OSDN Git Service

PR debug/50191
[pf3gnuchains/gcc-fork.git] / gcc / ChangeLog
1 2011-09-07  Jakub Jelinek  <jakub@redhat.com>
2
3         PR debug/50191
4         * dwarf2out.c (mem_loc_descriptor) <case MEM>: Try
5         avoid_constant_pool_reference first instead of last.
6
7 2011-09-06  Michael Meissner  <meissner@linux.vnet.ibm.com>
8
9         * doc/configfiles.texi (Configuration Files): Update documentation
10         about tm_p.h and remove FIXME comment.
11
12 2011-09-06  Uros Bizjak  <ubizjak@gmail.com>
13
14         * config/i386/i386.c (ix86_function_value_regno_p): Use AX_REG.
15         (function_value_32): Do not check TARGET_MMX, TARGET_SSE or TARGET_AVX.
16
17 2011-09-06  Iain Sandoe  <iains@gcc.gnu.org>
18
19         * config/darwin10.h Remove duplicate LIB_SPEC.
20
21 2011-09-06  Enkovich Ilya  <ilya.enkovich@intel.com>
22
23         PR middle-end/44382
24         * target.def (reassociation_width): New hook.
25
26         * doc/tm.texi.in (reassociation_width): Likewise.
27
28         * doc/tm.texi (reassociation_width): Likewise.
29
30         * doc/invoke.texi (tree-reassoc-width): New param documented.
31
32         * hooks.h (hook_int_uint_mode_1): New default hook.
33
34         * hooks.c (hook_int_uint_mode_1): Likewise.
35
36         * config/i386/i386.h (ix86_tune_indices): Add
37         X86_TUNE_REASSOC_INT_TO_PARALLEL and
38         X86_TUNE_REASSOC_FP_TO_PARALLEL.
39
40         (TARGET_REASSOC_INT_TO_PARALLEL): New.
41         (TARGET_REASSOC_FP_TO_PARALLEL): Likewise.
42
43         * config/i386/i386.c (initial_ix86_tune_features): Add
44         X86_TUNE_REASSOC_INT_TO_PARALLEL and
45         X86_TUNE_REASSOC_FP_TO_PARALLEL.
46
47         (ix86_reassociation_width) implementation of
48         new hook for i386 target.
49
50         * params.def (PARAM_TREE_REASSOC_WIDTH): New param added.
51
52         * tree-ssa-reassoc.c (get_required_cycles): New function.
53         (get_reassociation_width): Likewise.
54         (swap_ops_for_binary_stmt): Likewise.
55         (rewrite_expr_tree_parallel): Likewise.
56
57         (rewrite_expr_tree): Refactored. Part of code moved into
58         swap_ops_for_binary_stmt.
59
60         (reassociate_bb): Now checks reassociation width to be used
61         and call rewrite_expr_tree_parallel instead of rewrite_expr_tree
62         if needed.
63
64 2011-09-06  Richard Guenther  <rguenther@suse.de>
65
66         PR tree-optimization/47025
67         * tree-ssa-alias.c (ref_maybe_used_by_call_p_1): BUILT_IN_VA_END
68         uses nothing.
69         (call_may_clobber_ref_p_1): BUILT_IN_VA_END is a barrier like
70         BUILT_IN_FREE.
71         (stmt_kills_ref_p_1): BUILT_IN_VA_END kills what its argument
72         definitely points to.
73         * tree-ssa-structalias.c (find_func_aliases_for_builtin_call):
74         BUILT_IN_VA_START doesn't let its va_list argument escape.
75         * tree-ssa-dce.c (propagate_necessity): BUILT_IN_VA_END does
76         not make any previous stores necessary.
77
78 2011-09-06  Martin Jambor  <mjambor@suse.cz>
79
80         * ipa-inline.h (struct inline_summary): Move versionable flag...
81         * cgraph.h (struct cgraph_local_info): ...here
82         * ipa-cp.c (determine_versionability): Use the new versionable flag.
83         (determine_versionability): Likewise.
84         (ipcp_versionable_function_p): Likewise.
85         (ipcp_generate_summary): Likewise.
86         * ipa-inline-analysis.c (dump_inline_summary): Do not dump the
87         versionable flag.
88         (compute_inline_parameters): Do not clear the versionable flag.
89         (inline_read_section): Do not stream the versionable flag.
90         (inline_write_summary): Likewise.
91         * lto-cgraph.c (lto_output_node): Stream the versionable flag.
92         (input_overwrite_node): Likewise.
93
94 2011-09-06  Richard Guenther  <rguenther@suse.de>
95
96         PR tree-optimization/48149
97         * tree-ssa-sccvn.c (vn_get_expr_for): Simplify.  Fix tuplification bug.
98         (vn_valueize): Move earlier.
99         (valueize_expr): Use vn_valueize.
100         (simplify_binary_expression): Simplify, also combine COMPLEX_EXPR
101         operands.
102         (simplify_unary_expression): Simplify.
103
104 2011-09-06  Richard Guenther  <rguenther@suse.de>
105
106         PR tree-optimization/48317
107         * tree-ssa-sccvn.h (struct vn_nary_op_s): Make op a true
108         trailing array.
109         (sizeof_vn_nary_op): New inline function.
110         (vn_nary_op_lookup_pieces): Adjust.
111         (vn_nary_op_insert_pieces): Likewise.
112         * tree-ssa-sccvn.c (vn_nary_op_eq): Also compare the length.
113         (init_vn_nary_op_from_pieces): Adjust signature.  Deal with
114         any number of operands.
115         (vn_nary_length_from_stmt): New function.
116         (init_vn_nary_op_from_stmt): Adjust for CONSTRUCTOR handling.
117         (vn_nary_op_lookup_pieces): Adjust signature and allocate properly
118         sized temporary.
119         (vn_nary_op_lookup): Likewise.
120         (vn_nary_op_lookup_stmt): Likewise.
121         (vn_nary_op_insert_into): Likewise.
122         (vn_nary_op_insert_stmt): Likewise.
123         (visit_use): Handle CONSTRUCTOR as nary.
124         * tree-ssa-pre.c (phi_translate_1): Adjust.
125         (create_expression_by_pieces): Likewise.
126         (compute_avail): Likewise.
127
128 2011-09-06  Ira Rosen  <ira.rosen@linaro.org>
129
130          * config/arm/arm.c (arm_preferred_simd_mode): Check
131         TARGET_NEON_VECTORIZE_DOUBLE instead of
132         TARGET_NEON_VECTORIZE_QUAD.
133         (arm_autovectorize_vector_sizes): Likewise.
134         * config/arm/arm.opt (mvectorize-with-neon-quad): Make inverse
135         mask of mvectorize-with-neon-double.  Add RejectNegative.
136         (mvectorize-with-neon-double): New.
137
138 2011-09-06  Richard Guenther  <rguenther@suse.de>
139
140         * tree-ssa-sccvn.c (visit_use): CSE stmt pieces and simplify
141         matching.
142
143 2011-09-06  Tom de Vries  <tom@codesourcery.com>
144
145         * recog.c (asm_labels_ok): New function.
146         (check_asm_operands): Use asm_labels_ok.
147
148 2011-09-05  Richard Sandiford  <rdsandiford@googlemail.com>
149
150         PR target/49606
151         * config/mips/mips.h (ABI_HAS_64BIT_SYMBOLS): Check Pmode.
152         (PMODE_INSN): New macro.
153         * config/mips/mips.c (gen_load_const_gp): Use PMODE_INSN.
154         (mips_got_load, mips_expand_synci_loop): Likewise.
155         (mips_save_gp_to_cprestore_slot): Handle SImode and DImode
156         cprestore patterns.
157         (mips_emit_loadgp): Use PMODE_INSN.  Handle SImode and DImode
158         copygp_mips16 patterns.
159         (mips_expand_prologue): Handle SImode and DImode potential_cprestore
160         and use_cprestore patterns.
161         (mips_override_options): Check for incompatible -mabi and -mlong
162         combinations.
163         * config/mips/mips.md (unspec_got<mode>): Rename to...
164         (unspec_got_<mode>): ...this.
165         (copygp_mips16): Use the Pmode iterator.
166         (potential_cprestore, cprestore, use_cprestore): Likewise.
167         (clear_cache, indirect_jump): Use PMODE_INSN.
168         (indirect_jump<mode>): Rename to...
169         (indirect_jump_<mode>): ...this.
170         (tablejump): Use PMODE_INSN.
171         (tablejump<mode>): Rename to...
172         (tablejump_<mode>): ...this.
173         (exception_receiver): Handle restore_gp_si and restore_gp_di.
174         (restore_gp): Use the Pmode iterator.
175         * config/mips/mips-dsp.md (mips_lbux, mips_lhx, mips_lwx): Use
176         PMODE_INSN.
177
178 2011-09-05  Richard Sandiford  <rdsandiford@googlemail.com>
179
180         * config/mips/mips.c (mips_gimplify_va_arg_expr): Unshare off.
181         Fix the type of the BIT_AND_EXPR.
182
183 2011-09-05  David S. Miller  <davem@davemloft.net>
184
185         * config.host: Add driver-sparc.o and sparc/x-sparc on
186         native sparc*-*-linux* builds.
187         * config/sparc/driver-sparc.c: Correct Linux strings.
188         * config/sparc/linux.h: Add DRIVER_SELF_SPECS.
189         * config/sparc/linux64.h: Likewise.
190         * doc/invoke.texi: Document that Linux also supports
191         -mcpu=native and -mtune=native on sparc.
192
193         * config/sparc/sparc-opts.h (PROCESSOR_NIAGARA3,
194         PROCESSOR_NIAGARA4): New.
195         * config/sparc/sparc.opt: Handle new processor types.
196         * config/sparc/sparc.md: Add to "cpu" attribute.
197         * config/sparc/sparc.h (TARGET_CPU_niagara3,
198         TARGET_CPU_niagara4): New, treat as niagara2.
199         * config/sparc/linux64.h: Handle niagara3 and niagara4
200         like niagara2.
201         * config/sparc/sol2.h: Likewise.
202         * config/sparc/niagara2.md: Schedule niagara3 like
203         niagara2.
204         * config/sparc/sparc.c (sparc_option_override): Add
205         niagara3 and niagara4 handling.
206         (sparc32_initialize_trampoline): Likewise.
207         (sparc64_initialize_trampoline): Likewise.
208         (sparc_use_sched_lookahead): Likewise.
209         (sparc_issue_rate): Likewise.
210         (sparc_register_move_cost): Likewise.
211         * config/sparc/driver-sparc.c (cpu_names): Use niagara3
212         and niagara4 as appropriate.
213         * doc/invoke.texi: Document new processor types.
214         * config.gcc: Recognize niagara3 and niagara4 in --with-cpu
215         and --with-tune options.
216
217         * config/sparc/sol2-64.h: Move ...
218         * config/sparc/default-64.h: ... to here.  Update comment.
219         * config.gcc: Update Solaris sparc to use default-64.h, also
220         prefix this header into the list on sparc64-*-linux.
221         * config/sparc/linux64.h (TARGET_DEFAULT): Only override if
222         TARGET_64BIT_DEFAULT is defined.  Remove commented out reference
223         to MASK_HARD_QUAD.
224
225 2011-09-05  Georg-Johann Lay  <avr@gjlay.de>
226
227         PR target/50289
228         * config/avr/avr.c (sequent_regs_live): Don't recognize sequences
229         that contain global register variable.
230
231 2011-09-05  Richard Guenther  <rguenther@suse.de>
232
233         * tree-cfg.c (replace_uses_by): Use fold_stmt, not fold_stmt_inplace.
234
235 2011-09-05  Richard Guenther  <rguenther@suse.de>
236
237         * stor-layout.c (layout_type): Use size_binop for array size
238         calculations.
239
240 2011-09-05  Georg-Johann Lay  <avr@gjlay.de>
241
242         * config/avr/avr.h (progmem_section): Remove Declaration.
243         * config/avr/avr.c (progmem_section): Make static and rename to
244         progmem_swtable_section.
245         (avr_output_addr_vec_elt): No need to switch sections.
246         (avr_asm_init_sections): Use output_section_asm_op as section
247         callback for progmem_swtable_section.
248         (avr_output_progmem_section_asm_op): Remove Function.
249         (TARGET_ASM_FUNCTION_RODATA_SECTION): New Define.
250         (avr_asm_function_rodata_section): New static Function.
251         * config/avr/elf.h (ASM_OUTPUT_BEFORE_CASE_LABEL): Output
252         alignment 2**1 for jump tables.
253
254 2011-09-04  Jan Hubicka  <jh@suse.cz>
255
256         * ipa-inline-analysis.c (set_cond_stmt_execution_predicate): Check that
257         parameter is SSA name.
258
259 2011-09-04  Richard Guenther  <rguenther@suse.de>
260
261         Revert
262         2011-08-31  Richard Guenther  <rguenther@suse.de>
263
264         * fold-const.c (extract_muldiv_1): Remove bogus TYPE_IS_SIZETYPE
265         special-casing.
266
267 2011-09-04  Iain Sandoe  <iains@gcc.gnu.org>
268
269         PR debug/49901
270         * config/darwin.h (DEBUG_MACRO_SECTION): New macro.
271
272 2011-09-04  Jakub Jelinek  <jakub@redhat.com>
273             Ira Rosen  <ira.rosen@linaro.org>
274
275         PR tree-optimization/50208
276         * tree-vect-patterns.c (vect_handle_widen_mult_by_const): Add an
277         argument.  Check that def_stmt is inside the loop.
278         (vect_recog_widen_mult_pattern): Update calls to
279         vect_handle_widen_mult_by_cons.
280         (vect_operation_fits_smaller_type): Check that def_stmt is
281         inside the loop.
282
283 2011-09-04  Ira Rosen  <ira.rosen@linaro.org>
284
285         * tree-vectorizer.c (vect_print_dump_info): Print line
286         number when dumping to a file.
287         (vectorize_loops): Add new messages to dump file.
288
289 2011-09-03  Martin Jambor  <mjambor@suse.cz>
290
291         * ipa-prop.h (ipa_jump_func_t): New typedef.
292         (struct ipa_edge_args): Removed field argument_count, field
293         jump_functions turned into a vector.
294         (ipa_set_cs_argument_count): Removed.
295         (ipa_get_cs_argument_count): Updated to work on vectors.
296         (ipa_get_ith_jump_func): Likewise.
297         * ipa-prop.c (ipa_count_arguments): Removed.
298         (compute_scalar_jump_functions): Use ipa_get_ith_jump_func to access
299         jump functions.  Update caller.
300         (compute_pass_through_member_ptrs): Likewise.
301         (compute_cst_member_ptr_arguments): Likewise.
302         (ipa_compute_jump_functions_for_edge): Get number of arguments from
303         the statement, allocate vector.
304         (ipa_compute_jump_functions): Do not call ipa_count_arguments.
305         (duplicate_ipa_jump_func_array): Removed.
306         (ipa_edge_duplication_hook): Use VEC_copy, do not copy argument count.
307         (ipa_read_node_info): Allocate vector.
308
309 2011-09-03  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
310
311         PR middle-end/50232
312         * config/pa/pa.md (return): Define "return" insn pattern.
313         (epilogue): Use it when no epilogue is needed.
314         * config/pa/pa.c (pa_can_use_return_insn): New function.
315         * config/pa/pa-protos.h (pa_can_use_return_insn): Declare.
316
317 2011-09-03  Eric Botcazou  <ebotcazou@adacore.com>
318
319         * cfgexpand.c (add_stack_var): Assert that the alignment is not zero.
320         * tree-ssa-ccp.c (fold_builtin_alloca_for_var): Revert latest change.
321         Force at least BITS_PER_UNIT alignment on the new variable.
322
323 2011-09-02  Gary Funck <gary@intrepid.com>
324
325         * opts.c (print_specific_help): Fix off-by-one compare in
326         assertion check.
327         * opts.h (CL_PARAMS, CL_WARNING, CL_OPTIMIZATION, CL_DRIVER,
328         CL_TARGET, CL_COMMON, CL_JOINED, CL_SEPARATE, CL_UNDOCUMENTED):
329         Increase by +5 to allow for more languages.
330         * optc-gen.awk: Generate #if that ensures that the number of
331         languages is within the implementation-defined limit.
332
333 2011-09-02  Michael Matz  <matz@suse.de>
334
335         PR middle-end/50260
336         * ipa-split.c (split_function): Call add_referenced_var.
337
338         * tree-ssa-phiopt.c (cond_store_replacement): Don't call get_var_ann.
339         (cond_if_else_store_replacement_1): Ditto.
340         * tree-ssa-pre.c (get_representative_for): Ditto.
341         (create_expression_by_pieces): Ditto.
342         (insert_into_preds_of_block): Ditto.
343         * tree-sra.c (create_access_replacement): Ditto.
344         (get_replaced_param_substitute): Ditto.
345
346 2011-09-02  Bernd Schmidt  <bernds@codesourcery.com>
347
348         * config/c6x/c6x.md (collapse-ndfa, no-comb-vect): New
349         automata_options.
350         (d1, l1, s1, m1, d2, l2, s2, m2): Changed to define_query_cpu_unit.
351         (l1w, s1w, l2w, s2w): Define in the main automaton.
352         (fps1, fpl1, adddps1, adddpl1, fps2, fpl2, adddps2, adddpl2): New
353         units.
354         * config/c6x/c6x.c (c6x_sched_insn_info): Add unit_mask member.
355         (c6x_unit_names): Add the new units.
356         (c6x_unit_codes): New static array.
357         (UNIT_QID_D1, UNIT_QID_L1, UNIT_QID_S1, UNIT_QID_M1, UNIT_QID_FPS1,
358         UNIT_QID_FPL1, UNIT_QID_ADDDPS1, UNIT_QID_ADDDPL1,
359         UNIT_QID_SIDE_OFFSET): New macros.
360         (RESERVATION_S2): Adjust value.
361         (c6x_option_override): Compute c6x_unit_codes.
362         (assign_reservations): Take the unit_mask of the last instruction
363         into account.  Detect floating point reservations by looking for
364         the new units.  Don't assign reservations if the field is already
365         nonzero.
366         (struct c6x_sched_context): Add member prev_cycle_state_ctx.
367         (init_sched_state): Initialize it.
368         (c6x_clear_sched_context): Free it.
369         (insn_set_clock): Clear reservation.
370         (prev_cycle_state): New static variable.
371         (c6x_init_sched_context): Save it.
372         (c6x_sched_init): Allocate space for it and clear it.
373         (c6x_sched_dfa_pre_cycle_insn): New static function.
374         (c6x_dfa_new_cycle): Save state at the start of a new cycle.
375         (c6x_variable_issue): Only record units in the unit_mask that
376         were not set at the start of the cycle.
377         (c6x_variable_issue): Compute and store the unit_mask from the
378         current state.
379         (reorg_split_calls): Ensure the new information remains correct.
380         (TARGET_SCHED_DFA_NEW_CYCLE, TARGET_SCHED_CLEAR_SCHED_CONTEXT,
381         TARGET_SCHED_DFA_PRE_CYCLE_INSN): Define.
382         * config/c6x/c6x.h (CPU_UNITS_QUERY): Define.
383         * config/c6x/c6x-sched.md.in (fp4_ls_N__CROSS_, adddp_ls_N__CROSS_):
384         Add special reservations.
385         * config/c6x/c6x-sched.md: Regenerate.
386
387 2011-09-02  Martin Jambor  <mjambor@suse.cz>
388
389         * ipa-prop.h (ipa_node_params): Removed fields
390         called_with_var_arguments and node_versionable.
391         (ipa_set_called_with_variable_arg): Removed.
392         (ipa_is_called_with_var_arguments): Likewise.
393         * ipa-cp.c (ipa_get_lattice): Fixed index check in an assert.
394         (determine_versionability): Do not check for type attributes and va
395         builtins.  Record versionability into inline summary.
396         (initialize_node_lattices): Do not check
397         ipa_is_called_with_var_arguments.
398         (propagate_constants_accross_call): Likewise, ignore arguments we do
399         not have PARM_DECLs for, set variable flag for parameters that were
400         not passed a value.
401         (create_specialized_node): Dump info that we cannot change signature.
402         * ipa-prop.c (ipa_compute_jump_functions): Do not care about variable
403         number of arguments.
404         (ipa_make_edge_direct_to_target): Likewise.
405         (ipa_update_after_lto_read): Likewise.
406         (ipa_node_duplication_hook): Do not copy called_with_var_arguments flag.
407         * tree-inline.c (copy_arguments_for_versioning): Copy PARM_DECLs if
408         they were remapped.
409
410 2011-09-02  Richard Guenther  <rguenther@suse.de>
411
412         PR tree-optimization/27460
413         PR middle-end/29269
414         * doc/md.texi (vcond): Document.
415         * genopinit.c (optabs): Turn vcond{,u}_optab into a conversion
416         optab with two modes.
417         * optabs.h (enum convert_optab_index): Add COI_vcond, COI_vcondu.
418         (enum direct_optab_index): Remove DOI_vcond, DOI_vcondu.
419         (vcond_optab): Adjust.
420         (vcondu_optab): Likewise.
421         (expand_vec_cond_expr_p): Adjust prototype.
422         * optabs.c (get_vcond_icode): Adjust.
423         (expand_vec_cond_expr_p): Likewise.
424         (expand_vec_cond_expr): Likewise.
425         * tree-vect-stmts.c (vect_is_simple_cond): Return the comparison
426         vector type.
427         (vectorizable_condition): Allow differing types for comparison
428         and result.
429         * config/i386/i386.c (ix86_expand_sse_cmp): Use proper mode
430         for the comparison.
431         * config/i386/sse.md (vcond<mode>): Split to
432         vcond<V_256:mode><VF_256:mode>, vcond<V_128:mode><VF_128:mode>,
433         vcond<V_128:mode><VI124_128:mode> and
434         vcondu<V_128:mode><VI124_128:mode>.
435         (vcondv2di): Change to vcond<VI8F_128:mode>v2di.
436         (vconduv2di): Likewise.
437         * config/arm/neon.md (vcond<mode>): Change to vcond*<mode><mode>.
438         (vcondu<mode>): Likewise.
439         * config/ia64/vect.md (vcond<mode>): Likewise.
440         (vcondu<mode>): Likewise.
441         (vcondv2sf): Likewise.
442         * config/mips/mips-ps-3d.md (vcondv2sf): Likewise.
443         * config/rs6000/paired.md (vcondv2sf): Likewise.
444         * config/rs6000/vector.md (vcond<mode>): Likewise.
445         (vcondu<mode>): Likewise.
446         * config/spu/spu.md (vcond<mode>): Likewise.
447         (vcondu<mode>): Likewise.
448
449 2011-09-02  Richard Guenther  <rguenther@suse.de>
450
451         * pretty-print.h (pp_unsigned_wide_integer): New.
452         * tree-pretty-print.c (dump_generic_node): Print unsigned
453         host-wide-int fitting INTEGER_CSTs with pp_unsigned_wide_integer.
454
455 2011-09-02  Richard Sandiford  <richard.sandiford@linaro.org>
456
457         PR target/49987
458         * config/rs6000/rs6000.c (paired_expand_vector_init): Check for
459         valid CONST_VECTOR operands.
460         (rs6000_expand_vector_init): Likewise.
461
462 2011-09-02  Martin Jambor  <mjambor@suse.cz>
463
464         * cgraph.h (cgraph_indirect_call_info): Removed field thunk_delta.
465         * gimple-fold.c (gimple_get_virt_method_for_binfo): Rewritten to use
466         BINFO_VTABLE.  Parameter delta removed, all callers updated.
467         * tree.c (free_lang_data_in_binfo): Clear BINFO_VIRTUALs instead
468         BINFO_VTABLE.
469         * cgraph.c (cgraph_make_edge_direct): Removed parameter delta, updated
470         all calls.
471         * cgraphunit.c (cgraph_redirect_edge_call_stmt_to_callee): Removed
472         handling of thunk_delta.
473         * ipa-cp.c (get_indirect_edge_target): Removed parameter delta.
474         (devirtualization_time_bonus): Do not handle thunk deltas.
475         (ipcp_discover_new_direct_edges): Likewise.
476         * ipa-prop.c (ipa_make_edge_direct_to_target): Likewise.
477         (try_make_edge_direct_simple_call): Likewise.
478         (try_make_edge_direct_virtual_call): Likewise.
479         * lto-cgraph.c (output_cgraph_opt_summary_p): Likewise.  Mark
480         parameter set as unused.
481         (output_edge_opt_summary): Likewise.  Mark both parameters as unused.
482         * lto-cgraph.c (output_cgraph_opt_summary_p): Likewise.  Mark
483         parameter set as unused.
484         (output_edge_opt_summary): Likewise.  Mark both parameters as unused.
485         (input_edge_opt_summary): Likewise.
486         * lto-streamer-out.c (lto_output_ts_binfo_tree_pointers): Do not stream
487         BINFO_VIRTUALS at all.
488         * lto-streamer-in.c (lto_input_ts_binfo_tree_pointers): Likewise.
489
490 2011-09-02  Richard Guenther  <rguenther@suse.de>
491
492         * tree-ssa-ccp.c (fold_builtin_alloca_for_var): Do not fold alloca (0).
493         (ccp_fold_stmt): Continue replacing args when folding alloca fails.
494
495 2011-08-31  Richard Guenther  <rguenther@suse.de>
496
497         * expr.c (expand_expr_real_2): Move COND_EXPR and VEC_COND_EXPR
498         handling here, from ...
499         (expand_expr_real_1): ... here.
500         * gimple-pretty-print.c (dump_ternary_rhs): Handle COND_EXPR
501         and VEC_COND_EXPR.
502         * gimple.c (gimple_rhs_class_table): Make COND_EXPR and VEC_COND_EXPR
503         a GIMPLE_TERNARY_RHS.
504         * tree-cfg.c (verify_gimple_assign_ternary): Handle COND_EXPR
505         and VEC_COND_EXPR here ...
506         (verify_gimple_assign_single): ... not here.
507         * gimple-fold.c (fold_gimple_assign): Move COND_EXPR folding.
508         * tree-object-size.c (cond_expr_object_size): Adjust.
509         (collect_object_sizes_for): Likewise.
510         * tree-scalar-evolution.c (interpret_expr): Don't handle
511         ternary RHSs.
512         * tree-ssa-forwprop.c (forward_propagate_into_cond): Fix and simplify.
513         (ssa_forward_propagate_and_combine): Adjust.
514         * tree-ssa-loop-im.c (move_computations_stmt): Build the COND_EXPR
515         as ternary.
516         * tree-ssa-threadedge.c (fold_assignment_stmt): Adjust.
517         * tree-vect-loop.c (vect_is_simple_reduction_1): Likewise.
518         * tree-vect-stmt.c (vectorizable_condition): Likewise.
519         * tree-vrp.c (extract_range_from_cond_expr): Likewise.
520         (extract_range_from_assignment): Likewise.
521
522 2011-08-31  Richard Sandiford  <rdsandiford@googlemail.com>
523
524         * config/i386/i386.md: Use (match_test ...) for attribute tests.
525         * config/i386/mmx.md: Likewise.
526         * config/i386/sse.md: Likewise.
527         * config/i386/predicates.md (call_insn_operand): Use
528         (not (match_test "...")) instead of (match_test "!...")
529         * config/i386/constraints.md (w): Likewise.
530
531 2011-08-31  Richard Sandiford  <rdsandiford@googlemail.com>
532
533         * doc/md.texi: Describe the use of match_tests in attribute tests.
534         * rtl.def (MATCH_TEST): Update commentary.
535         * genattrtab.c (attr_copy_rtx, check_attr_test, clear_struct_flag)
536         (write_test_expr, walk_attr_value): Handle MATCH_TEST.
537
538 2011-08-31  Richard Sandiford  <rdsandiford@googlemail.com>
539
540         * genattrtab.c (attr_rtx_1): Hash SYMBOL_REFs.
541         (attr_string): Use copy_md_ptr_loc.
542
543 2011-08-31  Martin Jambor  <mjambor@suse.cz>
544
545         PR middle-end/49886
546         * ipa-inline-analysis.c (compute_inline_parameters): Set
547         can_change_signature of noes with typde attributes.
548         * ipa-split.c (split_function): Do not skip any arguments if
549         can_change_signature is set.
550
551 2011-08-31  Martin Jambor  <mjambor@suse.cz>
552
553         * cgraphunit.c (cgraph_redirect_edge_call_stmt_to_callee): Alias
554         check removed.
555
556 2011-08-31  Richard Guenther  <rguenther@suse.de>
557
558         * fold-const.c (extract_muldiv_1): Remove bogus TYPE_IS_SIZETYPE
559         special-casing.
560
561 2011-08-31  Marc Glisse  <marc.glisse@inria.fr>
562
563         * doc/generic.texi (Types for C++): CP_TYPE_QUALS -> cp_type_quals.
564
565 2011-08-31  Tom de Vries  <tom@codesourcery.com>
566
567         PR middle-end/43513
568         * Makefile.in (tree-ssa-ccp.o): Add $(PARAMS_H) to rule.
569         * tree-ssa-ccp.c (params.h): Include.
570         (fold_builtin_alloca_for_var): New function.
571         (ccp_fold_stmt): Use fold_builtin_alloca_for_var.
572
573 2011-08-30  Uros Bizjak  <ubizjak@gmail.com>
574
575         * config/i386/i386.c (ix86_valid_target_attribute_inner_p):
576         Handle FMA option.
577
578 2011-08-30  Andrew Stubbs  <ams@codesourcery.com>
579
580         * config/arm/arm.c (optimal_immediate_sequence_1): Make b1, b2,
581         b3 and b4 unsigned.
582
583 2011-08-30  Andrew Stubbs  <ams@codesourcery.com>
584
585         * config/arm/arm.c (arm_gen_constant): Set can_negate correctly
586         when code is SET.
587
588 2011-08-30  Richard Guenther  <rguenther@suse.de>
589
590         PR middle-end/48571
591         * gimple.h (maybe_fold_offset_to_address): Remove.
592         (maybe_fold_offset_to_reference): Likewise.
593         (maybe_fold_stmt_addition): Likewise.
594         (may_propagate_address_into_dereference): Likewise.
595         * tree-inline.c (remap_gimple_op_r): Do not reconstruct
596         array references.
597         * gimple-fold.c (canonicalize_constructor_val): Likewise.
598         Canonicalize invariant POINTER_PLUS_EXPRs to invariant MEM_REF
599         addresses instead.
600         (may_propagate_address_into_dereference): Remove.
601         (maybe_fold_offset_to_array_ref): Likewise.
602         (maybe_fold_offset_to_reference): Likewise.
603         (maybe_fold_offset_to_address): Likewise.
604         (maybe_fold_stmt_addition): Likewise.
605         (fold_gimple_assign): Do not reconstruct array references but
606         instead canonicalize invariant POINTER_PLUS_EXPRs to invariant
607         MEM_REF addresses.
608         (gimple_fold_stmt_to_constant_1): Likewise.
609         * tree-ssa-forwprop.c (forward_propagate_addr_expr_1): Likewise.
610         * gimplify.c (gimplify_conversion): Likewise.
611         (gimplify_expr): Likewise.
612
613 2011-08-30  Ilya Tocar  <ilya.tocar@intel.com>
614
615         * config/i386/fmaintrin.h: New.
616         * config.gcc: Add fmaintrin.h.
617         * config/i386/i386.c
618         (enum ix86_builtins) <IX86_BUILTIN_VFMADDSS3>: New.
619         <IX86_BUILTIN_VFMADDSD3>: Likewise.
620         * config/i386/sse.md (fmai_vmfmadd_<mode>): New.
621         (*fmai_fmadd_<mode>): Likewise.
622         (*fmai_fmsub_<mode>): Likewise.
623         (*fmai_fnmadd_<mode>): Likewise.
624         (*fmai_fnmsub_<mode>): Likewise.
625         * config/i386/immintrin.h: Add fmaintrin.h.
626
627 2011-08-30  Bernd Schmidt  <bernds@codesourcery.com>
628
629         * genautomata.c (NO_COMB_OPTION): New macro.
630         (no_comb_flag): New static variable.
631         (gen_automata_option): Handle NO_COMB_OPTION.
632         (comb_vect_p): False if no_comb_flag.
633         (add_vect): Move computation of min/max values.  Return early if
634         no_comb_flag.
635         * doc/md.texi (automata_option): Document no-comb-vect.
636
637         * config/i386/i386.c (get_pc_thunk_name): Change prefix to
638         "__x86.get_pc_thunk".
639
640         * bb-reorder.c (insert_section_boundary_note): Only do it if
641         we reordered the blocks; i.e. not if !optimize_function_for_speed_p.
642
643 2011-08-30  Christian Bruel  <christian.bruel@st.com>
644
645         * coverage.c (coverage_init): Check flag_branch_probabilities instead of
646         flag_profile_use.
647
648 2011-08-29  Michael Meissner  <meissner@linux.vnet.ibm.com>
649
650         * config/rs6000/rs6000.opt (-msave-toc-indirect): Change default
651         to off.  Document switch.
652         * doc/invoke.texi (-msave-toc-indirect): Ditto.
653
654 2011-08-29  Jakub Jelinek  <jakub@redhat.com>
655
656         * gthr-posix.h (__gthread_active_p): Do not use preprocessor
657         conditionals and comments inside macro arguments.
658
659 2011-08-29  Artjoms Sinkarovs  <artyom.shinkaroff@gmail.com>
660             Richard Guenther  <rguenther@suse.de>
661
662         * tree.h (constant_boolean_node): Adjust prototype.
663         * fold-const.c (fold_convert_loc): Move aggregate conversion
664         leeway down.
665         (constant_boolean_node): Make value parameter boolean, add
666         vector type handling.
667         (fold_unary_loc): Use constant_boolean_node.
668         (fold_binary_loc): Preserve types properly when folding
669         COMPLEX_EXPR <__real x, __imag x>.
670         * gimplify.c (gimplify_expr): Handle vector comparison.
671         * tree.def (EQ_EXPR, ...): Document behavior on vector typed
672         comparison.
673         * tree-cfg.c (verify_gimple_comparison): Verify vector typed
674         comparisons.
675
676 2011-08-29  Jakub Jelinek  <jakub@redhat.com>
677
678         PR middle-end/48722
679         * emit-rtl.c (unshare_all_rtl_again): For CALL_INSNs,
680         reset_used_flags also in CALL_INSN_FUNCTION_USAGE.
681         (verify_rtl_sharing): Likewise and verify_rtx_sharing
682         in there too.
683         (unshare_all_rtl_in_chain): For CALL_INSNs
684         copy_rtx_if_shared also CALL_INSN_FUNCTION_USAGE.
685
686 2011-08-29  Richard Guenther  <rguenther@suse.de>
687
688         * gimple-fold.c (gimple_fold_stmt_to_constant_1): Set a location
689         on the built ADDR_EXPR.
690
691 2011-08-29  Jakub Jelinek  <jakub@redhat.com>
692
693         PR debug/50215
694         * var-tracking.c (create_entry_value): Call cselib_lookup_from_insn
695         before adding ENTRY_VALUE to val->locs.
696
697 2011-08-28  Mikael Pettersson  <mikpe@it.uu.se>
698
699         PR bootstrap/50218
700         * tree-ssa-loop-ivopts.c (determine_use_iv_cost_condition): Initialize
701         comp.
702
703 2011-08-27  Bernd Schmidt  <bernds@codesourcery.com>
704
705         * doc/rtl.texi (simple_return): Document.
706         (parallel, PATTERN): Here too.
707         * doc/md.texi (return): Mention it's allowed to expand to simple_return
708         in some cases.
709         (simple_return): Document standard pattern.
710         * gengenrtl.c (special_rtx): SIMPLE_RETURN is special.
711         * final.c (final_scan_insn): Use ANY_RETURN_P on body.
712         * reorg.c (function_return_label, function_simple_return_label):
713         New static variables, replacing...
714         (end_of_function_label): ... this.
715         (simplejump_or_return_p): New static function.
716         (optimize_skip, steal_delay_list_from_fallthrough,
717         fill_slots_from_thread): Use it.
718         (relax_delay_slots): Likewise.  Use ANY_RETURN_P on body.
719         (rare_destination, follow_jumps): Use ANY_RETURN_P on body.
720         (find_end_label): Take a new arg which is one of the two return
721         rtxs.  Depending on which, set either function_return_label or
722         function_simple_return_label.  All callers changed.
723         (make_return_insns): Make both kinds.
724         (dbr_schedule): Adjust for two kinds of end labels.
725         * function.c (emit_return_into_block): Set JUMP_LABEL properly.
726         * genemit.c (gen_exp): Handle SIMPLE_RETURN.
727         (gen_expand, gen_split): Use ANY_RETURN_P.
728         * df-scan.c (df_uses_record): Handle SIMPLE_RETURN.
729         * rtl.def (SIMPLE_RETURN): New code.
730         * ifcvt.c (find_if_case_1): Be more careful about
731         redirecting jumps to the EXIT_BLOCK.
732         * jump.c (condjump_p, condjump_in_parallel_p, any_condjump_p,
733         returnjump_p_1): Handle SIMPLE_RETURNs.
734         * print-rtl.c (print_rtx): Likewise.
735         * rtl.c (copy_rtx): Likewise.
736         * bt-load.c (compute_defs_uses_and_gen): Use ANY_RETURN_P.
737         * combine.c (simplify_set): Likewise.
738         * resource.c (find_dead_or_set_registers, mark_set_resources):
739         Likewise.
740         * emit-rtl.c (verify_rtx_sharing, classify_insn, copy_insn_1,
741         copy_rtx_if_shared_1, mark_used_flags): Handle SIMPLE_RETURNs.
742         (init_emit_regs): Initialize simple_return_rtx.
743         * cfglayout.c (fixup_reorder_chain): Pass a JUMP_LABEL to
744         force_nonfallthru_and_redirect.
745         * rtl.h (ANY_RETURN_P): Allow SIMPLE_RETURN.
746         (GR_SIMPLE_RETURN): New enum value.
747         (simple_return_rtx): New macro.
748         * basic-block.h (force_nonfallthru_and_redirect): Adjust
749         declaration.
750         * cfgrtl.c (force_nonfallthru_and_redirect): Take a new jump_label
751         argument.  All callers changed.  Be careful about what kinds of
752         returnjumps to generate.
753         * config/i386/3i86.c (ix86_pad_returns, ix86_count_insn_bb,
754         ix86_pad_short_function): Likewise.
755         * config/arm/arm.c (arm_final_prescan_insn): Handle both kinds
756         of return.
757         * config/mips/mips.md (any_return): New code_iterator.
758         (optab): Add cases for return and simple_return.
759         (return): Expand to a simple_return.
760         (simple_return): New pattern.
761         (*<optab>, *<optab>_internal for any_return): New patterns.
762         (return_internal): Remove.
763         * config/mips/mips.c (mips_expand_epilogue): Make the last insn
764         a simple_return_internal.
765
766 2011-08-27  Uros Bizjak  <ubizjak@gmail.com>
767
768         * config/i386/sse.md (*absneg<mode>2): Fix split condition.
769         (vec_extract_lo_<mode>): Prevent both operands in memory.
770         (vec_extract_lo_v16hi): Ditto.
771         (*vec_extract_v4sf_mem): Add TARGET_SSE insn constraint.
772
773 2011-08-27  Uros Bizjak  <ubizjak@gmail.com>
774
775         * config/i386/sse.md (mulv16qi3): Attach REG_EQUAL note.
776         (*sse2_mulv4si3): Ditto.
777         (mulv2di3): Ditto.
778         * config/i386/i386.c (legitimize_tls_address): Change REG_EQIV
779         notes to REG_EQUAL.
780
781 2011-08-27  Uros Bizjak  <ubizjak@gmail.com>
782
783         PR target/50202
784         * config/i386/sse.md (sse4_2_pcmpestr): Emit NOTE_INSN_DELETED note
785         when all outputs are unused.
786         (sse4_2_pcmpistr): Ditto.
787
788 2011-08-26  Uros Bizjak  <ubizjak@gmail.com>
789
790         * config/i386/i386.md (round<mode>2): New expander.
791         * config/i386/i386.c (enum ix86_builtins): Add
792         IX86_BUILTIN_ROUND{PS,PD}_AZ{,256}.
793         (struct builtin_description): Add __builtin_ia32_round{ps,pd}_az{,256}
794         descriptions.
795         (ix86_builtin_vectorized_function): Handle BUILT_IN_ROUND{,F} builtins.
796         (ix86_build_const_vector): Rewrite using loop with RTVEC_ELT accessor.
797
798 2011-08-26  Uros Bizjak  <ubizjak@gmail.com>
799
800         PR middle-end/50083
801         * convert.c (convert_to_integer) <BUIT_IN_ROUND{,F,L}>: Convert
802         only when TARGET_C99_FUNCTIONS.
803         <BUILT_IN_NEARBYINT{,F,L}>: Ditto.
804         <BUILT_IN_RINT{,F,L}>: Ditto.
805
806 2011-08-26  Michael Matz  <matz@suse.de>
807             Jakub Jelinek  <jakub@redhat.com>
808
809         PR lto/50165
810         * lto-streamer-in.c (canon_file_name): Initialize new_slot->len;
811         don't call strlen twice, use memcpy.
812
813 2011-08-26  H.J. Lu  <hongjiu.lu@intel.com>
814
815         * config/i386/bmi2intrin.h: Allow in <immintrin.h>.
816         * config/i386/bmiintrin.h: Likewise.
817         * config/i386/lzcntintrin.h: Likewise.
818
819         * config/i386/immintrin.h: Include <lzcntintrin.h>,
820         <bmiintrin.h> and <bmi2intrin.h>.
821
822 2011-08-26  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
823
824         PR target/50166
825         * acinclude.m4 (gcc_AC_INITFINI_ARRAY): Check count in main.
826         * configure: Regenerate.
827
828 2011-08-26  Jakub Jelinek  <jakub@redhat.com>
829
830         PR c/50179
831         * c-typeck.c (c_process_expr_stmt): Skip over nops and
832         call mark_exp_read even if exprv is ADDR_EXPR.
833
834 2011-08-26  Richard Sandiford  <richard.sandiford@linaro.org>
835
836         * df-problems.c (df_note_bb_compute): Pass uses rather than defs
837         to df_set_dead_notes_for_mw.
838
839 2011-08-26  Richard Guenther  <rguenther@suse.de>
840
841         * varasm.c (decode_addr_const): Handle MEM_REF[&X, OFF].
842
843 2011-08-26  Zdenek Dvorak  <ook@ucw.cz>
844             Tom de Vries  <tom@codesourcery.com>
845
846         * tree-ssa-loop-ivopts.c (struct cost_pair): Add comp field.
847         (struct ivopts_data): Add loop_single_exit_p field.
848         (niter_for_exit): Change parameter desc_p into return value.  Return
849         desc if desc->may_be_zero.  Free desc if unused.
850         (niter_for_single_dom_exit): Change return type.
851         (find_induction_variables): Handle changed return type of
852         niter_for_single_dom_exit.  Dump may_be_zero.
853         (add_candidate_1): Keep original base and step type for IP_ORIGINAL.
854         (set_use_iv_cost): Add and handle comp parameter.
855         (determine_use_iv_cost_generic, determine_use_iv_cost_address): Add
856         comp argument to set_use_iv_cost.
857         (strip_wrap_conserving_type_conversions, expr_equal_p)
858         (difference_cannot_overflow_p, iv_elimination_compare_lt): New function.
859         (may_eliminate_iv): Add comp parameter.  Handle new return type of
860         niter_for_exit.  Use loop_single_exit_p.  Use iv_elimination_compare_lt.
861         (determine_use_iv_cost_condition): Add comp argument to set_use_iv_cost
862         and may_eliminate_iv.
863         (rewrite_use_compare): Move call to iv_elimination_compare to ...
864         (may_eliminate_iv): Here.
865         (tree_ssa_iv_optimize_loop): Initialize loop_single_exit_p.
866
867 2011-08-26  Tom de Vries  <tom@codesourcery.com>
868
869         * tree-pretty-print (dump_generic_node): Test for NULL_TREE before
870         accessing TREE_TYPE.
871
872 2011-08-26  Jiangning Liu  <jiangning.liu@arm.com>
873
874         * config/arm/arm.md (*ior_scc_scc): Enable for Thumb2 as well.
875         (*ior_scc_scc_cmp): Likewise
876         (*and_scc_scc): Likewise.
877         (*and_scc_scc_cmp): Likewise.
878         (*and_scc_scc_nodom): Likewise.
879         (*cmp_ite0, *cmp_ite1, *cmp_and, *cmp_ior): Handle Thumb2.
880
881 2011-08-26  Jakub Jelinek  <jakub@redhat.com>
882
883         * rtlanal.c (nonzero_bits1): Handle CLRSB.
884
885 2011-08-26  Richard Guenther  <rguenther@suse.de>
886
887         * expr.c (string_constant): Handle &MEM_REF.
888
889 2011-08-26  Andrew Stubbs  <ams@codesourcery.com>
890
891         * config/arm/arm.c (struct four_ints): New type.
892         (count_insns_for_constant): Delete function.
893         (find_best_start): Delete function.
894         (optimal_immediate_sequence): New function.
895         (optimal_immediate_sequence_1): New function.
896         (arm_gen_constant): Move constant splitting code to
897         optimal_immediate_sequence.
898         Rewrite constant negation/invertion code.
899
900 2011-08-26  Andrew Stubbs  <ams@codesourcery.com>
901
902         * config/arm/arm-protos.h (const_ok_for_op): Add prototype.
903         * config/arm/arm.c (const_ok_for_op): Add support for addw/subw.
904         Remove prototype. Remove static function type.
905         * config/arm/arm.md (*arm_addsi3): Add addw/subw support.
906         Add arch attribute.
907         * config/arm/constraints.md (Pj, PJ): New constraints.
908
909 2011-08-26  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
910
911         * config/arm/cortex-a9.md ("cortex_a9_mult_long"): New.
912         ("cortex_a9_multiply_long"): New and use above.  Handle all
913         long multiply cases.
914         ("cortex_a9_multiply"): Handle smmul and smmulr.
915         ("cortex_a9_mac"): Handle smmla.
916
917 2011-08-25  Richard Henderson  <rth@redhat.com>
918
919         PR 50132
920         PR 49864
921         * cfgcleanup.c (old_insns_match_p): Don't allow cross-jump for
922         non-constant stack adjutment.
923         * expr.c (find_args_size_adjust): Break out from ...
924         (fixup_args_size_notes): ... here.
925         * rtl.h (find_args_size_adjust): Declare.
926
927 2011-08-25  Uros Bizjak  <ubizjak@gmail.com>
928
929         * config/i386/i386.md (isa): Add sse2, sse2_noavx, sse3,
930         sse4 and sse4_noavx.
931         (enabled): Handle sse2, sse2_noavx, sse3, sse4 and sse4_noavx.
932         (*pushdf_rex64): Change Y2 register constraint to x.
933         (*movdf_internal_rex64): Ditto.
934         (*zero_extendsidi2_rex64): Ditto.
935         (*movdi_internal): Change Y2 register constraint to x
936         and update "isa" attribute.
937         (*pushdf): Ditto.
938         (*movdf internal): Ditto.
939         (zero_extendsidi2_1): Ditto.
940         (*truncdfdf_mixed): Ditto.
941         (*truncxfdf2_mixed): Ditto.
942         * config/i386/mmx.md (*mov<mode>_internal_rex64): Change Y2
943         register constraint to x.
944         (*movv2sf_internal_rex64): Ditto.
945         (*mov<mode>_internal): Change Y2 register constraint to x
946         and add "isa" attribute.
947         (*movv2sf_internal): Ditto.
948         (*vec_extractv2si_1): Ditto.
949         * config/i386/sse.md ("vec_set<mode>_0): Change Y2 and Y4 register
950         constraints to x and update "isa" attribute.
951         (*vec_interleave_highv2df): Change Y3 registerconstraint
952         to x and update "isa" attribute.
953         (*vec_interleave_lowv2df): Ditto.
954         (*vec_concatv2df): Change Y2 register constraint to x and
955         update "isa" attribute.
956         (sse2_loadld): Ditto.
957         (*vec_extractv2di_1): Ditto.
958         (*vec_dupv4si): Ditto.
959         (*vec_dupv2di): Ditto.
960         (*vec_concatv4si): Ditto.
961         (vec_concatv2di): Ditto.
962         * config/i386/constraints.md (Y2): Remove.
963         (Y3): Ditto.
964         (Y4): Ditto.
965
966 2011-08-25  Bernd Schmidt  <bernds@codesourcery.com>
967
968         * regrename.c (scan_rtx_reg, scan_rtx_address, build_def_use,
969         dump_def_use_chain): Don't declare.
970         (mark_conflict, create_new_chain): Move before users.
971         (regrename_optimize): Move to near end of file.
972
973 2011-08-25  Georg-Johann Lay  <avr@gjlay.de>
974
975         * config/avr-protos.h (byte_immediate_operand): Remove Prototype.
976         (secondary_input_reload_class): Remove Prototype.
977         * config/avr/avr.c (byte_immediate_operand): Remove Function.
978         * config/avr/avr.md (setmemhi): Use u8_operand.
979         (strlenhi): Use const0_rtx for comparison.
980         * config/avr/avr.h (avr_reg_order): Remove Declaration.
981
982 2011-08-25  Georg-Johann Lay  <avr@gjlay.de>
983
984         * config/avr/avr.c (reg_class_tab): Make local to
985         avr_regno_reg_class.  Return smallest register class available.
986
987 2011-08-25  Georg-Johann Lay  <avr@gjlay.de>
988
989         * config/avr/avr.c (STR_PREFIX_P): New Define.
990         (avr_asm_declare_function_name): Use it.
991         (avr_asm_named_section): Use it.
992         (avr_section_type_flags): Use it.
993
994 2011-08-25  Bernd Schmidt  <bernds@codesourcery.com>
995
996         * doc/md.texi (automata_option): Document collapse-ndfa.
997         * genautomata.c (COLLAPSE_OPTION): New macro.
998         (collapse_flag): New static variable.
999         (struct description): New member normal_decls_num.
1000         (struct automaton): New members advance_ainsn and collapse_ainsn.
1001         (gen_automata_option): Check for COLLAPSE_OPTION.
1002         (collapse_ndfa_insn_decl): New static variable.
1003         (add_collapse_ndfa_insn_decl, special_decl_p): New functions.
1004         (find_arc): If insn is the collapse-ndfa insn, accept any arc we find.
1005         (transform_insn_regexps): Call add_collapse_ndfa_insn_decl if
1006         necessary.  Use normal_decls_num rather than decls_num, remove
1007         test for special decls.
1008         (create_alt_states, form_ainsn_with_same_reservs): Use special_decl_p.
1009         (make_automaton); Likewise.  Use the new advance_cycle_insn member
1010         of struct automaton.
1011         (create_composed_state): Disallow advance-cycle arcs if collapse_flag
1012         is set.
1013         (NDFA_to_DFA): Don't create composed states for the collapse-ndfa
1014         transition.  Create the necessary transitions for it.
1015         (create_ainsns): Return void.  Take an automaton_t argument, and
1016         update its ainsn_list, advance_ainsn and collapse_ainsn members.  All
1017         callers changed.
1018         (COLLAPSE_NDFA_VALUE_NAME): New macro.
1019         (output_tables): Output code to define it.
1020         (output_internal_insn_code_evaluation): Output code to accept
1021         const0_rtx as collapse-ndfa transition.
1022         (output_default_latencies, output_print_reservation_func,
1023         output_print_description): Reorganize loops to use normal_decls_num
1024         as loop bound; remove special case for advance_cycle_insn_decl.
1025         (initiate_automaton_gen): Handle COLLAPSE_OPTION.
1026         (check_automata_insn_issues): Check for collapse_ainsn.
1027         (expand_automate): Allocate sufficient space.  Initialize
1028         normal_decls_num.
1029
1030 2011-08-25  Georg-Johann Lay  <avr@gjlay.de>
1031
1032         * config/avr/avr.md: Fix indentation from r177991.
1033
1034 2011-08-25  Bernd Schmidt  <bernds@codesourcery.com>
1035
1036         * regrename.c (struct du_head): Remove member terminated.
1037         (create_new_chain): Don't initialize it.
1038         (scan_rtx_reg): Don't set or test it, test the open_chains_set
1039         bitmap instead.
1040         (tick, this_tick): New global variables, moved out of
1041         regrename_optimize.
1042         (current_id, open_chains, closed_chains, open_chains_set,
1043         live_in_chains, live_hard_regs): Reorder declarations.
1044         (dump_def_use_chain): Move function earlier in the file.
1045         (rename_chains): New static function, broken out of
1046         regrename_optimize.
1047         (regrename_optimize): Use it.  Remove #if 0'ed code.
1048
1049 2011-08-25  Bernhard Reutner-Fischer  <aldot@gcc.gnu.org>
1050
1051         * varasm.c: (default_binds_local_p_1): Commentary typo fix.
1052
1053 2011-08-24  H.J. Lu  <hongjiu.lu@intel.com>
1054
1055         PR target/50172
1056         * config/i386/i386.c (ix86_expand_builtin): Convert to Pmode if needed.
1057
1058 2011-08-24  Richard Guenther  <rguenther@suse.de>
1059
1060         * tree-data-ref.c (dr_analyze_indices): Avoid unsharing the
1061         ref in the basic-block case.  Move stripping array-refs
1062         to the place we create an access-function for it.  Remove
1063         bogus stripping down a MEM_REF to its base.
1064
1065 2011-08-24  Richard Guenther  <rguenther@suse.de>
1066
1067         * fold-const.c (fold_comparison): Fold &a < &a + 4 even
1068         with -fno-strict-overflow.
1069
1070 2011-08-24  Richard Guenther  <rguenther@suse.de>
1071
1072         * tree-vectorizer.c (vect_print_dump_info): Avoid the
1073         file and location clutter when dumping to dump files.
1074
1075 2011-08-24  Simon Baldwin  <simonb@google.com>
1076
1077         * gengtype-state.c (write_state): Remove timestamped header line.
1078
1079 2011-08-24  Joseph Myers  <joseph@codesourcery.com>
1080
1081         * Makefile.in (CFLAGS-collect2.o, CFLAGS-c-family/c-opts.o)
1082         (CFLAGS-c-family/c-pch.o, CFLAGS-prefix.o, CFLAGS-version.o)
1083         (CFLAGS-lto-compress.o, CFLAGS-toplev.o, CFLAGS-intl.o)
1084         (CFLAGS-cppbuiltin.o, CFLAGS-cppdefault.o): New.
1085         (collect2.o, c-family/c-cppbuiltin.o, c-family/c-opts.o)
1086         (c-family/c-pch.o, prefix.o, version.o, lto-compress.o, toplev.o)
1087         (intl.o, cppbuiltin.o, cppdefault.o): Remove explicit compilation
1088         rules.
1089         (lto-wrapper$(exeext)): Use $(LINKER) not $(COMPILER).
1090
1091 2011-08-24  Joseph Myers  <joseph@codesourcery.com>
1092
1093         * Makefile.in (ALL_CXXFLAGS): Include $(CFLAGS-$@).
1094
1095 2011-08-24  Richard Guenther  <rguenther@suse.de>
1096
1097         PR tree-optimization/50067
1098         * tree-data-ref.c (dr_analyze_indices): Do not add an access
1099         function for a MEM_REF base that has no evolution in the loop
1100         nest or that is not analyzable.
1101
1102 2011-08-23  Vladimir Makarov  <vmakarov@redhat.com>
1103
1104         * ira.c (ira_init_register_move_cost): Check small subclasses
1105         through ira_reg_class_max_nregs and ira_available_class_regs.
1106
1107 2011-08-23  Uros Bizjak  <ubizjak@gmail.com>
1108
1109         * config/i386/constraints.md (Yp): New register constraint.
1110         * config/i386/i386.md (*addhi_1): Merge with *addhi_1_lea using
1111         Yp register constraint.
1112         (*addqi_1): Merge with *addqi_1_lea using Yp register constraint.
1113         (*ashlhi3_1): Merge with *ashlhi3_1_lea using Yp register constraint.
1114         (*ashlqi3_1): Merge with *ashlqi3_1_lea using Yp register constraint.
1115
1116 2011-08-23  Kirill Yukhin  <kirill.yukhin@intel.com>
1117
1118         * config/i386/sse.md (<s>mul<mode>3_highpart): Update.
1119
1120 2011-08-23  Mark Heffernan  <meheff@google.com>
1121
1122         PR middle-end/38509
1123         * common.opt (Wfree-nonheap-object): New option.
1124         * doc/invoke.texi (Warning options): Document -Wfree-nonheap-object.
1125         * builtins.c (maybe_emit_free_warning): Add OPT_Wfree_nonheap_object
1126         to warning.
1127         (expand_builtin): Make warning conditional.
1128
1129 2011-08-23  Uros Bizjak  <ubizjak@gmail.com>
1130
1131         * config/i386/i386.md (type): Add imulx, ishiftx and rotatex.
1132         (length_immediate): Handle imulx, ishiftx and rotatex.
1133         (imm_disp): Ditto.
1134         (isa): Add bmi2.
1135         (enabled): Handle bmi2.
1136         (*mul<mode><dwi>3): Split from *<u>mul<mode><dwi>3.
1137         (*umul<mode><dwi>3): Ditto.  Add imulx BMI2 alternative.
1138         (*bmi2_umulditi3_1): New insn pattern.
1139         (*bmi2_umulsidi3_1): Ditto.
1140         (*umul<mode><dwi>3 splitter): New splitter to avoid flags dependency.
1141         (*bmi2_ashl<mode>3_1): New insn pattern.
1142         (*ashl<mode>3_1): Add ishiftx BMI2 alternative.
1143         (*ashl<mode>3_1 splitter): New splitter to avoid flags dependency.
1144         (*bmi2_ashlsi3_1_zext): New insn pattern.
1145         (*ashlsi3_1_zext): Add ishiftx BMI2 alternative.
1146         (*ashlsi3_1_zext splitter): New splitter to avoid flags dependency.
1147         (*bmi2_<shiftrt_insn><mode>3_1): New insn pattern.
1148         (*<shiftrt_insn><mode>3_1): Add ishiftx BMI2 alternative.
1149         (*<shiftrt_insn><mode>3_1 splitter): New splitter to avoid
1150         flags dependency.
1151         (*bmi2_<shiftrt_insn>si3_1_zext): New insn pattern.
1152         (*<shiftrt_insn>si3_1_zext): Add ishiftx BMI2 alternative.
1153         (*<shiftrt_insn>si3_1_zext splitter): New splitter to avoid
1154         flags dependency.
1155         (*bmi2_rorx<mode>3_1): New insn pattern.
1156         (*<rotate_insn><mode>3_1): Add rotatex BMI2 alternative.
1157         (*rotate<mode>3_1 splitter): New splitter to avoid flags dependency.
1158         (*rotatert<mode>3_1 splitter): Ditto.
1159         (*bmi2_rorxsi3_1_zext): New insn pattern.
1160         (*<rotate_insn>si3_1_zext): Add rotatex BMI2 alternative.
1161         (*rotatesi3_1_zext splitter): New splitter to avoid flags dependency.
1162         (*rotatertsi3_1_zext splitter): Ditto.
1163
1164 2011-08-23  Kirill Yukhin  <kirill.yukhin@intel.com>
1165
1166         * common/config/i386/i386-common.c (OPTION_MASK_ISA_BMI2_SET): New.
1167         (OPTION_MASK_ISA_BMI2_UNSET): Likewise.
1168         (ix86_handle_option): Handle OPT_mbmi2 case.
1169         * config.gcc (i[34567]86-*-*): Add bmi2intrin.h.
1170         (x86_64-*-*): Likewise.
1171         * config/i386/bmi2intrin.h: New file.
1172         * config/i386/cpuid.h (bit_BMI2): New.
1173         * config/i386/driver-i386.c (host_detect_local_cpu): Detect
1174         BMI2 feature.
1175         * config/i386/i386-c.c (ix86_target_macros_internal):
1176         Conditionally define __BMI2__.
1177         * config/i386/i386.c (ix86_option_override_internal): Define PTA_BMI2.
1178         Handle BMI2 option.
1179         (ix86_valid_target_attribute_inner_p): Handle BMI2 option.
1180         (print_reg): New code.
1181         (ix86_print_operand): Likewise.
1182         (ix86_builtins): Add IX86_BUILTIN_BZHI32, IX86_BUILTIN_BZHI64,
1183         IX86_BUILTIN_PDEP32, IX86_BUILTIN_PDEP64, IX86_BUILTIN_PEXT32,
1184         IX86_BUILTIN_PEXT64.
1185         (bdesc_args): Add IX86_BUILTIN_BZHI32, IX86_BUILTIN_BZHI64,
1186         IX86_BUILTIN_PDEP32, IX86_BUILTIN_PDEP64, IX86_BUILTIN_PEXT32,
1187         IX86_BUILTIN_PEXT64.
1188         * config/i386/i386.h (TARGET_BMI2): New.
1189         * config/i386/i386.md (UNSPEC_PDEP): New.
1190         (UNSPEC_PEXT): Likewise.
1191         (*bmi2_bzhi_<mode>3): Likewise.
1192         (*bmi2_pdep_<mode>3): Likewise.
1193         (*bmi2_pext_<mode>3): Likewise.
1194         * config/i386/i386.opt (mbmi2): New.
1195         * config/i386/x86intrin.h: Include bmi2intrin.h when __BMI2__
1196         is defined.
1197         * doc/extend.texi: Document BMI2 built-in functions.
1198         * doc/invoke.texi: Document -mbmi2.
1199
1200 2011-08-23  Jakub Jelinek  <jakub@redhat.com>
1201
1202         PR middle-end/50161
1203         * simplify-rtx.c (simplify_const_unary_operation): If
1204         op is CONST_INT, don't look at op_mode, but use instead mode.
1205         * optabs.c (add_equal_note): For FFS, CLZ, CTZ,
1206         CLRSB, POPCOUNT, PARITY and BSWAP use operand mode for
1207         operation and TRUNCATE/ZERO_EXTEND if needed.
1208         * doc/rtl.texi (ffs, clrsb, clz, ctz, popcount, parity, bswap):
1209         Document that operand mode must be same as operation mode,
1210         or VOIDmode.
1211         * config/avr/avr.md (paritysi2, *parityqihi2.libgcc,
1212         *paritysihi2.libgcc, popcountsi2, *popcountsi2.libgcc,
1213         *popcountqihi2.libgcc, clzsi2, *clzsihi2.libgcc, ctzsi2,
1214         *ctzsihi2.libgcc, ffssi2, *ffssihi2.libgcc): For unary ops
1215         use the mode of operand for the operation and add truncate
1216         or zero_extend around if needed.
1217         * config/c6x/c6x.md (ctzdi2): Likewise.
1218         * config/bfin/bfin.md (clrsbsi2, signbitssi2): Likewise.
1219
1220 2011-08-12  Michael Matz  <matz@suse.de>
1221
1222         * cfgexpand.c (expand_one_register_var): Use get_pointer_alignment.
1223         (gimple_expand_cfg): Merge alignment info for coalesced pointer
1224         SSA names.
1225
1226 2011-08-23  Richard Guenther  <rguenther@suse.de>
1227
1228         * Makefile.in (tree-data-ref.o): Add tree-affine.h dependency.
1229         * tree-affine.h (aff_comb_cannot_overlap_p): Declare.
1230         * tree-affine.c (aff_comb_cannot_overlap_p): New function, moved
1231         from ...
1232         * tree-ssa-loop-im.c (cannot_overlap_p): ... here.
1233         (mem_refs_may_alias_p): Adjust.
1234         * tree-data-ref.h (dr_may_alias_p): Adjust.
1235         * tree-data-ref.c: Include tree-affine.h.
1236         (dr_analyze_indices): Do nothing for the non-loop case.
1237         (dr_may_alias_p): Distinguish loop and non-loop case.  Disambiguate
1238         more cases in the non-loop case.
1239         * graphite-sese-to-poly.c (write_alias_graph_to_ascii_dimacs): Adjust
1240         calls to dr_may_alias_p.
1241         (write_alias_graph_to_ascii_ecc): Likewise.
1242         (write_alias_graph_to_ascii_dot): Likewise.
1243         (build_alias_set_optimal_p): Likewise.
1244
1245 2011-08-23  Richard Guenther  <rguenther@suse.de>
1246
1247         PR tree-optimization/50162
1248         * tree-vect-stmts.c (vectorizable_call): Fix argument lookup.
1249
1250 2011-08-23  Richard Guenther  <rguenther@suse.de>
1251
1252         * tree-data-ref.c (dr_analyze_indices): Add comments, handle
1253         REALPART_EXPR and IMAGPART_EXPR similar to ARRAY_REFs.
1254         (create_data_ref): Also dump access functions for the created data-ref.
1255
1256 2011-08-22  Uros Bizjak  <ubizjak@gmail.com>
1257             Kirill Yukhin  <kirill.yukhin@intel.com>
1258
1259         PR target/50155
1260         * config/i386/sse.md (VI_AVX2): New.
1261         (<plusminus_insn><mode>3): Use VI_AVX2 mode iterator.
1262         (*<plusminus_insn><mode>3): Ditto.
1263         (<sse2_avx2>_andnot<mode>3): Ditto.
1264         (*andnot<mode>3): Fix order of cond operands.
1265         Add asserts for correct TARGET_xxx.
1266         (*<any_logic:code><mode>3): Ditto.
1267
1268 2011-08-22  Anatoly Sokolov  <aesok@post.ru>
1269
1270         * config/m32c/m32c.h (CLASS_MAX_NREGS): Remove macro.
1271         * config/m32c/m32c-protos.h (m32c_class_max_nregs): Remove.
1272         * config/m32c/m32c.c (m32c_class_max_nregs): Make static. Change
1273         regclass argument type to reg_class_t. Change 'max' and 'v' vars
1274         and return types to unsigned char. Use reg_class_contents instead
1275         of class_contents.
1276         (TARGET_CLASS_MAX_NREGS): Define.
1277
1278 2011-08-22  Bernd Schmidt  <bernds@codesourcery.com>
1279
1280         * config/c6x/c6x.md (indirect_jump_shadow): Tweak representation
1281         to make computed_jump_p return true.
1282
1283 2011-08-22  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
1284
1285         * configure.ac (GCC_PICFLAG_FOR_TARGET): Call it.
1286         (PICFLAG_FOR_TARGET): Substitute.
1287         * aclocal.m4: Regenerate.
1288         * configure: Regenerate.
1289
1290 2011-08-22  Dodji Seketeli  <dodji@redhat.com>
1291
1292         * c-family/c-pch.c (c_common_read_pch): Re-set line table right
1293         after reading in the pch.
1294
1295 2011-08-22  H.J. Lu  <hongjiu.lu@intel.com>
1296
1297         * acinclude.m4 (gcc_AC_INITFINI_ARRAY): Error if __ELF__ isn't defined.
1298         * configure: Regenerated.
1299
1300 2011-08-22  Jakub Jelinek  <jakub@redhat.com>
1301
1302         PR tree-optimization/50133
1303         * tree-vect-stmts.c (vect_finish_stmt_generation): Copy location
1304         from stmt instead of some statement around gsi.
1305
1306         PR middle-end/50141
1307         * expr.c (get_bit_range): Only use DECL_THREAD_LOCAL_P if
1308         innerdecl is a VAR_DECL.
1309
1310 2011-08-22  Kirill Yukhin  <kirill.yukhin@intel.com>
1311
1312         * config/i386/avx2intrin.h: New file.
1313         * config/i386/i386-builtin-types.def (PCINT, PCINT64, PV4SI,
1314         PV8SI, V32QI_FTYPE_V32QI, V32QI_FTYPE_V16QI, V16HI_FTYPE_V16HI,
1315         V16HI_FTYPE_V8HI, V8SI_FTYPE_V8SI, V16HI_FTYPE_V16QI,
1316         V8SI_FTYPE_V16QI, V4DI_FTYPE_V16QI, V8SI_FTYPE_V8HI,
1317         V4DI_FTYPE_V8HI, V4DI_FTYPE_V4SI, V4DI_FTYPE_PV4DI,
1318         V4DI_FTYPE_V2DI, V2DI_FTYPE_PCV2DI_V2DI, V4SI_FTYPE_PCV4SI_V4SI,
1319         V32QI_FTYPE_V16HI_V16HI, V16HI_FTYPE_V8SI_V8SI,
1320         V32QI_FTYPE_V32QI_V32QI, V16HI_FTYPE_V32QI_V32QI,
1321         V16HI_FTYPE_V16HI_V8HI, V16HI_FTYPE_V16HI_V16HI,
1322         V16HI_FTYPE_V16HI_INT, V16HI_FTYPE_V16HI_SI,
1323         V16HI_FTYPE_V16HI_V16HI_INT, V32QI_FTYPE_V32QI_V32QI_INT,
1324         V8SI_FTYPE_V8SI_V4SI, V8SI_FTYPE_V8SI_V8SI,
1325         V8SI_FTYPE_V16HI_V16HI, V8SI_FTYPE_V8SI_INT, V8SI_FTYPE_V8SI_SI,
1326         V8SI_FTYPE_PCV8SI_V8SI, V4DI_FTYPE_V4DI_V4DI,
1327         V4DI_FTYPE_V8SI_V8SI, V4DI_FTYPE_V4DI_V2DI,
1328         V4DI_FTYPE_PCV4DI_V4DI, V4DI_FTYPE_V4DI_INT,
1329         V2DI_FTYPE_V4DI_INT, V4DI_FTYPE_V4DI_V4DI_INT,
1330         V4DI_FTYPE_V4DI_V2DI_INT, VOID_FTYPE_PV2DI_V2DI_V2DI,
1331         VOID_FTYPE_PV4DI_V4DI_V4DI, VOID_FTYPE_PV4SI_V4SI_V4SI,
1332         VOID_FTYPE_PV8SI_V8SI_V8SI,
1333         V2DF_FTYPE_V2DF_PCDOUBLE_V4SI_V2DF_INT,
1334         V4DF_FTYPE_V4DF_PCDOUBLE_V4SI_V4DF_INT,
1335         V2DF_FTYPE_V2DF_PCDOUBLE_V2DI_V2DF_INT,
1336         V4DF_FTYPE_V4DF_PCDOUBLE_V4DI_V4DF_INT,
1337         V4SF_FTYPE_V4SF_PCFLOAT_V4SI_V4SF_INT,
1338         V8SF_FTYPE_V8SF_PCFLOAT_V8SI_V8SF_INT,
1339         V4SF_FTYPE_V4SF_PCFLOAT_V2DI_V4SF_INT,
1340         V4SF_FTYPE_V4SF_PCFLOAT_V4DI_V4SF_INT,
1341         V2DI_FTYPE_V2DI_PCINT64_V4SI_V2DI_INT,
1342         V4DI_FTYPE_V4DI_PCINT64_V4SI_V4DI_INT,
1343         V2DI_FTYPE_V2DI_PCINT64_V2DI_V2DI_INT,
1344         V4DI_FTYPE_V4DI_PCINT64_V4DI_V4DI_INT,
1345         V4SI_FTYPE_V4SI_PCINT_V4SI_V4SI_INT,
1346         V8SI_FTYPE_V8SI_PCINT_V8SI_V8SI_INT,
1347         V4SI_FTYPE_V4SI_PCINT_V2DI_V4SI_INT,
1348         V4SI_FTYPE_V4SI_PCINT_V4DI_V4SI_INT,
1349         V16HI_FTYPE_V16HI_SI_COUNT, V16HI_FTYPE_V16HI_V8HI_COUNT,
1350         V8SI_FTYPE_V8SI_SI_COUNT, V8SI_FTYPE_V8SI_V4SI_COUNT,
1351         V4DI_FTYPE_V4DI_INT_COUNT, V4DI_FTYPE_V4DI_V2DI_COUNT,
1352         V4DI_FTYPE_V4DI_INT_CONVERT,
1353         V4DI_FTYPE_V4DI_V4DI_INT_CONVERT): New.
1354         * config/i386/i386.c (ix86_builtins): Add IX86_BUILTIN_MPSADBW256,
1355         IX86_BUILTIN_PABSB256, IX86_BUILTIN_PABSW256,
1356         IX86_BUILTIN_PABSD256, IX86_BUILTIN_PACKSSDW256,
1357         IX86_BUILTIN_PACKSSWB256, IX86_BUILTIN_PACKUSDW256,
1358         IX86_BUILTIN_PACKUSWB256, IX86_BUILTIN_PADDB256,
1359         IX86_BUILTIN_PADDW256, IX86_BUILTIN_PADDD256,
1360         IX86_BUILTIN_PADDQ256, IX86_BUILTIN_PADDSB256,
1361         IX86_BUILTIN_PADDSW256, IX86_BUILTIN_PADDUSB256,
1362         IX86_BUILTIN_PADDUSW256, IX86_BUILTIN_PALIGNR256,
1363         IX86_BUILTIN_AND256I, IX86_BUILTIN_ANDNOT256I,
1364         IX86_BUILTIN_PAVGB256, IX86_BUILTIN_PAVGW256,
1365         IX86_BUILTIN_PBLENDVB256, IX86_BUILTIN_PBLENDVW256,
1366         IX86_BUILTIN_PCMPEQB256, IX86_BUILTIN_PCMPEQW256,
1367         IX86_BUILTIN_PCMPEQD256, IX86_BUILTIN_PCMPEQQ256,
1368         IX86_BUILTIN_PCMPGTB256, IX86_BUILTIN_PCMPGTW256,
1369         IX86_BUILTIN_PCMPGTD256, IX86_BUILTIN_PCMPGTQ256,
1370         IX86_BUILTIN_PHADDW256, IX86_BUILTIN_PHADDD256,
1371         IX86_BUILTIN_PHADDSW256, IX86_BUILTIN_PHSUBW256,
1372         IX86_BUILTIN_PHSUBD256, IX86_BUILTIN_PHSUBSW256,
1373         IX86_BUILTIN_PMADDUBSW256, IX86_BUILTIN_PMADDWD256,
1374         IX86_BUILTIN_PMAXSB256, IX86_BUILTIN_PMAXSW256,
1375         IX86_BUILTIN_PMAXSD256, IX86_BUILTIN_PMAXUB256,
1376         IX86_BUILTIN_PMAXUW256, IX86_BUILTIN_PMAXUD256,
1377         IX86_BUILTIN_PMINSB256, IX86_BUILTIN_PMINSW256,
1378         IX86_BUILTIN_PMINSD256, IX86_BUILTIN_PMINUB256,
1379         IX86_BUILTIN_PMINUW256, IX86_BUILTIN_PMINUD256,
1380         IX86_BUILTIN_PMOVMSKB256, IX86_BUILTIN_PMOVSXBW256,
1381         IX86_BUILTIN_PMOVSXBD256, IX86_BUILTIN_PMOVSXBQ256,
1382         IX86_BUILTIN_PMOVSXWD256, IX86_BUILTIN_PMOVSXWQ256,
1383         IX86_BUILTIN_PMOVSXDQ256, IX86_BUILTIN_PMOVZXBW256,
1384         IX86_BUILTIN_PMOVZXBD256, IX86_BUILTIN_PMOVZXBQ256,
1385         IX86_BUILTIN_PMOVZXWD256, IX86_BUILTIN_PMOVZXWQ256,
1386         IX86_BUILTIN_PMOVZXDQ256, IX86_BUILTIN_PMULDQ256,
1387         IX86_BUILTIN_PMULHRSW256, IX86_BUILTIN_PMULHUW256,
1388         IX86_BUILTIN_PMULHW256, IX86_BUILTIN_PMULLW256,
1389         IX86_BUILTIN_PMULLD256, IX86_BUILTIN_PMULUDQ256,
1390         IX86_BUILTIN_POR256, IX86_BUILTIN_PSADBW256,
1391         IX86_BUILTIN_PSHUFB256, IX86_BUILTIN_PSHUFD256,
1392         IX86_BUILTIN_PSHUFHW256, IX86_BUILTIN_PSHUFLW256,
1393         IX86_BUILTIN_PSIGNB256, IX86_BUILTIN_PSIGNW256,
1394         IX86_BUILTIN_PSIGND256, IX86_BUILTIN_PSLLDQI256,
1395         IX86_BUILTIN_PSLLWI256, IX86_BUILTIN_PSLLW256,
1396         IX86_BUILTIN_PSLLDI256, IX86_BUILTIN_PSLLD256,
1397         IX86_BUILTIN_PSLLQI256, IX86_BUILTIN_PSLLQ256,
1398         IX86_BUILTIN_PSRAWI256, IX86_BUILTIN_PSRAW256,
1399         IX86_BUILTIN_PSRADI256, IX86_BUILTIN_PSRAD256,
1400         IX86_BUILTIN_PSRLDQI256, IX86_BUILTIN_PSRLWI256,
1401         IX86_BUILTIN_PSRLW256, IX86_BUILTIN_PSRLDI256,
1402         IX86_BUILTIN_PSRLD256, IX86_BUILTIN_PSRLQI256,
1403         IX86_BUILTIN_PSRLQ256, IX86_BUILTIN_PSUBB256,
1404         IX86_BUILTIN_PSUBW256, IX86_BUILTIN_PSUBD256,
1405         IX86_BUILTIN_PSUBQ256, IX86_BUILTIN_PSUBSB256,
1406         IX86_BUILTIN_PSUBSW256, IX86_BUILTIN_PSUBUSB256,
1407         IX86_BUILTIN_PSUBUSW256, IX86_BUILTIN_PUNPCKHBW256,
1408         IX86_BUILTIN_PUNPCKHWD256, IX86_BUILTIN_PUNPCKHDQ256,
1409         IX86_BUILTIN_PUNPCKHQDQ256, IX86_BUILTIN_PUNPCKLBW256,
1410         IX86_BUILTIN_PUNPCKLWD256, IX86_BUILTIN_PUNPCKLDQ256,
1411         IX86_BUILTIN_PUNPCKLQDQ256, IX86_BUILTIN_PXOR256,
1412         IX86_BUILTIN_MOVNTDQA256, IX86_BUILTIN_VBROADCASTSS_PS,
1413         IX86_BUILTIN_VBROADCASTSS_PS256,
1414         IX86_BUILTIN_VBROADCASTSD_PD256,
1415         IX86_BUILTIN_VBROADCASTSI256, IX86_BUILTIN_PBLENDD256,
1416         IX86_BUILTIN_PBLENDD128, IX86_BUILTIN_PBROADCASTB256,
1417         IX86_BUILTIN_PBROADCASTW256, IX86_BUILTIN_PBROADCASTD256,
1418         IX86_BUILTIN_PBROADCASTQ256, IX86_BUILTIN_PBROADCASTB128,
1419         IX86_BUILTIN_PBROADCASTW128, IX86_BUILTIN_PBROADCASTD128,
1420         IX86_BUILTIN_PBROADCASTQ128, IX86_BUILTIN_VPERMVARSI256,
1421         IX86_BUILTIN_VPERMDF256, IX86_BUILTIN_VPERMVARSF256,
1422         IX86_BUILTIN_VPERMDI256, IX86_BUILTIN_VPERMTI256,
1423         IX86_BUILTIN_VEXTRACT128I256, IX86_BUILTIN_VINSERT128I256,
1424         IX86_BUILTIN_MASKLOADD, IX86_BUILTIN_MASKLOADQ,
1425         IX86_BUILTIN_MASKLOADD256, IX86_BUILTIN_MASKLOADQ256,
1426         IX86_BUILTIN_MASKSTORED, IX86_BUILTIN_MASKSTOREQ,
1427         IX86_BUILTIN_MASKSTORED256, IX86_BUILTIN_MASKSTOREQ256,
1428         IX86_BUILTIN_PSLLVV4DI, IX86_BUILTIN_PSLLVV2DI,
1429         IX86_BUILTIN_PSLLVV8SI, IX86_BUILTIN_PSLLVV4SI,
1430         IX86_BUILTIN_PSRAVV8SI, IX86_BUILTIN_PSRAVV4SI,
1431         IX86_BUILTIN_PSRLVV4DI, IX86_BUILTIN_PSRLVV2DI,
1432         IX86_BUILTIN_PSRLVV8SI, IX86_BUILTIN_PSRLVV4SI,
1433         IX86_BUILTIN_GATHERSIV2DF, IX86_BUILTIN_GATHERSIV4DF,
1434         IX86_BUILTIN_GATHERDIV2DF, IX86_BUILTIN_GATHERDIV4DF,
1435         IX86_BUILTIN_GATHERSIV4SF, IX86_BUILTIN_GATHERSIV8SF,
1436         IX86_BUILTIN_GATHERDIV4SF, IX86_BUILTIN_GATHERDIV8SF,
1437         IX86_BUILTIN_GATHERSIV2DI, IX86_BUILTIN_GATHERSIV4DI,
1438         IX86_BUILTIN_GATHERDIV2DI, IX86_BUILTIN_GATHERDIV4DI,
1439         IX86_BUILTIN_GATHERSIV4SI, IX86_BUILTIN_GATHERSIV8SI,
1440         IX86_BUILTIN_GATHERDIV4SI, IX86_BUILTIN_GATHERDIV8SI.
1441         (bdesc_special_args): Add IX86_BUILTIN_MOVNTDQA256,
1442         IX86_BUILTIN_MASKLOADD, IX86_BUILTIN_MASKLOADQ,
1443         IX86_BUILTIN_MASKLOADD256, IX86_BUILTIN_MASKLOADQ256,
1444         IX86_BUILTIN_MASKSTORED, IX86_BUILTIN_MASKSTOREQ,
1445         IX86_BUILTIN_MASKSTORED256, IX86_BUILTIN_MASKSTOREQ256.
1446         (bdesc_args): Add  IX86_BUILTIN_MPSADBW256,
1447         IX86_BUILTIN_PABSB256, IX86_BUILTIN_PABSW256,
1448         IX86_BUILTIN_PABSD256, IX86_BUILTIN_PACKSSDW256,
1449         IX86_BUILTIN_PACKSSWB256, IX86_BUILTIN_PACKUSDW256,
1450         IX86_BUILTIN_PACKUSWB256, IX86_BUILTIN_PADDB256,
1451         IX86_BUILTIN_PADDW256, IX86_BUILTIN_PADDD256,
1452         IX86_BUILTIN_PADDQ256, IX86_BUILTIN_PADDSB256,
1453         IX86_BUILTIN_PADDSW256, IX86_BUILTIN_PADDUSB256,
1454         IX86_BUILTIN_PADDUSW256, IX86_BUILTIN_PALIGNR256,
1455         IX86_BUILTIN_AND256I, IX86_BUILTIN_ANDNOT256I,
1456         IX86_BUILTIN_PAVGB256, IX86_BUILTIN_PAVGW256,
1457         IX86_BUILTIN_PBLENDVB256, IX86_BUILTIN_PBLENDVW256,
1458         IX86_BUILTIN_PCMPEQB256, IX86_BUILTIN_PCMPEQW256,
1459         IX86_BUILTIN_PCMPEQD256, IX86_BUILTIN_PCMPEQQ256,
1460         IX86_BUILTIN_PCMPGTB256, IX86_BUILTIN_PCMPGTW256,
1461         IX86_BUILTIN_PCMPGTD256, IX86_BUILTIN_PCMPGTQ256,
1462         IX86_BUILTIN_PHADDW256, IX86_BUILTIN_PHADDD256,
1463         IX86_BUILTIN_PHADDSW256, IX86_BUILTIN_PHSUBW256,
1464         IX86_BUILTIN_PHSUBD256, IX86_BUILTIN_PHSUBSW256,
1465         IX86_BUILTIN_PMADDUBSW256, IX86_BUILTIN_PMADDWD256,
1466         IX86_BUILTIN_PMAXSB256, IX86_BUILTIN_PMAXSW256,
1467         IX86_BUILTIN_PMAXSD256, IX86_BUILTIN_PMAXUB256,
1468         IX86_BUILTIN_PMAXUW256, IX86_BUILTIN_PMAXUD256,
1469         IX86_BUILTIN_PMINSB256, IX86_BUILTIN_PMINSW256,
1470         IX86_BUILTIN_PMINSD256, IX86_BUILTIN_PMINUB256,
1471         IX86_BUILTIN_PMINUW256, IX86_BUILTIN_PMINUD256,
1472         IX86_BUILTIN_PMOVMSKB256, IX86_BUILTIN_PMOVSXBW256,
1473         IX86_BUILTIN_PMOVSXBD256, IX86_BUILTIN_PMOVSXBQ256,
1474         IX86_BUILTIN_PMOVSXWD256, IX86_BUILTIN_PMOVSXWQ256,
1475         IX86_BUILTIN_PMOVSXDQ256, IX86_BUILTIN_PMOVZXBW256,
1476         IX86_BUILTIN_PMOVZXBD256, IX86_BUILTIN_PMOVZXBQ256,
1477         IX86_BUILTIN_PMOVZXWD256, IX86_BUILTIN_PMOVZXWQ256,
1478         IX86_BUILTIN_PMOVZXDQ256, IX86_BUILTIN_PMULDQ256,
1479         IX86_BUILTIN_PMULHRSW256, IX86_BUILTIN_PMULHUW256,
1480         IX86_BUILTIN_PMULHW256, IX86_BUILTIN_PMULLW256,
1481         IX86_BUILTIN_PMULLD256, IX86_BUILTIN_PMULUDQ256,
1482         IX86_BUILTIN_POR256, IX86_BUILTIN_PSADBW256,
1483         IX86_BUILTIN_PSHUFB256, IX86_BUILTIN_PSHUFD256,
1484         IX86_BUILTIN_PSHUFHW256, IX86_BUILTIN_PSHUFLW256,
1485         IX86_BUILTIN_PSIGNB256, IX86_BUILTIN_PSIGNW256,
1486         IX86_BUILTIN_PSIGND256, IX86_BUILTIN_PSLLDQI256,
1487         IX86_BUILTIN_PSLLWI256, IX86_BUILTIN_PSLLW256,
1488         IX86_BUILTIN_PSLLDI256, IX86_BUILTIN_PSLLD256,
1489         IX86_BUILTIN_PSLLQI256, IX86_BUILTIN_PSLLQ256,
1490         IX86_BUILTIN_PSRAWI256, IX86_BUILTIN_PSRAW256,
1491         IX86_BUILTIN_PSRADI256, IX86_BUILTIN_PSRAD256,
1492         IX86_BUILTIN_PSRLDQI256, IX86_BUILTIN_PSRLWI256,
1493         IX86_BUILTIN_PSRLW256, IX86_BUILTIN_PSRLDI256,
1494         IX86_BUILTIN_PSRLD256, IX86_BUILTIN_PSRLQI256,
1495         IX86_BUILTIN_PSRLQ256, IX86_BUILTIN_PSUBB256,
1496         IX86_BUILTIN_PSUBW256, IX86_BUILTIN_PSUBD256,
1497         IX86_BUILTIN_PSUBQ256, IX86_BUILTIN_PSUBSB256,
1498         IX86_BUILTIN_PSUBSW256, IX86_BUILTIN_PSUBUSB256,
1499         IX86_BUILTIN_PSUBUSW256, IX86_BUILTIN_PUNPCKHBW256,
1500         IX86_BUILTIN_PUNPCKHWD256, IX86_BUILTIN_PUNPCKHDQ256,
1501         IX86_BUILTIN_PUNPCKHQDQ256, IX86_BUILTIN_PUNPCKLBW256,
1502         IX86_BUILTIN_PUNPCKLWD256, IX86_BUILTIN_PUNPCKLDQ256,
1503         IX86_BUILTIN_PUNPCKLQDQ256, IX86_BUILTIN_PXOR256,
1504         IX86_BUILTIN_VBROADCASTSS_PS, IX86_BUILTIN_VBROADCASTSS_PS256,
1505         IX86_BUILTIN_VBROADCASTSD_PD256,
1506         IX86_BUILTIN_VBROADCASTSI256, IX86_BUILTIN_PBLENDD256,
1507         IX86_BUILTIN_PBLENDD128, IX86_BUILTIN_PBROADCASTB256,
1508         IX86_BUILTIN_PBROADCASTW256, IX86_BUILTIN_PBROADCASTD256,
1509         IX86_BUILTIN_PBROADCASTQ256, IX86_BUILTIN_PBROADCASTB128,
1510         IX86_BUILTIN_PBROADCASTW128, IX86_BUILTIN_PBROADCASTD128,
1511         IX86_BUILTIN_PBROADCASTQ128, IX86_BUILTIN_VPERMVARSI256,
1512         IX86_BUILTIN_VPERMDF256, IX86_BUILTIN_VPERMVARSF256,
1513         IX86_BUILTIN_VPERMDI256, IX86_BUILTIN_VPERMTI256,
1514         IX86_BUILTIN_VEXTRACT128I256, IX86_BUILTIN_VINSERT128I256,
1515         IX86_BUILTIN_PSLLVV4DI, IX86_BUILTIN_PSLLVV2DI,
1516         IX86_BUILTIN_PSLLVV8SI, IX86_BUILTIN_PSLLVV4SI,
1517         IX86_BUILTIN_PSRAVV8SI, IX86_BUILTIN_PSRAVV4SI,
1518         IX86_BUILTIN_PSRLVV4DI, IX86_BUILTIN_PSRLVV2DI,
1519         IX86_BUILTIN_PSRLVV8SI, IX86_BUILTIN_PSRLVV4SI.
1520         (ix86_init_mmx_sse_builtins): Add IX86_BUILTIN_GATHERSIV2DF,
1521         IX86_BUILTIN_GATHERSIV4DF, IX86_BUILTIN_GATHERDIV2DF,
1522         IX86_BUILTIN_GATHERDIV4DF, IX86_BUILTIN_GATHERSIV4SF,
1523         IX86_BUILTIN_GATHERSIV8SF, IX86_BUILTIN_GATHERDIV4SF,
1524         IX86_BUILTIN_GATHERDIV8SF, IX86_BUILTIN_GATHERSIV2DI,
1525         IX86_BUILTIN_GATHERSIV4DI, IX86_BUILTIN_GATHERDIV2DI,
1526         IX86_BUILTIN_GATHERDIV4DI, IX86_BUILTIN_GATHERSIV4SI,
1527         IX86_BUILTIN_GATHERSIV8SI, IX86_BUILTIN_GATHERDIV4SI,
1528         IX86_BUILTIN_GATHERDIV8SI.
1529         (ix86_preferred_simd_mode): Support AVX2 modes.
1530         (ix86_expand_args_builtin): Support AVX2 builtins.
1531         (ix86_expand_special_args_builtin): Likewise.
1532         (ix86_expand_builtin): Likewise.
1533         * config/i386/i386.md (UNSPEC_VPERMSI): New.
1534         (UNSPEC_VPERMDF): Likewise.
1535         (UNSPEC_VPERMSF): Likewise.
1536         (UNSPEC_VPERMDI): Likewise.
1537         (UNSPEC_VPERMTI): Likewise.
1538         (UNSPEC_GATHER): Likewise.
1539         (ssemodesuffix): Extend.
1540         * config/i386/immintrin.h: Include avx2intrin.h when __AVX2__
1541         is defined.
1542         * config/i386/predicates.md (const1248_operand): New.
1543         * config/i386/sse.md (VI1_AVX2): New mode iterator.
1544         (VI2_AVX2): Likewise.
1545         (VI4_AVX2): Likewise.
1546         (VI8_AVX2): Likewise.
1547         (VIMAX_AVX2): Likewise.
1548         (SSESCALARMODE): Likewise.
1549         (VI12_AVX2): Likewise.
1550         (VI24_AVX2): Likewise.
1551         (VI124_AVX2): Likewise.
1552         (VI248_AVX2): Likewise.
1553         (VI48_AVX2): Likewise.
1554         (VI4SD_AVX2): Likewise.
1555         (V48_AVX2): Likewise.
1556         (AVX256MODE2P): Likewise.
1557         (AVXMODE48P_DI): Likewise.
1558         (sse2_avx2): New mode attribute.
1559         (ssse3_avx2): Likewise.
1560         (sse4_1_avx2): Likewise.
1561         (avx_avx2): Likewise.
1562         (ssebytemode): Likewise.
1563         (AVXTOSSEMODE): Likewise.
1564         (AVXMODE48P_DI): Likewise.
1565         (gthrfirstp): Likewise.
1566         (gthrlastp): Likewise.
1567         (lshift): New code_iterator
1568         (lshift): New code attribute.
1569         (lshift): Likewise.
1570         (ssescalarmodesuffix): Update.
1571         (sseunpackmode): Likewise.
1572         (ssepackmode): Likewise.
1573         (avx2_vec_dupv4sf): New insn pattern.
1574         (avx2_vec_dupv8sf): Likewise.
1575         (avx2_interleave_highv4di): Likewise.
1576         (avx2_interleave_lowv4di): Likewise.
1577         (avx2_umulv4siv4di3): Likewise
1578         (*avx2_umulv4siv4di3): Likewise
1579         (avx2_pmaddwd): Likewise.
1580         (*avx2_pmaddwd): Likewise.
1581         (avx2_lshrqv4di3): Likewise.
1582         (avx2_lshlqv4di3): Likewise.
1583         (avx2_lshl<mode>3): Likewise.
1584         (avx2_<umaxmin:code><mode>3): Likewise.
1585         (*avx2_<umaxmin:code><mode>3): Likewise.
1586         (avx2_<smaxmin:code><mode>3): Likewise.
1587         (*avx2_<smaxmin:code><mode>3): Likewise.
1588         (avx2_eq<mode>3): Likewise.
1589         (*avx2_eq<mode>3): Likewise.
1590         (avx2_gt<mode>3): Likewise.
1591         (avx2_interleave_highv32qi): New.
1592         (avx2_interleave_lowv32qi): Likewise.
1593         (avx2_interleave_highv16hi): Likewise.
1594         (avx2_interleave_lowv16hi): Likewise.
1595         (avx2_interleave_highv8si): Likewise.
1596         (avx2_interleave_lowv8si): Likewise.
1597         (avx2_pshufd): Likewise.
1598         (avx2_pshufd_1): Likewise.
1599         (avx2_pshuflwv3): Likewise.
1600         (avx2_pshuflw_1): Likewise.
1601         (avx2_pshufhwv3): Likewise.
1602         (avx2_pshufhw_1): Likewise.
1603         (avx2_uavgv32qi3): Likewise.
1604         (*avx2_uavgv32qi3): Likewise.
1605         (avx2_uavgv16hi3): Likewise.
1606         (*avx2_uavgv16hi3): Likewise.
1607         (avx2_pmovmskb): Likewise.
1608         (avx2_phaddwv16hi3): Likewise.
1609         (avx2_phadddv8si3): Likewise.
1610         (avx2_phaddswv16hi3): Likewise.
1611         (avx2_phsubwv16hi3): Likewise.
1612         (avx2_phsubdv8si3): Likewise.
1613         (avx2_phsubswv16hi3): Likewise.
1614         (avx2_pmaddubsw256): Likewise.
1615         (avx2_umulhrswv16hi3): Likewise.
1616         (*avx2_umulhrswv16hi3): Likewise.
1617         (avx2_packusdw): Likewise.
1618         (avx2_pblendd<mode>): Likewise.
1619         (avx2_<code>v16qiv16hi2): Likewise.
1620         (avx2_<code>v8qiv8si2): Likewise.
1621         (avx2_<code>v8hiv8si2): Likewise.
1622         (avx2_<code>v4qiv4di2): Likewise.
1623         (avx2_<code>v4hiv4di2): Likewise.
1624         (avx2_<code>v4siv4di2): Likewise.
1625         (avx2_pbroadcast<mode>): Likewise.
1626         (avx2_permvarv8si): Likewise.
1627         (avx2_permv4df): Likewise.
1628         (avx2_permvarv8sf): Likewise.
1629         (avx2_permv4di): Likewise.
1630         (avx2_permv2ti): Likewise.
1631         (avx2_vec_dupv4df): Likewise.
1632         (avx2_vbroadcasti128_<mode>): Likewise.
1633         (avx2_vec_set_lo_v4di): Likewise.
1634         (avx2_vec_set_hi_v4di): Likewise.
1635         (*avx2_maskmov<avx2modesuffix><avxmodesuffix>): Likewise.
1636         (avx2_extracti128): Likewise.
1637         (avx2_inserti128): Likewise.
1638         (avx2_ashrvv8si): Likewise.
1639         (avx2_ashrvv4si): Likewise.
1640         (avx2_<lshift>vv8si): Likewise.
1641         (avx2_<lshift>v<mode>): Likewise.
1642         (avx2_<lshift>vv2di): Likewise.
1643         (avx2_gathersi<mode>): Likewise.
1644         (*avx2_gathersi<mode>): Likewise.
1645         (avx2_gatherdi<mode>): Likewise.
1646         (*avx2_gatherdi<mode>): Likewise.
1647         (avx2_gatherdi<mode>256): Likewise.
1648         (*avx2_gatherdi<mode>256): Likewise.
1649         (<plusminus_insn><mode>3): Use VI mode iterator.
1650         (*<plusminus_insn><mode>3): Use VI mode iterator.
1651         (<sse2_avx2>_<plusminus_insn><mode>3): Rename from
1652         sse2_<plusminus_insn><mode>3.  Use VI12_AVX2 mode iterator.
1653         (*<sse2_avx2>_<plusminus_insn><mode>3): Rename from
1654         *sse2_<plusminus_insn><mode>3.  Use VI12_AVX2 mode iterator.
1655         (mul<mode>3): Rename from mulv8hi3.  Use VI2_AVX2 mode iterator.
1656         (*mul<mode>3): Rename from *mulv8hi3.  Use VI2_AVX2 mode iterator.
1657         (<s>mul<mode>3_highpart): Rename from <s>mulv8hi3_highpart.
1658         Use VI2_AVX2 mode iterator.
1659         (*<s>mul<mode>3_highpart): Rename from *<s>mulv8hi3_highpart.
1660         Use VI2_AVX2 mode iterator.
1661         (mul<mode>3): Rename from mulv4si3.  Use VI4_AVX2 mode iterator.
1662         (*mul<mode>3): Rename from *mulv4si3.  Use VI4_AVX2 mode iterator.
1663         (*<sse4_1_avx2>_mulv2siv2di3): Rename from *sse4_1_mulv4si3.
1664         Use VI4_AVX2 mode iterator.
1665         (ashr<mode>3): Use VI24_AVX2 mode iterator.
1666         (lshr<mode>3): Use VI248_AVX2 mode iterator.
1667         (<sse2_avx2>_ashl<mode>3): Rename from sse2_ashlv1ti3.
1668         Use VIMAX_AVX2 mode iterator.
1669         (<sse2_avx2>_andnot<mode>3): Rename from sse2_andnot<mode>3.
1670         Use VI mode iterator.
1671         (*andnot<mode>3): Update for AVX2.
1672         (*<any_logic:code><mode>3): Likewise.
1673         (<sse2_avx2>_packsswb): Rename from sse2_packsswb.
1674         Use VI1_AVX mode iterator.
1675         (<sse2_avx2>_packssdw):  Rename from sse2_packssdw.
1676         Use VI2_AVX mode iterator.
1677         (<sse2_avx2>_packuswb): Rename from sse2_packsswb.
1678         Use VI1_AVX mode iterator.
1679         (<sse2_avx2>_psadbw): Rename from sse2_psadbw.
1680         Use VI8_AVX2 mode iterator.
1681         (<ssse3_avx2>_pshufb<mode>3): Rename from ssse3_pshufbv16qi3.
1682         Use VI1_AVX2 mode iterator.
1683         (<ssse3_avx2>_psign<mode>3): Rename from ssse3_psign<mode>3.
1684         Use VI124_AVX2 mode iterator.
1685         (<ssse3_avx2>_palignr<mode>): Rename from ssse3_palignrti.
1686         Use SSESCALARMODE mode iterator.
1687         (abs<mode>2): Use VI124_AVX2 mode iterator.
1688         (<sse4_1_avx2>_movntdqa): Rename from sse4_1_movntdqa.
1689         Use VI8_AVX2 mode iterator.
1690         (<sse4_1_avx2>_mpsadbw): Rename from sse4_1_mpsadbw.
1691         Use VI1_AVX2 mode iterator.
1692         (<sse4_1_avx2>_pblendvb): Rename from sse4_1_pblendvb.
1693         Use VI1_AVX2 mode iterator.
1694         (<sse4_1_avx2>_pblendw): Rename from sse4_1_pblendvb.
1695         Use VI2_AVX2 mode iterator.
1696         (<avx_avx2>_maskload<avx2modesuffix><avxmodesuffix>): Rename from
1697         avx_maskload<ssemodesuffix><avxsizesuffix>. Use V48_AVX2 mode iterator.
1698         (<avx_avx2>_maskstore<avx2modesuffix><avxmodesuffix>): Rename from
1699         avx_maskstore<ssemodesuffix><avxsizesuffix>.
1700         Use V48_AVX2 mode iterator.
1701         * doc/extend.texi: Document AVX2 built-in functions.
1702         * doc/invoke.texi: Document -mavx2.
1703
1704 2011-08-22  Matthias Klose <doko@debian.org>
1705
1706         Revert:
1707         2011-07-11  Arthur Loiret  <aloiret@debian.org>
1708                     Matthias Klose <doko@debian.org>
1709         * config/mips/t-linux64 (MULTILIB_DIRNAMES): Set to 'n32 . 64' if
1710         tm_defines contains MIPS_ABI_DEFAULT ABI_32, to follow the glibc
1711         convention.
1712         * config.gcc (tm_defines): Add MIPS_ABI_DEFAULT=ABI_32.
1713
1714 2011-08-22  Mikael Pettersson  <mikpe@it.uu.se>
1715
1716         PR bootstrap/50146
1717         * ira-color.c (assign_hard_reg): Move saved_nregs declaration
1718         to #ifndef HONOR_REG_ALLOC_ORDER block.
1719
1720 2011-08-21  Richard Henderson  <rth@redhat.com>
1721
1722         * rtl.h (INSN_ANNULLED_BRANCH_P): Only allow JUMP_INSN.
1723         * dwarf2cfi.c (scan_trace): Test JUMP_P before INSN_ANNULLED_BRANCH_P.
1724         * resource.c (next_insn_no_annul): Likewise.
1725         (mark_set_resources): Likewise.
1726         * reorg.c (delete_from_delay_slot): Likewise.
1727         (dbr_schedule, redundant_insn, try_merge_delay_insns): Likewise.
1728         (get_branch_condition): Test pc_rtx and LABEL_REF before dereferencing.
1729
1730 2011-08-21  Uros Bizjak  <ubizjak@gmail.com>
1731
1732         * config/i386/i386.md (any_div): Remove.
1733         (sgnprefix): Update for removal.
1734         (u): Ditto.
1735
1736 2011-08-20  Vladimir Makarov  <vmakarov@redhat.com>
1737
1738         * ira-lives.c (mark_pseudo_regno_subword_live): Use allocno class
1739         for ira_reg_class_max_nregs.  Increase pressure by 1.
1740         (mark_pseudo_regno_subword_dead): Use allocno class
1741         for ira_reg_class_max_nregs.
1742
1743 2011-08-20  Richard Henderson  <rth@redhat.com>
1744
1745         * config/c6x/eqd.c, config/c6x/eqf.c, config/c6x/ged.c,
1746         config/c6x/gef.c, config/c6x/gtd.c, config/c6x/gtf.c,
1747         config/c6x/led.c, config/c6x/lef.c, config/c6x/ltd.c,
1748         config/c6x/ltf.c: Adjust include path for soft-fp.
1749
1750 2011-08-20  H.J. Lu  <hongjiu.lu@intel.com>
1751
1752         PR other/46770
1753         * config.gcc (tm_file): Add initfini-array.h if
1754         .init_arrary/.fini_array are supported.
1755
1756         * crtstuff.c: Don't generate .ctors nor .dtors sections if
1757         USE_INITFINI_ARRAY is defined.
1758
1759         * output.h (default_elf_init_array_asm_out_constructor): New.
1760         (default_elf_fini_array_asm_out_destructor): Likewise.
1761         * varasm.c (elf_init_array_section): Likewise.
1762         (elf_fini_array_section): Likewise.
1763         (get_elf_initfini_array_priority_section): Likewise.
1764         (default_elf_init_array_asm_out_constructor): Likewise.
1765         (default_elf_fini_array_asm_out_destructor): Likewise.
1766
1767         * config/initfini-array.h: New.
1768
1769 2011-08-20  Richard Sandiford  <rdsandiford@googlemail.com>
1770
1771         * config/mips/mips.c (mips_class_max_nregs): Check that the mode is
1772         OK for ST_REGS and FP_REGS before taking those classes into account.
1773
1774 2011-08-20  Richard Sandiford  <rdsandiford@googlemail.com>
1775
1776         * config/mips/mips.c (mips_reorg_process_insns): Check for jumps
1777         before checking for annulled branches.
1778
1779 2011-08-20  Uros Bizjak  <ubizjak@gmail.com>
1780
1781         * config/i386/i386.c (ix86_binary_operator_ok): Use
1782         satisfies_constraint_L.
1783
1784 2011-08-20  Uros Bizjak  <ubizjak@gmail.com>
1785             Michael Matz  <matz@suse.de>
1786
1787         * config/i386/i386.c (ix86_expand_round_sse4): Expand as
1788         trunc (a + copysign (nextafter (0.5, 0.0), a)).
1789
1790 2011-08-20  Anatoly Sokolov  <aesok@post.ru>
1791
1792         * doc/tm.texi.in (PREFERRED_OUTPUT_RELOAD_CLASS): Remove.
1793         * doc/tm.texi: Regenerate.
1794         * targhooks.c (default_preferred_output_reload_class): Don't use
1795         PREFERRED_OUTPUT_RELOAD_CLASS macro.
1796         * system.h (PREFERRED_OUTPUT_RELOAD_CLASS): Poison.
1797
1798 2011-08-20  Jakub Jelinek  <jakub@redhat.com>
1799
1800         PR tree-optimization/48739
1801         * tree-ssa.c: Include cfgloop.h.
1802         (execute_update_addresses_taken): When updating ssa, if in loop closed
1803         SSA form, call rewrite_into_loop_closed_ssa instead of update_ssa.
1804         * Makefile.in (tree-ssa.o): Depend on $(CFGLOOP_H).
1805
1806 2011-08-19  Vladimir Makarov  <vmakarov@redhat.com>
1807
1808         PR rtl-optimization/49936
1809         * ira.c (ira_init_register_move_cost): Ignore too small subclasses
1810         for calculation of max register move costs.
1811
1812 2011-08-19  Joseph Myers  <joseph@codesourcery.com>
1813
1814         * c-parser.c (c_parser_postfix_expression): Convert operands of
1815         __builtin_complex to their semantic types.
1816
1817 2011-08-19  H.J. Lu  <hongjiu.lu@intel.com>
1818
1819         PR middle-end/49721
1820         * explow.c (convert_memory_address_addr_space): Also permute the
1821         conversion and addition of constant for zero-extend.
1822
1823 2011-08-19  Joseph Myers  <joseph@codesourcery.com>
1824
1825         * c-parser.c (c_parser_postfix_expression): Handle RID_BUILTIN_COMPLEX.
1826         * doc/extend.texi (__builtin_complex): Document.
1827
1828 2011-08-19  Andrew Stubbs  <ams@codesourcery.com>
1829
1830         * tree-ssa-math-opts.c (is_widening_mult_rhs_p): Handle constants
1831         beyond conversions.
1832         (convert_mult_to_widen): Convert constant inputs to the right type.
1833         (convert_plusminus_to_widen): Don't automatically reject inputs that
1834         are not an SSA_NAME.
1835         Convert constant inputs to the right type.
1836
1837 2011-08-19  Andrew Stubbs  <ams@codesourcery.com>
1838
1839         * tree-ssa-math-opts.c (convert_plusminus_to_widen): Convert add_rhs
1840         to the correct type.
1841
1842 2011-08-19  Andrew Stubbs  <ams@codesourcery.com>
1843
1844         * tree-ssa-math-opts.c (convert_mult_to_widen): Better handle
1845         unsigned inputs of different modes.
1846         (convert_plusminus_to_widen): Likewise.
1847
1848 2011-08-19  Andrew Stubbs  <ams@codesourcery.com>
1849
1850         * tree-ssa-math-opts.c (is_widening_mult_rhs_p): Add new argument
1851         'type'.
1852         Use 'type' from caller, not inferred from 'rhs'.
1853         Don't reject non-conversion statements. Do return lhs in this case.
1854         (is_widening_mult_p): Add new argument 'type'.
1855         Use 'type' from caller, not inferred from 'stmt'.
1856         Pass type to is_widening_mult_rhs_p.
1857         (convert_mult_to_widen): Pass type to is_widening_mult_p.
1858         (convert_plusminus_to_widen): Likewise.
1859
1860 2011-08-19  Andrew Stubbs  <ams@codesourcery.com>
1861
1862         * tree-ssa-math-opts.c (is_widening_mult_p): Remove FIXME.
1863         Ensure the the larger type is the first operand.
1864
1865 2011-08-19  Andrew Stubbs  <ams@codesourcery.com>
1866
1867         * tree-ssa-math-opts.c (convert_mult_to_widen): Convert
1868         unsupported unsigned multiplies to signed.
1869         (convert_plusminus_to_widen): Likewise.
1870
1871 2011-08-19  Andrew Stubbs  <ams@codesourcery.com>
1872
1873         * tree-ssa-math-opts.c (convert_plusminus_to_widen): Permit a single
1874         conversion statement separating multiply-and-accumulate.
1875
1876 2011-08-19  Richard Guenther  <rguenther@suse.de>
1877
1878         PR tree-optimization/50067
1879         * tree-data-ref.c (dr_analyze_indices): Simplify, strip MEM_REF
1880         offset only if we accounted for it.
1881
1882 2011-08-19  Andrew Stubbs  <ams@codesourcery.com>
1883
1884         * config/arm/arm.md (maddhidi4): Remove '*' from name.
1885         * expr.c (expand_expr_real_2): Use find_widening_optab_handler.
1886         * optabs.c (find_widening_optab_handler_and_mode): New function.
1887         (expand_widen_pattern_expr): Use find_widening_optab_handler.
1888         (expand_binop_directly): Likewise.
1889         (expand_binop): Likewise.
1890         * optabs.h (find_widening_optab_handler): New macro define.
1891         (find_widening_optab_handler_and_mode): New prototype.
1892         * tree-cfg.c (verify_gimple_assign_binary): Adjust WIDEN_MULT_EXPR
1893         type precision rules.
1894         (verify_gimple_assign_ternary): Likewise for WIDEN_MULT_PLUS_EXPR.
1895         * tree-ssa-math-opts.c (build_and_insert_cast): New function.
1896         (is_widening_mult_rhs_p): Allow widening by more than one mode.
1897         Explicitly disallow mis-matched input types.
1898         (convert_mult_to_widen): Use find_widening_optab_handler, and cast
1899         input types to fit the new handler.
1900         (convert_plusminus_to_widen): Likewise.
1901
1902 2011-08-19  Andrew Stubbs  <ams@codesourcery.com>
1903
1904         * expr.c (expand_expr_real_2): Use widening_optab_handler.
1905         * genopinit.c (optabs): Use set_widening_optab_handler for $N.
1906         (gen_insn): $N now means $a must be wider than $b, not consecutive.
1907         * optabs.c (widened_mode): New function.
1908         (expand_widen_pattern_expr): Use widening_optab_handler.
1909         (expand_binop_directly): Likewise.
1910         (expand_binop): Likewise.
1911         * optabs.h (widening_optab_handlers): New struct.
1912         (optab_d): New member, 'widening'.
1913         (widening_optab_handler): New function.
1914         (set_widening_optab_handler): New function.
1915         * tree-ssa-math-opts.c (convert_mult_to_widen): Use
1916         widening_optab_handler.
1917         (convert_plusminus_to_widen): Likewise.
1918
1919 2011-08-19  Joseph Myers  <joseph@codesourcery.com>
1920
1921         * c-decl.c (grokdeclarator): Diagnose _Noreturn for non-C1X if
1922         pedantic.
1923         * c-parser.c (c_parser_declspecs): Include _Noreturn in syntax comment.
1924         * ginclude/stdnoreturn.h (noreturn): Don't define for C++.
1925
1926 2011-08-19  Joseph Myers  <joseph@codesourcery.com>
1927
1928         * opth-gen.awk: Do not declare target save/restore structures and
1929         functions if IN_RTS defined.
1930
1931 2011-08-19  Matthew Gretton-Dann  <matthew.gretton-dann@arm.com>
1932
1933         PR target/49437
1934         * config/arm/arm.c (arm_output_epilogue): Properly handle epilogue
1935         when stack was realigned in interrupt handler prologue.
1936
1937 2011-08-18  Joseph Myers  <joseph@codesourcery.com>
1938
1939         * c-decl.c (shadow_tag_warned): Check for _Noreturn.
1940         (quals_from_declspecs): Assert _Noreturn not present.
1941         (grokdeclarator): Handle _Noreturn.
1942         (build_null_declspecs): Initialize noreturn_p.
1943         (declspecs_add_scspec): Handle RID_NORETURN.
1944         * c-parser.c (c_token_starts_declspecs, c_parser_declspecs)
1945         (c_parser_attributes): Handle RID_NORETURN.
1946         * c-tree.h (struct c_declspecs): Add noreturn_p.
1947         * ginclude/stdnoreturn.h: New.
1948         * Makefile.in (USER_H): Add stdnoreturn.h.
1949
1950 2011-08-18  Kirill Yukhin  <kirill.yukhin@intel.com>
1951
1952         * common/config/i386/i386-common.c (OPTION_MASK_ISA_AVX2_SET): New.
1953         (OPTION_MASK_ISA_AVX_UNSET): Update.
1954         (OPTION_MASK_ISA_AVX2_UNSET): New.
1955         (ix86_handle_option): Handle OPT_mavx2 case.
1956         * config/i386/cpuid.h (bit_AVX2): New.
1957         * config/i386/driver-i386.c (host_detect_local_cpu): Detect
1958         AVX2 feature.
1959         * config/i386/i386-c.c (ix86_target_macros_internal):
1960         Conditionally define __AVX2__.
1961         * config/i386/i386.c (ix86_option_override_internal): Define PTA_AVX2.
1962         Define "core-avx2" processor alias.  Handle avx2 option.
1963         (ix86_valid_target_attribute_inner_p): Handle avx2 option.
1964         * config/i386/i386.h (TARGET_AVX2): New.
1965         * config/i386/i386.opt (mavx2): New.
1966         * doc/invoke.texi: Document -mavx2.
1967
1968 2011-08-18  Vladimir Makarov  <vmakarov@redhat.com>
1969
1970         PR rtl-optimization/49890
1971         * ira-costs.c (setup_regno_cost_classes_by_aclass): Don't exclude
1972         subclasses of class which is superset of a pressure class.
1973
1974 2011-08-18  H.J. Lu  <hongjiu.lu@intel.com>
1975             Igor Zamyatin <igor.zamyatin@intel.com>
1976
1977         * config/i386/i386-c.c (ix86_target_macros_internal): Replace int
1978         with HOST_WIDE_INT for isa_flag.
1979         (ix86_pragma_target_parse): Replace int with HOST_WIDE_INT for
1980         isa variables.
1981
1982         * config/i386/i386.c (ix86_target_string): Replace int with
1983         HOST_WIDE_INT for isa.  Use HOST_WIDE_INT_PRINT to print isa.
1984         (ix86_target_opts): Replace int with HOST_WIDE_INT on mask.
1985         (pta_flags): Removed.
1986         (PTA_XXX): Redefined as (HOST_WIDE_INT_1 << X).
1987         (pta): Use HOST_WIDE_INT on flags.
1988         (builtin_isa): Use HOST_WIDE_INT on isa.
1989         (ix86_add_new_builtins): Likewise.
1990         (def_builtin): Use HOST_WIDE_INT on mask.
1991         (def_builtin_const): Likewise.
1992         (builtin_description): Likewise.
1993
1994         * config/i386/i386.opt (ix86_isa_flags): Replace int with
1995         HOST_WIDE_INT.
1996         (ix86_isa_flags_explicit): Likewise.
1997         (x_ix86_isa_flags_explicit): Likewise.
1998
1999 2011-08-17  Vladimir Makarov  <vmakarov@redhat.com>
2000
2001         PR rtl-optimization/50107
2002         * ira-int.h (ira_hard_reg_not_in_set_p): Remove.
2003         (ira_hard_reg_in_set_p): New.
2004
2005         * ira-color.c (calculate_saved_nregs): New.
2006         (assign_hard_reg): Use it.  Set up allocated_hard_reg_p for all
2007         hard regs.
2008         (allocno_reload_assign, fast_allocation): Use
2009         ira_hard_reg_set_intersection_p instead of
2010         ira_hard_reg_not_in_set_p.
2011
2012         * ira.c (setup_reg_renumber): Use
2013         ira_hard_reg_set_intersection_p instead of
2014         ira_hard_reg_not_in_set_p.
2015         (setup_allocno_assignment_flags, calculate_allocation_cost): Use
2016         ira_hard_reg_in_set_p instead of ira_hard_reg_not_in_set_p.
2017
2018         * ira-costs.c (ira_tune_allocno_costs): Use
2019         ira_hard_reg_set_intersection_p instead of
2020         ira_hard_reg_not_in_set_p.
2021
2022 2011-08-18  H.J. Lu  <hongjiu.lu@intel.com>
2023             Igor Zamyatin <igor.zamyatin@intel.com>
2024
2025         * hwint.h (HOST_WIDE_INT_1): New.
2026
2027         * opt-functions.awk (switch_bit_fields): Initialize the
2028         host_wide_int field.
2029         (host_wide_int_var_name): New.
2030         (var_type_struct): Check and return HOST_WIDE_INT.
2031
2032         * opt-read.awk: Handle HOST_WIDE_INT for "Variable".
2033
2034         * optc-save-gen.awk: Support HOST_WIDE_INT on var_target_other.
2035
2036         * opth-gen.awk: Use HOST_WIDE_INT_1 on HOST_WIDE_INT.  Properly
2037         check masks for HOST_WIDE_INT.
2038
2039         * opts-common.c (set_option): Support HOST_WIDE_INT flag_var.
2040         (option_enabled): Likewise.
2041         (get_option_state): Likewise.
2042
2043         * opts.h (cl_option): Add cl_host_wide_int.  Change var_value
2044         to HOST_WIDE_INT.
2045
2046 2011-08-18  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
2047             Marc Glisse  <marc.glisse@normalesup.org>
2048
2049         PR libstdc++-v3/1773
2050         * target.def (decl_mangling_context): New C++ hook.
2051         * doc/tm.texi: Regenerate.
2052         * config/sol2-cxx.c, config/sol2-stubs.c: New files.
2053         * config/sol2-protos.h: Group by source file.
2054         (solaris_cxx_decl_mangling_context): Declare.
2055         * config/sol2.h (TARGET_CXX_DECL_MANGLING_CONTEXT): Define.
2056         * config/t-sol2 (sol2-cxx.o, sol2-stubs.o): New targets.
2057         Use $<.
2058         * config.gcc (*-*-solaris2*): Add sol2-cxx.o to cxx_target_objs.
2059         Add sol2-stubs.o to extra_objs.
2060
2061 2011-08-18  Jakub Jelinek  <jakub@redhat.com>
2062
2063         PR target/50009
2064         * stor-layout.c (update_alignment_for_field): Don't ICE on
2065         packed flexible array members if ms_bitfield_layout_p.
2066
2067         PR target/50092
2068         * config/i386/i386.c (assign_386_stack_local): Call validize_mem
2069         on the result before returning it.
2070
2071         PR debug/50017
2072         * tree-vect-stmts.c (vect_finish_stmt_generation): If gsi_stmt (*gsi)
2073         is a debug stmt, use location of the first non-debug stmt after it.
2074
2075 2011-08-18  Richard Sandiford  <richard.sandiford@linaro.org>
2076
2077         * config/arm/arm.c (arm_rtx_costs_1): Don't modify the costs of SET.
2078         (arm_size_rtx_costs): Likewise.
2079
2080 2011-08-18  Richard Guenther  <rguenther@suse.de>
2081
2082         * tree.h (tree_int_cst_msb): Remove.
2083         * tree.c (tree_int_cst_msb): Likewise.
2084         (tree_int_cst_sign_bit): Move from ...
2085         * tree-ssa-loop-ivopts.c (tree_int_cst_sign_bit): ... here.
2086
2087 2011-08-18  Richard Sandiford  <richard.sandiford@linaro.org>
2088
2089         * doc/tm.texi.in (TARGET_RTX_COSTS): Add an opno paramter.
2090         * doc/tm.texi: Regenerate.
2091         * target.def (rtx_costs): Add an opno parameter.
2092         * hooks.h (hook_bool_rtx_int_int_intp_bool_false): Replace with...
2093         (hook_bool_rtx_int_int_int_intp_bool_false): ...this.
2094         * hooks.c (hook_bool_rtx_int_int_intp_bool_false): Replace with...
2095         (hook_bool_rtx_int_int_int_intp_bool_false): ...this.
2096         * cse.c (COST_IN): Add an opno parameter.
2097         (notreg_cost): Likewise.  Update call to rtx_cost.
2098         (COST, fold_rtx): Update accordingly.
2099         * dojump.c (prefer_and_bit_test): Update call to rtx_cost.
2100         * expmed.c (emit_store_flag): Likewise.
2101         * optabs.c (avoid_expensive_constant): Add an opno parameter.
2102         Update call to rtx_cost.
2103         (expand_binop_directly, expand_binop): Likewise.
2104         (expand_twoval_binop, prepare_cmp_insn): Likewise.
2105         * rtl.h (rtx_cost, get_full_rtx_cost): Add opno parameters.
2106         (set_src_cost, get_full_set_src_cost): Update accordingly.
2107         * rtlanal.c (rtx_cost): Add an opno parameter.  Update call
2108         to target hook.
2109         (get_full_rtx_cost): Add an opno paramter.  Update calls to rtx_cost.
2110         (default_adress_cost): Update calls to rtx_cost.
2111
2112         * config/arm/arm.c (arm_rtx_costs_1, arm_size_rtx_costs)
2113         (arm_slowmul_rtx_costs): Adjust calls to rtx_cost.
2114         (arm_rtx_costs): Add an opno parameter.
2115         * config/alpha/alpha.c (alpha_rtx_costs): Add an opno parameter and
2116         adjust any recursive rtx-cost calls.
2117         * config/avr/avr.c (avr_operand_rtx_cost, avr_rtx_costs): Likewise.
2118         * config/bfin/bfin.c (bfin_rtx_costs): Likewise.
2119         * config/c6x/c6x.c (c6x_rtx_costs): Likewise.
2120         * config/cris/cris.c (cris_rtx_costs): Likewise.
2121         * config/frv/frv.c (frv_rtx_costs): Likewise.
2122         * config/h8300/h8300.c (h8300_rtx_costs): Likewise.
2123         * config/i386/i386.c (ix86_rtx_costs): Likewise.
2124         * config/ia64/ia64.c (ia64_rtx_costs): Likewise.
2125         * config/iq2000/iq2000.c (iq2000_rtx_costs): Likewise.
2126         * config/lm32/lm32.c (lm32_rtx_costs): Likewise.
2127         * config/m32c/m32c.c (m32c_rtx_costs): Likewise.
2128         * config/m32r/m32r.c (m32r_rtx_costs): Likewise.
2129         * config/m68k/m68k.c (m68k_rtx_costs): Likewise.
2130         * config/mcore/mcore.c (mcore_rtx_costs): Likewise.
2131         * config/mep/mep.c (mep_rtx_cost): Likewise.
2132         * config/microblaze/microblaze.c (microblaze_rtx_costs): Likewise.
2133         * config/mips/mips.c (mips_binary_cost): Update call to rtx_cost.
2134         (mips_zero_extend_cost): Add an opno parameter.
2135         * config/mmix/mmix.c (mmix_rtx_costs): Likewise.
2136         * config/mn10300/mn10300.c (mn10300_address_cost): Update call
2137         to rtx_cost.
2138         (mn10300_rtx_costs): Add an opno parameter and adjust any recursive
2139         rtx-cost calls.
2140         * config/pa/pa.c (hppa_rtx_costs): Likewise.
2141         * config/pdp11/pdp11.c (pdp11_rtx_costs): Likewise.
2142         * config/picochip/picochip.c (picochip_rtx_costs): Likewise.
2143         * config/rs6000/rs6000.c (rs6000_rtx_costs): Likewise.
2144         (rs6000_debug_rtx_costs): Likewise.
2145         * config/s390/s390.c (s390_rtx_costs): Likewise.
2146         * config/score/score-protos.h (score_rtx_costs): Likewise.
2147         * config/score/score.c (score_rtx_costs): Likewise.
2148         * config/sh/sh.c (andcosts): Update call to rtx_cost.
2149         (sh_rtx_costs): Add an opno parameter.
2150         * config/sparc/sparc.c (sparc_rtx_costs): Likewise.
2151         * config/spu/spu.c (spu_rtx_costs): Likewise.
2152         * config/stormy16/stormy16.c (xstormy16_rtx_costs): Likewise.
2153         * config/v850/v850.c (v850_rtx_costs): Likewise.
2154         * config/vax/vax.c (vax_rtx_costs): Likewise.
2155         * config/xtensa/xtensa.c (xtensa_rtx_costs): Likewise.
2156
2157 2011-08-18  Richard Sandiford  <richard.sandiford@linaro.org>
2158
2159         * rtl.h (set_src_cost, get_full_set_src_cost): New functions.
2160         * auto-inc-dec.c (attempt_change): Use set_src_cost instead of
2161         rtx_cost.
2162         * calls.c (precompute_register_parameters): Likewise.
2163         * combine.c (expand_compound_operation, make_extraction): Likewise.
2164         (force_to_mode, distribute_and_simplify_rtx): Likewise.
2165         * dse.c (find_shift_sequence): Likewise.
2166         * expmed.c (init_expmed, expand_mult, expand_smod_pow2): Likewise.
2167         * expr.c (compress_float_constant): Likewise.
2168         * fwprop.c (should_replace_address, try_fwprop_subst): Likewise.
2169         * gcse.c (want_to_gcse_p): Likewise.
2170         * ifcvt.c (noce_try_sign_mask): Likewise.
2171         * loop-doloop.c (doloop_optimize): Likewise.
2172         * loop-invariant.c (create_new_invariant): Likewise.
2173         * optabs.c (avoid_expensive_constant): Likewise.
2174         * postreload.c (reload_cse_simplify_set, reload_cse_simplify_operands)
2175         (try_replace_in_use, reload_cse_move2add): Likewise.
2176         * reload1.c (calculate_elim_costs_all_insns): Likewise.
2177         (note_reg_elim_costly): Likewise.
2178         * rtlanal.c (insn_rtx_cost): Likewise.
2179         * simplify-rtx.c (simplify_binary_operation_1): Likewise.
2180         * stmt.c (lshift_cheap_p): Likewise.
2181         * tree-ssa-loop-ivopts.c (seq_cost, computation_cost): Likewise.
2182         * config/avr/avr.c (final_prescan_insn): Likewise.
2183         * config/bfin/bfin.c (bfin_rtx_costs): Likewise.
2184         * config/mips/mips.c (mips_binary_cost, mips_rtx_costs): Likewise.
2185
2186 2011-08-18  Richard Sandiford  <richard.sandiford@linaro.org>
2187
2188         * rtl.h (set_rtx_cost, get_full_set_rtx_cost): New functions.
2189         * auto-inc-dec.c (attempt_change): Use set_rtx_cost.
2190         * cfgloopanal.c (seq_cost): Likewise.
2191         * loop-invariant.c (create_new_invariant): Likewise.
2192         * postreload.c (move2add_use_add2_insn, move2add_use_add3_insn)
2193         (reload_cse_move2add): Use get_full_set_rtx_cost.
2194
2195 2011-08-18  Richard Guenther  <rguenther@suse.de>
2196
2197         * expr.c (get_inner_reference): Fix typo in last change.
2198
2199 2011-08-18  Paolo Carlini  <paolo.carlini@oracle.com>
2200             Joseph Myers  <joseph@codesourcery.com>
2201
2202         PR tree-optimization/49963
2203         * hwint.c (absu_hwi): Define.
2204         * hwint.h (absu_hwi): Declare.
2205         * fold-const.c (fold_plusminus_mult_expr): Use absu_hwi instead
2206         of abs_hwi.
2207         * tree-ssa-math-opts.c (gimple_expand_builtin_pow): Likewise.
2208         * tree-ssa-loop-prefetch.c (prune_ref_by_group_reuse): Likewise.
2209
2210 2011-08-18  Richard Guenther  <rguenther@suse.de>
2211
2212         * expr.c (get_inner_reference): Sign-extend the constant
2213         twos-complement offset before doing arbitrary precision
2214         arithmetic on it.
2215         * tree-ssa-structalias.c (get_constraint_for_ptr_offset): Likewise.
2216         (get_constraint_for_1): Pass the offset of a MEM_REF unchanged
2217         to get_constraint_for_ptr_offset.
2218
2219 2011-08-17  Kaz Kojima  <kkojima@gcc.gnu.org>
2220
2221         PR target/50068
2222         * config/sh/sh.c (sh_output_mi_thunk): Don't call dbr_schedule.
2223
2224 2011-08-17  Richard Guenther  <rguenther@suse.de>
2225
2226         * tree.h (convert_to_ptrofftype_loc): New function.
2227         (convert_to_ptrofftype): Define.
2228         * builtins.c (expand_builtin_bzero): Use size_type_node.
2229         (fold_builtin_bzero): Likewise.
2230         (std_gimplify_va_arg_expr): Build the BIT_AND_EXPR on the pointer.
2231         * c-typeck.c (build_unary_op): Use convert_to_ptrofftype_loc.
2232         * cgraphunit.c (thunk_adjust): Use fold_build_pointer_plus_loc.
2233         (cgraph_redirect_edge_call_stmt_to_callee): Use size_int.
2234         * expr.c (expand_expr_addr_expr_1): Use fold_build_pointer_plus.
2235         * fold-const.c (build_range_check): Negate using the original type.
2236         (fold_unary_loc): Use fold_build_pointer_plus_loc.
2237         * gimple-fold.c (gimple_adjust_this_by_delta): Use
2238         convert_to_ptrofftype.
2239         * gimplify.c (gimplify_self_mod_expr): Likewise.
2240         * graphite-clast-to-gimple.c (clast_to_gcc_expression): Likewise.
2241         (graphite_create_new_loop_guard): Likewise.
2242         * graphite-sese-to-poly.c (my_long_long): Remove.
2243         (scop_ivs_can_be_represented): Adjust.
2244         * tree-cfg.c (verify_gimple_assign_unary): Use ptrofftype_p.
2245         * tree-chrec.c (chrec_fold_plus_1): Use fold_build_pointer_plus.
2246         * tree-loop-distribution.c (build_size_arg_loc): Use
2247         size_type_node.
2248         (generate_memset_zero): Simplify.
2249         * tree-mudflap.c: Use fold_convert, not convert.
2250         * tree-predcom.c (suitable_reference_p): Expand DR_OFFSET in
2251         its own type.
2252         (determine_offset): Likewise for DR_STEP.
2253         (valid_initializer_p): Likewise.
2254         * tree-profile.c (prepare_instrumented_value): Convert the pointer
2255         to an integer type of same size.
2256         * tree-scalar-evolution.c (interpret_rhs_expr): Do not refer
2257         to sizetype without need.
2258         * tree-ssa-address.c (tree_mem_ref_addr): Likewise.
2259         * tree-ssa-loop-ivopts.c (find_bivs): Use convert_to_ptrofftype.
2260         * tree-ssa-loop-manip.c (create_iv): Likewise.
2261         (determine_exit_conditions): Adjust comment.
2262         * tree-ssa-pre.c (create_expression_by_pieces): Use
2263         convert_to_ptrofftype.
2264         * tree-ssa-structalias.c (get_constraint_for_1): Likewise.
2265         * varasm.c (array_size_for_constructor): Compute using double_ints.
2266
2267 2011-08-16  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
2268
2269         * config/spu/spu.c (spu_emit_branch_or_set): Avoid reverse tests
2270         when generating an integer result where possible.  Short-cut
2271         comparison against 0 also for QImode.
2272
2273 2011-08-16  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
2274
2275         * config/spu/spu.h (LEGITIMIZE_RELOAD_ADDRESS): New macro.
2276         * config/spu/spu-protos.h (spu_legitimize_reload_address): Add
2277         prototype.
2278         * config/spu/spu.c (spu_legitimize_reload_address): New function.
2279         (spu_legitimate_address_p): Do not check displacement if the base
2280         is an eliminable stack register.
2281
2282 2011-08-16  Anatoly Sokolov  <aesok@post.ru>
2283
2284         * config/m32c/m32c.h (PREFERRED_RELOAD_CLASS,
2285         PREFERRED_OUTPUT_RELOAD_CLASS): Remove macro.
2286         * config/m32c/m32c-protos.h (m32c_preferred_reload_class,
2287         m32c_preferred_output_reload_class): Remove.
2288         * config/m32c/m32c.c (m32c_preferred_reload_class): Make static.
2289         Change rclass argument and return types to reg_class_t. Use
2290         reg_class_subset_p instead of class_sizes.
2291         (m32c_preferred_output_reload_class): Make static. Change rclass
2292         argument and return types to reg_class_t.
2293         (TARGET_PREFERRED_RELOAD_CLASS,
2294         TARGET_PREFERRED_OUTPUT_RELOAD_CLASS): Define.
2295
2296 2011-08-16  Kai Tietz  <ktietz@redhat.com>
2297
2298         * config/i386/mingw32.h (GOMP_SELF_SPEC): Add -pthread option.
2299
2300 2011-08-16  Richard GUenther  <rguenther@suse.de>
2301
2302         PR tree-optimization/50082
2303         * tree-ssa-forwprop.c (combine_cond_expr_cond): Handle overflow
2304         warnings here, instead of ...
2305         (ssa_forward_propagate_and_combine): ... here.
2306         (forward_propagate_into_comparison_1): Adjust.
2307         (forward_propagate_into_comparison): Likewise.
2308         (forward_propagate_into_gimple_cond): Likewise.
2309         (forward_propagate_into_cond): Likewise.
2310
2311 2011-08-16  Andreas Schwab  <schwab@redhat.com>
2312
2313         * ggc.h (ggc_alloc_rtvec_sized): Use ggc_alloc_zone_rtvec_def
2314         instead of ggc_alloc_zone_vec_rtvec_def.
2315
2316 2011-08-16  Richard Guenther  <rguenther@suse.de>
2317
2318         * tree.h (ptrofftype_p): New helper function.
2319         * tree-cfg.c (verify_expr): Use ptrofftype_p for POINTER_PLUS_EXPR
2320         offset verification.
2321         (verify_gimple_assign_binary): Likewise.
2322         * tree.c (build2_stat): Likewise.
2323         * tree-chrec.c (chrec_fold_plus_poly_poly): Likewise.
2324         (reset_evolution_in_loop): Likewise.
2325         * tree-chrec.h (build_polynomial_chrec): Likewise.
2326
2327 2011-08-16  Liang Wang  <lwang1@marvell.com>
2328
2329         * ggc.h (ggc_alloc_rtvec_sized): Change arguments of
2330         ggc_alloc_zone_vec_rtvec_def.
2331
2332 2011-08-16  Richard Guenther  <rguenther@suse.de>
2333
2334         * tree-vrp.c (extract_range_from_multiplicative_op_1): New
2335         helper factored out from ...
2336         (extract_range_from_binary_expr_1): ... here.  Re-structure
2337         to not glob handling too different tree codes.
2338
2339 2011-08-15  Richard Henderson  <rth@redhat.com>
2340
2341         PR middle-end/50006
2342         * explow.c (allocate_dynamic_stack_space): Move suppress_reg_args_size
2343         setting out to include allocate_stack named pattern as well.
2344         * builtins.c (expand_builtin_apply): Add ARG_SIZE 0 note.
2345         * stmt.c (expand_stack_restore): Likewise.
2346
2347 2011-08-15  Richard Guenther  <rguenther@suse.de>
2348
2349         PR middle-end/50082
2350         * fold-const.c (maybe_canonicalize_comparison_1): Properly
2351         convert the modified operand to the other operand type.
2352         (fold_comparison): Call maybe_canonicalize_comparison_1 with
2353         useless conversions stripped from comparison operands.
2354
2355 2011-08-15  Richard Guenther  <rguenther@suse.de>
2356
2357         * tree-vrp.c (value_range_nonnegative_p): Fix anti-range case.
2358         (extract_range_from_unary_expr_1): Restructure.
2359
2360 2011-08-15  Richard Guenther  <rguenther@suse.de>
2361
2362         PR tree-optimization/50058
2363         * tree-ssa-sccvn.c (vn_reference_lookup_3): Relax aggregate
2364         copy matching.
2365
2366 2011-08-15  Ramana Radhakrishnan  <ramana.radhakrishnan@linaro.org>
2367
2368         PR target/50022
2369         * config/arm/arm.c (output_move_double): Add 2 parameters
2370         to count the number of insns emitted and whether to emit or not.
2371         Use the flag to decide when to emit and count number of instructions
2372         that will be emitted.
2373         Handle case where output_move_double might be called for calculating
2374         lengths with an invalid constant.
2375         (arm_count_output_move_double_insns): Define.
2376         * config/arm/arm-protos.h (arm_count_output_move_double_insns): Declare.
2377         (output_move_double): Adjust prototype.
2378         * config/arm/vfp.md ("*movdi_vfp"): Adjust call to
2379         output_move_double.
2380         ("*movdi_vfp_cortexa8"): Likewise and add attribute
2381         for ce_count.
2382         * config/arm/arm.md ("*arm_movdi"): Adjust call to output_move_double.
2383         ("*movdf_soft_insn"): Likewise.
2384         * config/arm/cirrus.md ("*cirrus_arm_movdi"): Likewise.
2385         ("*cirrus_thumb2_movdi"): Likewise.
2386         ("*thumb2_cirrus_movdf_hard_insn"): Likewise.
2387         ("*cirrus_movdf_hard_insn"): Likewise.
2388         * config/arm/neon.md (*neon_mov<mode> VD): Likewise.
2389         * config/arm/iwmmxt.md ("*iwmmxt_arm_movdi"): Likewise.
2390         ("mov<mode>_internal VMMX"): Likewise.
2391         * config/arm/fpa.md (*movdf_fpa, *thumb2_movdf_fpa): Likewise.
2392
2393 2011-08-14  Uros Bizjak  <ubizjak@gmail.com>
2394
2395         * config/i386/i386.c (ix86_expand_round_sse4): New function.
2396         * config/i386/i386-protos.h (ix86_expand_round_sse4): New prototype.
2397         * config/i386/i386.md (round<mode>2): Use ix86_expand_round_sse4
2398         for TARGET_ROUND.
2399
2400         (rint<mode>2): Simplify TARGET_ROUND check.
2401         (floor<mode>2): Ditto.
2402         (ceil<mode>2): Ditto.
2403         (btrunc<mode>2): Ditto.
2404
2405 2011-08-14  Anatoly Sokolov  <aesok@post.ru>
2406
2407         * config/mmix/mmix.c (TARGET_PREFERRED_OUTPUT_RELOAD_CLASS): Redefine
2408         as mmix_preferred_output_reload_class.
2409
2410 2011-08-14  Georg-Johann Lay  <avr@gjlay.de>
2411
2412         * PR target/49903
2413         * config/avr/avr.md (UNSPEC_IDENTITY): New c_enum.
2414         (branch_unspec): New insn.
2415         (branch): Beauty farm.
2416         * config/avr/avr.c (compare_condition): Use JUMP_P.  Test SET_SRC
2417         to be IF_THEN_ELSE.
2418         (avr_compare_pattern, avr_reorg_remove_redundant_compare):
2419         New static functions.
2420         (avr_reorg): Use them.  Use next_real_insn instead of NEXT_INSN.
2421         Use CONST_INT_P.  Beauty.
2422
2423 2011-08-12  Richard Henderson  <rth@redhat.com>
2424
2425         PR rtl-opt/49994
2426         * sched-init.h (struct deps_desc): Add sched_before_next_jump.
2427         * sched-deps.c (init_deps): Clear it.
2428         (deps_analyze_insn): Consume it.
2429         (sched_analyze_insn): Fill it.
2430
2431 2011-08-12  Ramana Radhakrishnan  <ramana.radhakrishnan@linaro.org>
2432
2433         PR target/48328
2434         * config/arm/arm.h (CASE_VECTOR_SHORTEN_MODE): Fix distance
2435         for tbh instructions.
2436
2437 2011-08-12  Diego Novillo  <dnovillo@google.com>
2438
2439         * data-streamer.h (streamer_write_zero): Rename from output_zero.
2440         (streamer_write_uhwi): Rename from lto_output_uleb128.
2441         (streamer_write_hwi): Rename from output_sleb128.
2442         (streamer_write_string): Rename from lto_output_string.
2443         (streamer_string_index): Rename from lto_string_index.
2444         (streamer_write_string_with_length): Rename from
2445         lto_output_string_with_length.
2446         (streamer_write_uhwi_stream): Rename from lto_output_uleb128_stream.
2447         (streamer_write_hwi_stream): Rename from lto_output_sleb128_stream.
2448         (streamer_read_string): Rename from lto_input_string.
2449         (streamer_read_indexed_string): Rename from input_string_internal.
2450         (streamer_read_uhwi): Rename from lto_input_uleb128.
2451         (streamer_read_hwi): Rename from lto_input_sleb128.
2452         (streamer_write_hwi_in_range): Rename from lto_output_int_in_range.
2453         (streamer_read_hwi_in_range): Rename from lto_input_int_in_range.
2454         (streamer_write_enum): Rename from lto_output_enum.
2455         (streamer_read_enum): Rename from lto_input_enum.
2456         (streamer_write_record_start): Rename from output_record_start.
2457         (streamer_read_record_start): Rename from input_record_start.
2458         (streamer_write_bitpack): Rename from lto_output_bitpack.
2459         (streamer_read_bitpack): Rename from lto_input_bitpack.
2460         (streamer_write_char_stream): Rename from lto_output_1_stream.
2461         (streamer_read_uchar): Rename from lto_input_1_unsigned.
2462         * tree-streamer.h (streamer_cache_d): Rename from lto_streamer_cache_d.
2463         (streamer_handle_as_builtin_p): Rename from lto_stream_as_builtin_p.
2464         (streamer_read_string_cst): Rename from input_string_cst.
2465         (streamer_read_chain): Rename from lto_input_chain.
2466         (streamer_alloc_tree): Rename from lto_materialize_tree.
2467         (streamer_read_tree_body): Rename from lto_input_tree_pointers.
2468         (streamer_get_pickled_tree): Rename from lto_get_pickled_tree.
2469         (streamer_get_builtin_tree): Rename from lto_get_builtin_tree.
2470         (streamer_read_integer_cst): Rename from lto_input_integer_cst.
2471         (streamer_read_tree_bitfields): Rename from tree_read_bitfields.
2472         (streamer_write_chain): Rename from lto_output_chain.
2473         (streamer_write_tree_header): Rename from lto_output_tree_header.
2474         (streamer_pack_tree_bitfields): Rename from pack_value_fields.
2475         (streamer_write_tree_body): Rename from lto_output_tree_pointers.
2476         (streamer_write_integer_cst): Rename from lto_output_integer_cst.
2477         (streamer_write_builtin): Rename from lto_output_builtin_tree.
2478         (streamer_check_handled_ts_structures): Rename from
2479         check_handled_ts_structures.
2480         (streamer_tree_cache_insert): Rename from lto_streamer_cache_insert.
2481         (streamer_tree_cache_insert_at): Rename from
2482         lto_streamer_cache_insert_at.
2483         (streamer_tree_cache_append): Rename from lto_streamer_cache_append.
2484         (streamer_tree_cache_lookup): Rename from lto_streamer_cache_lookup.
2485         (streamer_tree_cache_get): Rename from lto_streamer_cache_get.
2486         (streamer_tree_cache_create): Rename from lto_streamer_cache_create.
2487         (streamer_tree_cache_delete): Rename from lto_streamer_cache_delete.
2488         * tree-streamer-out.c (write_string_cst): Rename from output_string_cst.
2489         (write_identifier): Rename from output_identifier.
2490         (write_ts_common_tree_pointers): Rename from
2491         lto_output_ts_common_tree_pointers.
2492         (write_ts_vector_tree_pointers): Rename from
2493         lto_output_ts_vector_tree_pointers.
2494         (write_ts_complex_tree_pointers): Rename from
2495         lto_output_ts_complex_tree_pointers.
2496         (write_ts_decl_minimal_tree_pointers): Rename from
2497         lto_output_ts_decl_minimal_tree_pointers.
2498         (write_ts_decl_common_tree_pointers): Rename from
2499         lto_output_ts_decl_common_tree_pointers.
2500         (write_ts_decl_non_common_tree_pointers): Rename from
2501         lto_output_ts_decl_non_common_tree_pointers.
2502         (write_ts_decl_with_vis_tree_pointers): Rename from
2503         lto_output_ts_decl_with_vis_tree_pointers.
2504         (write_ts_field_decl_tree_pointers): Rename from
2505         lto_output_ts_field_decl_tree_pointers.
2506         (write_ts_function_decl_tree_pointers): Rename from
2507         lto_output_ts_function_decl_tree_pointers.
2508         (write_ts_type_common_tree_pointers): Rename from
2509         lto_output_ts_type_common_tree_pointers.
2510         (write_ts_type_non_common_tree_pointers): Rename from
2511         lto_output_ts_type_non_common_tree_pointers.
2512         (write_ts_list_tree_pointers): Rename from
2513         lto_output_ts_list_tree_pointers.
2514         (write_ts_vec_tree_pointers): Rename from
2515         lto_output_ts_vec_tree_pointers.
2516         (write_ts_exp_tree_pointers): Rename from
2517         lto_output_ts_exp_tree_pointers.
2518         (write_ts_block_tree_pointers): Rename from
2519         lto_output_ts_block_tree_pointers.
2520         (write_ts_binfo_tree_pointers): Rename from
2521         lto_output_ts_binfo_tree_pointers.
2522         (write_ts_constructor_tree_pointers): Rename from
2523         lto_output_ts_constructor_tree_pointers.
2524         (write_ts_target_option): Rename from lto_output_ts_target_option.
2525         (write_ts_translation_unit_decl_tree_pointers): Rename from
2526         lto_output_ts_translation_unit_decl_tree_pointers.
2527         * tree-streamer.c (streamer_tree_cache_add_to_node_array):
2528         Rename from lto_streamer_cache_add_to_node_array.
2529         (streamer_tree_cache_insert_1): Rename from lto_streamer_cache_insert_1.
2530         (record_common_node): Rename from lto_record_common_node.
2531
2532         * streamer-hooks.h (bitpack_d, lto_streamer_cache_d): Remove forward
2533         declarations.
2534         * data-streamer-in.c (lto_input_widest_uint_uleb128): Remove unused
2535         function.
2536         * data-streamer-out.c (lto_output_widest_uint_uleb128_stream): Remove
2537         unused function.
2538         * Makefile.in (lto-section-out.o): Add dependency on DATA_STREAMER_H.
2539         (ipa-reference.o): Likewise.
2540         * lto-section-out.c: Include data-streamer.h.
2541         * ipa-reference.c: Include data-streamer.h.
2542
2543 2011-08-12  Nick Clifton  <nickc@redhat.com>
2544
2545         * builtins.c (expand_builtin_memcmp): Do not use cmpstrnsi pattern.
2546         * doc/md.texi (cmpstrn): Note that the comparison stops if both
2547         fetched bytes are zero.
2548         (cmpstr): Likewise.
2549         (cmpmem): Note that the comparison does not stop if both of the
2550         fetched bytes are zero.
2551
2552 2011-08-12  Uros Bizjak  <ubizjak@gmail.com>
2553
2554         * builtins.def (BUILT_IN_ICEIL{,F,L}, BUILT_IN_IFLOOR{,F,L}
2555         BUILT_IN_IRINT{,F,L}, BUILT_IN_IROUND{,F,L}: New builtin definitions.
2556         * convert.c (convert_to_integer): Convert to BUILT_IN_ICEIL,
2557         BUILT_IN_IFLOOR, BUILT_IN_IRINT or BUILT_INT_IROUND when converting
2558         to integer_type_node.
2559         * fold-const.c (tree_call_nonnegative_warnv_p): Handle BUILT_IN_ICEIL,
2560         BUILT_IN_IFLOOR, BUILT_IN_IRINT and BUILT_INT_IROUND.
2561         * builtins.c (expand_builtin_in): Ditto.
2562         (mathfn_built_in_1): Ditto.
2563         (expand_builtin_int_roundingfn): Handle BUILT_IN_ICEIL and
2564         BUILT_IN_IFLOOR.
2565         (expand_builtin_int_roundingfn_2): Handle BUILT_IN_IRINT and
2566         BUILT_IN_IROUND.
2567         (fold_fixed_mathfn): Canonicalize BUILT_IN_ICEIL, BUILTIN_IN_IFLOOR
2568         BUILT_IN_IRINT and BUILT_IN_IROUND to BUILT_IN_LCEIL,
2569         BUILTIN_IN_LFLOOR, BUILT_IN_LRINT and BUILT_IN_LROUND on ILP32 targets.
2570
2571 2011-08-12  Richard Guenther  <rguenther@suse.de>
2572
2573         * tree-vrp.c (extract_range_from_unary_expr_1): Implement -X as 0 - X.
2574
2575 2011-08-12  Romain Geissler  <romain.geissler@gmail.com>
2576
2577         * Makefile.in (PLUGIN_HEADERS): Add C_TREE_H.
2578
2579 2011-08-12  Richard Sandiford  <rdsandiford@googlemail.com>
2580
2581         * config/arm/arm.c (get_label_padding): New function.
2582         (create_fix_barrier, arm_reorg): Use it.
2583
2584 2011-08-11  Uros Bizjak  <ubizjak@gmail.com>
2585
2586         PR target/49781
2587         * config/i386/i386.md (*lea_5_zext): New.
2588         (*lea_6_zext): Ditto.
2589         * config/i386/predicates.md (const_32bit_mask): New predicate.
2590         (lea_address_operand): Reject AND.
2591         * config/i386/i386.c (ix86_decompose_address): Allow Dimode AND with
2592         const_32bit_mask immediate.
2593         (ix86_print_operand_address): Handle AND.
2594         (memory_address_length): Ditto.
2595
2596 2011-08-11  Romain Geissler  <romain.geissler@gmail.com>
2597             Brian Hackett  <bhackett1024@gmail.com>
2598
2599         * plugin.def: Add event for finish_decl.
2600         * plugin.c (register_callback, invoke_plugin_callbacks): Same.
2601         * c-decl.c (finish_decl): Invoke callbacks on above event.
2602         * doc/plugins.texi: Document above event.
2603
2604 2011-08-11  Richard Guenther  <rguenther@suse.de>
2605
2606         * tree-ssa-sccvn.c (vn_reference_lookup_3): Avoid redundant
2607         lookups, make looking through aggregate copies stronger.
2608
2609 2011-08-11  Richard Henderson  <rth@redhat.com>
2610
2611         PR bootstrap/50018
2612         * expr.c (fixup_args_size_notes): Accept and ignore normal calls.
2613
2614 2011-08-11  Richard Guenther  <rguenther@suse.de>
2615
2616         * lto-cgraph.c (input_node): Use DECL_BUILT_IN.
2617         * tree-vrp.c (stmt_interesting_for_vrp): Likewise.
2618         (vrp_visit_stmt): Likewise.
2619
2620 2011-08-11  Richard Guenther  <rguenther@suse.de>
2621
2622         PR middle-end/50040
2623         * gimplify.c (gimplify_modify_expr_complex_part): Mark the
2624         load of the other piece with TREE_NO_WARNING.
2625         * tree-flow.h (warn_uninit): Adjust prototype.
2626         * tree-ssa.c (warn_uninit): Take uninitialized SSA name,
2627         the base variable and the expression that is used separately.
2628         Properly query all TREE_NO_WARNING flags.
2629         (struct walk_data): Remove.
2630         (warn_uninitialized_var): Likewise.
2631         (warn_uninitialized_vars): Do not walk gimple pieces but simply
2632         look at all SSA uses of the statement.  Handle unused memory
2633         separately.
2634         * tree-ssa-uninit.c (warn_uninitialized_phi): Adjust.
2635
2636 2011-08-11   Kazuhiro Inaoka  <kazuhiro.inaoka.ud@renesas.com>
2637
2638         * config/rx/rx.md (movsicc): Allow register to register transfers.
2639         (*movsicc): Likewise.
2640         (*stcc): Restrict this pattern to EQ and NE compares.
2641         (*stcc_reg): New pattern.  Works for any comparison but only for
2642         register transfers.
2643
2644 2011-08-11   Diego Novillo  <dnovillo@google.com>
2645
2646         * tree-streamer-out.c (lto_output_ts_decl_with_vis_tree_pointers):
2647         Call stream_write_tree instead of output_record_start.
2648         (lto_output_ts_binfo_tree_pointers): Likewise.
2649
2650         * streamer-hooks.h (stream_write_tree): Move from tree-streamer.h.
2651         Convert it to a macro.
2652         (stream_read_tree): Likewise.
2653
2654         * lto-streamer.h (lto_stream_as_builtin_p): Move ...
2655         * tree-streamer.h (lto_stream_as_builtin_p): ... here.
2656
2657         * lto-streamer-in.c (lto_read_tree): Call lto_streamer_cache_append
2658         and tree_read_bitfields.
2659         * lto-streamer-out.c (lto_is_streamable): Move from lto-streamer.c
2660         (lto_write_tree): Call it.
2661         * lto-streamer.c (lto_is_streamable): Move to lto-streamer-out.c
2662         * streamer-hooks.h (struct streamer_hooks): Remove fields
2663         name, is_streamable and alloc_tree. Update all users.
2664         * tree-streamer-in.c (tree_read_bitfields): Factor out of ...
2665         (lto_materialize_tree): ... here.
2666         Handle CALL_EXPR codes.
2667         Remove call to lto_streamer_cache_append.
2668         * tree-streamer-out.c (lto_output_tree_header): Handle CALL_EXPR nodes.
2669         * tree-streamer.h (tree_read_bitfields): Declare.
2670
2671         * Makefile.in (TREE_STREAMER_H): Add STREAMER_HOOKS_H.
2672         (gimple-streamer-in.o): Add dependency on TREE_STREAMER_H.
2673         * tree-streamer.h (stream_read_tree): New.  Replace all calls
2674         to lto_input_tree with it.
2675         (stream_write_tree): New.  Replace all calls to lto_output_tree,
2676         lto_output_tree_ref and lto_output_tree_or_ref with it.
2677         * lto-streamer-in.c (lto_read_tree): Inline code from
2678         lto_streamer_read_tree.
2679         (lto_input_tree): Move from tree-streamer-in.c.
2680         * lto-streamer-out.c (lto_output_tree_ref): Make static.
2681         Remove handling of NULL values for EXPR.
2682         Do not handle EXPRs that are not indexable.
2683         (lto_write_tree): Move from tree-streamer-out.c.
2684         Inline lto_streamer_write_tree.
2685         (lto_output_tree): Move from tree-streamer-out.c.
2686         If REF_P is true and EXPR is indexable, call lto_output_tree_ref.
2687         * lto-streamer.c (lto_record_common_node): Move to tree-streamer.c.
2688         (lto_preload_common_nodes): Likewise.
2689         Remove assertions and adjustments for nodes
2690         main_identifier_node, ptrdiff_type_node and fileptr_type_node.
2691         (lto_streamer_hooks_init): Set streamer_hooks.write_tree to
2692         lto_output_tree and streamer_hooks.read_tree to lto_input_tree.
2693         * lto-streamer.h (lto_input_tree): Declare.
2694         (lto_output_tree_ref): Remove.
2695         * streamer-hooks.h (struct streamer_hooks): Remove fields
2696         preload_common_nodes, indexable_with_decls_p,
2697         pack_value_fields, unpack_value_fields and output_tree_header.
2698         Update all users.
2699         * tree-streamer-in.c (lto_materialize_tree): Make extern.
2700         (lto_input_tree_pointers): Likewise.
2701         (lto_read_tree): Move to lto-streamer-in.c.
2702         (lto_input_integer_cst): Make extern.
2703         (lto_get_pickled_tree): Likewise.
2704         (lto_get_builtin_tree): Likewise.
2705         (lto_input_tree): Move to lto-streamer-in.c.
2706         * tree-streamer-out.c (pack_value_fields): Make extern.
2707         (lto_output_tree_or_ref): Remove.  Replace all callers with
2708         calls to stream_write_tree.
2709         (lto_output_builtin_tree): Make extern.
2710         (lto_streamer_write_tree): Inline into lto_write_tree.
2711         (lto_output_tree_pointers): Make extern.
2712         (lto_output_tree_header): Likewise.
2713         (lto_output_integer_cst): Likewise.
2714         (lto_write_tree): Move to lto-streamer-out.c.
2715         (lto_output_tree): Likewise.
2716         * tree-streamer.c (lto_record_common_node): Move from lto-streamer.c
2717         (preload_common_nodes): Likewise.
2718         (lto_streamer_cache_create): Call it.
2719         * tree-streamer.h: Include streamer-hooks.h.
2720         (stream_write_tree): New.
2721         (stream_read_tree): New.
2722         (lto_input_tree): Remove.
2723         (lto_materialize_tree): Declare.
2724         (lto_input_tree_pointers): Declare.
2725         (lto_get_pickled_tree): Declare.
2726         (lto_get_builtin_tree): Declare.
2727         (lto_input_integer_cst): Declare.
2728         (lto_output_tree_header): Declare.
2729         (pack_value_fields): Declare.
2730         (lto_output_tree_pointers): Declare.
2731         (lto_output_integer_cst): Declare.
2732         (lto_output_builtin_tree): Declare.
2733
2734 2011-08-11  Sergey Grechanik  <mouseentity@ispras.ru>
2735
2736         * sel-sched-ir.c (has_dependence_note_reg_use): Call ds_full_merge
2737         only if producer writes to the register given by regno.
2738
2739 2011-08-11  Sergey Grechanik  <mouseentity@ispras.ru>
2740             Alexander Monakov  <amonakov@ispras.ru>
2741
2742         * sched-deps.c (sched_get_condition_with_rev): Rename to ...
2743         (sched_get_condition_with_rev_uncached): ... this.  Factor out
2744         condition caching logic into ...
2745         (sched_get_condition_with_rev): ... this.  Reimplement.  Do not
2746         attempt to use cache for instructions with zero luid.
2747         (sched_analyze_insn): Use INSN_CACHED_COND instead of INSN_COND.
2748         * sched-int.h (INSN_COND): Rename to INSN_CACHED_COND.
2749
2750 2011-08-11  Sergey Grechanik  <mouseentity@ispras.ru>
2751
2752         * sel-sched-ir.c (get_seqno_of_a_pred): Rename to
2753         get_seqno_for_a_jump.  Update the caller.
2754         (get_seqno_by_succs): New.  Use it ...
2755         (get_seqno_for_a_jump): ... here to find a seqno if looking at
2756         predecessors was not sufficient.
2757         (get_seqno_by_preds): Include head in iteration range, exclude insn.
2758
2759 2011-08-11  Dmitry Melnik  <dm@ispras.ru>
2760
2761         * sel-sched-ir.c (invalidate_av_set): Remove the assert.
2762
2763 2011-08-11  Sergey Grechanik  <mouseentity@ispras.ru>
2764
2765         * sel-sched-ir.h (register_unavailable_p): Declare.
2766         * sel-sched-ir.c (register_unavailable_p): New.  Use it...
2767         (set_unavailable_target_for_expr): ... here to properly test
2768         availability of a register.
2769         (speculate_expr): Ditto.
2770         * sel-sched.c (substitute_reg_in_expr): Ditto.
2771         (av_set_could_be_blocked_by_bookkeeping_p): Ditto.
2772
2773 2011-08-11  Sergey Grechanik  <mouseentity@ispras.ru>
2774
2775         * sel-sched.c (verify_target_availability): Fix usage of
2776         hard_regno_nregs.
2777
2778 2011-08-11  Dmitry Melnik  <dm@ispras.ru>
2779
2780         * sel-sched-ir.c (init_global_and_expr_for_insn): Forbid copying of
2781         recognized by cannot_copy_insn_p hook and volatile instructions.
2782
2783 2011-08-11  Dmitry Melnik  <dm@ispras.ru>
2784
2785         * sel-sched-ir.c (merge_expr_data): Take maximum spec.
2786
2787 2011-08-11  Richard Sandiford  <richard.sandiford@linaro.org>
2788
2789         * doc/md.texi (define_bypass): Say that the instruction names can
2790         be filename-style globs.
2791         * Makefile.in (FNMATCH_H): Define.
2792         (build/genattrtab.o, build/genautomata.o): Depend on $(FNMATCH_H).
2793         * genattrtab.c: Include fnmatch.h.
2794         (bypass_list): Change field name from "insn" to "pattern".
2795         (gen_bypass_1): Update accordingly.
2796         (process_bypasses): Use fnmatch to check for matches between
2797         insn reservations and define_bypasses.
2798         * genautomata.c: Include fnmatch.h.
2799         (bypass_decl): Rename in_insn_name and out_insn_name to in_pattern
2800         and out_pattern respectively.
2801         (gen_bypass, insert_bypass): Update accordingly.
2802         (for_each_matching_insn, process_bypass_2, process_bypass_1)
2803         (process_bypass): New functions.
2804         (process_decls): Use process_bypass.  Update after field name changes.
2805
2806 2011-08-11  Georg-Johann Lay  <avr@gjlay.de>
2807
2808         PR target/49687
2809         * config/avr/avr.md (smulqi3_highpart): New insn.
2810         (umulqi3_highpart): New insn.
2811         (*subqi3.ashiftrt7): New insn.
2812         (smulhi3_highpart): New expander.
2813         (umulhi3_highpart): Nex expander.
2814         (*smulhi3_highpart_call): New insn.
2815         (*umulhi3_highpart_call): New insn.
2816         (extend_u): New code attribute.
2817         (extend_prefix): Rename code attribute to extend_su.
2818         * config/avr/avr.c (avr_rtx_costs): Report costs of highpart of
2819         widening QI/HI multiply.
2820
2821 2011-08-11  Ira Rosen  <ira.rosen@linaro.org>
2822
2823         PR tree-optimization/50039
2824         * tree-vect-patterns.c (vect_operation_fits_smaller_type): Check
2825         that DEF_STMT has a stmt_vec_info.
2826
2827 2011-08-10  Richard Guenther  <rguenther@suse.de>
2828
2829         * tree.h (can_trust_pointer_alignment): Remove.
2830         * builtins.c (can_trust_pointer_alignment): Remove.
2831
2832 2011-08-10  Artjoms Sinkarovs <artyom.shinakroff@gmail.com>
2833
2834         * c-typeck.c (scalar_to_vector): New function. Try scalar to
2835         vector conversion.
2836         (stv_conv): New enum for scalar_to_vector return type.
2837         (build_binary_op): Adjust.
2838         * doc/extend.texi: Description of scalar to vector expansion.
2839
2840 2011-08-10  Richard Guenther  <rguenther@suse.de>
2841
2842         * tree.h (get_pointer_alignment): Remove max-align argument.
2843         (get_object_alignment): Likewise.
2844         * builtins.c (get_object_alignment_1): Adjust.
2845         (get_object_alignment): Remove max-align argument.
2846         (get_pointer_alignment): Likewise.
2847         (expand_builtin_strlen): Adjust.
2848         (expand_builtin_memcpy): Likewise.
2849         (expand_builtin_mempcpy_args): Likewise.
2850         (expand_builtin_strncpy): Likewise.
2851         (expand_builtin_memset_args): Likewise.
2852         (expand_builtin_memcmp): Likewise.
2853         (expand_builtin_strcmp): Likewise.
2854         (expand_builtin_strncmp): Likewise.
2855         (get_builtin_sync_mem): Likewise.
2856         (fold_builtin_memset): Likewise.
2857         (fold_builtin_memory_op): Likewise.
2858         (expand_builtin_memory_chk): Likewise.
2859         * emit-rtl.c (get_mem_align_offset): Likewise.
2860         (set_mem_attributes_minus_bitpos): Likewise.
2861         * expr.c (expand_assignment): Likewise.
2862         (expand_expr_real_1): Likewise.
2863         * tree-sra.c (tree_non_mode_aligned_mem_p): Likewise.
2864         * tree-ssa-forwprop.c (simplify_builtin_call): Likewise.
2865         * tree-ssa-loop-ivopts.c (may_be_unaligned_p): Likewise.
2866         * tree-vect-data-refs.c (vect_compute_data_ref_alignment): Likewise.
2867         * value-prof.c (gimple_stringops_transform): Likewise.
2868
2869 2011-08-10  Paulo J. Matos  <paulo.matos@csr.com>
2870
2871         * doc/tm.texi.in (CLASS_MAX_NREGS): Fix typo.
2872         * doc/tm.texi: Regenerate.
2873
2874 2011-08-10  Georg-Johann Lay  <avr@gjlay.de>
2875
2876         PR target/29560
2877         * config/avr/avr.md (*ashlhiqi3): New insn-and-split.
2878         (*ashl<extend_prefix>qihiqi3): New insn-and-splits.
2879         (*ashl<extend_prefix>qihiqi3.mem): New insn-and-splits.
2880         Add peephole2 to map ashlhi3 to ashlqi3 if high part of
2881         shift target is unused.
2882
2883 2011-08-10  Richard Guenther  <rguenther@suse.de>
2884
2885         PR tree-optimization/49937
2886         * tree-ssa-ccp.c (get_value_from_alignment): Re-implement
2887         using get_object_alignment_1.
2888
2889 2011-08-09  Uros Bizjak  <ubizjak@gmail.com>
2890
2891         * config/i386/i386.c (ix86_emit_i387_round): New function.
2892         * config/i386/i386-protos.h (ix86_emit_i387_round): Declare.
2893         * config/i386/i386.md (round<mode>2): Use X87MODEF mode iterator.
2894         Use ix86_emit_i387_round to expand round function for i387 math.
2895         (lround<X87MODEF:mode><SWI248x:mode>2): Use X87MODEF mode iterator.
2896         Use ix86_emit_i387_round to expand {l,ll}round function for i387 math.
2897
2898 2011-08-09  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
2899
2900         * config/sync.c: Move to ../libgcc.
2901         * Makefile.in (libgcc.mvars): Remove LIBGCC_SYNC, LIBGCC_SYNC_CFLAGS.
2902         * config/mips/t-libgcc-mips16 (LIBGCC_SYNC, LIBGCC_SYNC_CFLAGS):
2903         Remove.
2904
2905 2011-08-09  Anatoly Sokolov  <aesok@post.ru>
2906
2907         * config/mmix/mmix.h (REGISTER_MOVE_COST): Remove macro.
2908         * config/mmix/mmix-protos.h (mmix_register_move_cost): Remove.
2909         * config/mmix/mmix.c (mmix_register_move_cost): Make static.
2910         Change 'from' and 'to' arguments type to reg_class_t.
2911         (TARGET_REGISTER_MOVE_COST): Define.
2912
2913 2011-08-09  Vladimir Makarov  <vmakarov@redhat.com>
2914
2915         PR target/50026
2916         Revert:
2917         PR rtl-optimization/49990
2918         * ira-costs.c (print_allocno_costs, print_pseudo_costs): Don't
2919         ignore classes which can not change mode.
2920         (find_costs_and_classes): Ditto.
2921
2922 2011-08-09  Richard Guenther  <rguenther@suse.de>
2923
2924         * tree-vrp.c (zero_nonzero_bits_from_vr): Also return precise
2925         information for ranges with only negative values.
2926         (extract_range_from_binary_expr_1): Adjust BIT_IOR_EXPR and
2927         BIT_AND_EXPR handling to handle ranges with negative values.
2928
2929 2011-08-09  Kirill Yukhin  <kirill.yukhin@intel.com>
2930
2931         * config/i386/i386.c: Remove traling spaces.
2932         * config/i386/sse.md: Likewise.
2933         (*fma_fmadd_<mode>): Fix insn alternative 1 mnemonic.
2934         (*fma_fmsub_<mode>): Likewise.
2935         (*fma_fnmadd_<mode>): Likewise.
2936         (*fma_fnmsub_<mode>): Likewise.
2937
2938 2011-08-09  Nick Clifton  <nickc@redhat.com>
2939
2940         * config/rx/rx.md: Disable extender peepholes at -O3.
2941
2942 2011-08-09  Uros Bizjak  <ubizjak@gmail.com>
2943
2944         PR target/49781
2945         * config/i386/i386.md (reload_noff_load): New.
2946         (reload_noff_store): Ditto.
2947         * config/i386/i386.c (ix86_secondary_reload): Use
2948         CODE_FOR_reload_noff_load and CODE_FOR_reload_noff_store to handle
2949         double-word moves from/to non-offsetable addresses instead of
2950         generating XMM temporary.
2951
2952 2011-08-09  Anatoly Sokolov  <aesok@post.ru>
2953
2954         * config/mmix/mmix.h (REG_OK_FOR_BASE_P, REG_OK_FOR_INDEX_P): Remove.
2955
2956 2011-08-09  Ira Rosen  <ira.rosen@linaro.org>
2957
2958         PR tree-optimization/50014
2959         * tree-vect-loop.c (vectorizable_reduction): Get def type before
2960         calling vect_get_vec_def_for_stmt_copy ().
2961
2962 2011-08-08  Vladimir Makarov  <vmakarov@redhat.com>
2963
2964         PR rtl-optimization/49990
2965         * ira-costs.c (print_allocno_costs, print_pseudo_costs): Don't
2966         ignore classes which can not change mode.
2967         (find_costs_and_classes): Ditto.
2968
2969 2011-08-08  Richard Henderson  <rth@redhat.com>
2970
2971         PR middle-end/49990
2972         * config/i386/i386.c (ix86_expand_prologue): Call
2973         for SEH target gen_prologue_use instead of gen_blockage
2974         at prologue's end.
2975
2976 2011-08-08  Martin Jambor  <mjambor@suse.cz>
2977
2978         PR middle-end/49923
2979         * tree-sra.c (access_precludes_ipa_sra_p): Also check access
2980         memory alignment.
2981
2982 2011-08-08   Diego Novillo  <dnovillo@google.com>
2983
2984         * Makefile.in (LTO_STREAMER_H): Add DIAGNOSTIC_H.
2985         (DATA_STREAMER_H): New.
2986         (GIMPLE_STREAMER_H): New.
2987         (TREE_STREAMER_H): New.
2988         (STREAMER_HOOKS_H): New.
2989         (OBJS): Add data-streamer.o, data-streamer-in.o, data-streamer-out.o,
2990         gimple-streamer-in.o, gimple-streamer-out.o, streamer-hooks.o,
2991         tree-streamer.o, tree-streamer-in.o and tree-streamer-out.o.
2992         (data-streamer.o): New.
2993         (data-streamer-in.o): New.
2994         (data-streamer-out.o): New.
2995         (gimple-streamer-in.o): New.
2996         (gimple-streamer-out.o): New.
2997         (streamer-hooks.o): New.
2998         (tree-streamer.o): New.
2999         (tree-streamer-in.o): New.
3000         (tree-streamer-out.o): New.
3001         (lto-cgraph.o): Add dependency on DATA_STREAMER_H and TREE_STREAMER_H.
3002         (lto-streamer-in.o): Add dependency on DATA_STREAMER_H,
3003         GIMPLE_STREAMER_H and TREE_STREAMER_H.
3004         (lto-streamer-out.o): Add dependency on DATA_STREAMER_H,
3005         GIMPLE_STREAMER_H and TREE_STREAMER_H.
3006         (lto-streamer.o): Add dependency on STREAMER_HOOKS_H.
3007         (ipa-prop.o): Add dependency on DATA_STREAMER_H and TREE_STREAMER_H.
3008         (ipa-inline-analysis.o): Likewise.
3009         (ipa-pure-const.o): Likewise.
3010         * data-streamer-in.c: New.
3011         * data-streamer-out.c: New.
3012         * data-streamer.c: New.
3013         * data-streamer.h: New.
3014         * gimple-streamer-in.c: New.
3015         * gimple-streamer-out.c: New.
3016         * gimple-streamer.h: New.
3017         * ipa-inline-analysis.c: Include data-streamer.h.
3018         * ipa-prop.c: Include data-streamer.h.
3019         * ipa-pure-const.c: Include data-streamer.h.
3020         * lto-cgraph.c: Include data-streamer.h.
3021         * lto-section-in.c (lto_input_uleb128): Move to data-streamer-in.c.
3022         (lto_input_widest_uint_uleb128): Likewise.
3023         (lto_input_sleb128): Likewise.
3024         (bp_unpack_var_len_unsigned): Likewise.
3025         (bp_unpack_var_len_int): Likewise.
3026         * lto-section-out.c (lto_output_uleb128_stream): Move to
3027         data-streamer-out.c.
3028         (lto_output_widest_uint_uleb128_stream): Likewise.
3029         (lto_output_sleb128_stream): Likewise.
3030         (bp_pack_var_len_unsigned): Likewise.
3031         (bp_pack_var_len_int): Likewise.
3032         * lto-streamer-in.c: Include data-streamer.h and gimple-streamer.h.
3033         (struct string_slot): Remove.  Update all users.
3034         (lto_tag_check_set): Make extern.
3035         (lto_tag_check_range): Move to lto-streamer.h.
3036         (lto_tag_check): Likewise.
3037         (hash_string_slot_node): Remove.  Update all users.
3038         (eq_string_slot_node): Remove.  Update all users.
3039         (string_for_index): Move to data-streamer-in.c
3040         (input_string_internal): Likewise.
3041         (input_string_cst): Move to tree-streamer-in.c.
3042         (input_identifier): Likewise.
3043         (lto_input_string): Move to data-streamer-in.c
3044         (input_record_start): Move to data-streamer.h
3045         (canon_file_name): Use new definition of struct string_slot
3046         from data-streamer.h.  Set S_SLOT.LEN.
3047         (lto_input_location): Make extern.
3048         (lto_input_chain): Move to tree-streamer-in.c.
3049         (lto_init_eh): Make extern.
3050         (input_phi): Move to gimple-streamer-in.c.
3051         (input_gimple_stmt): Likewise.
3052         (input_bb): Likewise.
3053         (unpack_ts_base_value_fields): Move to tree-streamer-in.c.
3054         (unpack_ts_real_cst_value_fields): Likewise.
3055         (unpack_ts_fixed_cst_value_fields): Likewise.
3056         (unpack_ts_decl_common_value_fields): Likewise.
3057         (unpack_ts_decl_wrtl_value_fields): Likewise.
3058         (unpack_ts_decl_with_vis_value_fields): Likewise.
3059         (unpack_ts_function_decl_value_fields): Likewise.
3060         (unpack_ts_type_common_value_fields): Likewise.
3061         (unpack_ts_block_value_fields): Likewise.
3062         (unpack_ts_translation_unit_decl_value_fields): Likewise.
3063         (unpack_value_fields): Likewise.
3064         (lto_materialize_tree): Likewise.
3065         (lto_input_ts_common_tree_pointers): Likewise.
3066         (lto_input_ts_vector_tree_pointers): Likewise.
3067         (lto_input_ts_complex_tree_pointers): Likewise.
3068         (lto_input_ts_decl_minimal_tree_pointers): Likewise.
3069         (lto_input_ts_decl_common_tree_pointers): Likewise.
3070         (lto_input_ts_decl_non_common_tree_pointers): Likewise.
3071         (lto_input_ts_decl_with_vis_tree_pointers): Likewise.
3072         (lto_input_ts_field_decl_tree_pointers): Likewise.
3073         (lto_input_ts_function_decl_tree_pointers): Likewise.
3074         (lto_input_ts_type_common_tree_pointers): Likewise.
3075         (lto_input_ts_type_non_common_tree_pointers): Likewise.
3076         (lto_input_ts_list_tree_pointers): Likewise.
3077         (lto_input_ts_vec_tree_pointers): Likewise.
3078         (lto_input_ts_exp_tree_pointers): Likewise.
3079         (lto_input_ts_block_tree_pointers): Likewise.
3080         (lto_input_ts_binfo_tree_pointers): Likewise.
3081         (lto_input_ts_constructor_tree_pointers): Likewise.
3082         (lto_input_ts_target_option): Likewise.
3083         (lto_input_ts_translation_unit_decl_tree_pointers): Likewise.
3084         (lto_input_tree_pointers): Likewise.
3085         (lto_get_pickled_tree): Likewise.
3086         (lto_get_builtin_tree): Likewise.
3087         (lto_read_tree): Likewise.
3088         (lto_input_integer_cst): Likewise.
3089         (lto_input_tree): Likewise.
3090         * lto-streamer-out.c: Include data-streamer.h,
3091         gimple-streamer.h and streamer-hooks.h.
3092         (struct string_slot): Move to data-streamer.h.
3093         (hash_string_slot_node): Likewise.
3094         (eq_string_slot_node): Likewise.
3095         (lto_string_index): Move to data-streamer-out.c.
3096         (lto_output_string_with_length): Likewise.
3097         (lto_output_string): Likewise.
3098         (output_string_cst): Move to tree-streamer-out.c.
3099         (output_identifier): Likewise.
3100         (output_zero): Move to data-streamer-out.c
3101         (output_uleb128): Likewise.
3102         (output_sleb128): Likewise.
3103         (output_record_start): Move to data-streamer.h
3104         (pack_ts_base_value_fields): Move to tree-streamer-out.c.
3105         (pack_ts_real_cst_value_fields): Likewise.
3106         (pack_ts_fixed_cst_value_fields): Likewise.
3107         (pack_ts_decl_common_value_fields): Likewise.
3108         (pack_ts_decl_wrtl_value_fields): Likewise.
3109         (pack_ts_decl_with_vis_value_fields): Likewise.
3110         (pack_ts_function_decl_value_fields): Likewise.
3111         (pack_ts_type_common_value_fields): Likewise.
3112         (pack_ts_block_value_fields): Likewise.
3113         (pack_ts_translation_unit_decl_value_fields): Likewise.
3114         (pack_value_fields): Likewise.
3115         (lto_output_chain): Likewise.
3116         (lto_output_ts_common_tree_pointers): Likewise.
3117         (lto_output_ts_vector_tree_pointers): Likewise.
3118         (lto_output_ts_complex_tree_pointers): Likewise.
3119         (lto_output_ts_decl_minimal_tree_pointers): Likewise.
3120         (lto_output_ts_decl_common_tree_pointers): Likewise.
3121         (lto_output_ts_decl_non_common_tree_pointers): Likewise.
3122         (lto_output_ts_decl_with_vis_tree_pointers): Likewise.
3123         (lto_output_ts_field_decl_tree_pointers): Likewise.
3124         (lto_output_ts_function_decl_tree_pointers): Likewise.
3125         (lto_output_ts_type_common_tree_pointers): Likewise.
3126         (lto_output_ts_type_non_common_tree_pointers): Likewise.
3127         (lto_output_ts_list_tree_pointers): Likewise.
3128         (lto_output_ts_vec_tree_pointers): Likewise.
3129         (lto_output_ts_exp_tree_pointers): Likewise.
3130         (lto_output_ts_block_tree_pointers): Likewise.
3131         (lto_output_ts_binfo_tree_pointers): Likewise.
3132         (lto_output_ts_constructor_tree_pointers): Likewise.
3133         (lto_output_ts_target_option): Likewise.
3134         (lto_output_ts_translation_unit_decl_tree_pointers): Likewise.
3135         (lto_output_tree_pointers): Likewise.
3136         (lto_output_tree_header): Likewise.
3137         (lto_output_builtin_tree): Likewise.
3138         (lto_write_tree): Likewise.
3139         (lto_output_integer_cst): Likewise.
3140         (lto_output_tree): Likewise.
3141         (output_phi): Move to gimple-streamer-out.c.
3142         (output_gimple_stmt): Likewise.
3143         (output_bb): Likewise.
3144         * lto-streamer.c: Include tree-streamer.h and streamer-hooks.h.
3145         (streamer_hooks): Move to streamer-hooks.c.
3146         (check_handled_ts_structures): Move to tree-streamer.c
3147         (lto_streamer_cache_add_to_node_array): Likewise.
3148         (lto_streamer_cache_insert_1): Likewise.
3149         (lto_streamer_cache_insert): Likewise.
3150         (lto_streamer_cache_insert_at): Likewise.
3151         (lto_streamer_cache_append): Likewise.
3152         (lto_streamer_cache_lookup): Likewise.
3153         (lto_streamer_cache_get): Likewise.
3154         (lto_record_common_node): Likewise.
3155         (lto_preload_common_nodes): Likewise.
3156         (lto_streamer_cache_create): Likewise.
3157         (lto_streamer_cache_delete): Likewise.
3158         (streamer_hooks_init): Move to streamer-hooks.c.
3159         * lto-streamer.h: Include diagnostic.h
3160         (struct output_block, struct lto_input_block,
3161         struct data_in, struct bitpack_d): Remove forward declarations.
3162         (struct bitpack_d): Move to data-streamer.h.
3163         (struct lto_streamer_cache_d): Move to tree-streamer.h.
3164         (struct streamer_hooks): Move to streamer-hooks.h.
3165         (bp_pack_var_len_unsigned): Move to data-streamer.h.
3166         (bp_pack_var_len_int): Likewise.
3167         (bp_unpack_var_len_unsigned): Likewise.
3168         (bp_unpack_var_len_int): Likewise.
3169         (lto_input_location): Declare.
3170         (lto_tag_check_set): Declare.
3171         (lto_init_eh): Declare.
3172         (lto_output_tree_ref): Declare.
3173         (lto_output_location): Declare.
3174         (bitpack_create): Move to data-streamer.h.
3175         (bp_pack_value): Likewise.
3176         (lto_output_bitpack): Likewise.
3177         (lto_input_bitpack): Likewise.
3178         (bp_unpack_value): Likewise.
3179         (lto_output_1_stream): Likewise.
3180         (lto_input_1_unsigned): Likewise.
3181         (lto_output_int_in_range): Likewise.
3182         (lto_input_int_in_range): Likewise.
3183         (bp_pack_int_in_range): Likewise.
3184         (bp_unpack_int_in_range): Likewise.
3185         (lto_output_enum): Likewise.
3186         (lto_input_enum): Likewise.
3187         (bp_pack_enum): Likewise.
3188         (bp_unpack_enum): Likewise.
3189         * streamer-hooks.c: New.
3190         * streamer-hooks.h: New.
3191         * tree-streamer-in.c: New.
3192         * tree-streamer-out.c: New.
3193         * tree-streamer.c: New.
3194         * tree-streamer.h: New.
3195
3196 2011-08-08  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
3197
3198         * gthr-posix95.h: Remove.
3199         * gthr.h [_PTHREADS95]: Remove.
3200         * configure.ac (enable_threads): Remove posix95.
3201         * configure: Regenerate.
3202         * doc/install.texi (Configuration, --enable-threads): Remove posix95.
3203
3204 2011-08-08  Uros Bizjak  <ubizjak@gmail.com>
3205
3206         PR target/49781
3207         * config/i386/i386.c (ix86_decompose_address): Allow zero-extended
3208         SImode addresses.
3209         (ix86_print_operand_address): Handle zero-extended addresses.
3210         (memory_address_length): Add length of addr32 prefix for
3211         zero-extended addresses.
3212         (ix86_secondary_reload): Handle moves to/from double-word general
3213         registers from/to zero-extended addresses.
3214         * config/i386/predicates.md (lea_address_operand): Reject
3215         zero-extended operands.
3216
3217 2011-08-08  H.J. Lu  <hongjiu.lu@intel.com>
3218
3219         PR other/48007
3220         * config.gcc (libgcc_tm_file): Add i386/value-unwind.h for Linux/x86.
3221
3222         * system.h (REG_VALUE_IN_UNWIND_CONTEXT): Poisoned.
3223         (ASSUME_EXTENDED_UNWIND_CONTEXT): Likewise.
3224
3225         * unwind-dw2.c (ASSUME_EXTENDED_UNWIND_CONTEXT): New.
3226         (_Unwind_Context_Reg_Val): Likewise.
3227         (_Unwind_Get_Unwind_Word): Likewise.
3228         (_Unwind_Get_Unwind_Context_Reg_Val): Likewise.
3229         (_Unwind_Context): Use _Unwind_Context_Reg_Val on the reg field.
3230         (_Unwind_IsExtendedContext): Check ASSUME_EXTENDED_UNWIND_CONTEXT
3231         for EXTENDED_CONTEXT_BIT.
3232         (__frame_state_for): Likewise.
3233         (uw_init_context_1): Likewise.
3234         (_Unwind_GetGR): Updated.
3235         (_Unwind_SetGR): Likewise.
3236         (_Unwind_GetGRPtr): Likewise.
3237         (_Unwind_SetGRPtr): Likewise.
3238         (_Unwind_SetGRValue): Likewise.
3239         (_Unwind_GRByValue): Likewise.
3240         (uw_install_context_1): Likewise.
3241
3242         * doc/tm.texi.in: Document REG_VALUE_IN_UNWIND_CONTEXT and
3243         ASSUME_EXTENDED_UNWIND_CONTEXT.
3244         * doc/tm.texi: Regenerated.
3245
3246 2011-08-08  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
3247
3248         * Makefile.in (gengtype$(exeext)): Add $(LDFLAGS).
3249
3250 2011-08-08  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
3251
3252         * doc/invoke.texi (DEC Alpha Options, -mcpu): native support isn't
3253         Linux/GNU-specific.
3254         (DEC Alpha Options, -mtune): Likewise.
3255         (MIPS Options, -march): native is supported on IRIX.
3256
3257 2011-08-08  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
3258
3259         * config/sparc/driver-sparc.c: New file.
3260         * config/sparc/x-sparc: New file.
3261         * config.host: Use driver-sparc.o, sparc/x-sparc on sparc*-*-solaris2*.
3262         * config/sparc/sparc.opt (native): New value for enum processor_type.
3263         * config/sparc/sparc-opts.h (PROCESSOR_NATIVE): Declare.
3264         * config/sparc/sparc.c (sparc_option_override): Abort if
3265         PROCESSOR_NATIVE gets here.
3266         * config/sparc/sol2.h [__sparc__] (host_detect_local_cpu): Declare.
3267         (EXTRA_SPEC_FUNCTIONS, MCPU_MTUNE_NATIVE_SPECS,
3268         DRIVER_SELF_SPECS): Define.
3269         * doc/invoke.texi (SPARC Options, -mcpu): Document native.
3270         (SPARC Options, -mtune): Likewise.
3271         * configure.ac (EXTRA_GCC_LIBS): Check for libkstat.
3272         Substitute result.
3273         * configure: Regenerate.
3274         * Makefile.in (EXTRA_GCC_LIBS): Set.
3275         (xgcc$(exeext)): Add $(EXTRA_GCC_LIBS).
3276         (cpp$(exeext)): Likewise.
3277
3278 2011-08-08  Richard Guenther  <rguenther@suse.de>
3279
3280         * tree-vrp.c (extract_range_from_unary_expr_1): New function,
3281         split out from ...
3282         (extract_range_from_unary_expr): ... here.  Handle BIT_NOT_EXPR
3283         by composition.
3284
3285 2011-08-08  Mikael Pettersson  <mikpe@it.uu.se>
3286
3287         PR tree-optimization/50005
3288         * ipa-inline-analysis (remap_predicate): Add cast to
3289         silence signed/unsigned comparison warning.
3290
3291 2011-08-08  Richard Sandiford  <richard.sandiford@linaro.org>
3292
3293         * modulo-sched.c (get_sched_window): Use a table for the debug output.
3294         Print the current ii.
3295         (sms_schedule_by_order): Reduce whitespace in dump line.
3296
3297 2011-08-08  Richard Sandiford  <richard.sandiford@linaro.org>
3298
3299         * modulo-sched.c (get_sched_window): Use just one loop for predecessors
3300         and one loop for successors.  Fix upper bound of memory range.
3301
3302 2011-08-06  Uros Bizjak  <ubizjak@gmail.com>
3303
3304         PR target/50001
3305         * config/alpha/alpha.c (alpha_instantiate_decls): New function.
3306         (TARGET_INSTANTIATE_DECLS): New define.
3307
3308 2011-08-06  Paolo Bonzini  <bonzini@gnu.org>
3309             Mikael Morin   <mikael.morin@sfr.fr>
3310
3311         * Makefile.in (INCLUDES_FOR_TARGET): New.
3312         (LIBGCC2_CFLAGS): Use it.
3313         (CRTSTUFF_CFLAGS): Use it instead of INCLUDES.
3314
3315 2011-08-06  Uros Bizjak  <ubizjak@gmail.com>
3316
3317         * config/i386/i386.c (ix86_compute_frame_layout): Simplify
3318         frame->save_regs_using_mov calculation.
3319
3320 2011-08-06  Uros Bizjak  <ubizjak@gmail.com>
3321
3322         * config/i386/i386.md (ssemodesuffix): Remove V8SI mode.
3323         * config/i386/sse.md (castmode): New mode attribute.
3324         (avx_<castmode><avxsizesuffix>_<castmode>): Rename from
3325         avx_<ssemodesuffix><avxsizesuffix>_<ssemodesuffix>.
3326
3327 2011-08-05  Jan Hubicka  <jh@suse.cz>
3328
3329         PR middle-end/49494
3330         * ipa-inline-analysis.c (remap_predicate): Add bounds check.
3331
3332 2011-08-05  Jan Hubicka  <jh@suse.cz>
3333
3334         PR middle-end/49500
3335         * tree-emultls.c (new_emutls_decl):Add alias_of parameter;
3336         handle aliases.
3337         (create_emultls_var):New function.
3338         (ipa_lower_emutls): Handle aliases correctly.
3339
3340 2011-08-05  Jan Hubicka  <jh@suse.cz>
3341
3342         PR middle-end/49735
3343         * ipa-inline.c (recursive_inlining): Look through aliases.
3344
3345 2011-08-05  Jason Merrill  <jason@redhat.com>
3346
3347         * config/i386/i386.c (setup_incoming_varargs_ms_64): Move
3348         declarations to beginning of function.
3349
3350 2011-08-05  Bernd Schmidt  <bernds@codesourcery.com>
3351
3352         PR rtl-optimization/49900
3353         * sched-ebb.c (add_deps_for_risky_insns): Also add dependencies to
3354         ensure basic blocks stay in the same order.
3355
3356 2011-08-05  Aldy Hernandez  <aldyh@redhat.com>
3357
3358         * config/s390/s390.c (s390_expand_cs_hqi): Add new arguments to
3359         store_bit_field.
3360         (s390_expand_atomic): Same.
3361
3362 2011-08-05  Richard Henderson  <rth@redhat.com>
3363
3364         PR rtl-opt/49977
3365         * dwarf2cfi.c (scan_insn_after): Split out of ...
3366         (scan_trace): ... here.  Correctly place notes wrt sequences.
3367
3368 2011-08-05  Kaz Kojima  <kkojima@gcc.gnu.org>
3369             Richard Henderson  <rth@redhat.com>
3370
3371         PR rtl-opt/49982
3372         * expr.c (fixup_args_size_notes): Look through no-op moves.
3373
3374 2011-08-05  Uros Bizjak  <ubizjak@gmail.com>
3375
3376         * config/i386/i386.md (*push<mode>2): Use "o" constraint instead
3377         of "m" for operand 0.  Add type and mode attribute.
3378         (*pushxf_nointeger"): Use "<" constraint for operand 0.
3379         (*pushdf_rex64): New pattern, split out of *pushdf.  Use "m"
3380         constraint instead of "o" for opreand 1.
3381         (*pushdf): Disable for TARGET_64BIT.  Correct mode attribute.
3382         (*movdi_internal_rex64): Use "!o" constraint instead of "!m" for
3383         operand 0, alternative 4.
3384         (*movdf_internal_rex64): Ditto for operand 0, alernative 6.
3385
3386 2011-08-05  Uros Bizjak  <ubizjak@gmail.com>
3387
3388         * config/i386/predicates.md (lea_address_operand): Rename from
3389         no_seg_address_operand.
3390         * config/i386/i386.md (*lea_1): Update operand 1 predicate for rename.
3391         (*lea_1_zext): Ditto.
3392         (*lea_2): Ditto.
3393         (*lea_2_zext): Ditto.
3394
3395 2011-08-05  Uros Bizjak  <ubizjak@gmail.com>
3396
3397         * config/i386/i386.c (ix86_print_operand_address): Handle SUBREGs of
3398         parts.base and parts.index.
3399         * config/i386/predicates.md (aligned_operand): Ditto.
3400         (cmpxchg8b_pic_memory_operand): Ditto.
3401
3402 2011-08-05  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
3403
3404         * config/soft-fp: Move to ../libgcc.
3405         * Makefile.in (SFP_MACHINE): Remove.
3406         (libgcc-support): Remove $(SFP_MACHINE) dependency.
3407         * config/arm/sfp-machine.h: Move to ../libgcc/config/arm.
3408         * config/arm/t-arm-softfp: Move to
3409         ../libgcc/config/arm/t-softfp.
3410         * config/c6x/sfp-machine.h: Move to ../libgcc/config/c6x.
3411         * config/c6x/t-c6x-softfp: Remove.
3412         * config/i386/sfp-machine.h: Move to ../libgcc/config/i386.
3413         * config/i386/t-fprules-softfp: Move to
3414         ../libgcc/config/t-softfp-tf.
3415         * config/ia64/sfp-machine.h: Move to ../libgcc/config/ia64.
3416         * config/ia64/t-fprules-softfp: Remove.
3417         * config/lm32/sfp-machine.h: Move to ../libgcc/config/lm32.
3418         * config/lm32/t-fprules-softfp: Remove.
3419         * config/moxie/sfp-machine.h: Remove.
3420         * config/moxie/t-moxie-softfp: Remove.
3421         * config/rs6000/darwin-ldouble-format: Move to
3422         ../libgcc/config/rs6000/ibm-ldouble-format.
3423         * config/rs6000/darwin-ldouble.c: Move to
3424         ../libgcc/config/rs6000/ibm-ldouble.c
3425         * config/rs6000/libgcc-ppc-glibc.ver: Move to ../libgcc/config/rs6000.
3426         * config/rs6000/libgcc-ppc64.ver: Likewise.
3427         * config/rs6000/sfp-machine.h: Likewise.
3428         * config/rs6000/t-aix43 (SHLIB_MAPFILES): Remove
3429         $(srcdir)/config/rs6000/libgcc-ppc64.ver.
3430         (LIB2FUNCS_EXTRA): Remove.
3431         (TARGET_LIBGCC2_CFLAGS): Remove.
3432         * config/rs6000/t-aix52: Likewise
3433         * config/rs6000/t-darwin (LIB2FUNCS_EXTRA): Remove
3434         $(srcdir)/config/rs6000/darwin-ldouble.c.
3435         (SHLIB_MAPFILES): Remove.
3436         * config/rs6000/t-darwin64 (LIB2FUNCS_EXTRA): Remove
3437         $(srcdir)/config/rs6000/darwin-ldouble.c.
3438         * config/rs6000/t-fprules-softfp: Move to
3439         ../libgcc/config/t-softfp-sfdf.
3440         * config/rs6000/t-freebsd: Move to ../libgcc/config/rs6000.
3441         * config/rs6000/t-linux64 (softfp_wrap_start, softfp_wrap_end): Remove.
3442         * config/rs6000/t-ppccomm (LIB2FUNCS_EXTRA): Remove
3443         $(srcdir)/config/rs6000/darwin-ldouble.c.
3444         * config/score/sfp-machine.h: Move to ../libgcc/config/score.
3445         * config/score/t-score-softfp: Remove.
3446         * config.gcc (arm*-*-linux*): Remove arm/t-arm-softfp,
3447         soft-fp/t-softfp from tmake_file.
3448         (arm*-*-uclinux*): Likewise.
3449         (arm*-*-ecos-elf): Likewise.
3450         (arm*-*-eabi*, arm*-*-symbianelf*): Likewise.
3451         (arm*-*-rtems*): Likewise.
3452         (arm*-*-elf): Likewise.
3453         (moxie-*-elf): Remove moxie/t-moxie-softfp, soft-fp/t-softfp from
3454         tmake_file.
3455         (moxie-*-uclinux*): Likewise.
3456         (moxie-*-rtems*): Likewise.
3457         (lm32-*-elf*): Remove lm32/t-fprules-softfp, soft-fp/t-softfp from
3458         tmake_file.
3459         (lm32-*-rtems*): Likewise.
3460         (lm32-*-uclinux*): Likewise.
3461         (powerpc-*-freebsd*): Remove rs6000/t-freebsd,
3462         rs6000/t-fprules-softfp, soft-fp/t-softfp from tmake_file.
3463         (powerpc-*-linux*, powerpc64-*-linux*): Remove
3464         rs6000/t-fprules-softfp, soft-fp/t-softfp from tmake_file.
3465         (score-*-elf): Remove score/t-score-softfp, soft-fp/t-softfp from
3466         tmake_file.
3467         (tic6x-*-elf): Remove c6x/t-c6x-softfp, soft-fp/t-softfp from
3468         tmake_file.
3469         (tic6x-*-uclinux): Likewise.
3470         (i[34567]86-*-darwin*, x86_64-*-darwin*): Remove i386/t-fprules-softfp,
3471         soft-fp/t-softfp from tmake_file.
3472         (i[34567]86-*-linux*, x86_64-*-linux*, i[34567]86-*-kfreebsd*-gnu)
3473         (x86_64-*-kfreebsd*-gnu, i[34567]86-*-gnu*): Likewise.
3474         (i[34567]86-*-solaris2*, x86_64-*-solaris2.1[0-9]*): Likewise.
3475         (i[34567]86-*-cygwin*, i[34567]86-*-mingw*, x86_64-*-mingw*): Likewise.
3476         (i[34567]86-*-freebsd*, x86_64-*-freebsd*): Likewise.
3477
3478 2011-08-05  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
3479
3480         * Makefile.in (FPBIT_FUNCS, DPBIT_FUNCS, TPBIT_FUNCS): Remove.
3481         (libgcc-support): Remove $(FPBIT), $(DPBIT), $(TPBIT) dependencies.
3482         (libgcc.mvars): Remove FPBIT, FPBIT_FUNCS, DPBIT, DPBIT_FUNCS,
3483         TPBIT, TPBIT_FUNCS.
3484         * config/fp-bit.c, config/fp-bit.h: Move to ../libgcc.
3485         * config/arm/t-strongarm-elf (FPBIT, DPBIT, dp-bit.c, fp-bit.c):
3486         Remove.
3487         * config/arm/t-vxworks: Likewise.
3488         * config/arm/t-wince-pe: Likewise.
3489         * config/avr/t-avr (fp-bit.c, FPBIT): Remove.
3490         * config/bfin/t-bfin (FPBIT, DPBIT, dp-bit.c, fp-bit.c): Remove.
3491         * config/bfin/t-bfin-elf: Likewise.
3492         * config/bfin/t-bfin-linux: Likewise.
3493         * config/bfin/t-bfin-uclinux: Likewise.
3494         * config/cris/t-cris (FPBIT, DPBIT, dp-bit.c, tmplibgcc_fp_bit.c):
3495         Remove.
3496         * config/fr30/t-fr30: Likewise.
3497         * config/frv/t-frv: Likewise.
3498         * config/h8300/t-h8300 (FPBIT, fp-bit.c): Remove.
3499         * config/iq2000/t-iq2000 (FPBIT, DPBIT, dp-bit.c, fp-bit.c): Remove.
3500         * config/m32c/t-m32c: Likewise.
3501         * config/m32r/t-linux: (LIB2FUNCS_EXTRA, fp-bit.c, dp-bit.c): Remove.
3502         * config/m32r/t-m32r (FPBIT, DPBIT, dp-bit.c, fp-bit.c): Remove.
3503         * config/mcore/t-mcore: Likewise.
3504         * config/mep/t-mep: Likewise.
3505         * config/microblaze/t-microblaze: Likewise.
3506         * config/mips/t-linux64 (TPBIT, tp-bit.c): Remove.
3507         * config/mips/t-mips (FPBIT, DPBIT, dp-bit.c, fp-bit.c): Remove.
3508         * config/mips/t-sdemtk (FPBIT, DPBIT): Remove.
3509         * config/mips/t-sr71k (FPBIT, DPBIT, dp-bit.c, fp-bit.c): Remove.
3510         * config/mn10300/t-linux: Remove.
3511         * config/mn10300/t-mn10300 (FPBIT, DPBIT, dp-bit.c, fp-bit.c): Remove.
3512         * config/pdp11/t-pdp11: Likewise.
3513         * config/picochip/t-picochip (FPBIT, fp-bit.c): Remove.
3514         * config/rs6000/ppc64-fp.c: Move to ../libgcc/config/rs6000.
3515         * config/rs6000/t-aix43 (FPBIT, DPBIT, dp-bit.c, fp-bit.c): Remove.
3516         (LIB2FUNCS_EXTRA): Remove $(srcdir)/config/rs6000/ppc64-fp.c.
3517         * config/rs6000/t-aix52: Likewise.
3518         * config/rs6000/t-darwin (LIB2FUNCS_EXTRA): Remove
3519         $(srcdir)/config/rs6000/ppc64-fp.c.
3520         * config/rs6000/t-fprules-fpbit: Remove.
3521         * config/rs6000/t-linux64 (LIB2FUNCS_EXTRA): Remove.
3522         * config/rs6000/t-lynx (FPBIT, DPBIT, dp-bit.c, fp-bit.c): Remove.
3523         * config/sh/t-netbsd (FPBIT, DPBIT): Remove.
3524         * config/sh/t-sh (FPBIT, DPBIT, dp-bit.c, fp-bit.c): Remove.
3525         * config/sparc/t-elf: Likewise.
3526         * config/sparc/t-leon: Likewise.
3527         * config/sparc/t-leon3: Likewise.
3528         * config/spu/t-spu-elf: Likewise.
3529         (DPBIT_FUNCS): Remove.
3530         * config/stormy16/t-stormy16 (FPBIT, DPBIT, dp-bit.c, fp-bit.c): Remove.
3531         * config/v850/t-v850: Likewise.
3532         * config.gcc (avr-*-rtems*): Add avr/avr-lib.h to libgcc_tm_file.
3533         (avr-*-*): Likewise.
3534         (h8300-*-rtems*): Set libgcc_tm_file.
3535         (h8300-*-elf*): Likewise.
3536         (powerpc-*-eabisimaltivec*): Remove rs6000/t-fprules-fpbit from
3537         tmake_file.
3538         (powerpc-*-eabisim*): Likewise.
3539         (powerpc-*-elf*): Likewise.
3540         (powerpc-*-eabialtivec*): Likewise.
3541         (powerpc-xilinx-eabi*): Likewise.
3542         (powerpc-*-eabi*): Likewise.
3543         (powerpc-*-rtems*): Likewise.
3544         (powerpc-wrs-vxworks, powerpc-wrs-vxworksae): Likewise.
3545         (powerpcle-*-elf*): Likewise.
3546         (powerpcle-*-eabisim*): Likewise.
3547         (powerpcle-*-eabi*): Likewise.
3548         (rx-*-elf*): Add rx/rx-lib.h to libgcc_tm_file.
3549         (am33_2.0-*-linux*): Remove mn10300/t-linux from tmake_file.
3550         * doc/fragments.texi (Target Fragment, Floating Point Emulation):
3551         Remove.
3552
3553 2011-08-05  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
3554
3555         * Makefile.in (UNWIND_H): Remove.
3556         (LIB2ADDEH, LIB2ADDEHSTATIC, LIB2ADDEHSHARED): Move to
3557         ../libgcc/Makefile.in.
3558         (LIBUNWIND, SHLIBUNWIND_LINK, SHLIBUNWIND_INSTALL): Likewise.
3559         (LIBUNWINDDEP): Remove.
3560         (libgcc-support): Remove LIB2ADDEH, $(srcdir)/emutls.c dependencies.
3561         (libgcc.mvars): Remove LIB2ADDEH, LIB2ADDEHSTATIC, LIB2ADDEHSHARED,
3562         LIBUNWIND, SHLIBUNWIND_LINK, SHLIBUNWIND_INSTALL.
3563         (stmp-int-hdrs): Remove $(UNWIND_H) dependency.
3564         Don't copy $(UNWIND_H).
3565         * config.gcc (ia64*-*-linux*): Remove with_system_libunwind handling.
3566         * configure.ac (GCC_CHECK_UNWIND_GETIPINFO): Remove.
3567         * aclocal.m4: Regenerate.
3568         * configure: Regenerate.
3569         * emutls.c, unwind-c.c, unwind-compat.c, unwind-compat.h,
3570         unwind-dw2-fde-compat.c, unwind-dw2-fde-glibc.c, unwind-dw2-fde.c,
3571         unwind-dw2-fde.h, unwind-dw2.c, unwind-dw2.h, unwind-generic.h,
3572         unwind-pe.h, unwind-sjlj.c, unwind.inc: Move to ../libgcc.
3573         * unwind-dw2-fde-darwin.c: Move to ../libgcc/config.
3574         * config/arm/libunwind.S, config/arm/pr-support.c,
3575         config/arm/unwind-arm.c, config/arm/unwind-arm.h: Move to
3576         ../libgcc/config/arm.
3577         * config/arm/t-bpabi (UNWIND_H, LIB2ADDEH): Remove.
3578         * config/arm/t-symbian (UNWIND_H, LIB2ADDEH): Remove.
3579         * config/frv/t-frv ($(T)frvbegin$(objext)): Use
3580         $(srcdir)/../libgcc to refer to unwind-dw2-fde.h.
3581         ($(T)frvend$(objext)): Likewise.
3582         * config/ia64/t-glibc (LIB2ADDEH): Remove.
3583         * config/ia64/t-glibc-libunwind: Move to ../libgcc/config/ia64.
3584         * config/ia64/fde-glibc.c, config/ia64/fde-vms.c,
3585         config/ia64/unwind-ia64.c, config/ia64/unwind-ia64.h: Move to
3586         ../libgcc/config/ia64.
3587         * config/ia64/t-hpux (LIB2ADDEH): Remove.
3588         * config/ia64/t-ia64 (LIB2ADDEH): Remove.
3589         * config/ia64/t-vms (LIB2ADDEH): Remove.
3590         * config/ia64/vms.h (UNW_IVMS_MODE,
3591         MD_UNW_COMPATIBLE_PERSONALITY_P): Remove.
3592         * config/picochip/t-picochip (LIB2ADDEH): Remove.
3593         * config/rs6000/aix.h (R_LR, MD_FROB_UPDATE_CONTEXT): Remove.
3594         * config/rs6000/t-darwin (LIB2ADDEH): Remove.
3595         * config/rs6000/darwin-fallback.c: Move to ../libgcc/config/rs6000.
3596         * config/sh/t-sh ($(T)unwind-dw2-Os-4-200.o): Use
3597         $(srcdir)/../libgcc to refer to unwinder sources.
3598         * config/spu/t-spu-elf (LIB2ADDEH): Remove.
3599         * config/t-darwin (LIB2ADDEH): Remove.
3600         * config/t-freebsd (LIB2ADDEH): Remove.
3601         * config/t-libunwind (LIB2ADDEH, LIB2ADDEHSTATIC): Remove.
3602         * config/t-libunwind-elf: Move to ../libgcc/config.
3603         * config/t-linux (LIB2ADDEH): Remove.
3604         * config/t-sol2 (LIB2ADDEH): Remove.
3605         * config/xtensa/t-xtensa (LIB2ADDEH): Remove.
3606         * system.h (MD_FROB_UPDATE_CONTEXT): Poison.
3607
3608 2011-08-05  H.J. Lu  <hongjiu.lu@intel.com>
3609
3610         * config/i386/i386.c (processor_alias_table): Add core-avx-i.
3611
3612         * doc/invoke.texi: Document core-avx-i.
3613
3614 2011-08-05  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
3615
3616         * tsystem.h (CONST_CAST2, CONST_CAST): Define.
3617
3618 2011-08-05  Ira Rosen  <ira.rosen@linaro.org>
3619
3620         * tree-vect-loop.c (vect_create_epilog_for_reduction): Use the
3621         result of multiple results reduction when extracting the final
3622         value using scalar code.
3623
3624 2011-08-05  Richard Guenther  <rguenther@suse.de>
3625
3626         PR tree-optimization/49984
3627         * tree-vrp.c (extract_range_from_binary_expr_1): Handle BIT_XOR_EXPR.
3628
3629 2011-08-05  Richard Guenther  <rguenther@suse.de>
3630
3631         * tree-vrp.c (zero_nonzero_bits_from_vr): Make sure to always
3632         return true for constant integer ranges.
3633         (extract_range_from_binary_expr_1): Simplify BIT_AND_EXPR and
3634         BIT_IOR_EXPR handling.
3635
3636 2011-08-04  Kai Tietz  <ktietz@redhat.com>
3637
3638         * config/i386/i386.c (setup_incoming_varargs_ms_64): Set
3639         ix86_varargs_gpr_size and ix86_varargs_fpr_size to zero.
3640
3641 2011-08-04  Ira Rosen  <ira.rosen@linaro.org>
3642
3643         * tree-vectorizer.h (struct _stmt_vec_info): Add new field for
3644         pattern def statement, and its access macro.
3645         (NUM_PATTERNS): Set to 5.
3646         * tree-vect-loop.c (vect_determine_vectorization_factor): Handle
3647         pattern def statement.
3648         (vect_transform_loop): Likewise.
3649         * tree-vect-patterns.c (vect_vect_recog_func_ptrs): Add new
3650         function vect_recog_over_widening_pattern ().
3651         (vect_operation_fits_smaller_type): New function.
3652         (vect_recog_over_widening_pattern, vect_mark_pattern_stmts):
3653         Likewise.
3654         (vect_pattern_recog_1): Move the code that marks pattern
3655         statements to vect_mark_pattern_stmts (), and call it.  Update
3656         documentation.
3657         * tree-vect-stmts.c (vect_supportable_shift): New function.
3658         (vect_analyze_stmt): Handle pattern def statement.
3659         (new_stmt_vec_info): Initialize pattern def statement.
3660
3661 2011-08-04  Richard Henderson  <rth@redhat.com>
3662
3663         PR target/49964
3664         * config/i386/i386.c (ix86_expand_call): Don't create nested
3665         PARALLELs for TARGET_VZEROUPPER.
3666         (ix86_split_call_vzeroupper): Fix extraction of the original call.
3667         * config/i386/i386.md (*call_rex64_ms_sysv_vzeroupper): Don't
3668         recognize nested PARALLELs.
3669         (*call_pop_vzeroupper, *sibcall_pop_vzeroupper,
3670         *call_value_rex64_ms_sysv_vzeroupper, *call_value_pop_vzeroupper,
3671         *sibcall_value_pop_vzeroupper): Likewise.
3672
3673 2011-08-04  Richard Henderson  <rth@redhat.com>
3674
3675         PR middle-end/49968
3676         * calls.c (expand_call): Use fixup_args_size_notes for
3677         emit_stack_restore.
3678         * expr.c (fixup_args_size_notes): Allow STACK_POINTER_REGNUM sets
3679         in non-standard modes.
3680
3681 2011-08-04  Jakub Jelinek  <jakub@redhat.com>
3682
3683         * gcc.c (self_spec): New variable.
3684         (static_specs): Add self_spec.
3685         (main): Call do_self_spec on "self_spec" specs after reading
3686         user specs files.  Move compare_debug handling right after that.
3687
3688 2011-08-04  Richard Guenther  <rguenther@suse.de>
3689
3690         * tree-vrp.c (vrp_expr_computes_nonnegative): Remove.
3691         (value_range_nonnegative_p): New function.
3692         (ssa_name_nonnegative_p): Use it.
3693         (value_range_constant_singleton): New function.
3694         (op_with_constant_singleton_value_range): Use it.
3695         (extract_range_from_binary_expr_1): New function, split out from ...
3696         (extract_range_from_binary_expr): ... this.  Remove fallback
3697         constant folding done here.
3698
3699 2011-08-04  Richard Guenther  <rguenther@suse.de>
3700
3701         PR tree-optimization/49806
3702         * tree-vrp.c (op_with_boolean_value_range_p): New function.
3703         (simplify_truth_ops_using_ranges): Simplify.  Allow inserting
3704         a new statement for a final conversion to bool.
3705
3706 2011-08-04  Romain Geissler  <romain.geissler@gmail.com>
3707
3708         * gengtype-state.c: Include "bconfig.h" if
3709         GENERATOR_FILE is defined, "config.h" otherwise.
3710         * gengtype.c: Likewise.
3711         * gengtype-lex.l: Likewise.
3712         * gengtype-parse.c: Likewise.
3713         * Makefile.in (gengtype-lex.o-warn): New variable.
3714         (plugin_resourcesdir): Likewise.
3715         (plugin_bindir): Likewise.
3716         (plugin_includedir): Use $(plugin_resourcesdir) as prefix base.
3717         (MOSTLYCLEANFILES): Add gengtype$(exeext).
3718         (native): Depend on gengtype$(exeext) is $enable_plugin
3719         is set to "yes".
3720         (gtype.state): Depend on s-gtype. Use temporary file.
3721         (gengtype-lex.o): New rule.
3722         (gengtype-parse.o): Likewise.
3723         (gengtype-state.o): Likewise.
3724         (gengtype$(exeext)): Likewise.
3725         (install-gengtype): Likewise.
3726         (gengtype.o): Likewise.
3727         (build/gengtype.o): Depend on version.h.
3728         (build/gengtype-state): Depend on double-int.h, version.h,
3729         $(HASHTAB_H), $(OBSTACK_H), $(XREGEX_H) and build/errors.o.
3730         (install-plugin): Depend on install-gengtype.
3731
3732 2011-08-04  Jakub Jelinek  <jakub@redhat.com>
3733
3734         PR middle-end/49905
3735         * tree.h (init_attributes): New prototype.
3736         * attribs.c (init_attributes): No longer static.
3737
3738 2011-08-04  Ramana Radhakrishnan  <ramana.radhakrishnan@linaro.org>
3739
3740         * config/arm/arm.c (arm_set_fixed_optab_libfunc): Constify
3741         maybe_suffix.
3742
3743 2011-08-03   David Li  <davidxl@google.com>
3744
3745         * tree-optimize.c (execute_fixup_cfg): Fix up entry
3746         outgoing edge counts after inlining.
3747
3748 2011-08-03   David Li  <davidxl@google.com>
3749
3750         * profile.c (compute_branch_probabilities): Compute
3751         function frequency after profile annotation.
3752
3753 2011-08-04  Alan Modra  <amodra@gmail.com>
3754
3755         * config/rs6000/rs6000.c (rs6000_emit_epilogue): Simplify
3756         use_backchain_to_restore_sp initialisation.
3757         (rs6000_legitimate_offset_address_p): Simplify offset test.
3758
3759 2011-08-03  Richard Henderson  <rth@redhat.com>
3760
3761         * config/spu/spu.md: Use define_c_enum instead of define_constants.
3762         (UNSPECV_BLOCKAGE, UNSPECV_LNOP, UNSPECV_SYNC): Rename from UNSPEC_*.
3763         (UNSPECV_NOP): New.
3764
3765 2011-08-03  Richard Henderson  <rth@redhat.com>
3766
3767         PR target/34888
3768         * config/avr/avr.md: New splitter for REG_ARGS_SIZE 0.
3769
3770 2011-08-03  Jakub Jelinek  <jakub@redhat.com>
3771
3772         PR tree-optimization/49948
3773         * gimple.c (walk_stmt_load_store_addr_ops): Walk CONSTRUCTOR elements.
3774
3775 2011-08-03  Anatoly Sokolov  <aesok@post.ru>
3776
3777         * config/m32c/m32c.c (class_sizes): Remove.
3778         (reduce_class): Change arguments and return type to reg_class_t.
3779         Change type cc var to HARD_REG_SET. Change type best var to
3780         reg_class_t. Change type best_size var to unsigned int. Remove
3781         initialization class_sizes var. Use reg_class_size array instead
3782         of class_sizes. Use reg_class_contents array instead
3783         of class_contents.
3784
3785 2011-08-03  Richard Guenther  <rguenther@suse.de>
3786
3787         PR middle-end/49958
3788         * fold-const.c (fold_binary_loc): Only associate
3789         (+ (+ (* a b) c) (* d e)) as (+ (+ (* a b) (* d e)) c) if
3790         overflow wraps.
3791
3792 2011-08-03  Alan Modra  <amodra@gmail.com>
3793
3794         PR rtl-optimization/49941
3795         * jump.c (mark_jump_label): Comment.
3796         (mark_jump_label_1): Set JUMP_LABEL for return jumps.
3797         * emit-rtl.c (copy_rtx_if_shared_1, copy_insn_1): Leave RETURN shared.
3798         (mark_used_flags): Don't mark RETURN.
3799
3800 2011-08-03  Richard Guenther  <rguenther@suse.de>
3801
3802         PR tree-optimization/49938
3803         * tree-scalar-evolution.c (interpret_loop_phi): Gracefully
3804         deal with a POLYNOMIAL_CHREC.
3805
3806 2011-08-03  Revital Eres  <revital.eres@linaro.org>
3807
3808         * modulo-sched.c (calculate_stage_count,
3809         calculate_must_precede_follow, get_sched_window,
3810         try_scheduling_node_in_cycle, remove_node_from_ps): Add
3811         declaration.
3812         (update_node_sched_params, set_must_precede_follow, optimize_sc):
3813         New functions.
3814         (reset_sched_times): Call update_node_sched_params.
3815         (sms_schedule): Call optimize_sc.
3816         (get_sched_window): Change function arguments.
3817         (sms_schedule_by_order): Update call to get_sched_window.
3818         Call set_must_precede_follow.
3819         (calculate_stage_count): Add function argument.
3820
3821 2011-08-02  Richard Henderson  <rth@redhat.com>
3822
3823         PR target/49864
3824         PR target/49879
3825         * reg-notes.def (REG_ARGS_SIZE): New.
3826         * calls.c (emit_call_1): Emit REG_ARGS_SIZE for call_pop.
3827         (expand_call): Add REG_ARGS_SIZE to emit_stack_restore.
3828         * cfgcleanup.c (old_insns_match_p): Don't allow cross-jumping to
3829         different stack levels.
3830         * combine-stack-adj.c (adjust_frame_related_expr): Remove.
3831         (maybe_move_args_size_note): New.
3832         (combine_stack_adjustments_for_block): Use it.
3833         * combine.c (distribute_notes): Place REG_ARGS_SIZE.
3834         * dwarf2cfi.c (dw_cfi_row_struct): Remove args_size member.
3835         (dw_trace_info): Add beg_true_args_size, end_true_args_size,
3836         beg_delay_args_size, end_delay_args_size, eh_head, args_size_undefined.
3837         (cur_cfa): New.
3838         (queued_args_size): Remove.
3839         (add_cfi_args_size): Assert size is non-negative.
3840         (stack_adjust_offset, dwarf2out_args_size): Remove.
3841         (dwarf2out_stack_adjust, dwarf2out_notice_stack_adjust): Remove.
3842         (notice_args_size, notice_eh_throw): New.
3843         (dwarf2out_frame_debug_def_cfa): Use cur_cfa.
3844         (dwarf2out_frame_debug_adjust_cfa): Likewise.
3845         (dwarf2out_frame_debug_cfa_offset): Likewise.
3846         (dwarf2out_frame_debug_expr): Likewise.  Don't stack_adjust_offset.
3847         (dwarf2out_frame_debug): Don't handle non-frame-related-p insns.
3848         (change_cfi_row): Don't emit args_size.
3849         (maybe_record_trace_start_abnormal): Split out from ...
3850         (maybe_record_trace_start): Here.  Set args_size_undefined.
3851         (create_trace_edges): Update to match.
3852         (scan_trace): Handle REG_ARGS_SIZE.
3853         (connect_traces): Connect args_size between EH insns.
3854         * emit-rtl.c (try_split): Handle REG_ARGS_SIZE.
3855         * explow.c (suppress_reg_args_size): New.
3856         (adjust_stack_1): Split out from ...
3857         (adjust_stack): ... here.
3858         (anti_adjust_stack): Use it.
3859         (allocate_dynamic_stack_space): Suppress REG_ARGS_SIZE.
3860         * expr.c (mem_autoinc_base): New.
3861         (fixup_args_size_notes): New.
3862         (emit_single_push_insn_1): Rename from emit_single_push_insn.
3863         (emit_single_push_insn): New.  Generate REG_ARGS_SIZE.
3864         * recog.c (peep2_attempt): Handle REG_ARGS_SIZE.
3865         * reload1.c (reload_as_needed): Likewise.
3866         * rtl.h (fixup_args_size_notes): Declare.
3867
3868 2011-08-02  Paolo Carlini  <paolo.carlini@oracle.com>
3869
3870         PR bootstrap/49914
3871         * fold-const.c (fold_plusminus_mult_expr): Use abs_hwi instead
3872         of abs.
3873         * tree-ssa-math-opts.c (gimple_expand_builtin_pow): Likewise.
3874         * tree-ssa-loop-prefetch.c (prune_ref_by_group_reuse): Likewise.
3875
3876 2011-08-02  Richard Henderson  <rth@redhat.com>
3877
3878         * config/h8300/h8300.c (push, pop): Return the insn.
3879         (h8300_swap_into_er6): Generate correct unwind info.
3880         (h8300_swap_out_of_er6): Likewise.
3881         * dwarf2cfi.c (def_cfa_1): Clear cfa_cfi if we no longer have a
3882         complex cfa expression.
3883         (dwarf2out_frame_debug_def_cfa): Allow (plus (mem) (const_int)) too.
3884
3885 2011-08-02  H.J. Lu  <hongjiu.lu@intel.com>
3886
3887         * config/i386/driver-i386.c (host_detect_local_cpu): Fix a typo.
3888
3889 2011-08-02  Richard Henderson  <rth@redhat.com>
3890
3891         PR target/49878
3892         * config/h8300/h8300.c (h8300_move_ok): New.
3893         * config/h8300/h8300-protos.h: Declare it.
3894         * config/h8300/h8300.md (P): New mode iterator.
3895         (*movqi_h8300, *movqi_h8300hs, movqi): Use h8300_move_ok.
3896         (*movqi_h8sx, *movhi_h8300, *movhi_h8300hs, movhi): Likewise.
3897         (movsi, *movsi_h8300, *movsi_h8300hs): Likewise.
3898         (*pushqi1_h8300): Rename from pushqi1_h8300; use PRE_MODIFY.
3899         (*pushqi1_h8300hs_<P>): Macroize from pushqi1_h8300hs_advanced
3900         and pushqi1_h8300hs_normal; use PRE_MODIFY and
3901         register_no_sp_elim_operand.
3902         (*pushhi1_h8300hs_<P>): Similarly.
3903         (pushqi1, pushhi1, pushhi1_h8300): Remove.
3904         * config/h8300/predicates.md (register_no_sp_elim_operand): New.
3905
3906 2011-08-02  Richard Henderson  <rth@redhat.com>
3907
3908         PR target/49881
3909         * config/avr/avr.md (push<MPUSH>1): Don't constrain the operand.
3910
3911 2011-08-02  Jakub Jelinek  <jakub@redhat.com>
3912
3913         * c-parser.c (enum c_parser_prec): New enum, moved from within
3914         c_parser_binary_expression.
3915         (c_parser_binary_expression): Add PREC argument.  Stop parsing
3916         if operator has lower or equal precedence than PREC.
3917         (c_parser_conditional_expression, c_parser_omp_for_loop): Adjust
3918         callers.
3919         (c_parser_omp_atomic): Handle parsing OpenMP 3.1 atomics.
3920         Adjust c_finish_omp_atomic caller.
3921         (c_parser_omp_taskyield): New function.
3922         (c_parser_pragma): Handle PRAGMA_OMP_TASKYIELD.
3923         (c_parser_omp_clause_name): Handle final and mergeable clauses.
3924         (c_parser_omp_clause_final, c_parser_omp_clause_mergeable): New
3925         functions.
3926         (c_parser_omp_all_clauses): Handle PRAGMA_OMP_CLAUSE_FINAL
3927         and PRAGMA_OMP_CLAUSE_MERGEABLE.
3928         (OMP_TASK_CLAUSE_MASK): Allow final and mergeable clauses.
3929         (c_parser_omp_clause_reduction): Handle min and max.
3930         * c-typeck.c (c_finish_omp_clauses): Don't complain about
3931         const qualified predetermined vars in firstprivate clause.
3932         andle OMP_CLAUSE_FINAL and OMP_CLAUSE_MERGEABLE.
3933         Handle MIN_EXPR and MAX_EXPR.
3934         * tree-pretty-print.c (dump_omp_clause): Handle OMP_CLAUSE_FINAL
3935         and OMP_CLAUSE_MERGEABLE.
3936         (dump_generic_node): Handle OMP_ATOMIC_READ, OMP_ATOMIC_CAPTURE_OLD
3937         and OMP_ATOMIC_CAPTURE_NEW.
3938         * tree.c (omp_clause_num_ops): Add OMP_CLAUSE_FINAL and
3939         OMP_CLAUSE_MERGEABLE.
3940         (omp_clause_code_name): Likewise.
3941         (walk_tree_1): Handle OMP_CLAUSE_FINAL and OMP_CLAUSE_MERGEABLE.
3942         * tree.h (enum omp_clause_code): Add OMP_CLAUSE_FINAL
3943         and OMP_CLAUSE_MERGEABLE.
3944         (OMP_CLAUSE_FINAL_EXPR): Define.
3945         * omp-low.c (scan_sharing_clauses): Handle OMP_CLAUSE_FINAL and
3946         OMP_CLAUSE_MERGEABLE.
3947         (expand_task_call): Likewise.
3948         (expand_omp_atomic_load, expand_omp_atomic_store): New functions.
3949         (expand_omp_atomic_fetch_op): Handle cases where old or new
3950         value is needed afterwards.
3951         (expand_omp_atomic): Call expand_omp_atomic_load resp.
3952         expand_omp_atomic_store.
3953         * gimplify.c (gimplify_omp_atomic, gimplify_expr): Handle
3954         OMP_ATOMIC_READ, OMP_ATOMIC_CAPTURE_OLD and OMP_ATOMIC_CAPTURE_NEW.
3955         (gimplify_scan_omp_clauses, gimplify_adjust_omp_clauses): Handle
3956         OMP_CLAUSE_FINAL and OMP_CLAUSE_MERGEABLE.
3957         * tree-nested.c (convert_nonlocal_omp_clauses,
3958         convert_local_omp_clauses): Likewise.
3959         * tree.def (OMP_ATOMIC_READ, OMP_ATOMIC_CAPTURE_OLD,
3960         OMP_ATOMIC_CAPTURE_NEW): New.
3961         * gimple.h (GF_OMP_ATOMIC_NEED_VALUE): New.
3962         (gimple_omp_atomic_need_value_p, gimple_omp_atomic_set_need_value):
3963         New inlines.
3964         * omp-builtins.def (BUILT_IN_GOMP_TASKYIELD): New builtin.
3965         * doc/generic.texi: Mention OMP_CLAUSE_COLLAPSE,
3966         OMP_CLAUSE_UNTIED, OMP_CLAUSE_FINAL and OMP_CLAUSE_MERGEABLE.
3967
3968 2011-08-02  Kai Tietz  <ktietz@redhat.com>
3969
3970         * gimple.c (canonicalize_cond_expr_cond): Handle cast from
3971         boolean-type.
3972         (ssa_forward_propagate_and_combine): Interprete result of
3973         forward_propagate_comparison.
3974         * gcc/gimple-fold.c (fold_gimple_assign): Add canonicalization for
3975         boolean-typed operands for comparisons.
3976
3977 2011-08-02  Georg-Johann Lay  <avr@gjlay.de>
3978
3979         * config/avr/libgcc.S: Gather related function in the
3980         same input section.
3981         (__mulqihi3, __mulqihi3, __divmodqi4, __divmodhi4, __udivmodsi4,
3982         __divmodsi4): Use XCALL/XJMP instead of rcall/rjmp for external
3983         references.
3984         (__udivmodqi4, __divmodqi4, __udivmodhi4, __divmodhi4,
3985         __udivmodsi4, __divmodsi4, __prologue_saves__,
3986         __epilogue_restores__, _exit, __tablejump2__, __tablejump__,
3987         __do_copy_data, __do_clear_bss, __do_global_ctors,
3988         __do_global_dtors, __tablejump_elpm__): Enclose in DEFUN/ENDF.
3989
3990 2011-08-02  Uros Bizjak  <ubizjak@gmail.com>
3991
3992         PR target/47766
3993         * doc/md.texi (stack_protect_set): The pattern moves ptr_mode value.
3994         (stack_protect_test): The pattern compares ptr_mode value.
3995
3996 2011-08-02  Alan Modra  <amodra@gmail.com>
3997
3998         * config/rs6000/rs6000.c (rs6000_emit_prologue): Add REG_CFA_RESTORE
3999         note for save_LR_around_toc_setup sequence.
4000
4001 2011-08-01  H.J. Lu  <hongjiu.lu@intel.com>
4002
4003         * config/i386/lzcntintrin.h (__lzcnt64): Replace long with long long.
4004
4005 2011-08-01  Sebastian Pop  <sebastian.pop@amd.com>
4006             Joseph Myers  <joseph@codesourcery.com>
4007
4008         * Makefile.in (hwint.o): Depend on DIAGNOSTIC_CORE_H.
4009         * hwint.c: Include diagnostic-core.h.
4010         (abs_hwi): New.
4011         (gcd): Moved here...
4012         (pos_mul_hwi): New.
4013         (mul_hwi): New.
4014         (least_common_multiple): Moved here...
4015         * hwint.h (gcd): ... from here.
4016         (least_common_multiple): ... from here.
4017         (HOST_WIDE_INT_MIN): New.
4018         (HOST_WIDE_INT_MAX): New.
4019         (abs_hwi): Declared.
4020         (gcd): Declared.
4021         (pos_mul_hwi): Declared.
4022         (mul_hwi): Declared.
4023         (least_common_multiple): Declared.
4024         * omega.c (check_pos_mul): Removed.
4025         (check_mul): Removed.
4026         (omega_solve_geq): Use pos_mul_hwi instead of check_pos_mul and
4027         mul_hwi instead of check_mul.
4028
4029 2011-08-01  Richard Henderson  <rth@redhat.com>
4030
4031         PR target/49881
4032         * config/avr/avr.h (PUSH_ROUNDING): New.
4033         * config/avr/avr.md (pushqi1): Rename from *pushqi.
4034         (*pushhi, *pushsi, *pushsf): Remove.
4035         (MPUSH): New mode iterator.
4036         (push<MPUSH>1): New expander.
4037
4038 2011-08-01  Anatoly Sokolov  <aesok@post.ru>
4039
4040         * config/mmix/mmix.h (PREFERRED_RELOAD_CLASS,
4041         PREFERRED_OUTPUT_RELOAD_CLASS): Remove macro.
4042         * config/mmix/mmix-protos.h (mmix_preferred_reload_class,
4043         mmix_preferred_output_reload_class): Remove.
4044         * config/mmix/mmix.c (mmix_preferred_reload_class,
4045         mmix_preferred_output_reload_class): Make static. Change rclass
4046         argument and return type to reg_class_t.
4047         (TARGET_PREFERRED_RELOAD_CLASS,
4048         TARGET_PREFERRED_OUTPUT_RELOAD_CLASS): Define.
4049
4050 2011-08-01  Joern Rennecke  <joern.rennecke@embecosm.com>
4051
4052         * mode-switching.c (optimize_mode_switching): Fix bug in MODE_AFTER
4053         handling.
4054
4055 2011-08-01  H.J. Lu  <hongjiu.lu@intel.com>
4056
4057         PR target/47766
4058         * config/i386/i386.md (PTR): New.
4059         (stack_protect_set: Check TARGET_LP64 instead of TARGET_64BIT.
4060         (stack_protect_test): Likewise.
4061         (stack_protect_set_<mode>): Replace ":P" with ":PTR".
4062         (stack_tls_protect_set_<mode>): Likewise.
4063         (stack_tls_protect_test_<mode>): Likewise.
4064
4065 2011-08-01  Uros Bizjak  <ubizjak@gmail.com>
4066
4067         PR target/49927
4068         * config/i386/i386.c (ix86_address_subreg_operand): New.
4069         (ix86_decompose_address): Use ix86_address_subreg_operand.
4070         (ix86_legitimate_address_p): Do not assert that subregs satisfy
4071         register_no_elim_operand in DImode.
4072
4073 2011-08-01  Ira Rosen  <ira.rosen@linaro.org>
4074
4075         PR tree-optimization/49926
4076         * tree-vect-loop.c (vect_is_slp_reduction): Check that a statement
4077         in a chain doesn't have uses both inside and outside the loop.
4078
4079 2011-08-01  Georg-Johann Lay  <avr@gjlay.de>
4080
4081         * config/avr/avr.h (mcu_type_s): Add errata_skip field.
4082         * config/avr/avr-devices.c (avr_mcu_types): Use it.
4083         * config/avr/avr-mcus.def (AVR_MCU): Use it.
4084         * config/avr/avr-c.c (avr_cpu_cpp_builtins): Use it to builtin
4085         define __AVR_ERRATA_SKIP__ and __AVR_ERRATA_SKIP_JMP_CALL__.
4086         * config/avr/libgcc.S (__mulshisi3, __ffshi2, __fmulsu_exit):
4087         Use __AVR_ERRATA_SKIP_JMP_CALL__ instead of __AVR_HAVE_JMP_CALL__
4088         to detect if XJMP must not be skipped.
4089
4090 2011-08-02  Alan Modra  <amodra@gmail.com>
4091
4092         * config/rs6000/rs6000-protos.h (rs6000_save_toc_in_prologue_p):
4093         Delete.
4094         * config/rs6000/rs6000.c (rs6000_save_toc_in_prologue_p): Make static.
4095         (rs6000_emit_prologue): Don't prematurely return when
4096         TARGET_SINGLE_PIC_BASE.  Don't emit eh_frame info in
4097         save_toc_in_prologue case.
4098         (rs6000_call_indirect_aix): Only disallow save_toc_in_prologue for
4099         calls_alloca.
4100
4101 2011-08-01  Georg-Johann Lay  <avr@gjlay.de>
4102
4103         * config/avr/avr-devices.c: Delete SVN property svn:executable.
4104         * config/avr/predicates.md: Ditto.
4105         * config/avr/driver-avr.c: Ditto.
4106         * config/avr/genopt.sh: Set SVN property svn:executable to *.
4107
4108 2011-08-01  H.J. Lu  <hongjiu.lu@intel.com>
4109
4110         * calls.c (emit_library_call_value_1): Declare size only if
4111         BLOCK_REG_PADDING is defined.
4112
4113 2011-08-01  Kirill Yukhin  <kirill.yukhin@intel.com>
4114
4115         PR target/49547
4116         * config.gcc (i[34567]86-*-*): Replace abmintrin.h with lzcntintrin.h.
4117         (x86_64-*-*): Likewise.
4118         * config/i386/i386.opt (mlzcnt): New.
4119         * config/i386/abmintrin.h: File removed.
4120         (__lzcnt_u16, __lzcnt, __lzcnt_u64): Moved to ...
4121         * config/i386/lzcntintrin.h: ... here.  New file.
4122         (__lzcnt): Rename to ...
4123         (__lzcnt32): ... this.
4124         * config/i386/bmiintrin.h (head): Update copyright year.
4125         (__lzcnt_u16): Removed.
4126         (__lzcnt_u32): Likewise.
4127         (__lzcnt_u64): Likewise.
4128         * config/i386/x86intrin.h: Include lzcntintrin.h when __LZCNT__
4129         is defined, remove abmintrin.h.
4130         * config/i386/cpuid.h (bit_LZCNT): New.
4131         * config/i386/driver-i386.c (host_detect_local_cpu): Detect
4132         LZCNT feature.
4133         * config/i386/i386-c.c (ix86_target_macros_internal): Define
4134         __LZCNT__ if needed.
4135         * config/i386/i386.c (ix86_target_string): New option -mlzcnt.
4136         (ix86_option_override_internal): Handle LZCNT option.
4137         (ix86_valid_target_attribute_inner_p): Likewise.
4138         (struct builtin_description bdesc_args) <IX86_BUILTIN_CLZS>: Update.
4139         * config/i386/i386.h (TARGET_LZCNT): New.
4140         (CLZ_DEFINED_VALUE_AT_ZERO): Update.
4141         * config/i386/i386.md (clz<mode>2): Update insn constraint.
4142         (clz<mode>2_lzcnt): Likewise.
4143         * doc/invoke.texi: Mention -mlzcnt option.
4144         * doc/extend.texi: Likewise.
4145
4146 2011-08-01  Julian Brown  <julian@codesourcery.com>
4147
4148         * configure.ac (fixed-point): Add ARM support.
4149         * configure: Regenerate.
4150         * config/arm/arm.c (arm_fixed_mode_set): New struct.
4151         (arm_set_fixed_optab_libfunc): New.
4152         (arm_set_fixed_conv_libfunc): New.
4153         (arm_init_libfuncs): Initialise fixed-point helper libfuncs with
4154         ARM-specific names.
4155         (aapcs_libcall_value): Return sub-word-size fixed-point libcall
4156         return values in SImode.
4157         (arm_return_in_msb): Return fixed-point types in the msb.
4158         (arm_pad_reg_upwards, arm_pad_arg_upwards): Pad fixed-point types
4159         upwards.
4160         (arm_scalar_mode_supported_p): Support fixed-point modes.
4161         (arm_vector_mode_supported_p): Support vector fixed-point modes.
4162         * config/arm/arm.h (SHORT_FRACT_TYPE_SIZE, FRACT_TYPE_SIZE)
4163         (LONG_FRACT_TYPE_SIZE, LONG_LONG_FRACT_TYPE_SIZE)
4164         (SHORT_ACCUM_TYPE_SIZE, ACCUM_TYPE_SIZE, LONG_ACCUM_TYPE_SIZE)
4165         (LONG_LONG_ACCUM_TYPE_SIZE, MAX_FIXED_MODE_SIZE): Define.
4166         * config/arm/iterators.md (FIXED, ADDSUB, UQADDSUB, QADDSUB, QMUL):
4167         New mode iterators.
4168         (qaddsub_suf): New mode attribute.
4169         * config/arm/arm-modes.def (FRACT, UFRACT, ACCUM, UACCUM): Declare
4170         vector modes.
4171         * config/arm/predicates.md (sat_shift_operator): New predicate.
4172         * config/arm/arm-fixed.md: New.
4173         * config/arm/arm.md: Include arm-fixed.md.
4174         * config/arm/t-arm (MD_INCLUDES): Add arm-fixed.md.
4175
4176 2011-08-01  Julian Brown  <julian@codesourcery.com>
4177
4178         * calls.c (emit_library_call_value_1): Support padding for libcall
4179         arguments and return values.
4180         * config/arm/arm.c (arm_pad_arg_upward): Pad half-float values
4181         downwards in big-endian mode.
4182
4183 2011-08-01  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
4184
4185         PR debug/49887
4186         * config/sol2.c (solaris_code_end): Rename to solaris_file_end.
4187         * config/sol2-protos.h: Likewise.
4188         * config/i386/i386.c (ix86_code_end) [TARGET_SOLARIS]: Don't call
4189         solaris_code_end.
4190         * config/i386/sol2.h [!USE_GAS] (TARGET_ASM_FILE_END): Redefine.
4191         * config/sparc/sparc.c (sparc_file_end) [TARGET_SOLARIS]: Call
4192         solaris_file_end.
4193         * config/sparc/sol2.h (TARGET_ASM_CODE_END): Remove.
4194
4195 2011-08-01  Julian Brown  <julian@codesourcery.com>
4196
4197         * tree-ssa-sccvn.c (copy_reference_ops_from_ref): Support FIXED_CST.
4198
4199 2011-08-01  Julian Brown  <julian@codesourcery.com>
4200
4201         * final.c (output_addr_const): Print fixed-point constants as
4202         decimal not hex.
4203
4204 2011-08-01  Richard Guenther  <rguenther@suse.de>
4205
4206         * stor-layout.c (initialize_sizetypes): Properly sign-extend
4207         bitsiztype TYPE_MAX_VALUE.
4208
4209 2011-08-01  Julian Brown  <julian@codesourcery.com>
4210
4211         * optabs.c (prepare_cmp_insn): Use correct biasing for fixed-point
4212         comparison helpers.
4213
4214 2011-07-31  Richard Henderson  <rth@redhat.com>
4215
4216         * config/h8300/crti.asm: Add flags to .section directive.
4217         * config/h8300/crtn.asm: Likewise.
4218
4219 2011-07-31  Richard Henderson  <rth@redhat.com>
4220
4221         * stor-layout.c (initialize_sizetypes): Handle unsigned short.
4222         * tree.c (build_common_tree_nodes): Likewise.
4223
4224 2011-07-31  Kaz Kojima  <kkojima@gcc.gnu.org>
4225
4226         PR target/49880
4227         * config/sh/sh.md (udivsi3_i1): Enable for TARGET_DIVIDE_CALL_DIV1.
4228         (divsi3_i1): Likewise.
4229
4230 2011-07-31  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
4231
4232         PR tree-optimization/49749
4233         * tree-ssa-reassoc.c (get_rank): New forward declaration.
4234         (PHI_LOOP_BIAS): New macro.
4235         (phi_rank): New function.
4236         (loop_carried_phi): Likewise.
4237         (propagate_rank): Likewise.
4238         (get_rank): Add calls to phi_rank and propagate_rank.
4239
4240 2011-07-31  H.J. Lu  <hongjiu.lu@intel.com>
4241
4242         * config/i386/x86-64.h (SIZE_TYPE): Check TARGET_LP64 instead
4243         of TARGET_64BIT.
4244         (PTRDIFF_TYPE): Likewise.
4245
4246 2011-07-31  Uros Bizjak  <ubizjak@gmail.com>
4247
4248         PR target/49920
4249         * config/i386/i386.md (strset): Do not expand strset_singleop
4250         when %eax or $edi are fixed.
4251         (*strsetdi_rex_1): Disable when %eax or %edi are fixed.
4252         (*strsetsi_1): Ditto.
4253         (*strsethi_1): Ditto.
4254         (*strsetqi_1): Ditto.
4255         (*rep_stosdi_rex64): Disable when %eax, %ecx or %edi are fixed.
4256         (*rep_stossi): Ditto.
4257         (*rep_stosqi): Ditto.
4258         (*strlenqi_1): Ditto.
4259         (cmpstrnsi): Also fail when %ecx is fixed.
4260         (*cmpstrnqi_nz_1): Disable when %ecx, %esi or %edi are fixed.
4261         (*cmpstrnqi_1): Ditto.
4262         (*strmovdi_rex_1): Disable when %esi or %edi are fixed.
4263         (*strmovsi_1): Ditto.
4264         (*strmovhi_1): Ditto.
4265         (*strmovqi_1): Ditto.
4266         (*rep_movdi_rex64): Disable when %ecx, %esi or %edi are fixed.
4267         (*rep_movsi): Ditto.
4268         (*rep_movqi): Ditto.
4269
4270 2011-07-31  Mikael Pettersson  <mikpe@it.uu.se>
4271
4272         PR target/47908
4273         * config/m68k/m68k.c (m68k_override_options_after_change): New function.
4274         Disable instruction scheduling for non-ColdFire targets.
4275         (TARGET_OVERRIDE_OPTIONS_AFTER_CHANGE): Define.
4276
4277 2011-07-31  Revital Eres  <revital.eres@linaro.org>
4278
4279         * ddg.c (create_ddg_dep_from_intra_loop_link): Remove the creation
4280         of anti-dep edge from a branch.
4281         (add_cross_iteration_register_deps): Create anti-dep edge from
4282         a branch.
4283
4284 2011-07-31  Revital Eres  <revital.eres@linaro.org>
4285
4286         * modulo-sched.c: Change comment.
4287         (reset_sched_times): Fix print message.
4288         (print_partial_schedule): Add print info.
4289
4290 2011-07-31  Tom de Vries  <tom@codesourcery.com>
4291
4292         PR middle-end/43513
4293         * tree-ssa-loop-ivopts.c (may_be_unaligned_p): Use max of
4294         get_object_alignment and TYPE_ALIGN.
4295
4296 2011-07-30  Tom de Vries  <tom@codesourcery.com>
4297
4298         PR middle-end/43513
4299         * tree-ssa-dce.c (ref_may_be_aliased): Add assert.
4300         (propagate_necessity): Handle WITH_SIZE_EXPR call arg.
4301
4302 2011-07-29  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
4303
4304         * config/mips/driver-native.c [__sgi__]: Include <invent.h>,
4305         <sys/sbd.h>.
4306         (cpu_types): New array.
4307         (cputype): New function.
4308         (host_detect_local_cpu): Only define buf, f if !__sgi__.
4309         Use scaninvent instead of /proc/cpuinfo if __sgi__.
4310         * config.host: Also use driver-native.o, mips/x-native on
4311         mips-sgi-irix*.
4312         * config/mips/iris6.h [__mips__] (host_detect_local_cpu): Declare.
4313         (EXTRA_SPEC_FUNCTIONS, MARCH_MTUNE_NATIVE_SPECS): Define.
4314         (DRIVER_SELF_SPECS): Add MARCH_MTUNE_NATIVE_SPECS.
4315
4316 2011-07-29  Jakub Jelinek  <jakub@redhat.com>
4317
4318         PR middle-end/49897
4319         PR middle-end/49898
4320         * omp-low.c (use_pointer_for_field): If disallowing copy-in/out
4321         in nested parallel and outer is a gimple_reg, mark it as addressable
4322         and set its bit in task_shared_vars bitmap too.
4323
4324 2011-07-29  Uros Bizjak  <ubizjak@gmail.com>
4325
4326         * config/i386/predicates.md (tp_or_register_operand): Remove predicate.
4327
4328 2011-07-29  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
4329
4330         * config/alpha/driver-alpha.c (IMPLVER_EV4_FAMILY,
4331         IMPLVER_EV5_FAMILY, IMPLVER_EV6_FAMILY, IMPLVER_EV7_FAMILY): Define.
4332         (AMASK_BWX, AMASK_FIX, AMASK_CIX, AMASK_MVI, AMASK_PRECISE,
4333         AMASK_LOCKPFTCHOK): Define.
4334         (host_detect_local_cpu): Remove buf, f, cpu_names.
4335         Define cpu_types, implver, amask.
4336         Use __builtin_alpha_implver, __builtin_alpha_amask to determine
4337         native CPU.
4338         * config.host: Also use driver-alpha.o, alpha/x-alpha on
4339         alpha*-dec-osf*.
4340         * config/alpha/osf5.h [__alpha__ || __alpha]
4341         (host_detect_local_cpu): Declare.
4342         (EXTRA_SPEC_FUNCTIONS, MCPU_MTUNE_NATIVE_SPECS)
4343         (DRIVER_SELF_SPECS): Define.
4344
4345 2011-07-29  Uros Bizjak  <ubizjak@gmail.com>
4346
4347         PR target/47715
4348         * config/i386/i386.md (*load_tp_x32): New.
4349         (*load_tp_x32_zext): Ditto.
4350         (*add_tp_x32): Ditto.
4351         (*add_tp_x32_zext): Ditto.
4352         (*load_tp_<mode>): Disable for TARGET_X32 targets.
4353         (*add_tp_<mode>): Ditto.
4354         * config/i386/i386.c (get_thread_pointer): Load thread pointer in
4355         ptr_mode and convert to Pmode if needed.
4356
4357 2011-07-29  Georg-Johann Lay  <avr@gjlay.de>
4358
4359         PR target/49687
4360         * config/avr/avr.md (mulsi3, *mulsi3, mulu<mode>si3,
4361         muls<mode>si3, mulohisi3, mulhisi3, umulhisi3, usmulhisi3,
4362         *<any_extend:extend_prefix><any_extend2:extend_prefix>mul<QIHI:mode><QIHI2:mode>si3):
4363         Add X to register footprint: Clobber r26/r27.
4364
4365 2011-07-29  Richard Guenther  <rguenther@suse.de>
4366
4367         * builtins.c (fold_builtin_signbit): Build the comparison
4368         with a proper type.
4369
4370 2011-07-29  Richard Guenther  <rguenther@suse.de>
4371
4372         PR tree-optimization/49893
4373         * tree-predcom.c (suitable_reference_p): Volatile references
4374         are not suitable.
4375
4376 2011-07-29  Georg-Johann Lay  <avr@gjlay.de>
4377
4378         PR target/49313
4379         * config/avr/libgcc.S (__ffshi2): Don't skip 2-word instruction.
4380         (__ctzsi2): Result for 0 may be undefined.
4381         (__ctzhi2): Result for 0 may be undefined.
4382         (__popcounthi2): Don't clobber r30. Use __popcounthi2_tail.
4383         (__popcountsi2): Ditto. And don't clobber r26.
4384         (__popcountdi2): Ditto. And don't clobber r27.
4385         * config/avr/avr.md (UNSPEC_COPYSIGN): New c_enum.
4386         (parityhi2): New expand.
4387         (paritysi2): New expand.
4388         (popcounthi2): New expand.
4389         (popcountsi2): New expand.
4390         (clzhi2): New expand.
4391         (clzsi2): New expand.
4392         (ctzhi2): New expand.
4393         (ctzsi2): New expand.
4394         (ffshi2): New expand.
4395         (ffssi2): New expand.
4396         (copysignsf3): New insn.
4397         (bswapsi2): New expand.
4398         (*parityhi2.libgcc): New insn.
4399         (*parityqihi2.libgcc): New insn.
4400         (*paritysihi2.libgcc): New insn.
4401         (*popcounthi2.libgcc): New insn.
4402         (*popcountsi2.libgcc): New insn.
4403         (*popcountqi2.libgcc): New insn.
4404         (*popcountqihi2.libgcc): New insn-and-split.
4405         (*clzhi2.libgcc): New insn.
4406         (*clzsihi2.libgcc): New insn.
4407         (*ctzhi2.libgcc): New insn.
4408         (*ctzsihi2.libgcc): New insn.
4409         (*ffshi2.libgcc): New insn.
4410         (*ffssihi2.libgcc): New insn.
4411         (*bswapsi2.libgcc): New insn.
4412
4413 2011-07-29  Richard Guenther  <rguenther@suse.de>
4414
4415         * tree-vrp.c (get_value_range): Only set parameter default
4416         definitions to varying, leave others at undefined.
4417         (extract_range_from_binary_expr): Fix undefined handling.
4418         (vrp_visit_phi_node): Handle merged undefined state.
4419
4420 2011-07-29  Wei Guozhi  <carrot@google.com>
4421
4422         PR rtl-optimization/49799
4423         * combine.c (make_compound_operation): Check if the bit field is valid
4424         before change it to bit field extraction.
4425
4426 2011-07-29  Bernd Schmidt  <bernds@codesourcery.com>
4427
4428         PR rtl-optimization/49891
4429         * cfgrtl.c (force_nonfallthru_and_redirect): Set JUMP_LABEL for
4430         newly created returnjumps.
4431
4432 2011-07-28  DJ Delorie  <dj@redhat.com>
4433
4434         * expr.c (expand_expr_addr_expr_1): Detect a user request for a
4435         local frame in a naked function, and produce a suitable error for
4436         that specific case.
4437
4438         * config/m32c/m32c.c (m32c_secondary_reload_class): Allow PSI
4439         registers to be reloaded in HI classes when the target is HI.
4440
4441 2011-07-28  Sebastian Pop  <sebastian.pop@amd.com>
4442
4443         * graphite-clast-to-gimple.c: Replace v1, v2, lb, ub with
4444         bound_one, bound_two.
4445
4446 2011-07-28  Sebastian Pop  <sebastian.pop@amd.com>
4447
4448         PR middle-end/48648
4449         * graphite-clast-to-gimple.c (clast_get_body_of_loop): Handle
4450         CLAST assignments.
4451         (translate_clast): Same.
4452         (translate_clast_assignment): New.
4453
4454 2011-07-28  Sebastian Pop  <sebastian.pop@amd.com>
4455
4456         PR tree-optimization/49876
4457         * sese.c (rename_uses): Do not return false on gloog_error: set
4458         the new_expr to integer_zero_node and continue code generation.
4459         (graphite_copy_stmts_from_block): Remove early exit on gloog_error.
4460
4461 2011-07-28  Jakub Jelinek  <jakub@redhat.com>
4462
4463         PR debug/49846
4464         * var-tracking.c (prepare_call_arguments): For non-MODE_INT stack
4465         arguments also check if they aren't initialized with a MODE_INT
4466         mode of the same size.
4467
4468 2011-07-28  Aldy Hernandez  <aldyh@redhat.com>
4469
4470         * expr.c (get_bit_range): Handle *MEM_REF's.
4471
4472 2011-07-28  Bernd Schmidt  <bernds@codesourcery.com>
4473
4474         * rtlanal.c (tablejump_p): False for returns.
4475         * reorg.c (first_active_target_insn): New static function.
4476         (find_end_label): Set JUMP_LABEL for a new returnjump.
4477         (optimize_skip, get_jump_flags, rare_destination,
4478         mostly_true_jump, get_branch_condition,
4479         steal_delay_list_from_target, own_thread_p,
4480         fill_simple_delay_slots, follow_jumps, fill_slots_from_thread,
4481         fill_eager_delay_slots, relax_delay_slots, make_return_insns,
4482         dbr_schedule): Adjust to handle ret_rtx in JUMP_LABELs.
4483         * jump.c (delete_related_insns): Likewise.
4484         (jump_to_label_p): New function.
4485         (redirect_target): New static function.
4486         (redirect_exp_1): Use it.  Adjust to handle ret_rtx in JUMP_LABELS.
4487         (redirect_jump_1): Assert that the new label is nonnull.
4488         (redirect_jump): Likewise.
4489         (redirect_jump_2): Check for ANY_RETURN_P rather than NULL labels.
4490         * ifcvt.c (find_if_case_1): Take care when redirecting jumps to the
4491         exit block.
4492         (dead_or_predicable): Change NEW_DEST arg to DEST_EDGE.  All callers
4493         changed.  Ensure that the right label is passed to redirect_jump.
4494         * function.c (emit_return_into_block,
4495         thread_prologue_and_epilogue_insns): Ensure new returnjumps have
4496         ret_rtx in their JUMP_LABEL.
4497         * print-rtl.c (print_rtx): Handle ret_rtx in a JUMP_LABEL.
4498         * emit-rtl.c (skip_consecutive_labels): Allow the caller to
4499         pass ret_rtx as label.
4500         * cfglayout.c (fixup_reorder_chain): Use
4501         force_nonfallthru_and_redirect rather than force_nonfallthru.
4502         (duplicate_insn_chain): Copy JUMP_LABELs for returns.
4503         * rtl.h (ANY_RETURN_P): New macro.
4504         (jump_to_label_p): Declare.
4505         * resource.c (find_dead_or_set_registers): Handle ret_rtx in
4506         JUMP_LABELs.
4507         (mark_target_live_regs): Likewise.
4508         * basic-block.h (force_nonfallthru_and_redirect): Declare.
4509         * cfgrtl.c (force_nonfallthru_and_redirect): No longer static.
4510         * config/alpha/alpha.c (alpha_tablejump_addr_vec,
4511         alpha_tablejump_best_label): Remove functions.
4512         * config/alpha/alpha-protos.c (alpha_tablejump_addr_vec,
4513         alpha_tablejump_best_label): Remove declarations.
4514         * config/sh/sh.c (barrier_align, split_branches): Adjust for
4515         ret_rtx in JUMP_LABELs.
4516         * config/arm/arm.c (is_jump_table): Likewise.
4517
4518 2011-07-28  Uros Bizjak  <ubizjak@gmail.com>
4519
4520         * config/i386/predicates.md (pic_32bit_opreand): Do not define as
4521         special predicate.  Remove explicit mode checks.
4522
4523 2011-07-28  Jakub Jelinek  <jakub@redhat.com>
4524
4525         * dwarf2out.c (resolve_addr): For -gdwarf-2 don't optimize
4526         DW_AT_data_member_location containing just DW_OP_plus_uconst.
4527
4528         PR debug/49871
4529         * dwarf2out.c (size_of_die, value_format, output_die): Use
4530         DW_FORM_udata instead of DW_FORM_data[48] for
4531         dw_val_class_unsigned_const DW_AT_data_member_location for DWARF 3.
4532
4533 2011-07-28  H.J. Lu  <hongjiu.lu@intel.com>
4534
4535         * config/i386/i386.md (*tls_global_dynamic_64): Update
4536         length attribute.
4537
4538 2011-07-28  Uros Bizjak  <ubizjak@gmail.com>
4539
4540         PR target/47715
4541         * config/i386/i386.md (*tls_global_dynamic_64): Remove mode from
4542         tls_symbolic_operand check.  Update code sequence for TARGET_X32.
4543         (tls_global_dynamic_64): Remove mode from tls_symbolic_operand check.
4544         (tls_dynamic_gnu2_64): Ditto.
4545         (*tls_dynamic_gnu2_lea_64): Ditto.
4546         (*tls_dynamic_gnu2_call_64): Ditto.
4547         (*tls_dynamic_gnu2_combine_64): Ditto.
4548
4549 2011-07-28  H.J. Lu  <hongjiu.lu@intel.com>
4550
4551         * config.gcc: Set need_64bit_hwint to yes for x86 targets.
4552
4553 2011-07-28  H.J. Lu  <hongjiu.lu@intel.com>
4554
4555         PR target/47364
4556         * config/i386/i386.md (strlen<mode>): Replace SWI48x with P.
4557
4558 2011-07-28  Ramana Radhakrishnan  <ramana.radhakrishnan@linaro.org>
4559
4560         * config/arm/vfp.md ("*movdf_vfp"): Handle the VFP constraints
4561         before the core constraints. Adjust attributes.
4562         ("*thumb2_movdf_vfp"): Likewise.
4563
4564 2011-07-28  Kai Tietz  <ktietz@redhat.com>
4565
4566         * tree-vrp.c (simplify_stmt_using_ranges): Remove TRUTH_NOT_EXPR case.
4567         (simplify_truth_ops_using_ranges): Likewise.
4568         (build_assert_expr_for): Likewise.
4569         (build_assert_expr_for_1): Remove TRUTH_NOT_EXPR case
4570         and handle BIT_NOT_EXPR for truth-operation.
4571
4572 2011-07-28  Georg-Johann Lay  <avr@gjlay.de>
4573
4574         PR target/49313
4575         Undo r176835 from trunk
4576         2011-07-27  Georg-Johann Lay
4577
4578 2011-07-28  Georg-Johann Lay  <avr@gjlay.de>
4579
4580         PR target/49687
4581         * config/avr/t-avr (LIB1ASMFUNCS): Remove _xmulhisi3_exit.
4582         Add _muluhisi3, _mulshisi3, _usmulhisi3.
4583         * config/avr/libgcc.S (__mulsi3): Rewrite.
4584         (__mulhisi3): Rewrite.
4585         (__umulhisi3): Rewrite.
4586         (__usmulhisi3): New.
4587         (__muluhisi3): New.
4588         (__mulshisi3): New.
4589         (__mulohisi3): New.
4590         (__mulqi3, __mulqihi3, __umulqihi3, __mulhi3): Use DEFUN/ENDF to
4591         declare.
4592         * config/avr/predicates.md (pseudo_register_operand): Rewrite.
4593         (pseudo_register_or_const_int_operand): New.
4594         (combine_pseudo_register_operand): New.
4595         (u16_operand): New.
4596         (s16_operand): New.
4597         (o16_operand): New.
4598         * config/avr/avr.c (avr_rtx_costs): Handle costs for mult:SI.
4599         * config/avr/avr.md (QIHI, QIHI2): New mode iterators.
4600         (any_extend, any_extend2): New code iterators.
4601         (extend_prefix): New code attribute.
4602         (mulsi3): Rewrite. Turn insn to expander.
4603         (mulhisi3): Ditto.
4604         (umulhisi3): Ditto.
4605         (usmulhisi3): New expander.
4606         (*mulsi3): New insn-and-split.
4607         (mulu<mode>si3): New insn-and-split.
4608         (muls<mode>si3): New insn-and-split.
4609         (mulohisi3): New insn-and-split.
4610         (*uumulqihisi3, *uumulhiqisi3, *uumulhihisi3, *uumulqiqisi3,
4611         *usmulqihisi3, *usmulhiqisi3, *usmulhihisi3, *usmulqiqisi3,
4612         *sumulqihisi3, *sumulhiqisi3, *sumulhihisi3, *sumulqiqisi3,
4613         *ssmulqihisi3, *ssmulhiqisi3, *ssmulhihisi3, *ssmulqiqisi3): New
4614         insn-and-split.
4615         (*mulsi3_call): Rewrite.
4616         (*mulhisi3_call): Rewrite.
4617         (*umulhisi3_call): Rewrite.
4618         (*usmulhisi3_call): New insn.
4619         (*muluhisi3_call): New insn.
4620         (*mulshisi3_call): New insn.
4621         (*mulohisi3_call): New insn.
4622         (extendqihi2): Use combine_pseudo_register_operand as predicate
4623         for operand 1.
4624         (extendqisi2): Ditto.
4625         (zero_extendqihi2): Ditto.
4626         (zero_extendqisi2): Ditto.
4627         (zero_extendhisi2): Ditto.
4628         (extendhisi2): Ditto. Don't early-clobber operand 0.
4629
4630 2011-07-28  Uros Bizjak  <ubizjak@gmail.com>
4631
4632         * config/i386/i386.c (add->lea splitter): Add SWI mode to PLUS RTX.
4633
4634 2011-07-27  Sebastian Pop  <sebastian.pop@amd.com>
4635
4636         PR tree-optimization/49471
4637         * tree-ssa-loop-manip.c (canonicalize_loop_ivs): Build an unsigned
4638         iv only when the largest type is unsigned.  Do not call
4639         lang_hooks.types.type_for_size.
4640
4641 2011-07-27  Sebastian Pop  <sebastian.pop@amd.com>
4642
4643         PR middle-end/45450
4644         * graphite-poly.c (apply_poly_transforms): Disable legality check
4645         after an openscop read.
4646
4647 2011-07-27  Sebastian Pop  <sebastian.pop@amd.com>
4648
4649         PR middle-end/47691
4650         * graphite-clast-to-gimple.c (translate_clast_user): Update use of
4651         copy_bb_and_scalar_dependences.
4652         * sese.c (rename_uses): Do not call gcc_assert.  Set gloog_error.
4653         (graphite_copy_stmts_from_block): Update call to rename_uses.
4654         (copy_bb_and_scalar_dependences): Update call to
4655         graphite_copy_stmts_from_block.
4656         * sese.h (copy_bb_and_scalar_dependences): Update declaration.
4657
4658 2011-07-27  Georg-Johann Lay  <avr@gjlay.de>
4659
4660         PR target/49313
4661         * config/avr/libgcc.S (__ffshi2): Don't skip 2-word instruction.
4662         (__ctzsi2): Result for 0 may be undefined.
4663         (__ctzhi2): Result for 0 may be undefined.
4664         (__popcounthi2): Don't clobber r30. Use __popcounthi2_tail.
4665         (__popcountsi2): Ditto. And don't clobber r26.
4666         (__popcountdi2): Ditto. And don't clobber r27.
4667         * config/avr/avr.md (UNSPEC_COPYSIGN): New c_enum.
4668         (parityhi2): New expand.
4669         (paritysi2): New expand.
4670         (popcounthi2): New expand.
4671         (popcountsi2): New expand.
4672         (clzhi2): New expand.
4673         (clzsi2): New expand.
4674         (ctzhi2): New expand.
4675         (ctzsi2): New expand.
4676         (ffshi2): New expand.
4677         (ffssi2): New expand.
4678         (copysignsf3): New insn.
4679         (bswapsi2): New expand.
4680         (*parityhi2.libgcc): New insn.
4681         (*parityqihi2.libgcc): New insn.
4682         (*paritysihi2.libgcc): New insn.
4683         (*popcounthi2.libgcc): New insn.
4684         (*popcountsi2.libgcc): New insn.
4685         (*popcountqi2.libgcc): New insn.
4686         (*popcountqihi2.libgcc): New insn-and-split.
4687         (*clzhi2.libgcc): New insn.
4688         (*clzsihi2.libgcc): New insn.
4689         (*ctzhi2.libgcc): New insn.
4690         (*ctzsihi2.libgcc): New insn.
4691         (*ffshi2.libgcc): New insn.
4692         (*ffssihi2.libgcc): New insn.
4693         (*bswapsi2.libgcc): New insn.
4694
4695 2011-07-27  Uros Bizjak  <ubizjak@gmail.com>
4696
4697         * config/i386/i386.c (ix86_expand_move): Do not explicitly check
4698         the mode of symbolic_opreand RTXes.
4699
4700 2011-07-27  Uros Bizjak  <ubizjak@gmail.com>
4701
4702         * config/i386/predicates.md (x86_64_movabs_operand): Return false
4703         for pic_32bit_operand RTXes.
4704         * config/i386/i386.c (ix86_expand_move): Check x86_64_movabs_operand
4705         in DImode.
4706
4707 2011-07-27  Kai Tietz  <ktietz@redhat.com>
4708
4709         * config/i386/i386.c (ix86_option_override_internal): Allow -mabi
4710         for 32-bit, too.
4711         (ix86_handle_abi_attribute): Allow function attributes
4712         ms_abi/sysv_abi in 32-bit mode, too.
4713         * doc/extend.texi: Adjust attribute documentation.
4714
4715         * gimple-fold.c (or_comparisons_1): Remove TRUTH_AND/OR
4716         expression handling.
4717         (and_var_with_comparison_1): Likewise.
4718
4719 2011-07-27  Aldy Hernandez  <aldyh@redhat.com>
4720
4721         * params.h (ALLOW_STORE_DATA_RACES): New.
4722         * params.def (PARAM_ALLOW_STORE_DATA_RACES): New.
4723         * Makefile.in (expr.o): Depend on PARAMS_H.
4724         * machmode.h (get_best_mode): Add argument.
4725         * fold-const.c (optimize_bit_field_compare): Add argument to
4726         get_best_mode.
4727         (fold_truthop): Same.
4728         * ifcvt.c (noce_emit_move_insn): Add argument to store_bit_field.
4729         * expr.c (emit_group_store): Same.
4730         (copy_blkmode_from_reg): Same.
4731         (write_complex_part): Same.
4732         (optimize_bitfield_assignment_op): Add argument.
4733         Add argument to get_best_mode.
4734         (get_bit_range): New.
4735         (expand_assignment): Calculate maxbits and pass it down accordingly.
4736         (store_field): New argument.
4737         (expand_expr_real_2): New argument to store_field.  Include params.h.
4738         * expr.h (store_bit_field): New argument.
4739         * stor-layout.c (get_best_mode): Restrict mode expansion by taking
4740         into account maxbits.
4741         * calls.c (store_unaligned_arguments_into_pseudos): New argument
4742         to store_bit_field.
4743         * expmed.c (store_bit_field_1): New argument.  Use it.
4744         (store_bit_field): Same.
4745         (store_fixed_bit_field): Same.
4746         (store_split_bit_field): Same.
4747         (extract_bit_field_1): Pass new argument to get_best_mode.
4748         (extract_bit_field): Same.
4749         * stmt.c (store_bit_field): Pass new argument to store_bit_field.
4750         * doc/invoke.texi: Document parameter allow-store-data-races.
4751
4752 2011-07-27  Jakub Jelinek  <jakub@redhat.com>
4753
4754         * dwarf2out.c (gen_producer_string): Ignore also -fverbose-asm option.
4755
4756 2011-07-27  Kai Tietz  <ktietz@redhat.com>
4757
4758         * tree-vrp.c (extract_range_from_binary_expr): Remove
4759         TRUTH-binary cases and add new bitwise-cases.
4760         (extract_range_from_assignment): Likewise.
4761         (register_edge_assert_for_1): Likeiwise.
4762         (register_edge_assert_for): Likewise.
4763         (simplify_truth_ops_using_ranges): Likewise.
4764         (simplify_stmt_using_ranges): Likewise.
4765
4766 2011-07-26  H.J. Lu  <hongjiu.lu@intel.com>
4767
4768         PR target/47372
4769         * config/i386/i386.c (ix86_delegitimize_address): Call
4770         simplify_gen_subreg for PIC with mode of x only if modes of
4771         x and orig_x are different.
4772
4773 2011-07-26  Jakub Jelinek  <jakub@redhat.com>
4774
4775         * dwarf2out.c (output_macinfo_op): Ensure fd->filename points
4776         to GC allocated copy of the string.
4777         (dwarf2out_finish): Emit .debug_macinfo or .debug_macro sections
4778         before .debug_line, not after it.
4779
4780 2011-07-26  Sebastian Pop  <sebastian.pop@amd.com>
4781
4782         PR middle-end/47046
4783         * tree-chrec.h (evolution_function_is_affine_p): Recursively call
4784         evolution_function_is_affine_p on CHREC_RIGHT.
4785
4786 2011-07-26  Sebastian Pop  <sebastian.pop@amd.com>
4787
4788         * tree-data-ref.c (max_stmt_executions_tree): Do not call
4789         lang_hooks.types.type_for_size.
4790
4791 2011-07-26  Sebastian Pop  <sebastian.pop@amd.com>
4792
4793         PR middle-end/47653
4794         * graphite-scop-detection.c (graphite_can_represent_loop): Discard
4795         loops using wrapping semantics.
4796
4797 2011-07-26  Sebastian Pop  <sebastian.pop@amd.com>
4798
4799         PR middle-end/48805
4800         * tree-scalar-evolution.c (instantiate_scev_r): Return
4801         chrec_dont_know for ADDR_EXPR.
4802
4803 2011-07-26  Uros Bizjak  <ubizjak@gmail.com>
4804             H.J. Lu  <hongjiu.lu@intel.com>
4805
4806         PR target/47369
4807         PR target/49853
4808         * config/i386/i386.c (ix86_expand_move): Call convert_to_mode
4809         if legitimize_tls_address returned operand in wrong mode. Allow
4810         SImode and DImode symbolic operand for PIC.  Call convert_to_mode
4811         if legitimize_pic_address returned operand in wrong mode.
4812
4813 2011-07-26  Martin Jambor  <mjambor@suse.cz>
4814
4815         * tree-sra.c (tree_non_mode_aligned_mem_p): Strip conversions and
4816         return false for invariants.
4817
4818 2011-07-26  Uros Bizjak  <ubizjak@gmail.com>
4819
4820         * config/i386/i386.md (add->lea splitter): Implement using SWI
4821         mode iterator.  Change operand 2 predicate to <nonmemory_operand>.
4822         (add->lea zext splitter): Change operand 2 predicate to
4823         x86_64_nonmemory_operand.
4824
4825 2011-07-26  Richard Guenther  <rguenther@suse.de>
4826
4827         * predict.c (maybe_hot_frequency_p): Make sure a zero entry-block
4828         frequency makes everything hot.
4829
4830 2011-07-26  Richard Guenther  <rguenther@suse.de>
4831
4832         PR tree-optimization/49840
4833         * tree-vrp.c (range_fits_type_p): Properly handle full
4834         double-int precision.
4835
4836 2011-07-26  Martin Jambor  <mjambor@suse.cz>
4837
4838         PR bootstrap/49786
4839         * ipa-cp.c (update_profiling_info): Avoid overflow when updating
4840         counts.
4841         (update_specialized_profile): Likewise.
4842
4843 2011-07-26  Uros Bizjak  <ubizjak@gmail.com>
4844             H.J. Lu  <hongjiu.lu@intel.com>
4845
4846         PR target/47381
4847         PR target/49832
4848         PR target/49833
4849         * config/i386/i386.md (i): Change SImode attribute to "e".
4850         (g): Change SImode attribute to "rme".
4851         (di): Change SImode attribute to "nF".
4852         (general_operand): Change SImode attribute to x86_64_general_operand.
4853         (general_szext_operand): Change SImode attribute to
4854         x86_64_szext_general_operand.
4855         (immediate_operand): Change SImode attribute to
4856         x86_64_immediate_operand.
4857         (nonmemory_operand): Change SImode attribute to
4858         x86_64_nonmemory_operand.
4859         (*movdi_internal_rex64): Remove mode from pic_32bit_operand check.
4860         (*movsi_internal): Ditto.  Use "e" constraint in alternative 2.
4861         (*lea_1): Use SWI48 mode iterator.
4862         (*lea_1_zext): New insn pattern.
4863         (testsi_ccno_1): Use x86_64_nonmemory_operand predicate for operand 2.
4864         (*bt<mode>): Ditto.
4865         (*add<mode>1): Use x86_64_general_operand predicate for operand 2.
4866         Update operand constraints.
4867         (addsi_1_zext): Ditto.
4868         (*add<mode>2): Ditto.
4869         (*addsi_3_zext): Ditto.
4870         (*subsi_1_zext): Ditto.
4871         (*subsi_2_zext): Ditto.
4872         (*subsi_3_zext): Ditto.
4873         (*addsi3_carry_zext): Ditto.
4874         (*<plusminus_insn>si3_zext_cc_overflow): Ditto.
4875         (*mulsi3_1_zext): Ditto.
4876         (*andsi_1): Ditto.
4877         (*andsi_1_zext): Ditto.
4878         (*andsi_2_zext): Ditto.
4879         (*<any_or:code>si_1_zext): Ditto.
4880         (*<any_or:code>si_2_zext): Ditto.
4881         (*test<mode>_1): Use <general_operand> predicate for operand 1.
4882         (*and<mode>_2): Ditto.
4883         (mov<mode>cc): Use  <general_operand> predicate for operands 1 and 2.
4884         (add->lea splitter): Check operand modes in insn constraint.  Extend
4885         operands less than SImode wide to SImode.
4886         (add->lea zext splitter): Do not extend input operands to DImode.
4887         (*lea_general_1): Handle only QImode and HImode operands.
4888         (*lea_general_2): Ditto.
4889         (*lea_general_3): Ditto.
4890         (*lea_general_1_zext): Remove.
4891         (*lea_general_2_zext): Ditto.
4892         (*lea_general_3_zext): Ditto.
4893         (*lea_general_4): Check operand modes in insn constraint.  Extend
4894         operands less than SImode wide to SImode.
4895         (ashift->lea splitter): Ditto.
4896         * config/i386/i386.c (ix86_print_operand_address): Print address
4897         registers with 'q' modifier on 64bit targets.
4898         * config/i386/predicates.md (pic_32bit_opreand): Define as special
4899         predicate.  Reject non-SI and non-DI modes.
4900
4901 2011-07-25  Andrew Pinski  <apinski@cavium.com>
4902
4903         PR tree-opt/49671
4904         * tree-inline.c (remap_gimple_op_r): Copy TREE_THIS_VOLATILE and
4905         TREE_THIS_NOTRAP into the inner most MEM_REF.
4906         Always copy TREE_THIS_VOLATILE.
4907         * tree-sra.c (ptr_parm_has_direct_uses): Check that the lhs, rhs and
4908         arguments are not volatile references.
4909
4910 2011-07-25  Richard Henderson  <rth@redhat.com>
4911
4912         * insn-notes.def (NOTE_INSN_CFA_RESTORE_STATE): Remove.
4913         * final.c (final_scan_insn): Don't test for it.
4914         (rest_of_clean_state): Likewise.
4915
4916 2011-07-25  Richard Henderson  <rth@redhat.com>
4917
4918         PR debug/49841
4919         * config/rs6000/rs6000.c (rs6000_frame_related): Return the insn.
4920         (emit_frame_save): Likewise.
4921         (rs6000_emit_prologue): Move the FRAME_RELATED_EXPR from the save
4922         insn onto a dummy blockage insn after the join label.
4923
4924 2011-07-25  Richard Henderson  <rth@redhat.com>
4925
4926         * dwarf2cfi.c (dw_trace_info): Add ID member.
4927         (get_trace_index): Remove.  Change users to use ID member.
4928         (before_next_cfi_note): New.
4929         (connect_traces): Remove unreachable traces before the main loop.
4930         Look across one trace and generate remember/restore_state if needed.
4931
4932 2011-07-25  Richard Henderson  <rth@redhat.com>
4933
4934         * dwarf2cfi.c (dump_cfi_row, debug_cfi_row): New.
4935
4936 2011-07-25  Joern Rennecke  <joern.rennecke@embecosm.com>
4937
4938         * genattr.c (write_upcase, gen_attr <enum definition writing>):
4939         Move to ...
4940         * genattr-common.c ... here.
4941         (main): Call gen_attr.
4942         * optc-gen.awk: Make generated program include insn-attr-common.h .
4943         * Makefile.in (oprions.o): Depend on insn-attr-common.h
4944
4945 2011-07-25  Anatoly Sokolov  <aesok@post.ru>
4946
4947         * config/m32c/m32c.h (PRINT_OPERAND, PRINT_OPERAND_ADDRESS,
4948         PRINT_OPERAND_PUNCT_VALID_P): Remove macro.
4949         * config/m32c/m32c-protos.h (m32c_print_operand_punct_valid_p,
4950         m32c_print_operand, m32c_print_operand_address): Remove.
4951         * config/m32c/m32c.c (m32c_print_operand_punct_valid_p): Make static.
4952         Change return type to bool. Change argument type to bool.
4953         (m32c_print_operand, m32c_print_operand_address): Make static.
4954         (TARGET_PRINT_OPERAND, TARGET_PRINT_OPERAND_ADDRESS,
4955         TARGET_PRINT_OPERAND_PUNCT_VALID_P): Define.
4956
4957 2011-07-25  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
4958
4959         * doc/sourcebuild.texi (Effective-Target Keywords, Environment
4960         attributes): Document mmap.
4961
4962 2011-07-25  Anatoly Sokolov  <aesok@post.ru>
4963
4964         * config/mmix/mmix.h (PRINT_OPERAND, PRINT_OPERAND_ADDRESS,
4965         PRINT_OPERAND_PUNCT_VALID_P): Remove macro.
4966         * config/mmix/mmix-protos.h (mmix_print_operand_punct_valid_p,
4967         mmix_print_operand, mmix_print_operand_address): Remove.
4968         * config/mmix/mmix.c (mmix_print_operand_punct_valid_p): Make static.
4969         Change return type to bool. Change argument type to bool.
4970         (mmix_print_operand, mmix_print_operand_address): Make static.
4971         (mmix_intval, mmix_output_condition): Change 'x' argument type
4972         to const_rtx.
4973         (TARGET_PRINT_OPERAND, TARGET_PRINT_OPERAND_ADDRESS,
4974         TARGET_PRINT_OPERAND_PUNCT_VALID_P): Define.
4975
4976 2011-07-25  Georg-Johann Lay  <avr@gjlay.de>
4977
4978         PR target/39386
4979         * config/avr/avr.c (out_shift_with_cnt): Use tmp_reg as
4980         shift counter for x << x and x >> x shifts.
4981
4982 2011-07-25  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
4983
4984         PR target/47124
4985         * config.gcc: Reject *-*-solaris2 configuration.
4986
4987 2011-07-25  Richard Sandiford  <richard.sandiford@linaro.org>
4988
4989         PR tree-optimization/49809
4990         * tree-ssa-phiopt.c (cond_if_else_store_replacement): Use
4991         gimple_get_lhs instead of gimple_assign_lhs.
4992
4993 2011-07-25  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
4994
4995         * system.h [__cplusplus]: Wrap C function declarations in extern "C".
4996
4997 2011-07-25  Richard Guenther  <rguenther@suse.de>
4998
4999         PR tree-optimization/49822
5000         * tree-ssa-forwprop.c (remove_prop_source_from_use): Robustify
5001         more.  Make sure to preserve stmts with side-effects.  Properly
5002         handle virtual defs, follow a longer def chain.
5003
5004 2011-07-22  Romain Geissler  <romain.geissler@gmail.com>
5005
5006         PR plugins/45348
5007         PR plugins/48425
5008         PR plugins/46577
5009         * Makefile.in: Do not flatten c-family directory when installing
5010         plugin headers.
5011
5012 2011-07-25  Eric Botcazou  <ebotcazou@adacore.com>
5013
5014         * ipa-inline.c (can_inline_edge_p): Look into DECL_STRUCT_FUNCTION of
5015         original nodes if we are dealing with virtual clones.
5016
5017 2011-07-25  Bernd Schmidt  <bernds@codesourcery.com>
5018
5019         * common/config/c6x/c6x-common.c: New file.
5020
5021 2011-07-25  Roman Zhuykov  <zhroma@ispras.ru>
5022
5023         * tree-flow.h (tree_ssa_loop_version): Remove unused declaration.
5024
5025 2011-07-25  Richard Guenther  <rguenther@suse.de>
5026
5027         PR tree-optimization/49715
5028         * tree-vrp.c: Include expr.h and optabs.h.
5029         (range_fits_type_): New function.
5030         (simplify_float_conversion_using_ranges): Likewise.
5031         (simplify_stmt_using_ranges): Call it.
5032         * Makefile.in (tree-vrp.o): Add $(EXPR_H) and $(OPTABS_H) dependencies.
5033         * optabs.c (can_float_p): Export.
5034         * optabs.h (can_float_p): Declare.
5035
5036 2011-07-25  Richard Guenther  <rguenther@suse.de>
5037
5038         * tree-vrp.c (num_vr_values, values_propagated): New global vars.
5039         (get_value_range): For out-of-range SSA names or names created
5040         after propagation return a read-only varying range.
5041         (dump_all_value_ranges): Adjust.
5042         (vrp_initialize): Likewise.
5043         (vrp_finalize): Likewise.
5044
5045 2011-07-24  Richard Henderson  <rth@redhat.com>
5046
5047         PR debug/49831
5048         * dwarf2cfi.c (connect_traces): Allow unvisited traces.  Skip
5049         them entirely.
5050
5051 2011-07-24  Richard Henderson  <rth@redhat.com>
5052
5053         PR debug/49825
5054         * dwarf2cfi.c (dwarf2out_stack_adjust): Move A_O_A test earlier.
5055         (dwarf2out_notice_stack_adjust): Use args_size from call_insn.
5056
5057 2011-07-24  Richard Henderson  <rth@redhat.com>
5058
5059         PR debug/49827
5060         * dwarf2cfi.c (create_trace_edges): Handle sequences properly.
5061
5062 2011-07-24  Richard Henderson  <rth@redhat.com>
5063
5064         * dwarf2cfi.c (maybe_record_trace_start): Add abnormal parameter.
5065         Zero args_size for abnormal edges.  Adjust all callers.
5066
5067 2011-07-24  Richard Henderson  <rth@redhat.com>
5068
5069         PR debug/49825
5070         * dwarf2cfi.c (cfi_row_equal_p): Don't compare args_size.
5071
5072 2011-07-24  H.J. Lu  <hongjiu.lu@intel.com>
5073
5074         PR bootstrap/49835
5075         * collect2.c (demangle_flag): Removed.
5076
5077 2011-07-24  Sandra Loosemore  <sandra@codesourcery.com>
5078
5079         * configure.ac (demangler_in_ld): Default to yes.
5080         * configure: Regenerated.
5081         * collect2.c (main): When HAVE_LD_DEMANGLE is defined, don't
5082         mess with COLLECT_NO_DEMANGLE, and just pass --demangle and
5083         --no-demangle options straight through to ld.  When
5084         HAVE_LD_DEMANGLE is not defined, set COLLECT_NO_DEMANGLE in a
5085         way that has the intended effect on Windows.
5086
5087 2011-07-23  Richard Henderson  <rth@redhat.com>
5088
5089         * dwarf2cfi.c: Include basic-block.h.
5090         (dw_label_info): Remove.
5091         (trace_work_list, trace_index): New.
5092         (remember_row, emit_cfa_remember): Remove.
5093         (dw_trace_info_hash, dw_trace_info_eq): New.
5094         (get_trace_index, get_trace_info): New.
5095         (save_point_p): New.
5096         (free_cfi_row): Remove.
5097         (add_cfi): Do not emit DW_CFA_remember_state.
5098         (cfa_row_equal_p): New.
5099         (barrier_args_size): Remove.
5100         (compute_barrier_args_size_1, compute_barrier_args_size): Remove.
5101         (dwarf2out_notice_stack_adjust): Don't compute_barrier_args_size.
5102         (maybe_record_trace_start, create_trace_edges, scan_trace): New.
5103         (dwarf2out_cfi_begin_epilogue): Remove.
5104         (dwarf2out_frame_debug_restore_state): Remove.
5105         (connect_traces, create_pseudo_cfg): New.
5106         (create_cfi_notes, execute_dwarf2_frame): Rewrite using traces.
5107         * Makefile.in (dwarf2cfi.o): Update.
5108
5109 2011-07-23  Richard Henderson  <rth@redhat.com>
5110
5111         * dwarf2cfi.c (dw_trace_info): New.
5112         (dw_label_info): New.
5113         (cie_return_save): New.
5114         (cur_trace): New.
5115         (queued_args_size): Rename from args_size.  Update all users.
5116         (cfa_store, cfa_temp, regs_saved_in_regs): Remove.
5117         (def_cfa_1): Use cur_trace instead of cfa_*.
5118         (dwarf2out_stack_adjust, record_reg_saved_in_reg): Likewise.
5119         (clobbers_queued_reg_save, reg_saved_in): Likewise.
5120         (dwarf2out_frame_debug_expr): Likewise.
5121         (create_cie_data): Split out from ...
5122         (execute_dwarf2_frame): ... here.  Initialize cur_trace.
5123
5124 2011-07-23  Richard Henderson  <rth@redhat.com>
5125
5126         * dwarf2cfi.c (regs_saved_in_regs): Allocate from heap, not gc.
5127         Update all users to match.
5128         (execute_dwarf2_frame): Free reg_saved_in_data.
5129
5130 2011-07-23  Richard Henderson  <rth@redhat.com>
5131
5132         * dwarf2cfi.c (queued_reg_save): Reorder for packing.  Don't GTY.
5133         (queued_reg_saves): Don't GTY.  Change to a VEC.
5134         (queue_reg_save): Update to match.
5135         (dwarf2out_flush_queued_reg_saves): Likewise.
5136         (clobbers_queued_reg_save): Likewise.
5137         (reg_saved_in): Likewise.
5138         (execute_dwarf2_frame): Free queued_reg_saves.
5139
5140 2011-07-23  Richard Henderson  <rth@redhat.com>
5141
5142         * dwarf2cfi.c (dw_cfi_row_ref): Remove.  Update all users.
5143
5144 2011-07-23  Richard Henderson  <rth@redhat.com>
5145
5146         * dwarf2cfi.c (add_cfi_args_size): Split out from...
5147         (dwarf2out_args_size): ... here.
5148         (add_cfi_restore): Split out from ...
5149         (dwarf2out_frame_debug_cfa_restore): ... here.
5150         (def_cfa_0): Split out from ...
5151         (def_cfa_1): ... here.
5152         (cfi_oprnd_equal_p, cfi_equal_p): New.
5153         (change_cfi_row): New.
5154         (add_cfis_to_fde): Set fde->dw_fde_switch_cfi_index.
5155         (create_cfi_notes): Use change_cfi_row at SWITCH_TEXT note.
5156         (output_cfis): Remove.
5157         * dwarf2out.c (output_fde): Simplify output_cfi loop.
5158         (dwarf2out_switch_text_section): Don't call output_cfis.
5159         (dw_val_equal_p, loc_descr_equal_p_1, loc_descr_equal_p): New.
5160         * dwarf2out.h: Update decls.
5161         (enum dw_val_class): Add dw_val_class_none.
5162
5163 2011-07-23  Richard Henderson  <rth@redhat.com>
5164
5165         * dwarf2cfi.c (update_row_reg_save): New.
5166         (dwarf2out_frame_debug_cfa_expression): Use it.
5167         (dwarf2out_frame_debug_cfa_restore): Likewise.
5168         (reg_save): Likewise.  Do not emit DW_CFA_same_value.
5169
5170 2011-07-23  Richard Henderson  <rth@redhat.com>
5171
5172         * dwarf2cfi.c (add_cfi_insn): Rename from cfi_insn.  Update all users.
5173
5174 2011-07-23  Richard Henderson  <rth@redhat.com>
5175
5176         * dwarf2cfi.c (dw_cfi_row, dw_cfi_row_ref): New.
5177         (cie_cfi_row): New.
5178         (new_cfi_row, copy_cfi_row, free_cfi_row): New.
5179         (cfa, old_cfa, cfa_remember, old_cfa_remember, old_args_size): Remove.
5180         (cur_row, remember_row): New.
5181         (def_cfa_1): Use cur_row instead of the old_* variables.
5182         (dwarf2out_frame_debug_restore_state): Similarly.
5183         (dwarf2out_args_size, dwarf2out_notice_stack_adjust): Likewise.
5184         (dwarf2out_frame_debug_def_cfa): Use a local variable instead of cfa.
5185         (dwarf2out_frame_debug_adjust_cfa): Likewise.
5186         (dwarf2out_frame_debug_cfa_offset): Likewise.
5187         (dwarf2out_frame_debug_expr): Likewise.
5188         (execute_dwarf2_frame): Set up cur_row.
5189         * dwarf2out.h (struct cfa_loc): Mark for GTY.
5190
5191 2011-07-23  Richard Henderson  <rth@redhat.com>
5192
5193         * basic-block.h (EDGE_PRESERVE): New.
5194         (EDGE_ALL_FLAGS, EDGE_COMPLEX): Include it.
5195         * bb-reorder.c: Include except.h.
5196         (fix_up_crossing_landing_pad): New.
5197         (find_rarely_executed_basic_blocks_and_crossing_edges): Place
5198         landing pads in the right partition.  Duplicate as necessary.
5199         (partition_hot_cold_basic_blocks): Fix up DF info after
5200         duplicating landing pads.
5201         * cfg.c (dump_edge_info): Add crossing and preserve to bitnames.
5202         * cfgrtl.c (rtl_verify_flow_info_1): Validate that EDGE_CROSSING
5203         is set properly.  Validate that EH edges are not CROSSING.
5204         * except.c (expand_dw2_landing_pad_for_region): Split out from ...
5205         (dw2_build_landing_pads): ... here.
5206         (convert_to_eh_region_ranges): Remove code to fixup crossing
5207         landing pads.
5208         * except.h (expand_dw2_landing_pad_for_region): Declare.
5209         * tree-cfg.c (gimple_can_merge_blocks_p): Don't merge PRESERVE edges.
5210
5211 2011-07-23  Richard Earnshaw  <rearnsha@arm.com>
5212
5213         PR target/49816
5214         * arm.c (aapcs_vfp_allocate_return_reg): Return NULL on failure.
5215
5216 2011-07-22  Jason Merrill  <jason@redhat.com>
5217
5218         * doc/invoke.texi (C++ Dialect Options): Document -Wno-narrowing.
5219
5220 2011-07-22  Richard Henderson  <rth@redhat.com>
5221
5222         * bb-reorder.c (gate_handle_partition_blocks): Honor optimize.
5223
5224 2011-07-22  Richard Henderson  <rth@redhat.com>
5225
5226         * jump.c (maybe_propagate_label_ref): Split out of...
5227         (mark_all_labels): ... here.  Do not attempt label_ref
5228         propagation while in cfglayout mode.
5229
5230 2011-07-22  Jakub Jelinek  <jakub@redhat.com>
5231
5232         * dwarf2out.c (struct macinfo_struct): Change code to unsigned char.
5233         (DEBUG_MACRO_SECTION, DEBUG_MACRO_SECTION_LABEL): Define.
5234         (dwarf_attr_name): Handle DW_AT_GNU_macros.
5235         (dwarf2out_define): If the vector is empty and
5236         lineno is 0, emit a dummy entry first.
5237         (dwarf2out_undef): Likewise.  Remove redundant semicolon.
5238         (htab_macinfo_hash, htab_macinfo_eq, output_macinfo_op,
5239         optimize_macinfo_range): New functions.
5240         (output_macinfo): Use them.  If !dwarf_strict and .debug_str is
5241         mergeable, optimize longer strings using
5242         DW_MACRO_GNU_{define,undef}_indirect and if HAVE_COMDAT_GROUP,
5243         optimize longer sequences of define/undef ops from headers
5244         using DW_MACRO_GNU_transparent_include.  For !dwarf_strict
5245         emit a section headers.
5246         (dwarf2out_init): For !dwarf_strict set debug_macinfo_section
5247         and macinfo_section_label to DEBUG_MACRO_SECTION
5248         resp. DEBUG_MACRO_SECTION_LABEL.
5249         (dwarf2out_finish): For !dwarf_strict emit DW_AT_GNU_macros
5250         instead of DW_AT_macro_info.
5251
5252         PR other/32998
5253         * common.opt (grecord-gcc-switches, gno-record-gcc-switches): New
5254         options.
5255         * dwarf2out.c: Include opts.h.
5256         (dchar_p): New typedef.  Define heap VEC for it.
5257         (producer_string): New variable.
5258         (gen_producer_string): New function.
5259         (gen_compile_unit_die): Use it.
5260         (dwarf2out_finish): Fix up comp_unit_die () DW_AT_producer if needed.
5261         * Makefile.in (dwarf2out.o): Depend on $(OPTS_H).
5262         * doc/invoke.texi: Document -grecord-gcc-switches and
5263         -gno-record-gcc-switches, add a -grecord-gcc-switches reference
5264         to -frecord-gcc-switches description.
5265
5266 2011-07-22  Jason Merrill  <jason@redhat.com>
5267
5268         PR c++/30112
5269         * c-decl.c (c_linkage_bindings): Define.
5270
5271 2011-07-22  Eric Botcazou  <ebotcazou@adacore.com>
5272
5273         PR debug/49815
5274         * var-tracking.c (vt_finalize): Always free windowed_parm_regs.
5275
5276 2011-07-22  H.J. Lu  <hongjiu.lu@intel.com>
5277
5278         * config/i386/i386.c (ix86_option_override_internal): Disallow
5279         MS ABI in x32 mode.
5280         (ix86_init_builtins): Call ix86_init_builtins_va_builtins_abi
5281         only for TARGET_LP64.
5282         (ix86_handle_abi_attribute): Check TARGET_LP64 instead of TARGET_64BIT.
5283
5284 2011-07-22  Michael Meissner  <meissner@linux.vnet.ibm.com>
5285
5286         * config/rs6000/rs6000.c (rs6000_xcoff_strip_dollar): Rewrite to
5287         avoid warnings when GCC is built with a C++ compiler.
5288
5289 2011-07-22  Martin Jambor  <mjambor@suse.cz>
5290
5291         PR lto/49796
5292         * cgraphunit.c (verify_edge_corresponds_to_fndecl): Return false
5293         if decl node is in another partition, call cgraph_get_node only once.
5294
5295 2011-07-22  Uros Bizjak  <ubizjak@gmail.com>
5296
5297         * config.gcc (x86_64-*-linux*): Set
5298         default_gnu_indirect_function to yes.
5299
5300 2011-07-22  Richard Guenther  <rguenther@suse.de>
5301
5302         PR tree-optimization/45819
5303         * tree-ssa-forwprop.c (forward_propagate_addr_expr_1): Properly
5304         preserve volatile and notrap flags.
5305
5306 2011-07-22  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
5307             Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
5308
5309         PR bootstrap/49794
5310         * configure.ac: Test AM_ICONV with CXX.
5311         * configure: Regenerate.
5312         * config/sol2-c.c (solaris_format_types): Use EXPORTED_CONST.
5313
5314 2011-07-22  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
5315
5316         PR bootstrap/49797
5317         * graphite-clast-to-gimple.c (CLOOG_LANGUAGE_C): Provide if missing.
5318         (set_cloog_options): Use it.
5319
5320 2011-07-22  Jakub Jelinek  <jakub@redhat.com>
5321
5322         PR c++/49756
5323         * gcc.c (main): Call stack_limit_increase (64MB).
5324         * toplev.c (toplev_main): Likewise.
5325
5326 2011-07-21  H.J. Lu  <hongjiu.lu@intel.com>
5327
5328         * config/i386/i386.c (ix86_expand_call): Call copy_to_mode_reg
5329         instead of force_reg.
5330
5331 2011-07-21  H.J. Lu  <hongjiu.lu@intel.com>
5332
5333         * config/i386/i386.c (ix86_expand_move): Convert to Pmode if
5334         needed and use force_reg after convert.
5335         (ix86_expand_call): Likewise.
5336         (ix86_expand_special_args_builtin): Likewise.
5337         (ix86_expand_builtin): Likewise.
5338
5339 2011-07-21  Sebastian Pop  <sebastian.pop@amd.com>
5340
5341         PR middle-end/47654
5342         PR middle-end/49649
5343         * graphite-clast-to-gimple.c (type_for_clast_term): Pass v1 and v2
5344         in parameter.  Initialize v1 and v2 based on the values returned
5345         by clast_name_to_lb_ub.
5346         (type_for_clast_red): Pass v1 and v2 in parameter, and set their
5347         values.
5348         (type_for_clast_bin): Same.
5349         (type_for_clast_expr): Same.
5350         (type_for_clast_eq): Update calls to type_for_clast_expr.
5351         (type_for_clast_for): Same.
5352         (build_iv_mapping): Same.
5353         * graphite-ppl.h (value_min): New.
5354
5355 2011-07-21  Sebastian Pop  <sebastian.pop@amd.com>
5356
5357         * graphite-clast-to-gimple.c (type_for_interval): Generate signed
5358         types whenever possible.
5359
5360 2011-07-21  Sebastian Pop  <sebastian.pop@amd.com>
5361
5362         * graphite-clast-to-gimple.c (struct clast_name_index): Add lb
5363         and ub fields.
5364         (new_clast_name_index): Add lb and ub parameters.
5365         (free_clast_name_index): New.
5366         (clast_name_to_lb_ub): New.
5367         (save_clast_name_index): Add lb and ub parameters.
5368         (compute_bounds_for_param): New.
5369         (type_for_level): Removed.
5370         (type_for_clast_for): Removed level parameter.  Do not call
5371         type_for_level.
5372         (graphite_create_new_loop): Store the lb and ub for the clast_name
5373         of the iterator of the loop that has been generated.
5374         (graphite_create_new_loop_guard): Remove parameter level.
5375         (create_params_index): Store the lb and ub of each parameter.
5376         (gloog): Use free_clast_name_index.  Pass to create_params_index
5377         the current scop.
5378
5379 2011-07-21  Sebastian Pop  <sebastian.pop@amd.com>
5380
5381         * graphite-clast-to-gimple.c (max_signed_precision_type): Removed.
5382         (max_precision_type): Inline max_signed_precision_type.
5383         (type_for_clast_red): Use max_precision_type.
5384         (type_for_clast_bin): Same.
5385         (type_for_clast_for): Same.
5386
5387 2011-07-21  Sebastian Pop  <sebastian.pop@amd.com>
5388
5389         * graphite-clast-to-gimple.c (gcc_type_for_interval): Renamed
5390         type_for_interval.
5391         (gcc_type_for_value): Renamed type_for_value.
5392         (gcc_type_for_clast_term): Renamed type_for_clast_term.
5393         (gcc_type_for_clast_expr): Renamed type_for_clast_expr.
5394         (gcc_type_for_clast_red): Renamed type_for_clast_red.
5395         (gcc_type_for_clast_bin): Renamed type_for_clast_bin.
5396         (gcc_type_for_clast_eq): Renamed type_for_clast_eq.
5397         (graphite_translate_clast_equation): Update calls.
5398         (compute_type_for_level): Renamed type_for_level.
5399         (gcc_type_for_iv_of_clast_loop): Renamed type_for_clast_for.
5400         (build_iv_mapping): Update calls.
5401         (graphite_create_new_loop_guard): Same.
5402
5403 2011-07-21  Sebastian Pop  <sebastian.pop@amd.com>
5404
5405         * graphite-clast-to-gimple.c (clast_get_body_of_loop): Add fixme
5406         comment.
5407
5408 2011-07-21  Sebastian Pop  <sebastian.pop@amd.com>
5409
5410         * graphite-clast-to-gimple.c (struct ivs_params): New.
5411         (clast_name_to_gcc): Use ivs_params to pass around parameters.
5412         (clast_to_gcc_expression): Same.
5413         (clast_to_gcc_expression_red): Same.
5414         (gcc_type_for_clast_term): Same.
5415         (gcc_type_for_clast_expr): Same.
5416         (gcc_type_for_clast_red): Same.
5417         (gcc_type_for_clast_bin): Same.
5418         (gcc_type_for_clast_eq): Same.
5419         (graphite_translate_clast_equation): Same.
5420         (graphite_create_guard_cond_expr): Same.
5421         (graphite_create_new_guard): Same.
5422         (graphite_create_new_loop): Same.
5423         (build_iv_mapping): Same.
5424         (translate_clast_user): Same.
5425         (graphite_create_new_loop_guard): Same.
5426         (translate_clast): Same.
5427         (translate_clast_for_loop): Same.
5428         (translate_clast_for): Same.
5429         (translate_clast_guard): Same.
5430         (initialize_cloog_names): Fix typo.
5431         (gloog): Initialize an ivs_params struct, pass it to translate_clast.
5432
5433 2011-07-21  Sebastian Pop  <sebastian.pop@amd.com>
5434
5435         * graphite-clast-to-gimple.c (struct clast_name_index): Add level.
5436         (new_clast_name_index): Add level parameter.
5437         (clast_name_to_level): New.
5438         (save_clast_name_index): Add level parameter.
5439         (newivs_to_depth_to_newiv): Removed.
5440         (clast_name_to_gcc): Inlined newivs_to_depth_to_newiv.
5441         (graphite_create_new_loop): Add level parameter.  Pass level to
5442         save_clast_name_index.
5443         (translate_clast_for_loop): Pass level to graphite_create_new_loop.
5444         (create_params_index): Pass level to save_clast_name_index.
5445
5446 2011-07-21  Sebastian Pop  <sebastian.pop@amd.com>
5447
5448         * graphite-clast-to-gimple.c (graphite_create_new_loop): Do not
5449         recompute type, lb, and ub.  Get them from...
5450         (graphite_create_new_loop_guard): ...here.  Pass in parameter
5451         pointers to type, lb, and ub.
5452         (translate_clast_for_loop): Update function calls.
5453         (translate_clast_for): Same.
5454
5455 2011-07-21  Sebastian Pop  <sebastian.pop@amd.com>
5456
5457         * graphite-clast-to-gimple.c (compute_bounds_for_level): Call
5458         psct_dynamic_dim.
5459         (translate_clast_for_loop): Pass loop level to dependency_in_loop_p.
5460         (gcc_type_for_iv_of_clast_loop): Update use of level.
5461         (gloog): Start counting nesting level from 0.
5462         * graphite-clast-to-gimple.h (get_scattering_level): Removed.
5463         * graphite-dependences.c (graphite_carried_dependence_level_k): Call
5464         psct_dynamic_dim on level.
5465
5466 2011-07-21  H.J. Lu  <hongjiu.lu@intel.com>
5467
5468         * config/i386/i386.c (ix86_legitimize_address): Convert to
5469         Pmode if needed.
5470
5471 2011-07-21  H.J. Lu  <hongjiu.lu@intel.com>
5472
5473         * config/i386/i386.c (function_value_64): Always return pointers
5474         in Pmode.
5475         (ix86_promote_function_mode): New.
5476         (TARGET_PROMOTE_FUNCTION_MODE): Likewise.
5477
5478 2011-07-21  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
5479
5480         PR tree-optimization/49749
5481         * tree-ssa-reassoc.c (get_rank): Fix operand scan conditions and
5482         remove no-longer-used maxrank variable.
5483
5484 2011-07-21  Georg-Johann Lay  <avr@gjlay.de>
5485
5486         * config/avr/avr.c (final_prescan_insn): Fix printing of rtx_costs.
5487
5488 2011-07-21  Jason Merrill  <jason@redhat.com>
5489
5490         * system.h (HAVE_DESIGNATED_UNION_INITIALIZERS): New.
5491         * recog.h (struct insn_data_d): Check it instead of
5492         HAVE_DESIGNATED_INITIALIZERS.
5493         * genoutput.c (output_insn_data): Likewise.
5494
5495 2011-07-21  Richard Guenther  <rguenther@suse.de>
5496
5497         PR tree-optimization/49770
5498         * tree-ssa-sccvn.c (valueize_refs_1): Return whether we
5499         valueized any operand.  Renamed from ...
5500         (valueize_refs): ... this.  New wrapper around valueize_refs_1.
5501         (valueize_shared_reference_ops_from_ref): Return whether we
5502         valueized any operand.
5503         (vn_reference_lookup): Only when we valueized any operand
5504         use the valueized reference for alias analysis.  Do not preserve
5505         the original reference tree in this case.
5506
5507 2011-07-21  Uros Bizjak  <ubizjak@gmail.com>
5508
5509         * config/i386/i386.c (ix86_decompose_address): Reject all but
5510         register operands and subregs of DImode hard registers in index.
5511
5512 2011-07-21  Kai Tietz  <ktietz@redhat.com>
5513
5514         * fold-const.c (fold_unary_loc): Preserve indirect
5515         comparison cast to none-boolean type.
5516         * tree-ssa.c (useless_type_conversion_p): Preserve cast
5517         from/to boolean-type.
5518         * gimplify.c (gimple_boolify): Handle boolification of comparisons.
5519         (gimplify_expr): Boolifiy non aggregate-typed comparisons.
5520         * tree-cfg.c (verify_gimple_comparison): Check result
5521         type of comparison expression.
5522         * tree-ssa-forwprop.c (forward_propagate_comparison): Adjust test
5523         of condition result and disallow type-cast sinking into comparison.
5524
5525 2011-07-21  Richard Guenther  <rguenther@suse.de>
5526
5527         * tree-ssa-forwprop.c (combine_conversions): Return whether
5528         we have to run cfg-cleanup.  Properly remove dead stmts.
5529         (ssa_forward_propagate_and_combine): Adjust.
5530
5531 2011-07-21  Richard Sandiford  <richard.sandiford@linaro.org>
5532
5533         * regcprop.c (maybe_mode_change): Check HARD_REGNO_MODE_OK.
5534
5535 2011-07-21  Kai Tietz  <ktietz@redhat.com>
5536
5537         * tree-ssa-propagate.c (substitute_and_fold): Use
5538         do_dce flag to deside, if BB's statements are scanned
5539         in last to first, or first to last order.
5540
5541 2011-07-21  Georg-Johann Lay  <avr@gjlay.de>
5542
5543         * config/avr/avr.c (avr_rtx_costs): Set cost of CONST, LABEL_REF to 0.
5544
5545 2011-07-20  H.J. Lu  <hongjiu.lu@intel.com>
5546             Uros Bizjak  <ubizjak@gmail.com>
5547             Richard Henderson  <rth@redhat.com>
5548
5549         * config/i386/constraints.md (w): New.
5550
5551         * config/i386/i386.c (ix86_output_addr_vec_elt): Check
5552         TARGET_LP64 instead of TARGET_64BIT for ASM_QUAD.
5553
5554         * config/i386/i386.h (CASE_VECTOR_MODE): Check TARGET_LP64
5555         instead of TARGET_64BIT.
5556
5557         * config/i386/i386.md (indirect_jump): Replace
5558         nonimmediate_operand with indirect_branch_operand.
5559         (*indirect_jump): Likewise.  Replace constraint "m" with "w".
5560         (tablejump): Replace nonimmediate_operand with indirect_branch_operand.
5561         Convert operand 0 to Pmode for x32 if not PIC.
5562         (*tablejump_1): Replace nonimmediate_operand with
5563         indirect_branch_operand.  Replace constraint "m" with "w".
5564         (*call_vzeroupper): Replace constraint "m" with "w".
5565         (*call): Likewise.
5566         (*call_rex64_ms_sysv_vzeroupper): Likewise.
5567         (*call_rex64_ms_sysv): Likewise.
5568         (*call_value_vzeroupper): Likewise.
5569         (*call_value): Likewise.
5570         (*call_value_rex64_ms_sysv_vzeroupper): Likewise.
5571         (*call_value_rex64_ms_sysv): Likewise.
5572         (set_got_offset_rex64): Check TARGET_LP64 instead of TARGET_64BIT.
5573
5574         * config/i386/predicates.md (indirect_branch_operand): New.
5575         (call_insn_operand): Support x32.
5576
5577 2011-07-20  Michael Eager  <eager@eagercon.com>
5578
5579         * params.def (PARAM_MAX_VARTRACK_EXPR_DEPTH): Default to 12.
5580
5581 2011-07-20  Richard Henderson  <rth@redhat.com>
5582
5583         * cfg.c (dump_bb_info): Dump basic_block->flags.
5584         * cfgrtl.c (print_rtl_with_bb): Use dump_bb_info.
5585
5586 2011-07-20  Uros Bizjak  <ubizjak@gmail.com>
5587
5588         * config/i386/i386.c (ix86_decompose_address): Allow only subregs
5589         of DImode hard registers in index.
5590         (ix86_legitimate_address_p): Allow subregs of base and index to span
5591         more than a word.  Assert that subregs of base and index satisfy
5592         register_no_elim_operand predicates.  Reject addresses where
5593         base and index have different modes.
5594
5595 2011-07-20  Robert Millan  <rmh@gnu.org>
5596
5597         * config.gcc (mips*-*-linux*): Remove redundant tm_file entry.
5598
5599 2011-07-20  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
5600
5601         * bb-reorder.c (fix_crossing_conditional_branches): Fix crash by
5602         removing now-unnecessary assignment.
5603
5604 2011-07-20  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
5605
5606         * emit-rtl.c (set_mem_attributes_minus_bitpos): Restore setting
5607         memory address space to the type's address space.
5608
5609 2011-07-20  Georg-Johann Lay  <avr@gjlay.de>
5610
5611         PR target/36467
5612         PR target/49687
5613         * config/avr/avr.md (mulhi3): Use register_or_s9_operand for operand2
5614         and expand appropriately if there is a CONST_INT in operand2.
5615         (usmulqihi3): New insn.
5616         (*sumulqihi3): New insn.
5617         (*osmulqihi3): New insn.
5618         (*oumulqihi3): New insn.
5619         (*muluqihi3.uconst): New insn_and_split.
5620         (*muluqihi3.sconst): New insn_and_split.
5621         (*mulsqihi3.sconst): New insn_and_split.
5622         (*mulsqihi3.uconst): New insn_and_split.
5623         (*mulsqihi3.oconst): New insn_and_split.
5624         (*ashifthi3.signx.const): New insn_and_split.
5625         (*ashifthi3.signx.const7): New insn_and_split.
5626         (*ashifthi3.zerox.const): New insn_and_split.
5627         (mulsqihi3): New insn.
5628         (muluqihi3): New insn.
5629         (muloqihi3): New insn.
5630         * config/avr/predicates.md (const_2_to_7_operand): New.
5631         (const_2_to_6_operand): New.
5632         (u8_operand): New.
5633         (s8_operand): New.
5634         (o8_operand): New.
5635         (s9_operand): New.
5636         (register_or_s9_operand): New.
5637
5638 2011-07-20  Kai Tietz  <ktietz@redhat.com>
5639
5640         * builtins.c (fold_builtin_expect): See through the cast
5641         from truthvalue_type_node to long.
5642
5643 2011-07-20  Michael Meissner  <meissner@linux.vnet.ibm.com>
5644
5645         * config/rs6000/vsx.md (vsx_fma*): Use 4 argument fma instructions
5646         where we can use them from the standard and altivec instruction
5647         sets, instead of always using the 3 operand VSX forms that require
5648         the destination to overlap one of the inputs.
5649         (vsx_fms*): Ditto.
5650         (vsx_fnma*): Ditto.
5651         (vsx_fnms*): Ditto.
5652
5653         * config/rs6000/rs6000.md (fmadf4_fpr): Set fp_type fp_maddsub_d
5654         for DF types.
5655         (fmsdf4_fpr): Ditto.
5656         (nfmadf4_fpr): Ditto.
5657         (nfmsdf4_fpr): Ditto.
5658
5659 2011-07-20  Sandra Loosemore  <sandra@codesourcery.com>
5660
5661         * genrecog.c (make_insn_sequence): Correct position numbering
5662         when filtering out match_scratch and match_dup.
5663
5664 2011-07-20  Richard Guenther  <rguenther@suse.de>
5665
5666         * tree-ssa-forwprop.c (remove_prop_source_from_use): Robustify
5667         against already removed statements.
5668         (forward_propagate_into_comparison): Remove dead defining stmts.
5669         (forward_propagate_into_gimple_cond): Likewise.
5670         (forward_propagate_into_cond): Simplify.
5671         (ssa_forward_propagate_and_combine): Handle changed cfg from
5672         forward_propagate_into_comparison.
5673         * tree-ssa-phiopt.c (conditional_replacement): Use proper
5674         locations for newly built statements.
5675
5676 2011-07-20  Georg-Johann Lay  <avr@gjlay.de>
5677
5678         * config/avr/avr.c (avr_rtx_costs): Set cost of SYMBOL_REF to 0.
5679
5680 2011-07-20  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
5681
5682         * config/s390/s390.c (s390_class_max_nregs): Fix return type.
5683         * config/s390/s390-protos.h (s390_class_max_nregs): Likewise.
5684
5685 2011-07-20  Richard Guenther  <rguenther@suse.de>
5686
5687         PR middle-end/18908
5688         * tree.c (integer_all_onesp): Use TYPE_PRECISION, not mode precision.
5689         * tree-ssa-forwprop.c (simplify_bitwise_binary): Remove bogus
5690         ADDR_EXPR folding.  Canonicalize X ^ ~0 as ~X.
5691
5692 2011-07-20  Vladimir Makarov  <vmakarov@redhat.com>
5693
5694         * config/frv/frv.c (frv_register_move_cost): Define explicitly
5695         costs for subclasses of GR_REGS.
5696
5697 2011-07-20  Uros Bizjak  <ubizjak@gmail.com>
5698
5699         PR target/49780
5700         * config/i386/predicates.md (no_seg_addres_operand): No more special.
5701         * config/i386/i386.c (ix86_decompose_address): Allow only subregs
5702         of DImode hard registers in base.
5703         (ix86_legitimate_address_p): Allow SImode and DImode base and index
5704         registers.
5705
5706 2011-07-20  Richard Guenther  <rguenther@suse.de>
5707
5708         * tree-ssa-structalias.c (new_var_info): Allocate oldsolution lazily.
5709         (unify_nodes): Deal with that.
5710         (solve_graph): Likewise.
5711
5712 2011-07-20  Chung-Lin Tang  <cltang@codesourcery.com>
5713
5714         * config/arm/arm.c (arm_canonicalize_comparison): Add case to
5715         canonicalize left operand from ZERO_EXTEND to AND.
5716
5717 2011-07-20  Anatoly Sokolov  <aesok@post.ru>
5718
5719         * target.def (class_max_nregs): New hook.
5720         * doc/tm.texi.in (TARGET_CLASS_MAX_NREGS): Document.
5721         * doc/tm.texi: Regenerate.
5722         * targhooks.c (default_class_max_nregs): New function.
5723         * targhooks.h (default_class_max_nregs): Declare.
5724         * ira.h (target_ira): Change type x_ira_reg_class_max_nregs and
5725         x_ira_reg_class_min_nregs arrays to unsigned char.
5726         * ira.c (setup_reg_class_nregs): Use TARGET_CLASS_MAX_NREGS target
5727         hook instead of CLASS_MAX_NREGS macro.
5728         * reginfo.c (restore_register_info): Ditto.
5729         * ira-conflicts.c (process_regs_for_copy): Use
5730         ira_reg_class_max_nregs array instead of CLASS_MAX_NREGS macro.
5731         Change type rclass and aclass vars to reg_class_t.
5732         * ira-costs.c (record_reg_classes): Use ira_reg_class_max_nregs
5733         array instead of CLASS_MAX_NREGS macro. Change type rclass var to
5734         reg_class_t.
5735         * reload.c (combine_reloads, find_reloads, find_reloads_address_1):
5736         Use ira_reg_class_max_nregs array instead of CLASS_MAX_NREGS macro.
5737
5738         * config/i386/i386.h (CLASS_MAX_NREGS): Remove.
5739         * config/i386/i386.c (ix86_class_max_nregs): New function.
5740         (ix86_register_move_cost): Use TARGET_CLASS_MAX_NREGS target hook
5741         instead of CLASS_MAX_NREGS macro.
5742         (TARGET_CLASS_MAX_NREGS): Define.
5743         * config/avr/avr.h (CLASS_MAX_NREGS): Remove.
5744         * config/avr/avr-protos.h (class_max_nregs): Remove declaration.
5745         * config/avr/avr.c (class_max_nregs): Remove function.
5746         * config/alpha/alpha.h (CLASS_MAX_NREGS): Remove.
5747         * config/spu/spu.h (CLASS_MAX_NREGS): Remove.
5748         * config/mep/mep.h (CLASS_MAX_NREGS): Remove.
5749         * config/m32r/m32r.h (CLASS_MAX_NREGS): Remove.
5750         * config/microblaze/microblaze.h (CLASS_MAX_NREGS): Remove.
5751         * config/xtensa/xtensa.h (CLASS_MAX_NREGS): Remove.
5752         * config/stormy16/stormy16.h (CLASS_MAX_NREGS): Remove.
5753         * config/lm32/lm32.h (CLASS_MAX_NREGS): Remove.
5754         * config/moxie/moxie.h (CLASS_MAX_NREGS): Remove.
5755         * config/iq2000/iq2000.h (CLASS_MAX_NREGS): Remove.
5756         * config/mn10300/mn10300.h (CLASS_MAX_NREGS): Remove.
5757         * config/score/score.h (CLASS_MAX_NREGS): Remove.
5758         * config/vax/vax.h (CLASS_MAX_NREGS): Remove.
5759         * config/h8300/h8300.h (CLASS_MAX_NREGS): Remove.
5760         * config/v850/v850.h (CLASS_MAX_NREGS): Remove.
5761
5762 2011-07-19  Eric Botcazou  <ebotcazou@adacore.com>
5763
5764         * cif-code.def (OVERWRITABLE): Fix typo and move around.
5765         (TARGET_OPTIMIZATION_MISMATCH): Delete.
5766         (EH_PERSONALITY): Fix typo.
5767         (NON_CALL_EXCEPTIONS): Fix message.
5768         (OPTIMIZATION_MISMATCH): Adjust message.
5769         * ipa-inline.c (can_inline_edge_p): Use CIF_OPTIMIZATION_MISMATCH.
5770
5771 2011-07-19  Ian Lance Taylor  <iant@google.com>
5772
5773         * doc/install.texi (Configuration): Document
5774         --enable-build-poststage1-with-cxx.
5775
5776 2011-07-19  Robert Millan  <rmh@gnu.org>
5777
5778         * config/mips/gnu-user.h: Copy from linux.h.  Update comments.
5779         (GLIBC_DYNAMIC_LINKER): Remove.
5780
5781         * config/mips/gnu-user64.h: Copy from linux64.h.  Update comments.
5782         (GLIBC_DYNAMIC_LINKER32, GLIBC_DYNAMIC_LINKER64)
5783         (GLIBC_DYNAMIC_LINKERN32, UCLIBC_DYNAMIC_LINKERN32)
5784         (BIONIC_DYNAMIC_LINKERN32, GNU_USER_DYNAMIC_LINKERN32): Remove.
5785         (LINK_SPEC): Use GNU_USER_DYNAMIC_LINKER32,
5786         GNU_USER_DYNAMIC_LINKER64 and GNU_USER_LINK_EMULATIONN32.
5787
5788         * config/mips/linux.h: Remove everything except for ...
5789         (GLIBC_DYNAMIC_LINKER): ... this macro.
5790
5791         * config/mips/linux64.h: Remove everything except for ...
5792         (GLIBC_DYNAMIC_LINKER32, GLIBC_DYNAMIC_LINKER64)
5793         (GLIBC_DYNAMIC_LINKERN32, UCLIBC_DYNAMIC_LINKERN32)
5794         (BIONIC_DYNAMIC_LINKERN32): ... these macros.
5795         (GNU_USER_LINK_EMULATION32, GNU_USER_LINK_EMULATION64)
5796         (GNU_USER_LINK_EMULATIONN32): New macros.
5797
5798         * config.gcc (mips64*-*-linux* | mipsisa64*-*-linux* | mips-*-linux*):
5799         Use the new headers.
5800
5801 2011-07-19  Richard Sandiford  <rdsandiford@googlemail.com>
5802
5803         * rtl.h (mem_attrs): Turn offset and size fields into HOST_WIDE_INTs.
5804         Add offset_known_p and size_known_p fields.
5805         (MEM_OFFSET_KNOWN_P): Update accordingly.
5806         (MEM_OFFSET, MEM_SIZE_KNOWN_P, MEM_SIZE): Likewise.
5807         * emit-rtl.c (mem_attrs_htab_hash): Update after mem_attrs changes.
5808         (mem_attrs_eq_p, set_mem_attributes_minus_bitpos, set_mem_offset)
5809         (clear_mem_offset, set_mem_size, clear_mem_size, change_address)
5810         (adjust_address_1, widen_memory_access, set_mem_attrs_for_spill)
5811         (init_emit_regs): Likewise.
5812
5813 2011-07-19  Richard Sandiford  <rdsandiford@googlemail.com>
5814
5815         * doc/rtl.texi (MEM_OFFSET_KNOWN_P): Document.
5816         (MEM_OFFSET): Change from returning an rtx to returning a
5817         HOST_WIDE_INT.
5818         * rtl.h (MEM_OFFSET_KNOWN_P): New macro.
5819         (MEM_OFFSET): Return a HOST_WIDE_INT rather than an rtx.
5820         * emit-rtl.h (set_mem_offset): Take a HOST_WIDE_INT rather than an rtx.
5821         (clear_mem_offset): Declare.
5822         * alias.c (ao_ref_from_mem): Adjust uses of MEM_OFFSET, using
5823         MEM_OFFSET_KNOWN_P to test whether the offset is known, and
5824         MEM_OFFSET to get a HOST_WIDE_INT offset.
5825         (nonoverlapping_memrefs_p): Likewise.  Adjust calls to...
5826         (adjust_offset_for_component_ref): Take a bool "known_p"
5827         parameter and a HOST_WIDE_INT "offset" parameter.
5828         * builtins.c (get_memory_rtx): As for ao_ref_from_mem.
5829         Adjust calls to set_mem_offset, passing a HOST_WIDE_INT rather
5830         than an rtx.  Use clear_mem_offset to clear the offset.
5831         * cfgcleanup.c (merge_memattrs): Likewise.
5832         * dwarf2out.c (tls_mem_loc_descriptor): Likewise.
5833         * function.c (assign_parm_find_stack_rtl): Likewise.
5834         (assign_parm_setup_stack): Likewise.
5835         * print-rtl.c (print_rtx): Likewise.
5836         * reload.c (find_reloads_subreg_address): Likewise.
5837         * simplify-rtx.c (delegitimize_mem_from_attrs): Likewise.
5838         * var-tracking.c (INT_MEM_OFFSET): Likewise.
5839         * emit-rtl.c (set_reg_attrs_from_value): Likewise.
5840         (get_mem_align_offset): Likewise.
5841         (set_mem_offset): Take a HOST_WIDE_INT rather than an rtx.
5842         (clear_mem_offset): New function.
5843         * config/mips/mips.c (r10k_safe_mem_expr_p): Take a HOST_WIDE_INT
5844         offset rather than an rtx.  Assume both the expressio and offset
5845         are available.
5846         (r10k_needs_protection_p_1): Update accordingly, checking the
5847         expression and offset availability here instead.
5848
5849 2011-07-19  Richard Sandiford  <rdsandiford@googlemail.com>
5850
5851         * doc/rtl.texi (MEM_SIZE_KNOWN_P): Document.
5852         (MEM_SIZE): Change from returning an rtx to returning a HOST_WIDE_INT.
5853         * rtl.h (MEM_SIZE_KNOWN_P): New macro.
5854         (MEM_SIZE): Return a HOST_WIDE_INT rather than an rtx.
5855         * emit-rtl.h (set_mem_size): Take a HOST_WIDE_INT rather than an rtx.
5856         (clear_mem_size): Declare.
5857         * emit-rtl.c (set_mem_size): Take a HOST_WIDE_INT rather than an rtx.
5858         (clear_mem_size): New function.
5859         * alias.c (ao_ref_from_mem): Adjust uses of MEM_SIZE, using
5860         MEM_SIZE_KNOWN_P to test whether the size is known, and MEM_SIZE
5861         to get a HOST_WIDE_INT size.  Adjust calls to set_mem_size,
5862         passing a HOST_WIDE_INT rather than an rtx.  Use clear_mem_size
5863         to clear the size.
5864         (nonoverlapping_memrefs_p): Likewise.
5865         * builtins.c (get_memory_rtx, expand_builtin_memcmp): Likewise.
5866         (expand_builtin_init_trampoline): Likewise.
5867         * calls.c (compute_argument_addresses): Likewise.
5868         * cfgcleanup.c (merge_memattrs): Likewise.
5869         * dce.c (find_call_stack_args): Likewise.
5870         * dse.c (record_store, scan_insn): Likewise.
5871         * dwarf2out.c (dw_sra_loc_expr): Likewise.
5872         * expr.c (emit_block_move_hints): Likewise.
5873         * function.c (assign_parm_find_stack_rtl): Likewise.
5874         * print-rtl.c (print_rtx): Likewise.
5875         * reload.c (find_reloads_subreg_address): Likewise.
5876         * rtlanal.c (may_trap_p_1): Likewise.
5877         * var-tracking.c (track_expr_p): Likewise.
5878         * varasm.c (assemble_trampoline_template): Likewise.
5879         * config/arm/arm.c (arm_print_operand): Likewise.
5880         * config/h8300/h8300.c (h8sx_emit_movmd): Likewise.
5881         * config/i386/i386.c (expand_movmem_via_rep_mov): Likewise.
5882         (expand_setmem_via_rep_stos, expand_constant_movmem_prologue)
5883         (expand_constant_setmem_prologue): Likewise.
5884         * config/mips/mips.c (mips_get_unaligned_mem): Likewise.
5885         * config/rs6000/rs6000.c (expand_block_move): Likewise.
5886         (adjacent_mem_locations): Likewise.
5887         * config/s390/s390.c (s390_expand_setmem): Likewise.
5888         (s390_expand_insv): Likewise.
5889         * config/s390/s390.md (*extzv<mode>, *extv<mode>): Likewise.
5890         (*extendqi<mode>2_short_displ): Likewise.
5891         * config/sh/sh.c (expand_block_move): Likewise.
5892         * config/sh/sh.md (extv, extzv): Likewise.
5893
5894 2011-07-19  Richard Sandiford  <rdsandiford@googlemail.com>
5895
5896         * emit-rtl.c (mem_attrs_eq_p): New function, split out from...
5897         (mem_attrs_htab_eq): ...here.
5898         (find_mem_attrs): Replace with...
5899         (set_mem_attrs): ...this function.  Take a mem_attrs structure
5900         rather than individual fields.
5901         (set_mem_attributes_minus_bitpos, set_mem_alias_set)
5902         (set_mem_addr_space, set_mem_align, set_mem_expr, set_mem_offset)
5903         (set_mem_size, change_address, adjust_address_1, offset_address)
5904         (widen_memory_access, get_spill_slot_decl, set_mem_attrs_for_spill):
5905         Update accordingly.
5906
5907 2011-07-19  Richard Sandiford  <rdsandiford@googlemail.com>
5908
5909         * rtl.h (MEM_ALIAS_SET, MEM_EXPR, MEM_OFFSET, MEM_ADDR_SPACE)
5910         (MEM_SIZE, MEM_ALIGN): Redefine in terms of get_mem_attrs.
5911         Provide a dummy definition of MEM_ADDR_SPACE for generators.
5912         (target_rtl): Add x_mode_mem_attrs.
5913         (mode_mem_attrs): New macro.
5914         (get_mem_attrs): New function.
5915         * emit-rtl.c (get_mem_attrs): Rename to...
5916         (find_mem_attrs): ...this.
5917         (set_mem_attributes_minus_bitpos, set_mem_alias_set)
5918         (set_mem_addr_space, set_mem_align, set_mem_expr, set_mem_offset)
5919         (set_mem_size, change_address, adjust_address_1, offset_address)
5920         (widen_memory_access, get_spill_slot_decl, set_mem_attrs_for_spill):
5921         Update accordingly.
5922         (init_emit_regs): Initialize mode_mem_attrs.
5923
5924 2011-07-19  Richard Guenther  <rguenther@suse.de>
5925
5926         * tree-ssa-forwprop.c (lookup_logical_inverted_value): Remove
5927         TRUTH_*_EXPR handling.
5928         * tree-ssa-operands.c (get_expr_operands): Likewise.
5929         * tree-ssa-pre.c (fully_constant_expression): Likewise.
5930         * tree-ssa-uninit.c (use_pred_not_overlap_with_undef_path_pre):
5931         Likewise.
5932         (is_and_or_or): Likewise.
5933         (is_norm_cond_subset_of): Likewise.
5934
5935 2011-07-19  Richard Guenther  <rguenther@suse.de>
5936
5937         * tree.h (fold_build_pointer_plus_loc): New helper function.
5938         (fold_build_pointer_plus_hwi_loc): Likewise.
5939         (fold_build_pointer_plus): Define.
5940         (fold_build_pointer_plus_hwi): Likewise.
5941         * builtins.c (std_gimplify_va_arg_expr): Use fold_build_pointer_plus.
5942         (fold_builtin_memory_op): Likewise.
5943         (fold_builtin_stpcpy): Likewise.
5944         (fold_builtin_memchr): Likewise.
5945         (fold_builtin_strstr): Likewise.
5946         (fold_builtin_strchr): Likewise.
5947         (fold_builtin_strrchr): Likewise.
5948         (fold_builtin_strpbrk): Likewise.
5949         (fold_builtin_strcat): Likewise.
5950         (expand_builtin_memory_chk): Likewise.
5951         (fold_builtin_memory_chk): Likewise.
5952         * c-typeck.c (build_unary_op): Likewise.
5953         * cgraphunit.c (thunk_adjust): Likewise.
5954         * fold-const.c (build_range_check): Likewise.
5955         (fold_binary_loc): Likewise.
5956         * omp-low.c (extract_omp_for_data): Likewise.
5957         (expand_omp_for_generic): Likewise.
5958         (expand_omp_for_static_nochunk): Likewise.
5959         (expand_omp_for_static_chunk): Likewise.
5960         * tree-affine.c (add_elt_to_tree): Likewise.
5961         * tree-data-ref.c (split_constant_offset_1): Likewise.
5962         * tree-loop-distribution.c (generate_memset_zero): Likewise.
5963         * tree-mudflap.c (mf_xform_derefs_1): Likewise.
5964         * tree-predcom.c (ref_at_iteration): Likewise.
5965         * tree-ssa-address.c (tree_mem_ref_addr): Likewise.
5966         (add_to_parts): Likewise.
5967         (create_mem_ref): Likewise.
5968         * tree-ssa-loop-ivopts.c (force_expr_to_var_cost): Likewise.
5969         * tree-ssa-loop-niter.c (number_of_iterations_lt_to_ne): Likewise.
5970         (number_of_iterations_le): Likewise.
5971         * tree-ssa-loop-prefetch.c (issue_prefetch_ref): Likewise.
5972         * tree-vect-data-refs.c (vect_analyze_data_refs): Likewise.
5973         (vect_create_addr_base_for_vector_ref): Likewise.
5974         * tree-vect-loop-manip.c (vect_update_ivs_after_vectorizer): Likewise.
5975         (vect_create_cond_for_alias_checks): Likewise.
5976         * tree-vrp.c (extract_range_from_assert): Likewise.
5977         * config/alpha/alpha.c (alpha_va_start): Likewise.
5978         (alpha_gimplify_va_arg_1): Likewise.
5979         * config/i386/i386.c (ix86_va_start): Likewise.
5980         (ix86_gimplify_va_arg): Likewise.
5981         * config/ia64/ia64.c (ia64_gimplify_va_arg): Likewise.
5982         * config/mep/mep.c (mep_expand_va_start): Likewise.
5983         (mep_gimplify_va_arg_expr): Likewise.
5984         * config/mips/mips.c (mips_va_start): Likewise.
5985         (mips_gimplify_va_arg_expr): Likewise.
5986         * config/pa/pa.c (hppa_gimplify_va_arg_expr): Likewise.
5987         * config/rs6000/rs6000.c (rs6000_va_start): Likewise.
5988         (rs6000_gimplify_va_arg): Likewise.
5989         * config/s390/s390.c (s390_va_start): Likewise.
5990         (s390_gimplify_va_arg): Likewise.
5991         * config/sh/sh.c (sh_va_start): Likewise.
5992         (sh_gimplify_va_arg_expr): Likewise.
5993         * config/sparc/sparc.c (sparc_gimplify_va_arg): Likewise.
5994         * config/spu/spu.c (spu_va_start): Likewise.
5995         (spu_gimplify_va_arg_expr): Likewise.
5996         * config/stormy16/stormy16.c (xstormy16_expand_builtin_va_start):
5997         Likewise.
5998         (xstormy16_gimplify_va_arg_expr): Likewise.
5999         * config/xtensa/xtensa.c (xtensa_va_start): Likewise.
6000         (xtensa_gimplify_va_arg_expr): Likewise.
6001
6002 2011-07-19  Richard Guenther  <rguenther@suse.de>
6003
6004         * expr.c (expand_expr_real_2): Remove TRUTH_*_EXPR handling.
6005         (expand_expr_real_1): Remove TRUTH_*IF_EXPR and STATEMENT_LIST
6006         handling.
6007
6008         PR middle-end/18908
6009         * expr.c (expand_expr_real_2): Do not unnecessarily truncate the
6010         result of BIT_*_EXPR to bitfield precision.
6011
6012 2011-07-19  Richard Sandiford  <richard.sandiford@linaro.org>
6013
6014         PR tree-optimization/49742
6015         * tree-data-ref.c (get_references_in_stmt): Treat the lhs of a call
6016         as a potential write.
6017
6018 2011-07-19  Richard Guenther  <rguenther@suse.de>
6019
6020         * Makefile.in (tree-ssa-forwprop.o): Depend on gimple-pretty-print.h.
6021         * tree-ssa-forwprop.c: Include gimple-pretty-print.h.
6022         (forward_propagate_comparison): Simplify, remove obsolete code.
6023
6024 2011-07-19  Richard Guenther  <rguenther@suse.de>
6025
6026         * gimplify.c (gimplify_expr): Gimplify TRUTH_NOT_EXPR as
6027         BIT_XOR_EXPR, same as the RTL expander does.
6028         * tree-cfg.c (verify_expr): Disallow TRUTH_NOT_EXPR in the gimple IL.
6029         (verify_gimple_assign_unary): Likewise.
6030         * tree-ssa-propagate.c (valid_gimple_rhs_p): Disallow TRUTH_*_EXPR.
6031         * tree-ssa-forwprop.c (forward_propagate_comparison): Handle
6032         BIT_NOT_EXPR and BIT_XOR_EXPR instead of TRUTH_NOT_EXPR.
6033
6034 2011-07-19  Jakub Jelinek  <jakub@redhat.com>
6035
6036         PR tree-optimization/49768
6037         * gimple-fold.c (fold_nonarray_ctor_reference): Return NULL
6038         if offset is smaller than bitoffset, but offset+size is bigger
6039         than bitoffset.
6040
6041 2011-07-19  Ira Rosen  <ira.rosen@linaro.org>
6042
6043         PR tree-optimization/49771
6044         * tree-vect-loop-manip.c (vect_vfa_segment_size): In case of
6045         zero step, set segment length to the size of the data-ref's type.
6046
6047 2011-07-18  Martin Jambor  <mjambor@suse.cz>
6048
6049         * ipa-prop.h: Include alloc-pool.h, all sorts of updates to general
6050         comments.
6051         (ipcp_values_pool): Declare.
6052         (ipcp_sources_pool): Likewise.
6053         (ipcp_lattice): Changed to forward declaration.
6054         (ipa_param_descriptor): Removed fields ipcp_lattice, types and
6055         cannot_devirtualize.
6056         (ipa_node_params): New fields descriptors, lattices, known_vals,
6057         clone_for_all_contexts and node dead, removed fields params and
6058         count_scale.
6059         (ipa_set_param_count): Removed.
6060         (ipa_get_param_count): Made to work with descriptors vector.
6061         (ipa_get_param): Updated.
6062         (ipa_param_cannot_devirtualize_p): Removed.
6063         (ipa_param_types_vec_empty): Likewise.
6064         (ipa_set_param_used): New function.
6065         (ipa_get_param_used): Updated to use descriptors vector.
6066         (ipa_func_list): Removed.
6067         (ipa_init_func_list): Removed declaration.
6068         (ipa_push_func_to_list_1): Likewise.
6069         (ipa_pop_func_from_list): Likewise.
6070         (ipa_push_func_to_list): Removed.
6071         (ipa_lattice_from_jfunc): Remove declaration.
6072         (ipa_get_jf_pass_through_result): Declare.
6073         (ipa_get_jf_ancestor_result): Likewise.
6074         (ipa_value_from_jfunc): Likewise.
6075         (ipa_get_lattice): Update.
6076         (ipa_lat_is_single_const): New function.
6077         * ipa-prop.c (ipa_push_func_to_list_1): Removed.
6078         (ipa_init_func_list): Likewise.
6079         (ipa_pop_func_from_list): Likewise.
6080         (ipa_get_param_decl_index): Fix coding style.
6081         (count_formal_params): Removed.
6082         (count_formal_params_1): Renamed to count_formal_params.
6083         (ipa_populate_param_decls): Update to use descriptors vector.
6084         (ipa_initialize_node_params): Likewise.
6085         (visit_ref_for_mod_analysis): Use ipa_set_param_used.
6086         (ipa_analyze_params_uses): Likewise.
6087         (ipa_free_node_params_substructures): Likewise and free also lattices
6088         and known values.
6089         (duplicate_array): Removed.
6090         (ipa_edge_duplication_hook): Add the new edge to the list of edge
6091         clones.
6092         (ipa_node_duplication_hook): Update to use new lattices.
6093         (ipa_free_all_structures_after_ipa_cp): Free alloc pools.
6094         (ipa_free_all_structures_after_iinln): Likewise.
6095         (ipa_write_node_info): Update to use new lattices.
6096         (ipa_read_node_info): Likewise.
6097         (ipa_get_jf_pass_through_result): New function.
6098         (ipa_get_jf_ancestor_result): Likewise.
6099         (ipa_value_from_jfunc): Likewise.
6100         (ipa_cst_from_jfunc): Reimplemented using ipa_value_from_jfunc.
6101         * ipa-cp.c: Reimplemented.
6102         * params.def (PARAM_DEVIRT_TYPE_LIST_SIZE): Removed.
6103         (PARAM_IPA_CP_VALUE_LIST_SIZE): New parameter.
6104         (PARAM_IPA_CP_EVAL_THRESHOLD): Likewise.
6105         * Makefile.in (IPA_PROP_H): Added alloc-pool.h to dependencies.
6106         * doc/invoke.texi (devirt-type-list-size): Removed description.
6107         (ipa-cp-value-list-size): Added description.
6108
6109 2011-07-18  Richard Henderson  <rth@redhat.com>
6110
6111         * bb-reorder.c (fix_crossing_conditional_branches): Emit all insns
6112         before calling create_basic_block.
6113
6114 2011-07-18  Jakub Jelinek  <jakub@redhat.com>
6115
6116         PR middle-end/49675
6117         * tree.c (build_common_builtin_nodes): Register
6118         __builtin_return_address, __cyg_profile_func_enter
6119         and __cyg_profile_func_exit.
6120
6121 2011-07-18  Richard Henderson  <rth@redhat.com>
6122
6123         * bb-reorder.c (emit_barrier_after_bb): Split out of ...
6124         (add_labels_and_missing_jumps): ... here.
6125         (fix_up_fall_thru_edges, fix_crossing_conditional_branches): Use it.
6126
6127 2011-07-18  Uros Bizjak  <ubizjak@gmail.com>
6128
6129         PR target/47744
6130         * config/i386/i386.c (ix86_decompose_address): Allow only subregs
6131         of DImode hard registers in PLUS address chains.
6132
6133 2011-07-18  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
6134
6135         PR bootstrap/49769
6136         * config.gcc (alpha*-*-linux*): Add crtfastmath.o to extra_parts.
6137         (alpha*-*-freebsd*): Likewise.
6138         (i[34567]86-*-linux*, i[34567]86-*-kfreebsd*-gnu,
6139         i[34567]86-*-knetbsd*-gnu, i[34567]86-*-gnu*,
6140         i[34567]86-*-kopensolaris*-gnu): Add crtprec32.o, crtprec64.o,
6141         crtprec80.o, crtfastmath.o to extra_parts for all targets.
6142         (ia64*-*-elf*): Remove extra_parts.
6143         (sparc-*-linux*): Add crtfastmath.o to extra_parts.
6144         (sparc64-*-linux*): Likewise.
6145         (sparc64-*-freebsd*): Likewise.
6146
6147         Revert:
6148         * config.gcc (ia64*-*-freebsd*): Remove crtfastmath.o from extra_parts.
6149         (ia64*-*-linux*): Likewise.
6150         (mips64*-*-linux*): Likewise.
6151         (mips*-*-linux*): Likewise.
6152
6153 2011-07-18  David Edelsohn  <dje.gcc@gmail.com>
6154
6155         * doc/install.texi (Specific, *-ibm-aix*): AIX assembler bug.
6156
6157 2011-07-18  Richard Guenther  <rguenther@suse.de>
6158
6159         * gimplify.c (gimplify_expr): Use input_location, not saved_location
6160         when building new trees.
6161
6162 2011-07-18  Richard Guenther  <rguenther@suse.de>
6163
6164         * expr.c (expand_expr_real_2): Properly truncate the BIT_NOT_EXPR
6165         expansion result to bitfield precision if required.
6166
6167 2011-07-18  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
6168
6169         * config.gcc (i[3456x]86-*-netware*): Remove.
6170
6171         * gthr-nks.h: Remove.
6172         * configure.ac (enable_threads): Remove nks.
6173         * configure: Regenerate.
6174
6175         * config/i386/i386.c (ix86_encode_section_info): Remove netware
6176         reference.
6177         * config/i386/i386.h (KEEP_AGGREGATE_RETURN_POINTER): Remove
6178         <netware.h> reference.
6179
6180         * config/i386/netware-libgcc.c,
6181         gcc/config/i386/netware-libgcc.def,
6182         gcc/config/i386/netware-libgcc.exp, gcc/config/i386/netware.c,
6183         gcc/config/i386/netware.h, gcc/config/i386/netware.opt,
6184         gcc/config/i386/nwld.c, gcc/config/i386/nwld.h,
6185         gcc/config/i386/t-netware, gcc/config/i386/t-nwld: Remove
6186
6187         * doc/extend.texi (Function Attributes,
6188         callee_pop_aggregate_return): Remove i?86-netware reference.
6189         * doc/install.texi (Configuration, --enable-threads): Remove nks.
6190
6191 2011-07-17  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
6192
6193         PR target/49746
6194         Revert:
6195         2010-12-30  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
6196
6197         * config/pa/pa.md: Add ",*" condition to 64-bit add/subtract boolean
6198         patterns.
6199
6200 2011-07-17  Eric Botcazou  <ebotcazou@adacore.com>
6201
6202         PR middle-end/49732
6203         * tree.c (walk_tree_1) <DECL_EXPR>: Do not walk a pointed-to type.
6204
6205 2011-07-16  Matthias Klose  <doko@ubuntu.com>
6206
6207         * doc/install.texi: Document --enable-static-libjava.
6208
6209 2011-07-15  Richard Henderson  <rth@redhat.com>
6210
6211         * bb-reorder.c (find_rarely_executed_basic_blocks_and_crossing_edges):
6212         Replace all three arguments by returning a VEC of edges.
6213         (add_labels_and_missing_jumps): Accept a VEC of edges, not bare
6214         pointers and counts.
6215         (fix_edges_for_rarely_executed_code): Merge ...
6216         (rest_of_handle_partition_blocks): ... into...
6217         (partition_hot_cold_basic_blocks): ... here.  Return todo items if
6218         any work was performed.
6219         (pass_partition_blocks): Clear todo_flags_finish.
6220
6221 2011-07-15  Paolo Carlini  <paolo.carlini@oracle.com>
6222             Jakub Jelinek  <jakub@redhat.com>
6223             Jonathan Wakely  <jwakely.gcc@gmail.com>
6224
6225         PR libstdc++/49745
6226         * gthr-posix.h: Do not include <unistd.h> unconditionally; use
6227         _GTHREADS_USE_MUTEX_TIMEDLOCK instead of _POSIX_TIMEOUTS.
6228
6229 2011-07-15  Jason Merrill  <jason@redhat.com>
6230
6231         PR testsuite/49741
6232         * Makefile.in ($(lang_checks_parallelized)): Allow --extra_opts
6233         rather than --tool_opts.
6234
6235 2011-07-15  Basile Starynkevitch  <basile@starynkevitch.net>
6236
6237         * doc/plugins.texi (Building GCC plugins): gengtype needs its
6238         corresponding gtype.state.
6239
6240 2011-07-15  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
6241
6242         PR target/49723
6243         * config/pa/pa.md (casesi): Use gen_int_mode instead of GEN_INT.
6244
6245 2011-07-15  Eric Botcazou  <ebotcazou@adacore.com>
6246
6247         PR target/48220
6248         * doc/md.texi (Standard Names): Document window_save.
6249         * cfgexpand.c (expand_debug_parm_decl): New function extracted from
6250         expand_debug_expr and expand_debug_source_expr.  If the target has
6251         a window_save instruction, adjust the ENTRY_VALUE_EXP.
6252         (expand_debug_expr) <SSA_NAME>: Call expand_debug_parm_decl if the
6253         SSA_NAME_VAR is a parameter.
6254         (expand_debug_source_expr) <PARM_DECL>: Call expand_debug_parm_decl.
6255         * var-tracking.c (parm_reg_t): New type and associated vector type.
6256         (windowed_parm_regs): New variable.
6257         (adjust_insn): If the target has a window_save instruction and this
6258         is the instruction, make its effect on parameter registers explicit.
6259         (next_non_note_insn_var_location): New function.
6260         (emit_notes_in_bb): Use it instead of NEXT_INSN throughout.
6261         (vt_add_function_parameter): If the target has a window_save insn,
6262         adjust the incoming RTL and record that in windowed_parm_regs.
6263         (vt_finalize): Free windowed_parm_regs.
6264
6265 2011-07-15  Bernd Schmidt  <bernds@codesourcery.com>
6266
6267         * doc/invoke.texi (C6X Options): New section.
6268         * doc/md.texi (TI C6X family): New section.
6269         * config.gcc: Handle tic6x, in particular tic6x-*-elf and
6270         tic6x-*-uclinux.
6271         * longlong.h (add_ssaaaa, __umulsidi3, umul_ppmm,
6272         count_leading_zeros, count_trailing_zeros, UMUL_TIME, UDIV_TIME):
6273         Provide C6X definitions.
6274         * config/c6x/c6x.md: New file.
6275         * config/c6x/constraints.md: New file.
6276         * config/c6x/predicates.md: New file.
6277         * config/c6x/c6x-sched.md.in: New file.
6278         * config/c6x/c6x-sched.md: New file.
6279         * config/c6x/gensched.sh: New file.
6280         * config/c6x/c6x-mult.md.in: New file.
6281         * config/c6x/genmult.sh: New file.
6282         * config/c6x/c6x-mult.md: New file.
6283         * config/c6x/sync.md: New file.
6284         * config/c6x/c6x-protos.h: New file.
6285         * config/c6x/sfp-machine.h: New file.
6286         * config/c6x/c6x.c: New file.
6287         * config/c6x/c6x.h: New file.
6288         * config/c6x/crti.s: New file.
6289         * config/c6x/crtn.s: New file.
6290         * config/c6x/lib1funcs.asm: New file.
6291         * config/c6x/c6x-modes.def: New file.
6292         * config/c6x/genopt.sh: New file.
6293         * config/c6x/c6x.opt: New file.
6294         * config/c6x/c6x-tables.opt: New file.
6295         * config/c6x/c6x-opts.h: New file.
6296         * config/c6x/c6x-isas.def: New file.
6297         * config/c6x/elf.h: New file.
6298         * config/c6x/elf-common.h: New file.
6299         * config/c6x/uclinux-elf.h: New file.
6300         * config/c6x/t-c6x: New file.
6301         * config/c6x/t-c6x-elf: New file.
6302         * config/c6x/t-c6x-uclinux: New file.
6303         * config/c6x/t-c6x-softfp: New file.
6304         * config/c6x/gtd.c: New file.
6305         * config/c6x/gtf.c: New file.
6306         * config/c6x/ltd.c: New file.
6307         * config/c6x/ltf.c: New file.
6308         * config/c6x/ged.c: New file.
6309         * config/c6x/gef.c: New file.
6310         * config/c6x/led.c: New file.
6311         * config/c6x/lef.c: New file.
6312         * config/c6x/eqd.c: New file.
6313         * config/c6x/eqf.c: New file.
6314         * config/c6x/libgcc-c6xeabi.ver: New file.
6315
6316         Revert
6317         2003-07-10  Eric Botcazou  <ebotcazou@libertysurf.fr>
6318         PR rtl-optimization/11320
6319         * sched-int.h (struct deps) [reg_conditional_sets]: New field.
6320         (struct sched_info) [compute_jump_reg_dependencies]: New prototype.
6321         * sched-deps.c (sched_analyze_insn) [JUMP_INSN]: Update call to
6322         current_sched_info->compute_jump_reg_dependencies. Record which
6323         registers are used and which registers are set by the jump.
6324         Clear deps->reg_conditional_sets after a barrier.
6325         Set deps->reg_conditional_sets if the insn is a COND_EXEC.
6326         Clear deps->reg_conditional_sets if the insn is not a COND_EXEC.
6327         (init_deps): Initialize reg_conditional_sets.
6328         (free_deps): Clear reg_conditional_sets.
6329         * sched-ebb.c (compute_jump_reg_dependencies): New prototype.
6330         Mark registers live on entry of the fallthrough block and conditionally
6331         set as set by the jump. Mark registers live on entry of non-fallthrough
6332         blocks as used by the jump.
6333         * sched-rgn.c (compute_jump_reg_dependencies): New prototype.
6334         Mark new parameters as unused.
6335
6336 2011-07-14  Andrew Pinski  <pinskia@gmail.com>
6337
6338         PR tree-opt/49309
6339         * tree-mudflap.c (mf_xform_derefs_1 <case MEM_REF>):
6340         Use fold_build2_loc instead of build2.
6341         Use the correct type for the new tree.
6342
6343 2011-07-14  Bernd Schmidt  <bernds@codesourcery.com>
6344
6345         PR rtl-optimization/11320
6346         * config/ia64/ia64.md (load_symptr_low): Show a MEM.
6347         * config/ia64/ia64.c (ia64_expand_load_address): Generate it.
6348
6349 2011-07-14  Georg-Johann Lay  <avr@gjlay.de>
6350
6351         PR target/49487
6352         * config/avr/avr.md (rotl<mode>3): Generate SCRATCH instead
6353         of REG.
6354         (*rotw<mode>): Use const_int_operand for operand2.
6355         Use match_scatch for operand3.
6356         (*rotb<mode>): Ditto
6357         * config/avr/avr.c (avr_rotate_bytes): Treat SCRATCH.
6358
6359 2011-07-14  Richard Guenther  <rguenther@suse.de>
6360
6361         PR tree-optimization/49651
6362         * tree-ssa-structalias.c (get_constraint_for_1): Properly
6363         handle dereferences with subvariables.
6364
6365 2011-07-14  Richard Guenther  <rguenther@suse.de>
6366
6367         * gimple-fold.c (fold_gimple_assign): Remove operand swapping.
6368         (fold_stmt_1): Do it here directly on gimple and as a first thing.
6369
6370 2011-07-14  Richard Guenther  <rguenther@suse.de>
6371
6372         * fold-const.c (fold_binary_loc): Convert the !bool_var result,
6373         not bool_var when folding bool_var != 1 or bool_var == 0.
6374
6375 2011-07-14  Bernd Schmidt  <bernds@codesourcery.com>
6376
6377         * haifa-sched.c (schedule_insns): Remove outdated comment.
6378         (schedule_block): When computing a known value for TODO_SPEC,
6379         just set it rather than using logical operations.
6380         (try_ready): Likewise.  Use a local variable rather than a
6381         pointer to TODO_SPEC.  Reorder an if statement to move the
6382         easy case to the then block.
6383         * sched-deps.c (dep_spec_p): New static function.
6384         (update_dep): Use it to decide whether to call
6385         change_spec_dep_to_hard.
6386         (get_back_and_forw_lists): Use it.
6387         (sd_resolve_dep): Likewise.
6388         (init_dep): If !USE_DEPS_LIST, use zero to initialize status.
6389         (haifa_note_mem_dep): Likewise.
6390         (check_dep): Likewise.
6391         (sd_add_dep): Also clear SPECULATIVE bits if not DO_SPECULATION.
6392         (sched_free_deps): Free in two passes.
6393
6394 2011-07-14  Richard Sandiford  <richard.sandiford@linaro.org>
6395
6396         PR middle-end/49736
6397         * expr.c (all_zeros_p): Undo bogus part of last change.
6398
6399 2011-07-14  Matthias Klose <doko@ubuntu.com>
6400
6401         * doc/extend.texi (optimize attribute): Fix typo.
6402
6403 2011-07-14  Richard Guenther  <rguenther@suse.de>
6404
6405         * gimplify.c (gimplify_expr): Only do required conversions.
6406
6407 2011-07-14  Georg-Johann Lay  <avr@gjlay.de>
6408
6409         PR target/43746
6410         * config/avr/elf.h (TARGET_ASM_SELECT_SECTION): Remove,
6411         i.e. use default_elf_select_section.
6412         (TARGET_HAVE_SWITCHABLE_BSS_SECTIONS): Remove.
6413         (READONLY_DATA_SECTION_ASM_OP): Remove.
6414         (TARGET_ASM_NAMED_SECTION): Move from here...
6415         * config/avr/avr.c: ...to here.
6416         (avr_asm_init_sections): Set unnamed callback of readonly_data_section.
6417         (avr_asm_named_section): Make static.
6418
6419 2011-07-13  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
6420
6421         PR bootstrap/49739
6422         * config.gcc (extra_parts): Add crtprec32.o crtprec64.o crtprec80.o
6423         and crtfastmath.o for Linux/x86.
6424
6425 2011-07-14  Bernd Schmidt  <bernds@codesourcery.com>
6426
6427         * haifa-sched.c: Include "hashtab.h"
6428         (sched_no_dce): New global variable.
6429         (INSN_EXACT_TICK, INSN_TICK_ESTIMATE, FEEDS_BACKTRACK_INSN,
6430         SHADOW_P): New macros.
6431         (last_clock_var, cycle_issued_insns): Move declarations.
6432         (must_backtrack): New static variable.
6433         (struct delay_pair): New structure.
6434         (delay_htab, delay_htab_i2): New static variables.
6435         (delay_hash_i1, delay_hash_i2, delay_i1_eq, delay_i2_eq,
6436         record_delay_slot_pair, pair_delay, add_delay_dependencies): New
6437         functions.
6438         (dep_cost_1): If delay pairs exist, try to look up the insns and
6439         use the correct pair delay if we find them.
6440         (rank-for_schedule): Tweak priority for insns that must be scheduled
6441         soon to avoid backtracking.
6442         (queue_insn): Detect conditions which force backtracking.
6443         (ready_add): Likewise.
6444         (struct sched_block_state): Add member shadows_only_p.
6445         (struct haifa_save_data): New structure.
6446         (backtrack_queue): New static variable.
6447         (mark_backtrack_feeds, copy_insn_list, save_backtrack_point,
6448         unschedule_insns_until, restore_last_backtrack_point,
6449         free_topmost_backtrack_point, free_backtrack_queue,
6450         estimate_insn_tick, estimate_shadow_tick): New functions.
6451         (prune_ready_list): New arg shadows_only_p.  All callers changed.
6452         If true, remove everything that isn't SHADOW_P.  Look up delay
6453         pairs and estimate ticks to avoid scheduling the first insn too early.
6454         (verify_shadows): New function.
6455         (schedule_block): Add machinery to enable backtracking.
6456         (sched_init): Take sched_no_dce into account when setting
6457         DF_LR_RUN_DCE.
6458         (free_delay_pairs): New function.
6459         (init_h_i_d): Initialize INSN_EXACT_TICK.
6460         * Makefile.in (haifa-sched.o): Add $(HASHTAB_H).
6461         * sched-deps.c (sd_unresolve_dep): New function.
6462         * sched-int. (struct haifa_sched_info): New fields save_state
6463         and restore_state.
6464         (struct _haifa_insn_data): New fields exact_tick, tick_estimate,
6465         feeds_backtrack_insn and shadow_p.
6466         (DO_BACKTRACKING): New value in enum SCHED_FLAGS.
6467         (sched_no_dce): Declare variable.
6468         (record_delay_slot_pair, free_delay_pairs, add_delay_dependencies,
6469         sd_unresolve_dep): Declare functions.
6470         * modulo-sched.c (sms_sched_info): Clear the two new fields.
6471         * sched-rgn.c (rgn_const_sched_info): Likewise.
6472         * sel-sched-ir.c (sched_sel_haifa_sched_info): Likewise.
6473         * sched-ebb.c (save_ebb_state, restore_ebb_state): New functions.
6474         (ebb_sched_info): Add them for the two new fields.
6475         (add_deps_for_risky_insns): Call add_delay_dependencies.
6476
6477 2011-07-13  Michael Meissner  <meissner@linux.vnet.ibm.com>
6478
6479         * config/rs6000/rs6000.opt (-mpointers-to-nested-functions):
6480         Rename -mr11.
6481         * config/rs6000/rs6000.c (rs6000_trampoline_init): Ditto.
6482         (rs6000_call_indirect_aix): Ditto.
6483         * config/rs6000/rs6000.md (call_indirect_aix<ptrsize>): Ditto.
6484         (call_indirect_aix<ptrsize>_internal): Ditto.
6485         (call_indirect_aix<ptrsize>_nor11): Ditto.
6486         (call_indirect_aix<ptrsize>_internal2): Ditto.
6487         (call_value_indirect_aix<ptrsize>): Ditto.
6488         (call_value_indirect_aix<ptrsize>_internal): Ditto.
6489         (call_value_indirect_aix<ptrsize>_nor11): Ditto.
6490         (call_value_indirect_aix<ptrsize>_internal2): Ditto.
6491         * doc/invoke.texi (RS/6000 and PowerPC Options): Ditto.
6492
6493 2011-07-13  Jason Merrill  <jason@redhat.com>
6494
6495         * Makefile.in ($(lang_checks_parallelized)): Allow --tool_opts.
6496
6497 2011-07-13  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
6498
6499         * config/spu/spu.c (spu_init_libfuncs): Install __clrsbdi2.
6500         * config/spu/spu.md ("clrsb<mode>2"): New expander.
6501
6502 2011-07-13  Thomas Schwinge  <thomas@schwinge.name>
6503
6504         * acinclude.m4 (gcc_GAS_CHECK_FEATURE): Use AS_ECHO instead of echo.
6505         * configure: Regenerate.
6506
6507 2011-07-13  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
6508
6509         * config/spu/spu.c (TARGET_ASM_FILE_START): Do not define.
6510         (asm_file_start): Remove.
6511         (spu_machine_dependent_reorg): Call compute_bb_for_insn and
6512         free_bb_for_insn around code that modifies insns before
6513         restarting df analysis.
6514
6515 2011-07-13  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
6516
6517         PR target/49541
6518         * config/sol2.h (LIB_SPEC): Simplify.  Move LIB_THREAD_LDFLAGS_SPEC ...
6519         (LINK_SPEC): ... here.
6520
6521 2011-07-13  Bernd Schmidt  <bernds@codesourcery.com>
6522
6523         * haifa-sched.c (struct sched_block_state): New.
6524         (schedule_block): Move some local variables into such a structure.
6525
6526 2011-07-13  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
6527
6528         * config/i386/crtprec.c: Move to ../libgcc/config/i386.
6529         * config/i386/t-crtpc: Remove.
6530         * config/t-darwin (EXTRA_MULTILIB_PARTS): Remove.
6531         * config.gcc (i[34567]86-*-darwin*): Remove i386/t-crtpc from
6532         tmake_file.
6533         (x86_64-*-darwin*): Likewise.
6534         (i[34567]86-*-linux*): Likewise.
6535         (x86_64-*-linux*): Likewise.
6536
6537         * config/i386/sol2.h (ENDFILE_SPEC): Redefine.
6538         Handle -mpc32, -mpc64, -mpc80.
6539
6540 2011-07-13  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
6541
6542         * config/alpha/crtfastmath.c: Move to ../libgcc/config/alpha.
6543         * config/alpha/t-crtfm: Remove.
6544         * config/i386/crtfastmath.c: Move to ../libgcc/config/i386.
6545         * config/i386/t-crtfm: Remove.
6546         * config/ia64/crtfastmath.c: Move to ../libgcc/config/ia64.
6547         * config/mips/crtfastmath.c: Move to ../libgcc/config/mips.
6548         * config/sparc/crtfastmath.c: Move to ../libgcc/config/sparc.
6549         * config/sparc/t-crtfm: Remove.
6550
6551         * config.gcc (alpha*-*-linux*): Remove alpha/t-crtfm from tmake_file.
6552         (alpha*-*-freebsd*): Likewise.
6553         (i[34567]86-*-darwin*): Remove i386/t-crtfm from tmake_file.
6554         (x86_64-*-darwin*): Likewise.
6555         (i[34567]86-*-linux*): Likewise.
6556         (x86_64-*-linux*): Likewise.
6557         (x86_64-*-mingw*): Likewise.
6558         (ia64*-*-elf*): Remove crtfastmath.o from extra_parts.
6559         (ia64*-*-freebsd*): Likewise.
6560         (ia64*-*-linux*): Likewise.
6561         (mips64*-*-linux*): Likewise.
6562         (mips*-*-linux*): Likewise.
6563         (sparc-*-linux*): Remove sparc/t-crtfm from tmake_file.
6564         (sparc64-*-linux*): Likewise.
6565         (sparc64-*-freebsd*): Likewise.
6566
6567 2011-07-13  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
6568
6569         * config/darwin-crt2.c: Move to ../libgcc/config/rs6000.
6570         * config/darwin-crt3.c: Move to ../libgcc/config.
6571         * config/t-darwin (EXTRA_MULTILIB_PARTS): Remove.
6572         ($(T)crt3$(objext)): Remove.
6573         * config/rs6000/t-darwin (DARWIN_EXTRA_CRT_BUILD_CFLAGS): Remove.
6574         ($(T)crt2$(objext)): Remove.
6575         * config.gcc (powerpc-*-darwin*): Remove extra_parts.
6576         (powerpc64-*-darwin*): Likewise.
6577
6578 2011-07-13  H.J. Lu  <hongjiu.lu@intel.com>
6579
6580         * config/i386/i386.c (x86_output_mi_thunk): Support ptr_mode != Pmode.
6581
6582         * config/i386/i386.md (*addsi_1_zext): Renamed to ...
6583         (addsi_1_zext): This.
6584
6585 2011-07-13  Bernd Schmidt  <bernds@codesourcery.com>
6586
6587         * doc/tm.texi.in (TARGET_ASM_MERGEABLE_RODATA_PREFIX): Add hook.
6588         * doc/tm.texi: Regenerate.
6589         * target.def (mergeable_rodata_prefix): New defhookpod.
6590         * varasm.c (mergeable_string_section, mergeable_constant_section):
6591         Use it. Allocate name with alloca.
6592
6593 2011-07-13  H.J. Lu  <hongjiu.lu@intel.com>
6594
6595         * doc/invoke.texi (x86): Remove -mfused-madd and add -mfma.
6596
6597 2011-07-13  Richard Sandiford  <richard.sandiford@linaro.org>
6598
6599         * tree-vect-loop-manip.c (vect_create_cond_for_alias_checks): Tighten
6600         overlap check.
6601
6602 2011-07-13  Richard Sandiford  <richard.sandiford@linaro.org>
6603
6604         * tree.h (categorize_ctor_elements): Remove comment.  Fix long line.
6605         (count_type_elements): Delete.
6606         (complete_ctor_at_level_p): Declare.
6607         * expr.c (flexible_array_member_p): New function, split out from...
6608         (count_type_elements): ...here.  Make static.  Replace allow_flexarr
6609         parameter with for_ctor_p.  When for_ctor_p is true, return the
6610         number of elements that should appear in the top-level constructor,
6611         otherwise return an estimate of the number of scalars.
6612         (categorize_ctor_elements): Replace p_must_clear with p_complete.
6613         (categorize_ctor_elements_1): Likewise.  Use complete_ctor_at_level_p.
6614         (complete_ctor_at_level_p): New function, borrowing union logic
6615         from old categorize_ctor_elements_1.
6616         (mostly_zeros_p): Return true if the constructor is not complete.
6617         (all_zeros_p): Update call to categorize_ctor_elements.
6618         * gimplify.c (gimplify_init_constructor): Update call to
6619         categorize_ctor_elements.  Don't call count_type_elements.
6620         Unconditionally prevent clearing for variable-sized types,
6621         otherwise rely on categorize_ctor_elements to detect
6622         incomplete initializers.
6623
6624 2011-07-13  Richard Guenther  <rguenther@suse.de>
6625
6626         * tree-vrp.c (simplify_conversion_using_ranges): Make sure
6627         the final type is integral.
6628
6629 2011-07-13  Bernd Schmidt  <bernds@codesourcery.com>
6630
6631         * sched-int.h (struct _dep): Add member cost.
6632         (DEP_COST, UNKNOWN_DEP_COST): New macros.
6633         * sched-deps.c (init_dep_1): Initialize DEP_COST.
6634         * haifa-sched.c (dep_cost_1): Use and set DEP_COST.
6635         (sched_change_pattern): Reset it for dependent insns.
6636
6637 2011-07-13  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
6638
6639         * Makefile.in (CRT0STUFF_T_CFLAGS): Remove.
6640         ($(T)crt0.o, $(T)mcrt0.o, s-crt0): Remove.
6641         * config/i386/netware-crt0.c: Move to ../libgcc/config/i386.
6642         * config/i386/t-nwld (CRTSTUFF_T_CFLAGS, CRT0STUFF_T_CFLAGS): Remove.
6643         (CRT0_S, MCRT0_S): Remove.
6644         ($(T)libgcc.def, $(T)libc.def, $(T)libcpre.def, $(T)posixpre.def):
6645         Remove.
6646         (s-crt0): Remove.
6647         * config.gcc (i[3456x]86-*-netware*): Remove extra_parts.
6648
6649 2011-07-12  Eric Botcazou  <ebotcazou@adacore.com>
6650
6651         * cse.c (insert_with_costs): Put semi-colon after empty loop body
6652         on the next line.
6653         * emit-rtl.c (push_to_sequence): Likewise.
6654         * haifa-sched.c (max_issue): Likewise.
6655         * matrix-reorg.c (add_allocation_site): Likewise.
6656         * postreload-gcse.c (eliminate_partially_redundant_load): Likewise.
6657         * reload.c (alternative_allows_const_pool_ref): Likewise.
6658         * sched-rgn.c (rgn_add_block): Likewise.
6659         (rgn_fix_recovery_cfg): Likewise.
6660         * tree.c (attribute_list_contained): Likewise.
6661
6662 2011-07-12  Uros Bizjak  <ubizjak@gmail.com>
6663
6664         * config/i386/i386.c: Tidy processor feature bitmasks.
6665         (m_P4_NOCONA): New.
6666
6667 2011-07-12  Andrew Pinski  <pinskia@gmail.com>
6668
6669         PR rtl-opt/49474
6670         * cprop.c (find_implicit_sets): Correct the condition.
6671
6672 2011-07-12  Richard Henderson  <rth@redhat.com>
6673
6674         PR target/49713
6675         * dwarf2out.h (dwarf_frame_regnum): Remove.
6676         * dwarf2out.c (based_loc_descr): Revert last change.  Initialize regno
6677         earlier from DWARF_FRAME_REGNUM.  Never use dbx_reg_number.
6678         * dwarf2cfi.c (dw_stack_pointer_regnum, dw_frame_pointer_regnum): New.
6679         (execute_dwarf2_frame): Initialize them.
6680         (DW_STACK_POINTER_REGNUM, DW_FRAME_POINTER_REGNUM): Remove; replace
6681         users of the macros with the variables.
6682         (expand_builtin_dwarf_sp_column): Revert last change.
6683         (expand_builtin_init_dwarf_reg_sizes): Likewise.  Compute the
6684         result of DWARF_FRAME_REGNUM into a local variable.
6685
6686 2011-07-12  Richard Henderson  <rth@redhat.com>
6687
6688         PR target/49714
6689         * config/i386/i386.c (x86_output_mi_thunk): Use
6690         machopic_indirect_call_target instead of machopic_indirection_name
6691         directly.
6692
6693 2011-07-12  Laurent GUERBY  <laurent@guerby.net>
6694             Eric Botcazou  <ebotcazou@adacore.com>
6695
6696         * prefix.h: Wrap up in extern "C" block.
6697
6698 2011-07-12  Harsha Jagasia  <harsha.jagasia@amd.com>
6699
6700         AMD bdver2 Enablement
6701         * config.gcc (i[34567]86-*-linux* | ...): Add bdver2.
6702         (case ${target}): Add bdver2.
6703         * config/i386/driver-i386.c (host_detect_local_cpu): Let
6704         -march=native recognize bdver2 processors.
6705         * config/i386/i386-c.c (ix86_target_macros_internal): Add
6706         bdver2 def_and_undef
6707         * config/i386/i386.c (struct processor_costs bdver2_cost): New
6708         bdver2 cost table.
6709         (m_BDVER2): New definition.
6710         (m_AMD_MULTIPLE): Includes m_BDVER2.
6711         (initial_ix86_tune_features): Add bdver2 tuning.
6712         (processor_target_table): Add bdver2 entry.
6713         (static const char *const cpu_names): Add bdver2 entry.
6714         (ix86_option_override_internal): Add bdver2 instruction sets.
6715         (ix86_issue_rate): Add bdver2.
6716         (ix86_adjust_cost): Add bdver2.
6717         (has_dispatch): Add bdver2.
6718         * config/i386/i386.h (TARGET_BDVER2): New definition.
6719         (enum target_cpu_default): Add TARGET_CPU_DEFAULT_bdver2.
6720         (enum processor_type): Add PROCESSOR_BDVER2.
6721         * config/i386/i386.md (define_attr "cpu"): Add bdver2.
6722         * config/i386/i386.opt ( mdispatch-scheduler): Add bdver2 to
6723         description.
6724
6725 2011-07-12  Richard Henderson  <rth@redhat.com>
6726
6727         PR target/49714
6728         * config/i386/i386.c (x86_output_mi_thunk): Fix mode for
6729         destination address in memory on some paths.
6730
6731 2011-07-12  Bernd Schmidt  <bernds@codesourcery.com>
6732
6733         * doc/tm.texi.in (FUNCTION_ARG_PADDING): Mention
6734         TARGET_FUNCTION_ARG_ROUND_BOUNDARY.
6735         (TARGET_FUNCTION_ARG_ROUND_BOUNDARY): Add hook.
6736         * function.c (locate_and_pad_parm): Take it into account.
6737         * target.def (function_arg_round_boundary): New hook.
6738         * targhooks.c (default_function_arg_round_boundary): New function.
6739         * targhooks.h (default_function_arg_round_boundary): Declare.
6740         * doc/tm.texi: Regenerate.
6741
6742 2011-07-12  Richard Guenther  <rguenther@suse.de>
6743
6744         * tree-ssa-copyrename.c (rename_ssa_copies): Zero statistics.
6745         Do not perform no-op changes.
6746
6747 2011-07-12  Richard Sandiford  <richard.sandiford@linaro.org>
6748
6749         * config/arm/predicates.md (neon_struct_operand): Make a normal
6750         predicate.
6751         (neon_struct_or_register_operand): New predicate.
6752         * config/arm/neon.md (movmisalign<mode>): Replace predicates
6753         with neon_struct_or_register_operand.
6754         (*movmisalign<mode>_neon_store, *movmisalign<mode>_neon_load): Use
6755         neon_struct_operand instead of memory_operand.
6756
6757 2011-07-12  Martin Jambor  <mjambor@suse.cz>
6758
6759         * cgraph.h (cgraph_get_node_or_alias): Removed declaration.
6760         * cgraph.c (cgraph_get_node_or_alias): Removed.
6761         (change_decl_assembler_name): Changed all calls to
6762         cgraph_get_node_or_alias to a call to cgraph_get_node.
6763         (cgraph_make_decl_local): Likewise.
6764         * lto-symtab.c (lto_symtab_resolve_symbols): Likewise.
6765         * varasm.c (default_binds_local_p_1): Likewise.
6766         (decl_binds_to_current_def_p): Likewise.
6767
6768 2011-07-12  Jakub Jelinek  <jakub@redhat.com>
6769
6770         PR tree-optimization/49712
6771         * tree-ssa-loop-im.c (gen_lsm_tmp_name): Handle TARGET_MEM_REF.
6772
6773 2011-07-11  Bernd Schmidt  <bernds@codesourcery.com>
6774
6775         * genautomata.c (add_arc): Return void.  All callers changed.
6776         (make_automaton): Remove dead code.
6777
6778 2011-07-11  Richard Henderson  <rth@redhat.com>
6779
6780         * dwarf2cfi.c (DW_STACK_POINTER_REGNUM): New.
6781         (DW_FRAME_POINTER_REGNUM): New.
6782         (expand_builtin_init_dwarf_reg_sizes): Use unsigned for rnum.
6783         (def_cfa_1): Do not convert reg to DWARF_FRAME_REGNUM here.
6784         (dwf_regno): New.
6785         (dwarf2out_flush_queued_reg_saves, dwarf2out_frame_debug_def_cfa,
6786         dwarf2out_frame_debug_adjust_cfa, dwarf2out_frame_debug_cfa_register,
6787         dwarf2out_frame_debug_cfa_expression, dwarf2out_frame_debug_expr):
6788         Use it.
6789         * dwarf2out.c (based_loc_descr): Use dwarf_frame_regnum.
6790         * dwarf2out.h (dwarf_frame_regnum): New.
6791         (struct cfa_loc): Document the domain of the reg member.
6792
6793 2011-07-11  Uros Bizjak  <ubizjak@gmail.com>
6794
6795         * config/i386/i386.c (ix86_trampoline_init): Switch arms of if expr.
6796         Use offset everywhere.  Always assert that offset <= TRAMPOLINE_SIZE.
6797
6798 2011-07-11  Jakub Jelinek  <jakub@redhat.com>
6799
6800         PR debug/49676
6801         * dwarf2out.c (int_shift_loc_descriptor): New function.
6802         (int_loc_descriptor): If shorter, emit i as
6803         (i >> shift), shift, DW_OP_shl for suitable shift value.
6804         Similarly, try to optimize large negative values using
6805         DW_OP_neg of a positive value if shorter.
6806         (size_of_int_shift_loc_descriptor): New function.
6807         (size_of_int_loc_descriptor): Adjust to match int_loc_descriptor
6808         changes.
6809         (mem_loc_descriptor) <case CONST_INT>: Emit zero-extended constants
6810         that fit into DWARF2_ADDR_SIZE bytes as int_loc_descriptor +
6811         DW_OP_GNU_convert instead of DW_OP_GNU_const_type if the former
6812         is shorter.
6813         (resolve_addr_in_expr): Optimize DW_OP_plus_uconst with a large
6814         addend as added DW_OP_plus if it is shorter.
6815
6816 2011-07-11  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
6817
6818         * config/i386/sol2.h [!USE_GLD] (CTORS_SECTION_ASM_OP): Define.
6819         (DTORS_SECTION_ASM_OP): Define.
6820
6821 2011-07-11  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
6822
6823         * config/dfp-bit.c, config/dfp-bit.h: Move to ../libgcc.
6824         * config/t-dfprules: Move to ../libgcc/config.
6825         * config.gcc (i[34567]86-*-linux*, i[34567]86-*-kfreebsd*-gnu,
6826         i[34567]86-*-knetbsd*-gnu, i[34567]86-*-gnu*,
6827         i[34567]86-*-kopensolaris*-gnu): Remove t-dfprules from tmake_file.
6828         (x86_64-*-linux*, x86_64-*-kfreebsd*-gnu, x86_64-*-knetbsd*-gnu):
6829         Likewise.
6830         (i[34567]86-*-cygwin*): Likewise.
6831         (i[34567]86-*-mingw*,  x86_64-*-mingw*): Likewise.
6832         (powerpc-*-linux*, powerpc64-*-linux*): Likewise.
6833         * Makefile.in (D32PBIT_FUNCS, D64PBIT_FUNCS, D128PBIT_FUNCS): Remove.
6834         (libgcc.mvars): Remove DFP_ENABLE, DFP_CFLAGS, D32PBIT_FUNCS,
6835         D64PBIT_FUNCS, D128PBIT_FUNCS.
6836
6837 2011-07-11  Richard Guenther  <rguenther@suse.de>
6838
6839         * tree-vrp.c (simplify_conversion_using_ranges): Manually
6840         translate the source value-range through the conversion chain.
6841
6842 2011-07-11  Richard Sandiford  <richard.sandiford@linaro.org>
6843
6844         * expr.c (expand_expr_real_1): Use expand_insn for movmisalign.
6845
6846 2011-07-11  Arthur Loiret  <aloiret@debian.org>
6847
6848         * config.gcc (s390-*-linux*): If 'enabled_targets' is 'all', build
6849         a bi-arch compiler defaulting to 31-bit. In this case:
6850         (tmake_file): Add s390/t-linux64.
6851         * doc/install.texi: Add s390-linux to the list of targets supporting
6852         --enable-targets=all.
6853
6854 2011-07-11  Arthur Loiret  <aloiret@debian.org>
6855             Matthias Klose <doko@debian.org>
6856
6857         * config.gcc (mips*-*-linux*): If 'enabled_targets' is 'all', build
6858         a tri-arch compiler defaulting to 32-bit (ABI o32). In this case:
6859         (tm_file): Add mips/linux64.h.
6860         (tmake_file): Add mips/t-linux64.
6861         (tm_defines): Add MIPS_ABI_DEFAULT=ABI_32.
6862         * config/mips/linux64.h (DRIVER_SELF_SPECS): Use MULTILIB_ABI_DEFAULT
6863         instead of hardcoded mabi=n32.
6864         * config/mips/t-linux64 (MULTILIB_DIRNAMES): Set to 'n32 . 64' if
6865         tm_defines contains MIPS_ABI_DEFAULT ABI_32, to follow the glibc
6866         convention.
6867
6868 2011-07-11  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
6869
6870         * passes.c (init_optimization_passes): Add invariant motion pass
6871         after induction variable optimization.
6872
6873 2011-07-11  Georg-Johann Lay  <avr@gjlay.de>
6874
6875         PR target/39633
6876         * config/avr/avr.c (notice_update_cc): For ashiftrt:QI, only
6877         offsets 1..5 set cc0 in a usable way.
6878
6879 2011-07-11  Romain Geissler  <romain.geissler@gmail.com>
6880
6881         * tree.h (call_expr_arg): Remove.
6882         (call_expr_argp): Likewise.
6883
6884 2011-07-11  Eric Botcazou  <ebotcazou@adacore.com>
6885
6886         * config/sparc/sparc.md (save_register_window_1): Rename to...
6887         (window_save): ...this.
6888         * config/sparc/sparc.c (emit_save_register_window): Rename to...
6889         (emit_window_save): ...this.
6890         (sparc_expand_prologue): Adjust to above renaming.
6891
6892 2011-07-10  H.J. Lu  <hongjiu.lu@intel.com>
6893
6894         * config/i386/i386.c (ix86_trampoline_init): Use movl instead
6895         of movabs for x32.
6896
6897 2011-07-10  Richard Henderson  <rth@redhat.com>
6898
6899         * config/i386/i386.c (x86_output_mi_thunk): Generate rtl and
6900         run final, instead of emitting text directly.
6901
6902 2011-07-10  H.J. Lu  <hongjiu.lu@intel.com>
6903
6904         * config/i386/i386.c (ix86_option_override_internal): Turn on
6905         OPTION_MASK_ISA_64BIT for TARGET_X32.  Only allow small and
6906         small PIC models for TARGET_X32.
6907
6908 2011-07-10  Hans-Peter Nilsson  <hp@axis.com>
6909
6910         PR target/49684
6911         * config/cris/t-elfmulti (CRTSTUFF_T_CFLAGS): Don't include
6912         $(LIBGCC2_CFLAGS).
6913
6914         PR bootstrap/49680
6915         * config/cris/cris.c (cris_asm_output_case_end): Robustify against
6916         stray notes and debug insns by using prev_nonnote_nondebug_insn
6917         instead of PREV_INSN.
6918
6919 2011-07-09  Richard Henderson  <rth@redhat.com>
6920
6921         * defaults.h (DWARF2_ADDR_SIZE, DWARF_OFFSET_SIZE,
6922         DWARF_TYPE_SIGNATURE_SIZE): Move from ...
6923         * dwarf2out.c: ... here.
6924         (output_all_cfis): Remove.
6925         (dwarf2out_switch_text_section): Use output_cfis directly.
6926         (size_of_locs): Export.
6927         (output_loc_sequence, output_loc_sequence_raw): Export.
6928         (div_data_align, need_data_align_sf_opcode, dwarf_cfi_name, output_cfi,
6929         output_cfi_directive, dwarf2out_emit_cfi, output_cfis, output_cfa_loc,
6930         output_cfa_loc_raw): Move to ...
6931         * dwarfcfi.c: ... here.
6932         * dwarf2out.h: Update decls.
6933
6934 2011-07-09  Richard Henderson  <rth@redhat.com>
6935
6936         * defaults.h (DWARF_CIE_DATA_ALIGNMENT, DWARF_FRAME_RETURN_COLUMN,
6937         DWARF_FRAME_REGNUM, DWARF2_FRAME_REG_OUT): Move from ...
6938         * dwarf2cfi.c: ... here.
6939         (PTR_SIZE, DWARF_OFFSET_SIZE, DWARF_INITIAL_LENGTH_SIZE): Remove.
6940         (DWARF_ROUND, DWARF_CIE_ID): Remove.
6941         * dwarf2out.c (INCOMING_RETURN_ADDR_RTX): Remove.
6942         (DWARF2_FRAME_REG_OUT, DWARF_CIE_DATA_ALIGNMENT): Remove.
6943         (DWARF_FRAME_RETURN_COLUMN, DWARF_FRAME_REGNUM): Remove.
6944
6945 2011-07-09  Richard Henderson  <rth@redhat.com>
6946
6947         * dwarf2cfi.c (cie_return_save): New.
6948         (queue_reg_save): Use compare_reg_or_pc.
6949         (dwarf2out_flush_queued_reg_saves): Handle pc_rtx as return column.
6950         (dwarf2out_frame_debug_expr): Likewise.
6951         (dwarf2out_frame_debug_cfa_register): Record saved reg for pc too.
6952         (initial_return_save): Likewise.
6953         (execute_dwarf2_frame): Save and restore initial return save from
6954         the cie to the fde.
6955         * config/mips/mips.c (mips_frame_set): Remove special case for
6956         DWARF_FRAME_RETURN_COLUMN.
6957
6958 2011-07-09  Richard Henderson  <rth@redhat.com>
6959
6960         * dwarf2cfi.c (lookup_cfa): Remove.
6961         (execute_dwarf2_frame): Assert queues are empty on entry.
6962         Setup initial cfa directly, not via lookup_cfa.
6963         Don't clear args_size state here.
6964
6965 2011-07-09  Richard Henderson  <rth@redhat.com>
6966
6967         * dwarf2cfi.c (add_cfi_vec): New.
6968         (add_cfi): Rename from add_fde_cfi.  Add the element to add_cfi_vec.
6969         (def_cfa_1, reg_save): Remove for_cie argument.  Update all callers.
6970         (execute_dwarf2_frame): Set add_cfi_vec.
6971
6972 2011-07-09  Richard Henderson  <rth@redhat.com>
6973
6974         * defaults.h (ASM_COMMENT_START): Move here...
6975         * dwarf2asm.c: ... from here.
6976         * dwarf2out.c, final.c, vmsdbgout.c: Remove duplicates.
6977         * toplev.c: Remove ifndef tests of ASM_COMMENT_START.
6978         * varasm.c: Likewise.
6979
6980 2011-07-09  Richard Henderson  <rth@redhat.com>
6981
6982         PR debug/49686
6983         * dwarf2cfi.c (dwarf2out_frame_debug): Don't set cfi_insn here...
6984         (create_cfi_notes): ... do it here instead.
6985
6986 2011-07-09  Jakub Jelinek  <jakub@redhat.com>
6987
6988         PR debug/49676
6989         * dwarf2out.c (size_of_int_loc_descriptor): New function.
6990         (address_of_int_loc_descriptor): Use it.
6991         (scompare_loc_descriptor): Optimize EQ/NE comparison with constant.
6992
6993 2011-07-09  Richard Henderson  <rth@redhat.com>
6994
6995         * config/pdp11/pdp11.md (define_c_enum "unspecv"): New.
6996         (prologue, epilogue): New.
6997         (return, *rts): New.
6998         (blockage, setd, seti): New.
6999         * config/pdp11/pdp11.c (TARGET_ASM_FUNCTION_PROLOGUE): Remove.
7000         (TARGET_ASM_FUNCTION_EPILOGUE): Remove.
7001         (pdp11_saved_regno): New.
7002         (pdp11_expand_prologue): Rename from pdp11_output_function_prologue;
7003         generate rtl instead of text.
7004         (pdp11_expand_epilogue): Similarly from pdp11_output_function_epilogue.
7005         (pdp11_sp_frame_offset): Export.  Use pdp11_saved_regno.
7006         * config/pdp11/pdp11-protos.h: Update.
7007
7008 2011-07-09  Richard Henderson  <rth@redhat.com>
7009
7010         * config/rs6000/rs6000.c (rs6000_output_function_prologue): Don't
7011         try to insert an rtl prologue here.
7012         (rs6000_output_function_epilogue): Similarly.
7013         * config/rs6000/rs6000.md (prologue): Emit a barrier to
7014         satisfy !TARGET_SCHED_PROLOG.
7015         (epilogue, sibcall_epilogue): Likewise.
7016
7017 2011-07-09  Eric Botcazou  <ebotcazou@adacore.com>
7018
7019         * config/sparc/sparc.h (STACK_SAVEAREA_MODE): Move around.
7020         (FP_REG_P): Delete.
7021         (IN_OR_GLOBAL_P): Likewise.
7022
7023 2011-07-08  Jason Merrill  <jason@redhat.com>
7024
7025         PR c++/45437
7026         * gimplify.c (goa_stabilize_expr): Handle RHS preevaluation in
7027         compound assignment.
7028
7029         * cgraph.c (cgraph_add_to_same_comdat_group): New.
7030         * cgraph.h: Declare it.
7031         * ipa.c (function_and_variable_visibility): Make sure thunks
7032         have the right visibility.
7033
7034 2011-07-08  Richard Henderson  <rth@redhat.com>
7035
7036         PR bootstrap/49680
7037         * dwarf2cfi.c (dwarf2out_frame_debug): Insert cfi notes after
7038         any tablejump vector.
7039
7040         PR bootstrap/49680
7041         * dwarf2cfi.c (create_cfi_notes): Flush queued saves at the
7042         end of the prologue.
7043
7044 2011-07-08  Jakub Jelinek  <jakub@redhat.com>
7045
7046         PR target/49621
7047         * config/rs6000/rs6000.c (rs6000_emit_vector_cond_expr): Use
7048         CONST0_RTX (dest_mode) instead of const0_rtx as second operand of NE.
7049         * config/rs6000/vector.md (vector_select_<mode>,
7050         vector_select_<mode>_uns): Change second operand of NE to
7051         CONST0_RTX (<MODE>mode) instead of const0_rtx.
7052         * config/rs6000/altivec.md (*altivec_vsel<mode>,
7053         *altivec_vsel<mode>_uns): Expect second operand of NE to be
7054         zero_constant of the corresponding vector mode.
7055         * config/rs6000/vsx.md (*vsx_xxsel<mode>, *vsx_xxsel<mode>_uns):
7056         Likewise.
7057
7058 2011-07-08  Sebastian Pop  <sebastian.pop@amd.com>
7059
7060         * graphite-dependences.c (build_alias_set_powerset): Remove
7061         continue from loop, add one more assert.
7062
7063 2011-07-08  Georg-Johann Lay  <avr@gjlay.de>
7064
7065         PR target/46779
7066         * config/avr/avr.c (avr_hard_regno_mode_ok): Rewrite.
7067         In particular, allow 8-bit values in r28 and r29.
7068         (avr_hard_regno_scratch_ok): Disallow any register that might be
7069         part of the frame pointer.
7070         (avr_hard_regno_rename_ok): Same.
7071         (avr_legitimate_address_p): Don't allow SUBREGs.
7072
7073 2011-07-08  Julian Brown  <julian@codesourcery.com>
7074
7075         * config/arm/neon.md (vec_shr_<mode>, vec_shl_<mode>): Disable in
7076         big-endian mode.
7077         (reduc_splus_<mode>, reduc_uplus_<mode>, reduc_smin_<mode>)
7078         (reduc_smax_<mode>, reduc_umin_<mode>, reduc_umax_<mode>)
7079         (neon_vec_unpack<US>_lo_<mode>, neon_vec_unpack<US>_hi_<mode>)
7080         (vec_unpack<US>_hi_<mode>, vec_unpack<US>_lo_<mode>)
7081         (neon_vec_<US>mult_lo_<mode>, vec_widen_<US>mult_lo_<mode>)
7082         (neon_vec_<US>mult_hi_<mode>, vec_widen_<US>mult_hi_<mode>)
7083         (vec_pack_trunc_<mode>, neon_vec_pack_trunc_<mode>): Disable for Q
7084         registers in big-endian mode.
7085
7086 2011-07-08  Bernd Schmidt  <bernds@codesourcery.com>
7087
7088         * genattrtab.c (evaluate_eq_attr): Allow an attribute to be defined
7089         in terms of another.
7090         (write_attr_value): Write a cast if necessary.
7091
7092         * defaults.h (REG_WORDS_BIG_ENDIAN): Provide a default.
7093         * doc/tm.texi.in (WORDS_BIG_ENDIAN): Mention REG_WORDS_BIG_ENDIAN.
7094         (REG_WORDS_BIG_ENDIAN): Document.
7095         * doc/tm.texi: Regenerate.
7096         * reload.c (operands_match_p): Take it into account.
7097         (reload_adjust_reg_for_mode): Likewise.
7098         * rtlanal.c (subreg_get_info): Likewise.
7099
7100 2011-07-08  Richard Guenther  <rguenther@suse.de>
7101
7102         * fold-const.c (fold_binary_loc): Remove index +p PTR -> PTR +p index
7103         folding.
7104
7105 2011-07-08  Kai Tietz  <ktietz@redhat.com>
7106
7107         * fold-const.c (fold_truth_andor): Factored out truth_andor
7108         label from fold_binary as function.
7109         (fold_binary_loc): Replace truth_andor lable
7110         by function fold_truth_andor.
7111
7112 2011-07-08  Kirill Yukhin  <kirill.yukhin@intel.com>
7113
7114         PR middle-end/49519
7115         * calls.c (mem_overlaps_already_clobbered_arg_p): Additional
7116         check if address is stored in register. If so - give up.
7117         (check_sibcall_argument_overlap_1): Do not perform check of
7118         overlapping when it is call to address.
7119
7120 2011-07-08  Georg-Johann Lay  <avr@gjlay.de>
7121
7122         * config/avr/avr.c (output_reload_insisf): Use 'REG_Z+1' instead
7123         of magic '31'.
7124
7125 2011-07-08  Bernd Schmidt  <bernds@codesourcery.com>
7126
7127         * optabs.c (expand_binop): Use GET_MODE_PRECISION instead of
7128         GET_MODE_BITSIZE where appropriate.
7129         (widen_leading, expand_parity, expand_ctz, expand_ffs,
7130         expand_unop, expand_abs_nojump, expand_one_cmpl_abs_nojump,
7131         expand_float, expand_fix): Likewise.
7132         * expr.c (convert_move, convert_modes, expand_expr_real_2,
7133         expand_expr_real_1, reduce_to_bit_field_precision): Likewise.
7134         * stor-layout.c (get_mode_bounds): Likewise.
7135         * cfgexpand.c (convert_debug_memory_address, expand_debug_expr):
7136         Likewise.
7137         * convert.c (convert_to_integer): Likewise.
7138         * expmed.c (expand_shift_1): Likewise.
7139
7140         * rtlanal.c (nonzero_bits1): Don't compare GET_MODE_SIZE against
7141         a bitsize.
7142
7143         * optabs.c (expand_binop): Tighten conditions for doubleword
7144         expansions.
7145         (widen_bswap): Assert that mode bitsize and precision are the same.
7146         * stor-layout.c (get_best_mode): Skip modes that have lower
7147         precision than bitsize.
7148         * recog.c (simplify_while_replacing): Assert that bitsize and
7149         precision are the same.
7150
7151 2011-07-08  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
7152
7153         * Makefile.in (LIBGCOV): Remove.
7154         (libgcc.mvars): Remove LIBGCOV.
7155         * libgov.c: Move to ../libgcc.
7156
7157 2011-07-08  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
7158
7159         * config/fixed-bit.c, config/fixed-bit.h: Move to ../libgcc.
7160
7161 2011-07-08  Martin Jambor  <mjambor@suse.cz>
7162
7163         * tree-sra.c (analyze_all_variable_accesses): Dump that a struture
7164         is too big for total scalarization.
7165
7166 2011-07-07  Richard Henderson  <rth@redhat.com>
7167
7168         * config/alpha/elf.h (MIPS_DEBUGGING_INFO): Undef.
7169         (DBX_DEBUGGING_INFO): Undef.
7170
7171 2011-07-07  Richard Henderson  <rth@redhat.com>
7172
7173         * dwarf2out.c (output_cfi_directive): Export.  Add FILE parameter.
7174         Handle some opcodes specially for debugging.
7175         * print-rtl.c: Include dwarf2out.h
7176         (print_rtx): Handle NOTE_INSN_CFI.
7177         * Makefile.in (print-rtl.o): Update.
7178
7179 2011-07-07  Richard Henderson  <rth@redhat.com>
7180
7181         * tree-pass.h (pass_dwarf2_frame): Declare.
7182         * passes.c (init_optimization_passes): Add it.
7183         * dwarf2cfi.c (dwarf2out_frame_debug): Make static.
7184         (create_cfi_notes): Rename from dwarf2out_frame_debug_after_prologue;
7185         make static, do not call add_cfis_to_fde.
7186         (dwarf2out_frame_debug_init, dwarf2cfi_function_init,
7187         dwarf2out_frame_init): Merge into...
7188         (execute_dwarf2_frame): ... here.  New function.
7189         (dwarf2out_do_frame, dwarf2out_do_cfi_asm): Make boolean.  Change
7190         saved_do_cfi_asm to a tri-state variable.
7191         (gate_dwarf2_frame, pass_dwarf2_frame): New.
7192         * dwarf2out.c (dwarf2out_begin_prologue): Only allocate the fde
7193         if it has yet to be done.  Don't call dwarf2cfi_function_init.
7194         * dwarf2out.h, debug.h: Update decls.
7195         * final.c (final_start_function): Don't call
7196         dwarf2out_frame_debug_init or dwarf2out_frame_debug_after_prologue.
7197         * lto-streamer-in.c (lto_init_eh): Don't call dwarf2out_frame_init.
7198         * toplev.c (lang_dependent_init): Likewise.
7199
7200 2011-07-07  Richard Henderson  <rth@redhat.com>
7201
7202         * dwarf2out.c (fde_table, fde_table_allocated, fde_table_in_use,
7203         FDE_TABLE_INCREMENT): Replace with...
7204         (fde_vec): ... this, a new vector.
7205         (current_fde): Remove.  Replace all users with cfun->fde.
7206         (output_call_frame_info): Use FOR_EACH_VEC_ELT over fde_vec.
7207         (size_of_aranges, dwarf2out_finish): Likewise.
7208         (dwarf2out_alloc_current_fde): Break out from ...
7209         (dwarf2out_begin_prologue): ... here.
7210         (dwarf2out_frame_init): Remove.
7211         * dwarf2cfi.c: Update all users of current_fde.
7212         (dwarf2out_frame_init): Rename from dwarf2cfi_frame_init.
7213         * dwarf2out.h: Update decls.
7214         (dw_fde_node): Add fde_index member.
7215         * function.h (struct function): Add fde member.
7216
7217 2011-07-07  Bernd Schmidt  <bernds@codesourcery.com>
7218             Richard Henderson  <rth@redhat.com>
7219
7220         * dwarf2cfi.c (add_cfi): Remove.
7221         (dwarf2out_cfi_label): Remove force argument.  Only generate the
7222         label name.
7223         (add_fde_cfi): Simplify the different code paths.
7224         (add_cie_cfi): New.
7225         (old_cfa, old_cfa_remember): New.
7226         (def_cfa_1, reg_save): Remove label, add for_cie parameter.
7227         (last_reg_save_label): Remove.
7228         (dwarf2out_args_size, dwarf2out_stack_adjust, queue_reg_save,
7229         dwarf2out_frame_debug_def_cfa, dwarf2out_frame_debug_adjust_cfa,
7230         dwarf2out_frame_debug_cfa_offset, dwarf2out_frame_debug_cfa_register,
7231         dwarf2out_frame_debug_cfa_expression,
7232         dwarf2out_frame_debug_cfa_restore,
7233         dwarf2out_frame_debug_cfa_window_save,
7234         dwarf2out_frame_debug_expr): Remove label parameter.
7235         (cfi_label_required_p, add_cfis_to_fde): New.
7236         (dwarf2out_frame_debug_after_prologue): New.
7237         (dwarf2cfi_frame_init): Initialize old_cfa.
7238         (dwarf2out_frame_debug_restore_state): Likewise.
7239         * dwarf2out.c (dwarf2out_emit_cfi): Only do output for cfi_asm.
7240         (dwarf2out_switch_text_section): Don't clear dw_fde_current_label here.
7241         * final.c (final_start_function): Call
7242         dwarf2out_frame_debug_after_prologue.
7243
7244 2011-07-07  Bernd Schmidt  <bernds@codesourcery.com>
7245             Richard Henderson  <rth@redhat.com>
7246
7247         * dwarf2cfi.c (cfi_insn): New.
7248         (dwarf2out_cfi_label): Don't emit cfi label here.
7249         (add_fde_cfi): Create a NOTE_INSN_CFI.
7250         (dwarf2out_frame_debug): Setup cfi_insn.
7251         (dwarf2out_frame_debug_init): Loop over insns creating CFI notes.
7252         (dwarf2out_cfi_begin_epilogue): Make static.
7253         (dwarf2out_frame_debug_restore_state): Make static.
7254         * dwarf2out.c (output_cfi_directive): Make static.
7255         (dwarf2out_emit_cfi): New.
7256         * dwarf2out.h: Update.
7257         * final.c (final): Remove CFI notes.
7258         (final_scan_insn): Don't call dwarf2out_cfi_begin_epilogue,
7259         dwarf2out_frame_debug_restore_state, dwarf2out_frame_debug.
7260         Handle NOTE_INSN_CFI and NOTE_INSN_CFI_LABEL.
7261         * insn-notes.def (NOTE_INSN_CFI): New.
7262         (NOTE_INSN_CFI_LABEL): New.
7263         * rtl.h (union rtunion_def): Add rt_cfi member.
7264         (XCFI, XCCFI, NOTE_CFI, NOTE_LABEL_NUMBER): New.
7265
7266 2011-07-07  Richard Henderson  <rth@redhat.com>
7267
7268         * dwarf2cfi.c: New file.
7269         * Makefile.in (OBJS): Add it.
7270         (GTFILES): Add dwarf2cfi.c and dwarf2out.h.
7271         * gengtype.c (open_base_files): Include dwarf2out.h.
7272         * coretypes.h (enum var_init_status): Move from ...
7273         * rtl.h: ... here.
7274         * dwarf2out.c (saved_do_cfi_asm, dwarf2out_do_frame,
7275         dwarf2out_do_cfi_asm, cie_cfi_vec, dwarf2out_cfi_label_num,
7276         expand_builtin_dwarf_sp_column, init_return_column_size,
7277         expand_builtin_init_dwarf_reg_sizes, new_cfi, add_cfi,
7278         dwarf2out_cfi_label, emit_cfa_remember, any_cfis_emitted, add_fde_cfi,
7279         lookup_cfa_1, lookup_cfa, cfa, cfa_store, cfa_remember, args_size,
7280         old_args_size, cfa_equal_p, def_cfa_1, reg_save, initial_return_save,
7281         stack_adjust_offset, barrier_args_size, compute_barrier_args_size_1,
7282         compute_barrier_args_size, dwarf2out_args_size,
7283         dwarf2out_stack_adjust, dwarf2out_notice_stack_adjust,
7284         queued_reg_saves, reg_saved_in_data, regs_saved_in_regs,
7285         compare_reg_or_pc, record_reg_saved_in_reg, last_reg_save_label,
7286         queue_reg_save, dwarf2out_flush_queued_reg_saves,
7287         clobbers_queued_reg_save, reg_saved_in, cfa_temp,
7288         dwarf2out_frame_debug_def_cfa, dwarf2out_frame_debug_adjust_cfa,
7289         dwarf2out_frame_debug_cfa_offset, dwarf2out_frame_debug_cfa_register,
7290         dwarf2out_frame_debug_cfa_expression,
7291         dwarf2out_frame_debug_cfa_restore,
7292         dwarf2out_frame_debug_cfa_window_save, dwarf2out_frame_debug_expr,
7293         dwarf2out_frame_debug, dwarf2out_frame_debug_init,
7294         dwarf2out_cfi_begin_epilogue, dwarf2out_frame_debug_restore_state,
7295         get_cfa_from_loc_descr): Move to dwarf2cfi.c.
7296         (dw_cfi_ref, dw_fde_ref, dw_cfi_oprnd_ref, enum dw_cfi_oprnd_type,
7297         dw_cfi_oprnd, dw_cfi_node, cfi_vec, dw_cfa_location, dw_fde_node,
7298         dw_val_ref, dw_die_ref, const_dw_die_ref, dw_loc_descr_ref,
7299         dw_loc_list_ref, enum dw_val_class, dw_vec_const, dw_val_node,
7300         dw_loc_descr_node): Move to dwarf2out.h.
7301         (current_fde, output_cfi_directive, build_cfa_loc, get_address_mode,
7302         mem_loc_descriptor): Export.
7303         (build_cfa_aligned_loc): Export.  Take CFA as a parameter.
7304         (dwarf2out_frame_init): Extract CIE generation code to
7305         dwarf2cfi_frame_init.
7306
7307 2011-07-07  Eric Botcazou  <ebotcazou@adacore.com>
7308
7309         PR target/49660
7310         * config/sparc/sol2.h [TARGET_64BIT_DEFAULT] (TARGET_DEFAULT): Add
7311         MASK_V8PLUS, remove commented out flag and reorder.
7312
7313 2011-07-07  Jakub Jelinek  <jakub@redhat.com>
7314
7315         PR c/49644
7316         * c-typeck.c (build_binary_op): For MULT_EXPR and TRUNC_DIV_EXPR with
7317         one non-complex and one complex argument, call c_save_expr on both
7318         operands.
7319
7320 2011-07-07  Martin Jambor  <mjambor@suse.cz>
7321
7322         PR middle-end/49495
7323         * cgraphunit.c (verify_edge_corresponds_to_fndecl): New function.
7324         (verify_cgraph_node): Some functinality moved to
7325         verify_edge_corresponds_to_fndecl, call it.
7326
7327 2011-07-07  Joseph Myers  <joseph@codesourcery.com>
7328
7329         * config.gcc (*local*): Remove.
7330         * doc/install-old.texi: Don't mention local configurations.
7331
7332 2011-07-07  Jakub Jelinek  <jakub@redhat.com>
7333
7334         PR debug/49522
7335         * df-problems.c (dead_debug_reset): Remove dead_debug_uses
7336         referencing debug insns that have been reset.
7337         (dead_debug_insert_before): Don't assert reg is non-NULL,
7338         instead return immediately if it is NULL.
7339
7340 2011-07-07  Joseph Myers  <joseph@codesourcery.com>
7341
7342         * config/i386/t-crtpic, config/i386/t-svr3dbx, config/pa/t-pa: Remove.
7343
7344 2011-07-07  Bernd Schmidt  <bernds@codesourcery.com>
7345
7346         * hw-doloop.c: New file.
7347         * hw-doloop.h: New file.
7348         * Makefile.in (OBJS): Add hw-doloop.o.
7349         (hw-doloop.o): New rule.
7350         ($(obj_out_file)): Add hw-doloop.h dependency.
7351         * config/bfin/bfin.c: Include "hw-doloop.h".
7352         (loop_info, DEF_VEC_P for loop_info, loop_info_d): Remove.
7353         (bfin_dump_loops, bfin_bb_in_loop, bfin_scan_loop): Remove.
7354         (hwloop_optimize): Renamed from bfin_optimize_loop.  Argument
7355         type changed to hwloop_info.  Return bool, true if the loop was
7356         successfully optimized.  Remove code that was moved to
7357         hw-doloop.c, and adjust other parts.
7358         (hwloop_fail): New static function, containing parts that used
7359         to be in bfin_optimize_loop.
7360         (bfin_discover_loop, bfin_discover_loops, free_loops,
7361         bfin_reorder_loops): Remove.
7362         (hwloop_pattern_reg): New static function.
7363         (bfin_doloop_hooks): New variable.
7364         (bfin_reorg_loops): Remove most code, call reorg_loops.
7365         * config/bfin/bfin.md (doloop_end splitter): Also enable if
7366         loop counter is a memory_operand.
7367
7368 2011-07-07  H.J. Lu  <hongjiu.lu@intel.com>
7369
7370         * config.gcc: Support --with-multilib-list for x86 Linux targets.
7371
7372         * configure.ac: Mention x86-64 for --with-multilib-list.
7373         * configure: Regenerated.
7374
7375         * config/i386/gnu-user64.h (SPEC_64): Support x32.
7376         (SPEC_32): Likewise.
7377         (ASM_SPEC): Likewise.
7378         (LINK_SPEC): Likewise.
7379         (TARGET_THREAD_SSP_OFFSET): Likewise.
7380         (TARGET_THREAD_SPLIT_STACK_OFFSET): Likewise.
7381         (SPEC_X32): New.
7382
7383         * config/i386/i386.h (TARGET_X32): New.
7384         (TARGET_LP64): New.
7385         (LONG_TYPE_SIZE): Likewise.
7386         (POINTER_SIZE): Likewise.
7387         (POINTERS_EXTEND_UNSIGNED): Likewise.
7388         (OPT_ARCH64): Support x32.
7389         (OPT_ARCH32): Likewise.
7390
7391         * config/i386/i386.opt (mx32): New.
7392
7393         * config/i386/kfreebsd-gnu64.h (GNU_USER_LINK_EMULATIONX32): New.
7394         (GLIBC_DYNAMIC_LINKERX32): Likewise.
7395         * config/i386/linux64.h (GNU_USER_LINK_EMULATIONX32): Likewise.
7396         (GLIBC_DYNAMIC_LINKERX32): Likewise.
7397
7398         * config/linux.h (UCLIBC_DYNAMIC_LINKERX32): New.
7399         (BIONIC_DYNAMIC_LINKERX32): Likewise.
7400         (GNU_USER_DYNAMIC_LINKERX32): Likewise.
7401
7402         * config/i386/t-linux64: Support TM_MULTILIB_CONFIG.
7403
7404         * doc/install.texi: Document --with-multilib-list for Linux/x86-64.
7405
7406         * doc/invoke.texi: Document -mx32.
7407
7408 2011-07-07  Richard Sandiford  <richard.sandiford@linaro.org>
7409
7410         * doc/invoke.texi (mwords-little-endian): Deprecate.
7411         * config/arm/arm.opt (mwords-little-endian): Likewise.
7412         * config/arm/arm.c (arm_option_override): Warn about the deprecation
7413         of -mwords-little-endian.
7414
7415 2011-07-07  Richard Sandiford  <richard.sandiford@linaro.org>
7416
7417         * reload1.c (choose_reload_regs): Use mode sizes to check whether
7418         an old reload register completely defines the required value.
7419
7420 2011-07-07  Richard Guenther  <rguenther@suse.de>
7421
7422         * fold-const.c (fold_unary_loc): Do not strip sign-changes
7423         for NEGATE_EXPR.
7424
7425 2011-07-07  Richard Guenther  <rguenther@suse.de>
7426
7427         * tree-vrp.c (simplify_conversion_using_ranges): New function.
7428         (simplify_stmt_using_ranges): Call it.
7429
7430 2011-07-07  Kai Tietz  <ktietz@redhat.com>
7431
7432         * tree-ssa-forwprop.c (truth_valued_ssa_name): New function.
7433         (lookup_logical_inverted_value): Likewise.
7434         (simplify_bitwise_binary_1): Likewise.
7435         (simplify_bitwise_binary): Use simplify_bitwise_binary_1.
7436
7437 2011-07-07  Joseph Myers  <joseph@codesourcery.com>
7438
7439         * gcc.c (%[Spec]): Don't document.
7440         (struct spec_list): Update comment.
7441         (do_spec_1): Don't handle %[Spec].
7442         * doc/invoke.texi (%[@var{name}]): Remove documentation of spec.
7443
7444 2011-07-07  Joseph Myers  <joseph@codesourcery.com>
7445
7446         * common/common-target-def.h (TARGET_HAVE_NAMED_SECTIONS): Don't
7447         default based on TARGET_ASM_NAMED_SECTION.
7448         * common/common-target.def (have_named_sections): Default to true.
7449         * common/config/default-common.c: Don't include tm.h.
7450         * common/config/picochip/picochip-common.c
7451         (TARGET_HAVE_NAMED_SECTIONS): Don't define.
7452         * common/config/m32c/m32c-common.c: Remove.
7453         * config.gcc (m32c*-*-*): Set target_has_targetm_common=no.
7454         * config/alpha/osf5.h (TARGET_HAVE_NAMED_SECTIONS): Define to false.
7455         * config/i386/openbsd.h (TARGET_HAVE_NAMED_SECTIONS): Define to false.
7456         * config/m68k/openbsd.h (TARGET_HAVE_NAMED_SECTIONS): Define to false.
7457         * config/pa/som.h (TARGET_HAVE_NAMED_SECTIONS): Define to false.
7458         * config/pdp11/pdp11.h (TARGET_HAVE_NAMED_SECTIONS): Define to false.
7459         * config/vax/openbsd.h (TARGET_HAVE_NAMED_SECTIONS): Define to false.
7460
7461 2011-07-07  Jakub Jelinek  <jakub@redhat.com>
7462
7463         PR middle-end/49640
7464         * gimplify.c (gimplify_compound_lval): For last 2 ARRAY_*REF operands
7465         and last COMPONENT_REF operand call gimplify_expr on it if non-NULL.
7466
7467 2011-07-07  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
7468
7469         PR libmudflap/49550
7470         * gcc.c (MFWRAP_SPEC): Also wrap mmap64.
7471
7472 2011-07-07  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
7473
7474         PR target/39150
7475         * configure.ac (gcc_cv_as_hidden): Also accept
7476         x86_64-*-solaris2.1[0-9]*.
7477         (gcc_cv_as_cfi_directive): Likewise.
7478         (gcc_cv_as_comdat_group_group): Likewise.
7479         (set_have_as_tls): Likewise.
7480         * configure: Regenerate.
7481         * config.gcc (i[34567]86-*-solaris2*): Also handle
7482         x86_64-*-solaris2.1[0-9]*.
7483         * config.host (i[34567]86-*-solaris2*): Likewise.
7484         * config/sparc/sol2.h (ASM_CPU_DEFAULT_SPEC): Remove.
7485         * config/sol2-bi.h (ASM_CPU_DEFAULT_SPEC): Redefine.
7486         [USE_GLD] (ARCH_DEFAULT_EMULATION): Define.
7487         (TARGET_LD_EMULATION): Use it.
7488         * config/i386/sol2.h (ASM_CPU_DEFAULT_SPEC): Define.
7489         (SUBTARGET_CPU_EXTRA_SPECS): Add asm_cpu_default.
7490         * config/i386/sol2-bi.h (ASM_CPU32_DEFAULT_SPEC): Define.
7491         (ASM_CPU64_DEFAULT_SPEC): Define.
7492         (ASM_CPU_SPEC): Use %(asm_cpu_default).
7493         (ASM_SPEC): Redefine.
7494         (DEFAULT_ARCH32_P): Define using TARGET_64BIT_DEFAULT.
7495         * config/host-solaris.c [__x86_64__] (TRY_EMPTY_VM_SPACE): Reduce.
7496         * doc/install.texi (Specific, amd64-*-solaris2.1[0-9]*): Document.
7497         (Specific, i?86-*-solaris2.10): Mention x86_64-*-solaris2.1[0-9]*
7498         configuration.
7499         (Specific, x86_64-*-solaris2.1[0-9]*): Document.
7500
7501 2011-07-07  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
7502
7503         * config/sol2.h (ASM_SPEC): Split into ...
7504         (ASM_SPEC_BASE, ASM_PIC_SPEC): ... this.
7505         * config/i386/sol2.h (ASM_SPEC): Define using ASM_SPEC_BASE.
7506         * config/i386/sol2-bi.h (ASM_CPU_SPEC): Redefine.
7507         (ASM_SPEC): Use ASM_SPEC_BASE.
7508         * config/sparc/sol2.h (ASM_SPEC): Redefine.
7509
7510 2011-07-07  Georg-Johann Lay  <avr@gjlay.de>
7511
7512         * config/avr/avr.md (*reload_insi): Change predicate #1 to
7513         const_int_operand.  Ditto for peep2 producing this insn.
7514         Add argument to output_reload_insisf call.
7515         (*movsi,*movsf): Add argument to output_movsisf call.
7516         (*reload_insf): New insn and new peep2 to produce it.
7517         * config/avr/avr-protos.h (output_movsisf): Change prototype.
7518         (output_reload_insisf): Change prototype.
7519         * config/avr/avr.c (avr_asm_len): New function.
7520         (output_reload_insisf): Rewrite.
7521         (output_movsisf): Change prototype.  output_reload_insisf for
7522         all CONST_INT and CONST_DOUBLE.  ALlow moving 0.0f to memory.
7523         (adjust_insn_length): Add argument to output_movsisf and
7524         output_reload_insisf call.
7525
7526 2011-07-07  Bernd Schmidt  <bernds@codesourcery.com>
7527
7528         * emit-rtl.c (paradoxical_subreg_p): New function.
7529         * rtl.h (paradoxical_subreg_p): Declare.
7530         * combine.c (set_nonzero_bits_and_sign_copies, get_last_value,
7531         apply_distributive_law, simplify_comparison, simplify_set): Use it.
7532         * cse.c (record_jump_cond, cse_insn): Likewise.
7533         * expr.c (force_operand): Likewise.
7534         * rtlanal.c (num_sign_bit_copies1): Likewise.
7535         * reload1.c (eliminate_regs_1, strip_paradoxical_subreg): Likewise.
7536         * reload.c (push_secondary_reload, find_reloads_toplev): Likewise.
7537         (push_reload): Use precision to check for paradoxical subregs.
7538         * expmed.c (extract_bit_field_1): Likewise.
7539
7540         * machmode.h (HWI_COMPUTABLE_MODE_P): New macro.
7541         * combine.c (set_nonzero_bits_and_sign_copies): Use it.
7542         (find_split-point, combine_simplify_rtx, simplify_if_then_else,
7543         simplify_set, simplify_logical, expand_compound_operation,
7544         make_extraction, force_to_mode, if_then_else_cond, extended_count,
7545         try_widen_shift_mode, simplify_shift_const_1, simplify_comparison,
7546         record_value_for_reg): Likewise.
7547         * expmed.c (expand_widening_mult, expand_mult_highpart): Likewise.
7548         * simplify-rtx. c (simplify_unary_operation_1,
7549         simplify_binary_operation_1, simplify_const_relational_operation):
7550         Likewise.
7551
7552         * explow.c (trunc_int_for_mode): Use GET_MODE_PRECISION
7553         instead of GET_MODE_BITSIZE where appropriate.
7554         * rtlanal.c (subreg_lsb_1, subreg_get_info, nonzero_bits1,
7555         num_sign_bit_copies1, canonicalize_condition, low_bitmask_len,
7556         init_num_sign_bit_copies_in_rep): Likewise.
7557         * cse.c (fold_rtx, cse_insn): Likewise.
7558         * loop-doloop.c (doloop_modify, doloop_optimize): Likewise.
7559         * simplify-rtx.c (simplify_unary_operation_1,
7560         simplify_const_unary_operation, simplify_binary_operation_1,
7561         simplify_const_binary_operation, simplify_ternary_operation,
7562         simplify_const_relational_operation, simplify_subreg): Likewise.
7563         * combine.c (try_combine, find_split_point, combine_simplify_rtx,
7564         simplify_if_then_else, simplify_set, expand_compound_operation,
7565         expand_field_assignment, make_extraction, if_then_else_cond,
7566         make_compound_operation, force_to_mode, make_field_assignment,
7567         reg_nonzero_bits_for_combine, reg_num_sign_bit_copies_for_combine,
7568         extended_count, try_widen_shift_mode, simplify_shift_const_1,
7569         simplify_comparison, record_promoted_value, simplify_compare_const,
7570         record_dead_and_set_regs_1): Likewise.
7571
7572         Revert:
7573         * simplify-rtx.c (simplify_const_binary_operation): Use the
7574         shift_truncation_mask hook instead of performing modulo by width.
7575         Compare against mode precision, not bitsize.
7576         * combine.c (combine_simplify_rtx, simplify_shift_const_1):
7577         Use shift_truncation_mask instead of constructing the value manually.
7578
7579 2011-07-06  Michael Meissner  <meissner@linux.vnet.ibm.com>
7580
7581         * config/rs6000/rs6000-protos.h (rs6000_call_indirect_aix): New
7582         declaration.
7583         (rs6000_save_toc_in_prologue_p): Ditto.
7584
7585         * config/rs6000/rs6000.opt (-mr11): New switch to disable loading
7586         up the static chain (r11) during indirect function calls.
7587         (-msave-toc-indirect): New undocumented debug switch.
7588
7589         * config/rs6000/rs6000.c (struct machine_function): Add
7590         save_toc_in_prologue field to note whether the prologue needs to
7591         save the TOC value in the reserved stack location.
7592         (rs6000_emit_prologue): Use TOC_REGNUM instead of 2.  If we need
7593         to save the TOC in the prologue, do so.
7594         (rs6000_trampoline_init): Don't allow creating AIX style
7595         trampolines if -mno-r11 is in effect.
7596         (rs6000_call_indirect_aix): New function to create AIX style
7597         indirect calls, adding support for -mno-r11 to suppress loading
7598         the static chain, and saving the TOC in the prologue instead of
7599         the call body.
7600         (rs6000_save_toc_in_prologue_p): Return true if we are saving the
7601         TOC in the prologue.
7602
7603         * config/rs6000/rs6000.md (STACK_POINTER_REGNUM): Add more fixed
7604         register numbers.
7605         (TOC_REGNUM): Ditto.
7606         (STATIC_CHAIN_REGNUM): Ditto.
7607         (ARG_POINTER_REGNUM): Ditto.
7608         (SFP_REGNO): Delete, unused.
7609         (TOC_SAVE_OFFSET_32BIT): Add constants for AIX TOC save and
7610         function descriptor offsets.
7611         (TOC_SAVE_OFFSET_64BIT): Ditto.
7612         (AIX_FUNC_DESC_TOC_32BIT): Ditto.
7613         (AIX_FUNC_DESC_TOC_64BIT): Ditto.
7614         (AIX_FUNC_DESC_SC_32BIT): Ditto.
7615         (AIX_FUNC_DESC_SC_64BIT): Ditto.
7616         (ptrload): New mode attribute for the appropriate load of a pointer.
7617         (call_indirect_aix32): Delete, rewrite AIX indirect function calls.
7618         (call_indirect_aix64): Ditto.
7619         (call_value_indirect_aix32): Ditto.
7620         (call_value_indirect_aix64): Ditto.
7621         (call_indirect_nonlocal_aix32_internal): Ditto.
7622         (call_indirect_nonlocal_aix32): Ditto.
7623         (call_indirect_nonlocal_aix64_internal): Ditto.
7624         (call_indirect_nonlocal_aix64): Ditto.
7625         (call): Rewrite AIX indirect function calls.  Add support for
7626         eliminating the static chain, and for moving the save of the TOC
7627         to the function prologue.
7628         (call_value): Ditto.
7629         (call_indirect_aix<ptrsize>): Ditto.
7630         (call_indirect_aix<ptrsize>_internal): Ditto.
7631         (call_indirect_aix<ptrsize>_internal2): Ditto.
7632         (call_indirect_aix<ptrsize>_nor11): Ditto.
7633         (call_value_indirect_aix<ptrsize>): Ditto.
7634         (call_value_indirect_aix<ptrsize>_internal): Ditto.
7635         (call_value_indirect_aix<ptrsize>_internal2): Ditto.
7636         (call_value_indirect_aix<ptrsize>_nor11): Ditto.
7637         (call_nonlocal_aix32): Relocate in the rs6000.md file.
7638         (call_nonlocal_aix64): Ditto.
7639
7640         * doc/invoke.texi (RS/6000 and PowerPC Options): Add -mr11 and
7641         -mno-r11 documentation.
7642
7643 2011-07-06  Jonathan Wakely  <jwakely.gcc@gmail.com>
7644
7645         PR other/49658
7646         * doc/extend.texi (Compound Literals): Fix typo.
7647
7648 2011-07-06  James Greenhalgh  <james.greenhalgh@arm.com>
7649
7650         * config/arm/arm.h (TARGET_CPU_CPP_BUILTINS): Add __ARM_FEATURE_DSP.
7651
7652 2011-07-06  Basile Starynkevitch  <basile@starynkevitch.net>
7653
7654         * configure.ac (plugin-version.h): Generate
7655         GCCPLUGIN_VERSION_MAJOR, GCCPLUGIN_VERSION_MINOR,
7656         GCCPLUGIN_VERSION_PATCHLEVEL, GCCPLUGIN_VERSION constant integer
7657         macros.
7658
7659         * configure: Regenerate.
7660
7661         * doc/plugins.texi (Building GCC plugins): Mention
7662         GCCPLUGIN_VERSION ... constant macros in plugin-version.h.
7663
7664 2011-07-06  Bernd Schmidt  <bernds@codesourcery.com>
7665
7666         * machmode.h (TRULY_NOOP_TRUNCATION_MODES_P): New macro.
7667         * combine.c (make_extraction, gen_lowpart_or_truncate,
7668         apply_distributive_law, simplify_comparison,
7669         reg_truncated_to_mode, record_truncated_value): Use it.
7670         * cse.c (notreg_cost): Likewise.
7671         * expmed.c (store_bit_field_1, extract_bit_field_1): Likewise.
7672         * expr.c (convert_move, convert_modes): Likewise.
7673         * optabs.c (expand_binop, expand_unop): Likewise.
7674         * postreload.c (move2add_last_label): Likewise.
7675         * regmove.c (optimize_reg_copy_3): Likewise.
7676         * rtlhooks.c (gen_lowpart_general): Likewise.
7677         * simplify-rtx.c (simplify_unary_operation_1): Likewise.
7678
7679 2011-07-06  Joseph Myers  <joseph@codesourcery.com>
7680
7681         * config/rs6000/vxworks.h (WORDS_BIG_ENDIAN): Define.
7682
7683 2011-07-06  Bernd Schmidt  <bernds@codesourcery.com>
7684
7685         * cse.c (find_comparison_args): Use val_mode_signbit_set_p.
7686         * simplify-rtx.c (mode_signbit_p): Use GET_MODE_PRECISION.
7687         (val_mode_signbit_p, val_mode_signbit_set_p): New functions.
7688         (simplify_const_unary_operation, simplify_binary_operation_1,
7689         simplify_const_binary_operation, simplify_const_relational_operation):
7690         Use them.  Use GET_MODE_MASK for masking and sign-extensions.
7691         * combine.c (set_nonzero_bits_and_sign_copies, simplify_set,
7692         combine_simplify_rtx, force_to_mode, reg_nonzero_bits_for_combine,
7693         simplify_shift_const_1, simplify_comparison): Likewise.
7694         * expr.c (convert_modes): Likewise.
7695         * rtlanal.c (nonzero_bits1, canonicalize_condition): Likewise.
7696         * expmed.c (emit_cstore, emit_store_flag_1, emit_store_flag): Likewise.
7697         * rtl.h (val_mode_signbit_p, val_mode_signbit_set_p): Declare.
7698
7699         * simplify-rtx.c (simplify_ternary_operation): Remove dead code.
7700
7701 2011-07-06  Richard Guenther  <rguenther@suse.de>
7702
7703         PR tree-optimization/49645
7704         * c-decl.c (finish_decl): Also set DECL_HARD_REGISTER for global
7705         register variables.
7706         * tree-ssa-sccvn.c (vn_reference_op_eq): Disregard differences
7707         in type qualification here ...
7708         (copy_reference_ops_from_ref): ... not here.
7709         (vn_reference_lookup_3): ... or here.
7710         (copy_reference_ops_from_ref): Record decl bases as MEM[&decl].
7711         (vn_reference_lookup): Do the lookup with a valueized ao-ref.
7712
7713 2011-07-06  Ian Lance Taylor  <iant@google.com>
7714
7715         * doc/install.texi (Configuration): It's
7716         --enable-gnu-indirect-function, not --enable-indirect-function.
7717
7718 2011-07-06  Bernd Schmidt  <bernds@codesourcery.com>
7719
7720         * simplify-rtx.c (simplify_const_binary_operation): Use the
7721         shift_truncation_mask hook instead of performing modulo by width.
7722         Compare against mode precision, not bitsize.
7723         * combine.c (combine_simplify_rtx, simplify_shift_const_1):
7724         Use shift_truncation_mask instead of constructing the value manually.
7725
7726 2011-07-06  H.J. Lu  <hongjiu.lu@intel.com>
7727
7728         PR middle-end/47383
7729         * tree-ssa-address.c (addr_for_mem_ref): Use pointer_mode for
7730         address computation and convert to address_mode if needed.
7731
7732 2011-07-06  Richard Guenther  <rguenther@suse.de>
7733
7734         * tree.c (build_common_tree_nodes_2): Merge with
7735         build_common_tree_nodes.
7736         * tree.h (build_common_tree_nodes): Adjust prototype.
7737         (build_common_tree_nodes_2): Remove.
7738         * doc/tm.texi.in (lang_hooks.builtin_function): Adjust.
7739         * doc/tm.texi (lang_hooks.builtin_function): Regenerate.
7740
7741 2011-07-05  Jakub Jelinek  <jakub@redhat.com>
7742
7743         PR tree-optimization/49618
7744         * tree-eh.c (tree_could_trap_p) <case CALL_EXPR>: For DECL_WEAK
7745         t recurse on the decl.
7746         <case FUNCTION_DECL, case VAR_DECL>: For DECL_WEAK decls
7747         return true if expr isn't known to be defined in current
7748         TU or some other LTO partition.
7749
7750 2011-07-05  Michael Meissner  <meissner@linux.vnet.ibm.com>
7751
7752         * params.def (PARAM_CASE_VALUES_THRESHOLD): New parameter to
7753         override CASE_VALUES_THRESHOLD.
7754
7755         * stmt.c (toplevel): Include params.h.
7756         (case_values_threshold): Use the --param case-values-threshold
7757         value if non-zero, otherwise use machine dependent value.
7758         (expand_case): Use case_values_threshold.
7759
7760         * Makefile.in (stmt.o): Add $(PARAMS_H) dependency.
7761
7762         * doc/invoke.texi (--param case-values-threshold): Document.
7763
7764 2011-07-05  Richard Henderson  <rth@redhat.com>
7765
7766         * dwarf2out.c (dwarf2out_cfi_label): Make static.
7767         (dwarf2out_flush_queued_reg_saves): Make static.
7768         (dwarf2out_reg_save): Remove.
7769         (dwarf2out_return_save): Remove.
7770         (dwarf2out_return_reg): Remove.
7771         (dwarf2out_reg_save_reg): Remove.
7772         (dwarf2out_def_cfa): Merge into ...
7773         (dwarf2out_frame_init): ... here.
7774         * dwarf2out.h, tree.h: Remove declarations as necessary.
7775
7776 2011-07-05  Richard Henderson  <rth@redhat.com>
7777
7778         * config/ia64/ia64.c (ia64_dwarf_handle_frame_unspec): Remove.
7779         (TARGET_DWARF_HANDLE_FRAME_UNSPEC): Remove.
7780         (ia64_expand_epilogue): Emit an empty FRAME_RELATED_EXPR for
7781         the alloc insn.
7782
7783         * config/ia64/ia64.c (ia64_emit_deleted_label_after_insn): Remove.
7784         (IA64_CHANGE_CFA_IN_EPILOGUE): Remove.
7785         (process_epilogue): Don't call dwarf2out_def_cfa.
7786
7787         * config/ia64/ia64.c (ia64_expand_prologue): Use pc_rtx to
7788         indicate the return address save.
7789         (process_cfa_register): Likewise.
7790
7791         * config/ia64/ia64.c (ia64_dwarf2out_def_steady_cfa): Remove.
7792         (process_cfa_adjust_cfa, ia64_asm_unwind_emit): Don't call it.
7793
7794         * config/ia64/ia64.c (ia64_expand_prologue): Emit REG_CFA_REGISTER
7795         for ar.pfs save at alloc insn.
7796
7797 2011-07-05  Richard Henderson  <rth@redhat.com>
7798
7799         * config/arm/arm.c (arm_dwarf_handle_frame_unspec): Remove.
7800         (TARGET_DWARF_HANDLE_FRAME_UNSPEC): Remove.
7801         (arm_expand_prologue): Use REG_CFA_REGISTER to mark the
7802         stack pointer save.
7803         (arm_unwind_emit_set): Don't recognize UNSPEC_STACK_ALIGN.
7804         (arm_unwind_emit): Walk REG_NOTES for unwinding notes.  Emit
7805         proper unwind info for a REG_CFA_REGISTER save of stack pointer.
7806         * config/arm/arm.md (UNSPEC_STACK_ALIGN): Remove.
7807
7808 2011-07-05  Richard Henderson  <rth@redhat.com>
7809
7810         * config/vax/vax.md (define_c_enum unspecv): New.  Define the
7811         VUNSPEC_* constants here instead of via define_constants.
7812         (VUNSPEC_PEM): New constant.
7813         (procedure_entry_mask): New insn.
7814         (prologue): New expander.
7815         * config/vax/vax.c (vax_add_reg_cfa_offset): New.
7816         (vax_expand_prologue): Rename from vax_output_function_prologue;
7817         emit rtl instead of text.
7818         (TARGET_ASM_FUNCTION_PROLOGUE): Remove.
7819         (print_operand): Add 'x' prefix.
7820
7821 2011-07-05  H.J. Lu  <hongjiu.lu@intel.com>
7822
7823         PR middle-end/47715
7824         * calls.c (precompute_register_parameters): Promote the function
7825         argument before checking non-legitimate constant.
7826
7827 2011-07-05  Sebastian Pop  <sebastian.pop@amd.com>
7828
7829         PR tree-optimization/47654
7830         * graphite-blocking.c (pbb_strip_mine_time_depth): Do not return bool.
7831         (lst_do_strip_mine_loop): Return an int.
7832         (lst_do_strip_mine): Same.
7833         (scop_do_strip_mine): Same.
7834         (scop_do_block): Loop blocking should strip-mine at least two loops.
7835         * graphite-interchange.c (lst_interchange_select_outer): Return an int.
7836         (scop_do_interchange): Same.
7837         * graphite-poly.h (scop_do_interchange): Update declaration.
7838         (scop_do_strip_mine): Same.
7839
7840 2011-07-05  Sebastian Pop  <sebastian.pop@amd.com>
7841
7842         * graphite-clast-to-gimple.c (precision_for_value): Removed.
7843         (precision_for_interval): Removed.
7844         (gcc_type_for_interval): Use mpz_sizeinbase.
7845
7846 2011-07-05  Sebastian Pop  <sebastian.pop@amd.com>
7847
7848         * graphite-ppl.h (value_max): Correct computation of max.
7849
7850 2011-07-05  Sebastian Pop  <sebastian.pop@amd.com>
7851
7852         * graphite-clast-to-gimple.c (clast_name_to_index): Add missing space.
7853
7854 2011-07-05  Richard Guenther  <rguenther@suse.de>
7855
7856         * c-decl.c (c_init_decl_processing): Defer building common
7857         tree nodes to c_common_nodes_and_builtins.
7858
7859 2011-07-05  Razya Ladelsky  <razya@il.ibm.com>
7860
7861         PR tree-optimization/49580
7862         * tree-cfg.c (gimple_duplicate_sese_tail): Remove handling of
7863         the loop's number of iterations.
7864         * tree-parloops.c (transform_to_exit_first_loop): Add the
7865         handling of the loop's number of iterations before the call
7866         to gimple_duplicate_sese_tail.
7867         Insert the stmt caclculating the new rhs of the loop's
7868         condition stmt to the preheader instead of iters_bb.
7869
7870 2011-07-05  H.J. Lu  <hongjiu.lu@intel.com>
7871
7872         PR rtl-optimization/47449
7873         * fwprop.c (forward_propagate_subreg): Don't propagate hard
7874         register nor zero/sign extended hard register.
7875
7876 2011-07-05  Richard Guenther  <rguenther@suse.de>
7877
7878         PR tree-optimization/49518
7879         PR tree-optimization/49628
7880         * tree-vect-data-refs.c (vect_enhance_data_refs_alignment): Skip
7881         irrelevant and invariant data-references.
7882         (vect_analyze_data_ref_access): For invariant loads clear the
7883         group association.
7884
7885 2011-07-04  Jakub Jelinek  <jakub@redhat.com>
7886
7887         PR rtl-optimization/49619
7888         * combine.c (combine_simplify_rtx): In PLUS -> IOR simplification
7889         pass VOIDmode as op0_mode to recursive call, and return temp even
7890         when different from tor, just if it is not IOR of the original
7891         PLUS arguments.
7892
7893         PR rtl-optimization/49472
7894         * simplify-rtx.c (simplify_unary_operation_1) <case NEG>: When
7895         negating MULT, negate the second operand instead of first.
7896         (simplify_binary_operation_1) <case MULT>: If one operand is
7897         a NEG and the other is MULT, don't attempt to optimize by negation
7898         of the MULT operand if it only moves the NEG operation around.
7899
7900         PR debug/49602
7901         * tree-into-ssa.c (rewrite_debug_stmt_uses): Disregard
7902         get_current_def return value if it can't be trusted to be
7903         the current value of the variable in the current bb.
7904
7905 2011-07-04  Uros Bizjak  <ubizjak@gmail.com>
7906
7907         PR target/49600
7908         * config/i386/i386.md (SSE2 int->float split): Push operand 1 in
7909         general register to memory for !TARGET_INTER_UNIT_MOVES.
7910
7911 2011-07-04  Georg-Johann Lay  <avr@gjlay.de>
7912
7913         PR target/44643
7914         * config/avr/avr.c (avr_insert_attributes): Use TYPE_READONLY
7915         instead of TREE_READONLY.
7916
7917 2011-07-04  Georg-Johann Lay  <avr@gjlay.de>
7918
7919         * doc/extend.texi (AVR Built-in Functions): Update documentation
7920         of __builtin_avr_fmul*.
7921         * config/avr/avr.c (avr_init_builtins): Don't depend on AVR_HAVE_MUL.
7922         * config/avr/avr-c.c (avr_cpu_cpp_builtins): Ditto.
7923         * config/avr/avr.md (fmul): Rename to fmul_insn.
7924         (fmuls): Rename to fmuls_insn.
7925         (fmulsu): Rename to fmulsu_insn.
7926         (fmul,fmuls,fmulsu): New expander.
7927         (*fmul.call,*fmuls.call,*fmulsu.call): New Insn.
7928         * config/avr/t-avr (LIB1ASMFUNCS): Add _fmul, _fmuls, _fmulsu.
7929         * config/avr/libgcc.S (__fmul): New function.
7930         (__fmuls): New function.
7931         (__fmulsu,__fmulsu_exit): New function.
7932
7933 2011-07-04  Richard Guenther  <rguenther@suse.de>
7934
7935         PR tree-optimization/49615
7936         * tree-cfgcleanup.c (split_bbs_on_noreturn_calls): Fix
7937         basic-block index check.
7938
7939 2011-07-04  Georg-Johann Lay  <avr@gjlay.de>
7940
7941         * longlong.h (count_leading_zeros, count_trailing_zeros,
7942         COUNT_LEADING_ZEROS_0): Define for target avr if W_TYPE_SIZE is 16
7943         resp. 64.
7944
7945 2011-07-03  Ira Rosen  <ira.rosen@linaro.org>
7946
7947         PR tree-optimization/49610
7948         * tree-vect-loop.c (vect_is_slp_reduction): Check that DEF_STMT has
7949         a basic block.
7950
7951 2011-07-02  Eric Botcazou  <ebotcazou@adacore.com>
7952             Olivier Hainque  <hainque@adacore.com>
7953             Nicolas Setton  <setton@adacore.com>
7954
7955         * tree.h (TYPE_ARTIFICIAL): New flag.
7956         * dwarf2out.c (modified_type_die): Add a DW_AT_artificial attribute to
7957         the DIE of the type if it is artificial.
7958         (gen_array_type_die): Likewise.
7959         (gen_enumeration_type_die): Likewise.
7960         (gen_struct_or_union_type_die): Likewise.
7961         * lto-streamer-in.c (unpack_ts_base_value_fields): Use TYPE_ARTIFICIAL.
7962         * lto-streamer-out.c (pack_ts_base_value_fields): Likewise.
7963
7964 2011-07-01  Jakub Jelinek  <jakub@redhat.com>
7965
7966         * tree-object-size.c (pass_through_call): Handle
7967         BUILT_IN_ASSUME_ALIGNED.
7968
7969 2011-07-01  Martin Jambor  <mjambor@suse.cz>
7970
7971         * tree-sra.c (tree_non_mode_aligned_mem_p): Also ignore MEM_REFs.
7972
7973 2011-07-01  H.J. Lu  <hongjiu.lu@intel.com>
7974
7975         PR middle-end/48016
7976         * explow.c (update_nonlocal_goto_save_area): Use proper mode
7977         for stack save area.
7978         * function.c (expand_function_start): Likewise.
7979
7980 2011-07-01  Richard Guenther  <rguenther@suse.de>
7981
7982         PR middle-end/49596
7983         * cgraph.h (varpool_all_refs_explicit_p): Not analyzed nodes
7984         may have unknown refs.
7985
7986 2011-07-01  Kai Tietz  <ktietz@redhat.com>
7987
7988         * tree-ssa-forwprop.c (simplify_bitwise_binary): Fix typo.
7989
7990 2011-07-01  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
7991
7992         * config.gcc: Obsolete alpha*-dec-osf5.1, mips-sgi-irix6.5.
7993         * doc/install.texi (Specific, alpha*-dec-osf5.1): Document it.
7994         (Specific, mips-sgi-irix6): Likewise.
7995
7996 2011-07-01  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
7997
7998         PR libmudflap/49549
7999         * doc/sourcebuild.texi (Effective-Target Keywords): Document gld.
8000
8001 2011-07-01  Jakub Jelinek  <jakub@redhat.com>
8002
8003         * tree-pretty-print.c (dump_generic_code) <case CONSTRUCTOR>: Print
8004         [idx]= and [idx1 ... idx2]= before initializers if needed for
8005         array initializers.
8006
8007 2011-07-01  Chen Liqin  <liqin.gcc@gmail.com>
8008
8009         * config.gcc (score-*-elf): Remove score7.o.
8010         * config/score/t-score-elf: Likewise.
8011         * config/score/score.c: Merge score7 to score.c and
8012         remove forwarding functions.
8013         * config/score/score7.c: Deleted.
8014         * config/score/score7.h: Deleted.
8015
8016 2011-07-01  Richard Guenther  <rguenther@suse.de>
8017
8018         PR tree-optimization/49603
8019         * tree-vect-stmts.c (vectorizable_load): Remove unnecessary assert.
8020
8021 2011-06-30  Martin Jambor  <mjambor@suse.cz>
8022
8023         * tree-sra.c (struct access): Rename total_scalarization to
8024         grp_total_scalarization
8025         (completely_scalarize_var): New function.
8026         (sort_and_splice_var_accesses): Set total_scalarization in the
8027         representative access.
8028         (analyze_access_subtree): Propagate total scalarization accross the
8029         tree, no holes in totally scalarized trees, simplify coverage
8030         computation.
8031         (analyze_all_variable_accesses): Call completely_scalarize_var instead
8032         of completely_scalarize_record.
8033
8034 2011-06-30  Richard Henderson  <rth@redhat.com>
8035
8036         * config/i386/i386.h (X86_TUNE_DEEP_BRANCH_PREDICTION): Remove.
8037         (TARGET_DEEP_BRANCH_PREDICTION): Remove.
8038         * config/i386/i386.c: Don't include dwarf2out.h.
8039         (initial_ix86_tune_features): Remove X86_TUNE_DEEP_BRANCH_PREDICTION.
8040         (output_set_got): Don't test TARGET_DEEP_BRANCH_PREDICTION, delete
8041         all code dead thereafter.  Don't do dwarf2out_flush_queued_reg_saves.
8042         (ix86_expand_prologue): Set REG_CFA_FLUSH_QUEUE on set_got insn.
8043         (machopic_output_stub): Don't test TARGET_DEEP_BRANCH_PREDICTION.
8044
8045 2011-06-30  Richard Henderson  <rth@redhat.com>
8046
8047         * reg-notes.def (REG_CFA_FLUSH_QUEUE): New.
8048         * dwarf2out.c (dwarf2out_frame_debug): Handle it.
8049         * final.c (final_scan_insn): Look for it, and invoke
8050         dwarf2out_frame_debug before the insn if found.
8051
8052 2011-06-30  Richard Henderson  <rth@redhat.com>
8053
8054         * dwarf2out.c (dwarf2out_frame_debug_cfa_offset): Allow PC_RTX
8055         as a source, and interpret that as DWARF_FRAME_RETURN_COLUMN.
8056
8057 2011-06-30  Richard Henderson  <rth@redhat.com>
8058
8059         * dwarf2out.c (struct reg_saved_in_data): Provide a typedef.
8060         Define a vector of this type.
8061         (regs_saved_in_regs): Use a VEC.
8062         (num_regs_saved_in_regs): Remove.
8063         (compare_reg_or_pc): New.
8064         (record_reg_saved_in_reg): Split out from...
8065         (dwarf2out_flush_queued_reg_saves): ... here.
8066         (clobbers_queued_reg_save): Update for VEC.
8067         (reg_saved_in): Likewise.
8068         (dwarf2out_frame_debug_init): Likewise.
8069         (dwarf2out_reg_save_reg): Use record_reg_saved_in_reg.
8070         (dwarf2out_frame_debug_cfa_register): Likewise.
8071
8072 2011-06-30  Eric Botcazou  <ebotcazou@adacore.com>
8073
8074         PR tree-optimization/49572
8075         * tree-ssa-dom.c (initialize_hash_element) <GIMPLE_SINGLE_RHS>: Use the
8076         type of the RHS instead of that of the LHS for the expression type.
8077
8078 2011-06-30  Eric Botcazou  <ebotcazou@adacore.com>
8079
8080         * df-scan.c (df_get_entry_block_def_set): Use INCOMING_REGNO macro
8081         unconditionally.
8082
8083 2011-06-30  Richard Guenther  <rguenther@suse.de>
8084
8085         * opts.c (finish_options): Do not disable IPA-PTA during ltrans.
8086         * tree-ssa-structalias.c (create_variable_info_for): Do not
8087         add initial constraints for non-var-decls.  Properly handle
8088         globals in other ltrans partitions.
8089         (intra_create_variable_infos): Manually create constraints for
8090         the fake no-alias parameter.
8091         (ipa_pta_execute): Dump the cgraph, handle ltrans partitions properly
8092         and assert there are no clones.
8093
8094 2011-06-30  Richard Guenther  <rguenther@suse.de>
8095
8096         PR tree-optimization/46787
8097         * tree-data-ref.c (dr_address_invariant_p): Remove.
8098         (find_data_references_in_stmt): Invariant accesses are ok now.
8099         * tree-vect-stmts.c (vectorizable_load): Handle invariant loads.
8100         * tree-vect-data-refs.c (vect_analyze_data_ref_access): Allow
8101         invariant loads.
8102
8103 2011-06-30  Martin Jambor  <mjambor@suse.cz>
8104
8105         PR tree-optimization/49094
8106         * tree-sra.c (tree_non_mode_aligned_mem_p): New function.
8107         (build_accesses_from_assign): Use it.
8108
8109 2011-06-30  Jakub Jelinek  <jakub@redhat.com>
8110
8111         * tree-ssa-structalias.c (find_func_aliases_for_builtin_call): Fix
8112         handling of BUILT_IN_ASSUME_ALIGNED.
8113
8114         PR debug/49364
8115         * dwarf2out.c (output_abbrev_section): Don't return early
8116         if abbrev_die_table_in_use is 1.
8117         (dwarf2out_finish): Instead don't call output_abbrev_section
8118         nor emit abbrev_section_label in that case.
8119
8120 2011-06-30  Nick Clifton  <nickc@redhat.com>
8121
8122         * config/v850/v850.h (CPP_SPEC): Define __v850e__ when compiling
8123         for the V850E.
8124
8125 2011-06-30  Jakub Jelinek  <jakub@redhat.com>
8126
8127         * tree-ssa-structalias.c (find_func_aliases_for_builtin_call): Fix
8128         handling of BUILT_IN_MEMPCPY_CHK and BUILT_IN_STPCPY_CHK.
8129
8130 2011-06-30  Ira Rosen  <ira.rosen@linaro.org>
8131
8132         * tree-vect-loop.c (vect_determine_vectorization_factor): Handle
8133         both pattern and original statements if necessary.
8134         (vect_transform_loop): Likewise.
8135         * tree-vect-patterns.c (vect_pattern_recog): Update documentation.
8136         * tree-vect-stmts.c (vect_mark_relevant): Add new argument.
8137         Mark the pattern statement only if the original statement doesn't
8138         have its own uses.
8139         (process_use): Call vect_mark_relevant with additional parameter.
8140         (vect_mark_stmts_to_be_vectorized): Likewise.
8141         (vect_get_vec_def_for_operand): Use vectorized pattern statement.
8142         (vect_analyze_stmt): Handle both pattern and original statements
8143         if necessary.
8144         (vect_transform_stmt): Don't store vectorized pattern statement
8145         in the original statement.
8146         (vect_is_simple_use_1): Use related pattern statement only if the
8147         original statement is irrelevant.
8148         * tree-vect-slp.c (vect_get_and_check_slp_defs): Likewise.
8149
8150 2011-06-29  Changpeng Fang  <changpeng.fang@amd.com>
8151
8152         * config/i386/i386.opt (mprefer-avx128): Redefine the flag as a Mask
8153         option.
8154         * config/i386/i386.h (ix86_tune_indices): Add X86_TUNE_AVX128_OPTIMAL
8155         entry.
8156         (TARGET_AVX128_OPTIMAL): New definition.
8157         * config/i386/i386.c (initial_ix86_tune_features): Initialize
8158         X86_TUNE_AVX128_OPTIMAL entry.
8159         (ix86_option_override_internal): Enable the generation
8160         of the 128-bit instructions when TARGET_AVX128_OPTIMAL is set.
8161         (ix86_preferred_simd_mode): Use TARGET_PREFER_AVX128.
8162         (ix86_autovectorize_vector_sizes): Use TARGET_PREFER_AVX128.
8163
8164 2011-06-29  Eric Botcazou  <ebotcazou@adacore.com>
8165
8166         PR tree-optimization/49539
8167         * tree-ssa-forwprop.c (can_propagate_from): Check for abnormal SSA
8168         names by means of stmt_references_abnormal_ssa_name.
8169         (associate_plusminus): Call can_propagate_from before propagating
8170         from definition statements.
8171         (ssa_forward_propagate_and_combine): Remove superfluous newline.
8172
8173 2011-06-29  Richard Guenther  <rguenther@suse.de>
8174
8175         * doc/invoke.texi: Document -scev dump modifier.
8176         * tree-pass.h (TDF_SCEV): New dump flag.
8177         * tree-dump.c (dump_option_value_in): Add scev.
8178         * tree-chrec.c: Replace all TDF_DETAILS checks with TDF_SCEV.
8179         * tree-scalar-evolution.c: Likewise.
8180
8181 2011-06-29  Nathan Sidwell  <nathan@codesourcery.com>
8182
8183         * config/arm/unwind-arm.c (enum __cxa_type_match_result): New.
8184         (cxa_type_match): Correct declaration.
8185         (__gnu_unwind_pr_common): Reconstruct additional indirection
8186         when __cxa_type_match returns succeeded_with_ptr_to_base.
8187
8188 2011-06-29  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
8189
8190         PR rtl-optimization/49114
8191         * reload.c (struct replacement): Remove SUBREG_LOC member.
8192         (push_reload): Do not set it.
8193         (push_replacement): Likewise.
8194         (subst_reload): Remove dead code.
8195         (copy_replacements): Remove assertion.
8196         (copy_replacements_1): Do not handle SUBREG_LOC.
8197         (move_replacements): Likewise.
8198         (find_replacement): Remove dead code.  Use reload_adjust_reg_for_mode.
8199         Detect subregs via recursive descent instead of via SUBREG_LOC.
8200
8201 2011-06-29  Georg-Johann Lay  <avr@gjlay.de>
8202
8203         * config/avr/avr.c (avr_encode_section_info): Dispatch to
8204         default_encode_section_info.
8205
8206 2011-06-29  Richard Sandiford  <richard.sandiford@linaro.org>
8207
8208         PR tree-optimization/49545
8209         * builtins.c (get_object_alignment_1): Update function comment.
8210         Do not use DECL_ALIGN for functions, but test
8211         TARGET_PTRMEMFUNC_VBIT_LOCATION instead.
8212         * fold-const.c (get_pointer_modulus_and_residue): Don't check
8213         for functions here.
8214         * tree-ssa-ccp.c (get_value_from_alignment): Likewise.
8215
8216 2011-06-29  Jakub Jelinek  <jakub@redhat.com>
8217
8218         PR debug/49567
8219         * dwarf2out.c (mem_loc_descriptor) <case ZERO_EXTEND>: Give up for
8220         non-MODE_INT modes instead of asserting the mode has MODE_INT class.
8221
8222 2011-06-29  Georg-Johann Lay  <avr@gjlay.de>
8223
8224         PR target/34734
8225         * config/avr/avr.c (avr_handle_progmem_attribute): Move warning
8226         about uninitialized data attributed 'progmem' from here...
8227         (avr_encode_section_info): ...to this new function.
8228         (TARGET_ENCODE_SECTION_INFO): New define.
8229         (avr_section_type_flags): For data in ".progmem.data", remove
8230         section flag SECTION_WRITE.
8231
8232 2011-06-29  Georg-Johann Lay  <avr@gjlay.de>
8233
8234         * config/avr/t-avr (LIB1ASMFUNCS): Add _mulhisi3, _umulhisi3,
8235         _xmulhisi3_exit.
8236         * config/avr/libgcc.S (_xmulhisi3_exit): New Function.
8237         (__mulhisi3): Optimize if have MUL*.  Use XJMP instead of rjmp.
8238         (__umulhisi3): Ditto.
8239         * config/avr/avr.md (mulhisi3): New insn expender.
8240         (umulhisi3): New insn expender.
8241         (*mulhisi3_call): New insn.
8242         (*umulhisi3_call): New insn.
8243
8244 2011-06-28  Joseph Myers  <joseph@codesourcery.com>
8245
8246         * Makefile.in (LIBGCC2_CFLAGS): Remove -D__GCC_FLOAT_NOT_NEEDED.
8247
8248 2011-06-28  Richard Henderson  <rth@redhat.com>
8249
8250         * config/arm/arm.c (thumb_pop): Rename from thumb_pushpop.  Delete
8251         all code and arguments that handled pushes.  Update all callers.
8252
8253 2011-06-28  Richard Henderson  <rth@redhat.com>
8254
8255         * config/arm/arm.c (arm_output_function_prologue): Don't call
8256         thumb1_output_function_prologue.
8257         (arm_expand_prologue): Avoid dead store.
8258         (number_of_first_bit_set): Use ctz_hwi.
8259         (thumb1_emit_multi_reg_push): New.
8260         (thumb1_expand_prologue): Merge thumb1_output_function_prologue
8261         to emit the entire prologue as rtl.
8262         (thumb1_output_interwork): Split out from
8263         thumb1_output_function_prologue.
8264         (thumb1_output_function_prologue): Remove.
8265         (arm_attr_length_push_multi): Handle thumb1.
8266         * config/arm/arm.md (VUNSPEC_THUMB1_INTERWORK): New.
8267         (prologue_thumb1_interwork): New.
8268         (*push_multi): Allow thumb1; use push_mult_memory_operand.
8269         * config/arm/predicates.md (push_mult_memory_operand): New.
8270
8271 2011-06-28  Eric Botcazou  <ebotcazou@adacore.com>
8272
8273         * config/sparc/sync.md (*stbar): Delete.
8274         (*membar_v8): New insn to implement UNSPEC_MEMBAR in SPARC-V8.
8275
8276 2011-06-28  Eric Botcazou  <ebotcazou@adacore.com>
8277
8278         * tree-ssa-dom.c (initialize_hash_element): Fix oversight.
8279
8280 2011-06-28  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
8281
8282         * config/sparc/sol2-64.h (TARGET_DEFAULT): Remove.
8283         (TARGET_64BIT_DEFAULT): Define.
8284         * config.gcc (sparc*-*-solaris2*): Move sparc/sol2-64.h to front
8285         of tm_file.
8286         * config/sparc/sol2.h [TARGET_64BIT_DEFAULT] (TARGET_DEFAULT): Define.
8287
8288 2011-06-28  Joseph Myers  <joseph@codesourcery.com>
8289
8290         * common.opt (in_lto_p): New Variable entry.
8291         * flags.h (in_lto_p): Move to common.opt.
8292         * gcc.c: Include params.h.
8293         (set_option_handlers): Also use common_handle_option and
8294         target_handle_option.
8295         (main): Call global_init_params, finish_params and init_options_struct.
8296         * opts.c (debug_type_names): Move from toplev.c.
8297         (print_filtered_help): Access quiet_flag through opts pointer.
8298         (common_handle_option): Return early in the driver for some options.
8299         Access in_lto_p, dwarf_version and warn_maybe_uninitialized through
8300         opts pointer.
8301         * toplev.c (in_lto_p): Move to common.opt.
8302         (debug_type_names): Move to opts.c.
8303         * Makefile.in (OBJS): Remove opts.o.
8304         (OBJS-libcommon-target): Add opts.o.
8305         (gcc.o): Update dependencies.
8306
8307 2011-06-28  Kai Tietz  <ktietz@redhat.com>
8308
8309         * tree-ssa-forwprop.c (simplify_bitwise_binary): Improve type sinking.
8310
8311 2011-06-28  Ramana Radhakrishnan  <ramana.radhakrishnan@linaro.org>
8312
8313         * config/arm/vfp.md ("*divsf3_vfp"): Replace '+' constraint modifier
8314         with '=' constraint modifier.
8315         (*divdf3_vfp): Likewise.
8316         ("*mulsf3_vfp"): Likewise.
8317         ("*muldf3_vfp"): Likewise.
8318         ("*mulsf3negsf_vfp"): Likewise.
8319         ("*muldf3negdf_vfp"): Likewise.
8320
8321 2011-06-28  Nick Clifton  <nickc@redhat.com>
8322
8323         * config/mn10300/mn10300.h (LINK_SPEC): Do not use linker
8324         relaxation when performing an incremental link.
8325
8326 2011-06-28  Kai Tietz  <ktietz@redhat.com>
8327
8328         * tree-ssa-math-opts.c (execute_optimize_bswap): Search
8329         within BB from last to first.
8330
8331 2011-06-28  Joseph Myers  <joseph@codesourcery.com>
8332
8333         * genattr-common.c: New.  Based on genattr.c.
8334         * Makefile.in (INSN_ATTR_H): Include insn-attr-common.h.
8335         (MOSTLYCLEANFILES): Add insn-attr-common.h.
8336         (opts.o): Update dependencies.
8337         (.PRECIOUS): Add insn-attr-common.h.
8338         (simple_rtl_generated_h): Add insn-attr-common.h.
8339         (build/genattr-common.o): New.
8340         (genprogrtl): Add attr-common.
8341         * genattr.c (main): Include insn-attr-common.h.  Don't generate
8342         definitions of DELAY_SLOTS or INSN_SCHEDULING.
8343         * opts.c: Include insn-attr-common.h instead of rtl.h and insn-attr.h.
8344
8345 2011-06-28  Georg-Johann Lay  <avr@gjlay.de>
8346
8347         * config.gcc (tm_file): Add elfos.h and avr/elf.h for
8348         avr-*-* and avr-*-rtems* targets.
8349
8350         * config/avr/elf.h: New file.
8351         (ASM_OUTPUT_BEFORE_CASE_LABEL): Define.
8352         (TARGET_ASM_SELECT_SECTION): Define.
8353         (INIT_SECTION_ASM_OP): Undefine.
8354         (FINI_SECTION_ASM_OP): Undefine.
8355         (READONLY_DATA_SECTION_ASM_OP): Undefine.
8356         (PCC_BITFIELD_TYPE_MATTERS): Undefine.
8357         (TARGET_HAVE_SWITCHABLE_BSS_SECTIONS): Undefine.
8358         * config/avr/avr.h:
8359         (PREFERRED_DEBUGGING_TYPE): Move to elf.h.
8360         (TARGET_ASM_NAMED_SECTION): Move to elf.h.
8361         (MAX_OFILE_ALIGNMENT): Move to elf.h.
8362         (STRING_LIMIT): Move to elf.h.
8363         (ASM_DECLARE_FUNCTION_NAME): Move to elf.h.
8364         (ASM_DECLARE_OBJECT_NAME): Remove.
8365         (ESCAPES): Remove.
8366         (ASM_OUTPUT_SKIP): Remove.
8367         (DWARF2_DEBUGGING_INFO): Remove.
8368         (OBJECT_FORMAT_ELF): Remove.
8369         (USER_LABEL_PREFIX): Remove.
8370         (ASM_OUTPUT_EXTERNAL): Remove.
8371         (ASM_OUTPUT_ASCII): Remove.
8372         (TYPE_ASM_OP): Remove.
8373         (SIZE_ASM_OP): Remove.
8374         (WEAK_ASM_OP): Remove.
8375         (STRING_ASM_OP): Remove.
8376         (SET_ASM_OP): Remove.
8377         (ASM_WEAKEN_LABEL): Remove.
8378         (TYPE_OPERAND_FMT): Remove.
8379         (ASM_DECLARE_FUNCTION_SIZE): Remove.
8380         (ASM_FINISH_DECLARE_OBJECT): Remove.
8381         (NO_DOLLAR_IN_LABEL): Remove.
8382         (ASM_GENERATE_INTERNAL_LABEL): Remove.
8383         (ASM_OUTPUT_CASE_LABEL): Remove.
8384         * config/avr/avr.c (avr_asm_output_aligned_decl_common): Use
8385         ASM_OUTPUT_ALIGNED_LOCAL, ASM_OUTPUT_ALIGNED_COMMON.
8386         (gas_output_ascii): Remove.
8387         (gas_output_limited_string): Remove.
8388         (TARGET_ASM_FILE_START_FILE_DIRECTIVE): Remove.
8389         * config/avr/avr-protos.h
8390         (gas_output_ascii): Remove prototye.
8391         (gas_output_limited_string): Remove prototype.
8392
8393 2011-06-27  Richard Earnshaw  <rearnsha@arm.com>
8394
8395         PR target/48637
8396         * arm.c (arm_print_operand): Allow sym+offset.  Don't abort on invalid
8397         asm operands.
8398
8399 2011-06-27  Jan Hubicka  <jh@suse.cz>
8400
8401         * ipa.c (cgraph_address_taken_from_non_vtable_p): Walk references of
8402         node instead of references in node.
8403
8404 2011-06-27  Richard Henderson  <rth@redhat.com>
8405
8406         * config/alpha/alpha.c (vms_patch_builtins): Provide dummy definition.
8407         * config/ia64/ia64.c (ia64_init_builtins): Call vms_patch_builtins
8408         inside ifdef.
8409
8410 2011-06-27  Jakub Jelinek  <jakub@redhat.com>
8411
8412         * c-decl.c (union lang_tree_node): Use it in chain_next expression.
8413
8414         * builtin-types.def (BT_FN_PTR_CONST_PTR_SIZE_VAR): New.
8415         * builtins.def (BUILT_IN_ASSUME_ALIGNED): New builtin.
8416         * tree-ssa-structalias.c (find_func_aliases_for_builtin_call,
8417         find_func_clobbers): Handle BUILT_IN_ASSUME_ALIGNED.
8418         * tree-ssa-ccp.c (bit_value_assume_aligned): New function.
8419         (evaluate_stmt, execute_fold_all_builtins): Handle
8420         BUILT_IN_ASSUME_ALIGNED.
8421         * tree-ssa-dce.c (propagate_necessity): Likewise.
8422         * tree-ssa-alias.c (ref_maybe_used_by_call_p_1,
8423         call_may_clobber_ref_p_1): Likewise.
8424         * builtins.c (is_simple_builtin, expand_builtin): Likewise.
8425         (expand_builtin_assume_aligned): New function.
8426         * doc/extend.texi (__builtin_assume_aligned): Document.
8427
8428         PR debug/49544
8429         * cselib.c (promote_debug_loc): If cselib_preserve_constants
8430         and l has two DEBUG_INSN owned locs instead of just one, adjust
8431         the second location's setting_insn too.
8432
8433 2011-06-27  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
8434
8435         PR libmudflap/38738
8436         * config/sol2.h [!USE_GLD] (MFLIB_SPEC): Define.
8437
8438 2011-06-27  Nick Clifton  <nickc@redhat.com>
8439
8440         * config/mn10300/mn10300.md (clzsi2): Use XOR after BSCH to convert
8441         bit position of highest bit set into a count of the high zero bits.
8442
8443 2011-06-27  Eric Botcazou  <ebotcazou@adacore.com>
8444
8445         * dwarf2out.c (TYPE_DECL_IS_STUB): Extend mechanism to all types.
8446
8447 2011-06-27  Eric Botcazou  <ebotcazou@adacore.com>
8448
8449         PR lto/48492
8450         * dwarf2out.c (dwarf2out_finish): Do not attach a DIE on the limbo list
8451         to a NULL parent.
8452
8453 2011-06-27  Richard Guenther  <rguenther@suse.de>
8454
8455         PR tree-optimization/49394
8456         * passes.c (execute_one_pass): Restore current_pass after
8457         applying IPA transforms.
8458
8459 2011-06-27  Kai Tietz  <ktietz@redhat.com>
8460
8461         * tree-ssa-math-opts.c (do_shift_rotate): Zero bits
8462         out of type precision after operation.
8463         (find_bswap): Take for limit value the integer auto-promotion
8464         into account.
8465
8466 2011-06-27  Eric Botcazou  <ebotcazou@adacore.com>
8467
8468         * reorg.c (fill_simple_delay_slots): Use stop_search_p to stop the
8469         forward scan as well.
8470
8471 2011-06-27  Tristan Gingold  <gingold@adacore.com>
8472
8473         PR target/44241
8474         * config/vms/vms-protos.h: New file.
8475         * config/vms/vms-crtlmap.map: New file.
8476         * config/vms/vms.c: New file.
8477         * config/vms/make-crtlmap.awk: New file.
8478         * config/vms/vms-crtl.h: File removed.
8479         * config/vms/vms-crtl-64.h: File removed.
8480         * config/vms/t-vms (vms-crtlmap.h, vms.o): New targets.
8481         * config/alpha/vms64.h: Do not include vms-crtl-64.h
8482         * config/alpha/alpha.c (alpha_init_builtins): Remove code to
8483         clear some builtins on VMS.  Calls vms_patch_builtins.
8484         (avms_asm_output_external): Remove.
8485         * config/alpha/vms.h (ASM_OUTPUT_EXTERNAL): Remove.
8486         (struct crtl_name_spec): Remove
8487         (DO_CTRL_NAMES): Remove.
8488         * config/ia64/vms.h (struct crtl_name_spec): Remove
8489         (DO_CTRL_NAMES): Remove.
8490         * config/ia64/ia64.c (alpha_init_builtins): Remove code to
8491         clear some builtins on VMS.  Calls vms_patch_builtins.
8492         (ia64_asm_output_external): Remove DO_CRTL_NAME.
8493         * config/ia64/vms64.h: Do not include vms-crtl-64.h
8494         * config.gcc (*-*-*vms*): Define extra_objs, target_gtfiles, tm_p_file.
8495
8496 2011-06-27  Tristan Gingold  <gingold@adacore.com>
8497
8498         * config/alpha/alpha.c (alpha_end_function): Always generate .end
8499         directive on VMS.
8500
8501 2011-06-27  Eric Botcazou  <ebotcazou@adacore.com>
8502
8503         * config/sparc/sparc.c (sparc_frame_pointer_required): Return true if
8504         the function receives nonlocal gotos.
8505
8506 2011-06-27  Richard Guenther  <rguenther@suse.de>
8507
8508         PR tree-optimization/49536
8509         * tree-vect-stmts.c (get_vectype_for_scalar_type_and_size):
8510         For non-scalar inner types use a scalar type according to
8511         the scalar inner mode.
8512
8513 2011-06-27  Richard Guenther  <rguenther@suse.de>
8514
8515         PR tree-optimization/49365
8516         * params.def (min-insn-to-prefetch-ratio): Reduce from 10 to 9.
8517
8518 2011-06-27  Richard Guenther  <rguenther@suse.de>
8519
8520         PR tree-optimization/49169
8521         * fold-const.c (get_pointer_modulus_and_residue): Don't rely on
8522         the alignment of function decls.
8523
8524 2011-06-26  Iain Sandoe  <iains@gcc.gnu.org>
8525
8526         PR target/47997
8527         * config/darwin.c (darwin_mergeable_string_section): Place string
8528         constants in '.cstring' rather than '.const' when CF/NSStrings are
8529         active.
8530
8531 2011-06-26  Eric Botcazou  <ebotcazou@adacore.com>
8532
8533         * config/sparc/sparc.c (save_local_or_in_reg_p): Adjust comment.
8534         (emit_save_register_window): Likewise.
8535         (sparc_expand_prologue): Use SIZE_INT_RTX and SIZE_RTX variables.
8536         (sparc_flat_expand_prologue): Add comment.  Always emit blockage.
8537         Swap back %o7/%i7 in register naming.
8538
8539 2011-06-25  Iain Sandoe  <iains@gcc.gnu.org>
8540
8541         PR driver/49371
8542         * config/darwin.c (darwin_override_options): Improve warning when
8543         mdynamic-no-pic is given together with fPIC/fpic, also warn when it
8544         is given with fpie/fPIE.
8545         * config/darwin.h (PIE_SPEC): New, (LINK_SPEC): Use PIE_SPEC.
8546         * config/darwin9.h (PIE_SPEC): New.
8547
8548 2011-06-25  Basile Starynkevitch  <basile@starynkevitch.net>
8549
8550         * timevar.c (timevar_print): Increase width for display of timevar
8551         name.
8552
8553 2011-06-24  Jakub Jelinek  <jakub@redhat.com>
8554
8555         PR c++/46400
8556         * c-decl.c (union lang_tree_node): Use TYPE_NEXT_VARIANT
8557         instead of TYPE_CHAIN for chain_next for types.
8558
8559 2011-06-24  Richard Henderson  <rth@redhat.com>
8560
8561         * config/sparc/sparc.md (create_flat_frame_1<P:mode>): Remove.
8562         (create_flat_frame_2<P:mode>, create_flat_frame_3<P:mode>): Remove.
8563         * config/sparc/sparc.c (gen_create_flat_frame_1): Remove.
8564         (gen_create_flat_frame_2, gen_create_flat_frame_3): Remove.
8565         (sparc_flat_expand_prologue): Emit individual instructions
8566         instead of one of the above.
8567
8568 2011-06-24  Easwaran Raman  <eraman@google.com>
8569
8570         PR rtl-optimization/49429
8571         PR target/49454
8572         * expr.c (emit_block_move_hints):  Mark MEM_EXPR(x) and
8573         MEM_EXPR(y) addressable if emit_block_move_via_libcall is
8574         used to copy y into x.
8575         * calls.c (initialize_argument_information): Mark
8576         an argument addressable if it is passed by invisible reference.
8577         (emit_library_call_value_1): Mark  MEM_EXPR (val) addressable
8578         if it is passed by reference.
8579
8580 2011-06-24  H.J. Lu  <hongjiu.lu@intel.com>
8581
8582         PR rtl-optimization/49504
8583         * rtlanal.c (nonzero_bits1): Properly handle addition or
8584         subtraction of a pointer in Pmode if pointers extend unsigned.
8585         (num_sign_bit_copies1): Likewise.
8586
8587 2011-06-24  Martin Jambor  <mjambor@suse.cz>
8588
8589         PR tree-optimizations/49516
8590         * tree-sra.c (sra_modify_assign): Choose the safe path for
8591         aggregate copies if we also did scalar replacements.
8592
8593 2011-06-24  Ramana Radhakrishnan  <ramana.radhakrishnan@linaro.org>
8594
8595         PR target/49335
8596         * config/arm/predicates.md (add_operator): New.
8597         * config/arm/arm.md ("*arith_shiftsi"): Fix for SP reg usage in Thumb2.
8598
8599 2011-06-24  Andi Kleen  <ak@linux.intel.com>
8600
8601         * tree-sra.c (type_internals_preclude_sra_p): Add msg
8602         parameter. Split up ifs and report reason in *msg.
8603         (reject): Add.
8604         (find_var_candiate): Add msg variable.
8605         Split up ifs and report reason to reject.
8606         (find_param_candidates): Add msg variable.
8607         Pass msg to type_internals_preclude_sra_p.
8608
8609 2011-06-23  Jeff Law  <law@redhat.com>
8610
8611         PR middle-end/48770
8612         * reload.h (reload): Change to return a bool.
8613         * ira.c (ira): If requested by reload, run a fast DCE pass after
8614         reload has completed.  Fix comment typo.
8615         * reload1.c (need_dce): New file scoped static.
8616         (reload): Set reload_completed here.  Return whether or not a DCE
8617         pass after reload is needed.
8618         (delete_dead_insn): Set need_dce as needed.
8619
8620         PR middle-end/49465
8621         * tree-ssa-threadupate.c (fix_duplicate_block_edges): Fix condition
8622         to detect threading through joiner block.  If there was already
8623         an edge to the new target, then do not change the PHI nodes.
8624
8625 2011-06-23  Jakub Jelinek  <jakub@redhat.com>
8626
8627         * tree-vect-data-refs.c (vect_compute_data_ref_alignment): Use
8628         get_pointer_alignment to see if base isn't sufficiently aligned.
8629
8630 2011-06-23  Jan Hubicka  <jh@suse.cz>
8631
8632         PR tree-optimize/49373
8633         * tree-pass.h (all_late_ipa_passes): Declare.
8634         * cgraphunit.c (init_lowered_empty_function): Fix properties.
8635         (cgraph_optimize): Execute late passes; remove unreachable funcions
8636         after materialization.
8637         * ipa-inline.c (gate_ipa_inline): Enable only when optimizing or
8638         LTOing.
8639         * passes.c (all_late_ipa_passes): Declare.
8640         (dump_passes, register_pass): Handle late ipa passes.
8641         (init_optimization_passes): Move ipa_pta to late passes; schedule
8642         fixup_cfg at beggining of all_passes.
8643         (apply_ipa_transforms): New function.
8644         (execute_one_pass): When doing simple ipa pass, apply all transforms.
8645
8646 2011-06-23  Joseph Myers  <joseph@codesourcery.com>
8647
8648         * params.c: Include common/common-target.h.  Don't include tm.h.
8649         (lang_independent_params): Move from toplev.c.
8650         (global_init_params): New.
8651         * params.h (global_init_params): Declare.
8652         * target.def (default_params): Move to common-target.def.
8653         * toplev.c (lang_independent_options): Remove.
8654         (lang_independent_params): Move to params.c.
8655         (general_init): Use global_init_params.
8656         * common/common-target.def (option_default_params): Move from
8657         target.def.
8658         * common/config/ia64/ia64-common.c: Include params.h.
8659         (ia64_option_default_params, TARGET_OPTION_DEFAULT_PARAMS): Move
8660         from ia64.c.
8661         * common/config/rs6000/rs6000-common.c: Include params.h.
8662         (rs6000_option_default_params, TARGET_OPTION_DEFAULT_PARAMS): Move
8663         from rs6000.c.
8664         * common/config/sh/sh-common.c: Include params.h.
8665         (sh_option_default_params, TARGET_OPTION_DEFAULT_PARAMS): Move
8666         from sh.c.
8667         * common/config/spu/spu-common.c: Include params.h.
8668         (spu_option_default_params, TARGET_OPTION_DEFAULT_PARAMS): Move
8669         from spu.c.
8670         * config/ia64/ia64.c (ia64_option_default_params,
8671         TARGET_OPTION_DEFAULT_PARAMS): Move to ia64-common.c.
8672         * config/rs6000/rs6000.c (rs6000_option_default_params,
8673         TARGET_OPTION_DEFAULT_PARAMS): Move to rs6000-common.c.
8674         * config/sh/sh.c (sh_option_default_params,
8675         TARGET_OPTION_DEFAULT_PARAMS): Move to sh-common.c.
8676         * config/spu/spu.c (spu_option_default_params,
8677         TARGET_OPTION_DEFAULT_PARAMS): Move to spu-common.c.
8678         * Makefile.in (OBJS): Remove params.o.
8679         (OBJS-libcommon-target): Add params.o.
8680         (params.o, $(common_out_object_file)): Update dependencies.
8681         * doc/tm.texi: Regenerate.
8682
8683 2011-06-23  Alan Modra  <amodra@gmail.com>
8684
8685         PR bootstrap/49383
8686         * config/rs6000/rs6000.c (call_ABI_of_interest): Adjust cgraph
8687         invocation for 2011-06-09 changes.
8688
8689 2011-06-22  Jakub Jelinek  <jakub@redhat.com>
8690
8691         PR libgomp/49490
8692         * omp-low.c (expand_omp_for_static_nochunk): Only
8693         use n ceil/ nthreads size for the first n % nthreads threads in the
8694         team instead of all threads except for the last few ones which
8695         get less work or none at all.
8696
8697         PR debug/49496
8698         * tree-vect-patterns.c (vect_recog_widen_mult_pattern): Ignore debug
8699         uses.
8700
8701 2011-06-22  Richard Guenther  <rguenther@suse.de>
8702
8703         PR tree-optimization/49493
8704         * tree-ssa-structalias.c (get_constraint_for_ssa_var):
8705         Refer to the alias target of variables.
8706         (associate_varinfo_to_alias_1): Remove.
8707         (ipa_pta_execute): Do not associate aliases with anything.
8708         * cgraph.h (varpool_alias_aliased_node): Fix cut&paste errors.
8709         (cgraph_function_node): Likewise.
8710         (cgraph_function_or_thunk_node): Likewise.
8711         (varpool_variable_node): Likewise.
8712
8713 2011-06-22  Nathan Sidwell  <nathan@codesourcery.com>
8714
8715         * config/arm/arm.h (OPTION_DEFAULT_SPECS): Fix -mtls-dialect typo.
8716         * config.gcc (arm*-*-linux*): Default to gnu tls.
8717         (arm*-*-*): Add --with-tls option.
8718         (all_defaults): Add 'tls'.
8719
8720 2011-06-22  Richard Henderson  <rth@redhat.com>
8721
8722         * reg-notes.def (REG_CFA_WINDOW_SAVE): New.
8723         * dwarf2out.c (dwarf2out_frame_debug): Handle it.
8724         (dwarf2out_frame_debug_cfa_window_save): Rename from
8725         dwarf2out_window_save; make static.
8726         * tree.h (dwarf2out_window_save): Don't declare.
8727
8728         * config/sparc/sparc.c (sparc_dwarf_handle_frame_unspec): Remove.
8729         (TARGET_DWARF_HANDLE_FRAME_UNSPEC): Remove.
8730         (emit_save_register_window): Rename from gen_save_register_window;
8731         emit the insn and add REG_CFA_* notes.
8732         (sparc_expand_prologue): Update to match.
8733         * config/sparc/sparc.md (save_register_window_1): Simplify from
8734         save_register_window<P:mode>.
8735
8736 2011-06-22  H.J. Lu  <hongjiu.lu@intel.com>
8737
8738         PR target/49497
8739         * config/i386/i386.md (*lea_general_2): Always allow SImode.
8740         (*lea_general_2_zext): Likewise.
8741         (imul to lea peepholes): Use const359_operand and check
8742         TARGET_PARTIAL_REG_STALL.
8743
8744         * config/i386/predicates.md (const359_operand): New.
8745
8746 2011-06-22  Michael Matz  <matz@suse.de>
8747
8748         * cgraphunit.c (assemble_thunk): Use correct return type.
8749
8750 2011-06-22  Dmitry Plotnikov  <dplotnikov@ispras.ru>
8751             Dmitry Melnik  <dm@ispras.ru>
8752
8753         * config/arm/arm.c (neon_immediate_valid_for_shift): New function.
8754         (neon_output_shift_immediate): Ditto.
8755         * config/arm/arm-protos.h (neon_immediate_valid_for_shift): New
8756         prototype.
8757         (neon_output_shift_immediate): Ditto.
8758         * config/arm/neon.md (vashl<mode>3): Modified constraint.
8759         (vashr<mode>3_imm): New insn pattern.
8760         (vlshr<mode>3_imm): Ditto.
8761         (vashr<mode>3): Modified constraint.
8762         (vlshr<mode>3): Ditto.
8763         * config/arm/predicates.md (imm_for_neon_lshift_operand): New
8764         predicate.
8765         (imm_for_neon_rshift_operand): Ditto.
8766         (imm_lshift_or_reg_neon): Ditto.
8767         (imm_rshift_or_reg_neon): Ditto.
8768
8769         * optabs.c (init_optabs): Init optab codes for vashl, vashr, vlshr.
8770
8771 2011-06-22  Jakub Jelinek  <jakub@redhat.com>
8772
8773         * tree-ssa-ccp.c (evaluate_stmt): Try bitwise tracking for
8774         builtin calls even if likelyvalue is not CONSTANT.
8775         Handle BUILT_IN_STRDUP and BUILT_IN_STRNDUP like BUILT_IN_MALLOC.
8776         Return get_value_for_expr of first operand
8777         for BUILT_IN_{MEM{CPY,MOVE,SET},STR{,N}CPY}{,_CHK}.
8778         * tree-ssa-alias.c (ref_maybe_used_by_call_p_1): Handle
8779         BUILT_IN_{MEM{{,P}CPY,MOVE,SET},STR{,N}C{PY,AT},STPCPY}_CHK like
8780         their non-checking counterparts.
8781         (call_may_clobber_ref_p_1): Likewise.
8782         (stmt_kills_ref_p_1): Handle BUILT_IN_MEM{{,P}CPY,MOVE,SET}_CHK
8783         like their non-checking counterparts.
8784         * tree-ssa-structalias.c (find_func_aliases_for_builtin_call):
8785         Handle BUILT_IN_{MEM{{,P}CPY,MOVE,SET},STR{,N}C{PY,AT},STPCPY}_CHK
8786         like their non-checking counterparts.
8787         (find_func_clobbers): Likewise.
8788         * tree-ssa-dce.c (propagate_necessity): Handle BUILT_IN_MEMSET_CHK
8789         like BUILT_IN_MEMSET and BUILT_IN_CALLOC like BUILT_IN_MALLOC.
8790
8791         * dwarf2out.c (size_of_loc_descr, output_loc_operands,
8792         mark_base_types, hash_loc_operands, compare_loc_operands): Allow
8793         DW_OP_GNU_convert and DW_OP_GNU_reinterpret to use constant instead
8794         of base type reference as argument.
8795         (resolve_addr_in_expr): Likewise.  Fix keep computation.
8796         (convert_descriptor_to_signed): Renamed to...
8797         (convert_descriptor_to_mode): ... this.  For wider types convert to
8798         unsigned instead of signed, for <= DWARF2_ADDR_SIZE convert to untyped.
8799         (typed_binop): New function.
8800         (scompare_loc_descriptor, ucompare_loc_descriptor,
8801         minmax_loc_descriptor, mem_loc_descriptor): For wider integer modes
8802         default to unsigned type instead of signed.
8803
8804         PR debug/47858
8805         * gimple.h (enum gimple_debug_subcode): Add GIMPLE_DEBUG_SOURCE_BIND.
8806         (gimple_build_debug_source_bind_stat): New prototype.
8807         (gimple_build_debug_source_bind): Define.
8808         (gimple_debug_source_bind_p, gimple_debug_source_bind_get_var,
8809         gimple_debug_source_bind_get_value,
8810         gimple_debug_source_bind_get_value_ptr,
8811         gimple_debug_source_bind_set_var,
8812         gimple_debug_source_bind_set_value): New inlines.
8813         * gimple.c (gimple_build_debug_source_bind_stat): New function.
8814         * gimple-pretty-print.c (dump_gimple_debug): Handle
8815         GIMPLE_DEBUG_SOURCE_BIND.
8816         * sese.c (rename_uses): Handle gimple_debug_source_bind_p.
8817         * tree-ssa-dce.c (mark_stmt_if_obviously_necessary): Likewise.
8818         * tree-parloops.c (eliminate_local_variables,
8819         separate_decls_in_region): Likewise.
8820         (separate_decls_in_region_debug): Renamed from
8821         separate_decls_in_region_debug_bind.  Handle
8822         gimple_debug_source_bind_p.
8823         * tree.h (decl_debug_args_lookup, decl_debug_args_insert): New
8824         prototypes.
8825         (DECL_HAS_DEBUG_ARGS_P): Define.
8826         (struct tree_function_decl): Add has_debug_args_flag field.
8827         * tree.c (debug_args_for_decl): New variable.
8828         (decl_debug_args_lookup, decl_debug_args_insert): New functions.
8829         * tree-into-ssa.c (mark_def_sites): Handle uses in debug stmts.
8830         (rewrite_debug_stmt_uses): New function.
8831         (rewrite_stmt): Use it to rewrite debug stmt uses.
8832         * rtl.def (DEBUG_PARAMETER_REF): New.
8833         * rtl.h (DEBUG_PARAMETER_REF_DECL): Define.
8834         * cselib.c (rtx_equal_for_cselib_1, cselib_hash_rtx): Handle
8835         DEBUG_PARAMETER_REF.
8836         * rtl.c (rtx_equal_p_cb, rtx_equal_p, iterative_hash_rtx): Likewise.
8837         * print-rtl.c (print_rtx): Likewise.
8838         * tree-sra.c (sra_ipa_reset_debug_stmts): Prefer replacing of
8839         SSA_NAMEs with DEBUG_EXPR_DECLs initialized in source bind
8840         debug stmts in the first bb.
8841         * tree-inline.c (remap_ssa_name): If remapping default def
8842         of a PARM_DECL fails, map to a DEBUG_EXPR_DECL set in
8843         a source bind debug stmt.
8844         (remap_gimple_stmt): Handle gimple_debug_source_bind_p.
8845         (maybe_move_debug_stmts_to_successors): Likewise.
8846         (copy_debug_stmt): Likewise.  Avoid shadowing a variable.
8847         (tree_function_versioning): If DECL_HAS_DEBUG_ARGS_P, copy
8848         debug args vector from old_decl to new_decl.
8849         * ipa-prop.c (ipa_modify_call_arguments): For optimized away
8850         or modified parameters, add debug bind stmts before call
8851         setting DEBUG_EXPR_DECL which is remembered in debug args vector.
8852         * cfgexpand.c (expand_call_stmt): Call expand_debug_expr
8853         on DECL_DEBUG_EXPRs from debug args vector.
8854         (expand_debug_source_expr): New function.
8855         (expand_debug_locations): Use it for source bind insns.
8856         (expand_gimple_basic_block): Handle gimple_debug_source_bind_p.
8857         * var-tracking.c (prepare_call_arguments): Add debug args
8858         to call_arguments if any.
8859         * dwarf2out.c (dwarf_stack_op_name, size_of_loc_descr,
8860         output_loc_operands, output_loc_operands_raw, resolve_addr_in_expr,
8861         compare_loc_operands): Handle DW_OP_GNU_parameter_ref.
8862         (get_ref_die_offset, parameter_ref_descriptor): New functions.
8863         (mem_loc_descriptor): Handle DEBUG_PARAMETER_REF.
8864         (gen_subprogram_die): Handle parameters identified by
8865         DEBUG_PARAMETER_REF.
8866
8867 2011-06-22  Nathan Sidwell  <nathan@codesourcery.com>
8868
8869         * doc/invoke.texi (ARM Options): Document -mtls-dialect option.
8870         * doc/install.texi (Configuration): Document --with-tls.
8871         * config/arm/arm.c (enum tls_reloc): Add TLS_DESCSEQ.
8872         (arm_call_tls_get_addr): Clean up. Assert not tls descriptor.
8873         (arm_tls_descseq_addr): New.
8874         (legitimize_tls_address): Add tlsdesc support.
8875         (arm_cannot_copy_insn_p): Check for tlscall.
8876         (arm_emit_tls_decoration): Likewise.
8877         * config/arm/arm.h (TARGET_GNU2_TLS): New.
8878         (OPTION_DEFAULT_SPECS): Add with-tls support.
8879         * config/arm/arm.md (R1_REGNUM): Define.
8880         (tlscall): New.
8881         * config/arm/arm.opt (tls_type): New enumeration type and values.
8882         (mtls-dialect): New switch.
8883         * config/arm/arm-opts.h (enum tls_type): New.
8884
8885 2011-06-21  Nicola Pero  <nicola.pero@meta-innovation.com>
8886
8887         * attribs.c (register_attribute): Added assert to check that all
8888         attribute specs are registered with a name that is not empty and
8889         does not start with '_'.
8890         (decl_attributes): Avoid the lookup of the "naked" attribute spec
8891         if the function has no attributes.
8892         * tree.c (is_attribute_with_length_p): Removed.
8893         (is_attribute_p): Removed.
8894         (private_is_attribute_p): New.
8895         (private_lookup_attribute): New.
8896         (lookup_attribute): Removed.
8897         (lookup_ident_attribute): New.
8898         (remove_attribute): Require the first argument to be in the form
8899         'text', not '__text__'.  Updated asserts.
8900         (merge_attributes): Use lookup_ident_attributes instead of
8901         lookup_attribute.
8902         (merge_dllimport_decl_attributes): Use remove_attribute.
8903         (attribute_list_contained): Likewise.
8904         (attribute_list_equal): Immediately return 1 if the arguments are
8905         identical pointers.
8906         * tree.h (is_attribute_p): Made inline.  Return a 'bool', not an
8907         'int'.  Require the first argument to be in the form 'text', not
8908         '__text__'.  Require the second argument to be an identifier.
8909         (lookup_attribute): Made inline.  Require the first argument to be
8910         in the form 'text', not '__text__'.
8911         (private_is_attribute_p, private_lookup_attribute): New.
8912         Updated comments.
8913
8914 2011-06-21  Andrew MacLeod  <amacleod@redhat.com>
8915
8916         * builtins.c: Add sync_ or SYNC__ to builtin names.
8917         * sync-builtins.def: Add sync_ or SYNC__ to builtin names.
8918         * omp-low.c: Add sync_ or SYNC__ to builtin names.
8919
8920 2011-06-21  Georg-Johann Lay  <avr@gjlay.de>
8921
8922         PR target/33049
8923         * config/avr/avr.md (extzv): New expander.
8924         (*extzv): New insn.
8925         (*extzv.qihi1, *extzv.qihi2): New insn-and-split.
8926         * config/avr/constraints.md (C04): New constraint.
8927         * doc/md.texi (Machine Constraints): Document it.
8928
8929 2011-06-21  Jakub Jelinek  <jakub@redhat.com>
8930
8931         PR middle-end/49489
8932         * builtins.c (expand_builtin_unop): Call expand_unop with 0 as
8933         unsignedp argument instead of 1 for clrsb_optab.
8934         (fold_builtin_bitop): Fix masking for width > HOST_BITS_PER_WIDE_INT
8935         and < 2 * HOST_BITS_PER_WIDE_INT.  Optimize BUILT_IN_CLRSB*.
8936         (fold_builtin_1): Call fold_builtin_binop for BUILT_IN_CLRSB*.
8937         * optabs.c (widen_leading): Call widen_operand and expand_unop
8938         with 0 as unsignedp argument instead of 1 for clrsb_optab.
8939         (expand_unop): Subtract difference of mode sizes also for clrsb_optab.
8940
8941 2011-06-21  Georg-Johann Lay  <avr@gjlay.de>
8942
8943         * config/avr/avr.md (*jcindirect_jump): Fix build warning.
8944
8945 2011-06-21  Bernd Schmidt  <bernds@codesourcery.com>
8946
8947         * gensupport.c (add_define_attr): New static function.
8948         (is_predicable): Allow multi-alternative lists for the "predicable"
8949         attribute.
8950         (modify_attr_enabled_ce, alter_attrs_for_insn): New static functions.
8951         (process_one_cond_exec): Call alter_attrs_for_insn.
8952         * doc/md.texi (Defining Attributes): Mention some standard names.
8953         (Conditional Execution): Update documentation for "predicable".
8954
8955         * doc/extend.texi (__builtin_clrsb, __builtin_clrsbl,
8956         __builtin_clrsbll): Document.
8957         * doc/rtl.texi (clrsb): New entry.
8958         * optabs.c (widen_leading): Renamed from widen_clz.  New argument
8959         UNOPTAB.  All callers changed.  Use UNOPTAB instead of clz_optab.
8960         (expand_unop): Handle clrsb_optab.
8961         (init_optabs): Initialize it.
8962         * optabs.h (enum optab_index): New entry OTI_clrsb.
8963         (clrsb_optab): Define.
8964         * genopinit.c (optabs): Add an entry for it.
8965         * builtins.c (expand_builtin): Handle clrsb builtin functions.
8966         * builtins.def (BUILT_IN_CLRSB, BUILT_IN_CLRSBIMAX, BUILT_IN_CLRSBL,
8967         BUILT_IN_CLRSBLL): New.
8968         * rtl.def (CLRSB): New code.
8969         * dwarf2out.c (mem_loc_descriptor): Handle it.
8970         * simplify-rtx.c (simplify_const_unary_operation): Likewise.
8971         Use op_mode rather than mode when optimizing ffs, clz, ctz, parity
8972         and popcount.
8973         * libgcc2.c (__clrsbSI2, __clrsbDI2): New functions.
8974         * libgcc2.h (__clrsbSI2, __clrsbDI2): Define and declare.
8975         (__ctzDI2): Move declaration.
8976         * config/bfin/bfin.md (clrsbsi2): New expander.
8977         (signbitssi2): Use the CLRSB rtx.
8978         (clrsbhi2): Renamed from signbitshi2.  Use the CLRSB rtx.
8979         * config/bfin/bfin.c (bdesc_1arg): Changed accordingly.
8980
8981 2011-06-21  Richard Guenther  <rguenther@suse.de>
8982
8983         * ipa-inline-transform.c (inline_transform): Fix previous change.
8984
8985 2011-06-21  Ira Rosen  <ira.rosen@linaro.org>
8986
8987         PR tree-optimization/49478
8988         * tree-vect-loop.c (vectorizable_reduction): Handle DOT_PROD_EXPR
8989         with constant operand.
8990
8991 2011-06-21  Richard Guenther  <rguenther@suse.de>
8992
8993         * ipa-inline-transform.c (inline_transform): Fix typo.
8994
8995 2011-06-21  Richard Guenther  <rguenther@suse.de>
8996
8997         PR tree-optimization/49483
8998         * tree-vect-stmts.c (vectorizable_assignment): Also handle
8999         VIEW_CONVERT_EXPR conversions.
9000
9001 2011-06-21  Joseph Myers  <joseph@codesourcery.com>
9002
9003         * config/avr/avr-mcus.def, config/avr/genopt.sh: New files.
9004         * config/avr/avr-tables.opt: New file (generated).
9005         * config.gcc (avr-*-*): Use avr/avr-tables.opt.
9006         * config/avr/avr-devices.c (avr_mcu_types): Move contents to
9007         avr-mcus.def.
9008         * config/avr/avr.c (avr_help, TARGET_HELP): Remove.
9009         (avr_option_override): Don't process -mmcu= argument here.  Set
9010         avr_current_device using avr_mcu_index.
9011         (avr_file_start): Use avr_current_device->name instead of avr_mcu_name.
9012         * config/avr/avr.opt (mmcu=): Use Enum.
9013         * config/avr/t-avr (avr-devices.o): Update dependencies.
9014         ($(srcdir)/config/avr/avr-tables.opt): New.
9015         * target.def (help): Remove.
9016         * doc/tm.texi.in (TARGET_HELP): Remove.
9017         * doc/tm.texi: Regenerate.
9018         * opts.c: Don't include target.h.
9019         (common_handle_option): Don't call targetm.help.
9020         * system.h (TARGET_HELP): Poison.
9021         * Makefile.in (opts.o): Update dependencies.
9022
9023 2011-06-21  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
9024
9025         * config/usegld.h: New file.
9026         * config/sol2.h (PREFERRED_DEBUGGING_TYPE): Remove.
9027         (CPP_SUBTARGET_SPEC): Remove -compat-bsd support.
9028         (LIB_SPEC): Likewise.  Search /lib.
9029         (LINK_ARCH32_SPEC_BASE): Remove -compat-bsd support.
9030         (RDYNAMIC_SPEC): Handle GNU ld.
9031         [HAVE_LD_EH_FRAME_HDR && TARGET_DL_ITERATE_PHDR] (LINK_EH_SPEC):
9032         Define.
9033         (SUPPORTS_INIT_PRIORITY): Only disable for Sun ld.
9034         (SUBTARGET_INSERT_ATTRIBUTES, SUBTARGET_ATTRIBUTE_TABLE): Define.
9035         [!USE_GAS] (NO_DBX_BNSYM_ENSYM): Redefine.
9036         (STACK_CHECK_STATIC_BUILTIN): Define.
9037         * config/sol2.opt (compat-bsd): Remove.
9038         * config/sol2-10.h (TARGET_C99_FUNCTIONS): Remove undef.
9039         * config/sol2-bi.h: New file.
9040         * config/sol2-gld.h: Remove.
9041         * config/i386/sol2.h (TLS_COMMON_ASM_OP): Only define if !USE_GAS.
9042         (NO_DBX_BNSYM_ENSYM): Remove.
9043         (SUBTARGET_INSERT_ATTRIBUTES, SUBTARGET_ATTRIBUTE_TABLE): Remove.
9044         (STACK_CHECK_STATIC_BUILTIN): Remove.
9045         Test USE_GLD instead of TARGET_GNU_LD.
9046         * config/i386/sol2-10.h: Rename to ...
9047         * config/i386/sol2-bi.h .. this.
9048         (SUBTARGET_EXTRA_SPECS): Redefine.
9049         (WCHAR_TYPE, WCHAR_TYPE_SIZE, WINT_TYPE, WINT_TYPE_SIZE): Remove.
9050         (MULTILIB_DEFAULTS): Remove.
9051         (DEFAULT_ARCH32_P): Define.
9052         (LINK_ARCH64_SPEC_BASE, LINK_ARCH64_SPEC): Remove.
9053         (ARCH64_SUBDIR): Define.
9054         Test USE_GLD instead of TARGET_GNU_LD.
9055         (I386_EMULATION): Rename to ...
9056         (ARCH32_EMULATION): ... this.
9057         (X86_64_EMULATION): Rename to ...
9058         (ARCH64_EMULATION): ... this.
9059         (TARGET_LD_EMULATION): Remove.
9060         (LINK_ARCH_SPEC): Remove.
9061         * config/i386/sol2-gas.h: Remove.
9062         * config/i386/t-sol2-10: Rename to ...
9063         * config/i386/t-sol2-64: ... this.
9064         * config/sparc/sol2.h (SPARC_DEFAULT_CMODEL): Redefine.
9065         (AS_SPARC64_FLAG): Define.
9066         (ASM_CPU32_DEFAULT_SPEC, ASM_CPU64_DEFAULT_SPEC): Redefine.
9067         (CPP_CPU64_DEFAULT_SPEC, ASM_CPU32_DEFAULT_SPEC): Redefine
9068         depending on TARGET_CPU_DEFAULT.
9069         (CPP_CPU_SPEC): Redefine.
9070         (ASM_CPU_SPEC): Handle DEFAULT_ARCH32_P.
9071         (CPP_CPU_DEFAULT_SPEC, ASM_CPU_DEFAULT_SPEC): Redefine.
9072         (CPP_ARCH32_SPEC, CPP_ARCH64_SPEC, CPP_ARCH_SPEC): Redefine.
9073         (ASM_ARCH_SPEC, ASM_ARCH32_SPEC, ASM_ARCH64_SPEC,
9074         ASM_ARCH_DEFAULT_SPEC): Redefine.
9075         (SUBTARGET_EXTRA_SPECS): Add LINK_ARCH32_SPEC, LINK_ARCH64_SPEC,
9076         LINK_ARCH_DEFAULT_SPEC.
9077         [USE_GLD] (ARCH32_EMULATION, ARCH64_EMULATION): Define.
9078         [USE_GLD] (LINK_ARCH32_SPEC, LINK_ARCH64_SPEC): Redefine.
9079         (ARCH64_SUBDIR): Define.
9080         (LINK_ARCH64_SPEC): Redefine.
9081         (CC1_SPEC): Redefine.
9082         (OPTION_DEFAULT_SPECS): Redefine.
9083         (MULTILIB_DEFAULTS): Define.
9084         (WCHAR_TYPE, WCHAR_TYPE_SIZE, WINT_TYPE, WINT_TYPE_SIZE): Redefine.
9085         [USE_GAS && HAVE_AS_TLS] (TARGET_SUN_TLS, TARGET_GNU_TLS): Redefine.
9086         [USE_GLD] (CTORS_SECTION_ASM_OP, DTORS_SECTION_ASM_OP): Undef.
9087         (NO_DBX_BNSYM_ENSYM): Remove.
9088         (SUBTARGET_INSERT_ATTRIBUTES, SUBTARGET_ATTRIBUTE_TABLE): Remove.
9089         (ASM_OUTPUT_ALIGN_WITH_NOP): Only define if !USE_GAS.
9090         (TARGET_ASM_NAMED_SECTION): Likewise.
9091         (STACK_CHECK_STATIC_BUILTIN): Remove.
9092         * config/sparc/sol2-bi.h: Remove.
9093         * config/sparc/sol2-gas-bi.h: Remove.
9094         * config/sparc/sol2-gas.h: Remove.
9095         * config/sparc/sol2-gld-bi.h: Remove.
9096         * config.gcc (i[34567]86-*-solaris2*, sparc*-*-solaris2*): Move
9097         common parts ...
9098         (*-*-solaris2*): ... here.
9099
9100 2011-06-21  Christian Bruel  <christian.bruel@st.com>
9101
9102         PR other/43564
9103         * ipa-inline.c (can_inline_edge_p): Check
9104         !DECL_DISREGARD_INLINE_LIMITS.
9105
9106 2011-06-21  Christian Bruel  <christian.bruel@st.com>
9107
9108         PR middle-end/49139
9109         * cgraphunit.c (process_function_and_variable_attributes): warn when
9110         always_inline functions that are not inline.
9111         * ipa-inline-transform.c (inline_transform): Always call
9112         optimize_inline.
9113         * tree-inline.c (tree_inlinable_function_p): Use error instead
9114         of sorry.
9115         (expand_call_inline): Likewise.
9116
9117 2011-06-21  Jakub Jelinek  <jakub@redhat.com>
9118
9119         * Makefile.in (dg_target_exps): Set.
9120         (check_gcc_parallelize): Parallelize gcc testing into 10 jobs
9121         instead of 7, try to divide it more evenly.
9122
9123 2011-06-20  Changpeng Fang  <changpeng.fang@amd.com>
9124
9125         PR target/49089
9126         * config/i386/i386.c (avx256_split_unaligned_load): New definition.
9127         (avx256_split_unaligned_store): New definition.
9128         (ix86_option_override_internal): Enable avx256 unaligned load/store
9129         splitting only when avx256_split_unaligned_load/store is set.
9130
9131 2011-06-20  Bernd Schmidt  <bernds@codesourcery.com>
9132
9133         * regrename.c (scan_rtx_reg): Handle the case where we write to an
9134         open chain in a smaller mode without failing the entire block.
9135
9136 2011-06-21  Alan Modra  <amodra@gmail.com>
9137
9138         * config/rs6000/rs6000.c (rs6000_cannot_force_const_mem): Match
9139         CONST high part large-toc address.
9140         (rs6000_tls_referenced_p): Make static.
9141         * config/rs6000/rs6000-protos.h (rs6000_tls_referenced_p): Delete.
9142
9143 2011-06-20  Ramana Radhakrishnan  <ramana.radhakrishnan@linaro.org>
9144
9145         PR target/49385
9146         * config/arm/thumb2.md (*thumb2_movhi_insn): Make sure atleast
9147         one of the operands is a register.
9148
9149 2011-06-20  Kai Tietz  <ktietz@redhat.com>
9150
9151         * fold-const.c (fold_binary_loc): Add missing folding for truth-not
9152         operations in combination with binary and.
9153
9154 2011-06-20  Bernd Schmidt  <bernds@codesourcery.com>
9155
9156         * regrename.c (do_replace): Don't update notes.
9157
9158 2011-06-20  Alan Modra  <amodra@gmail.com>
9159
9160         * config/rs6000/rs6000.c (create_TOC_reference): Wrap high part
9161         of toc-relative address in CONST.
9162         (rs6000_delegitimize_address): Recognize changed address.
9163         (rs6000_legitimize_reload_address): Likewise.
9164         (rs6000_emit_move): Don't force these constants to memory.
9165         * config/rs6000/rs6000.md (tls_gd, tls_gd_high): Wrap high part of
9166         toc-relative address in CONST.
9167         (tls_ld, tls_ld_high, tls_got_dtprel, tls_got_dtprel_high): Likewise.
9168         (tls_got_tprel, tls_got_tprel_high, largetoc_high): Likewise.
9169
9170 2011-06-18  H.J. Lu  <hongjiu.lu@intel.com>
9171
9172         * longlong.h (count_leading_zeros): Use long long builtin for x86-64.
9173         (count_trailing_zeros): Likewise.
9174
9175 2011-06-18  H.J. Lu  <hongjiu.lu@intel.com>
9176
9177         PR other/49325
9178         * acinclude.m4 (gcc_AC_INITFINI_ARRAY): Properly check if
9179         .init_array can be used with .ctors on targets.
9180         * configure: Regenerated.
9181
9182 2011-06-18  Eric Botcazou  <ebotcazou@adacore.com>
9183
9184         * tree-sra.c (type_internals_preclude_sra_p) <ARRAY_TYPE>: Return true
9185         if the element type is volatile.
9186
9187 2011-06-18  Jan Hubicka  <jh@suse.cz>
9188
9189         * lto-symtab.c (lto_varpool_replace_node): Remove code handling
9190         extra name aliases.
9191         (lto_symtab_resolve_can_prevail_p): Likewise.
9192         (lto_symtab_merge_cgraph_nodes): Update alias_of pointers.
9193         * cgraphbuild.c (record_reference): Remove extra body alias code.
9194         (mark_load): Likewise.
9195         (mark_store): Likewise.
9196         * cgraph.h (varpool_node): Remove extra_name filed;
9197         add alias_of and extraname_alias.
9198         (varpool_create_variable_alias, varpool_for_node_and_aliases): Declare.
9199         (varpool_alias_aliased_node): New inline function.
9200         (varpool_variable_node): New function.
9201         * cgraphunit.c (handle_alias_pairs): Handle also variable aliases.
9202         * ipa-ref.c (ipa_record_reference): Allow aliases on variables.
9203         * lto-cgraph.c (lto_output_varpool_node): Update streaming.
9204         (input_varpool_node): Likewise.
9205         * lto-streamer-out.c (produce_symtab): Remove extra name aliases.
9206         (varpool_externally_visible_p): Remove extra body alias code.
9207         (function_and_variable_visibility): Likewise.
9208         * tree-ssa-structalias.c (associate_varinfo_to_alias_1): New function.
9209         (ipa_pta_execute): Use it.
9210         * varpool.c (varpool_remove_node): Remove extra name alias code.
9211         (varpool_mark_needed_node): Likewise.
9212         (varpool_analyze_pending_decls): Analyze aliases.
9213         (assemble_aliases): New functoin.
9214         (varpool_assemble_decl): Use it.
9215         (varpool_create_variable_alias): New function.
9216         (varpool_extra_name_alias): Rewrite.
9217         (varpool_for_node_and_aliases): New function.
9218
9219 2011-06-18  Jakub Jelinek  <jakub@redhat.com>
9220
9221         PR target/49411
9222         * config/i386/i386.c (ix86_expand_multi_arg_builtins): If
9223         last_arg_constant and last argument doesn't match its predicate,
9224         for xop_vpermil2<mode>3 error out and for xop_rotl<mode>3
9225         if it is CONST_INT, mask it, otherwise expand using rotl<mode>3.
9226         (ix86_expand_sse_pcmpestr, ix86_expand_sse_pcmpistr): Fix
9227         spelling of error message.
9228         * config/i386/sse.md (sse4a_extrqi, sse4a_insertqi,
9229         vcvtps2ph, *vcvtps2ph, *vcvtps2ph_store, vcvtps2ph256): Use
9230         const_0_to_255_operand instead of const_int_operand.
9231
9232         Revert:
9233         2011-05-09  Uros Bizjak  <ubizjak@gmail.com>
9234
9235         * config/i386/sse.md (blendbits): Remove mode attribute.
9236         (<sse4_1>_blend<ssemodesuffix><avxsizesuffix>): Use const_int_operand
9237         instead of const_0_to_<blendbits>_operand for operand 3 predicate.
9238         Check integer value of operand 3 in insn constraint.
9239
9240 2011-06-17  Hans-Peter Nilsson  <hp@axis.com>
9241
9242         PR rtl-optimization/48542
9243         * reload.c (find_equiv_reg): Stop looking when finding a
9244         setjmp-type call.
9245         * reload1.c (reload_as_needed): Invalidate all reload
9246         registers when crossing a setjmp-type call.
9247
9248 2011-06-16  Jeff Law  <law@redhat.com>
9249
9250         * tree-ssa-threadupdate.c (struct redirection_data): New field
9251         intermediate_edge.
9252         (THREAD_TARGET2): Define.
9253         (redirection_data_eq): Also check that the intermediate edge is equal.
9254         (lookup_redirection_data): Drop useless argument.  Extract the
9255         outgoing_edge and intermediate edge from E.  Callers updated.
9256         (copy_phi_args, update_destination_phis): New functions.
9257         (fix_duplicate_block_edges): Likewise.
9258         (create_edge_and_update_destination_phis): Duplicate all the edges
9259         hung off e->aux.  Use copy_phi_args.
9260         (create_duplicates): Use fix_duplicate_block_edges.
9261         (fixup_template_block): Likewise.
9262         (redirect_edges): If necessary, redirect the joiner block's incoming
9263         edge to the duplicate of the joiner block.
9264         (thread_block): Don't muck up loops when threading through a joiner
9265         block.
9266         (thread_through_loop_header): Handle threading through a joiner block.
9267         (mark_threaded_blocks, register_jump_thread): Likewise.
9268         * tree-flow.h (register_jump_thread): Add new argument.  Callers
9269         updated.
9270         * tree-ssa-threadedge.c (phi_args_equal_on_edges): New function.
9271         (thread_across_edge): Handle threading through a joiner block.
9272
9273 2011-06-16  Martin Jambor  <mjambor@suse.cz>
9274
9275         PR tree-optimization/49343
9276         * tree-sra.c (build_ref_for_model): Use component_ref_field_offset to
9277         calculate offset, provide 2nd operand for the new COMPONENT_REF.
9278
9279 2011-06-16  Iain Sandoe  <iains@gcc.gnu.org>
9280
9281         * config/darwin-protos.h (machopic_select_rtx_section): Move to
9282         inside RTX_CODE ifdef.
9283
9284 2011-06-16  Tom de Vries  <tom@codesourcery.com>
9285
9286         PR target/45098
9287         * tree-ssa-loop-niter.c (infer_loop_bounds_from_pointer_arith):
9288         Disallow NULL pointer for pointer arithmetic.
9289
9290 2011-06-16  Ramana Radhakrishnan  <ramana.radhakrishnan@linaro.org>
9291
9292         PR target/49398
9293         Revert.
9294         2011-06-10  Wei Guozhi  <carrot@google.com>
9295
9296         PR target/45335
9297         * config/arm/ldmstm.md (ldm2_ia, stm2_ia, ldm2_ib, stm2_ib, ldm2_da,
9298         stm2_da, ldm2_db, stm2_db): Add condition !arm_arch7 to these insns.
9299         (ldrd, ldrd_reg1, ldrd_reg2 and peephole2): New insn patterns and
9300         related peephole2.
9301         (strd, strd_reg1, strd_reg2 and peephole2): New insn patterns and
9302         related peephole2.
9303         * config/arm/arm-protos.h (arm_check_ldrd_operands): New prototype.
9304         (arm_legitimate_ldrd_p): New prototype.
9305         (arm_output_ldrd): New prototype.
9306         * config/arm/arm.c (arm_check_ldrd_operands): New function.
9307         (arm_legitimate_ldrd_p): New function.
9308         (arm_output_ldrd): New function.
9309
9310 2011-06-16  Joern Rennecke  <joern.rennecke@embecosm.com>
9311
9312         PR middle-end/46500
9313         * doc/tm.texi.in: Update Copyright date.
9314         * doc/tm.texi: Regenerate.
9315         * targhooks.c (default_setup_incoming_varargs): Replace
9316         CUMULATIVE_ARGS* argument type with cumulative_args_t.
9317         (default_pretend_outgoing_varargs_named): Likewise.
9318         (hook_pass_by_reference_must_pass_in_stack): Likewise.
9319         (hook_callee_copies_named): Likewise.
9320         (default_function_arg_advance): Likewise.
9321         (default_function_arg): Likewise.
9322         (default_function_incoming_arg): Likewise.
9323         (hook_bool_CUMULATIVE_ARGS_false): Likewise.
9324         (hook_bool_CUMULATIVE_ARGS_true): Likewise.
9325         (hook_bool_CUMULATIVE_ARGS_mode_tree_bool_false): Likewise.
9326         (hook_bool_CUMULATIVE_ARGS_mode_tree_bool_true): Likewise.
9327         (hook_int_CUMULATIVE_ARGS_mode_tree_bool_0): Likewise.
9328         * targhooks.h (default_setup_incoming_varargs): Likewise.
9329         (default_pretend_outgoing_varargs_named): Likewise.
9330         (hook_pass_by_reference_must_pass_in_stack): Likewise.
9331         (hook_callee_copies_named): Likewise.
9332         (default_function_arg_advance): Likewise.
9333         (default_function_arg): Likewise.
9334         (default_function_incoming_arg): Likewise.
9335         (hook_bool_CUMULATIVE_ARGS_false): Likewise.
9336         (hook_bool_CUMULATIVE_ARGS_true): Likewise.
9337         (hook_bool_CUMULATIVE_ARGS_mode_tree_bool_false): Likewise.
9338         (hook_bool_CUMULATIVE_ARGS_mode_tree_bool_true): Likewise.
9339         (hook_int_CUMULATIVE_ARGS_mode_tree_bool_0): Likewise.
9340         * target.def (pass_by_reference): Likewise.
9341         (setup_incoming_varargs, strict_argument_naming): Likewise.
9342         (pretend_outgoing_varargs_named, callee_copies): Likewise.
9343         (arg_partial_bytes, function_arg_advance, function_arg): Likewise.
9344         (function_incoming_arg): Likewise.
9345         * target.h: Don't include "tm.h" .
9346         (cumulative_args_t): New typedef.
9347         [GCC_TM_H] (get_cumulative_args): New static inline function.
9348         [GCC_TM_H] (pack_cumulative_args): Likewise.
9349         * config/alpha/alpha.c (alpha_function_arg): Replace CUMULATIVE_ARGS*
9350         argument type with cumulative_args_t.
9351         (alpha_function_arg_advance, alpha_arg_partial_bytes): Likewise.
9352         (alpha_pass_by_reference, alpha_setup_incoming_varargs): Likewise.
9353         * config/frv/frv.c (frv_setup_incoming_varargs): Likewise.
9354         (frv_arg_partial_bytes, frv_function_arg): Likewise.
9355         (frv_function_incoming_arg, frv_function_arg_advance): Likewise.
9356         (frv_function_arg_1): Likewise.
9357         * config/s390/s390.c (s390_pass_by_reference): Likewise.
9358         (s390_function_arg_advance, s390_function_arg): Likewise.
9359         * config/m32c/m32c.c (m32c_function_arg): Likewise.
9360         (m32c_pass_by_reference, m32c_function_arg_advance): Likewise.
9361         (m32c_strict_argument_naming): Likewise.
9362         * config/spu/spu.c (spu_pass_by_reference, spu_function_arg): Likewise.
9363         (spu_function_arg_advance): Likewise.
9364         (spu_setup_incoming_varargs): Likewise.  Make static.
9365         * config/spu/spu-protos.h (spu_setup_incoming_varargs):
9366         Remove prototype.
9367         * config/sparc/sparc.c (sparc_strict_argument_naming): Replace
9368         CUMULATIVE_ARGS* argument type with cumulative_args_t.
9369         (sparc_pass_by_reference, sparc_function_arg_advance): Likewise.
9370         (sparc_function_arg, sparc_function_incoming_arg): Likewise.
9371         (sparc_arg_partial_bytes, sparc_function_arg_1): Likewise.
9372         * config/mep/mep.c (mep_setup_incoming_varargs): Likewise.
9373         (mep_pass_by_reference, mep_function_arg): Likewise.
9374         (mep_function_arg_advance): Likewise.
9375         * config/m32r/m32r.c (m32r_setup_incoming_varargs): Likewise.
9376         (m32r_pass_by_reference, m32r_arg_partial_bytes): Likewise.
9377         (m32r_function_arg, m32r_function_arg_advance): Likewise.
9378         * config/rx/rx.c (rx_function_arg, rx_function_arg_advance): Likewise.
9379         * config/i386/i386.c (ix86_function_arg_advance): Likewise.
9380         (ix86_function_arg, ix86_pass_by_reference): Likewise.
9381         (ix86_setup_incoming_varargs): Likewise.
9382         * config/sh/sh.c (sh_setup_incoming_varargs): Likewise.
9383         (sh_strict_argument_naming): Likewise.
9384         (sh_pretend_outgoing_varargs_named, sh_pass_by_reference): Likewise.
9385         (sh_callee_copies, sh_arg_partial_bytes): Likewise.
9386         (sh_function_arg_advance, sh_function_arg): Likewise.
9387         * config/pdp11/pdp11.c (pdp11_function_arg): Likewise.
9388         (pdp11_function_arg_advance): Likewise.
9389         * config/microblaze/microblaze.c (microblaze_function_arg_advance):
9390         Likewise.
9391         (microblaze_function_arg, function_arg_partial_bytes): Likewise.
9392         * config/avr/avr.c (avr_function_arg): Likewise.
9393         (avr_function_arg_advance): Likewise.
9394         * config/xtensa/xtensa.c (xtensa_function_arg_advance): Likewise.
9395         (xtensa_function_arg, xtensa_function_incoming_arg): Likewise.
9396         (xtensa_function_arg_1): Likewise.
9397         * config/stormy16/stormy16.c (xstormy16_function_arg_advance):
9398         Likewise.
9399         (xstormy16_function_arg): Likewise.
9400         * config/fr30/fr30.c (fr30_setup_incoming_varargs): Likewise.
9401         (fr30_arg_partial_bytes, fr30_function_arg): Likewise.
9402         (fr30_function_arg_advance): Likewise.
9403         * config/lm32/lm32.c (lm32_setup_incoming_varargs): Likewise.
9404         (lm32_function_arg, lm32_function_arg_advance): Likewise.
9405         * config/moxie/moxie.c (moxie_setup_incoming_varargs): Likewise.
9406         (moxie_function_arg, moxie_function_arg_advance): Likewise.
9407         (moxie_pass_by_reference, moxie_arg_partial_bytes): Likewise.
9408         * config/cris/cris.c (cris_setup_incoming_varargs): Likewise.
9409         (cris_pass_by_reference, cris_arg_partial_bytes): Likewise.
9410         (cris_function_arg, cris_function_incoming_arg): Likewise.
9411         (cris_function_arg_advance, cris_function_arg_1): Likewise.
9412         * config/iq2000/iq2000.c (iq2000_setup_incoming_varargs): Likewise.
9413         (iq2000_pass_by_reference, iq2000_arg_partial_bytes): Likewise.
9414         (iq2000_function_arg, iq2000_function_arg_advance): Likewise.
9415         * config/mn10300/mn10300.c (mn10300_pass_by_reference): Likewise.
9416         (mn10300_function_arg, mn10300_function_arg_advance): Likewise.
9417         (mn10300_arg_partial_bytes): Likewise.
9418         * config/ia64/ia64.c (ia64_setup_incoming_varargs): Likewise.
9419         (ia64_arg_partial_bytes, ia64_function_arg): Likewise.
9420         (ia64_function_incoming_arg, ia64_function_arg_advance): Likewise.
9421         (ia64_function_arg_1): Likewise.
9422         * config/m68k/m68k.c (m68k_function_arg_advance): Likewise.
9423         (m68k_function_arg): Likewise.
9424         * config/rs6000/rs6000.c (rs6000_function_arg_advance): Likewise.
9425         (rs6000_function_arg, setup_incoming_varargs): Likewise.
9426         (rs6000_pass_by_reference, rs6000_arg_partial_bytes): Likewise.
9427         * config/picochip/picochip.c (picochip_arg_partial_bytes): Likewise.
9428         (picochip_function_arg, picochip_incoming_function_arg): Likewise.
9429         (picochip_arg_advance): Likewise.
9430         * config/mcore/mcore.c (mcore_setup_incoming_varargs): Likewise.
9431         (mcore_arg_partial_bytes, mcore_function_arg): Likewise.
9432         (mcore_function_arg_advance): Likewise.
9433         * config/score/score.c (score_pass_by_reference): Likewise.
9434         (score_function_arg_advance): Likewise.
9435         (score_arg_partial_bytes): Likewise.  Make static.
9436         * config/score/score-protos.h (score_arg_partial_bytes): Don't declare.
9437         * config/arm/arm.c (arm_arg_partial_bytes): Replace
9438         CUMULATIVE_ARGS* argument type with cumulative_args_t.
9439         (arm_function_arg, arm_function_arg_advance): Likewise.
9440         (arm_setup_incoming_varargs, arm_pass_by_reference): Likewise.
9441         * config/pa/pa.c (pa_pass_by_reference): Likewise.
9442         (pa_arg_partial_bytes, pa_function_arg_advance): Likewise.
9443         (pa_function_arg): Likewise.
9444         * config/mips/mips.c (mips_strict_argument_naming): Likewise.
9445         (mips_function_arg, mips_function_arg_advance): Likewise.
9446         (mips_arg_partial_bytes, mips_pass_by_reference): Likewise.
9447         (mips_callee_copies, mips_setup_incoming_varargs): Likewise.
9448         * config/vax/vax.c (vax_function_arg): Likewise.
9449         (vax_function_arg_advance): Likewise.
9450         * config/h8300/h8300.c (h8300_function_arg): Likewise.
9451         (h8300_function_arg_advance): Likewise.
9452         * config/v850/v850.c (v850_pass_by_reference): Likewise.
9453         (v850_strict_argument_naming, v850_function_arg): Likewise.
9454         (v850_arg_partial_bytes, v850_function_arg_advance): Likewise.
9455         (v850_setup_incoming_varargs): Likewise.
9456         * config/mmix/mmix.c (mmix_setup_incoming_varargs): Likewise.
9457         (mmix_function_arg_advance, mmix_function_incoming_arg): Likewise.
9458         (mmix_function_arg, mmix_pass_by_reference): Likewise.
9459         (mmix_function_arg_1): Replace const CUMULATIVE_ARGS* argument type
9460         with const void *.
9461         * config/bfin/bfin.c (setup_incoming_varargs): Replace
9462         CUMULATIVE_ARGS* argument type with cumulative_args_t.
9463         (bfin_function_arg_advance, bfin_function_arg): Likewise.
9464         (bfin_arg_partial_bytes, bfin_pass_by_reference): Likewise.
9465         * calls.c (emit_call_1): Change type of args_so_far to
9466         cumulative_args_t.  Changed all callers.
9467         (initialize_argument_information): Likewise.
9468         (expand_call, emit_library_call_value_1): Use pack_cumulative_args.
9469         * dse.c (get_call_args): Likewise.
9470         * expr.c (block_move_libcall_safe_for_call_parm): Likewise.
9471         * function.c (pass_by_reference, reference_callee_copied): Likewise.
9472         (struct assign_parm_data_all): Rename args_so_far to args_so_far_v.
9473         New member args_so_far_v.  Changed all users.
9474         * var-tracking.c (prepare_call_arguments): Use pack_cumulative_args.
9475         * config/iq2000/iq2000.c (iq2000_expand_prologue): Likewise.
9476         * config/mips/mips.c (mips_output_args_xfer): Likewise.
9477         * config/s390/s390.c (s390_call_saved_register_used): Likewise.
9478         * config/sh/sh.c (sh_output_mi_thunk): Likewise.
9479         * config/microblaze/microblaze.c (microblaze_expand_prologue):
9480         Likewise.
9481         * config/m32r/m32r.c (m32r_return_in_memory): Adjust for changed
9482         m32r_pass_by_reference.
9483
9484 2011-06-16  Ira Rosen  <ira.rosen@linaro.org>
9485
9486         * tree-vectorizer.h (vect_recog_func_ptr): Change the first
9487         argument to be a VEC of statements.
9488         * tree-vect-loop.c (vect_determine_vectorization_factor): Remove the
9489         assert that pattern statements have to have their vector type set.
9490         * tree-vect-patterns.c (vect_recog_widen_sum_pattern):
9491         Change the first argument to be a VEC of statements.  Update
9492         documentation.
9493         (vect_recog_dot_prod_pattern, vect_recog_pow_pattern): Likewise.
9494         (vect_handle_widen_mult_by_const): New function.
9495         (vect_recog_widen_mult_pattern):  Change the first argument to be a
9496         VEC of statements.  Update documentation.  Check that the constant is
9497         INTEGER_CST.  Support multiplication by a constant that fits an
9498         intermediate type - call vect_handle_widen_mult_by_const.
9499         (vect_pattern_recog_1): Update vect_recog_func_ptr and its
9500         call.  Handle additional pattern statements if necessary.
9501
9502 2011-06-16  Nick Clifton  <nickc@redhat.com>
9503
9504         PR target/49427
9505         * config.gcc: Set cpu_type to v850 for any V850 architecture.
9506         (v850*-*-*): Delete explicit setting of tm_p_file, tmake_file,
9507         md_file, extra_modes, out_file and extra_options are these are all
9508         deduced from cpu_type.
9509
9510 2011-06-16  Georg-Johann Lay  <avr@gjlay.de>
9511
9512         * config/avr/libgcc.S (__ashldi3, __ashrdi3, __lshrdi3): Set shift
9513         truncation mask to 63.
9514
9515 2011-06-16  Georg-Johann Lay  <avr@gjlay.de>
9516
9517         PR target/49313
9518         PR target/29524
9519         * longlong.h: Add AVR support:
9520         (count_leading_zeros): New macro.
9521         (count_trailing_zeros): New macro.
9522         (COUNT_LEADING_ZEROS_0): New macro.
9523         * config/avr/t-avr (LIB1ASMFUNCS): Add _ffssi2, _ffshi2, _loop_ffsqi2,
9524         _ctzsi2, _ctzhi2, _clzdi2, _clzsi2, _clzhi2, _paritydi2, _paritysi2,
9525         _parityhi2, _popcounthi2,_popcountsi2, _popcountdi2, _popcountqi2,
9526         _bswapsi2, _bswapdi2, _ashldi3, _ashrdi3, _lshrdi3.
9527         (LIB2FUNCS_EXCLUDE): Add _clz.
9528         * config/avr/libgcc.S (XCALL): Move up in file.
9529         (XJMP): New C Macro.
9530         (DEFUN): New asm macro.
9531         (ENDF): New asm macro.
9532         (__ffssi2): New function.
9533         (__ffshi2): New function.
9534         (__loop_ffsqi2): New function.
9535         (__ctzsi2): New function.
9536         (__ctzhi2): New function.
9537         (__clzdi2): New function.
9538         (__clzsi2): New function.
9539         (__clzhi2): New function.
9540         (__paritydi2): New function.
9541         (__paritysi2): New function.
9542         (__parityhi2): New function.
9543         (__parityqi2): New function.
9544         (__popcounthi2): New function.
9545         (__popcountsi2): New function.
9546         (__popcountdi2): New function.
9547         (__popcountqi2): New function.
9548         (__bswapsi2): New function.
9549         (__bswapdi2): New function.
9550         (__ashldi3): New function.
9551         (__ashrdi3): New function.
9552         (__lshrdi3): New function.
9553         Fix suspicous lines.
9554
9555 2011-06-16  Richard Guenther  <rguenther@suse.de>
9556
9557         * gimple.c (canonicalize_cond_expr_cond): (bool)x is not
9558         the same as x != 0.
9559         * fold-const.c (fold_binary_loc): Do not fold X & 1 != 0
9560         to (bool) X & 1.
9561         * ipa-prop.c (ipa_analyze_indirect_call_uses): Also allow
9562         equality compares against zero for the lower bit.
9563
9564 2011-06-16  Jakub Jelinek  <jakub@redhat.com>
9565
9566         PR tree-optimization/49419
9567         * tree-vrp.c (execute_vrp): Call init_range_assertions
9568         before estimate_numbers_of_iterations, call
9569         free_number_of_iterations_estimates before calling
9570         remove_range_assertions.
9571
9572 2011-06-16  Revital Eres  <revital.eres@linaro.org>
9573
9574         * modulo-sched.c (struct ps_insn): Remove row_rest_count field.
9575         (struct partial_schedule): Add rows_length field.
9576         (verify_partial_schedule): Check rows_length.
9577         (ps_insert_empty_row): Handle rows_length.
9578         (create_partial_schedule): Likewise.
9579         (free_partial_schedule): Likewise.
9580         (reset_partial_schedule): Likewise.
9581         (create_ps_insn): Remove rest_count argument.
9582         (remove_node_from_ps): Update rows_length.
9583         (add_node_to_ps): Update rows_length and call create_ps_insn
9584         without passing row_rest_count.
9585         (rotate_partial_schedule): Update rows_length.
9586
9587 2011-06-16  Revital Eres  <revital.eres@linaro.org>
9588
9589         * ddg.c (add_intra_loop_mem_dep): New function.
9590         (build_intra_loop_deps): Call it.
9591
9592 2011-06-13  Jeff Law  <law@redhat.com>
9593
9594         * df-problems.c (df_lr_local_compute): Manually CSE
9595         PIC_OFFSET_TABLE_REGNUM.
9596         * df-scan.c (df_get_regular_block_artificial_uses): Likewise.
9597         (df_get_entry_block_def_set, df_get_exit_block_use_set): Likewise.
9598
9599 2011-06-13  Jan Hubicka  <jh@suse.cz>
9600
9601         * cgraphunit.c (handle_alias_pairs): New function.
9602         (cgraph_finalize_compilation_unit): Use it.
9603         * ipa.c (cgraph_externally_visible_p): Remove hack marking asm names
9604         as externally visible.
9605
9606 2011-06-15  Richard Guenther  <rguenther@suse.de>
9607
9608         * expr.c (expand_expr_real_2): Reduce all integral types to
9609         bitfield precision.
9610         (expand_expr_real_1): Likewise.
9611
9612 2011-06-15  Martin Jambor  <mjambor@suse.cz>
9613
9614         PR tree-optimization/48613
9615         * ipa-prop.c (ipa_prop_write_jump_functions): Return immediately if
9616         ipa_node_params_vector is NULL.
9617
9618 2011-06-15  Jakub Jelinek  <jakub@redhat.com>
9619
9620         PR debug/49382
9621         * dwarf2out.c (dw_loc_list_node): Add force field.
9622         (add_var_loc_to_decl): For PARM_DECL, attempt to keep the incoming
9623         location in the list, even if it is modified before first real insn.
9624         (output_loc_list): Emit empty ranges with force flag set.
9625         (dw_loc_list): If first range of a PARM_DECL is empty, set force flag.
9626
9627 2011-06-15  Alexander Monakov  <amonakov@ispras.ru>
9628
9629         PR target/49349
9630         * sel-sched.c (find_place_for_bookkeeping): Add new parameter
9631         (fence_to_rewind).  Use it to notice when bookkeeping will be placed
9632         above a fence.  Update comments.
9633         (generate_bookkeeping_insn): Rewind fence when bookkeeping code is
9634         placed just above it.  Do not allow NULL place_to_insert.
9635
9636 2011-06-15  Ira Rosen  <ira.rosen@linaro.org>
9637
9638         * tree-vect-loop-manip.c (remove_dead_stmts_from_loop): Remove.
9639         (slpeel_tree_peel_loop_to_edge): Don't call
9640         remove_dead_stmts_from_loop.
9641         * tree-vect-loop.c (vect_determine_vectorization_factor): Don't
9642         remove irrelevant pattern statements.  For irrelevant statements
9643         check if it is the last statement of a detected pattern, use
9644         corresponding pattern statement instead.
9645         (destroy_loop_vec_info): No need to remove pattern statements,
9646         only free stmt_vec_info.
9647         (vect_transform_loop): For irrelevant statements check if it is
9648         the last statement of a detected pattern, use corresponding
9649         pattern statement instead.
9650         * tree-vect-patterns.c (vect_pattern_recog_1): Don't insert
9651         pattern statements.  Set basic block for the new statement.
9652         (vect_pattern_recog): Update documentation.
9653         * tree-vect-stmts.c (vect_mark_stmts_to_be_vectorized): Scan
9654         operands of pattern statements.
9655         (vectorizable_call): Fix printing.  In case of a pattern statement
9656         use the lhs of the original statement when creating a dummy
9657         statement to replace the original call.
9658         (vect_analyze_stmt): For irrelevant statements check if it is
9659         the last statement of a detected pattern, use corresponding
9660         pattern statement instead.
9661         * tree-vect-slp.c (vect_schedule_slp_instance): For pattern
9662         statements use gsi of the original statement.
9663
9664 2011-06-14  Joseph Myers  <joseph@codesourcery.com>
9665
9666         * target-def.h (TARGET_HAVE_NAMED_SECTIONS): Move to
9667         common/common-target-def.h.
9668         * target.def (default_target_flags, handle_option,
9669         supports_split_stack, optimization_table, init_struct,
9670         except_unwind_info, unwind_tables_default, have_named_sections):
9671         Move to common/common-target.def.
9672         * target.h (enum opt_levels, struct default_options): Move to
9673         common/common-target.h.
9674         * targhooks.c (default_except_unwind_info,
9675         dwarf2_except_unwind_info, sjlj_except_unwind_info,
9676         default_target_handle_option, empty_optimization_table): Move to
9677         common/common-targhooks.c.
9678         * targhooks.h (default_except_unwind_info,
9679         dwarf2_except_unwind_info, sjlj_except_unwind_info,
9680         default_target_handle_option, empty_optimization_table): Move to
9681         common/common-targhooks.h.
9682         * common/common-target-def.h: Include common/common-targhooks.h.
9683         (TARGET_HAVE_NAMED_SECTIONS): Define if TARGET_ASM_NAMED_SECTION
9684         defined.
9685         * common/common-target.def (handle_option, option_init_struct,
9686         option_optimization_table, default_target_flags,
9687         except_unwind_info, supports_split_stack, unwind_tables_default,
9688         have_named_sections): Move from target.def.
9689         (HOOK_PREFIX): Undefine at end of file.
9690         * common/common-target.h: Include input.h.
9691         (enum opt_levels, struct default_options): Move from target.h.
9692         * common/common-targhooks.c, common/common-targhooks.h: New.
9693         * config.gcc (target_has_targetm_common): Default to yes.
9694         (moxie*): Set target_has_targetm_common=no.
9695         (hppa*-*-*): Don't set target_has_targetm_common=yes.
9696         * doc/tm.texi: Regenerate.
9697         * Makefile.in (COMMON_TARGET_H): Add $(INPUT_H).
9698         (C_TARGET_DEF_H): Add common/common-targhooks.h.
9699         (GCC_OBJS): Remove vec.o.
9700         (OBJS): Remove hooks.o and vec.o.
9701         (OBJS-libcommon-target): Add vec.o, hooks.o and
9702         common/common-targhooks.o.
9703         (c-family/c-common.o, c-family/c-cppbuiltin.o, lto-opts.o, tree.o,
9704         tree-tailcall.o, opts.o, toplev.o, varasm.o, function.o, except.o,
9705         expr.o, explow.o, dbxout.o, dwarf2out.o, cfgrtl.o, haifa-sched.o,
9706         cfglayout.o, $(out_object_file), $(common_out_object_file)):
9707         Update dependencies.
9708         (common/common-targhooks.o): New.
9709         * common/config/default-common.c: Include tm.h.  Add FIXME comment.
9710         * common/config/pa/pa-common.c: Include more headers.  Take
9711         copyright dates from pa.c.
9712         (pa_option_optimization_table, pa_handle_option,
9713         TARGET_OPTION_OPTIMIZATION_TABLE, TARGET_DEFAULT_TARGET_FLAGS,
9714         TARGET_HANDLE_OPTION): Move from pa.c.
9715         * common/config/alpha/alpha-common.c,
9716         common/config/arm/arm-common.c, common/config/avr/avr-common.c,
9717         common/config/bfin/bfin-common.c,
9718         common/config/cris/cris-common.c,
9719         common/config/fr30/fr30-common.c, common/config/frv/frv-common.c,
9720         common/config/h8300/h8300-common.c,
9721         common/config/i386/i386-common.c,
9722         common/config/ia64/ia64-common.c,
9723         common/config/iq2000/iq2000-common.c,
9724         common/config/lm32/lm32-common.c,
9725         common/config/m32c/m32c-common.c,
9726         common/config/m32r/m32r-common.c,
9727         common/config/m68k/m68k-common.c,
9728         common/config/mcore/mcore-common.c,
9729         common/config/mep/mep-common.c,
9730         common/config/microblaze/microblaze-common.c,
9731         common/config/mips/mips-common.c,
9732         common/config/mmix/mmix-common.c,
9733         common/config/mn10300/mn10300-common.c,
9734         common/config/pdp11/pdp11-common.c,
9735         common/config/picochip/picochip-common.c,
9736         common/config/rs6000/rs6000-common.c,
9737         common/config/rx/rx-common.c, common/config/s390/s390-common.c,
9738         common/config/score/score-common.c, common/config/sh/sh-common.c,
9739         common/config/sparc/sparc-common.c,
9740         common/config/spu/spu-common.c, common/config/v850/v850-common.c,
9741         common/config/vax/vax-common.c,
9742         common/config/xstormy16/xstormy16-common.c,
9743         common/config/xtensa/xtensa-common.c: New.
9744         * config/alpha/alpha.c: Include common/common-target.h.
9745         (alpha_option_optimization_table, alpha_handle_option,
9746         TARGET_DEFAULT_TARGET_FLAGS, TARGET_HANDLE_OPTION,
9747         TARGET_OPTION_OPTIMIZATION_TABLE): Move to alpha-common.c.
9748         * config/arm/arm-protos.h (arm_except_unwind_info): Declare.
9749         * config/arm/arm.c (arm_option_optimization_table,
9750         TARGET_DEFAULT_TARGET_FLAGS, TARGET_OPTION_OPTIMIZATION_TABLE,
9751         TARGET_EXCEPT_UNWIND_INFO, arm_except_unwind_info): Move to
9752         arm-common.c.
9753         * config/avr/avr.c (avr_option_optimization_table,
9754         TARGET_OPTION_OPTIMIZATION_TABLE, TARGET_EXCEPT_UNWIND_INFO): Move
9755         to avr-common.c.
9756         * config/bfin/bfin.c (struct bfin_cpu): Move to bfin.h.
9757         (bfin_cpus, bfin_handle_option, TARGET_HANDLE_OPTION,
9758         TARGET_DEFAULT_TARGET_FLAGS): Move to bfin-common.c.
9759         * config/bfin/bfin.h struct bfin_cpu): Move from bfin.c.
9760         * config/cris/cris.c (cris_option_optimization_table,
9761         TARGET_DEFAULT_TARGET_FLAGS, TARGET_HANDLE_OPTION,
9762         TARGET_OPTION_OPTIMIZATION_TABLE, cris_handle_option): Move to
9763         cris-common.c.
9764         * config/fr30/fr30.c (fr30_option_optimization_table,
9765         TARGET_EXCEPT_UNWIND_INFO, TARGET_OPTION_OPTIMIZATION_TABLE): Move
9766         to fr30-common.c.
9767         * config/frv/frv.c (frv_option_optimization_table,
9768         MASK_DEFAULT_ALLOC_CC, TARGET_DEFAULT_TARGET_FLAGS,
9769         TARGET_OPTION_OPTIMIZATION_TABLE): Move to frv-common.c.
9770         * config/h8300/h8300.c (h8300_option_optimization_table,
9771         TARGET_DEFAULT_TARGET_FLAGS, TARGET_OPTION_OPTIMIZATION_TABLE,
9772         TARGET_EXCEPT_UNWIND_INFO): Move to h8300-common.c.
9773         * config/i386/i386-protos.h (ix86_handle_option): Declare.
9774         * config/i386/i386.c: Include common/common-target.h.
9775         (OPTION_MASK_ISA_MMX_SET, OPTION_MASK_ISA_3DNOW_SET,
9776         OPTION_MASK_ISA_SSE_SET, OPTION_MASK_ISA_SSE2_SET,
9777         OPTION_MASK_ISA_SSE3_SET, OPTION_MASK_ISA_SSSE3_SET,
9778         OPTION_MASK_ISA_SSE4_1_SET, OPTION_MASK_ISA_SSE4_2_SET,
9779         OPTION_MASK_ISA_AVX_SET, OPTION_MASK_ISA_FMA_SET,
9780         OPTION_MASK_ISA_SSE4_SET, OPTION_MASK_ISA_SSE4A_SET,
9781         OPTION_MASK_ISA_FMA4_SET, OPTION_MASK_ISA_XOP_SET,
9782         OPTION_MASK_ISA_LWP_SET, OPTION_MASK_ISA_AES_SET,
9783         OPTION_MASK_ISA_PCLMUL_SET, OPTION_MASK_ISA_ABM_SET,
9784         OPTION_MASK_ISA_BMI_SET, OPTION_MASK_ISA_TBM_SET,
9785         OPTION_MASK_ISA_POPCNT_SET, OPTION_MASK_ISA_CX16_SET,
9786         OPTION_MASK_ISA_SAHF_SET, OPTION_MASK_ISA_MOVBE_SET,
9787         OPTION_MASK_ISA_CRC32_SET, OPTION_MASK_ISA_FSGSBASE_SET,
9788         OPTION_MASK_ISA_RDRND_SET, OPTION_MASK_ISA_F16C_SET,
9789         OPTION_MASK_ISA_MMX_UNSET, OPTION_MASK_ISA_3DNOW_UNSET,
9790         OPTION_MASK_ISA_3DNOW_A_UNSET, OPTION_MASK_ISA_SSE_UNSET,
9791         OPTION_MASK_ISA_SSE2_UNSET, OPTION_MASK_ISA_SSE3_UNSET,
9792         OPTION_MASK_ISA_SSSE3_UNSET, OPTION_MASK_ISA_SSE4_1_UNSET,
9793         OPTION_MASK_ISA_SSE4_2_UNSET, OPTION_MASK_ISA_AVX_UNSET,
9794         OPTION_MASK_ISA_FMA_UNSET, OPTION_MASK_ISA_SSE4_UNSET,
9795         OPTION_MASK_ISA_SSE4A_UNSET, OPTION_MASK_ISA_FMA4_UNSET,
9796         OPTION_MASK_ISA_XOP_UNSET, OPTION_MASK_ISA_LWP_UNSET,
9797         OPTION_MASK_ISA_AES_UNSET, OPTION_MASK_ISA_PCLMUL_UNSET,
9798         OPTION_MASK_ISA_ABM_UNSET, OPTION_MASK_ISA_BMI_UNSET,
9799         OPTION_MASK_ISA_TBM_UNSET, OPTION_MASK_ISA_POPCNT_UNSET,
9800         OPTION_MASK_ISA_CX16_UNSET, OPTION_MASK_ISA_SAHF_UNSET,
9801         OPTION_MASK_ISA_MOVBE_UNSET, OPTION_MASK_ISA_CRC32_UNSET,
9802         OPTION_MASK_ISA_FSGSBASE_UNSET, OPTION_MASK_ISA_RDRND_UNSET,
9803         OPTION_MASK_ISA_F16C_UNSET, ix86_handle_option,
9804         ix86_option_optimization_table, ix86_option_init_struct,
9805         ix86_supports_split_stack, TARGET_DEFAULT_TARGET_FLAGS,
9806         TARGET_HANDLE_OPTION, TARGET_OPTION_OPTIMIZATION_TABLE,
9807         TARGET_OPTION_INIT_STRUCT, TARGET_SUPPORTS_SPLIT_STACK): Move to
9808         i386-common.c.
9809         * config/i386/t-i386 (i386.o): Update dependencies.
9810         * config/ia64/ia64-protos.h (ia64_except_unwind_info): Declare.
9811         * config/ia64/ia64.c (ia64_option_optimization_table,
9812         TARGET_OPTION_OPTIMIZATION_TABLE, TARGET_EXCEPT_UNWIND_INFO,
9813         TARGET_DEFAULT_TARGET_FLAGS, TARGET_HANDLE_OPTION,
9814         ia64_handle_option): Move to ia64-common.c.
9815         * config/iq2000/iq2000.c (iq2000_option_optimization_table,
9816         TARGET_OPTION_OPTIMIZATION_TABLE): Move to iq2000-common.c.
9817         * config/lm32/lm32.c (lm32_option_optimization_table,
9818         TARGET_OPTION_OPTIMIZATION_TABLE, TARGET_EXCEPT_UNWIND_INFO): Move
9819         to lm32-common.c.
9820         * config/m32c/m32c.c (TARGET_HAVE_NAMED_SECTIONS): Move to
9821         m32c-common.c.
9822         * config/m32r/m32r.c (m32r_option_optimization_table,
9823         TARGET_DEFAULT_TARGET_FLAGS, TARGET_HANDLE_OPTION,
9824         TARGET_OPTION_OPTIMIZATION_TABLE, TARGET_EXCEPT_UNWIND_INFO,
9825         m32r_handle_option): Move to m32r-common.c.
9826         (m32r_memory_move_cost): Remove comment referring to
9827         TARGET_HANDLE_OPTION.
9828         * config/m68k/m68k.c (TARGET_HANDLE_OPTION, m68k_handle_option):
9829         Move to m68k-common.c.
9830         * config/mcore/mcore.c (mcore_option_optimization_table,
9831         TARGET_DEFAULT_TARGET_FLAGS, TARGET_OPTION_OPTIMIZATION_TABLE,
9832         TARGET_EXCEPT_UNWIND_INFO): Move to mcore-common.c.
9833         * config/mep/mep.c (mep_option_optimization_table,
9834         mep_handle_option, TARGET_HANDLE_OPTION,
9835         TARGET_OPTION_OPTIMIZATION_TABLE, TARGET_DEFAULT_TARGET_FLAGS):
9836         Move to mep-common.c.
9837         * config/microblaze/microblaze.c
9838         (microblaze_option_optimization_table,
9839         TARGET_DEFAULT_TARGET_FLAGS, TARGET_OPTION_OPTIMIZATION_TABLE,
9840         TARGET_EXCEPT_UNWIND_INFO): Move to microblaze-common.c.
9841         * config/mips/mips.c (mips_handle_option,
9842         mips_option_optimization_table, TARGET_OPTION_OPTIMIZATION_TABLE,
9843         TARGET_DEFAULT_TARGET_FLAGS, TARGET_HANDLE_OPTION): Move to
9844         mips-common.c.
9845         * config/mmix/mmix.c (mmix_option_optimization_table,
9846         TARGET_DEFAULT_TARGET_FLAGS, TARGET_OPTION_OPTIMIZATION_TABLE):
9847         Move to mmix-common.c.
9848         * config/mn10300/mn10300.c (mn10300_option_optimization_table,
9849         mn10300_handle_option, TARGET_EXCEPT_UNWIND_INFO,
9850         TARGET_DEFAULT_TARGET_FLAGS, TARGET_HANDLE_OPTION,
9851         TARGET_OPTION_OPTIMIZATION_TABLE): Move to mn10300-common.c.
9852         * config/pa/pa.c: Include common/common-target.h.
9853         (pa_option_optimization_table, TARGET_OPTION_OPTIMIZATION_TABLE,
9854         TARGET_DEFAULT_TARGET_FLAGS, TARGET_HANDLE_OPTION,
9855         pa_handle_option): Move to pa-common.c.
9856         (pa_option_override): Use targetm_common.except_unwind_info.
9857         (pa_asm_output_mi_thunk, pa_function_section): Use
9858         targetm_common.have_named_sections.
9859         * config/pdp11/pdp11.c (pdp11_option_optimization_table,
9860         TARGET_DEFAULT_TARGET_FLAGS, TARGET_HANDLE_OPTION,
9861         TARGET_OPTION_OPTIMIZATION_TABLE, TARGET_OPTION_INIT_STRUCT,
9862         pdp11_handle_option, pdp11_option_init_struct): Move to
9863         pdp11-common.c.
9864         * config/picochip/picochip.c (picochip_option_optimization_table,
9865         TARGET_HAVE_NAMED_SECTIONS, TARGET_OPTION_OPTIMIZATION_TABLE,
9866         TARGET_EXCEPT_UNWIND_INFO): Move to picochip-common.c.
9867         * config/rs6000/rs6000.c: Include common/common-target.h.
9868         (rs6000_option_optimization_table, TARGET_HANDLE_OPTION,
9869         TARGET_OPTION_INIT_STRUCT, TARGET_OPTION_OPTIMIZATION_TABLE,
9870         TARGET_DEFAULT_TARGET_FLAGS, rs6000_option_init_struct,
9871         rs6000_handle_option): Move to rs6000-common.c.
9872         * config/rs6000/t-rs6000 (rs6000.o): Update dependencies.
9873         * config/rx/rx.c (rx_handle_option, rx_option_optimization_table,
9874         TARGET_HANDLE_OPTION, TARGET_OPTION_OPTIMIZATION_TABLE,
9875         TARGET_EXCEPT_UNWIND_INFO): Move to rx-common.c.
9876         * config/s390/s390.c (processor_flags_table,
9877         s390_option_optimization_table, s390_option_init_struct,
9878         s390_handle_option, TARGET_DEFAULT_TARGET_FLAGS,
9879         TARGET_HANDLE_OPTION, TARGET_OPTION_OPTIMIZATION_TABLE,
9880         TARGET_OPTION_INIT_STRUCT): Move to s390-common.c.
9881         * config/s390/s390.h (processor_flags_table): Declare.
9882         * config/score/score.c (score_option_optimization_table,
9883         TARGET_DEFAULT_TARGET_FLAGS, TARGET_HANDLE_OPTION,
9884         TARGET_OPTION_OPTIMIZATION_TABLE, MASK_ALL_CPU_BITS,
9885         score_handle_option): Move to score-common.c.
9886         * config/sh/sh.c (sh_option_optimization_table,
9887         TARGET_OPTION_OPTIMIZATION_TABLE, TARGET_OPTION_INIT_STRUCT,
9888         TARGET_DEFAULT_TARGET_FLAGS, TARGET_HANDLE_OPTION,
9889         sh_handle_option, sh_option_init_struct): Move to sh-common.c.
9890         * config/sparc/sparc.c: Include common/common-target.h.
9891         (sparc_option_optimization_table, TARGET_DEFAULT_TARGET_FLAGS,
9892         TARGET_OPTION_OPTIMIZATION_TABLE): Move to sparc-common.c.
9893         * config/spu/spu.c (TARGET_DEFAULT_TARGET_FLAGS,
9894         TARGET_OPTION_INIT_STRUCT, TARGET_EXCEPT_UNWIND_INFO,
9895         spu_option_init_struct): Move to spu-common.c.
9896         * config/stormy16/stormy16.c (xstorym16_option_optimization_table,
9897         TARGET_OPTION_OPTIMIZATION_TABLE): Move to xstormy16-common.c.
9898         * config/v850/v850.c (small_memory_physical_max,
9899         v850_handle_memory_optionn v850_handle_option,
9900         v850_option_optimization_table, TARGET_DEFAULT_TARGET_FLAGS,
9901         TARGET_HANDLE_OPTION, TARGET_OPTION_OPTIMIZATION_TABLE): Move to
9902         v850-common.c.
9903         * config/vax/vax.c (TARGET_DEFAULT_TARGET_FLAGS): Move to vax-common.c.
9904         * config/xtensa/xtensa.c (xtensa_option_optimization_table,
9905         TARGET_DEFAULT_TARGET_FLAGS, TARGET_OPTION_OPTIMIZATION_TABLE):
9906         Move to xtensa-common.c.
9907         * cfglayout.c: Include common/common-target.h.
9908         (fixup_reorder_chain): Use targetm_common.have_named_sections.
9909         * cfgrtl.c: Include common/common-target.h.
9910         (force_nonfallthru_and_redirect, commit_one_edge_insertion): Use
9911         targetm_common.have_named_sections.
9912         * dbxout.c: Include common/common-target.h.
9913         (dbxout_function_end): Use targetm_common.have_named_sections.
9914         * defaults.h (STACK_OLD_CHECK_PROTECT, STACK_CHECK_PROTECT): Use
9915         targetm_common.except_unwind_info.
9916         * dwarf2out.c: Include common/common-target.h.
9917         (dwarf2out_do_frame, dwarf2out_do_cfi_asm,
9918         dwarf2out_begin_prologue, dwarf2out_frame_init,
9919         dwarf2out_frame_finish, dwarf2out_assembly_start): Use
9920         targetm_common.except_unwind_info.
9921         * except.c: Include common/common-target.h.
9922         (init_eh, finish_eh_generation,
9923         output_one_function_exception_table): Use
9924         targetm_common.except_unwind_info.
9925         (switch_to_exception_section): Use targetm_common.have_named_sections.
9926         * explow.c: Include common/common-target.h.
9927         * expr.c: Include common/common-target.h.
9928         (build_personality_function): Use targetm_common.except_unwind_info.
9929         * function.c: Include common/common-target.h.
9930         (expand_function_end): Use targetm_common.except_unwind_info.
9931         * haifa-sched.c: Include common/common-target.h.
9932         (sched_create_recovery_edges): Use targetm_common.have_named_sections.
9933         * lto-opts.c: Include common/common-target.h instead of target.h.
9934         (lto_reissue_options): Use targetm_common.handle_option.
9935         * opts.c: Include common/common-target.h.
9936         (target_handle_option): Use targetm_common.handle_option.
9937         (init_options_struct): Update comment referring to
9938         targetm.target_option.optimization.  Use
9939         targetm_common.default_target_flags,
9940         targetm_common.unwind_tables_default and
9941         targetm_common.option_init_struct.
9942         (default_options_optimization): Use
9943         targetm_common.option_optimization_table.
9944         (finish_options): Use targetm_common.except_unwind_info,
9945         targetm_common.unwind_tables_default,
9946         targetm_common.have_named_sections and
9947         targetm_common.supports_split_stack.
9948         * toplev.c: Include common/common-target.h.
9949         (process_options): Use targetm_common.have_named_sections.
9950         * tree-tailcall.c: Include common/common-target.h.
9951         (suitable_for_tail_call_opt_p): Use targetm_common.except_unwind_info.
9952         * tree.c: Include common/common-target.h.
9953         (build_common_builtin_nodes): Use targetm_common.except_unwind_info.
9954         * varasm.c: Include common/common-target.h.
9955         (resolve_unique_section, hot_function_section,
9956         default_function_section): Use targetm_common.have_named_sections.
9957
9958 2011-06-14  Easwaran Raman  <eraman@google.com>
9959
9960         PR rtl-optimization/44194
9961         * dse.c: Include tree-flow.h
9962         (insn_info): Add new field non_frame_wild_read.
9963         (group_info): Add new fields escaped_n and escaped_p.
9964         (kill_on_calls): New variable.
9965         (get_group_info): Initialize gi->escaped_n and gi->escaped_p.
9966         (dse_step0): Initialize kill_on_calls.
9967         (can_escape): New function.
9968         (set_usage_bits): Add additional parameter; record information
9969         about escaped locations.
9970         (record_store): Pass EXPR corresponding to MEM to set_usage_bits.
9971         (dse_step2_nospill): Set kill_on_calls based on
9972         group->escaped_n and group->escaped_n.
9973         (add_wild_read): Refactor into...
9974         (reset_active_stores): ... New function, and
9975         (free_read_records): ... New function.
9976         (add_non_frame_wild_read): New function.
9977         (scan_insn): Call add_non_frame_wild_read on non-const calls.
9978         (scan_reads_nospill): Handle instructions with non_frame_wild_read.
9979         (dse_step5_nospill): Call scan_reads_nospill for instructions
9980         marked as non_frame_wild_read.
9981         (dse_step7): Free escaped_n, escaped_p and kill_on_calls bitmaps.
9982
9983 2011-06-14  Joseph Myers  <joseph@codesourcery.com>
9984
9985         * common/common-target-def.h, common/common-target.def,
9986         common/common-target.h, common/config/default-common.c,
9987         common/config/pa/pa-common.c: New files.
9988         * Makefile.in (common_out_file, common_out_object_file,
9989         COMMON_TARGET_H, COMMON_TARGET_DEF_H): New.
9990         (OBJS-libcommon-target): Include $(common_out_object_file).
9991         (prefix.o): Update dependencies.
9992         ($(common_out_object_file), common/common-target-hooks-def.h,
9993         s-common-target-hooks-def-h): New.
9994         (s-tm-texi): Also check timestamp on common-target.def.
9995         (build/genhooks.o): Update dependencies.
9996         * config.gcc (common_out_file, target_has_targetm_common): Define.
9997         * config/pa/som.h (ALWAYS_STRIP_DOTDOT): Replace with
9998         TARGET_ALWAYS_STRIP_DOTDOT.
9999         * configure.ac (common_out_object_file): Define.
10000         (common_out_file, common_out_object_file): Substitute.
10001         (common): Create directory.
10002         * configure: Regenerate.
10003         * doc/tm.texi.in (targetm_common): Document.
10004         (TARGET_ALWAYS_STRIP_DOTDOT): Add @hook entry.
10005         * doc/tm.texi: Regenerate.
10006         * genhooks.c (hook_array): Also include common/common-target.def.
10007         * prefix.c (tm.h): Don't include.
10008         (common/common-target.h): Include.
10009         (ALWAYS_STRIP_DOTDOT): Don't define.
10010         (update_path): Use targetm_common.always_strip_dotdot instead of
10011         ALWAYS_STRIP_DOTDOT.
10012         * system.h (ALWAYS_STRIP_DOTDOT): Poison.
10013
10014 2011-06-14  David Li  <davidxl@google.com>
10015
10016         * passes.c (execute_function_todo): Remove TODO_dump_func.
10017         (execute_one_pass): Remove TODO_dump_func.
10018         (execute_function_dump): New function.
10019         * tree-vrp.c: Remove TODO_dump_func.
10020         * regrename.c: Remove TODO_dump_func.
10021         * fwprop.c: Remove TODO_dump_func.
10022         * tree-into-ssa.c: Remove TODO_dump_func.
10023         * tree-complex.c: Remove TODO_dump_func.
10024         * tracer.c: Remove TODO_dump_func.
10025         * tree-loop-distribution.c: Remove TODO_dump_func.
10026         * postreload-gcse.c: Remove TODO_dump_func.
10027         * postreload.c: Remove TODO_dump_func.
10028         * tree-ssa-loop-ch.c: Remove TODO_dump_func.
10029         * tree-tailcall.c: Remove TODO_dump_func.
10030         * ipa-cp.c: Remove TODO_dump_func.
10031         * final.c: Remove TODO_dump_func.
10032         * tree-emutls.c: Remove TODO_dump_func.
10033         * omp-low.c: Remove TODO_dump_func.
10034         * tree-ssa-dse.c: Remove TODO_dump_func.
10035         * tree-ssa-uncprop.c: Remove TODO_dump_func.
10036         * auto-inc-dec.c: Remove TODO_dump_func.
10037         * reorg.c: Remove TODO_dump_func.
10038         * tree-ssa-copyrename.c: Remove TODO_dump_func.
10039         * tree-ssa-ccp.c: Remove TODO_dump_func.
10040         * compare-elim.c: Remove TODO_dump_func.
10041         * mode-switching.c: Remove TODO_dump_func.
10042         * modulo-sched.c: Remove TODO_dump_func.
10043         * tree-call-cdce.c: Remove TODO_dump_func.
10044         * cse.c: Remove TODO_dump_func.
10045         * web.c: Remove TODO_dump_func.
10046         * tree-stdarg.c: Remove TODO_dump_func.
10047         * lto-streamer-out.c: Remove TODO_dump_func.
10048         * tree-ssa-math-opts.c: Remove TODO_dump_func.
10049         * tree-ssa-dom.c: Remove TODO_dump_func.
10050         * tree-nrv.c: Remove TODO_dump_func.
10051         * loop-init.c: Remove TODO_dump_func.
10052         * gimple-low.c: Remove TODO_dump_func.
10053         * ipa-inline.c: Remove TODO_dump_func.
10054         * tree-ssa-sink.c: Remove TODO_dump_func.
10055         * jump.c: Remove TODO_dump_func.
10056         * ifcvt.c: Remove TODO_dump_func.
10057         * tree-ssa-loop.c: Remove TODO_dump_func.
10058         * recog.c: Remove TODO_dump_func.
10059         * dse.c: Remove TODO_dump_func.
10060         * tree-ssa-ifcombine.c: Remove TODO_dump_func.
10061         * matrix-reorg.c: Remove TODO_dump_func.
10062         * tree-eh.c: Remove TODO_dump_func.
10063         * regmove.c: Remove TODO_dump_func.
10064         * function.c: Remove TODO_dump_func.
10065         * tree-vectorizer.c: Remove TODO_dump_func.
10066         * ipa-split.c: Remove TODO_dump_func.
10067         * gcse.c: Remove TODO_dump_func.
10068         * tree-if-conv.c: Remove TODO_dump_func.
10069         * init-regs.c: Remove TODO_dump_func.
10070         * tree-ssa-phiopt.c: Remove TODO_dump_func.
10071         * implicit-zee.c: Remove TODO_dump_func.
10072         * lower-subreg.c: Remove TODO_dump_func.
10073         * bt-load.c: Remove TODO_dump_func.
10074         * tree-dfa.c: Remove TODO_dump_func.
10075         * except.c: Remove TODO_dump_func.
10076         * emit-rtl.c: Remove TODO_dump_func.
10077         * store-motion.c: Remove TODO_dump_func.
10078         * cfgexpand.c: Remove TODO_dump_func.
10079         * tree-cfgcleanup.c: Remove TODO_dump_func.
10080         * cfgcleanup.c: Remove TODO_dump_func.
10081         * tree-ssa-pre.c: Remove TODO_dump_func.
10082         * tree-sra.c: Remove TODO_dump_func.
10083         * tree-mudflap.c: Remove TODO_dump_func.
10084         * tree-ssa-copy.c: Remove TODO_dump_func.
10085         * cfglayout.c: Remove TODO_dump_func.
10086         * tree-ssa-forwprop.c: Remove TODO_dump_func.
10087         * tree-ssa-dce.c: Remove TODO_dump_func.
10088         * ira.c: Remove TODO_dump_func.
10089         * tree-ssa.c: Remove TODO_dump_func.
10090         * integrate.c: Remove TODO_dump_func.
10091         * tree-optimize.c: Remove TODO_dump_func.
10092         * tree-ssa-phiprop.c: Remove TODO_dump_func.
10093         * tree-object-size.c: Remove TODO_dump_func.
10094         * combine.c: Remove TODO_dump_func.
10095         * bb-reorder.c: Remove TODO_dump_func.
10096         * cprop.c: Remove TODO_dump_func.
10097         * var-tracking.c: Remove TODO_dump_func.
10098         * tree-profile.c: Remove TODO_dump_func.
10099         * tree-vect-generic.c: Remove TODO_dump_func.
10100         * reg-stack.c: Remove TODO_dump_func.
10101         * sched-rgn.c: Remove TODO_dump_func.
10102         * tree-ssa-structalias.c: Remove TODO_dump_func.
10103         * tree-switch-conversion.c: Remove TODO_dump_func.
10104         * tree-cfg.c: Remove TODO_dump_func.
10105         * tree-ssa-reassoc.c: Remove TODO_dump_func.
10106         * combine-stack-adj.c: Remove TODO_dump_func.
10107         * dce.c: Remove TODO_dump_func.
10108         * tree-ssanames.c: Remove TODO_dump_func.
10109         * regcprop.c: Remove TODO_dump_func.
10110
10111 2011-06-14  H.J. Lu  <hongjiu.lu@intel.com>
10112
10113         PR middle-end/47364
10114         * builtins.c (expand_builtin_strlen): Expand strlen to Pmode
10115         and properly handle result not in Pmode.
10116
10117 2011-06-14  Robert Millan  <rmh@gnu.org>
10118
10119         * config/i386/kfreebsd-gnu.h: Resync with `config/i386/linux.h'.
10120         * config/kfreebsd-gnu.h (GNU_USER_DYNAMIC_LINKER): Resync with
10121         `config/linux.h'.
10122
10123         * config/i386/kfreebsd-gnu64.h: New file.
10124         * config.gcc (x86_64-*-kfreebsd*-gnu): Replace `i386/kfreebsd-gnu.h'
10125         with `i386/kfreebsd-gnu64.h'.
10126
10127         * config/i386/linux64.h (GNU_USER_LINK_EMULATION32)
10128         (GNU_USER_LINK_EMULATION64): New macros.
10129         * config/i386/gnu-user64.h (LINK_SPEC): Rely on
10130         `GNU_USER_LINK_EMULATION32' and `GNU_USER_LINK_EMULATION64' instead
10131         of hardcoding `elf_i386' and `elf_x86_64'.
10132
10133 2011-06-14  Nick Clifton  <nickc@redhat.com>
10134
10135         PR target/49403
10136         * config/v850/v850.c (v850_memory_move_cost): Add reg_class_t parameter.
10137
10138         PR target/49402
10139         * config.gcc(v850*-*-*): Avoid duplication of v850.opt.
10140
10141 2011-06-14  Jakub Jelinek  <jakub@redhat.com>
10142
10143         PR fortran/49103
10144         * tree.h (DECL_NONSHAREABLE): Define.
10145         (struct tree_decl_common): Change decl_common_unused to
10146         decl_nonshareable_flag.
10147         * cfgexpand.c (expand_used_vars_for_block, clear_tree_used):
10148         Ignore vars with DECL_NONSHAREABLE bit set.
10149         * tree-cfg.c (gimple_duplicate_bb): Set DECL_NONSHAREABLE
10150         on stores to automatic aggregate vars.
10151
10152         PR rtl-optimization/49390
10153         Revert:
10154         2010-06-29  Bernd Schmidt  <bernds@codesourcery.com>
10155
10156         * cse.c (exp_equiv_p): For MEMs, if for_gcse, only compare
10157         MEM_ALIAS_SET.
10158
10159 2011-06-14  Zdenek Dvorak  <ook@ucw.cz>
10160             Tom de Vries  <tom@codesourcery.com>
10161
10162         PR target/45098
10163         * cfgloop.h (nb_iterations_upper_bound, nb_iterations_estimate):
10164         Document changed semantics.
10165         (max_stmt_executions, max_stmt_executions_int): Declare.
10166         * tree-data-ref.c (estimated_loop_iterations)
10167         (estimated_loop_iterations_int): Move functions...
10168         * tree-ssa-loop-niter.c (estimated_loop_iterations)
10169         (estimated_loop_iterations_int): here.
10170         (record_estimate): Change nb_iterations_upper_bound and
10171         nb_iterations_estimate semantics.
10172         (max_stmt_executions, max_stmt_executions_int): New function.
10173         * tree-data-ref.c (estimated_loop_iterations_tree): Rename to ...
10174         (max_stmt_executions_tree): this.
10175         (analyze_miv_subscript): Use max_stmt_executions_tree instead of
10176         estimated_loop_iterations_tree.
10177         tree-ssa-loop-ivopts.c (avg_loop_niter): Use
10178         max_stmt_executions_int instead of estimated_loop_iterations_int.
10179         * predict.c (predict_loops): Idem.
10180         * tree-parloops.c (parallelize_loops): Idem.
10181         * tree-data-ref.c (analyze_siv_subscript_cst_affine)
10182         (compute_overlap_steps_for_affine_1_2, analyze_subscript_affine_affine)
10183         (init_omega_for_ddr_1): Idem.
10184         * tree-ssa-loop-prefetch.c (determine_loop_nest_reuse)
10185         (loop_prefetch_arrays): Idem
10186         * graphite-sese-to-poly.c (build_loop_iteration_domains): Use
10187         max_stmt_executions instead of estimated_loop_iterations.
10188         * tree-data-ref.c (estimated_loop_iterations_tree): Idem.
10189         * tree-vrp.c (adjust_range_with_scev): Use estimated_loop_iterations
10190         instead of nb_iterations_upper_bound.
10191
10192 2011-06-13  Jan Hubicka  <jh@suse.cz>
10193
10194         * ipa.c (cgraph_address_taken_from_non_vtable_p): Check the ref type.
10195
10196 2011-06-14  Richard Henderson  <rth@redhat.com>
10197
10198         PR debug/48459
10199         * dwarf2out.c (frame_pointer_fb_offset_valid): New.
10200         (based_loc_descr): Assert it's true.
10201         (compute_frame_pointer_to_fb_displacement): Set it, rather than
10202         aborting immediately.
10203
10204 2011-06-14  Sanjin Liu  <scliu@faraday-tech.com>
10205             Mingfeng Wu  <mingfeng@faraday-tech.com>
10206
10207         * doc/invoke.texi: Re-add missing -mcpu docs for Faraday cores.
10208
10209 2011-06-13  Jan Hubicka  <jh@suse.cz>
10210
10211         * ipa-cp.c (ipcp_iterate_stage): Revert accidental commit.
10212
10213 2011-06-13  Jan Hubicka  <jh@suse.cz>
10214
10215         * cgraph.c (cgraph_make_decl_local): Handle DECL_ONE_ONLY
10216         similarly to DECL_COMDAT.
10217         * cgraphunit.c (cgraph_analyze_function): Likewise.
10218         * ipa.c (function_and_variable_visibility): Likewise.
10219
10220 2011-06-13  Jan Hubicka  <jh@suse.cz>
10221
10222         * lto-streamer-out.c (lto_output_ts_binfo_tree_pointers): Do not output
10223         BINFO_VIRTUALS when streaming for ltrans unit.
10224
10225 2011-06-13  David Edelsohn  <dje.gcc@gmail.com>
10226
10227         * config/rs6000/rs6000.md (movdi_mfpgpr): Remove POWER mnemonic.
10228         (movdi_internal64): Same.
10229
10230 2011-06-13  Edmar Wienskoski  <edmar@freescale.com>
10231
10232         PR target/44618
10233         * config/rs6000/rs6000.md (save_gpregs_<mode>): Replaced pattern with
10234         a set of similar patterns, where the MATCH_OPERAND for the function
10235         argument is replaced with individual references to hardware registers.
10236         (save_fpregs_<mode>): Ditto
10237         (restore_gpregs_<mode>): Ditto
10238         (return_and_restore_gpregs_<mode>): Ditto
10239         (return_and_restore_fpregs_<mode>): Ditto
10240         (return_and_restore_fpregs_aix_<mode>): Ditto
10241
10242 2011-06-13  Jan Hubicka  <jh@suse.cz>
10243
10244         * ipa-utils.c (postorder_stack): New structure.
10245         (ipa_reverse_postorder): Handle aliases.
10246
10247 2011-06-13  Jan Hubicka  <jh@suse.cz>
10248
10249         * ipa-inline.c (reset_edge_caches): Walk aliases.
10250         (update_caller_keys): Do not test inlinability of aliases.
10251         * ipa-inline-analysis.c (do_estimate_edge_time): Look through alias.
10252         (do_estimate_growth): Fix typo.
10253
10254 2011-06-13  Jan Hubicka  <jh@suse.cz>
10255
10256         * ipa-inline-transform.c (+can_remove_node_now_p_1): Break out from...
10257         (can_remove_node_now_p): ... here; handle same comdat groups.
10258         (clone_inlined_nodes): Update use of can_remove_node_now_p add TODO.
10259         (inline_call): Update use of can_remove_node_now_p.
10260
10261 2011-06-13  Kaushik Phatak  <kaushik.phatak@kpitcummins.com>
10262
10263         * config/h8300/h8300.md (bsetqi_msx, bclrqi_msx, bnotqi_msx): Added
10264         condition to disallow non-identical memory locations.
10265         (*andqi3_2, andqi3_1, iorqi3_1, xorqi3_1): Reorder insn to give
10266         preference to bit manipulation instructions.
10267
10268 2011-06-13  Jan Hubicka  <jh@suse.cz>
10269
10270         * cgraph.c (cgraph_for_node_thunks_and_aliases,
10271         cgraph_for_node_and_aliases): Fix thinko in recursive walking.
10272         (nonremovable_p): New function.
10273         (cgraph_can_remove_if_no_direct_calls_p): New function.
10274         (used_from_object_file_p): New functoin.
10275         (cgraph_will_be_removed_from_program_if_no_direct_calls): Look for
10276         references from aliases.
10277         * cgraph.h (cgraph_can_remove_if_no_direct_calls_p): Bring offline.
10278         * ipa-inline.c (check_caller_edge): New function.
10279         (want_inline_function_called_once_p): Use it; accept aliases called
10280         once, too.
10281         * ipa-inline-analysis.c (do_estimate_growth): Remove FIXME.
10282
10283 2011-06-13  Ramana Radhakrishnan  <ramana.radhakrishnan@linaro.org>
10284
10285         PR target/48454
10286         * config/arm/neon.md (vec_pack_trunc): Set the lengths
10287         correctly for the case with Quad vectors.
10288
10289 2011-06-13 Jakub Jelinek  <jakub@redhat.com>
10290            Ira Rosen  <ira.rosen@linaro.org>
10291
10292         PR tree-optimization/49352
10293         * tree-vect-loop.c (vect_is_slp_reduction): Don't count debug uses at
10294         all, make sure loop_use_stmt after the loop is a def stmt of a used
10295         SSA_NAME that is the only one defined inside of the loop.  Don't
10296         check for COND_EXPR and GIMPLE_BINARY_RHS.
10297         (vect_is_simple_reduction_1): Call vect_is_slp_reduction only if
10298         check_reduction is true.
10299
10300 2011-06-11  Jan Hubicka  <jh@suse.cz>
10301
10302         PR middle-end/49373
10303         * ipa.c (cgraph_externally_visible_p): Check resolution info.
10304
10305 2011-06-11  Jan Hubicka  <jh@suse.cz>
10306
10307         PR middle-end/48836
10308         * ipa-inline-transform.c: Include tree-pass.h
10309         (inline_transform): Set TODO_update_ssa_only_virtuals.
10310         * Makefile.in (ipa-inline-transform.o): Add tree-pass.h.
10311
10312 2011-06-11  Jan Hubicka  <jh@suse.cz>
10313
10314         PR middle-end/49378
10315         * ipa.c (cgraph_non_local_node_p_1, cgraph_local_node_p): Rule out
10316         aliases and thunks.
10317
10318 2011-06-12  Ira Rosen  <ira.rosen@linaro.org>
10319
10320         * tree-vect-data-refs.c (vect_peeling_hash_get_most_frequent):
10321         Take number of iterations to peel into account for equally frequent
10322         misalignment values.
10323
10324 2011-06-11  Jan Hubicka  <jh@suse.cz>
10325
10326         * lto-streamer-out.c (produce_symtab): Stream out the newly
10327         represented aliases.
10328
10329 2011-06-11  Jan Hubicka  <jh@suse.cz>
10330
10331         * ipa-prop.c (ipa_make_edge_direct_to_target): Fix code setting
10332         varying args.
10333         (ipa_update_after_lto_read): Likewise.
10334         (ipa_write_node_info): Do not sream call_with_var_arguments.
10335         (ipa_read_node_info): Likewise.
10336
10337 2011-06-11  Jan Hubicka  <jh@suse.cz>
10338
10339         * ipa.c (cgraph_comdat_can_be_unshared_p): Fix pasto.
10340
10341 2011-06-11  Jan Hubicka  <jh@suse.cz>
10342
10343         * lto-symtab.c (lto_cgraph_replace_node): Kill same body alias code.
10344         (lto_symtab_resolve_can_prevail_p): Likewise.
10345         (lto_symtab_merge_cgraph_nodes): Update merging of aliases.
10346         * cgraph.c (same_body_aliases_done): New global var.
10347         (cgraph_same_body_alias_1): Rename to ...
10348         (cgraph_create_function_alias): ... this one; reorg to new
10349         representation.
10350         (cgraph_same_body_alias): Use cgraph_create_function_alias;
10351         record references when asked to.
10352         (cgraph_add_thunk): Fix formating.
10353         (cgraph_get_node): Kill same body alias code.
10354         (cgraph_node_for_asm): Likewise.
10355         (cgraph_remove_same_body_alias): Remove.
10356         (cgraph_remove_node): Kill same body alias code.
10357         (cgraph_mark_address_taken_node): Mark also the aliased function
10358         as having address taken.
10359         (dump_cgraph_node): Dump same body aliases.
10360         (cgraph_for_node_thunks_and_aliases): Update for new alias
10361         representation.
10362         (cgraph_for_node_and_aliases): Likewise.
10363         * cgraph.h (same_body): Kll pointer.
10364         (same_body_alias): Update comment.
10365         (same_body_aliases_done): Declare.
10366         (cgraph_remove_same_body_alias): Remove declaration.
10367         (cgraph_create_function_alias): Declare.
10368         (cgraph_process_same_body_aliases): Declare.
10369         (cgraph_function_with_gimple_body_p): Check for alias.
10370         (cgraph_can_remove_if_no_direct_calls_p): Look for aliases.
10371         (cgraph_alias_aliased_node): New function.
10372         (cgraph_function_node): Update for new aliases.
10373         (cgraph_function_or_thunk_node): Likewise.
10374         * ipa-inline-transform.c (can_remove_node_now_p): Look for aliases.
10375         (inline_call): Remove dead aliases.
10376         * cgraphunit.c (cgraph_decide_is_function_needed): Disable assembler
10377         name hack for same body aliases.
10378         (clone_of_p): Look through aliases.
10379         (verify_cgraph_node): Verify aliases.
10380         (cgraph_analyze_function): Analyze aliases; fixup C++ bugs.
10381         (cgraph_process_same_body_aliases): New function.
10382         (process_function_and_variable_attributes): Disable weakref warning on
10383         alias.
10384         (cgraph_analyze_functions): Handle aliases.
10385         (cgraph_mark_functions_to_output): Handle aliases same way as thunks.
10386         (assemble_thunks): Rename to ...
10387         (assemble_thunks_and_aliases): ... this one; handle aliases, too.
10388         (cgraph_expand_function): Remove alias output code.
10389         (cgraph_output_in_order): Skip aliases.
10390         (cgraph_preserve_function_body_p): Aliases don't need preserving.
10391         * ipa-ref.c (ipa_ref_use_name): Add alias reference.
10392         (ipa_record_reference): Do not assert on alias references.
10393         (ipa_ref_has_aliases_p): New function.
10394         * ipa-ref.h (enum ipa_ref_use): Add IPA_REF_ALIAS.
10395         (ipa_ref_has_aliases_p): Declare.
10396         * lto-cgraph.c (lto_output_node): Handle aliases.
10397         (input_node): Likewise.
10398         * lto-streamer-out.c (lto_output): Skip aliases.
10399         (produce_symtab): Kill same_body_alias code.
10400         * ipa-utils.c (ipa_reverse_postorder): Add FIXME.
10401         (ipa_reverse_postorder): Use cgraph_only_called_directly_or_aliased_p.
10402         * ipa-inline.c (update_caller_keys): Walk aliases.
10403         (inline_small_functions): Fix thinko in previous patch.
10404         * ipa.c (cgraph_externally_visible_p): Do not walk aliases.
10405         (function_and_variable_visibility): Do not walk same body aliases.
10406         * tree-ssa-structalias.c (associate_varinfo_to_alias): New function.
10407         (ipa_pta_execute): Use it.
10408
10409 2011-06-11  Uros Bizjak  <ubizjak@gmail.com>
10410
10411         * config/i386/sse.md (vec_dupv4sf): Correct mode of forced register.
10412         (*vec_dupv2df): Rename from vec_dupv2df.
10413         (vec_dupv2df): New expander.
10414
10415 2011-06-11  Uros Bizjak  <ubizjak@gmail.com>
10416
10417         * config/i386/sse.md (AVX_VEC_DUP_MODE): Rename from AVX256MODE24P.
10418
10419 2011-06-11  Uros Bizjak  <ubizjak@gmail.com>
10420
10421         * config/i386/i386.md: Use default value in "isa" attribute.
10422         * config/i386/sse.md: Ditto.
10423         * config/i386/mmx.md: Ditto.
10424
10425 2011-06-10  Wei Guozhi  <carrot@google.com>
10426
10427         PR target/45335
10428         * config/arm/ldmstm.md (ldm2_ia, stm2_ia, ldm2_ib, stm2_ib, ldm2_da,
10429         stm2_da, ldm2_db, stm2_db): Add condition !arm_arch7 to these insns.
10430         (ldrd, ldrd_reg1, ldrd_reg2 and peephole2): New insn patterns and
10431         related peephole2.
10432         (strd, strd_reg1, strd_reg2 and peephole2): New insn patterns and
10433         related peephole2.
10434         * config/arm/arm-protos.h (arm_check_ldrd_operands): New prototype.
10435         (arm_legitimate_ldrd_p): New prototype.
10436         (arm_output_ldrd): New prototype.
10437         * config/arm/arm.c (arm_check_ldrd_operands): New function.
10438         (arm_legitimate_ldrd_p): New function.
10439         (arm_output_ldrd): New function.
10440
10441 2011-06-10  David Li  <davidxl@google.com>
10442
10443         * cgraphunit.c (cgraph_finalize_compilation_unit): Pass dump.
10444         * passes.c (passr_eq): New function.
10445         (create_pass_tab): New function.
10446         (pass_traverse): New function.
10447         (dump_one_pass): New function.
10448         (dump_pass_list): New function.
10449         (dump_passes): New function.
10450
10451 2011-06-10  Jan Hubicka  <jh@suse.cz>
10452
10453         * cgraph.c (cgraph_set_nothrow_flag_1): Update cgraph after
10454         setting the nothrow flag.
10455         * ipa-reference.c (propagate): Skip aliases.
10456         * ipa-pure-const.c (propagate_pure_const): Skip aliases.
10457         (propagate_nothrow): Skip aliases; do not update cgraph.
10458         (local_pure_const): Do not update cgraph.
10459         * tree-profile.c (tree_profiling): Do fixup_cfg.
10460
10461 2011-06-10  Jan Hubicka  <jh@suse.cz>
10462
10463         * ipa.c (cgraph_non_local_node_p_1): Break out from ...;
10464         (cgraph_local_node_p): ... here; handle aliases.
10465         (has_addr_references_p): Break out from ...;
10466         (cgraph_remove_unreachable_nodes) ... here.
10467
10468 2011-06-10  Jan Hubicka  <jh@suse.cz>
10469
10470         * opts.c (default_options): Enlist OPT_finline_functions_called_once.
10471         * common.opt (flag_inline_functions_called_once): Do not
10472         initialize to 1.
10473
10474 2011-06-10  Jan Hubicka  <jh@suse.cz>
10475
10476         * ipa-cp.c (ipcp_versionable_function_p): Thunks are not versionable.
10477         (ipcp_initialize_node_lattices): Do not deal with aliases;
10478         Do not try to propagate through thunks.
10479         (ipcp_change_tops_to_bottom): Do not deal with aliases.
10480
10481 2011-06-10  Jan Hubicka  <jh@suse.cz>
10482
10483         * ipa-prop.c (ipa_write_node_info): Stream jump functions
10484         for indirect calls.
10485         (ipa_read_node_info): Likewise.
10486
10487 2011-06-10  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
10488
10489         PR lto/49302
10490         * tree-ssa-math-opts.c (powi_as_mults): Minor cleanup.
10491         (build_and_insert_call): Likewise.
10492         (build_and_insert_ref): New.
10493         (gimple_expand_builtin_pow): Minor cleanup.
10494         (gimple_expand_builtin_cabs): New.
10495         (execute_cse_sincos): Add case for BUILT_IN_CABS.
10496
10497 2011-06-10  Jan Hubicka  <jh@suse.cz>
10498
10499         * ipa-cp.c (ipcp_versionable_function_p): Aliases are not versionable.
10500         (ipcp_cloning_candidate_p): Aliases are not clonning candidates.
10501         (ipcp_initialize_node_lattices): We don't propagate through an aliases.
10502         (ipcp_propagate_stage): Skip aliases when propagating.
10503         (ipcp_need_redirect_p): Skip aliases.
10504         (ipcp_insert_stage): Use FOR_EACH_FUNCTION_WITH_GIMPLE_BODY and
10505         collect_callers_of_node.
10506         * ipa-prop.c (ipa_init_func_list): Do not analyze datastructures
10507         for aliases.
10508         (ipa_compute_jump_functions): Look through aliases.
10509
10510 2011-06-10  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
10511
10512         * doc/sourcebuild.texi (Effective-Target Keywords, pie): Document it.
10513
10514 2011-06-10  Hans-Peter Nilsson  <hp@axis.com>
10515
10516         * ira-costs.c: Remove #ifdefs on dead FORBIDDEN_INC_DEC_CLASSES.
10517         Adjust comments.
10518         * system.h (FORBIDDEN_INC_DEC_CLASSES): Poison.
10519
10520 2011-06-10  Jan Hubicka  <jh@suse.cz>
10521
10522         * ipa-cp.c (ipcp_process_devirtualization_opportunities):
10523         Update call of gimple_get_virt_method_for_binfo.
10524         * gimple-fold.c (gimple_get_virt_method_for_binfo): Remove
10525         refuse_thunks parameter.
10526         (gimple_fold_call): Update.
10527         * ipa-prop.c (try_make_edge_direct_virtual_call): Update.
10528
10529 2011-06-10  Jan Hubicka  <jh@suse.cz>
10530
10531         * tree-sra.c (all_callers_have_enough_arguments_p): Rename to ...
10532         (not_all_callers_have_enough_arguments_p): ... this one; turn into
10533         worker for cgraph_for_node_and_aliases.
10534         (convert_callers_for_node): Break out from ...
10535         (convert_callers): ... here.
10536         (modify_function): Use collect_callers_of_node.
10537         (ipa_early_sra): Use cgraph_for_node_and_aliases.
10538
10539 2011-06-10  Richard Guenther  <rguenther@suse.de>
10540
10541         PR tree-optimization/49361
10542         * fold-const.c (fold_binary_loc): Only fold x * x to pow (x, 2.0)
10543         when not already in gimple form.
10544
10545 2011-06-10  Richard Guenther  <rguenther@suse.de>
10546
10547         PR bootstrap/49344
10548         * tree-ssa-math-opts.c (convert_mult_to_fma): Use
10549         FOR_EACH_PHI_OR_STMT_USE.
10550
10551 2011-06-10  Jan Hubicka  <jh@suse.cz>
10552
10553         * ipa-inline-transform.c (can_remove_node_now_p): Move out of...
10554         (clone_inlined_nodes): ... here.
10555         (inline_call): Use cgraph_function_or_thunk_node; redirect edge
10556         to real destination prior inlining.
10557         * ipa-inline.c (caller_growth_limits, can_inline_edge_p,
10558         can_early_inline_edge_p, want_early_inline_function_p,
10559         want_early_inline_function_p, want_inline_small_function_p,
10560         want_inline_self_recursive_call_p, want_inline_function_called_once_p,
10561         edge_badness, update_all_callee_keys, lookup_recursive_calls,
10562         add_new_edges_to_heap, inline_small_functions, flatten_function,
10563         inline_always_inline_functions, early_inline_small_functions): Use
10564         cgraph_function_or_thunk_node.
10565         * ipa-inline-analysis.c (evaluate_conditions_for_edge,
10566         dump_inline_edge_summary, estimate_function_body_sizes): Likewise.
10567         (do_estimate_edge_growth_1): Break out from ...
10568         (do_estimate_growth) ... here; walk aliases.
10569         (inline_generate_summary): Skip aliases.
10570
10571 2011-06-10  Richard Guenther  <rguenther@suse.de>
10572
10573         * tree-ssa-forwprop.c (ssa_forward_propagate_and_combine): Scan stmts
10574         forward when combining, visit inserted stmts when a stmt was changed.
10575
10576 2011-06-10  Paolo Carlini  <paolo.carlini@oracle.com>
10577
10578         * tree.h (error_operand_p): Add.
10579         * dbxout.c (dbxout_type_fields): Use the latter.
10580         * c-decl.c (add_stmt): Likewise.
10581         * gimplify.c (omp_add_variable, omp_notice_variable,
10582         gimplify_scan_omp_clauses): Likewise.
10583
10584 2011-06-10  Georg-Johann Lay  <avr@gjlay.de>
10585
10586         * config/avr/avr.c (avr_function_arg_advance): Fix thinko about
10587         when a value is actually passed in regs.
10588
10589 2011-06-10  Eric Botcazou  <ebotcazou@adacore.com>
10590             Laurent Rougé  <laurent.rouge@menta.fr>
10591
10592         * doc/invoke.texi (SPARC options): Add -mflat.
10593         * config/sparc/sparc.opt: Likewise.
10594         * config/sparc/sparc-protos.h (sparc_expand_epilogue): Add parameter.
10595         (sparc_flat_expand_prologue): Declare.
10596         (sparc_flat_expand_epilogue): Likewise.
10597         * config/sparc/sparc.h (CPP_CPU_SPEC): Do not handle -msoft-float.
10598         (CPP_ENDIAN_SPEC): Replace with...
10599         (CPP_OTHER_SPEC): ...this.  Also handle -mflat and -msoft-float.
10600         (CPP_SPEC): Adjust to above change.
10601         (EXTRA_SPECS): Likewise.
10602         (SPARC_INCOMING_INT_ARG_FIRST): Add TARGET_FLAT handling.
10603         (INCOMING_REGNO): Likewise.
10604         (OUTGOING_REGNO): Likewise.
10605         (LOCAL_REGNO): Likewise.
10606         (SETUP_FRAME_ADDRESSES): Likewise.
10607         (FIXED_REGISTERS): Set 0 for %fp.
10608         (CALL_USED_REGISTERS): Likewise.
10609         (INITIAL_ELIMINATION_OFFSET): Pass current_function_is_leaf.
10610         (EXIT_IGNORE_STACK): Define to 1 unconditionally.
10611         (RETURN_ADDR_REGNUM): Define.
10612         (RETURN_ADDR_RTX): Use it.
10613         (INCOMING_RETURN_ADDR_REGNUM): Define.
10614         (INCOMING_RETURN_ADDR_RTX): Use it.
10615         (DWARF_FRAME_RETURN_COLUMN): Likewise.
10616         (EH_RETURN_REGNUM): Define.
10617         (EH_RETURN_STACKADJ_RTX): Use it.
10618         (EH_RETURN_HANDLER_RTX): Delete.
10619         (EPILOGUE_USES): Use them and add TARGET_FLAT handling.
10620         * config/sparc/sparc.c (apparent_fsize, actual_fsize, num_gfregs):
10621         Delete.
10622         (struct machine_function): Add frame_size, apparent_frame_size,
10623         frame_base_reg, frame_base_offset, n_global_fp_regs and
10624         save_local_in_regs_p fields.
10625         (sparc_frame_size, sparc_apparent_frame_size, sparc_frame_base_reg,
10626         sparc_frame_base_offset, sparc_n_global_fp_regs,
10627         sparc_save_local_in_regs_p): New macros.
10628         (sparc_option_override): Error out if -fcall-saved-REG is specified
10629         for Out registers.
10630         (eligible_for_restore_insn): Fix formatting.
10631         (eligible_for_return_delay): Likewise.  Add TARGET_FLAT handling.
10632         (eligible_for_sibcall_delay): Likewise.
10633         (RTX_OK_FOR_OFFSET_P, RTX_OK_FOR_OLO10_P): Add MODE parameter.
10634         (sparc_legitimate_address_p): Adjust to above change.
10635         (save_global_or_fp_reg_p): New predicate.
10636         (return_addr_reg_needed_p): Likewise.
10637         (save_local_or_in_reg_p): Likewise.
10638         (sparc_compute_frame_size): Use them.  Add TARGET_FLAT handling.
10639         (SORR_SAVE, SORR_RESTORE): Delete.
10640         (sorr_pred_t): New typedef.
10641         (sorr_act_t): New enum.
10642         (save_or_restore_regs): Rename to...
10643         (emit_save_or_restore_regs): ...this.  Change type of LOW and HIGH
10644         parameters, remove ACTION parameter, add LEAF_FUNCTION_P, SAVE_P,
10645         ACTION_TRUE and ACTION_FALSE parameters.  Implement more general
10646         mechanism.  Add CFI information for double-word saves in 32-bit mode.
10647         (emit_adjust_base_to_offset): New function extracted from...
10648         (emit_save_or_restore_regs): ...this.  Rename the rest to...
10649         (emit_save_or_restore_regs_global_fp_regs): ...this.
10650         (emit_save_or_restore_regs_local_in_regs): New function.
10651         (gen_create_flat_frame_[123]): New functions.
10652         (sparc_expand_prologue): Use SIZE local variable.  Adjust.
10653         (sparc_flat_expand_prologue): New function.
10654         (sparc_asm_function_prologue): Add TARGET_FLAT handling.
10655         (sparc_expand_epilogue): Use SIZE local variable.  Adjust.
10656         (sparc_flat_expand_epilogue): New function.
10657         (sparc_can_use_return_insn_p): Add TARGET_FLAT handling.
10658         (output_return): Likewise.
10659         (output_sibcall): Likewise.
10660         (sparc_output_mi_thunk): Likewise.
10661         (sparc_frame_pointer_required): Likewise.
10662         (sparc_conditional_register_usage): If TARGET_FLAT, disable the leaf
10663         function optimization.
10664         * config/sparc/sparc.md (flat): New attribute.
10665         (prologue): Add TARGET_FLAT handling.
10666         (save_register_window): Disable if TARGET_FLAT.
10667         (create_flat_frame_[123]): New patterns.
10668         (epilogue): Add TARGET_FLAT handling.
10669         (sibcall_epilogue): Likewise.
10670         (eh_return): New expander.
10671         (eh_return_internal): New insn and splitter.
10672         (return_internal): Add TARGET_FLAT handling.
10673         (untyped_return): Remove bogus test and use RETURN_ADDR_REGNUM.
10674         (save_stack_nonlocal): Use RETURN_ADDR_REGNUM.
10675         (nonlocal_goto): Add TARGET_FLAT handling.
10676         * config/sparc/t-elf: Add -mflat multilib.
10677         * config/sparc/t-leon: Likewise.
10678
10679 2011-06-10  Jan Hubicka  <jh@suse.cz>
10680
10681         * ipa-utils.c (searchc): Use cgraph_function_or_thunk_node.
10682         * ipa-pure-const.c (analyze_function): Aliases don't need analysis.
10683         (self_recursive_p): Use cgraph_function_node.
10684         (propagate_pure_const): Likewise.
10685         (propagate_nothrow): Likewise.
10686         * ipa-reference.c (ipa_reference_get_not_read_global): Use
10687         cgraph_function_node.
10688         (propagate_bits): Likewise.
10689         (propagate): Likewise.
10690
10691 2011-06-10  Ramana Radhakrishnan  <ramana.radhakrishnan@linaro.org>
10692             Richard Earnshaw  <rearnsha@arm.com>
10693
10694         * config/arm/arm.c (const_ok_for_op): Check to see if mvn can be used.
10695         * config/arm/vfp.md (*arm_movdi_vfp): Delete.
10696         (*thumb2_movdi_vfp): Delete.
10697         (*arm_movdi_vfp_cortexa8): Delete.
10698         (*movdi_vfp): Consolidate from *arm_movdi_vfp and *thumb2_movdi_vfp.
10699         (*movdi_vfp_cortexa8): Likewise.
10700
10701 2011-06-10  Richard Guenther  <rguenther@suse.de>
10702
10703         * stor-layout.c (initialize_sizetypes): Give names to all
10704         sizetype kinds.
10705
10706 2011-06-10  Ira Rosen  <ira.rosen@linaro.org>
10707
10708         PR tree-optimization/49318
10709         * tree-vect-loop.c (vect_determine_vectorization_factor): Remove
10710         irrelevant pattern statements.
10711
10712 2011-06-10  Hans-Peter Nilsson  <hp@axis.com>
10713
10714         * system.h (SETJMP_VIA_SAVE_AREA): Poison.
10715
10716         PR bootstrap/49354
10717         * ira-costs.c (setup_regno_cost_classes_by_mode): Add missing cast
10718         to last assignment.
10719
10720 2011-06-09  Jan Hubicka  <jh@suse.cz>
10721
10722         * cgraphunit.c (cgraph_reset_node): Do not set redefined_extern_inline;
10723         do not recompute reachable flag.
10724         (cgraph_finalize_function, cgraph_analyze_functions): Set
10725         redefined_extern_inline here.
10726
10727 2011-06-09  Jan Hubicka  <jh@suse.cz>
10728
10729         * cgraph.h (cgraph_only_called_directly_or_aliased_p): Rename from ...
10730         (cgraph_only_called_directly_p): ... this one; bring offline.
10731         (resolution_used_from_other_file_p, cgraph_used_from_object_file_p,
10732         varpool_used_from_object_file_p): Drop names from the declaratoin.
10733         (cgraph_for_node_thunks_and_aliases, cgraph_for_node_and_aliases,
10734         collect_callers_of_node): New.
10735         (cgraph_function_node, cgraph_function_or_thunk_node): New functions.
10736         (cgraph_edge_recursive_p): Use cgraph_function_node.
10737         * cgraph.c (cgraph_add_thunk): Check that thunk is not already alias.
10738         (cgraph_node_cannot_be_local_p_1): Break out from ...
10739         (cgraph_node_can_be_local_p): ... here; walk aliases.
10740         (cgraph_for_node_thunks_and_aliases): New function.
10741         (cgraph_for_node_and_aliases): New function.
10742         (cgraph_make_node_local_1): Break out from ...
10743         (cgraph_make_node_local) ... here; use
10744         cgraph_for_node_thunks_and_aliases.
10745         (cgraph_set_nothrow_flag_1): Break out from ...
10746         (cgraph_set_nothrow_flag) ... here;
10747         use cgraph_for_node_thunks_and_aliases.
10748         (cgraph_set_const_flag_1): Break out from ...
10749         (cgraph_set_const_flag) ... here;
10750         use cgraph_for_node_thunks_and_aliases.
10751         (cgraph_set_pure_flag_1): Break out from ...
10752         (cgraph_set_pure_flag) ... here;
10753         use cgraph_for_node_thunks_and_aliases.
10754         (cgraph_propagate_frequency_1): Break out from ...
10755         (cgraph_propagate_frequency) ... here; use
10756         cgraph_for_node_thunks_and_aliases.
10757         (cgraph_used_from_object_file_p): Do not care about aliases.
10758         (cgraph_not_only_called_directly_p_1, cgraph_only_called_directly_p):
10759         New functions.
10760         (collect_callers_of_node_1, collect_callers_of_node): New functions.
10761
10762 2011-06-10  Hans-Peter Nilsson  <hp@axis.com>
10763
10764         PR rtl-optimization/49154
10765         * config/cris/cris.h (FIXED_REGISTERS): Include CRIS_CC0_REGNUM.
10766         (enum reg_class): Add SRP_REGS and MOF_SRP_REGS.
10767         (REG_CLASS_NAMES, REG_CLASS_CONTENTS, REGNO_REG_CLASS)
10768         (PREFERRED_RELOAD_CLASS, SECONDARY_RELOAD_CLASS): Adjust to fit.
10769         * config/cris/cris.h (cris_register_move_cost): Remove
10770         !TARGET_V32 code.  Tweak comments.
10771
10772 2011-06-09  Jan Hubicka  <jh@suse.cz>
10773
10774         * cgraphbuild.c (record_eh_tables): Mark personality function as having
10775         address taken.
10776
10777 2011-06-10  Hans-Peter Nilsson  <hp@axis.com>
10778
10779         PR rtl-optimization/49154
10780         * ira-costs.c (setup_regno_cost_classes_by_mode): If there already
10781         is a matching slot in the hashtable, assign it to classes_ptr.
10782
10783         PR rtl-optimization/49154
10784         * doc/tm.texi.in (Register Classes): Document rule for the narrowest
10785         register classes.
10786         * doc/tm.texi: Regenerate.
10787
10788 2011-06-09  Kaz Kojima  <kkojima@gcc.gnu.org>
10789
10790         PR target/49307
10791         * config/sh/sh.md (UNSPEC_CHKADD): New.
10792         (chk_guard_add): New define_insn_and_split.
10793         (symGOT_load): Use chk_guard_add instead of blockage.
10794
10795 2011-06-09  Kai Tietz  <ktietz@redhat.com>
10796
10797         * libgcc2.c (L_trampoline): Include windows.h for mingw targets.
10798
10799 2011-06-09  Eric Botcazou  <ebotcazou@adacore.com>
10800
10801         * config/sparc/sparc.md (return_internal): Adjust 'length' attribute.
10802
10803 2011-06-09  Wei Guozhi  <carrot@google.com>
10804
10805         PR target/46975
10806         * config/arm/arm.md (*addsi3_carryin_compare0_<optab>): New pattern.
10807         (peephole2 for conditional move): Generate 16 bit instructions.
10808
10809 2011-06-09  Uros Bizjak  <ubizjak@gmail.com>
10810
10811         * config/i386/i386.md (*movdi_internal_rex64): Merge
10812         alternatives 6 and 8.
10813
10814 2011-06-09  David Li  <davidxl@google.com>
10815
10816         * cgraphunit.c (cgraph_finalize_compilation_unit): Pass dump.
10817         * passes.c (passr_eq): New function.
10818         (create_pass_tab): New function.
10819         (pass_traverse): New function.
10820         (dump_one_pass): New function.
10821         (dump_pass_list): New function.
10822         (dump_passes): New function.
10823
10824 2011-06-09  David Li  <davidxl@google.com>
10825
10826         * tree-complex.c (tree_lower_complex): Gate cleanup.
10827         * tree-stdarg.c (check_all_va_list_escapes): Ditto.
10828         (execute_optimize_stdarg): Ditto.
10829         * tree-eh.c (execute_lower_eh_dispatch): Ditto.
10830         (execute_cleanup_eh_1): Ditto.
10831         (execute_cleanup_eh): Ditto.
10832         * gcse.c (gate_rtl_pre): Ditto.
10833         (execute_rtl_pre): Ditto.
10834         * except.c (finish_eh_generation): Ditto.
10835         (convert_to_eh_region_ranges): Ditto.
10836         * cprop.c (one_cprop_pass): Ditto.
10837
10838 2011-06-09  Bernd Schmidt  <bernds@codesourcery.com>
10839
10840         PR target/48673
10841         * config/ia64/ia64.c (ia64_reorg): Clear BB_DISABLE_SCHEDULE flag
10842         in all basic blocks.
10843
10844 2011-06-09  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
10845
10846         * config/alpha/netbsd.h (ENABLE_EXECUTE_STACK): Remove.
10847         (HAVE_ENABLE_EXECUTE_STACK): Define.
10848         * config/alpha/osf5.h (ENABLE_EXECUTE_STACK): Remove.
10849         (HAVE_ENABLE_EXECUTE_STACK): Define.
10850         * config/darwin.h (ENABLE_EXECUTE_STACK): Remove.
10851         (HAVE_ENABLE_EXECUTE_STACK): Define.
10852         * config/i386/mingw32.h (MINGW_ENABLE_EXECUTE_STACK): Remove.
10853         (ENABLE_EXECUTE_STACK): Remove.
10854         (HAVE_ENABLE_EXECUTE_STACK): Define.
10855         [IN_LIBGCC2]: Don't include <windows.h>.
10856         * config/i386/netbsd-elf.h (ENABLE_EXECUTE_STACK): Remove.
10857         (HAVE_ENABLE_EXECUTE_STACK): Define.
10858         * config/i386/netbsd64.h (ENABLE_EXECUTE_STACK): Remove.
10859         (HAVE_ENABLE_EXECUTE_STACK): Define.
10860         * config/netbsd.h (NETBSD_ENABLE_EXECUTE_STACK): Remove.
10861         * config/openbsd.h (ENABLE_EXECUTE_STACK): Remove.
10862         (HAVE_ENABLE_EXECUTE_STACK): Define.
10863         * config/sol2.h (ENABLE_EXECUTE_STACK): Remove.
10864         (HAVE_ENABLE_EXECUTE_STACK): Define.
10865         * config/sparc/freebsd.h (ENABLE_EXECUTE_STACK): Remove.
10866         (HAVE_ENABLE_EXECUTE_STACK): Define.
10867         * config/sparc/netbsd-elf.h (ENABLE_EXECUTE_STACK): Remove.
10868         (HAVE_ENABLE_EXECUTE_STACK): Define.
10869         * config/alpha/alpha.c (alpha_trampoline_init): Test
10870         HAVE_ENABLE_EXECUTE_STACK.
10871         * config/i386/i386.c (ix86_trampoline_init): Likewise.
10872         * config/sparc/sparc.c (sparc32_initialize_trampoline): Likewise.
10873         (sparc64_initialize_trampoline): Likewise.
10874         * libgcc2.c [L_enable_execute_stack]: Remove.
10875         * system.h (ENABLE_EXECUTE_STACK): Poison.
10876         * doc/tm.texi.in (Trampolines, ENABLE_EXECUTE_STACK): Remove.
10877         * doc/tm.texi: Regenerate.
10878         * Makefile.in (LIBGCC2_CFLAGS): Add -fbuilding-libgcc.
10879
10880 2011-06-09  Jakub Jelinek  <jakub@redhat.com>
10881
10882         PR middle-end/49308
10883         * dce.c (reset_unmarked_insns_debug_uses): Avoid shadowing insn
10884         variable.  After resetting and rescanning insn continue with previous
10885         statement.
10886
10887 2011-06-09  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
10888
10889         * configure.ac (gcc_cv_as_hidden): Enable on *-*-darwin*.
10890         (gcc_cv_ld_hidden): Likewise.
10891         * configure: Regenerate.
10892         * config/i386/i386.c (USE_HIDDEN_LINKONCE): Remove TARGET_MACHO.
10893         (ix86_stack_protect_fail): Mark unused.
10894         (TARGET_STACK_PROTECT_FAIL) [TARGET_MACHO]: Don't redefine.
10895         * config/rs6000/rs6000.c (rs6000_assemble_visibility)
10896         [TARGET_MACHO]: Don't define.
10897         (TARGET_ASM_ASSEMBLE_VISIBILITY): Likewise.
10898         (TARGET_STACK_PROTECT_FAIL): Likewise.
10899         (rs6000_stack_protect_fail): Mark unused.
10900         * dwarf2asm.c (dw2_output_indirect_constant_1): Mark decl hidden if
10901         USE_LINKONCE_INDIRECT.  Don't emit .hidden expicitly.
10902
10903 2011-06-08  Andi Kleen  <ak@linux.intel.com>
10904
10905         * varasm.c (get_section): Print location of other conflict
10906         for section conflicts.
10907
10908 2011-06-08  Andi Kleen  <ak@linux.intel.com>
10909
10910         * config/i386/driver-i386.c (host_detect_local_cpu):
10911         Add model 0x2d Intel CPU.
10912
10913 2011-06-08  Andi Kleen  <ak@linux.intel.com>
10914
10915         * reginfo.c (global_regs_decl): Add.
10916         (globalize_reg): Add decl parameter. Compute location.  Pass location
10917         to warnings and add inform. Store decl in global_regs_decl.
10918         * rtl.h (globalize_reg): Update prototype.
10919         * varasm.c (make_decl_rtl): Pass decl to globalize_reg().
10920
10921 2011-06-09  Mingjie Xing  <mingjie.xing@gmail.com>
10922
10923         * treestruct.def (TS_TYPE_DECL): Fix the printable name typo.
10924
10925 2011-06-08  Kaz Kojima  <kkojima@gcc.gnu.org>
10926
10927         PR target/49305
10928         * config/sh/predicates.md (general_movsrc_operand): Check
10929         mode for memory with indexed address for QI and HImode.
10930         (general_movdst_operand): Likewise.
10931
10932 2011-06-09  Nicola Pero  <nicola.pero@meta-innovation.com>
10933
10934         * doc/objc.texi (Traditional GNU Objective-C runtime API): Updated.
10935
10936 2011-06-08  Alexandre Oliva  <aoliva@redhat.com>
10937
10938         * tree-flow-inline.h (op_iter_init): Reject GIMPLE_PHI stmts.
10939         (num_ssa_operands): Likewise.
10940         (op_iter_init_phiuse): Forward-declare.
10941         (delink_stmt_imm_use): Iterate with FOR_EACH_PHI_OR_STMT_USE.
10942
10943 2011-06-08  Nick Clifton  <nickc@redhat.com>
10944
10945         * doc/invoke.texi (ARM Options): Update description of
10946         -mthumb-interwork.
10947
10948 2011-06-08  H.J. Lu  <hongjiu.lu@intel.com>
10949
10950         * config/i386/driver-i386.c (host_detect_local_cpu): Support
10951         unknown Intel family 0x6 CPUs.
10952
10953 2011-06-08  Martin Jambor  <mjambor@suse.cz>
10954
10955         * tree-sra.c (mark_rw_status): Removed.
10956         (analyze_access_subtree): New parameter parent instead of
10957         mark_read and mark_write, propagate from that.
10958
10959 2011-06-08  Julian Brown  <julian@codesourcery.com>
10960
10961         * config/arm/arm.c (arm_libcall_uses_aapcs_base): Use correct ABI
10962         for double-precision helper functions in hard-float mode if only
10963         single-precision arithmetic is supported in hardware.
10964
10965 2011-06-08  Alexander Monakov  <amonakov@ispras.ru>
10966
10967         PR rtl-optimization/49303
10968         * sel-sched.c (move_op): Use correct type for 'res'.  Verify that
10969         code_motion_path_driver returned 0 or 1.
10970         (sel_region_finish): Clear h_d_i_d.
10971
10972 2011-06-08  Kaz Kojima  <kkojima@gcc.gnu.org>
10973
10974         * config/sh/sh.c (prepare_move_operands): Set pic register
10975         appropriately for global and local dynamic tls models even
10976         if flag_pic is unset.
10977
10978 2011-06-07  Jason Merrill  <jason@redhat.com>
10979
10980         * pretty-print.h (ATTRIBUTE_GCC_PPDIAG): Use GCC_DIAG_STYLE if set.
10981
10982 2011-06-07  Xinliang David Li  <davidxl@google.com>
10983         * passes.c (enable_disable_pass): Handle assembler name.
10984         (is_pass_explicitly_enabled_or_disabled): Ditto.
10985
10986 2011-06-07  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
10987
10988         PR tree-optimization/48497
10989         * doc/sourcebuild.texi (Directives, dg-additional-options): Document.
10990
10991 2011-06-07  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
10992
10993         PR tree-optimization/46728
10994         * tree-ssa-math-opts.c (gimple_expand_builtin_pow): Change FIXME
10995         to use gimple_val_nonnegative_real_p.
10996         * gimple-fold.c (gimple_val_nonnegative_real_p): New function.
10997         * gimple.h (gimple_val_nonnegative_real_p): New declaration.
10998
10999 2011-06-07  H.J. Lu  <hongjiu.lu@intel.com>
11000
11001         * config/i386/i386.md (*movsf_internal): Optimize AVX check.
11002
11003 2011-06-07  Sergey Grechanik  <mouseentity@ispras.ru>
11004
11005         * config/arm/arm.c (coproc_secondary_reload_class): Return NO_REGS for
11006         constant vectors.
11007
11008 2011-06-07  Richard Guenther  <rguenther@suse.de>
11009
11010         * stor-layout.c (initialize_sizetypes): Initialize all
11011         sizetypes based on target definitions.
11012         (set_sizetype): Remove.
11013         * tree.c (build_common_tree_nodes): Do not call set_sizetype.
11014         * tree.h (set_sizetype): Remove.
11015
11016 2011-06-07  Nick Clifton  <nickc@redhat.com>
11017
11018         * config.gcc: Unify V850 architecture options and add support for
11019         newer V850 architectures.
11020         * config/v850/t-v850e: Delete.
11021
11022 2011-06-07  Richard Guenther  <rguenther@suse.de>
11023
11024         * tree.c (build_common_tree_nodes): Also initialize size_type_node.
11025         Call set_sizetype from here.
11026
11027 2011-06-07  Andrew Stubbs  <ams@codesourcery.com>
11028
11029         * config/arm/arm.md (*maddhidi4tb, *maddhidi4tt): New define_insns.
11030         (*maddhisi4tb, *maddhisi4tt): New define_insns.
11031
11032 2011-06-07  Bernd Schmidt  <bernds@codesourcery.com>
11033             Andrew Stubbs  <ams@codesourcery.com>
11034
11035         * simplify-rtx.c (simplify_unary_operation_1): Canonicalize widening
11036         multiplies.
11037         * doc/md.texi (Canonicalization of Instructions): Document widening
11038         multiply canonicalization.
11039
11040 2011-06-07  Jakub Jelinek  <jakub@redhat.com>
11041
11042         PR gcov-profile/49299
11043         * value-prof.c (gimple_ic): Don't assume icall has a fallthru edge.
11044
11045 2011-06-07  Ira Rosen  <ira.rosen@linaro.org>
11046
11047         * tree-vectorizer.h (vect_recog_func_ptr): Make last argument to be
11048         a pointer.
11049         * tree-vect-patterns.c (vect_recog_widen_sum_pattern,
11050         vect_recog_widen_mult_pattern, vect_recog_dot_prod_pattern,
11051         vect_recog_pow_pattern): Likewise.
11052         (vect_pattern_recog_1): Remove declaration.
11053         (widened_name_p): Remove declaration.  Add new argument to specify
11054         whether to check that both types are either signed or unsigned.
11055         (vect_recog_widen_mult_pattern): Update documentation.  Handle
11056         unsigned patterns and multiplication by constants.
11057         (vect_pattern_recog_1): Update vect_recog_func references.  Use
11058         statement information from the statement returned from pattern
11059         detection functions.
11060         (vect_pattern_recog): Update vect_recog_func reference.
11061         * tree-vect-stmts.c (vectorizable_type_promotion): For widening
11062         multiplication by a constant use the type of the other operand.
11063
11064 2011-06-06  Richard Sandiford  <rdsandiford@googlemail.com>
11065
11066         PR rtl-optimization/49145
11067         * combine.c (make_compound_operation): Handle ZERO_EXTEND specially.
11068
11069 2011-06-06  Jakub Jelinek  <jakub@redhat.com>
11070
11071         PR debug/49262
11072         * dwarf2out.c (native_encode_initializer): Decrement count in each
11073         iteration.
11074
11075         PR debug/49294
11076         * dwarf2out.c (mem_loc_descriptor) <do_shift>: Give up for
11077         non-MODE_INT modes.
11078
11079         PR c++/49264
11080         * gimple-fold.c (fold_stmt_1): Don't try to fold *& on the lhs
11081         if stmt folded into nothing.
11082         * tree-inline.c (fold_marked_statements): If a builtin at the end of
11083         a bb folded into nothing, just update cgraph edges and move to next bb.
11084         * cgraph.c (cgraph_update_edges_for_call_stmt_node): Allow new_stmt
11085         to be NULL.  Don't compute count and frequency if new_call is NULL.
11086
11087 2011-06-04  Diego Novillo  <dnovillo@google.com>
11088
11089         * Makefile.in (lto-compress.o): Add dependency on LTO_STREAMER_H.
11090         (cgraph.o): Likewise.
11091         (cgraphunit.o): Likewise.
11092         * cgraphunit.c: Include lto-streamer.h
11093         (cgraph_finalize_compilation_unit): Call lto_streamer_hooks_init
11094         if LTO is enabled.
11095         * lto-streamer-in.c (unpack_value_fields): Call
11096         streamer_hooks.unpack_value_fields if set.
11097         (lto_materialize_tree): For unhandled nodes, first try to
11098         call lto_streamer_hooks.alloc_tree, if it exists.
11099         (lto_input_ts_decl_common_tree_pointers): Move reading of
11100         DECL_INITIAL to lto_streamer_read_tree.
11101         (lto_read_tree): Call lto_streamer_hooks.read_tree if set.
11102         (lto_streamer_read_tree): New.
11103         (lto_reader_init): Rename from lto_init_reader.
11104         Move initialization code to lto/lto.c.
11105         * lto-streamer-out.c (pack_value_fields): Call
11106         streamer_hooks.pack_value_fields if set.
11107         (lto_output_tree_ref): For tree nodes that are not normally indexable,
11108         call streamer_hooks.indexable_with_decls_p before giving up.
11109         (lto_output_ts_decl_common_tree_pointers): Move handling
11110         for FUNCTION_DECL and TRANSLATION_UNIT_DECL to lto_streamer_write_tree.
11111         (lto_output_tree_header): Call streamer_hooks.is_streamable instead of
11112         lto_is_streamable.  Call lto_streamer_hooks.output_tree_header if set.
11113         (lto_write_tree): Call lto_streamer_hooks.write_tree if set.
11114         (lto_streamer_write_tree): New.
11115         (lto_output): Call lto_streamer_init directly.
11116         (lto_writer_init): Remove.
11117         * lto-streamer.c (streamer_hooks): New.
11118         (lto_streamer_cache_create): Call streamer_hooks.preload_common_nodes
11119         instead of lto_preload_common_nodes.
11120         (lto_is_streamable): Move from lto-streamer.h
11121         (lto_streamer_hooks_init): New.
11122         (streamer_hooks): New.
11123         (streamer_hooks_init): New.
11124         * lto-streamer.h (struct output_block): Forward declare.
11125         (struct lto_input_block): Likewise.
11126         (struct data_in): Likewise.
11127         (struct bitpack_d): Likewise.
11128         (struct streamer_hooks): Declare.
11129         (streamer_hooks): Declare.
11130         (lto_streamer_hooks_init): Declare.
11131         (lto_streamer_write_tree): Declare.
11132         (lto_streamer_read_tree): Declare.
11133         (streamer_hooks_init): Declare.
11134         (lto_is_streamable): Move to lto-streamer.c
11135
11136 2011-06-06  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
11137
11138         * longlong.h (smul_ppmm): The resulting register pair contains the
11139         higher order word first.
11140
11141 2011-06-06  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
11142
11143         PR tree-optimization/46728
11144         * builtins.c (powi_table): Remove.
11145         (powi_lookup_cost): Remove.
11146         (powi_cost): Remove.
11147         (expand_powi_1): Remove.
11148         (expand_powi): Remove.
11149         (expand_builtin_pow_root): Remove.
11150         (expand_builtin_pow): Remove.
11151         (expand_builtin_powi): Eliminate handling of constant exponent.
11152         (expand_builtin): Use expand_builtin_mathfn_2 for BUILT_IN_POW.
11153
11154 2011-06-06  Alexandre Oliva  <aoliva@redhat.com>
11155
11156         * cprop.c (local_cprop_pass): Don't set changed for debug insns.
11157
11158 2011-06-06  Alexandre Oliva  <aoliva@redhat.com>
11159
11160         * dce.c (reset_unmarked_insns_debug_uses): New.
11161         (delete_unmarked_insns): Skip debug insns.
11162         (prescan_insns_for_dce): Likewise.
11163         (rest_of_handle_ud_dce): Reset debug uses of removed sets.
11164         * reg-stack.c (subst_stack_regs_in_debug_insn): Signal when no
11165         active reg can be found.
11166         (subst_all_stack_regs_in_debug_insn): New.  Reset debug insn then.
11167         (convert_regs_1): Use it.
11168
11169 2011-06-06  Alexandre Oliva  <aoliva@redhat.com>
11170
11171         * tree-pretty-print.c (dump_function_header): Add flags.
11172         Don't dump decl_uid with nouid.
11173         * tree-pretty-print.h (dump_function_header): Adjust.
11174         * final.c (rest_of_clean_state): Pass dump_flags on, with nouid.
11175         * passes.c (pass_init_dump_file): Pass dump_flags on.
11176         * tree-cfg.c (gimple_dump_cfg): Pass flags on.
11177
11178 2011-06-06  Alexandre Oliva  <aoliva@redhat.com>
11179
11180         PR bootstrap/49270
11181         * ipa-inline-analysis.c (read_predicate): Initialize all clauses.
11182
11183 2011-06-06  Mikael Pettersson  <mikpe@it.uu.se>
11184
11185         PR tree-optimization/49243
11186         * calls.c (setjmp_call_p): Also check if fndecl has the
11187         returns_twice attribute.
11188
11189 2011-06-06  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
11190
11191         * config/mips/iris6.h (ENDFILE_SPEC): Use crtfastmath.o if
11192         -ffast-math etc.
11193
11194 2011-06-06  Richard Henderson  <rth@redhat.com>
11195             Georg-Johann Lay  <avr@gjlay.de>
11196
11197         PR target/42210
11198         * config/avr/predicates.md (const1_operand, const_0_to_7_operand):
11199         New predicates.
11200         * config/avr/avr.md ("insv"): New insn expander.
11201         ("*movbitqi.1-6.a", "*movbitqi.1-6.b", "*movbitqi.0", "*insv.io",
11202         "*insv.not.io", "*insv.reg"): New insns.
11203
11204 2011-06-06  Hans-Peter Nilsson  <hp@bitrange.com>
11205
11206         PR target/49285
11207         * config/mmix/mmix.md ("truncdfsf2", "extendsfdf2"): Correct predicate
11208         to nonimmediate_operand from memory_operand for the operand that is to
11209         be forced to memory by the expander.  Lose the constraints.
11210
11211 2011-06-05  Eric Botcazou  <ebotcazou@adacore.com>
11212
11213         * config/sparc/sparc.c (output_return): Fix thinko in the output of an
11214         EH return when delayed branches are disabled.
11215
11216 2011-06-05  Uros Bizjak  <ubizjak@gmail.com>
11217
11218         * config/i386/i386.md (*movdf_internal_rex64) <case 8,9,10>:
11219         Remove MODE_TI handling.  Remove SSE1 handling in attribute "mode"
11220         calculation.
11221         (*movdf_internal_rex64) <case 6,7,8>: Remove MODE_TI handling.
11222         Simplify MODE_V1DF and MODE_V2SF handling.
11223         (*movsf_internal): Remove x constraint from alternative 7 of operand 1.
11224         Simplify MODE_SF handling.
11225
11226 2011-06-04  Jan Hubicka  <jh@suse.cz>
11227
11228         PR tree-optimization/48893
11229         PR tree-optimization/49091
11230         PR tree-optimization/49179
11231         * ipa-inline-analysis.c (evaluate_conditions_for_known_args):
11232         Bounds check.
11233
11234 2011-06-04  Jan Hubicka  <jh@suse.cz>
11235
11236         PR lto/48954
11237         * lto-cgraph.c (output_node_opt_summary): Handle NULL skip args
11238         bitmaps.
11239
11240 2011-06-04  Jonathan Wakely  <jwakely.gcc@gmail.com>
11241
11242         * doc/invoke.texi: Document -Wdelete-non-virtual-dtor.
11243
11244 2011-06-04  Jakub Jelinek  <jakub@redhat.com>
11245
11246         PR target/49281
11247         * config/i386/i386.md (*lea_general_4): Require INTVAL (operands[3])
11248         to be strictly smaller than 1 << shiftcount.
11249
11250 2011-06-04  Jan Hubicka  <jh@suse.cz>
11251
11252         PR tree-optimize/48929
11253         * ipa-inline-analysis.c (remap_edge_predicates): Fix handling
11254         of empty predicate.
11255
11256 2011-06-04  Alexandre Oliva  <aoliva@redhat.com>
11257
11258         PR debug/48333
11259         * calls.c (emit_call_1): Prefer the __builtin declaration of
11260         builtin functions.
11261
11262 2011-06-03   Diego Novillo  <dnovillo@google.com>
11263
11264         * lto-streamer-in.c (unpack_value_fields): Remove unneeded asserts.
11265         (lto_input_tree_pointers): Likewise.
11266         * lto-streamer-out.c (pack_value_fields): Likewise.
11267         (lto_output_tree_pointers): Likewise.
11268         * lto-streamer.h (lto_is_streamable): Add check for OMP_CLAUSE
11269         and OPTIMIZATION_NODE.
11270
11271 2011-06-03  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
11272
11273         * config/alpha/linux.h (MD_UNWIND_SUPPORT): Remove.
11274         * config/alpha/osf5.h (MD_UNWIND_SUPPORT): Remove.
11275         * config/alpha/vms.h (MD_UNWIND_SUPPORT): Remove.
11276         * config/bfin/linux.h (MD_UNWIND_SUPPORT): Remove.
11277         * config/bfin/uclinux.h (MD_UNWIND_SUPPORT): Remove.
11278         * config/i386/linux.h (MD_UNWIND_SUPPORT): Remove.
11279         * config/i386/linux64.h (MD_UNWIND_SUPPORT): Remove.
11280         * config/i386/sol2.h (MD_UNWIND_SUPPORT): Remove.
11281         * config/i386/mingw32.h (MD_UNWIND_SUPPORT): Remove.
11282         * config/ia64/linux.h (MD_UNWIND_SUPPORT): Remove.
11283         * config/ia64/vms.h (MD_UNWIND_SUPPORT): Remove.
11284         * config/m68k/linux.h (MD_UNWIND_SUPPORT): Remove.
11285         * config/mips/linux.h (MD_UNWIND_SUPPORT): Remove.
11286         * config/pa/pa-hpux.h (MD_UNWIND_SUPPORT): Remove.
11287         * config/pa/pa32-linux.h (MD_UNWIND_SUPPORT): Remove.
11288         * config/rs6000/darwin.h (MD_UNWIND_SUPPORT): Remove.
11289         * config/rs6000/linux.h (MD_UNWIND_SUPPORT): Remove.
11290         * config/rs6000/linux64.h (MD_UNWIND_SUPPORT): Remove.
11291         * config/s390/linux.h (MD_UNWIND_SUPPORT): Remove.
11292         * config/s390/tpf.h (MD_UNWIND_SUPPORT): Remove.
11293         * config/sh/linux.h (MD_UNWIND_SUPPORT): Remove.
11294         * config/sparc/linux.h (MD_UNWIND_SUPPORT): Remove.
11295         * config/sparc/linux64.h (MD_UNWIND_SUPPORT): Remove.
11296         * config/sparc/sol2.h (MD_UNWIND_SUPPORT): Remove.
11297         * config/xtensa/linux.h (MD_UNWIND_SUPPORT): Remove.
11298         * config/alpha/linux-unwind.h: Move to ../libgcc/config/alpha.
11299         * config/alpha/osf5-unwind.h: Move to ../libgcc/config/alpha.
11300         * config/alpha/vms-unwind.h: Move to ../libgcc/config/alpha.
11301         * config/bfin/linux-unwind.h: Move to ../libgcc/config/bfin.
11302         * config/i386/linux-unwind.h: Move to ../libgcc/config/i386.
11303         * config/i386/sol2-unwind.h: Move to ../libgcc/config/i386.
11304         * config/i386/w32-unwind.h: Move to ../libgcc/config/i386.
11305         * config/ia64/linux-unwind.h: Move to ../libgcc/config/ia64.
11306         * config/ia64/vms-unwind.h: Move to ../libgcc/config/ia64.
11307         * config/m68k/linux-unwind.h: Move to ../libgcc/config/m68k.
11308         * config/mips/linux-unwind.h: Move to ../libgcc/config/mips.
11309         * config/pa/hpux-unwind.h: Move to ../libgcc/config/pa.
11310         * config/pa/linux-unwind.h: Move to ../libgcc/config/pa.
11311         * config/rs6000/darwin-unwind.h: Move to ../libgcc/config/rs6000.
11312         * config/rs6000/linux-unwind.h: Move to ../libgcc/config/rs6000.
11313         * config/s390/linux-unwind.h: Move to ../libgcc/config/s390.
11314         * config/s390/tpf-unwind.h: Move to ../libgcc/config/s390.
11315         * config/sh/linux-unwind.h: Move to ../libgcc/config/sh.
11316         * config/sparc/linux-unwind.h: Move to ../libgcc/config/sparc.
11317         * config/sparc/sol2-unwind.h: Move to ../libgcc/config/sparc.
11318         * config/xtensa/linux-unwind.h: Move to ../libgcc/config/xtensa.
11319         * config/darwin9.h (DARWIN_LIBSYSTEM_HAS_UNWIND): Remove.
11320         * system.h (MD_UNWIND_SUPPORT): Poison.
11321         * doc/tm.texi.in (Exception Handling, MD_UNWIND_SUPPORT): Remove.
11322         * doc/tm.texi: Regenerate.
11323         * unwind-dw2.c: Include md-unwind-support.h instead of
11324         MD_UNWIND_SUPPORT.
11325         * config/ia64/unwind-ia64.c: Likewise.
11326         * config/xtensa/unwind-dw2-xtensa.c: Likewise.
11327
11328 2011-06-03  Jack Howarth  <howarth@bromo.med.uc.edu>
11329
11330         * varpool.c (varpool_extra_name_alias): Return NULL, not false.
11331
11332 2011-06-03  Richard Henderson  <rth@redhat.com>
11333             Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
11334
11335         * config/i386/crtfastmath.c [!__x86_64__ && __sun__ && __svr4__]
11336         (sigill_hdlr): Correct insn, insn size.
11337         (set_fast_math) [!__x86_64__ && __sun__ && __svr4__]: Use movaps.
11338
11339 2011-06-03  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
11340
11341         * config.gcc (mips-sgi-irix6.5*): Set tmake_file to mips/t-irix6
11342         t-slibgcc-dummy.
11343         * config/mips/irix-crti.asm: Move to ../libgcc/config/mips/irix-crti.S.
11344         * config/mips/irix-crtn.asm: Move to ../libgcc/config/mips/irix-crtn.S.
11345         * config/mips/t-iris: Remove.
11346         * config/mips/t-irix6: New file.
11347         * config/mips/t-slibgcc-irix: Move to ../libgcc/config/mips.
11348
11349 2011-06-03  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
11350
11351         * Makefile.in (LIB2ADDEHDEP): Remove.
11352         * config/arm/t-bpabi (LIB2ADDEHDEP): Remove.
11353         * config/arm/t-symbian (LIB2ADDEHDEP): Remove.
11354         * config/picochip/t-picochip (LIB2ADDEHDEP): Remove.
11355         * config/t-darwin (LIB2ADDEHDEP): Remove.
11356         * config/t-freebsd (LIB2ADDEHDEP): Remove.
11357         * config/t-linux (LIB2ADDEHDEP): Remove.
11358
11359 2011-06-03  Diego Novillo  <dnovillo@google.com>
11360
11361         * lto-streamer-in.c (get_resolution): Move to lto/lto.c.
11362         (lto_register_var_decl_in_symtab): Likewise.
11363         (lto_register_function_decl_in_symtab): Likewise.
11364         (lto_read_tree): Move VAR_DECL and FUNCTION_DECL registration
11365         logic to uniquify_nodes.
11366
11367 2011-06-03  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
11368
11369         * config/alpha/t-osf5: Remove.
11370         * config/alpha/t-osf-pthread: Remove.
11371         * config.gcc (alpha*-dec-osf5.1*): Set tmake_file to t-slibgcc-dummy.
11372         * mkmap-flat.awk: Handle osf_export for Tru64 UNIX linker -input file.
11373
11374 2011-06-03  Julian Brown  <julian@codesourcery.com>
11375
11376         * config/arm/arm-cores.def (strongarm, strongarm110, strongarm1100)
11377         (strongarm1110): Use strongarm tuning.
11378         * config/arm/arm-protos.h (tune_params): Add max_insns_skipped field.
11379         * config/arm/arm.c (arm_strongarm_tune): New.
11380         (arm_slowmul_tune, arm_fastmul_tune, arm_xscale_tune, arm_9e_tune)
11381         (arm_v6t2_tune, arm_cortex_tune, arm_cortex_a5_tune)
11382         (arm_cortex_a9_tune, arm_fa726te_tune): Add max_insns_skipped field
11383         setting, using previous defaults or 1 for Cortex-A5.
11384         (arm_option_override): Set max_insns_skipped from current tuning.
11385
11386 2011-06-03  Nathan Sidwell  <nathan@codesourcery.com>
11387
11388         * doc/install.texi (Options specification): Document --with-specs.
11389
11390 2011-06-02  Ramana Radhakrishnan  <ramana.radhakrishnan@linaro.org>
11391
11392         * config/arm/neon.md (orndi3_neon): Actually split it.
11393
11394 2011-06-02  Alexandre Oliva  <aoliva@redhat.com>
11395
11396         * params.def (PARAM_MAX_VARTRACK_EXPR_DEPTH): Bump default to 10.
11397         * var-tracking.c (reverse_op): Limite recurse depth to 5.
11398
11399 2011-06-02  Alexandre Oliva  <aoliva@redhat.com>
11400
11401         PR debug/47590
11402         * target.def (delay_sched2, delay_vartrack): New.
11403         * doc/tm.texi.in: Update.
11404         * doc/tm.texi: Rebuild.
11405         * sched-rgn.c (gate_handle_sched2): Fail if delay_sched2.
11406         * var-tracking.c (gate_handle_var_tracking): Likewise.
11407         * config/bfin/bfin.c (bfin_flag_schedule_insns2): Drop.
11408         (bfin_flag_var_tracking): Drop.
11409         (output_file_start): Don't save and override flag_var_tracking.
11410         (bfin_option_override): Ditto flag_schedule_insns_after_reload.
11411         (bfin_reorg): Test original variables.
11412         (TARGET_DELAY_SCHED2, TARGET_DELAY_VARTRACK): Define.
11413         * config/ia64/ia64.c (ia64_flag_schedule_insns2): Drop.
11414         (ia64_flag_var_tracking): Drop.
11415         (TARGET_DELAY_SCHED2, TARGET_DELAY_VARTRACK): Define.
11416         (ia64_file_start): Don't save and override flag_var_tracking.
11417         (ia64_override_options_after_change): Ditto
11418         flag_schedule_insns_after_reload.
11419         (ia64_reorg): Test original variables.
11420         * config/picochip/picochip.c (picochip_flag_schedule_insns2): Drop.
11421         (picochip_flag_var_tracking): Drop.
11422         (TARGET_DELAY_SCHED2, TARGET_DELAY_VARTRACK): Define.
11423         (picochip_option_override): Don't save and override
11424         flag_schedule_insns_after_reload.
11425         (picochip_asm_file_start): Ditto flag_var_tracking.
11426         (picochip_reorg): Test original variables.
11427         * config/spu/spu.c (spu_flag_var_tracking): Drop.
11428         (TARGET_DELAY_VARTRACK): Define.
11429         (spu_var_tracking): New.
11430         (spu_machine_dependent_reorg): Call it.
11431         (asm_file_start): Don't save and override flag_var_tracking.
11432
11433 2011-06-02  Kaz Kojima  <kkojima@gcc.gnu.org>
11434
11435         PR target/49163
11436         * config/sh/predicates.md (general_movsrc_operand): Return 0
11437         for memory and memory subreg of which address is an invalid
11438         indexed address for QI and HImode.
11439         (general_movdst_operand): Likewise.
11440
11441 2011-06-02  Eric Botcazou  <ebotcazou@adacore.com>
11442
11443         * cse.c (cse_find_path): Refine change to exclude EDGE_ABNORMAL_CALL
11444         edges only, when there is a non-local label in the function.
11445         * postreload-gcse.c (bb_has_well_behaved_predecessors): Likewise.
11446
11447 2011-06-02  Uros Bizjak  <ubizjak@gmail.com>
11448
11449         * config/i386/constraints.md (Y3): New register constraint.
11450         * config/i386/sse.md (*vec_interleave_highv2df): Merge with
11451         *sse3_interleave_highv2df and *sse2_interleave_highv2df.
11452         (*vec_interleave_lowv2df): Merge with *sse3_interleave_lowv2df and
11453         *sse2_interleave_lowv2df.
11454
11455 2011-06-02  Julian Brown  <julian@codesourcery.com>
11456
11457         * config/arm/arm-cores.def (cortex-a5): Use cortex_a5 tuning.
11458         * config/arm/arm.c (arm_cortex_a5_branch_cost): New.
11459         (arm_cortex_a5_tune): New.
11460
11461 2011-06-02  Julian Brown  <julian@codesourcery.com>
11462
11463         * config/arm/arm-protos.h (tune_params): Add branch_cost hook.
11464         * config/arm/arm.c (arm_default_branch_cost): New.
11465         (arm_slowmul_tune, arm_fastmul_tune, arm_xscale_tune, arm_9e_tune)
11466         (arm_v6t2_tune, arm_cortex_tune, arm_cortex_a9_tune)
11467         (arm_fa726_tune): Set branch_cost field using
11468         arm_default_branch_cost.
11469         * config/arm/arm.h (BRANCH_COST): Use branch_cost hook from
11470         current_tune structure.
11471         * dojump.c (tm_p.h): Include file.
11472
11473 2011-06-02  Julian Brown  <julian@codesourcery.com>
11474
11475         * config/arm/arm-cores.def (arm1156t2-s, arm1156t2f-s): Use v6t2
11476         tuning.
11477         (cortex-a5, cortex-a8, cortex-a15, cortex-r4, cortex-r4f, cortex-m4)
11478         (cortex-m3, cortex-m1, cortex-m0): Use cortex tuning.
11479         * config/arm/arm-protos.h (tune_params): Add prefer_constant_pool
11480         field.
11481         * config/arm/arm.c (arm_slowmul_tune, arm_fastmul_tune)
11482         (arm_xscale_tune, arm_9e_tune, arm_cortex_a9_tune)
11483         (arm_fa726te_tune): Add prefer_constant_pool setting.
11484         (arm_v6t2_tune, arm_cortex_tune): New.
11485         * config/arm/arm.h (TARGET_USE_MOVT): Make dependent on
11486         prefer_constant_pool setting.
11487
11488 2011-06-02  Uros Bizjak  <ubizjak@gmail.com>
11489
11490         * config/i386/i386.c (standard_sse_constant_p) <case 1>: Simplify
11491         switch statement.
11492         * config/i386/i386.md (*movdf_internal_rex64) <case 8,9,10>: Ditto.
11493         (*movdf_internal) <case 6,7,8>: Ditto.
11494
11495         * config/i386/constraints.md (Y4): New register constraint.
11496         * config/i386/sse.md (vec_set<mode>_0): Merge with
11497         *vec_set<mode>_0_sse4_1 and *vec_set<mode>_0_sse2.
11498         (*vec_extractv2di_1): Merge from *vec_extractv2di_1_sse2 and
11499         *vec_extractv2di_1_sse.
11500         (*vec_concatv2di_rex64): Merge from *vec_concatv2di_rex64_sse4_1
11501         and *vec_concatv2di_rex64_sse.
11502
11503 2011-06-02  Stuart Henderson  <shenders@gcc.gnu.org>
11504
11505         PR target/48807
11506         * config/bfin/bfin.c (bfin_function_ok_for_sibcall): Check return value
11507         of cgraph_local_info for null before attempting to use it.
11508
11509 2011-06-02  Eric Botcazou  <ebotcazou@adacore.com>
11510
11511         * function.h (struct stack_usage): Remove dynamic_alloc_count field.
11512         (current_function_dynamic_alloc_count): Delete.
11513         * builtins.c (expand_builtin_setjmp_setup): Do not set calls_setjmp.
11514         (expand_builtin_nonlocal_goto): Remove obsolete comment.
11515         (expand_builtin_update_setjmp_buf): Remove dead code.
11516         * cse.c (cse_find_path): Do not follow a single abnormal incoming edge.
11517         * explow.c (allocate_dynamic_stack_space): Remove SETJMP_VIA_SAVE_AREA
11518         support.
11519         * function.c (instantiate_virtual_regs): Likewise.
11520         * postreload-gcse.c (bb_has_well_behaved_predecessors): Return false
11521         for a block with a single abnormal incoming edge.
11522         * config/sparc/sparc.h (STACK_SAVEAREA_MODE): Define.
11523         (SETJMP_VIA_SAVE_AREA): Delete.
11524         * config/sparc/sparc-protos.h (load_got_register): Declare.
11525         * config/sparc/sparc.c (TARGET_BUILTIN_SETJMP_FRAME_VALUE): Define.
11526         (load_got_register): Make global.
11527         (sparc_frame_pointer_required): Add 'static'.
11528         (sparc_can_eliminate): Likewise.  Call sparc_frame_pointer_required.
11529         (sparc_builtin_setjmp_frame_value): New function.
11530         * config/sparc/sparc.md (UNSPECV_SETJMP): Remove.
11531         (save_stack_nonlocal): New expander.
11532         (restore_stack_nonlocal): Likewise.
11533         (nonlocal_goto): Remove modes, adjust predicates and reimplement.
11534         (nonlocal_goto_internal): New insn.
11535         (goto_handler_and_restore): Delete.
11536         (builtin_setjmp_setup): Likewise.
11537         (do_builtin_setjmp_setup): Likewise.
11538         (setjmp): Likewise.
11539         (builtin_setjmp_receiver): New expander.
11540
11541 2011-06-01  David Li  <davidxl@google.com>
11542
11543         PR middle-end/49261
11544         * tree-pretty-print.c (dump_function_header): Format cleanup.
11545
11546 2011-06-01  Kaz Kojima  <kkojima@gcc.gnu.org>
11547
11548         PR target/49238
11549         * config/sh/sh.c (expand_cbranchdi4): Use a scratch register if
11550         needed when original operands are used for msw_skip comparison.
11551
11552 2011-06-01  Jakub Jelinek  <jakub@redhat.com>
11553
11554         PR debug/49250
11555         * var-tracking.c (add_uses, add_stores): Don't call
11556         cselib_subst_to_values on ENTRY_VALUE.
11557
11558 2011-06-01  Diego Novillo  <dnovillo@google.com>
11559
11560         * lto-streamer-out.c (lto_output_ts_decl_with_vis_tree_pointers): Call
11561         output_record_start with LTO_null instead of output_zero.
11562         (lto_output_ts_binfo_tree_pointers): Likewise.
11563         (lto_output_tree): Likewise.
11564         (output_eh_try_list): Likewise.
11565         (output_eh_region): Likewise.
11566         (output_eh_lp): Likewise.
11567         (output_eh_regions): Likewise.
11568         (output_bb): Likewise.
11569         (output_function): Likewise.
11570         (output_unreferenced_globals): Likewise.
11571         * lto-streamer.h (enum LTO_tags): Reserve MAX_TREE_CODES
11572         instead of NUM_TREE_CODES.
11573         (lto_tag_is_tree_code_p): Check max value against MAX_TREE_CODES.
11574         (lto_output_int_in_range): Change << to >> when shifting VAL.
11575
11576 2011-06-01  Diego Novillo  <dnovillo@google.com>
11577
11578         * lto-streamer-out.c (lto_output_ts_decl_non_common_tree_pointers):
11579         Remove assertion for DECL_SAVED_TREE in FUNCTION_DECL nodes.
11580
11581 2011-06-01  Richard Sandiford  <rdsandiford@googlemail.com>
11582
11583         PR target/45074
11584         * optabs.h (valid_multiword_target_p): Declare.
11585         * expmed.c (extract_bit_field_1): Check valid_multiword_target_p when
11586         doing multi-word operations.
11587         * optabs.c (expand_binop): Likewise.
11588         (expand_doubleword_bswap): Likewise.
11589         (expand_absneg_bit): Likewise.
11590         (expand_unop): Likewise.
11591         (expand_copysign_bit): Likewise.
11592         (multiword_target_p): New function.
11593
11594 2011-06-01  Richard Sandiford  <rdsandiford@googlemail.com>
11595
11596         PR rtl-optimization/48830
11597         PR rtl-optimization/48808
11598         PR rtl-optimization/48792
11599         * reload.c (push_reload): Check contains_reg_of_mode.
11600         * reload1.c (strip_paradoxical_subreg): New function.
11601         (gen_reload_chain_without_interm_reg_p): Use it to handle
11602         paradoxical subregs.
11603         (emit_output_reload_insns, gen_reload): Likewise.
11604
11605 2011-06-01  David Li  <davidxl@google.com>
11606
11607         * predict.c : Change pass name
11608         * ipa.c: Ditto.
11609         * dce.c: Ditto.
11610         * tree-profile.c: Ditto.
11611         * except.c: Ditto.
11612
11613 2011-06-01  David Li  <davidxl@google.com>
11614
11615         * tree-pretty-print.c (dump_function_header): New function.
11616         * final.c (rest_of_clean_state): Use header dumper.
11617         * tree-cfg.c (gimple_dump_cfg): Use header dumper.
11618         * passes.c (pass_init_dump_file): Use header dumper.
11619
11620 2011-06-01  Jakub Jelinek  <jakub@redhat.com>
11621
11622         * dwarf2out.c (compare_loc_descriptor, scompare_loc_descriptor,
11623         ucompare_loc_descriptor, minmax_loc_descriptor, clz_loc_descriptor,
11624         popcount_loc_descriptor, bswap_loc_descriptor, rotate_loc_descriptor):
11625         New functions.
11626         (mem_loc_descriptor): Use them.
11627
11628         * var-tracking.c (create_entry_value): New function.
11629         (vt_add_function_parameter): Use it.
11630
11631 2011-06-01  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
11632
11633         * config/i386/crtfastmath.c [!__x86_64__ && __sun__ && __svr4__]:
11634         Include <signal.h>, <ucontext.h>.
11635         (sigill_caught): Define.
11636         (sigill_hdlr): New function.
11637         (set_fast_math) [!__x86_64__ && __sun__ && __svr4__]: Check if SSE
11638         insns can be executed.
11639         * config/sol2.h (ENDFILE_SPEC): Use crtfastmath.o if -ffast-math etc.
11640         * config/sparc/sol2.h (ENDFILE_SPEC): Remove.
11641
11642 2011-06-01  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
11643
11644         * config/t-slibgcc-darwin: Move to ...
11645         * config/t-slibgcc-dummy: ... this.  Clarify comments.
11646         * config.gcc (i[34567]86-*-darwin*, x86_64-*-darwin*,
11647         powerpc-*-darwin*, powerpc64-*-darwin*): Reflect this.
11648         (i[3456x]86-*-netware*): Add t-slibgcc-dummy to tmake_file.
11649         (i[34567]86-*-rtems*): Remove extra_parts.  Use i386/t-rtems.
11650         Remove i386/t-crtstuff from tmake_file.
11651         (i[34567]86-*-solaris2*): Remove t-svr4,
11652         t-slibgcc-elf-ver, t-slibgcc-sld from tmake_file, add
11653         t-slibgcc-dummy.
11654         (sparc-*-elf*, sparc64-*-elf*): Remove tmake_file, extra_parts.
11655         (sparc-*-rtems*, sparc64-*-rtems*): Remove sparc/t-crtin,
11656         sparc/t-crtfm from tmake_file.
11657         (sparc*-*-solaris2*): Remove sparc/t-sol2, sparc/t-crtfm,
11658         t-slibgcc-elf-ver, t-slibgcc-sld, add t-slibgcc-dummy.
11659         Remove extra_parts.
11660         * config/t-sol2 (TARGET_LIBGCC2_CFLAGS): Define.
11661         * config/i386/t-nwld (SHLIB_LINK): Remove.
11662         * config/i386/t-rtems-i386: Rename to ...
11663         * config/i386/t-rtems: ... this.
11664         ($(T)crti.o, $(T)crtn.o): Remove.
11665         (FPBIT, DPBIT, LIB2FUNCS_EXTRA): Remove.
11666         (dp-bit.c, fp-bit.c, xp-bit.c): Remove.
11667         (EXTRA_MULTILIB_PARTS, LIBGCC, INSTALL_LIBGCC): Remove.
11668         * config/i386/t-sol2-10 (LIBGCC, INSTALL_LIBGCC,
11669         EXTRA_MULTILIB_PARTS): Remove.
11670         * config/sparc/t-sol2-64: Likewise.
11671         * config/sparc/t-sol2: Remove.
11672         * config/sparc/t-crtin: Remove.
11673         * config/sparc/gmon-sol2.c: Move to ../libgcc/config.
11674         * config/i386/gmon-sol2.c: Remove.
11675         * config/i386/sol2-c1.asm: Move to ../libgcc/config/i386/sol2-c1.S.
11676         * config/i386/sol2-ci.asm: Move to ../libgcc/config/i386/sol2-ci.S.
11677         * config/i386/sol2-cn.asm: Move to ../libgcc/config/i386/sol2-cn.S.
11678         * config/i386/sol2-gc1.asm: Remove.
11679         * config/sparc/sol2-c1.asm: Move to ../libgcc/config/sparc/sol2-c1.S.
11680         * config/sparc/sol2-ci.asm: Move to ../libgcc/config/sparc/sol2-ci.S.
11681         * config/sparc/sol2-cn.asm: Move to ../libgcc/config/sparc/sol2-cn.S.
11682         * config/t-slibgcc-sld: Remove.
11683
11684 2011-06-01  Jakub Jelinek  <jakub@redhat.com>
11685
11686         * dwarf2out.c (mem_loc_descriptor) <do_ucompare>: Call
11687         base_type_for_mode with op_mode instead of mode.
11688
11689 2011-06-01  Paul Brook  <paul@cpodesourcery.com>
11690
11691         * config/arm/arm-cores.def: Add cortex-r5.  Add DIV flags to
11692         Cortex-A15.
11693         * config/arm/arm-tune.md: Regenerate.
11694         * config/arm/arm-tables.opt: Regenerate.
11695         * config/arm/arm.c (FL_DIV): Rename...
11696         (FL_THUMB_DIV): ... to this.
11697         (FL_ARM_DIV): Define.
11698         (FL_FOR_ARCH7R, FL_FOR_ARCH7M): Use FL_THUMB_DIV.
11699         (arm_arch_hwdiv): Remove.
11700         (arm_arch_thumb_hwdiv, arm_arch_arm_hwdiv): New variables.
11701         (arm_issue_rate): Add cortexr5.
11702         * config/arm/arm.h (TARGET_CPU_CPP_BUILTINS): Set
11703         __ARM_ARCH_EXT_IDIV__.
11704         (TARGET_IDIV): Define.
11705         (arm_arch_hwdiv): Remove.
11706         (arm_arch_arm_hwdiv, arm_arch_thumb_hwdiv): New prototypes.
11707         * config/arm/arm.md (tune_cortexr4): Add cortexr5.
11708         (divsi3, udivsi3): New patterns.
11709         * config/arm/thumb2.md (divsi3, udivsi3): Remove.
11710         * doc/invoke.texi: Document ARM -mcpu=cortex-r5
11711
11712 2011-06-01  Martin Jambor  <mjambor@suse.cz>
11713
11714         * ipa-utils.c (ipa_dfs_info): New field scc_no.
11715         * ipa-utils.c (searchc): Set scc_no.
11716
11717 2011-06-01  Martin Jambor  <mjambor@suse.cz>
11718
11719         * ipa-utils.c (searchc_env): New field allow_overwritable.
11720         (searchc): do not ignore edges to overwritable nodes if indicated
11721         by env->allow_overwritable.
11722         (ipa_reduced_postorder): Set env.allow_overwritable.
11723
11724 2011-06-01  Richard Guenther  <rguenther@suse.de>
11725
11726         * tree.c (free_lang_data): Do not reset boolean_type_node nor
11727         char_type_node.
11728         * lto-streamer.c (lto_record_common_node): Take node pointer,
11729         do not register types.
11730         (lto_preload_common_nodes): Explicitly skip preloading nodes
11731         that differ between frontends.
11732
11733 2011-05-31  Pat Haugen  <pthaugen@us.ibm.com>
11734
11735         * config/rs6000/rs6000.h (REG_CLASS_CONTENTS): Remove vr0..vr2 from
11736         NON_FLOAT_REGS.
11737
11738 2011-05-31  Pat Haugen  <pthaugen@us.ibm.com>
11739
11740         * config/rs6000/rs6000.c (rs6000_register_move_cost): Preserve from
11741         parameter value for dump. Dump cost on outermost call only.
11742         (rs6000_memory_move_cost): Dump cost on outermost call only.
11743
11744 2011-05-31  Jakub Jelinek  <jakub@redhat.com>
11745
11746         * dwarf2out.c (resolve_addr_in_expr): Optimize away redundant
11747         DW_OP_GNU_convert ops.
11748
11749         * cselib.c (promote_debug_loc): Allow l->next non-NULL for
11750         cselib_preserve_constants.
11751         (cselib_lookup_1): If cselib_preserve_constants,
11752         a new VALUE is being created for REG and there is a VALUE for the
11753         same register in wider mode, add another loc with lowpart SUBREG of
11754         the wider VALUE.
11755         (cselib_subst_to_values): Handle ENTRY_VALUE.
11756         * var-tracking.c  (replace_expr_with_values): Return NULL for
11757         ENTRY_VALUE too.
11758         * dwarf2out.c (convert_descriptor_to_signed): New function.
11759         (mem_loc_descriptor) <case ZERO_EXTEND>: Optimize using DW_OP_and
11760         instead of two shifts.
11761         (mem_loc_descriptor) <do_shift>: ZERO_EXTEND second argument to
11762         the right mode if needed.
11763         (mem_loc_descriptor) <case MOD>: For typed ops just use DW_OP_mod.
11764         (mem_loc_descriptor) <case UNSIGNED_FIX>: Use
11765         convert_descriptor_to_signed.
11766         (mem_loc_descriptor) <case UDIV, CLZ, CTZ, FFS, POPCOUNT, PARITY,
11767         BSWAP, ROTATE, ROTATERT>: Handle these rtls.
11768
11769         PR target/48688
11770         * config/i386/i386.md (*lea_general_4): New define_insn_and_split.
11771
11772 2011-05-31  Uros Bizjak  <ubizjak@gmail.com>
11773
11774         * config/i386/i386.md: Use SWI248x instead of X87MODEI, SWI24 instead
11775         of X87MODEI12 and SWI48x instead of SSEMODEI24.
11776         (SWI248x): New mode iterator, rename from X87MODEI.
11777         (X87MODEI): Remove mode iterator.
11778         (X87MODEI12): Ditto.
11779         (SSEMODEI24): Ditto.
11780
11781 2011-05-31  Alexandre Oliva  <aoliva@redhat.com>
11782
11783         * params.def (PARAM_MAX_VARTRACK_EXPR_DEPTH): New.
11784         * doc/invoke.texi: Document max-vartrack-expr-depth.
11785         * var-tracking.c (EXPR_DEPTH): New.
11786         (reverse_op, vt_expand_loc, vt_expand_loc_dummy): Use it.
11787
11788 2011-05-31  Alexandre Oliva  <aoliva@redhat.com>
11789
11790         * config/i386/i386.c (ix86_rtx_costs): Drop NEG from sub for FMA.
11791         * config/i386/sse.md: Add n to negated FMA pattern names.
11792
11793 2011-05-31  Alexandre Oliva  <aoliva@redhat.com>
11794
11795         * gcc.c (driver_handle_option): Fix disabling of -fcompare-debug.
11796
11797 2011-05-31  Alexandre Oliva  <aoliva@redhat.com>
11798
11799         * gengtype-state.c (read_state_params_structs): Initialize previous.
11800
11801 2011-05-31  Uros Bizjak  <ubizjak@gmail.com>
11802
11803         * config/i386/i386.md (*pushxf_nointeger): Merge alternatives 1 and 2.
11804         (FP push_operand splitters): Merge {TF,XF,DF}mode splitters.
11805
11806 2011-05-31  Uros Bizjak  <ubizjak@gmail.com>
11807
11808         * config/i386/i386.md (*movtf_internal): Avoid allocating general
11809         registers.  Penalize F*r->o alternative to prevent partial memory
11810         stalls.  Slightly penalize *roF->*r alternative.  Generate SSE
11811         CONST_DOUBLE immediates when optimizing function for size.  Do not move
11812         CONST_DOUBLEs directly to memory for !TARGET_MEMORY_MISMATCH_STALL.
11813         (*movxf_internal): Slightly penalize Yx*roF->Yx*r alternative.
11814         (*movdf_internal): Slightly penalize Yd*roF->Yd*r alternative.
11815         (*movdf_internal_rex64): Slightly penalize rm->r, F->m and r->m
11816         alternatives.
11817         (*movsf_internal): Slightly penalize rmF->r and Fr->m alternatives.
11818
11819         (fp_register_operand splitters): Use fp_register_operand
11820         constraint.  Do not use FP_REG_P in insn condition.
11821         (any_fp_register_operand splitters): Use any_fp_register_operand
11822         constraint.  Do not use ANY_FP_REG_P in insn condition.
11823
11824 2011-05-31  Jan Hubicka  <jh@suse.cz>
11825
11826         * cgraph.h (cgraph_inline_failed_t): Give enum a name
11827         * lto-cgraph.c (LDPR_NUM_KNOWN): New macro.
11828         (LTO_cgraph_tags): Add LTO_cgraph_last_tag.
11829         (lto_output_edge): Use output_enum and var_len_unsigned.
11830         (lto_output_varpool_node): Likewise.
11831         (input_overwrite_node): Do not take resolution parameter;
11832         extract it from a bitpack.
11833         (input_node): Do not read resolution; use input_enum and
11834         var_len_unsigned.
11835         (input_varpool_node): Likewise.
11836         (input_edge): Likewise.
11837         (input_cgraph_1): Likewise.
11838
11839 2011-05-31  Richard Guenther  <rguenther@suse.de>
11840
11841         * gimple.c (gimple_register_canonical_type): Do not register
11842         any types via gimple_register_type.
11843
11844 2011-05-31  Jan Hubicka  <jh@suse.cz>
11845
11846         * lto-symtab.c (lto_symtab_merge_cgraph_nodes): Merge alias decl
11847         of thunks.
11848
11849 2011-05-31  Jakub Jelinek  <jakub@redhat.com>
11850
11851         PR rtl-optimization/49235
11852         * tree-ssa-address.c (gen_addr_rtx): Ignore base if it is const0_rtx.
11853         (create_mem_ref_raw): Create MEM_REF even if base is INTEGER_CST.
11854
11855 2011-05-31  Ira Rosen  <ira.rosen@linaro.org>
11856
11857         PR tree-optimization/49093
11858         * tree-vect-data-refs.c (vect_analyze_data_refs): Fail for volatile
11859         data references.
11860
11861 2011-05-31  Dodji Seketeli  <dodji@redhat.com>
11862
11863         PR debug/49047
11864         * dwarf2out.c (gen_subprogram_die): Emit linkage name attribute
11865         for concrete functions containing the code of cloned functions.
11866
11867 2011-05-31  Richard Guenther  <rguenther@suse.de>
11868
11869         * tree-ssa-forwprop.c (forward_propagate_into_comparison): Rename
11870         to ...
11871         (forward_propagate_into_comparison_1): ... this.
11872         (forward_propagate_comparison): Rename to ...
11873         (forward_propagate_into_comparison): ... this.  Split out
11874         real forward propagation code to ...
11875         (forward_propagate_comparison): ... this.
11876         (forward_propagate_into_gimple_cond): Remove looping.
11877         (forward_propagate_into_cond): Likewise.
11878         (simplify_not_neg_expr): Return whether we have done something.
11879         (simplify_gimple_switch): Likewise.
11880         (tree_ssa_forward_propagate_single_use_vars): Rename to ...
11881         (ssa_forward_propagate_and_combine): ... this.  Re-structure
11882         to do a forward forward-propagation walk on BBs and a backward
11883         stmt combining walk on BBs.  Consistently re-scan changed statements.
11884         (pass_forwprop): Adjust.
11885
11886 2011-05-30  Ian Lance Taylor  <iant@google.com>
11887
11888         * godump.c (go_format_type): Correct length of name added to
11889         obstack for anonymous field.
11890
11891 2011-05-30  Kaz Kojima  <kkojima@gcc.gnu.org>
11892
11893         PR target/49186
11894         * config/sh/sh.c (expand_cbranchdi4): Set msw_skip when the high
11895         part of the second operand is 0.
11896
11897 2011-05-30  Uros Bizjak  <ubizjak@gmail.com>
11898
11899         * config/i386/i386.md (*movxf_internal): Penalize FYx*r->o alternative
11900         to prevent partial memory stalls.  Do not move CONST_DOUBLEs directly
11901         to memory for !TARGET_MEMORY_MISMATCH_STALL.
11902         (*movdf_internal_rex64): Do not penalize F->r alternative.
11903         (*movdf_internal): Penalize FYd*r->o alternative to prevent partial
11904         memory stalls.  Generate SSE and x87 CONST_DOUBLE immediates only
11905         when optimizing function for size.  Do not move CONST_DOUBLEs
11906         directly to memory for !TARGET_MEMORY_MISMATCH_STALL.
11907         (FP move splitters): Merge {TF,XF,DF}mode splitters.  Do not handle
11908         SUBREGs.  Do not check for MEM_P operands in the insn condition,
11909         check for ANY_FP_REGNO_P instead.
11910         * config/i386/constraints.md (Yd): Enable GENERAL_REGS for
11911         TARGET_64BIT and for TARGET_INTEGER_DFMODE_MOVES when optimizing
11912         function for speed.
11913         * config/i386/i386.c (ix86_option_override_internal): Do not
11914         set TARGET_INTEGER_DFMODE_MOVES here.
11915
11916 2011-05-30  H.J. Lu  <hongjiu.lu@intel.com>
11917
11918         PR target/49168
11919         * config/i386/i386.md (*movtf_internal): Handle misaligned load/store.
11920
11921 2011-05-30  Jakub Jelinek  <jakub@redhat.com>
11922
11923         * dwarf2out.c (modified_type_die, gen_reference_type_die): Use
11924         DW_TAG_rvalue_reference_type even for
11925         -gdwarf-4 -fno-debug-types-section.
11926
11927 2011-05-30  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
11928
11929         PR tree-optimization/46728
11930         * tree-ssa-math-opts.c (build_and_insert_call): Reorder parms.
11931         (build_and_insert_binop): New.
11932         (gimple_expand_builtin_pow): Reorder args for
11933         build_and_insert_call; use build_and_insert_binop; add more
11934         optimizations for fractional exponents.
11935
11936 2011-05-30  Nathan Froyd  <froydnj@gcc.gnu.org>
11937
11938         PR bootstrap/49190
11939
11940         Revert:
11941         2011-05-26  Nathan Froyd  <froydnj@codesourcery.com>
11942
11943         * tree.h (struct tree_identifier): Inherit from tree_typed, not
11944         tree_common.
11945         (HT_IDENT_TO_GCC_IDENT): Adjust for said change.
11946         * tree.c (initialize_tree_contains_struct): Mark TS_IDENTIFIER as
11947         TS_BASE instead of TS_COMMON.
11948         * varasm.c (assemble_name): Remove assert.
11949
11950 2011-05-30  Richard Sandiford  <rdsandiford@googlemail.com>
11951
11952         * config.gcc: Keep obselete list sorted.
11953
11954 2011-05-30  Jakub Jelinek  <jakub@redhat.com>
11955             Eric Botcazou  <ebotcazou@adacore.com>
11956
11957         * var-tracking.c (vt_add_function_parameter): Remap incoming MEMs with
11958         crtl->args.internal_arg_pointer based address to arg_pointer_rtx if
11959         there is a DRAP register and arg_pointer_rtx is the CFA pointer.
11960         (vt_init_cfa_base): Don't equate cfa_base_rtx if stack was realigned.
11961         (vt_initialize): Initialize cfa_base_rtx if there is a DRAP register.
11962
11963 2011-05-30  Richard Guenther  <rguenther@suse.de>
11964
11965         * gimple.c (gimple_types_compatible_p_1): Compare record
11966         and union type members properly.
11967
11968 2011-05-30  Richard Guenther  <rguenther@suse.de>
11969
11970         PR tree-optimization/49210
11971         * ipa-split.c (split_function): Care for the case where the call
11972         result is not trivially convertible to the result holding variable.
11973
11974 2011-05-30  Richard Guenther  <rguenther@suse.de>
11975
11976         PR tree-optimization/49218
11977         * tree-vrp.c (adjust_range_with_scev): Properly check whether
11978         overflow occured.
11979
11980 2011-05-30  Richard Guenther  <rguenther@suse.de>
11981
11982         * tree-ssa-forwprop.c (forward_propagate_into_comparison):
11983         New function split out from ...
11984         (forward_propagate_into_gimple_cond): ... here.  Adjust.
11985         (forward_propagate_into_cond): Likewise.
11986         (forward_propagate_comparison): Also propagate into
11987         comparisons on assignment RHS.  Change return value to
11988         behave similar to forward_propagate_into_cond.
11989         (tree_ssa_forward_propagate_single_use_vars): Handle
11990         strict-overflow warnings properly for forward_propagate_comparison.
11991
11992 2011-05-30  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
11993
11994         * configure.ac (gcc_cv_lto_plugin): Determine lto plugin support
11995         from plugin linker.
11996         * configure: Regenerate.
11997
11998 2011-05-30  Ira Rosen  <ira.rosen@linaro.org>
11999
12000         PR tree-optimization/49199
12001         * tree-vect-loop.c (vect_is_slp_reduction): Check that the
12002         non-reduction operands are either defined in the loop or by induction.
12003
12004 2011-05-29  Xinliang David Li  <davidxl@google.com>
12005
12006         * opts-global.c (handle_common_deferred_options): Handle new options.
12007         * passes.c (register_one_dump_file): Call register_pass_name.
12008         (execute_one_pass): Check explicit enable/disable flag.
12009         (passr_hash): New function.
12010         (passr_eq): Ditto.
12011         (register_pass_name): Ditto.
12012         (get_pass_by_name): Ditto.
12013         (pass_hash): Ditto.
12014         (pass_eq): Ditto.
12015         (enable_pass): Ditto.
12016         (disable_pass): Ditto.
12017         (is_pass_explicitly_enabled_or_disabled): Ditto.
12018
12019 2011-05-29  Uros Bizjak  <ubizjak@gmail.com>
12020
12021         * config/i386/i386.md (*movoi_internal_avx): Use
12022         standard_sse_constant_opcode for alternative 0.
12023         (*movti_internal_sse): Ditto.
12024         (*movti_internal_rex64): Use standard_sse_constant_opcode for
12025         alternative 2.
12026         (*movdi_internal_rex64): Use standard_sse_constant_opcode for
12027         sselog1 type moves.
12028         (*movsi_internal): Ditto.
12029         (*movdi_internal): Ditto.  Add ssecvt type moves.
12030
12031 2011-05-29  Eric Botcazou  <ebotcazou@adacore.com>
12032
12033         PR target/48830
12034         * rtlanal.c (simplify_subreg_regno): Adjust comment.
12035
12036 2011-05-29  Jakub Jelinek  <jakub@redhat.com>
12037
12038         PR rtl-optimization/49095
12039         * config/i386/predicates.md (plusminuslogic_operator): New predicate.
12040         * config/i386/i386.md: Add peepholes for mem {+,-,&,|,^}= x; mem != 0.
12041
12042 2011-05-29  Richard Sandiford  <rdsandiford@googlemail.com>
12043
12044         PR target/43995
12045         * config/mips/mips.c (mips_pic_call_symbol_from_set): Add a
12046         recurse_p argument.  Only follow register copies if it is set,
12047         and prevent mips_find_pic_call_symbol from recursing.
12048         (mips_find_pic_call_symbol): Add a recurse_p argument.
12049         Pass it to mips_pic_call_symbol_from_set.
12050         (mips_annotate_pic_calls): Update accordingly.
12051
12052 2011-05-29  Richard Sandiford  <rdsandiford@googlemail.com>
12053
12054         * emit-rtl.c (try_split): Use a loop to search for
12055         NOTE_INSN_CALL_ARG_LOCATIONs.
12056
12057 2011-05-29  Richard Guenther  <rguenther@suse.de>
12058
12059         PR tree-optimization/49217
12060         * ipa-pure-const.c (propagate_pure_const): Fix typos.
12061
12062 2011-05-28  Jan Hubicka  <jh@suse.cz>
12063
12064         * lto-streamer-out.c (hash_string_slot_node): Hash string based on its
12065         length.
12066         (string_slot_free): Remove
12067         (create_output_block): Initialize obstack.
12068         (destroy_output_block): Free obstack.
12069         (lto_string_index): Add PERSISTENT parameter; do not duplicate
12070         the string unless it needs to be added into the hash.
12071         (lto_output_string_with_length): Add persistent attribute;
12072         handle NULL strings.
12073         (lto_output_string): Add PERSISTENT parameter.
12074         (output_string_cst, output_identifier): Simplify.
12075         (lto_output_location_bitpack): Update.
12076         (lto_output_builtin_tree): Update.
12077         * lto-streamer.h (struct output_block): Add obstack.
12078         (lto_output_string, lto_output_string_with_length): Remove
12079         declarations; functions are static now.
12080
12081 2011-05-28  Jan Hubicka  <jh@suse.cz>
12082
12083         * lto-streamer-out.c (pack_ts_fixed_cst_value_fields,
12084         pack_ts_decl_common_value_fields, pack_ts_decl_with_vis_value_fields,
12085         pack_ts_function_decl_value_fields, lto_output_builtin_tree,
12086         output_cfg, output_gimple_stmt): Use enum and variable length i/o.
12087         * lto-streamer-in.c (input_cfg, input_gimple_stmt,
12088         unpack_ts_fixed_cst_value_fields, unpack_ts_decl_common_value_fields,
12089         unpack_ts_decl_with_vis_value_fields,
12090         unpack_ts_type_common_value_fields, unpack_ts_block_value_fields,
12091         lto_get_builtin_tree): Use enum and variable length i/o.
12092         * basic-block.h (profile_status_d): Add PROFILE_LAST.
12093         * lto-streamer.h (bp_pack_int_in_range, bp_unpack_int_in_range):
12094         New functions.
12095         (bp_pack_enum, bp_unpack_enum): New macros.
12096
12097 2011-05-28  Richard Sandiford  <rdsandiford@googlemail.com>
12098
12099         * genrecog.c: Remove redundant forward declarations.
12100
12101 2011-05-28  Richard Sandiford  <rdsandiford@googlemail.com>
12102
12103         * config.gcc: Deprecate mips*-*-openbsd*.
12104
12105 2011-05-28  Richard Sandiford  <rdsandiford@googlemail.com>
12106
12107         PR bootstrap/49195
12108         * genrecog.c (add_to_sequence): Use XEXP rather than XVECEXP
12109         for match_op_dup.
12110
12111 2011-05-27  Andrew Pinski  <pinskia@gmail.com>
12112
12113         PR middle-end/48981
12114         * gengtype.c (vec_prefix_type): New function.
12115         (note_def_vec): Use vec_prefix_type and change the length
12116         attribute to be based on the prefix.
12117         * vec.c: Include coretypes.h before vec.h.
12118         (struct vec_prefix): Remove.
12119         (vec_gc_p_reserve): Change the offsetof to sizeof.
12120         (vec_gc_p_reserve_exact): Likewise.
12121         (vec_heap_p_reserve): Likewise.
12122         (vec_heap_p_reserve_exact): Likewise.
12123         (vec_stack_o_reserve_1): Copy from +1 instead of from vec.
12124         (vec_stack_p_reserve): Change the offsetof to sizeof.
12125         (vec_stack_p_reserve_exact): Likewise.
12126         * vec.h (struct vec_prefix): New struct definition.
12127         (VEC_T(T,B)): Use vec_prefix instead of having num/alloc fields.
12128         (VEC_T_GTY(T,B)): Likewise.
12129         (DEF_VEC_FUNC_P(T)): Use prefix field.
12130         (DEF_VEC_NONALLOC_FUNCS_O(T,A)): Likewise.
12131         (DEF_VEC_NONALLOC_FUNCS_I(T,A)): Likewise.
12132
12133 2011-05-27  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
12134
12135         PR tree-optimization/46728
12136         * tree-ssa-math-opts.c (powi_as_mults_1): Add gimple_set_location.
12137         (powi_as_mults): Add gimple_set_location.
12138         (build_and_insert_call): New.
12139         (gimple_expand_builtin_pow): Add handling for pow(x,y) when y is
12140         0.5, 0.25, 0.75, 1./3., or 1./6.
12141
12142 2011-05-27  Alexander Monakov  <amonakov@ispras.ru>
12143
12144         * doc/contrib.texi: Update copyright years.
12145         (Contributors): Add Zdenek Sojka.
12146
12147 2011-05-27  Nathan Froyd  <froydnj@codesourcery.com>
12148
12149         * c-decl.c (c_push_function_context): Copy the current statement
12150         list stack.
12151         (add_stmt): Check building_stmt_list_p and push_stmt if necessary.
12152         (finish_struct): Call building_stmt_list_p instead of checking
12153         cur_stmt_list.
12154         * c-parser.c (c_parser_postfix_expression): Likewise.
12155         * c-typeck.c (c_end_compound_stmt): Likewise.
12156         * print-tree.c (print_node) [STATEMENT_LIST]: Don't print TREE_CHAIN.
12157         * tree-iterator.c (stmt_list_cache): Change to a VEC.
12158         (alloc_stmt_list): Adjust for stmt_list_cache's new type.
12159         (free_stmt_list): Likewise.
12160         * tree.h (struct tree_statement_list): Include typed_tree instead
12161         of tree_common.
12162         * tree.c (initialize_tree_contains_struct): Mark TS_STATEMENT_LIST
12163         as TS_TYPED instead of TS_COMMON.
12164
12165 2011-05-27  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
12166             Uros Bizjak  <ubizjak@gmail.com>
12167
12168         * configure.ac (gcc_cv_as_ix86_tlsgdplt): Check for @tlsgdplt
12169         (HAVE_AS_IX86_TLSGDPTL): Define.
12170         (gcc_cv_as_ix86_tlsldmplt): Check for @tlsldmplt.
12171         (HAVE_AS_IX86_TLSLDMPLT): Define.
12172         * configure: Regenerate.
12173         * config.in: Regenerate.
12174         * config/i386/i386.c (ix86_print_operand): Handle code 'p'.
12175         * config/i386/i386.md (*tls_global_dynamic_32_gnu): If
12176         TARGET_SUN_TLS, use @tlsgdplt or @plt.
12177         (*tls_global_dynamic_64): Use @plt if TARGET_SUN_TLS.
12178         (*tls_local_dynamic_base_32_gnu): If TARGET_SUN_TLS, use
12179         @tlsldmplt or @plt.
12180         (*tls_local_dynamic_base_64): Use @plt if TARGET_SUN_TLS.
12181
12182 2011-05-27  Bernd Schmidt  <bernds@codesourcery.com>
12183
12184         * sched-int.h (struct _haifa_deps_insn_data): New members cond
12185         and reverse_cond.
12186         (INSN_COND, INSN_REVERSE_COND): New macros.
12187         * sched-deps.c (deps_analyze_insn): Call sched_get_condition_with_rev
12188         once.
12189         (sched_get_condition_with_rev): Cache the results, and look them up
12190         if possible.
12191         (sched_analyze_insn): Destroy INSN_COND of previous insns if they
12192         are clobbered by the current insn.
12193         * target.def (exposed_pipline): New sched data hook.
12194         * doc/tm.texi.in: TARGET_SCHED_EXPOSED_PIPELINE: Add hook.
12195         * doc/tm.texi: Regenerate.
12196
12197 2011-05-27  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
12198
12199         PR tree-optimization/49170
12200         * tree-ssa-math-opts.c (execute_cse_sincos):  Add checks for
12201         sincos or cexp.
12202
12203 2011-05-27  Richard Guenther  <rguenther@suse.de>
12204
12205         PR middle-end/49189
12206         * fold-const.c (fold_unary_loc): Do not re-fold folding conversions
12207         of comparisons.
12208
12209 2011-05-27  Bernd Schmidt  <bernds@codesourcery.com>
12210
12211         * haifa-sched.c (sched_scan_info): Remove.
12212         (schedule_block): Call sched_extend_luids rather than sched_init_luids
12213         with NULL args.
12214         (extend_bb, init_bb, extend_insn, init_insn, init_insns_in_bb):
12215         Remove functions.
12216         (sched_scan): Remove.
12217         (sched_extend_luids): Renamed from luids_extend_insn and no longer
12218         static.  All callers changed.
12219         (sched_init_insn_luid): Renamed from luids_init_insn and no longer
12220         static.  All callers changed.
12221         (sched_init_luids): Remove all arguments except the first.  All
12222         callers changed.  Don't use sched_scan.
12223         (haifa_init_h_i_d): Likewise.
12224         (haifa_init_insn): Call sched_extend_luids and sched_init_insn_luid
12225         manually rather than using sched_init_luids.  Likewise with
12226         extend_h_i_d, init_h_i_d and haifa_init_h_i_d.
12227         * sel-sched.c (sel_region_target_finish): Call sched_extend_luids
12228         rather than sched_init_luids with NULL args.
12229         * sel-sched-ir.c (new_insns): Remove variable.
12230         (sched_scan): New static function, previously in haifa-sched.c.  Remove
12231         all arguments but the first two; all callers changed.
12232         (sel_init_new_insn): Call sched_extend_luids and sched_init_insn_luid
12233         rather than sched_init_luids.
12234         (sel_init_bbs): Remove second argument.  All callers changed.
12235         (sel_add_bb): Call sched_extend_luids rather than sched_init_luids
12236         with NULL arguments.
12237         (create_insn_rtx_from_pattern): Likewise.
12238         * sel-sched-ir.h (sel_init_bbs): Adjust declaration.
12239         * sched-int.h (sched_init_luids, haifa_init_h_i_d): Likewise.
12240         (sched_init_insn_luid, sched_extend_luids): Declare.
12241         (sched_scan_info_def, sched_scan_info, sched_scan): Remove
12242         declarations.
12243
12244 2011-05-27  Richard Guenther  <rguenther@suse.de>
12245
12246         PR middle-end/49177
12247         * fold-const.c (fold_unary_loc): Fold (T)(A CMP B) to
12248         A CMP B ? (T) true : (T) false for non-integral types T again.
12249
12250 2011-05-27  Jan Hubicka  <jh@suse.cz>
12251
12252         * lto-streamer-out.c (lto_string_index): break out from...; offset by 1
12253         so 0 means NULL string.
12254         (lto_output_string_with_length): ... here.
12255         (lto_output_string, output_string_cst, output_identifier): Update
12256         handling of NULL strings.
12257         (lto_output_location_bitpack): New function.
12258         (lto_output_location): Use it.
12259         (lto_output_tree_ref): Use output_record_start.
12260         (pack_ts_type_common_value_fields): Pack aliagn & alias set in var
12261         len values.
12262         * lto-streamer-in.c (string_for_index): Break out from ...; offset
12263         values by 1.
12264         (input_string_internal): ... here;
12265         (input_string_cst, input_identifier, lto_input_string): Update handling
12266         of NULL strings.
12267         (lto_input_location_bitpack): New function
12268         (lto_input_location): Use it.
12269         (unpack_ts_type_common_value_fields): Pack align & alias in var len
12270         values.
12271         * lto-streamer.h (bp_pack_val_len_unsigned, bp_pack_val_len_int,
12272         bp_unpack_val_len_unsigned, bp_unpack_val_len_int): Declare.
12273         (bp_pack_value): Sanity check the value range.
12274         * lto-section-in.c (bp_unpack_val_len_unsigned, bp_unpack_val_len_int):
12275         New functions.
12276         * lto-section-out.h (bp_pack_val_len_unsigned, bp_pack_val_len_int):
12277         New functions.
12278
12279 2011-05-27  Hariharan Sandanagobalane  <hariharan@picochip.com>
12280
12281         * config/picochip/picochip.c (reorder_var_tracking_notes): Drop
12282         call_arg_location instructions down the floor.
12283
12284 2011-05-26  Vladimir Makarov  <vmakarov@redhat.com>
12285
12286         PR rtl-optimization/49154
12287         * ira.c (setup_pressure_classes): Process class without sublcasses
12288         as a candidate for pressure classes.
12289
12290 2011-05-26  Richard Sandiford  <rdsandiford@googlemail.com>
12291
12292         PR rtl-optimization/48575
12293         * genrecog.c (position_type): New enum.
12294         (position): New structure.
12295         (decision): Use position structure instead of a string.
12296         (root_pos, peep2_insn_pos_list): New variables.
12297         (next_position, compare_positions): New functions.
12298         (new_decision): Use position structures instead of strings.
12299         (maybe_both_true): Likewise.
12300         (change_state): Likewise.
12301         (write_tree): Likewise.
12302         (make_insn_sequence): Likewise.
12303
12304 2011-05-26  Nathan Froyd  <froydnj@codesourcery.com>
12305
12306         * tree.c (initialize_tree_contains_struct): Mark TS_BLOCK as
12307         TS_BASE instead of TS_COMMON.
12308         (find_decls_types_r): Check for TS_TYPED structure before looking at
12309         TREE_TYPE.
12310         * tree.h (struct tree_block): Inherit from tree_base, not tree_common.
12311         Add chain field.
12312         (BLOCK_CHAIN): Use new chain field.
12313
12314 2011-05-26  Pat Haugen  <pthaugen@us.ibm.com>
12315
12316         * config/rs6000/rs6000.c (rs6000_register_move_cost): Make LR/CTR
12317         moves expensive on Power7 also.
12318
12319 2011-05-26  Richard Guenther  <rguenther@suse.de>
12320
12321         * fold-const.c (fold_unary_loc): Remove bogus code.
12322
12323 2011-05-26  Nathan Froyd  <froydnj@codesourcery.com>
12324
12325         * tree.h (struct tree_identifier): Inherit from tree_typed, not
12326         tree_common.
12327         (HT_IDENT_TO_GCC_IDENT): Adjust for said change.
12328         * tree.c (initialize_tree_contains_struct): Mark TS_IDENTIFIER as
12329         TS_BASE instead of TS_COMMON.
12330         * varasm.c (assemble_name): Remove assert.
12331
12332 2011-05-26  Bernd Schmidt  <bernds@codesourcery.com>
12333
12334         * Makefile.in (srcdirify): Change order so that libgcc_objdir is
12335         substituted first.
12336         * libgcc-std.ver: Delete file.
12337
12338 2011-05-26  Richard Guenther  <rguenther@suse.de>
12339
12340         PR tree-optimization/48702
12341         * tree-ssa-address.c (create_mem_ref_raw): Create MEM_REFs
12342         only when we know the base address is within bounds.
12343         * tree-ssa-alias.c (indirect_ref_may_alias_decl_p): Do not
12344         assume the base address of TARGET_MEM_REFs is in bounds.
12345
12346 2011-05-26  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
12347
12348         PR target/49099
12349         * config/sparc/sparc.c (sparc_solaris_elf_asm_named_section): Wrap
12350         declaration in TARGET_SOLARIS.
12351
12352 2011-05-26  Hariharan Sandanagobalane  <hariharan@picochip.com>
12353
12354         * config/picochip/picochip.md (cbranchhi4): No :CC for match_operator.
12355         The instruction is then expanded explicitly.
12356         (supported_compare): Callable instruction.
12357         (compare): Likewise.
12358
12359 2011-05-26  Jakub Jelinek  <jakub@redhat.com>
12360
12361         PR c++/49165
12362         * gimplify.c (shortcut_cond_r): Don't special case
12363         COND_EXPRs if they have void type on one of their arms.
12364
12365 2011-05-26  Bernd Schmidt  <bernds@codesourcery.com>
12366
12367         * haifa-sched.c (schedule-block): Reorder the inner scheduling loop
12368         to reduce duplication, and to achieve a slightly more logical order
12369         of operations.
12370
12371 2011-05-26  Jakub Jelinek  <jakub@redhat.com>
12372
12373         PR tree-optimization/49161
12374         * tree-vrp.c (struct case_info): New type.
12375         (compare_case_labels): Sort case_info structs instead of
12376         trees, and not primarily by CASE_LABEL uids but by
12377         label_for_block indexes.
12378         (find_switch_asserts): Put case labels into struct case_info
12379         array instead of TREE_VEC, adjust sorting, compare label_for_block
12380         values instead of CASE_LABELs.
12381
12382 2011-05-26  Ramana Radhakrishnan  <ramana.radhakrishnan@linaro.org>
12383
12384         * config/arm/neon.md ("orn<mode>3_neon"): Canonicalize not.
12385         ("orndi3_neon"): Likewise.
12386         ("bic<mode>3_neon"): Likewise.
12387
12388 2011-05-26  Ira Rosen  <ira.rosen@linaro.org>
12389
12390         PR tree-optimization/49038
12391         * tree-vect-loop-manip.c (vect_generate_tmps_on_preheader):
12392         Ensure at least one epilogue iteration if required by data
12393         accesses with gaps.
12394         * tree-vectorizer.h (struct _loop_vec_info): Add new field
12395         to mark loops that require peeling for gaps.
12396         * tree-vect-loop.c (new_loop_vec_info): Initialize new field.
12397         (vect_get_known_peeling_cost): Take peeling for gaps into
12398         account.
12399         (vect_transform_loop): Generate epilogue if required by data
12400         access with gaps.
12401         * tree-vect-data-refs.c (vect_analyze_group_access): Mark the
12402         loop as requiring an epilogue if there are gaps in the end of
12403         the strided group.
12404
12405 2011-05-25  Ian Lance Taylor  <iant@google.com>
12406
12407         * godump.c (go_format_type): Output the first field with a usable
12408         Go type, if any.
12409
12410 2011-05-25  Ian Lance Taylor  <iant@google.com>
12411
12412         * godump.c (go_format_type): Check for invalid type names, pointer
12413         target types, and struct field types.
12414
12415 2011-05-25  Jason Merrill  <jason@redhat.com>
12416
12417         * print-tree.c (print_node): Only look at TREE_TYPE if TS_TYPED.
12418
12419 2011-05-25  Uros Bizjak  <ubizjak@gmail.com>
12420
12421         * config/i386/sse.md (*<sse>_maskcmp<mode>3_comm): New pattern.
12422
12423 2011-05-25  H.J. Lu  <hongjiu.lu@intel.com>
12424
12425         * config/i386/i386.md (*movqi_extv_1)): Put back
12426         "register_operand" check in "type" calculation.
12427         (*movqi_extzv_2): Likewise.
12428
12429 2011-05-25  H.J. Lu  <hongjiu.lu@intel.com>
12430
12431         * doc/extend.texi (X86 Built-in Functions): Update pause intrinsic.
12432
12433 2011-05-25  Bernd Schmidt  <bernds@codesourcery.com>
12434
12435         PR bootstrap/49160
12436         * libgcc2.h (__powisf2, __powidf2, __powitf2, __powixf2,
12437         __mulsc3, __muldc3, __mulxc3, __multc3, __divsc3, __divdc3,
12438         __divxc3, __divtc3): Wrap definitions in #ifndef.
12439
12440 2011-05-25  H.J. Lu  <hongjiu.lu@intel.com>
12441
12442         PR target/49142
12443         * config/i386/i386.md (*movqi_extv_1_rex64): Remove
12444         "register_operand" check and replace q_regs_operand with
12445         QIreg_operand in "type" calculation.
12446         (*movqi_extv_1): Likewise.
12447         (*movqi_extzv_2_rex64): Likewise.
12448         (*movqi_extzv_2): Likewise.
12449
12450         * config/i386/predicates.md (QIreg_operand): New.
12451
12452 2011-05-25  Richard Guenther  <rguenther@suse.de>
12453
12454         * tree-ssa-alias.c (indirect_ref_may_alias_decl_p): Fix
12455         type-based offset disambiguation, streamline MEM_REF and
12456         TARGET_MEM_REF handling.
12457
12458 2011-05-25  H.J. Lu  <hongjiu.lu@intel.com>
12459
12460         * config/i386/i386.c (ix86_builtins): Add IX86_BUILTIN_PAUSE.
12461         (bdesc_special_args): Add pause intrinsic.
12462
12463         * config/i386/i386.md (UNSPEC_PAUSE): New.
12464         (pause): Likewise.
12465         (*pause): Likewise.
12466         * config/i386/ia32intrin.h (__pause): Likewise.
12467
12468         * doc/extend.texi (X86 Built-in Functions): Add documentation for
12469         pause intrinsic.
12470
12471 2011-05-25  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
12472
12473         PR tree-optimization/46728
12474         * tree-ssa-math-opts.c (gimple_expand_builtin_pow): New.
12475         (execute_cse_sincos): Add switch case for BUILT_IN_POW.
12476
12477 2011-05-25  Nathan Froyd  <froydnj@codesourcery.com>
12478
12479         * tree.h (struct tree_exp): Inherit from struct tree_typed.
12480         * tree.c (initialize_tree_contains_struct): Mark TS_EXP as TS_TYPED
12481         instead of TS_COMMON.
12482
12483 2011-05-25  Bernd Schmidt  <bernds@codesourcery.com>
12484
12485         * libgcc2.h (__NW, __NDW): Define using a __gnu_ prefix if
12486         LIBGCC2_GNU_PREFIX is defined.
12487         (__N): New macro.
12488         (__powisf2, __powidf2, __powitf2, __powixf2, __bswapsi2, __bswapdi2,
12489         __mulsc3, __muldc3, __mulxc3, __multc3, __divsc3, __divdc3, __divxc3,
12490         __divtc3, __udiv_w_sdiv, __clear_cache, __enable_execute_stack,
12491         __clz_tab): Define using __N.
12492         (__absvsi2, __negvsi2, __addvsi3, __subvsi3, __mulvsi3): Likewise if
12493         COMPAT_SIMODE_TRAPPING_ARITHMETIC.
12494         * target.def (libfunc_gnu_prefix): New hook.
12495         * doc/tm.texi.in (LIBGCC2_GNU_PREFIX): Document.
12496         (TARGET_LIBFUNC_GNU_PREFIX): Add hook.
12497         * doc/tm.texi: Regenerate.
12498         * system.h (LIBGCC2_GNU_PREFIX): Poison.
12499         * optabs.c (gen_libfunc): Take the libfunc_gnu_prefix hook into
12500         account.
12501         (gen_interclass_conv_libfunc, gen_intraclass_conv_libfunc): Likewise.
12502         (init_optabs): Likewise for the bswap libfuncs.
12503         * tree.c (build_common_builtin_nodes): Likewise for complex multiply
12504         and divide.
12505         * config/t-slibgcc-elf-ver (SHLIB_MAPFILES): Use $$(libgcc_objdir).
12506         * config/t-slibgcc-sld (SHLIB_MAPFILES): Likewise.
12507         * libgcc-std.ver: Remove.
12508         * Makefile.in (srcdirify): Handle $$(libgcc_objdir).
12509         * config/frv/t-linux (SHLIB_MAPFILES): Use $$(libgcc_objdir) for
12510         libgcc-std.ver.
12511         * config/i386/t-linux (SHLIB_MAPFILES): Likewise.
12512         * config/mips/t-slibgcc-irix (SHLIB_MAPFILES): Likewise.
12513         * config/rs6000/t-aix43 (SHLIB_MAPFILES): Likewise.
12514         * config/rs6000/t-aix52 (SHLIB_MAPFILES): Likewise.
12515         * config/sparc/t-linux (SHLIB_MAPFILES): Likewise.
12516         * config/i386/t-linux (SHLIB_MAPFILES): Likewise.
12517         * config/i386/t-linux (SHLIB_MAPFILES): Likewise.
12518         * config/fixed-bit.h (FIXED_OP): Define differently depending on
12519         LIBGCC2_GNU_PREFIX. All uses changed not to pass leading underscores.
12520         (FIXED_CONVERT_OP, FIXED_CONVERT_OP2): Likewise.
12521
12522 2011-05-25  Jan Hubicka  <jh@suse.cz>
12523
12524         * lto-streamer-out.c (output_record_start): Use lto_output_enum
12525         (lto_output_tree): Use output_record_start.
12526         * lto-streamer-in.c (input_record_start): Use lto_input_enum
12527         (lto_get_pickled_tree): Use input_record_start.
12528         * lto-section-in.c (lto_section_overrun): Turn into fatal error.
12529         (lto_value_range_error): New function.
12530         * lto-streamer.h (lto_value_range_error): Declare.
12531         (lto_output_int_in_range, lto_input_int_in_range): New functions.
12532         (lto_output_enum, lto_input_enum): New macros.
12533
12534 2011-05-25  Eric Botcazou  <ebotcazou@adacore.com>
12535
12536         * common.opt (flag_stack_usage_info): New variable.
12537         (-Wstack-usage): New option.
12538         * doc/invoke.texi (Warning options): Document -Wstack-usage.
12539         * opts.c (common_handle_option) <OPT_Wstack_usage_>: New case.
12540         <OPT_fstack_usage>: Likewise.
12541         * toplev.c (output_stack_usage): Handle -Wstack-usage.
12542         * calls.c (expand_call): Test flag_stack_usage_info variable instead
12543         of flag_stack_usage.
12544         (emit_library_call_value_1): Likewise.
12545         * explow.c (allocate_dynamic_stack_space): Likewise.
12546         * function.c (instantiate_virtual_regs ): Likewise.
12547         (prepare_function_start): Likewise.
12548         (rest_of_handle_thread_prologue_and_epilogue): Likewise.
12549         * config/alpha/alpha.c (alpha_expand_prologue): Likewise.
12550         * config/arm/arm.c (arm_expand_prologue): Likewise.
12551         (thumb1_expand_prologue): Likewise.
12552         * config/avr/avr.c (expand_prologue): Likewise.
12553         * config/i386/i386.c (ix86_expand_prologue): Likewise.
12554         * config/ia64/ia64.c (ia64_expand_prologue): Likewise.
12555         * config/m68k/m68k.c (m68k_expand_prologue): Likewise.
12556         * config/mips/mips.c (mips_expand_prologue): Likewise.
12557         * config/pa/pa.c (hppa_expand_prologue): Likewise.
12558         * config/rs6000/rs6000.c (rs6000_emit_prologue): Likewise.
12559         * config/s390/s390.c (s390_emit_prologue): Likewise.
12560         * config/sh/sh.c (sh_expand_prologue): Likewise.
12561         * config/sparc/sparc.c (sparc_expand_prologue): Likewise.
12562         * config/spu/spu.c (spu_expand_prologue): Likewise.
12563
12564 2011-05-25  Richard Guenther  <rguenther@suse.de>
12565
12566         * gimple.c (iterative_hash_canonical_type): Skip non-FIELD_DECLs.
12567         (gimple_canonical_types_compatible_p): Likewise.
12568
12569 2011-05-25  Jan Hubicka  <jh@suse.cz>
12570
12571         PR middle-end/49062
12572         * ipa.c (function_and_variable_visibility): Only add to same
12573         comdat group list if DECL_ONE_ONLY.
12574
12575 2011-05-25  Andrey Belevantsev  <abel@ispras.ru>
12576
12577         PR rtl-optimization/49014
12578         * config/i386/athlon.md (athlon_ssecomi): Change type to ssecomi.
12579
12580 2011-05-25  Jakub Jelinek  <jakub@redhat.com>
12581
12582         PR target/49128
12583         * config/i386/driver-i386.c (host_detect_local_cpu): Fix a typo.
12584
12585 2011-05-24  Vladimir Makarov  <vmakarov@redhat.com>
12586
12587         PR rtl-optimization/48757
12588         * ira-build.c (loop_with_eh_edge_p): Rename to
12589         loop_with_complex_edge_p, check edges on complexity, make function
12590         conditional.
12591         (mark_loops_for_removal): Make call of loop_with_complex_edge_p
12592         conditional.
12593
12594 2011-05-24  Eric Botcazou  <ebotcazou@adacore.com>
12595
12596         * config/sparc/sparc.c (sparc_option_override): If not set by the user,
12597         force flag_ira_share_save_slots to 0.
12598
12599 2011-05-24  Eric Botcazou  <ebotcazou@adacore.com>
12600
12601         * var-tracking.c (compute_cfa_pointer): Adjust head comment.
12602         (vt_initialize): Set PROLOGUE_BB unconditionally.
12603         Add block comment about CFA_BASE_RTX machinery.
12604         Reset FP_CFA_OFFSET to -1 on all invalid paths.
12605         Call vt_init_cfa_base only if FP_CFA_OFFSET isn't equal to -1.
12606
12607 2011-05-24  Nicola Pero  <nicola.pero@meta-innovation.com>
12608
12609         PR objc/48187
12610         * c-parser.c (c_parser_objc_class_instance_variables): More robust
12611         parsing of syntax error in ObjC instance variable lists.  In
12612         particular, avoid an infinite loop if there is a stray ']'.
12613         Updated error message.
12614
12615 2011-05-24  Ian Lance Taylor  <iant@google.com>
12616
12617         * godump.c (go_define): Don't accept a string immediately after
12618         another operand.
12619
12620 2011-05-24  Ian Lance Taylor  <iant@google.com>
12621
12622         * godump.c (struct godump_container): Add invalid_hash field.
12623         (go_format_type): Return false if type is found in invalid_hash.
12624         (go_output_typedef): Add invalid type to invalid_hash.
12625         (go_finish): Create and delete invalid_hash.
12626
12627 2011-05-24  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
12628
12629         PR tree-optimization/46728
12630         * tree-ssa-math-opts.c (powi_table): New.
12631         (powi_lookup_cost): New.
12632         (powi_cost): New.
12633         (powi_as_mults_1): New.
12634         (powi_as_mults): New.
12635         (gimple_expand_builtin_powi): New.
12636         (execute_cse_sincos): Add switch case for BUILT_IN_POWI.
12637         (gate_cse_sincos): Remove sincos/cexp restriction.
12638
12639 2011-05-24  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
12640
12641         PR target/3746
12642         * config.gcc (alpha*-dec-osf5.1*): Only build mips-tfile,
12643         mips-tdump native.
12644         * mips-tfile.c: Remove CROSS_DIRECTORY_STRUCTURE handling.
12645         * mips-tdump.c: Likewise.
12646
12647 2011-05-24  H.J. Lu  <hongjiu.lu@intel.com>
12648
12649         PR target/49128
12650         * config/i386/driver-i386.c (host_detect_local_cpu): Always
12651         add -mno-XXX.  Handle FMA.
12652
12653 2011-05-24  Vladimir Makarov  <vmakarov@redhat.com>
12654
12655         PR rtl-optimization/48633
12656         * ira-build.c (loop_with_eh_edge_p): New function.
12657         (mark_loops_for_removal): Use it.
12658
12659 2011-05-24  Vladimir Makarov  <vmakarov@redhat.com>
12660
12661         PR rtl-optimization/48971
12662         * ira.c (setup_pressure_classes): Don't check register move cost
12663         for classes with one registers.  Don't add pressure class if there
12664         is a pressure class with the same available hard registers.
12665         Check contains_reg_of_mode.  Fix a typo in collecting
12666         temp_hard_regset.  Ignore hard registers not belonging to a class.
12667
12668 2011-05-24  Uros Bizjak  <ubizjak@gmail.com>
12669
12670         PR target/49133
12671         * config/i386/sse.md (sse2_loadhpd): Remove shufpd alternative.
12672
12673 2011-05-24  Eric Botcazou  <ebotcazou@adacore.com>
12674             Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
12675
12676         PR gcov-profile/48845
12677         * config/sol2.h (LIB_SPEC): Link TLS support for tree profiling.
12678
12679 2011-05-24  Richard Guenther  <rguenther@suse.de>
12680
12681         * gimple.c (compare_type_names_p): Remove for_completion_p arg.
12682         (gimple_compatible_complete_and_incomplete_subtype_p): Remove.
12683         (gimple_types_compatible_p_1): Adjust.
12684         (iterative_hash_canonical_type): Do not bother about complete vs.
12685         incomplete types.
12686         (gimple_canonical_types_compatible_p): Likewise.
12687
12688 2011-05-24  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
12689
12690         * config/i386/sol2.h (FORCE_CODE_SECTION_ALIGN): Remove.
12691
12692 2011-05-24  Richard Guenther  <rguenther@suse.de>
12693
12694         PR bootstrap/49078
12695         * gimple.c (gimple_register_canonical_type): Revert
12696         previous change.
12697         * alias.c (get_alias_set): Only assert that TYPE_CANONICAL
12698         does not for a tree for the case where it matters.  Cache
12699         pointer-type alias-sets.
12700
12701 2011-05-24  Joseph Myers  <joseph@codesourcery.com>
12702
12703         * Makefile.in (GCC_OBJS): Remove opts-common.o and options.o.
12704         (OBJS): Remove options.o, opts-common.o and prefix.o.
12705         (OBJS-libcommon-target): New.
12706         (ALL_HOST_BACKEND_OBJS): Include $(OBJS-libcommon-target).
12707         (BACKEND): Include libcommon-target.a.
12708         (MOSTLYCLEANFILES): Include libcommon-target.a.
12709         (libcommon-target.a): New.
12710         (xgcc$(exeext), cpp$(exeext)): Use libcommon-target.a instead of
12711         prefix.o.
12712
12713 2011-05-23  Joseph Myers  <joseph@codesourcery.com>
12714
12715         * optc-save-gen.awk: New.  Based on optc-gen.awk.  Don't generate
12716         parts of output shared with the driver.
12717         * optc-gen.awk: Don't generate parts of output not shared with the
12718         driver.
12719         * opth-gen.awk: Remove GCC_DRIVER conditionals.
12720         * doc/options.texi (SourcerInclude): Mention options-save.c.
12721         * Makefile.in (GCC_OBJS): Use options.o instead of gcc-options.o.
12722         (OBJS): Add options-save.o.
12723         (options-save.c, options-save.o): New.
12724         (options.o): Update dependencies.
12725         (gcc-options.o): Remove.
12726         (mostlyclean): Remove options-save.c.
12727
12728 2011-05-23  Jakub Jelinek  <jakub@redhat.com>
12729
12730         PR debug/49032
12731         * dbxout.c: Include cgraph.h.
12732         (dbxout_expand_expr): If a VAR_DECL is TREE_STATIC, not written
12733         and without value expr, return NULL if no varpool node exists for
12734         it or if it is not needed.
12735         * Makefile.in (dbxout.o): Depend on $(CGRAPH_H).
12736
12737         PR c/49120
12738         * c-decl.c (start_decl): Convert expr to void_type_node.
12739
12740 2011-05-23  Richard Sandiford  <rdsandiford@googlemail.com>
12741
12742         PR rtl-optimization/48826
12743         * emit-rtl.c (try_split): When splitting a call that is followed
12744         by a NOTE_INSN_CALL_ARG_LOCATION, move the note after the new call.
12745
12746 2011-05-23  Jakub Jelinek  <jakub@redhat.com>
12747
12748         * cfgexpand.c (expand_debug_expr): For unused non-addressable
12749         parameters passed in memory prefer using DECL_INCOMING_RTL over
12750         the pseudos it will be copied into.
12751
12752 2011-05-23  H.J. Lu  <hongjiu.lu@intel.com>
12753
12754         PR target/47315
12755         * config/i386/i386.c (ix86_option_override_internal): Save the
12756         initial options after checking vzeroupper.
12757
12758 2011-05-23  David Li  <davidxl@google.com>
12759
12760         PR tree-optimization/48988
12761         * tree-ssa-uninit.c (convert_control_dep_chain_into_preds):
12762         Initialize has_valid_pred for each pred chain.
12763
12764 2011-05-23  Richard Guenther  <rguenther@suse.de>
12765
12766         * gimple.c (gimple_types_compatible_p_1): Always compare type names.
12767         (iterative_hash_gimple_type): Always hash type names.
12768
12769 2011-05-23  Nathan Froyd  <froydnj@codesourcery.com>
12770
12771         * c-typeck.c (build_function_call_vec): Tweak call to
12772         check_function_arguments.
12773
12774 2011-05-23  Richard Guenther  <rguenther@suse.de>
12775
12776         PR tree-optimization/49115
12777         * tree-ssa-alias.c (stmt_kills_ref_p_1): If the assignment
12778         is not necessarily carried out, do not claim it kills the ref.
12779         * tree-ssa-dce.c (mark_aliased_reaching_defs_necessary_1): Likewise.
12780
12781 2011-05-23  Richard Guenther  <rguenther@suse.de>
12782
12783         PR middle-end/15419
12784         * builtins.c (fold_builtin_memory_op): Be less restrictive about
12785         what pointer types we accept for folding.
12786
12787 2011-05-23  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
12788
12789         * gthr-gnat.c: Remove.
12790         * gthr-gnat.h: Remove.
12791         * Makefile.in (LIB2ADDEH): Remove $(srcdir)/gthr-gnat.c.
12792         * config/t-freebsd (LIB2ADDEH): Likewise.
12793         * config/t-linux (LIB2ADDEH): Likewise.
12794         * config/t-sol2 (LIB2ADDEH): Likewise.
12795         * config/ia64/t-vms (LIB2ADDEH): Likewise.
12796         * configure.ac (target_thread_file): Remove gnat handling.
12797         * configure: Regenerate.
12798         * doc/install.texi (Configuration, --enable-threads): Remove gnat.
12799
12800 2011-05-23  Tristan Gingold  <gingold@adacore.com>
12801             Eric Botcazou  <ebotcazou@adacore.com>
12802
12803         * gcov.c (create_file_names): If no object directory is specified,
12804         keep the directory of the file.
12805
12806 2011-05-23  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
12807
12808         * configure.ac (enable_threads): Remove irix; add lynx, tpf; sort list.
12809         * configure: Regenerate.
12810
12811 2011-05-23  Jakub Jelinek  <jakub@redhat.com>
12812
12813         PR middle-end/48973
12814         * expr.c (expand_expr_real_2) <case LT_EXPR>: If do_store_flag
12815         failed and the comparison has a single bit signed type, use
12816         constm1_rtx instead of const1_rtx for true value.
12817         (do_store_flag): If ops->type is single bit signed type, disable
12818         signel bit test optimization and pass -1 instead of 1 as last
12819         parameter to emit_store_flag_force.
12820
12821 2011-05-23  Tom de Vries  <tom@codesourcery.com>
12822
12823         PR target/45098
12824         * tree-ssa-loop-niter.c (infer_loop_bounds_from_pointer_arith): New
12825         function.
12826         (infer_loop_bounds_from_undefined): Use new function.
12827
12828 2011-05-22  Richard Sandiford  <rdsandiford@googlemail.com>
12829
12830         * config/mips/mips.h (SUBTARGET_ASM_OPTIMIZING_SPEC): Delete.
12831         (ASM_SPEC): Add a -O* option here.  Pass -O0 for -noasmopt,
12832         -O1 for -fno-delayed-branch, -O2 if optimization is enabled,
12833         and -O0 otherwise.
12834         (EXTRA_SPECS): Remove subtarget_asm_optimizing_spec.
12835
12836 2011-05-22  Eric Botcazou  <ebotcazou@adacore.com>
12837
12838         * cfgcleanup.c (try_forward_edges): Do not update BB_FORWARDER_BLOCK.
12839         (try_optimize_cfg): Update BB_FORWARDER_BLOCK if try_forward_edges
12840         returns true.
12841
12842 2011-05-22  Richard Sandiford  <rdsandiford@googlemail.com>
12843
12844         * config/mips/mips.c (mips_default_arch): Honor MIPS_ISA_DEFAULT.
12845
12846 2011-05-22  Eric Botcazou  <ebotcazou@adacore.com>
12847
12848         * config/sparc/sparc.c (sparc_delegitimize_address): Handle
12849         UNSPEC_MOVE_PIC pattern.
12850
12851 2011-05-22  Eric Botcazou  <ebotcazou@adacore.com>
12852
12853         * config.gcc (sparc-*-elf*): Add sparc/t-crtin.
12854         (sparc-*-rtems*): Likewise.
12855         (sparc64-*-elf*): Likewise.
12856         (sparc64-*-rtems*): Likewise.
12857         (sparc*-*-solaris2*): Likewise.  Remove crti.o crtn.o extra parts.
12858         * config/sparc/t-crtin: New file.
12859         * config/sparc/t-sol2 (crti.o): Delete rule.
12860         (crtn.o): Likewise.
12861         * config/sparc/t-linux64 (EXTRA_MULTILIB_PARTS): Delete.
12862         * config/sparc/t-sol2-64 (EXTRA_MULTILIB_PARTS): Likewise.
12863         * config/sparc/sp64-elf.h (STARTFILE_SPEC): Tidy and add crti.o.
12864         (ENDFILE_SPEC): Add crtn.o.
12865
12866 2011-05-22  Tom de Vries  <tom@codesourcery.com>
12867
12868         PR middle-end/48689
12869         * fold-const.c (fold_checksum_tree): Guard TREE_CHAIN use with
12870         CODE_CONTAINS_STRUCT (TS_COMMON).
12871
12872 2011-05-22  Jakub Jelinek  <jakub@redhat.com>
12873
12874         PR middle-end/49029
12875         * expmed.c (extract_fixed_bit_field): Test whether target can be used
12876         only after deciding which mode to use.
12877
12878 2011-05-22  Tom de Vries  <tom@codesourcery.com>
12879
12880         PR target/45098
12881         * tree-ssa-loop-ivopts.c (force_expr_to_var_cost): Fix const test
12882         for call to get_shiftadd_cost.
12883
12884 2011-05-22  Uros Bizjak  <ubizjak@gmail.com>
12885
12886         PR target/49104
12887         * config/i386/cpuid.h (bit_MMXEXT): New define.
12888
12889 2011-05-22  Nick Clifton  <nickc@redhat.com>
12890
12891         * config/stormy16/stormy16.c (xstormy16_init_builtins): prevent
12892         initialisation of non-existant args[2] element.  Use args[] array
12893         not arg[] array to pass arguments to build_function_type_list.
12894
12895 2011-05-22  Ira Rosen  <ira.rosen@linaro.org>
12896
12897         PR tree-optimization/49087
12898         * tree-vect-loop.c (vect_is_slp_reduction): Fail if LHS has no uses.
12899
12900 2011-05-21  Jason Merrill  <jason@redhat.com>
12901
12902         PR c++/49092
12903         * dwarf2out.c (tree_add_const_value_attribute_for_decl): Check for
12904         static storage duration.
12905
12906 2011-05-21  Eric Botcazou  <ebotcazou@adacore.com>
12907
12908         * config/sparc/sparc.md (setjmp): Handle PIC mode and use the hard
12909         frame pointer.
12910
12911 2011-05-21  Eric Botcazou  <ebotcazou@adacore.com>
12912
12913         * config/sparc/sparc.c (eligible_for_return_delay): Do not return
12914         false if there are call-saved registers here...
12915         (sparc_can_use_return_insn_p): ...but here instead.
12916         (save_or_restore_regs): Fix thinko.
12917         (sparc_expand_prologue): Use current_function_is_leaf.
12918         (sparc_frame_pointer_required): Likewise.
12919
12920 2011-05-21  Nick Clifton  <nickc@redhat.com>
12921
12922         PR target/49098
12923         * config/rx/rx.c (rx_memory_move_cost): Note unused parameters.
12924
12925 2011-05-21  Nicola Pero  <nicola.pero@meta-innovation.com>
12926
12927         * gengtype.c (walk_type): Implemented "atomic" GTY option.
12928         * doc/gty.texi (GTY Options): Document "atomic" GTY option.
12929
12930 2011-05-21  Joseph Myers  <joseph@codesourcery.com>
12931
12932         * opt-read.awk: New.  Split out of optc-gen.awk and opth-gen.awk.
12933         * optc-gen.awk: Move common code to opt-read.awk.
12934         * opth-gen.awk: Likewise.
12935         * Makefile.in (options.c, s-options-h): Update to use opt-read.awk.
12936
12937 2011-05-20  Nathan Froyd  <froydnj@codesourcery.com>
12938
12939         * godump.c (go_format_type): Don't use TYPE_ARG_TYPES.
12940
12941 2011-05-20  Tom de Vries  <tom@codesourcery.com>
12942
12943         PR target/45098
12944         * tree-ssa-loop-ivopts.c: Include expmed.h.
12945         (get_shiftadd_cost): New function.
12946         (force_expr_to_var_cost): Declare forward.  Use get_shiftadd_cost.
12947
12948 2011-05-20  Jakub Jelinek  <jakub@redhat.com>
12949
12950         PR bootstrap/49086
12951         * gimple-fold.c (and_comparisons_1, or_comparisons_1): Return NULL
12952         for PHI args that are SSA_NAME_IS_DEFAULT_DEF.
12953
12954 2011-05-20  Joseph Myers  <joseph@codesourcery.com>
12955
12956         * Makefile.in: Update comment referring to $(OBJS-common).
12957
12958 2011-05-20  Ian Lance Taylor  <iant@google.com>
12959
12960         * godump.c (go_output_typedef): Put enum constants in the macro
12961         hash table to avoid duplicate Go const definitions.
12962
12963 2011-05-20  Joseph Myers  <joseph@codesourcery.com>
12964
12965         * Makefile.in (LIBDEPS): Add libcommon.a.
12966         (LIBS): Likewise.
12967         (GCC_OBJS): Remove diagnostic.o, pretty-print.o and input.o.
12968         (OBJS-common): Remove diagnostic.o, input.o, intl.o,
12969         pretty-print.o and version.o.
12970         (OBJS-libcommon): New.
12971         (ALL_HOST_BACKEND_OBJS): Add $(OBJS-libcommon).
12972         (BACKEND): Add libcommon.a.
12973         (MOSTLYCLEANFILES): Likewise.
12974         (libcommon.a): New.
12975         (xgcc$(exeext)): Don't explicitly use version.o and intl.o.
12976         (cpp$(exeext)): Likewise.
12977         (COLLECT2_OBJS): Remove intl.o, version.o, diagnostic.o,
12978         pretty-print.o and input.o.
12979         (lto-wrapper$(exeext)): Don't explicitly use intl.o.
12980         (lto-wrapper.o): Depend on $(DIAGNOSTIC_H).
12981         (errors.o): Remove.
12982         (mips-tfile): Don't explicitly use version.o.
12983         (mips-tdump): Likewise.
12984         (gcov.o): Depend on $(DIAGNOSTIC_H).
12985         (gcov-dump.o): Depend on intl.h and $(DIAGNOSTIC_H).
12986         (GCOV_OBJS): Remove intl.o, version.o and errors.o.
12987         (GCOV_DUMP_OBJS): Remove version.o and errors.o.
12988         * gcov-dump.c: Include intl.h and diagnostic.h.
12989         (main): Initialize diagnostics.
12990         * gcov.c: Include diagnostic.h.
12991         (fnotice): Remove.
12992         (main): Initialize diagnostics.
12993         * lto-wrapper.c: Include diagnostic.h.
12994         (main): Initialize diagnostics.
12995
12996 2011-05-20  Michael Matz  <matz@suse.de>
12997
12998         * Makefile.in (OBJS-common, OBJS-md, OBJS-archive): Merge into OBJS.
12999
13000 2011-05-20  Michael Matz  <matz@suse.de>
13001             Richard Guenther  <rguenther@suse.de>
13002
13003         * lto-streamer.c (lto_record_common_node): Don't track seen nodes,
13004         use lto_streamer_cache_append directly instead of returning a VEC.
13005         (preload_common_node): Remove.
13006         (lto_get_common_nodes): Rename to lto_preload_common_nodes, don't
13007         track seen nodes.
13008         (lto_streamer_cache_create): Call lto_preload_common_nodes.
13009
13010 2011-05-20  Richard Guenther  <rguenther@suse.de>
13011
13012         PR tree-optimization/49079
13013         * tree-dfa.c (get_ref_base_and_extent): Handle view-converting
13014         MEM_REFs correctly for the trailing array access detection.
13015         Special case constants the same way as decls for overall size
13016         constraining.
13017
13018 2011-05-20  Uros Bizjak  <ubizjak@gmail.com>
13019
13020         * config/i386/mingw32.h (OUTPUT_QUOTED_STRING): Fix macro
13021         argument expansion.
13022
13023 2011-05-20  Jakub Jelinek  <jakub@redhat.com>
13024
13025         PR tree-optimization/49073
13026         * gimple-fold.c (and_comparisons_1, or_comparisons_1): Return NULL if
13027         PHI argument is SSA_NAME, whose def_stmt is dominated by the PHI.
13028         * tree-ssa-ifcombine.c (tree_ssa_ifcombine): Calculate dominators.
13029
13030 2011-05-20  Richard Guenther  <rguenther@suse.de>
13031
13032         PR middle-end/48849
13033         * gimple.c (gimple_register_canonical_type): Compute TYPE_CANONICAL
13034         of pointer types the same way the middle-end does.
13035
13036 2011-05-20  Richard Guenther  <rguenther@suse.de>
13037
13038         * gimple.c (gimple_register_type_1): Do not fiddle with main-variant
13039         or pointer-to chains.  Delay all fixup to uniquify_nodes.
13040
13041 2011-05-19  Quentin Neill  <quentin.neill@amd.com>
13042
13043         * config/i386/sse.md (fma4_fmsubadd): Use <ssemodesuffix>.
13044         (fma4_fmaddsub): Likewise
13045
13046 2011-05-19  Jan Hubicka  <jh@suse.cz>
13047
13048         * gimple.c (gtc_visited, gtc_ob, type_pair_hash, type_pair_eq): Remove.
13049         (GIMPLE_TYPE_PAIR_SIZE): New macro.
13050         (type_pair_cache): New static var.
13051         (lookup_type_pair): Use fixed sized custom hash; make inline.
13052         (gtc_visit, gimple_types_compatible_p, gimple_register_type_1): Update
13053         calls of lookup_type_pair.
13054         (print_gimple_types_stats): Remove cache stats.
13055         (free_gimple_type_tables): Free type_pair_cache instead of gtc_visited
13056         and gtc_ob.
13057
13058 2011-05-19  Uros Bizjak  <ubizjak@gmail.com>
13059
13060         * config/i386/i386.c (option_override_internal): Enable TARGET_CMOVE
13061         when TARGET_RDRND is active.
13062         (ix86_expand_builtin) <case IX86_BUILTIN_RDRAND{16,32,64}_STEP>:
13063         Generate dummy SImode target register when target is NULL.
13064
13065 2011-05-19  Joseph Myers  <joseph@codesourcery.com>
13066
13067         * config/arm/arm-fpus.def: New.
13068         * config/arm/genopt.sh: Generate Enum and EnumValue entries from
13069         arm-fpus.def.
13070         * config/arm/arm-tables.opt: Regenerate.
13071         * config/arm/arm.c (all_fpus): Move contents to arm-fpus.def.
13072         (arm_option_override): Don't decode FPU name to string here.
13073         * config/arm/arm.opt (mfpu=): Use Enum.
13074         * config/arm/t-arm ($(srcdir)/config/arm/arm-tables.opt, arm.o):
13075         Update dependencies.
13076
13077 2011-05-19  Joseph Myers  <joseph@codesourcery.com>
13078
13079         * collect2.c: Include diagnostic.h.
13080         (fatal_perror, fatal, error, fancy_abort): Remove.
13081         (main): Set progname.  Call xmalloc_set_program_name and
13082         diagnostic_initialize.
13083         (maybe_run_lto_and_relink, main, collect_execute, scan_prog_file,
13084         scan_libraries, resolve_lib_name): Call fatal_error instead of
13085         fatal and fatal_perror.
13086         * collect2.h (error, fatal, fatal_perror): Don't declare.
13087         * tlink.c: Include diagnostic-core.h.
13088         (recompile_files): Call fatal_error instead of fatal_perror.
13089         * Makefile.in (COLLECT2_OBJS): Include diagnostic.o,
13090         pretty-print.o and input.o.
13091         (collect2.o, tlink.o): Update dependencies.
13092
13093 2011-05-19  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
13094
13095         * config/i386/i386.md (tls_initial_exec_64_sun): Add semicolon.
13096
13097 2011-05-19  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
13098
13099         PR target/40483
13100         * configure.ac (gcc_cv_as_comdat_group_group): Check for Sun as
13101         COMDAT group syntax, both SPARC and x86 variants.
13102         (HAVE_COMDAT_GROUP): Also define if gcc_cv_as_comdat_group_group.
13103         * configure: Regenerate.
13104         * config/sol2.h (TARGET_SOLARIS): Define.
13105         (PUSHSECTION_FORMAT): Remove.
13106         (SECTION_NAME_FORMAT): Define.
13107         * config/sol2.c: Include hashtab.h.
13108         (solaris_output_init_fini): Replace PUSHSECTION_FORMAT by its
13109         expansion, using SECTION_NAME_FORMAT.
13110         (solaris_comdat_htab): New variable.
13111         (struct comdat_entry): Define.
13112         (comdat_hash): New function.
13113         (comdat_eq): New function.
13114         (solaris_elf_asm_comdat_section): New function.
13115         (solaris_define_comdat_signature): New function.
13116         (solaris_code_end): New function.
13117         * config/sol2-protos.h (solaris_elf_asm_comdat_section): Declare.
13118         (solaris_code_end): Declare.
13119         * config/t-sol2 (sol2.o): Add $HASHTAB_H dependency.
13120         * config/i386/i386.c (ix86_code_end) [TARGET_SOLARIS]: Call
13121         solaris_code_end.
13122         (i386_solaris_elf_named_section): Wrap in TARGET_SOLARIS.
13123         Remove ATTRIBUTE_UNUSED.
13124         [!USE_GAS]: Call solaris_elf_asm_comdat_section for
13125         SECTION_LINKONCE sections if HAVE_COMDAT_GROUP.
13126         * config/sparc/sparc.c (sparc_solaris_elf_asm_named_section): Likewise.
13127         * config/i386/sol2-10.h (TARGET_ASM_NAMED_SECTION): Moved ...
13128         * config/i386/sol2.h (TARGET_ASM_NAMED_SECTION): ... here.
13129         * config/sparc/sol2.h (TARGET_ASM_CODE_END): Redefine.
13130         (PUSHSECTION_FORMAT): Remove.
13131         (SECTION_NAME_FORMAT): Redefine.
13132
13133 2011-05-19  Kai Tietz  <ktietz@redhat.com>
13134
13135         * tree-cfg.c (verify_gimple_assign_binary): Barf on
13136         TRUTH_AND_EXPR, TRUTH_OR_EXPR, and TRUTH_XOR_EXPR.
13137         (gimplify_expr): Move TRUTH_AND|OR|XOR_EXPR to its binary form.
13138
13139 2011-05-19  Anatoly Sokolov  <aesok@post.ru>
13140             Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
13141
13142         * config/t-sol2 (sol2.o): Add $(TARGET_H) dependency.
13143
13144 2011-05-19  Richard Guenther  <rguenther@suse.de>
13145
13146         PR middle-end/48985
13147         * tree-object-size.c (addr_object_size): If the pointed-to
13148         variable is a decl use DECL_SIZE_UNIT instead of TYPE_SIZE_UNIT.
13149
13150 2011-05-19  Richard Guenther  <rguenther@suse.de>
13151
13152         * gimple.c (gimple_types_compatible_p_1): Compare names of
13153         the types themselves.
13154         (iterative_hash_gimple_type): And hash them that way.
13155         (gimple_register_type_1): If we register a main variant properly
13156         initialize the leader to ourselves.
13157
13158 2011-05-19  Tom de Vries  <tom@codesourcery.com>
13159
13160         PR target/45098
13161         * tree-ssa-loop-ivopts.c (get_expr_id): Factored new function out of
13162         get_loop_invariant_expr_id.
13163         (get_loop_invariant_expr_id): Use get_expr_id.
13164         (parm_decl_cost): New function.
13165         (determine_use_iv_cost_condition): Use get_expr_id and parm_decl_cost.
13166         Improve bound cost estimation.  Use different inv_expr_id for elim and
13167         express cases.
13168
13169 2011-05-19  Tom de Vries  <tom@codesourcery.com>
13170
13171         PR target/45098
13172         * tree-ssa-loop-ivopts.c (determine_iv_cost): Prevent
13173         cost_base.cost == 0.
13174
13175 2011-05-18  H.J. Lu  <hongjiu.lu@intel.com>
13176
13177         PR target/49002
13178         * config/i386/sse.md
13179         (avx_<ssemodesuffix><avxsizesuffix>_<ssemodesuffix>): Properly handle
13180         load cast.
13181
13182 2011-05-18  Jakub Jelinek  <jakub@redhat.com>
13183
13184         PR tree-optimization/49039
13185         * tree-vrp.c (extract_range_from_binary_expr): For
13186         MIN_EXPR <~[a, b], ~[c, d]> and MAX_EXPR <~[a, b], ~[c, d]>
13187         return ~[MAX_EXPR <a, c>, MIN_EXPR <b, d>].
13188
13189 2011-05-18  Tom de Vries  <tom@codesourcery.com>
13190
13191         PR target/45098
13192         * tree-ssa-loop-ivopts.c (computation_cost): Prevent cost of 0.
13193
13194 2011-05-18  Uros Bizjak  <ubizjak@gmail.com>
13195
13196         * config/i386/i386.md (*tls_global_dynamic_32_gnu): Split asm template.
13197         (*tls_global_dynamic_64): Ditto.
13198         (*tls_local_dynamic_base_32_gnu): Ditto.
13199         (*tls_local_dynamic_base_64): Ditto.
13200         (tls_initial_exec_64_sun): Ditto.
13201
13202 2011-05-18  Stuart Henderson  <shenders@gcc.gnu.org>
13203
13204         * doc/invoke.texi (Blackfin Options): -mcpu accepts bf592.
13205         * config/bfin/t-bfin-elf (MULTILIB_MATCHES): Select bf532-none for
13206         bf592-none.
13207         * config/bfin/t-bfin-linux (MULTILIB_MATCHES): Likewise.
13208         * config/bfin/t-bfin-uclinux (MULTILIB_MATCHES): Likewise.
13209         * config/bfin/bfin.c (bfin_cpus): Add bf592.
13210         * config/bfin/bfin.h (TARGET_CPU_CPP_BUILTINS): Define
13211         __ADSPBF592__ and __ADSPBF59x__ for BFIN_CPU_BF592.
13212         * config/bfin/bfin-opts.h (bfin_cpu_type): Add BFIN_CPU_BF592.
13213         * config/bfin/elf.h (LIB_SPEC): Add bf592.
13214
13215 2011-05-18  Joseph Myers  <joseph@codesourcery.com>
13216
13217         * config/arm/arm-opts.h (enum arm_fp16_format_type, enum
13218         arm_abi_type, enum float_abi_type, enum arm_tp_type): Move from arm.h.
13219         * config/arm/arm.c (arm_float_abi, arm_fp16_format, arm_abi,
13220         target_thread_pointer, arm_structure_size_boundary, struct
13221         float_abi, all_float_abis, struct fp16_format, all_fp16_formats,
13222         struct abi_name, arm_all_abis): Remove.
13223         (arm_option_override) Don't process most enumerated option values here.
13224         Don't process target_fpe_name here.  Work with integer not string for
13225         structure size boundary; use separate diagnostics for each case.
13226         * config/arm/arm.h (enum float_abi_type, enum
13227         arm_fp16_format_type, enum arm_abi_type, enum arm_tp_type): Move
13228         to arm-opts.h.
13229         (arm_float_abi, arm_fp16_format, arm_abi, target_thread_pointer,
13230         arm_structure_size_boundary): Remove.
13231         * config/arm/arm.opt (mabi=): Use Enum and Init.
13232         (arm_abi_type): New Enum and EnumValue entries.
13233         (mfloat-abi=): Use Enum and Init.
13234         (float_abi_type): New Enum and EnumValue entries.
13235         (mfp=, mfpe=): Replace by separate Alias entries for each argument.
13236         (mfp16-format=): Use Enum and Init.
13237         (arm_fp16_format_type): New Enum and EnumValue entries.
13238         (mstructure-size-boundary=): Use UInteger and Init.
13239         (mtp=): Use Enum and Init.
13240         (arm_tp_type): New Enum and EnumValue entries.
13241
13242 2011-05-18  Richard Guenther  <rguenther@suse.de>
13243
13244         PR tree-optimization/49018
13245         * gimple.c (gimple_has_side_effects): Volatile asms have side-effects.
13246         * tree-ssa-ifcombine.c (bb_no_side_effects_p): Use
13247         gimple_has_side_effects.
13248
13249 2011-05-18  Richard Guenther  <rguenther@suse.de>
13250
13251         * gimple.c (gimple_register_type_1): New function, split out from ...
13252         (gimple_register_type): ... here.  Avoid infinite recursion.
13253
13254 2011-05-18  Ira Rosen  <ira.rosen@linaro.org>
13255
13256         PR tree-optimization/41881
13257         * tree-vectorizer.h (struct _loop_vec_info): Add new field
13258         reduction_chains along with a macro for its access.
13259         * tree-vect-loop.c (new_loop_vec_info): Initialize reduction chains.
13260         (destroy_loop_vec_info): Free reduction chains.
13261         (vect_analyze_loop_2): Return false if vect_analyze_slp() returns false.
13262         (vect_is_slp_reduction): New function.
13263         (vect_is_simple_reduction_1): Call vect_is_slp_reduction.
13264         (vect_create_epilog_for_reduction): Support SLP reduction chains.
13265         * tree-vect-slp.c (vect_get_and_check_slp_defs): Allow different
13266         definition types for reduction chains.
13267         (vect_supported_load_permutation_p): Don't allow permutations for
13268         reduction chains.
13269         (vect_analyze_slp_instance): Support reduction chains.
13270         (vect_analyze_slp): Try to build SLP instance from reduction chains.
13271         (vect_get_constant_vectors):  Handle reduction chains.
13272         (vect_schedule_slp_instance): Mark the first statement of the
13273         reduction chain as reduction.
13274
13275 2011-05-18  Ira Rosen  <ira.rosen@linaro.org>
13276
13277         * tree-vect-loop-manip.c (vect_create_cond_for_alias_checks): Use new
13278         names for group elements access.
13279         * tree-vectorizer.h (struct _stmt_vec_info): Use interleaving info for
13280         reduction chains as well.  Remove data reference and interleaving
13281         related words from the fields names.
13282         * tree-vect-loop.c (vect_transform_loop): Use new names for group
13283         elements access.
13284         * tree-vect-data-refs.c (vect_get_place_in_interleaving_chain,
13285         vect_insert_into_interleaving_chain, vect_update_interleaving_chain,
13286         vect_update_interleaving_chain, vect_same_range_drs,
13287         vect_analyze_data_ref_dependence, vect_update_misalignment_for_peel,
13288         vect_verify_datarefs_alignment, vector_alignment_reachable_p,
13289         vect_peeling_hash_get_lowest_cost, vect_enhance_data_refs_alignment,
13290         vect_analyze_group_access, vect_analyze_data_ref_access,
13291         vect_create_data_ref_ptr, vect_transform_strided_load,
13292         vect_record_strided_load_vectors): Likewise.
13293         * tree-vect-stmts.c (vect_model_simple_cost, vect_model_store_cost,
13294         vect_model_load_cost, vectorizable_store, vectorizable_load,
13295         vect_remove_stores, new_stmt_vec_info): Likewise.
13296         * tree-vect-slp.c (vect_build_slp_tree,
13297         vect_supported_slp_permutation_p, vect_analyze_slp_instance): Likewise.
13298
13299 2011-05-18  Richard Guenther  <rguenther@suse.de>
13300
13301         PR middle-end/48989
13302         * tree-cfg.c (verify_gimple_assign_unary): Adjust TRUTH op
13303         operand verification.
13304         (verify_gimple_assign_binary): Likewise.
13305         * tree-ssa.c (useless_type_conversion_p): Preserve conversions
13306         to non-1-precision BOOLEAN_TYPEs.
13307
13308 2011-05-18  Tom de Vries  <tom@codesourcery.com>
13309
13310         PR target/45098
13311         * tree-ssa-loop-ivopts.c (seq_cost): Fix call to rtx_cost.
13312
13313 2011-05-18  Jakub Jelinek  <jakub@redhat.com>
13314
13315         PR tree-optimization/49000
13316         * tree-ssa.c (execute_update_addresses_taken): Call
13317         maybe_rewrite_mem_ref_base on debug stmt value.  If it couldn't
13318         be rewritten and decl has been marked for renaming, reset
13319         the debug stmt.
13320
13321 2011-05-17  Joseph Myers  <joseph@codesourcery.com>
13322
13323         * config/i386/i386.c (ix86_valid_target_attribute_tree): Use
13324         enum_opts_set when testing if attributes have set -mfpmath=.
13325
13326 2011-05-17  Richard Sandiford  <rdsandiford@googlemail.com>
13327
13328         * config/mips/mips.c (mips_handle_option): Remove unused variable.
13329
13330 2011-05-17  Uros Bizjak  <ubizjak@gmail.com>
13331
13332         * ipa-inline-analysis.c (inline_node_duplication_hook): Initialize
13333         info->entry with 0
13334         * tree-inline.c (maybe_inline_call_in_expr):  Initialize
13335         id.transform_lang_insert_block with NULL.
13336
13337 2011-05-17  Uros Bizjak  <ubizjak@gmail.com>
13338
13339         * config/i386/i386-protos.h (output_fix_trunc): Change arg 3 to bool.
13340         (output_fp_compare): Change args 3 and 4 to bool.
13341         (ix86_expand_call): Change arg 6 to bool.
13342         (ix86_attr_length_immediate_default): Change arg 2 to bool.
13343         (ix86_attr_length_vex_default): Change arg 3 to bool.
13344         * config/i386/i386.md: Update all uses.
13345         * config/i386/i386.c: Ditto.
13346         (ix86_flags_dependent): Change return type to bool.
13347
13348 2011-05-17  Richard Guenther  <rguenther@suse.de>
13349
13350         * gimple.c (type_hash_pair_compare): Fix comparison.
13351
13352 2011-05-17  Richard Guenther  <rguenther@suse.de>
13353
13354         * gimple.c (iterative_hash_gimple_type): Simplify singleton
13355         case some more, fix final hash value of the non-singleton case.
13356
13357 2011-05-17  Richard Guenther  <rguenther@suse.de>
13358
13359         PR bootstrap/49013
13360         Revert
13361         2011-05-16  Richard Guenther  <rguenther@suse.de>
13362
13363         * gimple.c (gimple_types_compatible_p_1): Use names of the
13364         type itself, not its main variant.
13365         (iterative_hash_gimple_type): Likewise.
13366
13367 2011-05-17  Richard Guenther  <rguenther@suse.de>
13368
13369         * gimple.c (gimple_register_canonical_type): Use the main-variant
13370         leader for computing the canonical type.
13371
13372 2011-05-17  Nick Clifton  <nickc@redhat.com>
13373
13374         * config/rx/rx.c (rx_memory_move_cost): Include cost of register
13375         moves.
13376
13377         * config/rx/rx.md: Add peephole to remove redundant extensions
13378         after loads.
13379         (bitset_in_memory): Use rx_restricted_mem_operand.
13380         (bitinvert_in_memory): Likewise.
13381         (bitclr_in_memory): Likewise.
13382
13383 2011-05-17  Kazuhio Inaoka  <kazuhiro.inaoka.ud@renesas.com>
13384             Nick Clifton  <nickc@redhat.com>
13385
13386         * config/rx/rx.md: Add peepholes to match a register move followed
13387         by a comparison of the moved register.  Replace these with an
13388         addition of zero that does both actions in one instruction.
13389
13390 2011-05-17  Jakub Jelinek  <jakub@redhat.com>
13391
13392         PR target/48986
13393         * config/i386/sync.md (sync_old_add<mode>): Relax operand 2
13394         predicate to allow CONST_INT.
13395         (*sync_old_add_cmp<mode>): New insn and peephole2 for it.
13396
13397 2011-05-16  Joseph Myers  <joseph@codesourcery.com>
13398
13399         * opts-common.c (opt_enum_arg_to_value): New.
13400         * opts.h (opt_enum_arg_to_value): Declare.
13401         * config/i386/i386.opt (fpmath): Remove.
13402         (mfpmath=): Use Enum, Init and Save.
13403         (fpmath_unit): New Enum and EnumValue entries.
13404         * config/i386/i386-c.c (ix86_pragma_target_parse): Update field
13405         name for function fpmath state.
13406         * config/i386/i386-opts.h (enum fpmath_unit): Move from i386.h.
13407         * config/i386/i386.c: Include diagnostic.h.
13408         (ix86_fpmath, IX86_FUNCTION_SPECIFIC_FPMATH): Remove.
13409         (ix86_target_string): Take enum fpmath_unit value instead of string.
13410         (ix86_debug_options): Update call to ix86_target_string.
13411         (ix86_option_override_internal): Don't process fpmath strings here.
13412         (x86_function_specific_save, ix86_function_specific_restore):
13413         Don't handle fpmath state specially.
13414         (ix86_function_specific_print): Pass fpmath state to
13415         ix86_target_string instead of printing in this function.
13416         (ix86_valid_target_attribute_inner_p): Take gcc_options pointer.
13417         Handle enum attributes.
13418         (IX86_ATTR_ENUM, ix86_opt_enum): New.
13419         (ix86_valid_target_attribute_tree): Update option_strings
13420         handling.  Handle fpmath as enum option.
13421         (ix86_can_inline_p): Update field names for function fpmath state.
13422         (ix86_expand_builtin): Update call to ix86_target_string.
13423         * config/i386/i386.h (enum fpmath_unit): Move to i386-opts.h.
13424         (ix86_fpmath): Remove.
13425         * config/i386/t-i386 (i386.o): Update dependencies.
13426
13427 2011-05-16  Joseph Myers  <joseph@codesourcery.com>
13428
13429         PR preprocessor/48677
13430         * cppspec.c (lang_specific_driver): Set new_decoded_options[0]
13431         from decoded_options[0], not from itself.
13432
13433 2011-05-16  Uros Bizjak  <ubizjak@gmail.com>
13434
13435         * config/i386/constraints.md (z): New constraint.
13436         * config/i386/i386.c (c): New mode attribute.
13437         (*call): Merge insn pattern from *call_0, *call_1, *call_1_rex64 and
13438         *call_1_rex64_large patterns using "P" mode iterator. Use "<c>zm"
13439         constraint for operand 0.
13440         (*call_vzeroupper): Ditto.
13441         (*call_rex64_ms_sysv): Ditto.  Use "rzm" constraint for operand 0.
13442         (*call_rex64_ms_sysv_vzeroupper): Ditto.
13443         (*call_pop): Merge insn pattern from *call_pop_0 and *call_pop_1.
13444         Use "lzm" constraint for operand 0.
13445         (*call_pop_vzeroupper): Ditto.
13446         (*sibcall): Merge insn pattern from *sibcall_0, *sibcall_1 and
13447         *sibcall_1_rex64 patterns using "P" mode iterator.  Use "Uz"
13448         constraint for operand 0.
13449         (*sibcall_vzeroupper): Ditto.
13450         (*sibcall_rex64_ms_sysv): Ditto.
13451         (*sibcall_rex64_ms_sysv_vzeroupper): Ditto.
13452         (*sibcall_pop): Merge insn pattern from *sibcall_pop_0 and
13453         *sibcall_pop_1.  Use "Uz" constraint for operand 0.
13454         (*sibcall_pop_vzeroupper): Ditto.
13455         (*call_value): Merge insn pattern from *call_value_0, *call_value_1,
13456         *call_value_1_rex64 and *call_value_1_rex64_large patterns using "P"
13457         mode iterator.  Use "<c>zm" constraint for operand 1.
13458         (*call_value_vzeroupper): Ditto.
13459         (*call_value_rex64_ms_sysv): Ditto.  Use "rzm" constraint
13460         for operand 1.
13461         (*call_value_rex64_ms_sysv_vzeroupper): Ditto.
13462         (*call_value_pop): Merge insn pattern from *call_value_pop_0 and
13463         *call_value_pop_1.  Use "lzm" constraint for operand 1.
13464         (*call_value_pop_vzeroupper): Ditto.
13465         (*sibcall_value): Merge insn pattern from *sibcall_value_0,
13466         *sibcall_value_1 and *sibcall_value_1_rex64 patterns using "P"
13467         mode iterator.  Use "Uz" constraint for operand 1.
13468         (*sibcall_value_vzeroupper): Ditto.
13469         (*sibcall_value_rex64_ms_sysv): Ditto.
13470         (*sibcall_value_rex64_ms_sysv_vzeroupper): Ditto.
13471         (*sibcall_value_pop): Rename from *sibcall_pop_1.  Use "Uz"
13472         constraint for operand 1.
13473         (*sibcall_value_pop_vzeroupper): Ditto.
13474         (*tls_global_dynamic_64): Use constant_call_address_operand predicate
13475         and "z" constraint for operand 2.
13476         (*tls_global_dynamic_32_gnu): Ditto.
13477         (*tls_local_dynamic_base_32_gnu): Ditto.
13478         (*tls_local_dynamic_base_64): Ditto.
13479         (*tls_local_dynamic_32_once): Ditto.
13480         * config/i386/i386.c (ix86_output_call_insn): Remove int_addr argument.
13481         Update all callers.
13482         * config/i386/i386-protos.h (ix86_output_call_insn): Update prototype.
13483
13484 2011-05-16  Richard Guenther  <rguenther@suse.de>
13485
13486         * gimple.c (gimple_types_compatible_p_1): Use names of the
13487         type itself, not its main variant.
13488         (iterative_hash_gimple_type): Likewise.
13489
13490 2011-05-16  Richard Guenther  <rguenther@suse.de>
13491
13492         * gimple.c (iterative_hash_gimple_type): Re-instantiate change to
13493         always visit pointer target and function result and argument types.
13494
13495 2011-05-16  Jason Merrill  <jason@redhat.com>
13496
13497         PR c++/48999
13498         * tree-inline.c (copy_statement_list): Put back recursion.
13499
13500 2011-05-16  Georg-Johann Lay  <avr@gjlay.de>
13501
13502         PR target/27663
13503         PR target/41076
13504         * config/avr/predicates.md (const_8_16_24_operand): New predicate.
13505         * config/avr/avr.md ("*ior<mode>qi.byte0",
13506         "*ior<mode>qi.byte1-3"): New define_insn_and_split patterns.
13507
13508 2011-05-16  Georg-Johann Lay  <avr@gjlay.de>
13509
13510         PR target/45099
13511         * config/avr/avr.c (avr_function_arg_advance): Error if a fixed
13512         register is needed for a function argument.
13513
13514 2011-05-16  Richard Guenther  <rguenther@suse.de>
13515
13516         * gimple.c (struct type_hash_pair): New type.
13517         (type_hash_pair_compare): New function.
13518         (iterative_hash_gimple_type): Mix in SCC member hashes in hash-order.
13519
13520 2011-05-16  Revital Eres  <revital.eres@linaro.org>
13521
13522         * modulo-sched.c (doloop_register_get): Check !DEBUG_INSN_P first.
13523
13524 2011-05-15  Uros Bizjak  <ubizjak@gmail.com>
13525
13526         * config/i386/i386.md (floating point move splitters): Fix
13527         usage of standard_80387_constant_p.
13528         * config/i386/i386.c (ix86_preferred_reload_class): Ditto.
13529
13530 2011-05-15  Uros Bizjak  <ubizjak@gmail.com>
13531
13532         * config/i386/i386.md (*movdf_internal): Simplify insn condition.
13533
13534 2011-05-14  Eric Botcazou  <ebotcazou@adacore.com>
13535
13536         * tree-ssa-loop-im.c (SET_ALWAYS_EXECUTED_IN): New macro.
13537         (fill_always_executed_in): Use [SET_]ALWAYS_EXECUTED_IN.
13538         (tree_ssa_lim_finalize): Likewise.
13539
13540 2011-05-14  Uros Bizjak  <ubizjak@gmail.com>
13541
13542         * config/i386/constraint.md (Yd, Yx): New register constraints.
13543         * config/i386/i386.md (*pushdf): Merge with *pushdf_nointeger.  Use
13544         Yd conditional register constraint.
13545         (*movtf_internal): Use standard_sse_constant_opcode.
13546         (*movxf_internal): Merge with *movxf_internal_nointeger.  Use
13547         Yx conditional register constraint.
13548         (*movdf_internal): Merge with *movdf_internal_nointeger.  Use
13549         Yd conditional register constraint.  Use standard_sse_constant_p to
13550         check for valid SSE constants and call standard_sse_constant_opcode to
13551         output SSE insn.
13552         (*movsf_internal): Use standard_sse_constant_p to check for valid SSE
13553         constants and call standard_sse_constant_opcode to output SSE insn.
13554         * config/i386/i386.c (ix86_option_ovverride_internal): Set
13555         TARGET_INTEGER_DFMODE_MOVES for 64bit targets.  Clear it when
13556         optimize_size is set.
13557         (standard_sse_constant_opcode): Output conditional AVX insn templates.
13558
13559 2011-05-14  Tobias Burnus  <burnus@net-b.de>
13560
13561         * doc/invoke.texi (-Ofast): Also enables -fstack-arrays.
13562
13563 2011-05-13  Martin Jambor  <mjambor@suse.cz>
13564
13565         * ipa-prop.c (ipa_cst_from_jfunc): New function.
13566         * ipa-prop.h (ipa_cst_from_jfunc): Declare.
13567         * ipa-inline-analysis.c (evaluate_conditions_for_edge): Use it.
13568         (evaluate_conditions_for_ipcp_clone): Removed.
13569         (estimate_ipcp_clone_size_and_time): Accept vector of known constants.
13570         * ipa-cp.c (ipcp_estimate_growth): Build vector of known constants.
13571         * ipa-inline.h (estimate_ipcp_clone_size_and_time): Update.
13572
13573 2011-05-13  Eric Botcazou  <ebotcazou@adacore.com>
13574
13575         * cfgrtl.c (cfg_layout_redirect_edge_and_branch): Adjust dump message.
13576         * regcprop.c (copyprop_hardreg_forward): Test MAY_HAVE_DEBUG_INSNS in
13577         lieu of MAY_HAVE_DEBUG_STMTS.
13578         * tree-cfgcleanup.c (remove_forwarder_block): Do not attempt to move
13579         debug statements if !MAY_HAVE_DEBUG_STMTS.
13580
13581 2011-05-13  Martin Thuresson  <martint@google.com>
13582
13583         PR gcov-profile/47793
13584         * libgcov.c (gcov_exit): Support relative profile paths.
13585         * doc/invoke.texi (-fprofile-dir): Update for above change.
13586
13587 2011-05-13  Richard Guenther  <rguenther@suse.de>
13588
13589         * gimple.c (gimple_canonical_types_compatible_p): Do not use
13590         type-pair caching, do not compare hashes.
13591
13592 2011-05-13  Nathan Froyd  <froydnj@codesourcery.com>
13593
13594         PR middle-end/48965
13595         * tree-cfg.c (edge_to_cases_cleanup): Return true.
13596         (verify_expr) [CASE_LABEL_EXPR]: Add checking.
13597
13598 2011-05-13  Kai Tietz  <ktietz@redhat.com>
13599
13600         * gimplify.c (gimplify_expr): Make sure operand is boolified.
13601         * tree-cfg.c (verify_gimple_assign_unary): Check for boolean
13602         compatible type for TRUTH_NOT_EXPR.
13603
13604 2011-05-13  H.J. Lu  <hongjiu.lu@intel.com>
13605
13606         * config/i386/i386.c (ix86_save_reg): Change return type to bool.
13607         (ix86_hard_regno_mode_ok): Change return value to bool.  Use
13608         can_create_pseudo_p ().
13609
13610 2011-05-13  Richard Guenther  <rguenther@suse.de>
13611
13612         PR lto/48978
13613         * gimple.c (iterative_hash_gimple_type): Revert change in
13614         pointer target and function result and argument hashing.
13615
13616 2011-05-13  Uros Bizjak  <ubizjak@gmail.com>
13617
13618         * config/i386/i386.md (*movxf_internal): Use !can_create_pseudo ().
13619         (*movxf_internal_nointeger): Ditto.
13620         (*movdf_internal_rex64): Ditto.
13621         (*movdf_internal): Ditto.
13622         (*movdf_internal_nointeger): Ditto.
13623         (*movsf_internal): Ditto.
13624         (sincos splitters): Use can_create_pseudo ().
13625
13626 2011-05-13  Joseph Myers  <joseph@codesourcery.com>
13627
13628         * config/i386/i386-opts.h: New.
13629         * gcc/config/i386/i386.c (stringop_alg, ix86_cmodel,
13630         ix86_asm_dialect, ix86_regparm, ix86_abi, ix86_branch_cost,
13631         ix86_section_threshold): Remove.
13632         (ix86_handle_option): Move MAX_CODE_ALIGN define here.  Handle
13633         OPT_malign_loops_, OPT_malign_jumps_, OPT_malign_functions_ and
13634         OPT_mbranch_cost_.
13635         (ix86_option_override_internal): Don't decode strings for options
13636         other than -march=, -mtune= and -mfpmath=.  Don't allow for
13637         __attribute__ uses in remaining diagnostics for options with
13638         string arguments.  Don't check for integer arguments being negative.
13639         * gcc/config/i386/i386.h (enum stringop_alg, enum calling_abi,
13640         enum tls_dialect, enum cmodel, enum asm_dialect): Move to i386-opts.h.
13641         (ix86_abi, ix86_tls_dialect, ix86_cmodel, ix86_asm_dialect,
13642         ix86_branch_cost, ix86_section_threshold): Remove.
13643         * gcc/config/i386/i386.opt (config/i386/i386-opts.h): New
13644         HeaderInclude.
13645         (malign-functions=, malign-jumps=, malign-loops=): Use UInteger
13646         but not Var.
13647         (masm=): Use Enum and Init.
13648         (asm_dialect): New Enum and EnumValue entries.
13649         (mbranch-cost=): Use UInteger.
13650         (mlarge-data-threshold=): Use UInteger and Init.
13651         (mcmodel=): Use Enum and Init.
13652         (cmodel): New Enum and EnumValue entries.
13653         (mpc): Replace with separate mpc32, mpc64 and mpc80 entries.
13654         (mpreferred-stack-boundary=, mincoming-stack-boundary=,
13655         mregparm=): Use UInteger.
13656         (mstringop-strategy=): Use Enum and Init.
13657         (stringop_alg): New Enum and EnumValue entries.
13658         (mtls-dialect=): Use Enum and Init.
13659         (tls_dialect): New Enum and EnumValue entries.
13660         (mabi=): Use Enum and Init.
13661         (calling_abi): New Enum and EnumValue entries.
13662         (mveclibabi=): Use Enum and Init.
13663         (ix86_veclibabi): New Enum and EnumValue entries.
13664
13665 2011-05-13  Nick Clifton  <nickc@redhat.com>
13666
13667         * config/rx/rx.md (mov expander): Fix use of rx_legitimate_constant_p.
13668         * config/rx/rx-protos.h (rx_legitimate_constant_p): Rename prototype.
13669
13670 2011-05-13  Kai Tietz  <ktietz@redhat.com>
13671
13672         PR middle-end/48984
13673         * gimplify.c (gimplify_expr): Check for boolean_type_node instead
13674         for BOOLEAN_TYPE for TRUTH-NOT/AND/OR/XOR.
13675         (gimple_boolify): Check for cast for boolean_type_node instead for
13676         BOOLEAN_TYPE.
13677
13678 2011-05-13  Richard Guenther  <rguenther@suse.de>
13679
13680         PR tree-optimization/48172
13681         * tree-vect-loop-manip.c (vect_vfa_segment_size): Avoid
13682         multiplying by number of iterations for equal step.
13683         (vect_create_cond_for_alias_checks): Likewise.
13684
13685 2011-05-13  Andreas Schwab  <schwab@redhat.com>
13686
13687         * configure.ac: Use AS_HELP_STRING throughout.
13688         * configure: Regenerate.
13689
13690 2011-05-12  H.J. Lu  <hongjiu.lu@intel.com>
13691
13692         * config/i386/i386.c (ix86_save_reg): Change maybe_eh_return to bool.
13693         (ix86_emit_restore_regs_using_mov): Likewise.
13694         (ix86_emit_restore_sse_regs_using_mov): Likewise.
13695
13696 2011-05-12  Anatoly Sokolov  <aesok@post.ru>
13697
13698         * config/sparc/sparc.h (REG_OK_FOR_INDEX_P, REG_OK_FOR_BASE_P,
13699         SYMBOLIC_CONST, RTX_OK_FOR_BASE_P, RTX_OK_FOR_INDEX_P): Remove.
13700         (RTX_OK_FOR_OFFSET_P, RTX_OK_FOR_OLO10_P): Move to...
13701         * config/sparc/sparc.c (RTX_OK_FOR_OFFSET_P,
13702         RTX_OK_FOR_OLO10_P): ...here.
13703         (sparc_mode_dependent_address_p): Use symbolic_operand instead of
13704         SYMBOLIC_CONST.
13705
13706 2011-05-12  Kai Tietz  <ktietz@redhat.com>
13707
13708         * gimplify.c (gimple_boolify): Re-boolify expression
13709         arguments even if expression type is of kind BOOLEAN_TYPE.
13710         (gimplify_boolean_expr): Removed.
13711         (gimplify_expr): Boolify truth opcodes AND, ANDIF, OR, ORIF,
13712         and XOR. Additional take care that we keep expression's type.
13713         * tree-cfg.c (verify_gimple_assign_binary): Adjust check for type
13714         of TRUTH_AND|OR|XOR_EXPR.
13715
13716 2011-05-12  Jakub Jelinek  <jakub@redhat.com>
13717
13718         PR tree-optimization/48975
13719         * tree-if-conv.c (combine_blocks): Call free_bb_predicate
13720         on all bbs here and free and clear ifc_bbs at the end.
13721
13722 2011-05-12  Richard Guenther  <rguenther@suse.de>
13723
13724         * gimple.c (gtc_visit): Compare TREE_ADDRESSABLE, handle
13725         NULLPTR_TYPE similar to VOID_TYPE.  Defer type-leader lookup
13726         until after simple checks.
13727         (gimple_types_compatible_p): Likewise.
13728         (iterative_hash_gimple_type): Always hash pointer targets
13729         and function return and argument types.
13730         (iterative_hash_canonical_type): Do not hash TYPE_QUALS,
13731         hash TYPE_ALIGN.  Do not hash TYPE_MIN/MAX_VALUE.
13732         (gimple_canonical_types_compatible_p): Compare TREE_ADDRESSABLE,
13733         handle NULLPTR_TYPE similar to VOID_TYPE.  Handle non-aggregates
13734         completely in the simple compare section.
13735         (gimple_register_canonical_type): Query the cache again after
13736         registering.
13737
13738 2011-05-12  Richard Guenther  <rguenther@suse.de>
13739
13740         PR tree-optimization/48172
13741         * tree-vect-loop-manip.c (vect_vfa_segment_size): Do not exclude
13742         the number of iterations from the segment size calculation.
13743         (vect_create_cond_for_alias_checks): Adjust.
13744
13745 2011-05-12  Jakub Jelinek  <jakub@redhat.com>
13746
13747         PR debug/48967
13748         * var-tracking.c (use_narrower_mode_test) <case REG>: Return 1
13749         if validate_subreg fails.
13750
13751 2011-05-12  Hariharan Sandanagobalane  <hariharan@picochip.com>
13752
13753         * ira.c (clarify_prohibited_class_mode_regs): Prevent the function from
13754         accessing beyond the end of REGNO_REG_CLASS array by stopping the loop
13755         early.
13756
13757 2011-05-12  DJ Delorie  <dj@redhat.com>
13758
13759         * config/rx/rx.c (rx_builtins): New arrays - holds builtin functions.
13760         (ADD_RX_BUILTIN1, ADD_RX_BUILTIN2, ADD_RX_BUILTIN3): Install
13761         created builtin into rx_builtins array.
13762         (rx_builtin_decl): New function.
13763         (TARGET_BUITLIN_DECL): Define.  Include gt-rx.h.
13764
13765 2011-05-12  DJ Delorie  <dj@redhat.com>
13766             Nick Clifton  <nickc@redhat.com>
13767
13768         * config/rx/rx.h (HAVE_PRE_DECREMENT): Fix typo.
13769         * config/rx/rx.c (CC_FLAG_FP): Fix comment.
13770         (rx_is_legitimate_address): Add pre-decrement and post-increment
13771         addressing in HImode and QImode.  Fix test for out of range
13772         REG+INT addressing.
13773         (rx_legitimate_constant_p): Rename to rx_is_legitimate_constant.
13774         (rx_align_for_label): Test label before extracting its usage count.
13775         (rx_adjust_insn_lengths): Fix selection of insn codes.
13776         (TARGET_LEGITIMATE_CONSTANT_P): Use renamed function.
13777
13778 2011-05-11  Jason Merrill  <jason@redhat.com>
13779
13780         * tree.c (type_hash_canon): Use struct tree_type_non_common.
13781
13782 2011-05-11  Eric Botcazou  <ebotcazou@adacore.com>
13783
13784         * cfgrtl.c (commit_one_edge_insertion): Remove always-true test and
13785         reindent the subsequent block.
13786
13787 2011-05-11  Satoru Takabayashi  <satorux@google.com>
13788             Paul Pluzhnikov  <ppluzhnikov@google.com>
13789
13790         * doc/install.texi (Configuration): Document --with-linker-hash-style.
13791         * gcc.c (init_spec): Handle LINKER_HASH_STYLE.
13792         * config.in: Add LINKER_HASH_STYLE.
13793         * configure.ac: Add --with-linker-hash-style.
13794         * configure: Regenerate.
13795
13796 2011-05-11  Richard Guenther  <rguenther@suse.de>
13797
13798         PR middle-end/48964
13799         * gimple.c (iterative_hash_canonical_type): Fix typo.
13800
13801 2011-05-11  Uros Bizjak  <ubizjak@gmail.com>
13802
13803         * config/i386/i386.c (legitimize_tls_address)
13804         <case TLS_MODEL_GLOBAL_DYNAMIC>: Call gen_tls_dynamic_gnu2_{32,64}
13805         expanders directly for TARGET_GNU2_TLS.  Determine pic and
13806         __tls_get_addr symbol reference here.  Update call to
13807         gen_tls_global_dynamic_{32,64} for added arguments.
13808         <case TLS_MODEL_LOCAL_DYNAMIC>: Call gen_tls_dynamic_gnu2_{32,64}
13809         expanders directly for TARGET_GNU2_TLS.  Determine
13810         __tls_get_addr symbol reference here.  Update call to
13811         gen_tls_local_dynamic_base_{32,64} for added arguments.  Attach
13812         unique UNSPEC REG_EQUIV to libcall block.
13813         (ix86_tls_get_addr): Declare static.
13814         * config/i386/i386-protos.h (ix86_tls_get_addr): Remove declaration.
13815         * config/i386/i386.md (tls_global_dynamic_32): Add operand 2 and 3.
13816         Do not determine pic and __tls_get_addr symbol reference here. Do not
13817         call gen_tls_dynamic_gnu2_32 for TARGET_GNU2_TLS.
13818         (tls_local_dynamic_base_32): Ditto for operands 1 and 2.
13819         (tls_global_dynamic_64): Add operand 2.  Do not determine
13820         __tls_get_addr symbol reference here.  Do not call
13821         gen_tls_dynamic_gnu2_64 for TARGET_GNU2_TLS here.
13822         (tls_local_dynamic_base64): Ditto for operand 1.
13823
13824 2011-05-11  Eric Botcazou  <ebotcazou@adacore.com>
13825
13826         * function.c (expand_function_start): Initialize stack_check_probe_note
13827         only if the generic stack checking mechanism is used.
13828
13829 2011-05-11  Richard Guenther  <rguenther@suse.de>
13830
13831         PR tree-optimization/15256
13832         * tree-ssa-forwprop.c (simplify_bitwise_binary): Canonicalize
13833         (A & B) | C, combine (A op CST1) op CST2.
13834         (tree_ssa_forward_propagate_single_use_vars): Only bother to
13835         visit assigns that have uses.
13836
13837 2011-05-11  Nathan Froyd  <froydnj@codesourcery.com>
13838
13839         * ggc-page.c (extra_order_size_table): Use struct tree_type_non_common.
13840         * lto-streamer-in.c (unpack_ts_type_value_fields): Rename to...
13841         (unpack_ts_type_common_value_fields): ...this.  Update comment.
13842         (unpack_value_fields): Adjust for renaming.
13843         (lto_input_ts_type_tree_pointers): Split into...
13844         (lto_input_ts_type_common_tree_pointer): ...this and...
13845         (lto_input_ts_type_non_common_tree_pointers): ...this.
13846         (lto_input_tree_pointers): Adjust for above split.
13847         * lto-streamer-out.c (pack_ts_type_value_fields): Rename to...
13848         (pack_ts_type_common_value_fields): ...this.  Update comment.
13849         (lto_output_ts_type_tree_pointers): Split into...
13850         (lto_output_ts_type_common_tree_pointers): ...this and...
13851         (lto_output_ts_type_non_common_tree_pointers): ...this.
13852         (lto_output_tree_pointers): Adjust for above split.
13853         * lto-streamer.c (check_handled_ts_structures): Mark TS_TYPE_COMMON,
13854         TS_TYPE_WITH_LANG_SPECIFIC, and TS_TYPE_NON_COMMON as handled.
13855         * stor-layout.c (vector_type_mode): Adjust location of mode field.
13856         * tree.h (MARK_TS_TYPE_COMMON, MARK_TS_TYPE_WITH_LANG_SPECIFIC):
13857         Define.
13858         (struct tree_type): Split into...
13859         (struct tree_type_common: ...this and...
13860         (struct tree_type_with_lang_specific): ...this and...
13861         (struct tree_type_non_common): ...this.  Adjust accessor macros
13862         accordingly.
13863         (TYPE_VALUES_RAW): Define.
13864         (union tree_node): Update for above changes.
13865         * tree.c (tree_node_structure_for_code) [tcc_type]: Return
13866         TS_TYPE_NON_COMMON.
13867         (initialize_tree_contains_struct) [TS_TYPE]: Use TS_TYPE_COMMON.
13868         Add TS_TYPE_WITH_LANG_SPECIFIC and TS_TYPE_NON_COMMON.
13869         (tree_code_size) [tcc_type]: Use struct tree_type_non_common.
13870         * treestructu.def (TS_TYPE): Remove.
13871         (TS_TYPE_COMMON, TS_TYPE_WITH_LANG_SPECIFIC, TS_TYPE_NON_COMMON):
13872         Define.
13873
13874 2011-05-11  Jakub Jelinek  <jakub@redhat.com>
13875
13876         PR debug/48159
13877         * tree-ssa.c (reset_debug_uses): New function.
13878         * tree-flow.h (reset_debug_uses): New prototype.
13879         * tree-data-ref.c (stmts_from_loop): Ignore debug stmts.
13880         * tree-loop-distribution.c (generate_loops_for_partition): Call
13881         reset_debug_uses on the stmts that will be removed.  Keep around
13882         all debug stmts, don't count them as bits in partition bitmap.
13883         (generate_builtin): Don't count debug stmts or labels as bits in
13884         partition bitmap.
13885
13886 2011-05-11  Richard Guenther  <rguenther@suse.de>
13887
13888         * gimple.c (gimple_type_hash_1): Merge with ...
13889         (gimple_type_hash): ... this.
13890         (gtc_visit): Remove mode parameter and simplify accordingly.
13891         (gimple_types_compatible_p_1): Likewise.
13892         (gimple_types_compatible_p): Likewise.
13893         (iterative_hash_gimple_type): Likewise.
13894         (visit): Likewise.
13895         (gimple_type_eq): Adjust.
13896
13897 2011-05-11  Revital Eres  <revital.eres@linaro.org>
13898
13899         * ddg.c (create_ddg_dep_from_intra_loop_link): If a true dep edge
13900         enters the branch create an anti edge in the opposite direction
13901         to prevent the creation of reg-moves.
13902         * modulo-sched.c: Adjust comment to reflect the fact we are
13903         scheduling closing branch.
13904         (PS_STAGE_COUNT): Rename to CALC_STAGE_COUNT and redefine.
13905         (stage_count): New field in struct partial_schedule.
13906         (calculate_stage_count): New function.
13907         (normalize_sched_times): Rename to reset_sched_times and handle
13908         incrementing the sched time of the nodes by a constant value
13909         passed as parameter.
13910         (duplicate_insns_of_cycles): Skip closing branch.
13911         (sms_schedule_by_order): Schedule closing branch.
13912         (ps_insn_find_column): Handle closing branch.
13913         (sms_schedule): Call reset_sched_times and adjust the code to
13914         support scheduling of the closing branch.
13915         (ps_insert_empty_row): Update calls to normalize_sched_times
13916         and rotate_partial_schedule functions.
13917
13918 2011-05-11  Richard Guenther  <rguenther@suse.de>
13919
13920         PR middle-end/48953
13921         * tree-inline.c (remap_gimple_op_r): Also remap types of MEM_REFs.
13922
13923 2011-05-11  Joseph Myers  <joseph@codesourcery.com>
13924
13925         * opts.c (finish_options): Move warning settings from process_options.
13926         * toplev.c (process_options): Move warning settings to finish_options.
13927
13928 2011-05-11  Richard Guenther  <rguenther@suse.de>
13929
13930         PR tree-optimization/18041
13931         * tree-ssa-forwprop.c (simplify_bitwise_and): Rename to ...
13932         (simplify_bitwise_binary): ... this.  Handle operand conversions
13933         by applying them to the result instead.
13934         (tree_ssa_forward_propagate_single_use_vars): Adjust.  CSE tree code.
13935
13936 2011-05-11  Richard Guenther  <rguenther@suse.de>
13937
13938         * gimple.c (gimple_canonical_types_compatible_p): Split out
13939         from gimple_types_compatible_p and friends.  Do not recurse
13940         to pointed-to types.
13941         (gimple_canonical_type_eq): Use it.
13942         (iterative_hash_canonical_type): Split out from
13943         iterative_hash_gimple_type and friends.  Do not recurse
13944         to pointed-to types.
13945         (gimple_canonical_type_hash): Use it, allocate the hash here.
13946
13947 2011-05-11  Revital Eres  <revital.eres@linaro.org>
13948
13949         * modulo-sched.c (doloop_register_get): Ignore DEBUG_INSNs while
13950         recognizing doloop.
13951
13952 2011-05-11  Revital Eres  <revital.eres@linaro.org>
13953
13954         * loop-doloop.c (doloop_condition_get): Use prev_nondebug_insn
13955         instead of PREV_INSN.
13956
13957 2011-05-11  Revital Eres  <revital.eres@linaro.org>
13958
13959         * modulo-sched.c (sms_schedule): Support new form of doloop pattern
13960         * loop-doloop.c (doloop_condition_get): Likewise.
13961         * config/arm/thumb2.md (*thumb2_addsi3_compare0): Remove "*".
13962         (doloop_end): New.
13963         * config/arm/arm.md (*addsi3_compare0): Remove "*".
13964
13965 2011-05-10  Nathan Froyd  <froydnj@codesourcery.com>
13966
13967         * tree.def (CASE_LABEL_EXPR): Add an operand.
13968         * tree.h (CASE_CHAIN): Use TREE_OPERAND instead of TREE_CHAIN.
13969
13970 2011-05-10  Joseph Myers  <joseph@codesourcery.com>
13971
13972         * c-decl.c (c_override_global_bindings_to_false): Remove.
13973         (global_bindings_p): Don't check
13974         c_override_global_bindings_to_false.
13975         * c-tree.h (c_override_global_bindings_to_false): Remove.
13976         * c-typeck.c (composite_type): Don't set
13977         c_override_global_bindings_to_false.
13978
13979 2011-05-10  Michael Meissner  <meissner@linux.vnet.ibm.com>
13980
13981         PR target/48857, 48495
13982         * config/rs6000/rs6000.h (VSX_SCALAR_MODE): Delete.
13983         (VSX_MODE): Ditto.
13984         (VSX_MOVE_MODE): Ditto.
13985         (ALTIVEC_OR_VSX_VECTOR_MODE): New macro, combine all Altivec and
13986         VSX vector types.  Add V2DImode.
13987         (HARD_REGNO_CALLER_SAVE_MODE): Use it instead of
13988         ALTIVEC_VECTOR_MODE and VSX_VECTOR_MODE calls.
13989         (MODES_TIEABLE_P): Ditto.
13990
13991         * config/rs6000/rs6000.c (rs6000_emit_move): Use
13992         ALTIVEC_OR_VSX_MODE instead of ALTIVEC_VECTOR_MODE and
13993         VSX_VECTOR_MODE.
13994         (init_cumulative_args): Ditto.
13995         (rs6000_function_arg_boundary): Ditto.
13996         (rs6000_function_arg_advance_1): Ditto.
13997         (rs6000_function_arg): Ditto.
13998         (rs6000_function_ok_for_sibcall): Ditto.
13999         (emit_frame_save): Ditto.
14000         (rs6000_function_value): Ditto.
14001         (rs6000_libcall_value): Ditto.
14002
14003 2011-05-10  Joseph Myers  <joseph@codesourcery.com>
14004
14005         * config.gcc (i[34567]86-*-darwin*, x86_64-*-darwin*): Add
14006         i386/darwin-lib.h to $libgcc_tm_file.
14007         * config/i386/darwin.h (DECLARE_LIBRARY_RENAMES): Remove.
14008
14009 2011-05-10  Joseph Myers  <joseph@codesourcery.com>
14010
14011         * doc/sourcebuild.texi (Back End): Mention contrib/config-list.mk.
14012
14013 2011-05-10  Joseph Myers  <joseph@codesourcery.com>
14014
14015         * config/rs6000/genopt.sh, config/rs6000/rs6000-cpus.def: New files.
14016         * config/rs6000/rs6000-tables.opt: New file (generated).
14017         * config.gcc (powerpc*-*-*, rs6000*-*-*): Add
14018         rs6000/rs6000-tables.opt to extra_options.
14019         * config/rs6000/rs6000-opts.h (RS6000_CPU_OPTION_NATIVE): Define.
14020         * config/rs6000/rs6000.c (rs6000_select): Remove.
14021         (processor_target_table): Move contents to rs6000-cpus.def.
14022         (darwin_rs6000_override_options): Check
14023         global_options_set.x_rs6000_cpu_index instead of
14024         rs6000_select[1].string.
14025         (rs6000_option_override_internal): Likewise.
14026         (rs6000_handle_option): Don't assert that global structures are in
14027         use.  Don't handle OPT_mcpu_ and OPT_mtune_ here.
14028         (rs6000_default_cpu): New variable.
14029         (rs6000_file_start): Set it instead of local default_cpu.  Check
14030         rs6000_default_cpu, global_options_set.x_rs6000_cpu_index and
14031         global_options_set.x_rs6000_tune_index instead of rs6000_select.
14032         (rs6000_darwin_file_start): Check rs6000_default_cpu and
14033         global_options_set.x_rs6000_cpu_index instead of rs6000_select.
14034         * config/rs6000/rs6000.h (struct rs6000_cpu_select,
14035         rs6000_select): Remove.
14036         * config/rs6000/rs6000.opt (rs6000_cpu_index, rs6000_tune_index):
14037         Remove.
14038         (mcpu=, mtune=): Use Var, Init, Enum and Save.
14039         * config/rs6000/t-rs6000
14040         ($(srcdir)/config/rs6000/rs6000-tables.opt): New.
14041         * config/rs6000/eabispe.h (SUBSUBTARGET_OVERRIDE_OPTIONS): Check
14042         global_options_set.x_rs6000_cpu_index instead of
14043         rs6000_select[1].string.
14044         * config/rs6000/linuxspe.h (SUBSUBTARGET_OVERRIDE_OPTIONS): Check
14045         global_options_set.x_rs6000_cpu_index instead of
14046         rs6000_select[1].string.
14047
14048 2011-05-10  Joseph Myers  <joseph@codesourcery.com>
14049
14050         * config.gcc (libgcc_tm_file): Define instead of including files
14051         from ../../libgcc/config/ in tm_file.
14052         * configure.ac (libgcc_tm_file_list, libgcc_tm_include_list): Define.
14053         * configure: Regenerate.
14054         * Makefile.in (libgcc_tm_file_list, libgcc_tm_include_list,
14055         libgcc_tm.h, cs-libgcc_tm.h): New.
14056         (TM_H): Include libgcc_tm.h and $(libgcc_tm_file_list).
14057         (clean): Remove libgcc_tm.h.
14058         * config/arm/symbian.h (RENAME_LIBRARY): Remove.
14059         * mkconfig.sh: Include libgcc_tm.h in tm.h if USED_FOR_TARGET.
14060         * system.h (DECLARE_LIBRARY_RENAMES): Poison.
14061
14062 2011-05-10  Georg-Johann Lay  <avr@gjlay.de>
14063
14064         PR target/48896
14065         * config/avr/avr.c (avr_ret_register): Return unsigned int
14066         instead of int.
14067         (avr_function_value): Mark fn_decl_or_type as unused, don't pass
14068         it to avr_libcall_value.
14069         avr_expand_builtin): Use EXPAND_NORMAL as arg 4 in calls to
14070         expand_expr.
14071         (avr_expand_binop_builtin): Ditto.
14072         (avr_expand_unop_builtin): Ditto.
14073
14074 2011-05-10  DJ Delorie  <dj@redhat.com>
14075
14076         * config/rx/rx.h (JUMP_ALIGN, LABEL_ALIGN, LOOP_ALIGN): Define.
14077         (LABEL_ALIGN_AFTER_BARRIER): Pass label to rx_align_for_label
14078         * config/rx/rx.c (rx_align_for_label): Add label and
14079         uses_threshold parameters.  Do not align when the label is not
14080         used enough.
14081         * config/rx/rx-protos.h (rx_align_for_label): Update prototype.
14082
14083 2011-05-10  Richard Guenther  <rguenther@suse.de>
14084
14085         * tree-ssa-forwprop.c (combine_conversions): Pattern-match
14086         a series of conversions and apply foldings similar to what
14087         fold-const does.
14088         (tree_ssa_forward_propagate_single_use_vars): Call it.
14089
14090 2011-05-10  Jakub Jelinek  <jakub@redhat.com>
14091
14092         PR tree-optimization/48611
14093         PR tree-optimization/48794
14094         * tree-eh.c (remove_unreachable_handlers): Don't remove regions
14095         referenced from RESX or EH_DISPATCH arguments.
14096
14097         PR debug/48928
14098         * dfp.c (decimal_to_decnumber): Handle conversion from
14099         dconst{1,2,m1,half}.
14100
14101 2011-05-09  Uros Bizjak  <ubizjak@gmail.com>
14102
14103         * config/i386/i386.c (ix86_autovectorize_vector_sizes): Return 0
14104         for !flag_prefer_avx128.
14105         (ix86_preferred_simd_mode): Return word_mode for DFmode without SSE2.
14106
14107 2011-05-09  Eric Botcazou  <ebotcazou@adacore.com>
14108
14109         * fold-const.c (fold_range_test): Pass LOC to build_range_check.
14110         (fold_ternary_loc): Use expr_location_or.
14111
14112 2011-05-09  H.J. Lu  <hongjiu.lu@intel.com>
14113
14114         PR debug/48853
14115         * dwarf2out.c (mem_loc_descriptor) <case SUBREG>: If
14116         POINTERS_EXTEND_UNSIGNED is defined, don't give up if mode is
14117         Pmode and mem_mode is not VOIDmode.
14118
14119 2011-05-09  Ville Voutilainen  <ville.voutilainen@gmail.com>
14120
14121         * tree.h (TYPE_UNQUALIFIED, TYPE_QUAL_CONST, TYPE_QUAL_VOLATILE,
14122         TYPE_QUAL_RESTRICT): Convert to enum.
14123
14124 2011-05-09  Uros Bizjak  <ubizjak@gmail.com>
14125
14126         * config/i386/predicates.md (const_pow2_1_to_2_operand): Remove.
14127         (const_pow2_1_to_8_operand): Ditto.
14128         (const_pow2_1_to_128_operand): Ditto.
14129         (const_pow2_1_to_32768_operand): Ditto.
14130         * config/i386/mmx.md (*mmx_pinsrw): Use const_int_operand instead of
14131         const_pow2_1_to_8_operand for operand 3 predicate.  Use exact_log2
14132         in insn constraint to check integer value of operand 3.
14133         * config/i386/sse.md (*vec_setv4sf_sse4_1): Ditto.
14134
14135         (PINSR_MODE): New mode iterator.
14136         (sse2p4_1): New mode attribute.
14137         (<sse2p4_1>_pinsr<ssemodesuffix>): Merge insn from sse4_1_pinsrb,
14138         sse2_pinsrw, sse4_1_pinsrd and sse4_1_pinsrq using PINSR_MODE mode
14139         iterator.  Use const_int_operand instead of
14140         const_pow2_1_to_{2,8,128,32768}_operand for operand 3 predicate.  Use
14141         exact_log2 in insn constraint to check integer value of operand 3.
14142
14143 2011-05-09  Uros Bizjak  <ubizjak@gmail.com>
14144
14145         * config/i386/sse.md (blendbits): Remove mode attribute.
14146         (<sse4_1>_blend<ssemodesuffix><avxsizesuffix>): Use const_int_operand
14147         instead of const_0_to_<blendbits>_operand for operand 3 predicate.
14148         Check integer value of operand 3 in insn constraint.
14149
14150 2011-05-09  Richard Guenther  <rguenther@suse.de>
14151
14152         * lto-symtab.c (lto_cgraph_replace_node): Use types_compatible_p
14153         for diagnostics.
14154         (lto_symtab_merge): Likewise.  Do not register types here.
14155         (lto_symtab_merge_decls_2): Likewise.
14156         (lto_symtab_merge_decls_1): Likewise.
14157         * gimple.h (enum gtc_mode, gimple_types_compatible_p): Do not declare.
14158         * gimple.c (enum gtc_mode): Declare.
14159         (gimple_types_compatible_p): Make static.
14160
14161 2011-05-09  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
14162
14163         * config/s390/s390.md (TD/TF mem to reg move splitter): Make the
14164         temporary register to match Pmode.
14165
14166 2011-05-09  Uros Bizjak  <ubizjak@gmail.com>
14167
14168         * config/i386/sse.md (*vec_concatv4si): Merge from *vec_concatv4si_1
14169         and *vec_concatv4si_1_avx.
14170
14171 2011-05-09  Uros Bizjak  <ubizjak@gmail.com>
14172
14173         PR rtl-optimization/48927
14174         * ira-conflicts.c (commutative_constraint_p): Use
14175         recog_data.alternative_enabled_p to disable alternatives where
14176         "enabled" attribute is false.
14177         (get_dup_num): Ditto.
14178         * ira-lives.c (single_reg_class): Ditto.
14179         (ira_implicitly_set_insn_hard_regs): Ditto.
14180
14181 2011-05-09  Eric Botcazou  <ebotcazou@adacore.com>
14182
14183         * var-tracking.c (find_mem_expr_in_1pdv): Fix thinko.
14184         (dataflow_set_preserve_mem_locs): Likewise.
14185
14186 2011-05-09  Philipp Thomas  <pth@suse.de>
14187
14188         * config/mep/mep.c (mep_validate_vliw): Syntax description
14189         should not be translated.
14190
14191 2011-05-09  Joseph Myers  <joseph@codesourcery.com>
14192
14193         * config/mips/genopt.sh, config/mips/mips-cpus.def: New files.
14194         * config/mips/mips-tables.opt: New file (generated).
14195         * config.gcc (mips*-*-*): Add mips/mips-tables.opt to extra_options.
14196         * config/mips/mips-opts.h (MIPS_ARCH_OPTION_FROM_ABI,
14197         MIPS_ARCH_OPTION_NATIVE): Define.
14198         * config/mips/mips.c (mips_cpu_info_table): Move contents to
14199         mips-cpus.def.
14200         (mips_strict_matching_cpu_name_p, mips_matching_cpu_name_p,
14201         mips_parse_cpu): Remove.
14202         (mips_cpu_info_from_opt, mips_default_arch): New.
14203         (mips_handle_option): Don't assert that global structures are in
14204         use.  Don't handle OPT_march_, OPT_mtune_ and OPT_mips here.
14205         (mips_option_override): Use new variables and functions to set
14206         state of these options.  Use strcmp to check for individual CPU names.
14207         * config/mips/mips.h (MIPS_CPU_STRING_DEFAULT): Remove default
14208         definition.
14209         * config/mips/mips.opt (march=): Use ToLower and Enum.
14210         (mips): Use ToLower, Enum and Var.
14211         (mtune=): Use ToLower and Enum.
14212         * config/mips/t-mips ($(srcdir)/config/mips/mips-tables.opt): New.
14213
14214 2011-05-08  Jan Hubicka  <jh@suse.cz>
14215
14216         * gimple.c (type_pair_hash, type_pair_eq, lookup_type_pair):
14217         Arrange type pairs to be UID ordered.
14218         (gimple_lookup_type_leader): Make inline.
14219
14220 2011-05-09  Nick Clifton  <nickc@redhat.com>
14221
14222         PR target/48899
14223         * config/iq2000/iq2000.opt (iq2000_tune): Initialise to
14224         PROCESSOR_DEFAULT.
14225
14226         PR target/48897
14227         * config/mn10300/mn10300.c (extract_bundle): Remove spurious local
14228         variable 's'.
14229
14230 2011-05-08  Chung-Lin Tang  <cltang@codesourcery.com>
14231
14232         * combine.c (simplify_comparison): Abstract out parts into...
14233         (simplify_compare_const): ... new function.
14234         (try_combine): Generalize parallel arithmetic/compare combining
14235         to call simplify_compare_const() and CANONICALIZE_COMPARE().
14236
14237 2011-05-08  Jan Hubicka  <jh@suse.cz>
14238
14239         * cgraph.c (cgraph_clone_node): Add call_duplication_hook parameter.
14240         (cgraph_create_virtual_clone): Call hooks once virtual clone
14241         is finished.
14242         * cgraph.h (cgraph_clone_node): Update prototype.
14243         * ipa-cp.c (ipcp_estimate_growth): Use
14244         estimate_ipcp_clone_size_and_time.
14245         * ipa-inline-transform.c (clone_inlined_nodes): Update.
14246         * lto-cgraph.c (input_node): Update.
14247         * ipa-inline.c (recursive_inlining): Update.
14248         * ipa-inline.h (estimate_ipcp_clone_size_and_time): New function.
14249         (evaluate_conditions_for_known_args): Break out from ...
14250         (evaluate_conditions_for_edge): ... here.
14251         (evaluate_conditions_for_ipcp_clone): New function.
14252         (inline_node_duplication_hook): Update clone summary based
14253         on parameter map.
14254         (estimate_callee_size_and_time): Rename to ...
14255         (estimate_node_size_and_time): take NODE instead of EDGE;
14256         take POSSIBLE_TRUTHS as argument.
14257         (estimate_callee_size_and_time): Update.
14258         (estimate_ipcp_clone_size_and_time): New function.
14259         (do_estimate_edge_time): Update.
14260
14261 2011-05-08  Richard Guenther  <rguenther@suse.de>
14262
14263         PR middle-end/48908
14264         PR middle-end/48905
14265         * expmed.c (expand_shift_1): Compute adjusted constant shift
14266         amount manually.
14267
14268 2011-05-08  Eric Botcazou  <ebotcazou@adacore.com>
14269
14270         * config/avr/avr.c (print_operand_address): Fix invalid RTL access.
14271
14272 2011-05-08  Eric Botcazou  <ebotcazou@adacore.com>
14273
14274         * config/rs6000/rs6000.c (output_profile_hook): Fix thinko.
14275
14276 2011-05-08  Jonathan Wakely  <jwakely.gcc@gmail.com>
14277
14278         * doc/invoke.texi (-fuse-linker-plugin): Improve grammar.
14279
14280 2011-05-07  Jan Hubicka  <jh@suse.cz>
14281
14282         * ipa-inline-transform.c (inline_call): Account when program size
14283         decreases.
14284         * ipa-inline.c (relative_time_benefit): New function.
14285         (edge_badness): Reorganize to be power 2 based; fix thinko when
14286         computing badness for negative growth; update comments to match
14287         reality; better dumps.
14288
14289 2011-05-07  Eric Botcazou  <ebotcazou@adacore.com>
14290
14291         * langhooks.h (lang_hooks_for_types): Change global_bindings_p's return
14292         type to bool and adjust comment.
14293         * fold-const.c (fold_range_test): Adjust call to global_bindings_p.
14294         (fold_mathfn_compare): Remove calls to global_bindings_p.
14295         (fold_inf_compare): Likewise.
14296         * stor-layout.c (variable_size): Adjust call to global_bindings_p.
14297         * c-tree.h (global_bindings_p): Adjust prototype.
14298         * c-decl.c (global_bindings_p): Return bool and simplify.
14299
14300 2011-05-07  Zdenek Dvorak  <ook@ucw.cz>
14301
14302         PR tree-optimization/48837
14303         * tree-tailcall.c (tree_optimize_tail_calls_1): Do not mark tailcalls
14304         when accumulator transformation is performed.
14305
14306 2011-05-06  Jan Hubicka  <jh@suse.cz>
14307
14308         * i386.h (ix86_tune_indices): Add
14309         X86_TUNE_SOFTWARE_PREFETCHING_BENEFICIAL.
14310         (TARGET_SOFTWARE_PREFETCHING_BENEFICIAL): New macro.
14311         * i386.c (initial_ix86_tune_features): Add
14312         X86_SOFTARE_PREFETCHING_BENEFICIAL.
14313         (software_prefetching_beneficial_p): Remove predicate.
14314         (ix86_option_override_internal): Use new macro.
14315
14316 2011-05-06  Jan Hubicka  <jh@suse.cz>
14317
14318         * ipa-inline.c (update_callee_keys): Don't reset node growth cache.
14319
14320 2011-05-06  Jan Hubicka  <jh@suse.cz>
14321
14322         * cgraph.c (cgraph_add_thunk): Create real function node instead
14323         of alias node; finalize it and mark needed/reachale; arrange visibility
14324         to be right and add it into the corresponding same comdat group list.
14325         (dump_cgraph_node): Dump thunks.
14326         * cgraph.h (cgraph_first_defined_function, cgraph_next_defined_function,
14327         cgraph_function_with_gimple_body_p,
14328         cgraph_first_function_with_gimple_body,
14329         cgraph_next_function_with_gimple_body): New functions.
14330         (FOR_EACH_FUNCTION_WITH_GIMPLE_BODY, FOR_EACH_DEFINED_FUNCTION):
14331         New macros.
14332         * ipa-cp.c (ipcp_need_redirect_p): Thunks can't be redirected.
14333         (ipcp_generate_summary): Use FOR_EACH_FUNCTION_WITH_GIMPLE_BODY.
14334         * cgraphunit.c (cgraph_finalize_function): Only look into possible
14335         devirtualization when optimizing.
14336         (verify_cgraph_node): Verify thunks.
14337         (cgraph_analyze_function): Analyze thunks.
14338         (cgraph_mark_functions_to_output): Output thunks only in combination
14339         with function they are assigned to.
14340         (assemble_thunk): Turn thunk into non-thunk; don't try to turn
14341         alias into normal node.
14342         (assemble_thunks): New functoin.
14343         (cgraph_expand_function): Use it.
14344         * lto-cgraph.c (lto_output_node): Stream thunks.
14345         (input_overwrite_node): Stream in thunks.
14346         * ipa-pure-const.c (analyze_function): Thunks do nothing interesting.
14347         * lto-streamer-out.c (lto_output): Do not try to output thunk's body.
14348         * ipa-inline.c (inline_small_functions): Use FOR_EACH_DEFINED_FUNCTION.
14349         * ipa-inline-analysis.c (compute_inline_parameters): "Analyze" thunks.
14350         (inline_analyze_function): Do not care about thunk jump functions.
14351         (inline_generate_summary):Use FOR_EACH_DEFINED_FUNCTION.
14352         * ipa-prop.c (ipa_prop_write_jump_functions): Use
14353         cgraph_function_with_gimple_body_p.
14354         * passes.c (do_per_function_toporder): Use
14355         cgraph_function_with_gimple_body_p.
14356         (execute_one_pass);Use FOR_EACH_FUNCTION_WITH_GIMPLE_BODY.
14357         (ipa_write_summaries): Use cgraph_function_with_gimple_body_p.
14358         (function_called_by_processed_nodes_p): Likewise.
14359
14360 2011-05-06  Joseph Myers  <joseph@codesourcery.com>
14361
14362         * config/rs6000/rs6000.opt (rs6000_ieeequad, rs6000_altivec_abi,
14363         rs6000_spe_abi, rs6000_darwin64_abi): Remove TargetVariable
14364         entries.
14365         (mabi=): Replace with separate entries for mabi=altivec,
14366         mabi=no-altivec, mabi=spe, mabi=no-spe, mabi=d64, mabi=d32,
14367         mabi=ieeelongdouble and mabi=ibmlongdouble.
14368         * config/rs6000/rs6000.c (rs6000_option_override_internal): Move
14369         check for -mabi=spe without SPE ABI support here.
14370         (rs6000_handle_option): Replace OPT_mabi_ handling with
14371         OPT_mabi_altivec and OPT_mabi_spe handling.
14372
14373 2011-05-06  Cary Coutant  <ccoutant@google.com>
14374
14375         * dwarf2out.c (contains_subprogram_definition): New function.
14376         (should_move_die_to_comdat): Call it.
14377
14378 2011-05-06  Jeff Law  <law@redhat.com>
14379
14380         * tree-ssa-threadupdate.c (create_block_for_threading): Do not call
14381         remove_ctrl_stmt_and_useless_edges.
14382         (create_duplicates): Call remove_ctrl_stmt_and_useless_edges.
14383         (fixup_template_block, thread_single_edge): Likewise.
14384         (mark_threaded_blocks): Use THREAD_TARGET.
14385
14386 2011-05-06  Alan Modra  <amodra@gmail.com>
14387
14388         PR target/48900
14389         * config/rs6000/rs6000.c (rs6000_legitimize_tls_address): Use
14390         const0_rtx as the arg to the dummy __tls_get_addr libcall.
14391
14392 2011-05-06  Uros Bizjak  <ubizjak@gmail.com>
14393
14394         * config/i386/i386.md (*movdf_internal_nointeger): Apply "*"
14395         constraint modifier to "r".
14396
14397 2011-05-06  Joseph Myers  <joseph@codesourcery.com>
14398
14399         * config/rs6000/rs6000.c (rs6000_handle_option): Don't handle and
14400         fall through for OPT_mcmodel_.
14401
14402 2011-05-06  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
14403
14404         * config/s390/s390.c (s390_asm_trampoline_template): Comment
14405         instruction sizes.
14406         (s390_trampoline_init): Replace UNITS_PER_WORD with UNITS_PER_LONG.
14407
14408 2011-05-06  Ramana Radhakrishnan  <ramana.radhakrishnan@linaro.org>
14409
14410         PR target/47930
14411         * config/arm/arm.opt (marm): Document it.
14412         (mthumb): Reject negative variant.
14413
14414 2011-05-06  Uros Bizjak  <ubizjak@gmail.com>
14415
14416         PR target/48898
14417         * config/i386/netware.c (i386_nlm_maybe_mangle_decl_assembler_name):
14418         Fix typo in "ccvt" variable name.
14419
14420 2011-05-06  Tristan Gingold  <gingold@adacore.com>
14421
14422         PR target/48895
14423         * config/vms/vms-ar.c (main): Remove cwd variable.
14424
14425 2011-05-06  Jakub Jelinek  <jakub@redhat.com>
14426
14427         PR debug/48902
14428         * var-tracking.c (prepare_call_arguments): Move else before #endif.
14429
14430 2011-05-05  Nathan Froyd  <froydnj@codesourcery.com>
14431
14432         * except.c (sjlj_emit_dispatch_table): Call build_case_label.
14433         * gimplify.c (gimplify_switch_expr): Likewise.
14434         * omp-low.c (expand_omp_sections): Likewise.
14435         * tree-eh.c (lower_try_finally_switch): Likewise.
14436         (lower_eh_dispatch): Likewise.
14437         * tree.h (build_case_label): Declare.
14438         * tree.c (build_case_label): Define.
14439
14440 2011-05-05  Jason Merrill  <jason@redhat.com>
14441
14442         PR c++/40975
14443         * tree-inline.c (copy_tree_r): Use copy_statement_list.
14444         (copy_statement_list): Don't recurse.
14445         * stor-layout.c (copy_self_referential_tree_r): Don't allow
14446         STATEMENT_LIST.
14447
14448 2011-05-05  Joseph Myers  <joseph@codesourcery.com>
14449
14450         * config/rs6000/rs6000.c (rs6000_handle_option): Don't fall
14451         through from -mfpu= handling.
14452         * config/rs6000/rs6000.opt (mfpu=): Use Var and Init.
14453
14454 2011-05-05  Bernd Schmidt  <bernds@codesourcery.com>
14455
14456         * dwarf2out.c (dwarf2out_frame_debug_expr) [rule 10]: Handle
14457         POST_MODIFY.
14458
14459 2011-05-05  Steve Ellcey  <sje@cup.hp.com>
14460
14461         * config.gcc (hppa*64*-*-hpux11*): Modify tm_file and extra_options
14462         for 11.31.
14463         (hppa[12]*-*-hpux11*): Ditto.
14464         (ia64*-*-hpux*): Add ia64/hpux-unix2003.h to tm_file.
14465         * config/ia64/hpux-unix2003.h: New.
14466         * config/pa/pa-hpux1131.opt: New.
14467         * config/pa/pa-hpux1131.h: New.
14468         * config/pa/pa64-hpux.h (STARTFILE_SPEC): Use unix2003.o if requested.
14469         * config/pa/pa-hpux.opt (flag_pa_unix): Check TARGET_HPUX_11_31 value.
14470         * config/pa/pa.h (TARGET_HPUX_11_31): Provide default (0) value.
14471
14472 2011-05-05  Jakub Jelinek  <jakub@redhat.com>
14473
14474         PR debug/48853
14475         * dwarf2out.c (mem_loc_descriptor) <case SUBREG>: Pass mem_mode
14476         instead of mode as 3rd argument to recursive call.
14477         (mem_loc_descriptor) <case REG>: If POINTERS_EXTEND_UNSIGNED, don't
14478         emit DW_OP_GNU_regval_type if mode is Pmode and mem_mode is not
14479         VOIDmode.
14480         (mem_loc_descriptor) <case SYMBOL_REF>: If POINTERS_EXTEND_UNSIGNED,
14481         don't give up if mode is Pmode and mem_mode is not VOIDmode.
14482         (mem_loc_descriptor) <case CONST_INT>: If POINTERS_EXTEND_UNSIGNED,
14483         use int_loc_descriptor if mode is Pmode and mem_mode is not VOIDmode.
14484
14485 2011-05-05  Julian Brown  <julian@codesourcery.com>
14486
14487         * config/arm/neon.md (vec_set<mode>_internal): Fix misplaced
14488         parenthesis in D-register case.
14489
14490 2011-05-05  Joseph Myers  <joseph@codesourcery.com>
14491
14492         * opt-functions.awk (var_type_struct): Handle Enum options.
14493         * optc-gen.awk: Don't check range of variables of character type.
14494         * config/rs6000/rs6000.c (rs6000_sched_insert_nops_str,
14495         rs6000_sched_costly_dep_str, rs6000_recip_name, rs6000_abi_name,
14496         rs6000_sdata_name, rs6000_explicit_options): Remove.
14497         (rs6000_option_override_internal): Check for -malign-power here.
14498         Use global_options_set instead of rs6000_explicit_options.
14499         (rs6000_parse_fpu_option): Remove.
14500         (rs6000_handle_option): Access variables via opts and opts_set
14501         pointers.  Use error_at and warning_at.  Add fall-through
14502         comments.  Don't handle OPT_mcmodel_, OPT_maix_struct_return,
14503         OPT_msvr4_struct_return, OPT_mvrsave, OPT_mspe, OPT_mcall_,
14504         OPT_msdata_, OPT_mtls_size_, OPT_mtraceback_, OPT_mfloat_gprs_,
14505         OPT_msched_costly_dep_, OPT_malign_ or OPT_mrecip_ explicitly
14506         here.  Don't use rs6000_parse_fpu_option.
14507         * config/rs6000/rs6000.h (fpu_type): Remove declaration.
14508         * config/rs6000/rs6000.opt (rs6000_long_double_type_size,
14509         rs6000_spe, rs6000_float_gprs): Remove TargetVariable entries.
14510         (mrecip=): Use Var.
14511         (mspe): Use Var and Save.
14512         (mtraceback=): Use Enum and Var.
14513         (rs6000_traceback_type): New Enum and EnumValue entries.
14514         (mfloat-gprs=): Use Enum, Var and Save.
14515         (rs6000_float_gprs): New Enum and EnumValue entries.
14516         (mlong-double-): use Var and Save.
14517         (msched-costly-dep=, minsert-sched-nops=): Use Var.
14518         (malign-): Use Enum and Var.
14519         (rs6000_alignment_flags): New Enum and EnumValue entries.
14520         (mfpu=): Use Enum.
14521         (fpu_type_t): New Enum and EnumValue entries.
14522         * config/rs6000/aix43.h (SUBTARGET_OVERRIDE_OPTIONS): Use
14523         global_options_set instead of rs6000_explicit_options.
14524         * config/rs6000/aix52.h (SUBTARGET_OVERRIDE_OPTIONS): Use
14525         global_options_set instead of rs6000_explicit_options.
14526         * config/rs6000/aix53.h (SUBTARGET_OVERRIDE_OPTIONS): Use
14527         global_options_set instead of rs6000_explicit_options.
14528         * config/rs6000/aix61.h (SUBTARGET_OVERRIDE_OPTIONS): Use
14529         global_options_set instead of rs6000_explicit_options.
14530         * config/rs6000/e500-double.h (SUB3TARGET_OVERRIDE_OPTIONS): Use
14531         global_options_set instead of rs6000_explicit_options.
14532         * config/rs6000/eabispe.h (SUBSUBTARGET_OVERRIDE_OPTIONS): Use
14533         global_options_set instead of rs6000_explicit_options.
14534         (RS6000_DEFAULT_LONG_DOUBLE_SIZE): Remove commented-out
14535         definition.
14536         * config/rs6000/linux64.h (SUBSUBTARGET_OVERRIDE_OPTIONS): Use
14537         global_options_set instead of rs6000_explicit_options.
14538         * config/rs6000/linux64.opt (mcmodel=): Use Enum and Var.
14539         (rs6000_cmodel): New Enum and EnumValue entries.
14540         * config/rs6000/linuxspe.h (SUBSUBTARGET_OVERRIDE_OPTIONS): Use
14541         global_options_set instead of rs6000_explicit_options.
14542         * config/rs6000/sysv4.opt (mcall-, msdata=): Use Var.
14543         (mtls-size=): Use Enum and Var.
14544         (rs6000_tls_size): New Enum and EnumValue entries.
14545
14546 2011-05-05  Michael Matz  <matz@suse.de>
14547
14548         * config/alpha/elf.h (ENDFILE_SPEC): Add Ofast.
14549         * config/alpha/osf5.h (ENDFILE_SPEC): Add Ofast.
14550         * config/alpha/netbsd.h (ENDFILE_SPEC): Add Ofast.
14551         * config/sparc/linux.h (ENDFILE_SPEC): Add Ofast.
14552         * config/sparc/sp64-elf.h (ENDFILE_SPEC): Add Ofast.
14553         * config/sparc/sp-elf.h (ENDFILE_SPEC): Add Ofast.
14554         * config/sparc/linux64.h (ENDFILE_SPEC): Add Ofast.
14555         * config/sparc/freebsd.h (ENDFILE_SPEC): Add Ofast.
14556         * config/sparc/sol2.h (ENDFILE_SPEC): Add Ofast.
14557         * config/i386/cygwin.h (ENDFILE_SPEC): Add Ofast.
14558         * config/i386/gnu-user.h (ENDFILE_SPEC): Add Ofast.
14559         * config/i386/gnu-user64.h (ENDFILE_SPEC): Add Ofast.
14560         * config/i386/darwin.h (ENDFILE_SPEC): Add Ofast.
14561         * config/i386/mingw32.h (ENDFILE_SPEC): Add Ofast.
14562         * config/ia64/linux.h (ENDFILE_SPEC): Add Ofast.
14563         * config/mips/linux.h (ENDFILE_SPEC): Add Ofast.
14564
14565 2011-05-05  Richard Guenther  <rguenther@suse.de>
14566
14567         * expmed.c (expand_variable_shift): Rename to ...
14568         (expand_shift_1): ... this.  Take an expanded shift amount.
14569         For rotates recurse directly not building trees for the shift amount.
14570         (expand_variable_shift): Wrap around expand_shift_1.
14571         (expand_shift): Adjust.
14572
14573 2011-05-05  Jakub Jelinek  <jakub@redhat.com>
14574
14575         * gimplify.c (create_tmp_var_raw): Don't call build_type_variant.
14576
14577 2011-05-05  Eric Botcazou  <ebotcazou@adacore.com>
14578
14579         * tree.h (get_pending_sizes): Remove prototype.
14580         (put_pending_size): Likewise.
14581         (put_pending_sizes): Likewise.
14582         * stor-layout.c (pending_sizes): Delete.
14583         (get_pending_sizes): Likewise.
14584         (put_pending_size): Likewise.
14585         (put_pending_sizes): Likewise.
14586         (variable_size): Do not call put_pending_size and tidy up.
14587         * function.h (struct function): Remove dont_save_pending_sizes_p.
14588         * lto-streamer-in.c (input_function): Do not stream it.
14589         * lto-streamer-out.c (output_function): Likewise.
14590         * tree-inline.c (initialize_cfun): Do not copy it.
14591         * c-decl.c (store_parm_decls): Do not set it.
14592         * omp-low.c (create_task_copyfn): Likewise.
14593         * tree-optimize.c (tree_rest_of_compilation): Likewise.
14594
14595 2011-05-05  Uros Bizjak  <ubizjak@gmail.com>
14596
14597         * config/i386/i386.md (*movdf_internal_rex64): Simplify nested "if"
14598         conditions.
14599         (*movdf_internal): Ditto.
14600         (*movdf_internal_nointeger): Ditto.
14601         (*movsf_internal): Ditto.
14602
14603 2011-05-05  Joseph Myers  <joseph@codesourcery.com>
14604
14605         * c-decl.c (finish_decl): Don't call get_pending_sizes.
14606         (grokparm): Add parameter expr.  Pass it to grokdeclarator.
14607         (push_parm_decl): Add parameter expr.  Pass it to grokdeclarator.
14608         (c_variable_size): Remove.
14609         (grokdeclarator): Use save_expr instead of c_variable_size.  Don't
14610         call put_pending_sizes.
14611         (get_parm_info): Add parameter expr.  Use it to set
14612         arg_info->pending_sizes.
14613         (store_parm_decls): Use arg_info->pending_sizes instead or calling
14614         get_pending_sizes.
14615         * c-parser.c (c_parser_parms_declarator): Update call to
14616         c_parser_parms_list_declarator.
14617         (c_parser_parms_list_declarator): Take parameter expr.  Update
14618         call to push_parm_decl.  Update recursive call.  Don't call
14619         get_pending_sizes.  Update calls to get_parm_info.
14620         (c_parser_objc_method_definition): Update calls to
14621         c_parser_objc_method_decl and objc_start_method_definition.
14622         (c_parser_objc_methodproto): Update call to c_parser_objc_method_decl.
14623         (c_parser_objc_method_decl): Add parameter expr.  Update call to
14624         grokparm.
14625         (c_parser_objc_try_catch_finally_statement): Update call to grokparm.
14626         * c-tree.h (struct c_arg_info.pending_sizes): Change to a tree.
14627         (get_parm_info, grokparm, push_parm_decl): Update prototypes.
14628
14629 2011-05-05  Michael Hope  <michael.hope@linaro.org>
14630
14631         PR pch/45979
14632         * config/host-linux.c (TRY_EMPTY_VM_SPACE): Define for
14633         __ARM_EABI__ hosts.
14634
14635 2011-05-05  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
14636
14637         * config/spu/spu.c (TARGET_ASM_OUTPUT_MI_THUNK): Define.
14638         (TARGET_ASM_CAN_OUTPUT_MI_THUNK): Likewise.
14639         (spu_output_mi_thunk): New function.
14640
14641 2011-05-05  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
14642
14643         * config/sparc/sol2.h (ASM_OUTPUT_CALL): Use
14644         targetm.asm_out.print_operand.
14645         * config/sol2.c: Include target.h.
14646
14647 2011-05-04  Jan Hubicka  <jh@suse.cz>
14648
14649         * ipa-inline.c (reset_edge_caches): New function.
14650         (update_caller_keys): Add check_inlinablity_for; do not
14651         reset edge caches; remove now unnecesary loop.
14652         (update_callee_keys): Add comments; reset node_growth_cache of callee.
14653         (update_all_callee_keys): Likewise.
14654         (inline_small_functions): Sanity check cache; update code
14655         recomputing it.
14656
14657 2011-05-04  Bernd Schmidt  <bernds@codesourcery.com>
14658
14659         PR rtl-optimization/47612
14660         * df-problems.c (can_move_insns_across): Don't pick a cc0 setter
14661         as the last insn of the sequence to be moved.
14662
14663 2011-05-04  Tobias Burnus  <burnus@net-b.de>
14664
14665         PR fortran/48864
14666         * doc/invoke.texi (Ofast): Document that it
14667         enables Fortran's -fno-protect-parens.
14668
14669 2011-05-04  Uros Bizjak  <ubizjak@gmail.com>
14670
14671         * config/i386/i386.c (ix86_reorg): Run move_or_delete_vzeroupper first.
14672
14673 2011-05-04  Eric Botcazou  <ebotcazou@adacore.com>
14674
14675         * stor-layout.c (variable_size): Do not issue errors.
14676
14677 2011-05-04  Richard Guenther  <rguenther@suse.de>
14678
14679         * coverage.c (tree_coverage_counter_ref): Use integer_type_node
14680         for array-ref indices.
14681         (tree_coverage_counter_addr): Likewise.
14682         (build_fn_info_type): Use size_int for index types.
14683         (build_gcov_info): Likewise.
14684
14685 2011-05-04  Richard Guenther  <rguenther@suse.de>
14686
14687         * c-decl.c (check_bitfield_type_and_width): Do not pass NULL
14688         to build_int_cst.
14689         * c-typeck.c (really_start_incremental_init): Use bitsize_int
14690         for constructor indices.
14691         (push_init_level): Likewise.
14692
14693 2011-05-04  Richard Guenther  <rguenther@suse.de>
14694
14695         * explow.c (promote_mode): Move variable declarations before code.
14696
14697 2011-05-04  Nathan Froyd  <froydnj@codesourcery.com>
14698
14699         * tree.h (build_function_type_array): Declare.
14700         (build_varargs_function_type_array): Declare.
14701         (build_function_type_vec, build_varargs_function_type_vec): Define.
14702         * tree.c (build_function_type_array_1): New function.
14703         (build_function_type_array): New function.
14704         (build_varargs_function_type_array): New function.
14705
14706 2011-05-04  Richard Sandiford  <richard.sandiford@linaro.org>
14707
14708         * tree-vect-loop.c (vectorizable_reduction): Check reduction cost
14709         before setting STMT_VINFO_TYPE.
14710
14711 2011-05-04  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
14712
14713         * config/spu/spu.c (spu_gimplify_va_arg_expr): Call pass_by_reference
14714         instead of spu_pass_by_reference.
14715
14716 2011-05-04  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
14717
14718         * calls.c (emit_library_call_value_1): Invoke
14719         promote_function_mode hook on libcall arguments.
14720         * explow.c (promote_function_mode, promote_mode): Handle TYPE
14721         argument being NULL.
14722         * targhooks.c (default_promote_function_mode): Lisewise.
14723         * config/s390/s390.c (s390_promote_function_mode): Likewise.
14724         * config/sparc/sparc.c (sparc_promote_function_mode): Likewise.
14725
14726         * doc/tm.texi: Document that TYPE argument might be NULL.
14727
14728 2011-05-04  Stuart Henderson  <shenders@gcc.gnu.org>
14729
14730         * config/bfin/bfin.c (bfin_cpus): Update silicon revisions.
14731
14732 2011-05-04  Stuart Henderson  <shenders@gcc.gnu.org>
14733
14734         From Bernd Schmidt
14735         * config/bfin/bfin.md (addsi3): Add an alternative for IREGS.
14736
14737 2011-05-04  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
14738
14739         * config/alpha/alpha.h (CODE_MASK, MIPS_IS_STAB, MIPS_MARK_STAB)
14740         (MIPS_UNMARK_STAB, SHASH_SIZE, THASH_SIZE, ALIGN_SYMTABLE_OFFSET):
14741         Move ...
14742         * mips-tfile.c: ... here.
14743         Don't include coretypes.h, tm.h, filenames.h.
14744         (saber_stop): Remove definition and all calls.
14745         [__SABER__]: Remove.
14746         (__LINE__): Remove default.
14747         (Size_t, Ptrdiff_t): Remove definitions.
14748         Replace by size_t, ptrdiff_t.
14749         [!MIPS_DEBUGGING_INFO]: Remove.
14750         (SHASH_SIZE, THASH_SIZE): Remove defaults.
14751         (progname): Add const.
14752         (STATIC): Remove.
14753         Replace all uses by static.
14754         (ALIGN_SYMTABLE_OFFSET): Remove default.
14755         * mips-tdump.c: Don't include coretypes.h, tm.h.
14756         Remove !MIPS_IS_STAB guard.
14757         * Makefile.in (mips-tfile.o): Remove $(RTL_H), coretypes.h,
14758         $(TM_H), filenames.h dependencies.
14759         (mips-tdump.o): Remove $(RTL_H), coretypes.h, $(TM_H) dependencies.
14760
14761 2011-05-04  Stuart Henderson  <shenders@gcc.gnu.org>
14762
14763         From Jie Zhang
14764         *config/bfin/bfin.c (bfin_extra_live_on_entry): New.
14765         (TARGET_EXTRA_LIVE_ON_ENTRY): Define.
14766
14767 2011-05-04  Stuart Henderson  <shenders@gcc.gnu.org>
14768
14769         From Bernd Schmidt
14770         * config/bfin/bfin.h (FUNCTION_PROFILER): Take TARGET_LONG_CALLS into
14771         account and save/restore RETS.
14772         (PROFILE_BEFORE_PROLOGUE): Define.
14773         (ASM_OUTPUT_REG_PUSH, ASM_OUTPUT_REG_POP): Add tab character.  Correct
14774         the push insn to use predecrement.
14775
14776 2011-05-04  Stuart Henderson  <shenders@gcc.gnu.org>
14777
14778         From Jie Zhang
14779         * config/bfin/bfin.c (bfin_expand_prologue): Don't clobber P2.
14780
14781 2011-05-04  Nick Clifton  <nickc@redhat.com>
14782
14783         * config/mn10300/mn10300.c: Include cfgloop.h.
14784         (DUMP): New macro.
14785         (mn10300_insert_setlb_lcc): New function.  Inserts a SETLB and a
14786         Lcc or a FLcc insn into the instruction stream.
14787         (mn10300_block_contains_call): New function.  Returns true if the
14788         given basic block contains a CALL insn.
14789         (mn10300_loop_contains_call_insn): New function.  Returns true if
14790         the given loop contains a CALL insn.
14791         (mn10300_scan_for_setlb_lcc): New function.  Finds opportunities
14792         to use the SETLB and Lcc or FLcc insns.
14793         (mn10300_reorg): Invoke mn10300_scan_for_setlb_lcc when optimizing.
14794         (TARGET_FLAGS): Add MASK_ALLOW_SETLB.
14795         * config/mn10300/mn10300.opt (msetlb): New option.  Used to
14796         disable the SETLB optimization.
14797         * config/mn10300/mn10300.h (TARGET_CPU_CPP_BUILTINS): Add
14798         __SETLB__ or __NO_SETLB__.
14799         * config/mn10300/mn10300.md (UNSPEC_SETLB): New constant.
14800         (movsf_internal): Handle MDR register.
14801         (cmpsi): Make visible.
14802         (setlb): New pattern.
14803         (Lcc): New pattern.
14804         (FLcc): New pattern.
14805
14806 2011-05-04  Uros Bizjak  <ubizjak@gmail.com>
14807
14808         PR target/48860
14809         * config/i386/i386.md (*movdi_internal_rex64) Use %vmovd
14810         for reg<->xmm moves.
14811         * config/i386/sse.md (*vec_concatv2di_rex64_sse4_1): Ditto.
14812         (vec_concatv2di_rex64_sse): Ditto.
14813         (*sse2_storeq_rex64): Do not emit %v prefix for mov{q} mnemonic.
14814         (*vec_extractv2di_1_rex64): Ditto.
14815
14816         Revert:
14817         2011-05-02  Uros Bizjak  <ubizjak@gmail.com>
14818
14819         * config/i386/mmx.md (*mov<mode>_internal_rex64): Use %vmovq for
14820         reg<->xmm moves.
14821         (*movv2sf_internal_rex64): Use %vmovq for reg<->xmm moves.
14822
14823 2011-05-04  Richard Guenther  <rguenther@suse.de>
14824
14825         * tree.h (int_const_binop): Remove notrunc argument.
14826         * fold-const.c (int_const_binop): Remove notrunc argument.  Always
14827         create integer constants that are properly truncated.
14828         (extract_muldiv_1): Expand one notrunc int_const_binop caller.
14829         (const_binop): Remove zero notrunc argument to int_const_binop.
14830         (size_binop_loc): Likewise.
14831         (fold_div_compare): Likewise.
14832         (maybe_canonicalize_comparison_1): Likewise.
14833         (fold_comparison): Likewise.
14834         (fold_binary_loc): Likewise.
14835         (multiple_of_p): Likewise.
14836         * expr.c (store_constructor): Likewise.
14837         * gimple-fold.c (maybe_fold_offset_to_array_ref): Likewise.
14838         (maybe_fold_stmt_addition): Likewise.
14839         * ipa-prop.c (ipa_modify_call_arguments): Likewise.
14840         * stor-layout.c (layout_type): Likewise.
14841         * tree-data-ref.c (tree_fold_divides_p): Likewise.
14842         * tree-sra.c (build_ref_for_offset): Likewise.
14843         (build_user_friendly_ref_for_offset): Likewise.
14844         * tree-ssa-address.c (maybe_fold_tmr): Likewise.
14845         * tree-ssa-forwprop.c (forward_propagate_addr_expr_1): Likewise.
14846         * tree-ssa-loop-niter.c (inverse): Likewise.
14847         * tree-ssa-pre.c (create_component_ref_by_pieces_1): Likewise.
14848         * tree-ssa.c (maybe_rewrite_mem_ref_base): Likewise.
14849         * tree-switch-conversion.c (check_range): Likewise.
14850         (build_constructors): Likewise.
14851         * tree-vect-generic.c (expand_vector_piecewise): Likewise.
14852         * tree-vrp.c (set_and_canonicalize_value_range): Likewise.
14853         (extract_range_from_assert): Likewise.
14854         (vrp_int_const_binop): Likewise.
14855         (extract_range_from_binary_expr): Likewise.
14856         (extract_range_from_unary_expr): Likewise.
14857         (check_array_ref): Likewise.
14858         (find_case_label_range): Likewise.
14859         (simplify_div_or_mod_using_ranges): Likewise.
14860         * tree-cfg.c (group_case_labels_stmt): Use double-ints for
14861         comparing case labels for merging.
14862
14863 2011-05-03  Mark Wielaard  <mjw@redhat.com>
14864
14865         * dwarf2out.c (debug_str_hash_forced): Removed.
14866         (gen_label_for_indirect_string): Removed.
14867         (get_debug_string_label): Removed.
14868         (AT_string_form): Generate label directly.
14869         (output_indirect_string): Test indirect_string_node for
14870         DW_FORM_strp instead of checking label and refcount.
14871         (prune_indirect_string): Removed.
14872         (prune_unused_types): Don't check debug_str_hash_forced or
14873         call prune_indirect_string.
14874
14875 2011-05-04  Alexandre Oliva  <aoliva@redhat.com>
14876
14877         PR other/48093
14878         * doc/invoke.texi: Document -mtls-dialect and GCC_COMPARE_DEBUG.
14879
14880 2011-05-04  Alexandre Oliva  <aoliva@redhat.com>
14881
14882         PR debug/47994
14883         PR debug/47919
14884         * combine.c (try_combine): Skip debug insns at m_split tests.
14885
14886 2011-04-26  Mark Wielaard  <mjw@redhat.com>
14887
14888         PR42288
14889         * dwarf2out.c (dwarf2out_finish): Always call output_aranges ()
14890         when info_section_emitted.
14891
14892 2011-05-03  Joseph Myers  <joseph@codesourcery.com>
14893
14894         * config/mips/mips-opts.h: New.
14895         * config/mips/mips.c (enum mips_r10k_cache_barrier_setting): Move
14896         to mips-opts.h.
14897         (mips_abi, mips_code_readable, mips_r10k_cache_barriee): Remove.
14898         (mips_handle_option): Don't handle OPT_mabi_, OPT_mcode_readable_
14899         or OPT_mr10k_cache_barrier_ here.  Access mips_cache_flush_func
14900         via opts pointer.
14901         * config/mips/mips.h (enum mips_code_readable_setting): Move to
14902         mips-opts.h.
14903         (mips_abi, mips_code_readable): Don't declare.
14904         * config/mips/mips.opt (config/mips/mips-opts.h): New HeaderInclude.
14905         (mabi=): Use Enum and Var.
14906         (mips_abi): New Enum and EnumValue entries.
14907         (mcode-readable=): Use Enum and Var.
14908         (mips_code_readable_setting): New Enum and EnumValue entries.
14909         (mr10k-cache-barrier=): Use Enum and Var.
14910         (mips_r10k_cache_barrier_setting): New Enum and EnumValue entries.
14911
14912 2011-05-03  Jan Hubicka  <jh@suse.cz>
14913
14914         * cgraph.h (cgraph_node_set_def, varpool_node_set_def): Move out of GTY;
14915         replace hash by pointer map.
14916         (cgraph_node_set_element_def, cgraph_node_set_element,
14917         const_cgraph_node_set_element, varpool_node_set_element_def,
14918         varpool_node_set_element, const_varpool_node_set_element): Remove.
14919         (free_cgraph_node_set, free_varpool_node_set): New function.
14920         (cgraph_node_set_size, varpool_node_set_size): Use vector size.
14921         * tree-emutls.c: Free varpool node set.
14922         * ipa-utils.c (cgraph_node_set_new, cgraph_node_set_add,
14923         cgraph_node_set_remove, cgraph_node_set_find, dump_cgraph_node_set,
14924         debug_cgraph_node_set, free_cgraph_node_set, varpool_node_set_new,
14925         varpool_node_set_add, varpool_node_set_remove, varpool_node_set_find,
14926         dump_varpool_node_set, free_varpool_node_set, debug_varpool_node_set):
14927         Move here from ipa.c; implement using pointer_map
14928         * ipa.c (cgraph_node_set_new, cgraph_node_set_add,
14929         cgraph_node_set_remove, cgraph_node_set_find, dump_cgraph_node_set,
14930         debug_cgraph_node_set, varpool_node_set_new,
14931         varpool_node_set_add, varpool_node_set_remove, varpool_node_set_find,
14932         dump_varpool_node_set, debug_varpool_node_set):
14933         Move to ipa-uitls.c.
14934         * passes.c (ipa_write_summaries): Update.
14935
14936 2011-05-03  Stuart Henderson  <shenders@gcc.gnu.org>
14937
14938         From Mike Frysinger:
14939         * config/bfin/bfin.c (bfin_cpus[]): Add 0.4 for
14940         bf542/bf544/bf547/bf548/bf549.
14941
14942 2011-05-03  Uros Bizjak  <ubizjak@gmail.com>
14943
14944         * expmed.c (extract_bit_field_1): Remove write-only variable "icode".
14945
14946 2011-05-03  Stuart Henderson  <shenders@gcc.gnu.org>
14947
14948         From Bernd Schmidt:
14949         * config/bfin/bfin.md (MOVCC): New mode_macro.
14950         (mov<mode>cc_insn1, mov<mode>cc_insn2, mov<mode>cc): Renamed from
14951         movsicc_insn1, movsicc_insn2 and movsicc and macroized.  Remove
14952         comments from generated assembly.
14953
14954 2011-05-03  Stuart Henderson  <shenders@gcc.gnu.org>
14955
14956         From Bernd Schmidt
14957         * config/bfin/t-bfin (LIB1ASMFUNCS): Add muldi3 and umulsi3_highpart.
14958         * config/bfin/t-bfin-elf (LIB1ASMFUNCS): Add muldi3.
14959         * config/bfin/t-bfin-linux (LIB1ASMFUNCS): Add muldi3.
14960         * config/bfin/t-bfin-uclinux (LIB1ASMFUNCS): Add muldi3.
14961         * config/bfin/lib1funcs.asm (___muldi3): New function.
14962
14963 2011-05-03  Nathan Froyd  <froydnj@codesourcery.com>
14964
14965         * config/stormy16/stormy16 (xstormy16_init_builtins): Call
14966         build_function_type_list instead of build_function_type.
14967         Rearrange initialization of `args' to do so.
14968
14969 2011-05-03  Nathan Froyd  <froydnj@codesourcery.com>
14970
14971         * config/i386/i386.c (ix86_code_end): Call build_function_type_list
14972         instead of build_function_type.
14973
14974 2011-05-03  Nathan Froyd  <froydnj@codesourcery.com>
14975
14976         * config/rs6000/rs6000.c (spe_init_builtins): Call
14977         build_function_type_list instead of build_function_type.
14978         (paired_init_builtins, altivec_init_builtins): Likewise.
14979         (builtin_function_type): Likewise.
14980
14981 2011-05-03  Nathan Froyd  <froydnj@codesourcery.com>
14982
14983         * config/sh/sh.c (sh_media_init_builtins): Call
14984         build_function_type_list instead of build_function_type.
14985
14986 2011-05-03  Nathan Froyd  <froydnj@codesourcery.com>
14987
14988         * config/sparc/sparc.c (sparc_file_end): Call
14989         build_function_type_list instead of build_function_type.
14990
14991 2011-05-03  Nathan Froyd  <froydnj@codesourcery.com>
14992
14993         * config/alpha/alpha.c (alpha_init_builtins): Call
14994         build_function_type_list instead of build_function_type.
14995
14996 2011-05-03  Nathan Froyd  <froydnj@codesourcery.com>
14997
14998         * config/xtensa/xtensa.c (xtensa_init_builtins): Call
14999         build_function_type_list instead of build_function_type.
15000
15001 2011-05-03  Nathan Froyd  <froydnj@codesourcery.com>
15002
15003         * config/iq2000/i2000.c (iq2000_init_builtins): Call
15004         build_function_type_list instead of build_function_type.
15005         Delete `endlink' variable.
15006
15007 2011-05-03  Nathan Froyd  <froydnj@codesourcery.com>
15008
15009         * config/avr/avr.c (avr_init_builtins): Call
15010         build_function_type_list instead of build_function_type.
15011
15012 2011-05-03  Nathan Froyd  <froydnj@codesourcery.com>
15013
15014         * config/picochip/picochip.c (picochip_init_builtins): Call
15015         build_function_type_list instead of build_function_type.
15016         Delete `endlink' variable.
15017
15018 2011-05-03  Nathan Froyd  <froydnj@codesourcery.com>
15019
15020         * config/bfin/bfin.c (bfin_init_builtins): Call
15021         build_function_type_list instead of build_function_type.
15022
15023 2011-05-03  Stuart Henderson  <shenders@gcc.gnu.org>
15024
15025         From Bernd Schmidt
15026         * config/bfin/bfin.md (rotrsi, rotlsi): Don't take INTVAL of anything
15027         that's not CONST_INT.  Seemingly redundant check is due to PR39768.
15028
15029 2011-05-03  Stuart Henderson  <shenders@gcc.gnu.org>
15030
15031         From Jie Zhang:
15032         * config/bfin/uclinux.h (LINK_GCC_C_SEQUENCE_SPEC): Make sure
15033         libbffastfp overrides libgcc when -mfast-fp.
15034
15035 2011-05-03  Stuart Henderson  <shenders@gcc.gnu.org>
15036
15037         Originally from Bernd Schmidt
15038         * config/bfin/uclinux.h (SUBTARGET_FDPIC_NOT_SUPPORTED): New macro.
15039         * config/bfin/bfin.c (override_options): Test it and error if
15040         TARGET_FDPIC.
15041
15042 2011-05-03  Stuart Henderson  <shenders@gcc.gnu.org>
15043
15044         Originally From Bernd Schmidt
15045         * config/bfin/bfin.c (override_options): Disable -fstack-limit for
15046         FD-PIC.
15047
15048 2011-05-03  Jeff Law  <law@redhat.com>
15049
15050         * tree-ssa-threadupdate.c (THREAD_TARGET): define.
15051         (remove_ctrl_stmt_and_useless_edges): Clear AUX field of outgoing edges.
15052         (craete_edge_and_update_destination_phis): Use THREAD_TARGET rather
15053         than accessing AUX field directly.  Free the AUX field before
15054         clearing it.
15055         (thread_block, thread_through_loop_header): Likewise.
15056         (thread_single_edge, mark_threaded_blocks): Likewise.
15057         (redirect_edges): Delay clearing the AUX field.  Free the AUX field.
15058         (register_jump_thread): Do not attempt to thread to a NULL edge.
15059
15060 2011-05-03  Bernd Schmidt  <bernds@codesourcery.com>
15061
15062         * function.c (init_function_start): Call decide_function_section.
15063         * varasm.c (decide_function_section): New function.
15064         (assemble_start_function): When not using
15065         flag_reorder_blocks_and_partition, don't compute in_cold_section_p
15066         or first_function_block_is_cold.
15067         * rtl.h (decide_function_section): Declare.
15068
15069 2011-05-03  Uros Bizjak  <ubizjak@gmail.com>
15070             Jakub Jelinek  <jakub@redhat.com>
15071
15072         PR target/48774
15073         * config/i386/i386.c (ix86_match_ccmode): For CC{A,C,O,S}mode
15074         only succeed if req_mode is the same as set_mode.
15075
15076 2011-05-03  Bernd Schmidt  <bernds@codesourcery.com>
15077
15078         * gengenrtl.c (special_rtx): PC, CC0 and RETURN are special.
15079         * genemit.c (gen_exp): Handle RETURN.
15080         * emit-rtl.c (verify_rtx_sharing): Likewise.
15081         (init_emit_regs): Create pc_rtx, ret_rtx and cc0_rtx specially.
15082         * rtl.c (copy_rtx): RETURN is shared.
15083         * rtl.h (enum global_rtl_index): Add GR_RETURN.
15084         (ret_rtx): New.
15085         * jump.c (redirect_exp_1): Don't use gen_rtx_RETURN.
15086         * config/s390/s390.c (s390_emit_epilogue): Likewise.
15087         * config/rx/rx.c (gen_rx_rtsd_vector): Likewise.
15088         * config/cris/cris.c (cris_expand_return): Likewise.
15089         * config/m68k/m68k.c (m68k_expand_epilogue): Likewise.
15090         * config/rs6000/rs6000.c (rs6000_make_savres_rtx,
15091         rs6000_emit_epilogue, rs6000_output_mi_thunk): Likewise.
15092         * config/picochip/picochip.c (picochip_expand_epilogue): Likewise.
15093         * config/h8300/h8300.c (h8300_push_pop, h8300_expand_epilogue):
15094         Likewise.
15095         * config/v850/v850.c (expand_epilogue): Likewise.
15096         * config/bfin/bfin.c (bfin_expand_call): Likewise.
15097         * config/arm/arm.md (epilogue): Likewise.
15098         * config/mn10300/mn10300.c (mn10300_expand_epilogue): Likewise.
15099         * config/sparc/sparc.c (sparc_struct_value_rtx): Rename ret_rtx
15100         variable to ret_reg.
15101
15102 2011-05-03  Richard Guenther  <rguenther@suse.de>
15103
15104         PR lto/48846
15105         * lto-streamer-in.c (unpack_ts_decl_common_value_fields):
15106         Stream decl_common.off_align instead of the derived DECL_OFFSET_ALIGN.
15107         * lto-streamer-out.c (pack_ts_decl_common_value_fields): Likewise.
15108
15109 2011-05-03  Richard Guenther  <rguenther@suse.de>
15110
15111         * c-decl.c (grokdeclarator): Instead of looking at
15112         TREE_OVERFLOW check if the constant fits in the index type.
15113
15114 2011-05-03  Richard Sandiford  <richard.sandiford@linaro.org>
15115
15116         * config/arm/neon.md (vec_load_lanes<mode><mode>): New expanders,
15117         (vec_store_lanes<mode><mode>): Likewise.
15118
15119 2011-05-03  Richard Sandiford  <richard.sandiford@linaro.org>
15120
15121         * doc/md.texi (vec_load_lanes, vec_store_lanes): Document.
15122         * optabs.h (COI_vec_load_lanes, COI_vec_store_lanes): New
15123         convert_optab_index values.
15124         (vec_load_lanes_optab, vec_store_lanes_optab): New convert optabs.
15125         * genopinit.c (optabs): Initialize the new optabs.
15126         * internal-fn.def (LOAD_LANES, STORE_LANES): New internal functions.
15127         * internal-fn.c (get_multi_vector_move, expand_LOAD_LANES)
15128         (expand_STORE_LANES): New functions.
15129         * tree.h (build_array_type_nelts): Declare.
15130         * tree.c (build_array_type_nelts): New function.
15131         * tree-vectorizer.h (vect_model_store_cost): Add a bool argument.
15132         (vect_model_load_cost): Likewise.
15133         (vect_store_lanes_supported, vect_load_lanes_supported)
15134         (vect_record_strided_load_vectors): Declare.
15135         * tree-vect-data-refs.c (vect_lanes_optab_supported_p)
15136         (vect_store_lanes_supported, vect_load_lanes_supported): New functions.
15137         (vect_transform_strided_load): Split out statement recording into...
15138         (vect_record_strided_load_vectors): ...this new function.
15139         * tree-vect-stmts.c (create_vector_array, read_vector_array)
15140         (write_vector_array, create_array_ref): New functions.
15141         (vect_model_store_cost): Add store_lanes_p argument.
15142         (vect_model_load_cost): Add load_lanes_p argument.
15143         (vectorizable_store): Try to use store-lanes functions for
15144         interleaved stores.
15145         (vectorizable_load): Likewise load-lanes and loads.
15146         * tree-vect-slp.c (vect_get_and_check_slp_defs): Update call
15147         to vect_model_store_cost.
15148         (vect_build_slp_tree): Likewise vect_model_load_cost.
15149
15150 2011-05-03  Richard Sandiford  <richard.sandiford@linaro.org>
15151
15152         * hooks.h (hook_bool_mode_uhwi_false): Declare.
15153         * hooks.c (hook_bool_mode_uhwi_false): New function.
15154         * target.def (array_mode_supported_p): New hook.
15155         * doc/tm.texi.in (TARGET_ARRAY_MODE_SUPPORTED_P): Add @hook.
15156         * doc/tm.texi: Regenerate.
15157         * stor-layout.c (mode_for_array): New function.
15158         (layout_type): Use it.
15159         * config/arm/arm.c (arm_array_mode_supported_p): New function.
15160         (TARGET_ARRAY_MODE_SUPPORTED_P): Define.
15161
15162 2011-05-03  Eric Botcazou  <ebotcazou@adacore.com>
15163
15164         PR target/48723
15165         * config/i386/i386.c (ix86_expand_prologue): Do not probe the stack
15166         for -fstack-check if the size to allocate is negative.
15167
15168 2011-05-02  Lawrence Crowl  <crowl@google.com>
15169
15170         * timevar.h (timevar_cond_start): Remove unused POP_TIMEVAR_AND_RETURN.
15171         (timevar_cond_start): New for starting a timer only when it is not
15172         already running.
15173         (timevar_cond_stop): New for stopping a timer when it was not already
15174         running.
15175
15176         * timevar.c (timevar_stop): Enable start/stop timers to start again.
15177         (timevar_cond_start): New as above.
15178         (timevar_cond_stop): New as above.
15179
15180         * timevar.def: Add start/stop timers for compiler phases,
15181         TV_PHASE_SETUP, TV_PHASE_PARSING, TV_PHASE_DEFERRED, TV_PHASE_CGRAPH,
15182         TV_PHASE_DBGINFO (C), TV_PHASE_CHECK_DBGINFO (C++), TV_PHASE_GENERATE,
15183         and TV_PHASE_FINALIZE.
15184         Change push/pop timer TV_PARSE to TV_PARSE_GLOBAL.
15185         Add push/pop timers TV_PARSE_STRUCT, TV_PARSE_ENUM, TV_PARSE_FUNC,
15186         TV_PARSE_INLINE, TV_PARSE_INMETH, TV_TEMPLATE_INST.
15187         Change push/pop timer TV_NAME_LOOKUP into a start/stop timer.
15188         Make unused TV_OVERLOAD into a start/stop timer.
15189
15190         Remove unused timers TV_OVERLOAD, TV_TEMPLATE_INSTANTIATION.
15191         Mark the strings for TV_NAME_LOOKUP and TV_OVERLOAD with a "|"
15192         to indicate that they are start/stop timers.
15193
15194         * toplev.c (compile_file): Change TV_PARSE to TV_PARSE_GLOBAL.
15195         Add start/stop timers TV_PHASE_PARSING and TV_PHASE_GENERATE.
15196         Move initialization to do_compile.
15197         (do_compile): Add initialization from above.
15198         Add start/stop timers TV_PHASE_SETUP and TV_PHASE_FINALIZE.
15199
15200         * c-decl.c (c_write_global_declarations): Add start/stop of
15201         TV_PHASE_DEFERRED, TV_PHASE_CGRAPH, TV_PHASE_DBGINFO.
15202
15203         * c-parser.c (c_parser_declaration_or_fndef): Push/pop TV_PARSE_FUNC
15204         or TV_PARSE_INLINE, as appropriate.
15205         (c_parser_enum_specifier): Push/pop TV_PARSE_ENUM.
15206         (c_parser_struct_or_union_specifier): Push/pop TV_PARSE_STRUCT.
15207
15208 2011-05-02  Jason Merrill  <jason@redhat.com>
15209
15210         PR c++/40975
15211         * tree-inline.c (copy_tree_r): Handle STATEMENT_LIST.
15212
15213 2011-05-02  Simon Martin  <simartin@users.sourceforge.net>
15214
15215         PR c/35445
15216         * c-decl.c (finish_decl): Only create a composite if the types are
15217         compatible.
15218
15219 2011-05-02  Joseph Myers  <joseph@codesourcery.com>
15220
15221         * config/fr30/fr30-protos.h (Mmode): Don't define.
15222         * config/m32r/m32r-protos.h (Mmode): Don't define.  Expand
15223         definition where used.
15224         * config/mn10300/mn10300-protos.h (Mmode, Cstar, Rclas): Don't
15225         define.  Expand definitions where used.
15226         * config/rx/rx-protos.h (Mmode, Fargs, Rcode): Don't define.
15227         Expand definitions where used.
15228         * config/rx/rx.c (rx_is_legitimate_address, rx_function_arg_size,
15229         rx_function_arg, rx_function_arg_advance,
15230         rx_function_arg_boundary): Expand definitions of those macros.
15231         * config/v850/v850-protos.h (Mmode): Don't define.  Expand
15232         definition where used.
15233
15234 2011-05-02  Uros Bizjak  <ubizjak@gmail.com>
15235
15236         * config/i386/mmx.md (*mov<mode>_internal_rex64): Use %vmovq for
15237         reg<->xmm moves.
15238         (*mov<mode>_internal): Merge with *mov<mode>_internal_avx.
15239         (*movv2sf_internal_rex64): Use %vmovq for reg<->xmm moves.  Merge
15240         with *movv2sf_internal_rex64_avx.
15241         (*movv2sf_internal): Merge with *movv2sf_internal_avx.
15242         * config/i386/i386.md (*movdi_internal_rex64) <TYPE_SSEMOV>:
15243         Use %v prefix in insn mnemonic to handle TARGET_AVX.
15244         (*movdi_internal): Add "isa" attribute.  Use "maybe_vex" instead of
15245         "vex" in "prefix" attribute calculation.
15246         (*movdf_internal): Output AVX mnemonics.  Add "prefix" attribute.
15247
15248 2011-05-02  Stuart Henderson  <shenders@gcc.gnu.org>
15249
15250         PR target/47951
15251         * config/bfin/bfin.md (loop_end): Use matching constraints to ensure
15252         inputs match the output.
15253
15254 2011-05-02  Andreas Schwab  <schwab@linux-m68k.org>
15255
15256         PR target/47955
15257         * config/m68k/m68k.c (m68k_expand_prologue): Set
15258         current_function_static_stack_size.
15259
15260 2011-05-02   Jan Hubicka  <jh@suse.cz>
15261
15262         * lto-streamer.c (lto_streamer_cache_insert_1,
15263         lto_streamer_cache_lookup, lto_streamer_cache_create,
15264         lto_streamer_cache_delete): Use pointer map instead of hashtable.
15265         * lto-streamer.h (lto_streamer_cache_d): Turn node_map into pointer_map.
15266
15267 2011-05-02  Joseph Myers  <joseph@codesourcery.com>
15268
15269         * config/m68k/genopt.sh, config/m68k/m68k-isas.def,
15270         config/m68k/m68k-microarchs.def, config/m68k/m68k-opts.h,
15271         config/m68k/t-opts: New files.
15272         * config/m68k/m68k-tables.opt: New file (generated).
15273         * config.gcc (fido-*-*, m68k-*-*): Add m68k/m68k-tables.opt to
15274         extra_options and m68k/t-opts to tmake_file.
15275         * config/m68k/m68k.c (m68k_library_id_string): More to m68k.opt.
15276         (all_isas): Initialize using m68k-isas.def.
15277         (all_microarchs): Initialize using m68k-microarchs.def.
15278         (m68k_find_selection): Remove.
15279         (m68k_handle_option): Don't assert that global structures are in
15280         use.  Use error_at.  Access variables via opts pointer.  Don't
15281         handle -march=, -mcpu= and -mtune= here.  Set gcc_options fields
15282         directly for -m68020-40 and -m68020-60.
15283         (m68k_option_override): Set m68k_arch_entry, m68k_cpu_entry and
15284         m68k_tune_entry here.
15285         * config/m68k/m68k.h (enum uarch_type, enum target_device): Move
15286         to m68k-opts.h.
15287         (m68k_library_id_string): Remove declaration.
15288         * config/m68k/m68k.opt (config/m68k/m68k-opts.h): New HeaderInclude.
15289         (m68k_library_id_string): New Variable.
15290         (march=, mcpu=, mtune=): Use Enum and Var.
15291
15292 2011-05-02  Richard Guenther  <rguenther@suse.de>
15293
15294         * varasm.c (output_constructor_regular_field): Compute zero-based
15295         index with double-ints.  Make sure to ICE instead of producing
15296         wrong code.
15297         * cgraph.c (cgraph_add_thunk): Do not create new tree nodes
15298         in asserts.  Properly use a signed type.
15299
15300 2011-05-02  Uros Bizjak  <ubizjak@gmail.com>
15301
15302         * config/i386/sse.md (V): New mode iterator.
15303         (V_128): Rename from SSEMODE.  Make V2DF mode conditional on
15304         TARGET_SSE2.
15305         (V_256): Rename from AVX256MODE.
15306         (VF): Make V4SF mode unconditional.  Add TARGET_SSE instruction
15307         condition to all users.
15308         (VF1): Ditto.
15309         (VF2): Make V2DF mode unconditional.  Add TARGET_SSE2 instruction
15310         condition to all users.
15311         (VF_128): Make V4SF mode unconditional.
15312         (VF_256): Rename from AVX256MODEF2P.
15313         (VI4F_128): Rename from SSEMODE4S.
15314         (VI8F_128): Rename from SSEMODE2D.
15315         (VI4F_256): Rename from AVX256MODE8P.
15316         (VI8F_256): Rename from AVX256MODE4P.
15317         (avxsizesuffix): Add V16HI, V4DI, V8HI and V2DI modes.
15318         (ssescalarmodesuffix): Remove SF and DF modes.
15319         (SSEMODE124): Remove.
15320         (SSEMODE1248): Ditto.
15321         (SSEMODEF2P): Ditto.
15322         (AVXMODEF2P): Ditto.
15323         (AVXMODEFDP): Ditto.
15324         (AVXMODEFSP): Ditto.
15325         (VEC_EXTRACT_MODE): Make V16QI, V8HI, V4SI, V2DI, V4SF and V2DF modes
15326         unconditional.
15327         (VEC_EXTRACT_EVENODD_MODE): Rename from SSEMODE_EO.  Make V4SF mode
15328         unconditional.
15329         (xop_pcmov_<mode><avxsizesuffix>): Merge from xop_pcmov_<mode> and
15330         xop_pcmov_<mode>256.  Use V mode iterator.
15331
15332         Adjust RTX patterns globally for renamed mode attributes.
15333
15334 2011-05-02  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
15335
15336         * haifa-sched.c (sched_emit_insn): Emit insn before first
15337         non-scheduled insn.  Inform back-end about new insn.  Add
15338         new insn to scheduled_insns list.
15339
15340 2011-05-02  Richard Guenther  <rguenther@suse.de>
15341
15342         PR tree-optimization/48822
15343         * tree-ssa-sccvn.c (set_ssa_val_to): Never go up the lattice.
15344         (process_scc): Indicate which iteration we start.
15345
15346 2011-05-02  Jan Hubicka  <jh@suse.cz>
15347
15348         * lto-section-in.c (lto_input_1_unsigned): Move to lto-streamer.h
15349         (lto_section_overrun): New.
15350         * lto-section-out.c (append_block): Rename to ...
15351         (lto_append_block): ... this one; export.
15352         (lto_output_1_stream): Move lto lto-streamer.h
15353         (lto_output_data_stream): Update.
15354         * lto-streamer.h (lto_section_overrun, lto_append_block): Declare.
15355         (lto_output_1_stream, lto_input_1_unsigned): Turn into inline
15356         functions.
15357
15358 2011-05-02  Richard Guenther  <rguenther@suse.de>
15359
15360         * tree.c (tree_code_counts): New global array.
15361         (record_node_allocation_statistics): Count individual tree codes.
15362         (dump_tree_statistics): Dump individual code stats.
15363
15364 2011-05-01  Jan Hubicka  <jh@suse.cz>
15365
15366         * ipa-inline.c (caller_growth_limits): Fix thinko when
15367         looking for largest stack frame.
15368         * ipa-inline.h (dump_inline_summary): Declare.
15369         * ipa-inline-analysis.c (dump_inline_edge_summary): Dump info
15370         on stack usage.
15371         (dump_inline_summary): Export.
15372         (debug_inline_summary): Declare as DEBUG_FUNCTION.
15373
15374 2011-05-01  Anatoly Sokolov  <aesok@post.ru>
15375
15376         * reginfo.c (memory_move_cost): Change rclass argument type form
15377         'enum reg_class' to reg_class_t.
15378         * reload.h (memory_move_cost): Update prototype.
15379         * postreload.c reload_cse_simplify_set): Change type dclass var to
15380         reg_class_t.
15381         * ira-int.h (ira_allocate_cost_vector, ira_free_cost_vector):
15382         Update prototype.
15383         (ira_allocate_and_set_costs): Change aclass argument type form
15384         'enum reg_class' to reg_class_t.
15385         * ira-build.c (ira_allocate_cost_vector, ira_free_cost_vector):
15386         Change aclass argument type to reg_class_t.
15387         (update_conflict_hard_reg_costs): Change type aclass and pref vars
15388         to reg_class_t.
15389         * gcc/ira.c (setup_class_subset_and_memory_move_costs): Adjust
15390         memory_move_cost call.
15391
15392         * config/ia64/ia64.c (ia64_register_move_cost): Remove 'from' and
15393         'to' local var. Rename from_i and to_i arguments to 'from' and 'to'.
15394         Change type tmp var to reg_class_t.
15395
15396 2011-04-30  Jan Hubicka  <jh@suse.cz>
15397
15398         * ipa-inline.c (can_inline_edge_p): Disregard limits when
15399         inlining into function with flatten attribute.
15400         (want_inline_small_function_p): Be more realistic about inlining
15401         cold calls where callee size grows.
15402
15403 2011-04-30  Jan Hubicka  <jh@suse.cz>
15404
15405         * cgraph.c (cgraph_create_virtual_clone): Clear constructor/destructor
15406         flags.
15407
15408 2011-04-30  Anatoly Sokolov  <aesok@post.ru>
15409
15410         * config/sparc/sparc.h (PRINT_OPERAND, PRINT_OPERAND_ADDRESS,
15411         PRINT_OPERAND_PUNCT_VALID_P): Remove.
15412         * config/sparc/sparc-protos.h (print_operand): Remove declaration.
15413         * config/sparc/sparc.c (TARGET_PRINT_OPERAND_PUNCT_VALID_P,
15414         TARGET_PRINT_OPERAND, TARGET_PRINT_OPERAND_ADDRESS): Define.
15415         (print_operand): Rename to...
15416         (sparc_print_operand): ...this. Make static. Adjust
15417         sparc_print_operand function call.
15418         (sparc_print_operand_punct_valid_p, sparc_print_operand_address): New
15419         functions.
15420
15421 2011-04-30  Jan Hubicka  <jh@suse.cz>
15422
15423         PR middle-end/48752
15424         * ipa-inline.c (early_inliner): Disable when doing late
15425         addition of function.
15426
15427 2011-04-30  Jakub Jelinek  <jakub@redhat.com>
15428
15429         * dwarf2out.c (get_address_mode): New inline.
15430         (mem_loc_descriptor): Add MEM_MODE parameter, adjust recursive calls,
15431         if not dwarf_strict emit
15432         DW_OP_GNU_{{const,regval,deref}_type,convert,reinterpret} when
15433         desirable.  Handle FLOAT_EXTEND, FLOAT_TRUNCATE, FLOAT,
15434         UNSIGNED_FLOAT, FIX and UNSIGNED_FIX.  Just return NULL for
15435         FMA, STRICT_LOW_PART, CONST_VECTOR and CONST_FIXED.
15436         (dwarf2out_frame_debug_cfa_expression, reg_loc_descriptor,
15437         dw_loc_list_1, cst_pool_loc_descr, loc_list_from_tree): Adjust
15438         mem_loc_descriptor callers.
15439         (dwarf_stack_op_name, size_of_loc_descr, output_loc_operands,
15440         output_loc_operands_raw, hash_loc_operands, compare_loc_operands):
15441         Handle DW_OP_GNU_const_type, DW_OP_GNU_regval_type,
15442         DW_OP_GNU_deref_type, DW_OP_GNU_convert and DW_OP_GNU_reinterpret.
15443         (base_types): New variable.
15444         (get_base_type_offset, calc_base_type_die_sizes,
15445         base_type_for_mode, mark_base_types, base_type_cmp,
15446         move_marked_base_types): New functions.
15447         (calc_die_sizes): Assert that die_offset is 0 or equal to
15448         next_die_offset.
15449         (loc_descriptor): Only handle here lowpart SUBREGs of REG, for
15450         others defer to mem_loc_descriptor.  Adjust mem_loc_descriptor
15451         callers.  If not dwarf_strict, call mem_loc_descriptor even for
15452         non-MODE_INT modes or MODE_INT modes larger than DWARF2_ADDR_SIZE.
15453         (gen_subprogram_die): Don't give up on call site parameters
15454         with non-integral or large integral modes.  Adjust
15455         mem_loc_descriptor callers.
15456         (prune_unused_types): Call prune_unused_types_mark on base_types
15457         vector entries.
15458         (resolve_addr): Call mark_base_types.
15459         (dwarf2out_finish): Call move_marked_base_types.
15460
15461         PR tree-optimization/48809
15462         * tree-switch-conversion.c (build_arrays): Compute tidx in unsigned
15463         type.
15464         (gen_inbound_check): Don't compute index_expr - range_min in utype
15465         again, instead reuse SSA_NAME initialized in build_arrays.
15466         Remove two useless gsi_for_stmt calls.
15467
15468 2011-04-29  Jeff Law  <law@redhat.com>
15469
15470         * tree-ssa-threadedge.c (thread_across_edge): Add missing return.
15471
15472 2011-04-29  Martin Jambor  <mjambor@suse.cz>
15473
15474         * cgraph.h (cgraph_postorder): Remove declaration.
15475         * ipa-utils.h (ipa_free_postorder_info): Declare.
15476         (ipa_reverse_postorder): Likewise.
15477         * cgraphunit.c: Include ipa-utils.h.
15478         (cgraph_expand_all_functions): Update call to ipa_reverse_postorder.
15479         * ipa-inline.c: Include ipa-utils.h.
15480         (ipa_inline): Update call to ipa_reverse_postorder.
15481         * ipa-pure-const.c (propagate_pure_const): Update call to
15482         ipa_reduced_postorder and ipa_print_order.  Call
15483         ipa_free_postorder_info to clean up.
15484         (propagate_nothrow): Likewise.
15485         * ipa-reference.c (propagate): Removed a useless call to
15486         ipa_utils_reduced_inorder, updated a call to ipa_reduced_postorder
15487         and ipa_print_order.  Call ipa_free_postorder_info to clean up.
15488         * ipa.c: Include ipa-utils.h.
15489         (ipa_profile): Update call to ipa_reverse_postorder.
15490         (cgraph_postorder): Moved to...
15491         * ipa-utils.c (ipa_reverse_postorder): ...here and renamed.
15492         (ipa_utils_print_order): Renamed to ipa_print_order.
15493         (ipa_utils_reduced_inorder): Renamed to ipa_reduced_postorder. Updated
15494         comments.
15495         (ipa_free_postorder_info): New function.
15496         * passes.c: Include ipa-utils.h.
15497         (do_per_function_toporder): Update call to ipa_reverse_postorder.
15498         (ipa_write_summaries): Likewise.
15499         * Makefile.in (passes.o): Add IPA_UTILS_H to dependencies.
15500         (cgraphunit.o): Likewise.
15501         (ipa.o): Likewise.
15502         (ipa-inline.o): Likewise.
15503
15504 2011-04-29  Jan Hubicka  <jh@suse.cz>
15505
15506         * gcc.dg/tree-ssa/inline-10.c: New testcase.
15507         * gcc.dg/tree-ssa/inline-9.c: Disable partial inlining.
15508         * ipa-inline.h (clause_t): Turn into unsigned int.
15509         * ipa-inline-analysis.c (add_clause): Do more simplification.
15510         (and_predicates): Shortcut more cases.
15511         (predicates_equal_p): Move forward; check that clauses are properly
15512         ordered.
15513         (or_predicates): Shortcut more cases.
15514         (edge_execution_predicate): Rewrite as...
15515         (set_cond_stmt_execution_predicate): ... this function; handle
15516         __builtin_constant_p.
15517         (set_switch_stmt_execution_predicate): New .
15518         (compute_bb_predicates): New.
15519         (will_be_nonconstant_predicate): Update TODO.
15520         (estimate_function_body_sizes): Use compute_bb_predicates
15521         and free them later, always try to estimate if stmt is constant.
15522         (estimate_time_after_inlining, estimate_size_after_inlining):
15523         Gracefully handle optimized out edges.
15524         (read_predicate): Fix off by one error.
15525
15526 2011-04-29  Nicola Pero  <nicola.pero@meta-innovation.com>
15527
15528         * Makefile.in (ENABLE_MAINTAINER_RULES): New.
15529
15530 2011-04-27  Xinliang David Li  <davidxl@google.com>
15531
15532         * tree-profile.c (init_ic_make_global_vars): Set
15533         tls attribute on ic vars.
15534         * coverage.c (coverage_end_function): Initialize
15535         function_list with zero.
15536
15537 2011-04-29  Richard Guenther  <rguenther@suse.de>
15538
15539         * builtins.c (fold_builtin_classify_type): Use integer_type_node
15540         for the type of the result.
15541         (fold_builtin_isascii): Likewise.
15542         (fold_builtin_toascii): Use integer_type_node where appropriate.
15543         (fold_builtin_logb): Likewise.
15544         (fold_builtin_frexp): Likewise.
15545         (fold_builtin_strstr): Likewise.
15546         (fold_builtin_strpbrk): Likewise.
15547         (fold_builtin_fputs): Likewise.
15548         (fold_builtin_sprintf): Likewise.
15549         (fold_builtin_snprintf): Likewise.
15550         (fold_builtin_printf): Likewise.
15551         (do_mpfr_remquo): Use a proper type for the assigned constant.
15552         (do_mpfr_lgamma_r): Likewise.
15553         * dwarf2out.c (resolve_one_addr): Use size_int.
15554         * except.c (init_eh): Likewise.
15555         (assign_filter_values): Use integer_type_node for filter values.
15556         (sjlj_emit_dispatch_table): Use integer_type_node for dispatch
15557         indices.
15558         * tree-cfg.c (move_stmt_eh_region_tree_nr): Use integer_type_node
15559         for EH region numbers.
15560         * tree-vrp.c (simplify_div_or_mod_using_ranges): Use integer_type_node
15561         for the shift amount.
15562
15563 2011-04-29  Richard Guenther  <rguenther@suse.de>
15564
15565         * expr.h (expand_shift): Rename to ...
15566         (expand_variable_shift): ... this.
15567         (expand_shift): Take a constant shift amount.
15568         * expmed.c (expand_shift): Rename to ...
15569         (expand_variable_shift): ... this.
15570         (expand_shift): New wrapper around expand_variable_shift.
15571         * expr.c (convert_move, emit_group_load_1, emit_group_store,
15572         optimize_bitfield_assignment_op, store_field, expand_expr_real_2,
15573         expand_expr_real_1, reduce_to_bit_field_precision): Adjust.
15574         * expmed.c (store_fixed_bit_field, extract_bit_field_1,
15575         extract_fixed_bit_field, extract_split_bit_field, expand_mult_const,
15576         expand_mult, expand_widening_mult, expand_mult_highpart_adjust,
15577         extract_high_half, expand_sdiv_pow2, expand_divmod, emit_cstore,
15578         emit_store_flag_1, emit_store_flag): Likewise.
15579         * builtins.c (expand_builtin_signbit): Likewise.
15580         * calls.c (load_register_parameters): Likewise.
15581         * function.c (assign_parm_setup_block): Likewise.
15582         * lower-subreg.c (resolve_shift_zext): Likewise.
15583         * optabs.c (widen_bswap, expand_abs_nojump,
15584         expand_one_cmpl_abs_nojump, expand_float): Likewise.
15585         * spu/spu.c (spu_expand_extv): Likewise.
15586         * sparc/sparc.c (sparc32_initialize_trampoline): Likewise.
15587
15588 2011-04-29  Richard Guenther  <rguenther@suse.de>
15589
15590         * tree-inline.c (remap_eh_region_tree_nr): Use integer_type_node
15591         for the remapped region number.
15592         * predict.c (build_predict_expr): Use integer_type_node for the
15593         predict kind.
15594         * fold-const.c (fold_binary_loc): Use integer_type_node for
15595         the shift amount.  Use a proper type for the PLUS_EXPR operand.
15596
15597 2011-04-29  Michael Matz  <matz@suse.de>
15598
15599         * lto-streamer.c (lto_streamer_cache_insert_1): Accept to override
15600         other trees that just builtins.
15601         (lto_record_common_node): Don't leave NULL TYPE_CANONICAL.
15602
15603 2011-04-29  Richard Guenther  <rguenther@suse.de>
15604
15605         * tree-nested.c (get_trampoline_type): Use size_int.
15606         (get_nl_goto_field): Likewise.
15607         * tree-eh.c (lower_try_finally_switch): Use integer_type_node
15608         for all indexes.
15609         (lower_eh_constructs_2): Likewise.
15610         (lower_resx): Likewise.
15611         (lower_eh_dispatch): Likewise.
15612         * tree-mudflap.c (mf_build_string): Use size_int.
15613         (mudflap_register_call): Use integer_type_node for the flag.
15614         (mudflap_enqueue_constant): Use size_int.
15615         * tree-chrec.c (reset_evolution_in_loop): Copy CHREC_VAR
15616         instead of rebuilding it.
15617
15618 2011-04-29  Richard Guenther  <rguenther@suse.de>
15619
15620         * tree-ssa-structalias.c (get_fi_for_callee): Restructure.
15621         Handle OBJ_TYPE_REF.
15622         (find_func_aliases_for_call): Use it more consistently.
15623
15624 2011-04-29  Alexandre Oliva  <aoliva@redhat.com>
15625
15626         * haifa-sched.c (last_nondebug_scheduled_insn): New.
15627         (rank_for_schedule): Use it.
15628         (schedule_block): Set it.
15629
15630 2011-04-28  David Li  <davidxl@google.com>
15631
15632         * tree.c (crc32_string): Use crc32_byte.
15633         (crc32_byte): New function.
15634         * tree.h (crc32_byte): New function.
15635         * gcov.c (read_graph_file): Handle new cfg_cksum.
15636         (read_count_file): Ditto.
15637         * profile.c (instrument_values): Ditto.
15638         (get_exec_counts): Ditto.
15639         (read_profile_edge_counts): Ditto.
15640         (compute_branch_probabilities): Ditto.
15641         (compute_value_histograms): Ditto.
15642         (branch_prob): Ditto.
15643         (end_branch_prob): Ditto.
15644         * coverage.c (read_counts_file): Ditto.
15645         (get_coverage_counts): Ditto.
15646         (tree_coverage_counter_addr): Ditto.
15647         (coverage_checksum_string): Ditto.
15648         (coverage_begin_output): Ditto.
15649         (coverage_end_function): Ditto.
15650         (build_fn_info_type): Ditto.
15651         (build_fn_info_value): Ditto.
15652         * libgcov.c (gcov_exit): Ditto.
15653         * gcov-dump.c (tag_function): Ditto.
15654         (compute_checksum): Remove.
15655
15656 2011-04-29  Alan Modra  <amodra@gmail.com>
15657
15658         * config/rs6000/rs6000.c (rs6000_delegitimize_address): Handle
15659         unspec plus offset.  Tidy macho code.
15660
15661 2011-04-29  Martin Jambor  <mjambor@suse.cz>
15662
15663         * cgraphunit.c (cgraph_preserve_function_body_p): Accept a cgraph
15664         node instead of a decl.  Update all callers.
15665         * cgraph.h: Update declaration.
15666
15667 2011-04-28  Ira Rosen  <ira.rosen@linaro.org>
15668
15669         PR tree-optimization/48765
15670         * tree-vectorizer.h (vect_make_slp_decision): Return bool.
15671         * tree-vect-loop.c (vect_analyze_loop_operations): Add new argument
15672         to indicate if loop aware SLP is being used.  Scan the statements
15673         and update the vectorization factor according to the type of
15674         vectorization before statement analysis.
15675         (vect_analyze_loop_2): Get a return value from vect_make_slp_decision,
15676         pass it to vect_analyze_loop_operations.
15677         (vectorizable_reduction): Set number of copies to 1 in case of pure
15678         SLP statement.
15679         * tree-vect-stmts.c (vectorizable_conversion,
15680         vectorizable_assignment, vectorizable_shift,
15681         vectorizable_operation, vectorizable_type_demotion,
15682         vectorizable_type_promotion, vectorizable_store, vectorizable_load):
15683         Likewise.
15684         (vectorizable_condition): Move the check that it is not SLP
15685         vectorization before the number of copies check.
15686         * tree-vect-slp.c (vect_make_slp_decision): Return TRUE if decided
15687         to vectorize the loop using SLP.
15688
15689 2011-04-28  Jakub Jelinek  <jakub@redhat.com>
15690
15691         PR middle-end/48597
15692         * final.c (final_scan_insn): Call dwarf2out_frame_debug even for
15693         inline asm.
15694
15695 2011-04-28  Joseph Myers  <joseph@codesourcery.com>
15696
15697         * config.gcc (*-*-kfreebsd*-gnu | *-*-knetbsd*-gnu | *-*-gnu* |
15698         *-*-kopensolaris*-gnu): Don't define SINGLE_LIBC.
15699         (i[34567]86-*-kfreebsd*-gnu | i[34567]86-*-knetbsd*-gnu |
15700         i[34567]86-*-gnu* | i[34567]86-*-kopensolaris*-gnu,
15701         x86_64-*-kfreebsd*-gnu | x86_64-*-knetbsd*-gnu): Don't use
15702         linux*.h headers.
15703         * config/gnu-user.h (TARGET_C99_FUNCTIONS, TARGET_HAS_SINCOS): Define.
15704         * config/i386/gnu.h (MD_UNWIND_SUPPORT): Don't undefine.
15705         * config/i386/kfreebsd-gnu.h (MD_UNWIND_SUPPORT): Don't undefine.
15706         * config/i386/knetbsd-gnu.h (MD_UNWIND_SUPPORT): Don't undefine.
15707         * config/i386/kopensolaris-gnu.h (MD_UNWIND_SUPPORT): Don't undefine.
15708         * config/i386/linux-unwind.h (x86_fallback_frame_state): Don't use
15709         REG_NAME.
15710         * config/i386/linux.h (REG_NAME): Don't define.
15711         * config/i386/linux64.h (REG_NAME): Don't define.
15712         * config/linux.h (TARGET_C99_FUNCTIONS, TARGET_HAS_SINCOS):
15713         Undefine before defining.
15714
15715 2011-04-28  Jan Hubicka  <jh@suse.cz>
15716
15717         * ipa-inline-analysis.c (will_be_nonconstant_predicate): Take
15718         nonconstant_names array.
15719         (estimate_function_body_sizes): Build nonconstant_names array; handle
15720         BUILT_IN_CONSTANT_P.
15721
15722 2011-04-28  Richard Guenther  <rguenther@suse.de>
15723
15724         PR bootstrap/48804
15725         Revert
15726         2011-04-28  Richard Guenther  <rguenther@suse.de>
15727
15728         * tree-ssa-structalias.c (solve_constraints): Build succ graph
15729         as late as possible.
15730
15731 2011-04-28  Richard Guenther  <rguenther@suse.de>
15732
15733         * tree-ssa-structalias.c (dump_constraint): Don't end the line.
15734         (debug_constraint): Do it here.
15735         (dump_constraints): And here.
15736         (rewrite_constraints): And here.
15737         (dump_constraint_edge): Remove.
15738         (dump_constraint_graph): Rewrite to produce DOT output.
15739         (solve_constraints): Build succ graph as late as possible.
15740         Dump constraint graphs before and after solving.
15741
15742 2011-04-28  Richard Guenther  <rguenther@suse.de>
15743
15744         * tree-ssa-structalias.c (find_func_aliases_for_builtin_call):
15745         New function split out from ...
15746         (find_func_aliases): ... here.  Call it.
15747         (find_func_aliases_for_call): Likewise.
15748
15749 2011-04-27  Gabriel Dos Reis  <gdr@integrable-solutions.net>
15750
15751         * internal-fn.h (internal_fn_name_array): Declare.
15752         (internal_fn_flags_array): Likewise.
15753
15754 2011-04-27  Uros Bizjak  <ubizjak@gmail.com>
15755
15756         * config/i386/i386.md (ssemodesuffix):  Merge with ssevecsize,
15757         ssemodefsuffix, ssescalarmodesuffix and avxmodesuffixp.
15758         Move from sse.md.
15759         (ssemodefsuffix): Remove.
15760         (ssevecmodesuffix): New mode attribute.
15761         (fix_trunc<mode>di_sse, fix_trunc<mode>si_sse,
15762         *float<SSEMODEI24:mode><MODEF:mode>2_mixed_interunit,
15763         *float<SSEMODEI24:mode><MODEF:mode>2_mixed_nointerunit,
15764         *float<SSEMODEI24:mode><MODEF:mode>2_sse_interunit,
15765         *float<SSEMODEI24:mode><MODEF:mode>2_sse_nointerunit, setcc_<mode>_sse,
15766         *sqrt<mode>2_sse, sse4_1_round<mode>2, <smaxmin:code><mode>3,
15767         *ieee_smin<mode>3, *ieee_smax<mode>3): Adjust assembler templates for
15768         ssemodesuffix mode attribute.
15769         (float splitters): Use ssevecmodesuffix mode attribute.
15770         * config/i386/sse.md (ssescalarmode): Merge with avxscalarmode.
15771         (sseinsmode): Rename from avxvecmode.
15772         (avxsizesuffix): Rename from avxmodesuffix.
15773         (sseintvecmode): Rename from avxpermvecmode.
15774         (ssedoublevecmode): Rename from ssedoublesizemode.
15775         (ssehalfvecmode): Rename from avxhalfvecmode.
15776         (ssescalarmode): Rename from avxscalarmode.
15777         (<sse>_comi, <sse>_ucomi, sse4a_movnt<mode>): Adjust assembler
15778         templates for ssemodesuffix mode attribute.
15779         (*andnot<mode>3, *<any_logic:code><mode>3): Use ssevecmodesuffix
15780         mode attribute.
15781
15782         Adjust RTX patterns globally for renamed mode attributes.
15783
15784 2011-04-27  Jan Hubcika  <jh@suse.cz>
15785
15786         * ipa-inline.h (struct inline_edge_summary): Add predicate pointer.
15787         * ipa-inline-analysis.c: Include alloc-pool.h.
15788         (edge_predicate_pool): New.
15789         (trye_predicate_p): New function
15790         (false_predicate_p): New function.
15791         (add_clause): Sanity check that false clauses are "optimized";
15792         never add clauses to predicate that is already known to be false.
15793         (and_predicate): Use flase_predicate_p.
15794         (evaulate_predicate): Rename to ...
15795         (evaluate_predicate): ... this one; update all callers; assert
15796         that false is not listed among possible truths.
15797         (dump_predicate): Use true_predicate_p.
15798         (account_size_time): Use false_predicate_p.
15799         (evaulate_conditions_for_edge): Rename to ...
15800         (evaluate_conditions_for_edge) ... this one.
15801         (edge_set_predicate): New function.
15802         (inline_edge_duplication_hook): Duplicate edge predicates.
15803         (inline_edge_removal_hook): Free edge predicates.
15804         (dump_inline_edge_summary): Add INFO parameter; dump edge predicates.
15805         (dump_inline_summary): Update.
15806         (estimate_function_body_sizes): Set edge predicates.
15807         (estimate_calls_size_and_time): Handle predicates.
15808         (estimate_callee_size_and_time): Update.
15809         (remap_predicate): Add toplev_predicate; update comment.
15810         (remap_edge_predicates): New function.
15811         (inline_merge_summary): Compute toplev predicate; update.
15812         (read_predicate): New function.
15813         (read_inline_edge_summary): Use it.
15814         (inline_read_section): Likewise.
15815         (write_predicate): New function.
15816         (write_inline_edge_summary): Use it.
15817         (inline_write_summary): Likewise.
15818         (inline_free_summary): Free alloc pool and edge summary vec.
15819
15820 2011-04-27  Richard Guenther  <rguenther@suse.de>
15821
15822         * tree-ssa-structalias.c (changed_count): Remove.
15823         (changed): Use a bitmap.
15824         (unify_nodes): Adjust.
15825         (do_sd_constraint): Likewise.
15826         (do_ds_constraint): Likewise.
15827         (do_complex_constraint): Likewise.
15828         (solve_graph): Likewise.
15829
15830 2011-04-27  Jan Hubicka  <jh@suse.cz>
15831
15832         * cgraphunit.c (cgraph_process_new_functions): Fix ordering issue.
15833
15834 2011-04-27  Uros Bizjak  <ubizjak@gmail.com>
15835
15836         * config/i386/predicates.md (avx_vpermilp_*_operand): Remove.
15837         (avx_vperm2f128_*_operand): Ditto.
15838         * config/i386/sse.md (*avx_vpermilp<mode>): Remove operand2 predicate.
15839         Use avx_vpermilp_parallel in insn condition.
15840         (*avx_vperm2f128<mode>_nozero): Remove operand3 predicate.
15841         Use avx_vperm2f128_parallel in insn condition.
15842
15843 2011-04-27  Richard Guenther  <rguenther@suse.de>
15844
15845         * Makefile.in (tree-ssa-structalias.o): Remove
15846         gt-tree-ssa-structalias.h dependency.
15847         (GTFILES): Remove tree-ssa-structalias.c.
15848         * tree.c (allocate_decl_uid): New function.
15849         (make_node_stat): Use it.
15850         (copy_node_stat): Likewise.
15851         * tree.h (allocate_decl_uid): Declare.
15852         * tree-ssa-alias.h (delete_alias_heapvars): Remove.
15853         * tree-ssa.c (delete_tree_ssa): Do not call delete_alias_heapvars.
15854         * tree-flow.h (struct var_ann_d): Remove is_heapvar flag.
15855         * tree-ssa-live.c (remove_unused_locals): Do not check is_heapvar flag.
15856         * tree-ssa-structalias.c (heapvar_for_stmt): Remove.
15857         (struct heapvar_map): Likewise.
15858         (heapvar_map_eq, heapvar_map_hash, heapvar_lookup,
15859         heapvar_insert): Likewise.
15860         (make_heapvar_for): Rename to ...
15861         (make_heapvar): ... this.  Simplify.
15862         (fake_var_decl_obstack): New global var.
15863         (build_fake_var_decl): New function.
15864         (make_constraint_from_heapvar): Adjust.
15865         (handle_lhs_call): Likewise.
15866         (create_function_info_for): Likewise.
15867         (intra_create_variable_infos): Likewise.
15868         (init_alias_vars): Allocate fake_var_decl_obstack.
15869         (init_alias_heapvars, delete_alias_heapvars): Remove.
15870         (compute_points_to_sets): Do not call init_alias_heapvars.
15871         (ipa_pta_execute): Likewise.
15872         (delete_points_to_sets): Free fake_var_decl_obstack.
15873
15874 2011-04-27  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
15875
15876         * config/spu/divmovti4.c (union qword_UTItype): New data type.
15877         (si_from_UTItype, si_to_UTItype): New functions.
15878         (__udivmodti4): Use them to implement type-punning.
15879         * config/spu/multi3.c (union qword_TItype): New data type.
15880         (si_from_TItype, si_to_TItype): New functions.
15881         (__multi3): Use them to implement type-punning.
15882
15883 2011-04-27  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
15884
15885         * config/spu/spu.c (spu_expand_epilogue): Do not emit barrier.
15886
15887 2011-04-27  Jan Hubicka  <jh@suse.cz>
15888
15889         * ipa-prop.c (function_insertion_hook_holder): New holder.
15890         (ipa_add_new_function): New function.
15891         (ipa_register_cgraph_hooks, ipa_unregister_cgraph_hooks):
15892         Register/deregister holder.
15893
15894 2011-04-27  Richard Guenther  <rguenther@suse.de>
15895
15896         PR tree-optimization/48772
15897         * tree-ssa-pre.c (eliminate): Update call stmts after elimination only.
15898
15899 2011-04-27  Richard Guenther  <rguenther@suse.de>
15900
15901         * tree-ssa-alias.c (indirect_refs_may_alias_p): Fix
15902         TARGET_MEM_REF handling.
15903
15904 2011-04-27  Nick Clifton  <nickc@redhat.com>
15905
15906         * config/frv/frv.h (enum reg_class): Delete EVEN_ACC_REGS,
15907         ACC_REGS, FEVEN_REGS, FPR_REGS, EVEN_REGS.
15908         (REG_CLASS_NAMES): Likewise.
15909         (REG_CLASS_CONTENTS): Likewise.
15910         (EVEN_ACC_REGS): New macro.  Alias for QUAD_ACC_REGS.
15911         (ACC_REGS): New macro.  Alias for QUAD_ACC_REGS.
15912         (FEVEN_REGS): New macro.  Alias for QUAD_ACC_REGS.
15913         (FPR_REGS): New macro.  Alias for QUAD_ACC_REGS.
15914         (EVEN_REGS): New macro.  Alias for QUAD_REGS.
15915         * config/frv/frv.c (frv_secondary_reload_class): Remove use of
15916         duplicate register classes.
15917         (frv_class_likely_spilled_p): Likewise.
15918         (frv_register_move_cost): Likewise.
15919
15920         * config/mcore/mcore.h (REGNO_REG_CLASS): Do not index beyond the
15921         end of the regno_reg_class array.
15922
15923 2011-04-27  Jakub Jelinek  <jakub@redhat.com>
15924
15925         PR c/48742
15926         * c-typeck.c (build_binary_op): Don't wrap arguments if
15927         int_operands is true.
15928
15929 2011-04-26  Kaz Kojima  <kkojima@gcc.gnu.org>
15930
15931         PR target/48767
15932         * config/sh/sh.c (sh_gimplify_va_arg_expr): Don't call
15933         targetm.calls.must_pass_in_stack for void type.
15934
15935 2011-04-26  Jan Hubicka  <jh@suse.cz>
15936
15937         * cgraphbuild.c (build_cgraph_edges): Update call
15938         of cgraph_create_edge and cgraph_create_indirect_edge.
15939         * cgraph.c (cgraph_create_edge_including_clones,
15940         cgraph_create_edge_1, cgraph_allocate_init_indirect_info,
15941         cgraph_update_edges_for_call_stmt_node): Do not take nest
15942         argument; do not initialize call_stmt_size/time.
15943         (dump_cgraph_node): Do not dump nest.
15944         (cgraph_clone_edge): Do not take loop_nest argument;
15945         do not propagate it; do not clone call_stmt_size/time.
15946         (cgraph_clone_node): Likewise.
15947         (cgraph_create_virtual_clone): Update.
15948         * cgraph.h (struct cgraph_edge): Remove
15949         call_stmt_size/call_stmt_time/loop_nest.
15950         (cgraph_create_edge, cgraph_create_indirect_edge,
15951         cgraph_create_edge_including_clones, cgraph_clone_node): Update
15952         prototype.
15953         * tree-emutls.c (gen_emutls_addr): Update.
15954         * ipa-inline-transform.c (update_noncloned_frequencies): Do not handle
15955         loop_nest; handle indirect calls, too.
15956         (clone_inlined_nodes): Do not care about updating inline summaries.
15957         * cgraphunit.c (cgraph_copy_node_for_versioning): Update.
15958         * lto-cgraph.c (lto_output_edge, input_node, input_edge): Do not
15959         stream call_stmt_size/call_stmt_time/loop_nest.
15960         * ipa-inline.c (edge_badness): Update.
15961         (ipa_inline): dump summaries after inlining.
15962         * ipa-inline.h (struct inline_edge_summary, inline_edge_summary_t):
15963         New.
15964         (inline_edge_summary): New function.
15965         * ipa-inline-analysis.c (edge_duplication_hook_holder): New holder.
15966         (inline_edge_removal_hook): Handle edge summaries.
15967         (inline_edge_duplication_hook): New hook.
15968         (inline_summary_alloc): Alloc hooks.
15969         (initialize_growth_caches): Do not register removal hooks.
15970         (free_growth_caches); Do not free removal hook.
15971         (dump_inline_edge_summary): New function.
15972         (dump_inline_summary): Use it.
15973         (estimate_function_body_sizes, estimate_edge_size_and_time): Update.
15974         (inline_update_callee_summaries): New function.
15975         (inline_merge_summary): Use it.
15976         (do_estimate_edge_time, do_estimate_edge_growth): Update.
15977         (read_inline_edge_summary): New function.
15978         (inline_read_section): Use it.
15979         (write_inline_edge_summary): New function.
15980         (inline_write_summary): Use it.
15981         (inline_free_summary): Free edge new holders.
15982         * tree-inline.c (copy_bb): Update.
15983
15984 2011-04-26  Jason Merrill  <jason@redhat.com>
15985
15986         * tree-eh.c (lower_try_finally_switch): Create the label along with
15987         the CASE_LABEL_EXPR.
15988
15989 2011-04-26  David S. Miller  <davem@davemloft.net>
15990             Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
15991
15992         * configure.ac (gcc_cv_as_sparc_gotdata_op): Specify alignment.
15993         * configure: Regenerate.
15994
15995 2011-04-26  Michael Meissner  <meissner@linux.vnet.ibm.com>
15996
15997         PR target/48258
15998         * config/rs6000/vector.md (UNSPEC_REDUC): New unspec for vector
15999         reduction.
16000         (VEC_reduc): New code iterator and splitters for vector reduction.
16001         (VEC_reduc_name): Ditto.
16002         (VEC_reduc_rtx): Ditto.
16003         (reduc_<VEC_reduc_name>_v2df): Vector reduction expanders for VSX.
16004         (reduc_<VEC_reduc_name>_v4sf): Ditto.
16005
16006         * config/rs6000/rs6000.c (rs6000_expand_vector_extract): Add
16007         support for extracting SF on VSX.
16008
16009         * config/rs6000/vsx.md (vsx_xscvspdp_scalar2): New insn for
16010         generating xscvspdp.
16011         (vsx_extract_v4sf): New insn to extract SF from V4SF vector.
16012         (vsx_reduc_<VEC_reduc_name>_v2df): New insns and splitters for
16013         double add, minimum, maximum vector reduction.
16014         (vsx_reduc_<VEC_reduc_name>_v4sf): Ditto.
16015         (vsx_reduc_<VEC_reduc_name>_v2df2_scalar): New combiner insn to
16016         optimize double vector reduction.
16017         (vsx_reduc_<VEC_reduc_name>_v4sf_scalar): Ditto.
16018
16019 2011-04-26  Joseph Myers  <joseph@codesourcery.com>
16020
16021         * config/fr30/fr30.h (inhibit_libc): Don't define.
16022         * config/m32r/m32r-protos.h: Correct comment.
16023         * config/v850/v850.h (GHS_default_section_names,
16024         GHS_current_section_names): Use tree, not union tree_node *.
16025
16026 2011-04-26  Xinliang David Li  <davidxl@google.com>
16027
16028         * tree-ssa-uninit.c (warn_uninitialized_phi): Pass warning code.
16029         * c-family/c-opts.c (c_common_handle_option): Set
16030         warn_maybe_uninitialized.
16031         * opts.c (common_handle_option): Ditto.
16032         * common.opt:  New option.
16033         * tree-ssa.c (warn_uninit): Add one more parameter.
16034         (warn_uninitialized_var): Pass warning code.
16035         * tree-flow.h: Interface change.
16036
16037 2011-04-26  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
16038
16039         * config/mips/iris6.h (LOCAL_LABEL_PREFIX): Don't test TARGET_NEWABI.
16040         (WINT_TYPE_SIZE): Use INT_TYPE_SIZE.
16041         (TARGET_OS_CPP_BUILTINS): Remove TARGET_IRIX6 guards.
16042
16043 2011-04-26  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
16044
16045         * config/mips/mips.h (DBX_OUTPUT_SOURCE_LINE): Remove.
16046         * config/mips/mips.opt (mmips-tfile): Remove.
16047
16048         * doc/install.texi (Specific, mips-*-*): Move mips-tfile,
16049         mips-tdump reference to ...
16050         (Specific, alpha*-dec-osf5.1): ... here.  Adapt for Tru64 UNIX.
16051         * doc/trouble.texi (Cross-Compiler Problems): Replace MIPS
16052         reference by Tru64 UNIX.
16053
16054 2011-04-26  Jakub Jelinek  <jakub@redhat.com>
16055
16056         PR debug/48768
16057         * tree-ssa.c (insert_debug_temp_for_var_def): If degenerate_phi_result
16058         is error_mark_node, set value to NULL.
16059
16060         PR tree-optimization/48734
16061         * tree-ssa-reassoc.c (eliminate_redundant_comparison): Give up
16062         if return value from maybe_fold_*_comparsions isn't something
16063         the code is prepared to handle.
16064
16065 2011-04-26  Uros Bizjak  <ubizjak@gmail.com>
16066
16067         * config/i386/predicates.md (ext_QIreg_operand): Remove extra
16068         mode check.
16069         (ext_QIreg_nomode_operands): Remove.
16070         * config/i386/i386.md (*anddi_1): Use ext_QIreg_operand.
16071         (*andsi_1): Ditto.
16072         (*andhi_1): Ditto.
16073
16074 2011-04-26  Andrew Stubbs  <ams@codesourcery.com>
16075
16076         * config/arm/arm.c (arm_gen_constant): Remove can_negate_initial.
16077
16078 2011-04-26  Richard Guenther  <rguenther@suse.de>
16079
16080         * c-typeck.c (build_unary_op): Do not expand array-refs via
16081         pointer arithmetic.  Only adjust qualifiers for function types.
16082
16083 2011-04-26  Richard Guenther  <rguenther@suse.de>
16084
16085         PR middle-end/48694
16086         * tree.h (OEP_CONSTANT_ADDRESS_OF): New operand_equal_flag.
16087         * fold-const.c (operand_equal_p): For TREE_CONSTANT ADDR_EXPRs
16088         compare the operands with OEP_CONSTANT_ADDRESS_OF.  Treat trees
16089         with TREE_SIDE_EFFECTS equal when OEP_CONSTANT_ADDRESS_OF is set.
16090
16091 2011-04-25  Paolo Carlini  <paolo.carlini@oracle.com>
16092
16093         * doc/extend.texi: Document __underlying_type.
16094
16095 2011-04-25  Segher Boessenkool  <segher@kernel.crashing.org>
16096
16097         * config/rs6000/titan.md (automata_option "progress"): Remove.
16098
16099 2011-04-25  Jeff Law  <law@redhat.com>
16100
16101         * tree-vrp.c (identify_jump_threads): Handle GIMPLE_SWITCH too.
16102
16103 2011-04-25  Jan Kratochvil  <jan.kratochvil@redhat.com>
16104
16105         * system.h (ENUM_BITFIELD): Remove.
16106
16107 2011-04-25  Maxim Kuvyrkov  <maxim@codesourcery.com>
16108             Eric Botcazou  <ebotcazou@adacore.com>
16109
16110         * combine.c (combine_simplify_rtx): Avoid mis-simplifying conditionals
16111         for STORE_FLAG_VALUE==-1 case.
16112
16113 2011-04-24  Richard Sandiford  <richard.sandiford@linaro.org>
16114
16115         PR target/43804
16116         * config/m68k/constraints.md (T): Allow PIC operands that satisfy
16117         LEGITIMATE_PIC_OPERAND_P.
16118
16119 2011-04-24  Jan Hubicka  <jh@suse.cz>
16120
16121         * ipa-prop.c (ipa_propagate_indirect_call_infos): Remove obsolette
16122         WPA hack.
16123         * ipa-prop.h (ipa_get_param, ipa_is_param_used,
16124         ipa_param_cannot_devirtualize_p, ipa_param_types_vec_empty,
16125         ipa_get_ith_jump_func, ipa_get_lattice): Fortify array bounds.
16126         * ipa-inline-analysis.c (add_clause): Fix clause ordering.
16127         (and_predicates, or_predicates, predicates_equal_p, evaulate_predicate):
16128         Sanity check predicate length.
16129         (remap_predicate): Likewise; sanity check jump functions.
16130         (inline_read_section, inline_write_summary): Sanity check
16131         predicate length.
16132
16133 2011-04-24  Paolo Carlini  <paolo.carlini@oracle.com>
16134
16135         PR other/48748
16136         * doc/extend.texi (Type Traits): Document __is_standard_layout,
16137         __is_literal_type, and __is_trivial; update throughout about
16138         possibly cv-qualified void types.
16139
16140 2011-04-24  Gerald Pfeifer  <gerald@pfeifer.com>
16141
16142         * doc/sourcebuild.texi (Ada Tests): Adjust reference to ACATS
16143         testsuite and make it version agnostic.
16144
16145 2011-04-22  Jan Hubicka  <jh@suse.cz>
16146
16147         * ipa-inline-analysis.c (inline_write_summary): Fix thinko.
16148
16149 2011-04-23  Jakub Jelinek  <jakub@redhat.com>
16150
16151         PR c/48685
16152         * fold-const.c (fold_convert_loc): Add NOP_EXPR when casting
16153         to VOID_TYPE even around MODIFY_EXPR.
16154
16155 2011-04-22  Mike Stump  <mikestump@comcast.net>
16156
16157         * gensupport.c (read_md_rtx): Fix typo in comment.
16158         * config/cris/cris.opt (moverride-best-lib-options): Fix typo in
16159         comment.
16160
16161 2011-04-22  Jan Hubicka  <jh@suse.cz>
16162
16163         * gengtype.c (open_base_files): Add ipa-inline.h include.
16164         * ipa-cp.c (ipcp_get_lattice, ipcp_lattice_from_jfunc): Move to
16165         ipa-prop.c; update all uses.
16166         * ipa-prop.c: (ipa_get_lattice, ipa_lattice_from_jfunc): ... here.
16167         * ipa-inline-transform.c (inline_call): Use inline_merge_summary to
16168         merge summary of inlined function into former caller.
16169         * ipa-inline.c (max_benefit): Remove.
16170         (edge_badness): Compensate for removal of benefits.
16171         (update_caller_keys): Use
16172         reset_node_growth_cache/reset_edge_growth_cache.
16173         (update_callee_keys): Likewise.
16174         (update_all_callee_keys): Likewise.
16175         (inline_small_functions): Do not collect max_benefit; do not reset
16176         estimated_growth; call free_growth_caches and initialize_growth_caches.
16177         * ipa-inline.h (struct condition, type clause_t, struct predicate,
16178         struct size_time_entry): New structures.
16179         (INLINE_SIZE_SCALE, INLINE_TIME_SCALE, MAX_CLAUSES): New constants.
16180         (inline_summary): Remove size_inlining_benefit, time_inlining_benefit
16181         and estimated_growth.
16182         (edge_growth_cache_entry): New structure.
16183         (node_growth_cache, edge_growth_cache): New global vars.
16184         (estimate_growth): Turn into inline.
16185         (inline_merge_summary, do_estimate_edge_growth, do_estimate_edge_time,
16186         initialize_growth_caches, free_growth_caches): Declare.
16187         (estimate_edge_growth): Rewrite.
16188         (estimate_edge_time): Implement as inline cache lookup.
16189         (reset_node_growth_cache, reset_edge_growth_cache): New inline
16190         functions.
16191         (MAX_TIME): Reduce to allow multiplicatoin by INLINE_SIZE_SCALE.
16192         (NUM_CONDITIONS): New constant.
16193         (predicate_conditions): New enum.
16194         (IS_NOT_CONSTANT): New constant.
16195         (edge_removal_hook_holder): New var.
16196         (node_growth_cache, edge_growth_cache): New global vars.
16197         (true_predicate, single_cond_predicate, false_predicate,
16198         not_inlined_predicate, add_condition, add_clause, and_predicates,
16199         or_predicates, predicates_equal_p, evaulate_predicate, dump_condition,
16200         dump_clause, dump_predicate, account_size_time,
16201         evaulate_conditions_for_edge): New functions.
16202         (inline_summary_alloc): Move to heap.
16203         (inline_node_removal_hook): Clear condition and entry vectors.
16204         (inline_edge_removal_hook): New function.
16205         (initialize_growth_caches, free_growth_caches): New function.
16206         (dump_inline_summary): Update.
16207         (edge_execution_predicate): New function.
16208         (will_be_nonconstant_predicate): New function.
16209         (estimate_function_body_sizes): Compute BB and constantness predicates.
16210         (compute_inline_parameters): Do not clear estimated_growth.
16211         (estimate_edge_size_and_time): New function.
16212         (estimate_calls_size_and_time): New function.
16213         (estimate_callee_size_and_time): New function.
16214         (remap_predicate): New function.
16215         (inline_merge_summary): New function.
16216         (do_estimate_edge_time): New function based on...
16217         (estimate_edge_time): ... this one.
16218         (do_estimate_edge_growth): New function.
16219         (do_estimate_growth): New function based on....
16220         (estimate_growth): ... this one.
16221         (inline_analyze_function): Analyze after deciding on jump functions.
16222         (inline_read_section): New function.
16223         (inline_read_summary): Use it.
16224         (inline_write_summary): Write all the new data.
16225         * ipa-prop.c (ipa_get_param_decl_index): Export.
16226         (ipa_lattice_from_jfunc): Move here from ipa-cp.c
16227         * ipa-prop.h (ipa_get_param_decl_index, ipa_lattice_from_jfunc):
16228         Declare.
16229         (ipa_get_lattice): Move here from ipa-cp.c
16230         * Makefile.in (GTFILES): Add ipa-inline.h and ipa-inline-analysis.c
16231         * params.def (PARAM_EARLY_INLINING_INSNS): Set to 11.
16232         * cgraph.h (cgraph_clone_inlined_nodes, compute_inline_parameters,
16233         cgraph_edge_inlinable_p): Remove.
16234         * cgraphunit.c: Include ipainline.h
16235         (cgraph_process_new_functions): Update call of
16236         compute_inline_parameters.
16237
16238 2011-04-22  Richard Guenther  <rguenther@suse.de>
16239
16240         * tree.c (build_int_cst): Properly create canonicalized integer
16241         constants.
16242         (build_int_cst_type): Remove scary comments.
16243
16244 2011-04-22  Xinliang David Li  <davidxl@google.com>
16245
16246         * toplev.c (process_options): Enable -Werror=coverage-mismatch
16247         by default when -Wno-error is not specified.
16248         * opts-global.c (decode_options): Remove call to
16249         control_warning_options.
16250
16251 2011-04-22  Jakub Jelinek  <jakub@redhat.com>
16252
16253         PR tree-optimization/48717
16254         * tree-ssa-forwprop.c (associate_plusminus): For A + ~A and
16255         ~A + A optimizations use build_int_cst_type instead of build_int_cst.
16256
16257 2011-04-22  Joseph Myers  <joseph@codesourcery.com>
16258
16259         * config/bfin/bfin-protos.h (Mmode): Don't define.  Expand
16260         definition where used.
16261
16262 2011-04-22  Jakub Jelinek  <jakub@redhat.com>
16263
16264         PR c/48716
16265         * gimplify.c (gimplify_bind_expr): Mark as GOVD_LOCAL also
16266         TREE_STATIC variables declared inside of some OpenMP construct.
16267
16268 2011-04-22  Martin Jambor  <mjambor@suse.cz>
16269
16270         PR middle-end/48585
16271         * tree-inline.c (copy_bb): Create new edges only for analyzed nodes.
16272
16273 2011-04-22  Alexander Monakov  <amonakov@ispras.ru>
16274
16275         PR c/36750
16276         * c-typeck.c (pop_init_level): Do not warn about initializing
16277         with ` = {0}'.
16278
16279 2011-04-22  Alan Modra  <amodra@gmail.com>
16280
16281         * config/rs6000/rs6000.c (rs6000_function_arg): Remove CALL_LIBCALL
16282         when returning call_cookie.
16283         (rs6000_function_ok_for_sibcall): Allow sibcalls via function
16284         pointers, to functions with no more vector args than the current
16285         function, and some non-local calls for ABI_V4.
16286         * config/rs6000/rs6000.md (sibcall_nonlocal_aix32,
16287         sibcall_nonlocal_aix64): Combine to ..
16288         (sibcall_nonlocal_aix<mode>): ..this.  Handle function pointer calls.
16289         (sibcall_value_nonlocal_aix32, sibcall_value_nonlocal_aix64): Combine..
16290         (sibcall_value_nonlocal_aix<mode>): ..likewise.
16291         (*sibcall_nonlocal_sysv<mode>): Handle function pointer calls.
16292         (sibcall_value_nonlocal_sysv<mode>): Likewise.  Correct call cookie
16293         operand.
16294         * config/rs6000/darwin.md (sibcall_nonlocal_darwin64,
16295         sibcall_value_nonlocal_darwin64, sibcall_symbolic_64,
16296         sibcall_value_symbolic_64): Delete.
16297
16298 2011-04-21  Xinliang David Li  <davidxl@google.com>
16299
16300         * cgraph.h: Remove pid.
16301         * cgraph.c: Remove pid.
16302         * value-prof.c (init_node_map): New function.
16303         (del_node_map): New function.
16304         (find_func_by_funcdef_no): New function.
16305         (gimple_ic_transform): Call new function.
16306         * cgraphunit.c (cgraph_finalize_function): Remove pid.
16307         * function.c (get_last_funcdef_no): New function.
16308         * function.h (get_last_funcdef_no): New function.
16309         * tree-profile.c (gimple_gen_ic_func_profiler): Pass funcdef_no
16310         to libgcov function.
16311         (tree-profiling): Call node map init and delete function.
16312
16313 2011-04-21  Ian Lance Taylor  <iant@google.com>
16314
16315         * godump.c (go_format_type): Use exported Go name for anonymous
16316         field name.
16317
16318 2011-04-21  Nathan Froyd  <froydnj@codesourcery.com>
16319
16320         * config/frv/frv.c (frv_init_builtins): Delete `endlink' variable.
16321         Call builtin_function_type_list instead of builtin_function_type.
16322         (UNARY, BINARY, TRINARY, QUAD): Likewise.
16323
16324 2011-04-21  Nathan Froyd  <froydnj@codesourcery.com>
16325
16326         * config/arm/arm.c (arm_init_iwmmxt_builtins): Call
16327         build_function_type_list instead of build_function_type.
16328         Delete variable `endlink'.
16329
16330 2011-04-21  Nathan Froyd  <froydnj@codesourcery.com>
16331
16332         * config/s390/s390.c (s390_init_builtins): Call
16333         build_function_type_list instead of build_function_type.
16334
16335 2011-04-21  Nathan Froyd  <froydnj@codesourcery.com>
16336
16337         * config/ia64/ia64.c (ia64_init_builtins): Call
16338         build_function_type_list instead of builtin_function_type.
16339
16340 2011-04-21  Easwaran Raman  <eraman@google.com>
16341
16342         * cfgexpand.c (stack_var): Remove OFFSET...
16343         (add_stack_var): ...and its reference here...
16344         (expand_stack_vars): ...and here.
16345         (stack_var_cmp): Sort by descending order of size.
16346         (partition_stack_vars): Change heuristic.
16347         (union_stack_vars): Fix to reflect changes in partition_stack_vars.
16348         (dump_stack_var_partition): Add newline after each partition.
16349
16350 2011-04-21  Dimitrios Apostolou  <jimis@gmx.net>
16351             Jeff Law  <law@redhat.com>
16352
16353         * gengtype-state.c (read_a_state_token): Fix argument to obstack_free.
16354         * gengtype.c (matching_file_name_substitute): Likewise.
16355
16356 2011-04-21  Richard Guenther  <rguenther@suse.de>
16357
16358         PR lto/48703
16359         * tree.c (free_lang_data_in_decl): Do not zero TREE_TYPE of DECL_NAME.
16360
16361 2011-04-21  Eric Botcazou  <ebotcazou@adacore.com>
16362
16363         * gimple.c (walk_gimple_op) <GIMPLE_CALL>: Fix couple of oversights.
16364
16365 2011-04-21  Richard Guenther  <rguenther@suse.de>
16366
16367         * Makefile.in (site.exp): Do not use tmp0 but site.tmp as temporary
16368         file name.
16369
16370 2011-04-21  Richard Guenther  <rguenther@suse.de>
16371
16372         * tree-ssa-alias.c (ptr_deref_may_alias_decl_p): Handle
16373         MEM_REF and TARGET_MEM_REF, do not care about INDIRECT_REFs.
16374         Use DECL_P, not SSA_VAR_P.
16375         (ptr_derefs_may_alias_p): Likewise.
16376         (ptr_deref_may_alias_ref_p_1): Likewise.
16377         (decl_refs_may_alias_p): Likewise.
16378         (refs_may_alias_p_1): Likewise.
16379         (ref_maybe_used_by_call_p_1): Likewise.
16380         (call_may_clobber_ref_p_1): Likewise.
16381         (indirect_ref_may_alias_decl_p): Assume indirect refrences
16382         are either MEM_REF or TARGET_MEM_REF.
16383         (indirect_refs_may_alias_p): Likewise.
16384         * calls.c (emit_call_1): Build a MEM_REF instead of an INDIRECT_REF
16385         for MEM_EXPR of indirect calls.
16386
16387 2011-04-21  Tristan Gingold  <gingold@adacore.com>
16388
16389         * vmsdbgout.c (write_srccorr): Compute file length from the string.
16390         (dst_file_info_struct): Remove flen field.
16391         (lookup_filename): Remove code that set flen field.
16392
16393 2011-04-21  Tristan Gingold  <gingold@adacore.com>
16394
16395         * config/ia64/ia64.c (ia64_start_function): Add a guard.
16396
16397 2011-04-21  Uros Bizjak  <ubizjak@gmail.com>
16398
16399         PR target/48708
16400         * config/i386/i386.c (ix86_expand_vector_set) <V2DImode>: Generate
16401         vec_extract and vec_concat for non-SSE4_1 targets.
16402
16403 2011-04-21  Richard Guenther  <rguenther@suse.de>
16404
16405         * tree-ssa-alias.c (ref_maybe_used_by_stmt_p): Handle
16406         return statements.
16407
16408 2011-04-21  Joseph Myers  <joseph@codesourcery.com>
16409
16410         * config/i386/cygming.h (union tree_node, TREE): Don't define or
16411         undefine.
16412         (FILE): Don't undefine.
16413
16414 2011-04-21  Joseph Myers  <joseph@codesourcery.com>
16415
16416         * config/alpha/alpha.c (struct machine_function): Use rtx, not
16417         struct rtx_def *.
16418         * config/bfin/bfin.h (bfin_cc_rtx, bfin_rets_rtx): Use rtx, not
16419         struct rtx_def *.
16420         * config/cris/cris-protos.h (STDIO_INCLUDED): Don't define.
16421         * config/h8300/h8300.h (struct cum_arg): Use rtx, not struct rtx_def *.
16422         * config/iq2000/iq2000.h (struct iq2000_args): Use rtx, not struct
16423         rtx_def *.
16424         * config/m32c/m32c-protos.h (MM, UINT): Don't define.  Expand
16425         definitions where used.
16426         * config/microblaze/microblaze.h (struct microblaze_args): Use
16427         rtx, not struct rtx_def *.
16428         * config/pa/pa-protos.h (return_addr_rtx): Use rtx, not struct
16429         rtx_def *.
16430         * config/pa/pa.h (hppa_pic_save_rtx): Use rtx, not struct rtx_def *.
16431         * config/pdp11/pdp11.h (cc0_reg_rtx): Use rtx, not struct rtx_def *.
16432         * config/sh/sh-protos.h (sfunc_uses_reg, get_fpscr_rtx): Use rtx,
16433         not struct rtx_def *.
16434         * config/sh/sh.h (sh_compare_op0, sh_compare_op1): Use rtx, not
16435         struct rtx_def *.
16436         * config/spu/spu-protos.h (spu_float_const): Use rtx, not struct
16437         rtx_def *.
16438         * config/spu/spu.c (spu_float_const): Use rtx, not struct rtx_def *.
16439
16440 2011-04-21  Richard Sandiford  <richard.sandiford@linaro.org>
16441
16442         * tree-vect-data-refs.c (vect_drs_dependent_in_basic_block): Use
16443         operand_equal_p to compare DR_BASE_ADDRESSes.
16444         (vect_check_interleaving): Likewise.
16445
16446 2011-04-21  Richard Sandiford  <richard.sandiford@linaro.org>
16447
16448         PR target/46329
16449         * config/arm/arm.c (arm_legitimate_constant_p_1): Return false
16450         for all Neon struct constants.
16451
16452 2011-04-21  Richard Sandiford  <richard.sandiford@linaro.org>
16453
16454         * target.def (legitimate_constant_p): New hook.
16455         * doc/tm.texi.in (LEGITIMATE_CONSTANT_P): Replace with...
16456         (TARGET_LEGITIMATE_CONSTANT_P): ...this.
16457         * doc/tm.texi: Regenerate.
16458         * hooks.h (hook_bool_mode_rtx_true): Declare.
16459         * hooks.c (hook_bool_mode_rtx_true): Define.
16460         * system.h (LEGITIMATE_CONSTANT_P): Poison.
16461         * calls.c (precompute_register_parameters): Replace uses of
16462         LEGITIMATE_CONSTANT_P with targetm.legitimate_constant_p.
16463         (emit_library_call_value_1): Likewise.
16464         * expr.c (move_block_to_reg, can_store_by_pieces, emit_move_insn)
16465         (compress_float_constant, emit_push_insn, expand_expr_real_1): Likewise.
16466         * ira-costs.c (scan_one_insn): Likewise.
16467         * recog.c (general_operand, immediate_operand): Likewise.
16468         * reload.c (find_reloads_toplev, find_reloads_address_part): Likewise.
16469         * reload1.c (init_eliminable_invariants): Likewise.
16470
16471         * config/alpha/alpha-protos.h (alpha_legitimate_constant_p): Add a
16472         mode argument.
16473         * config/alpha/alpha.h (LEGITIMATE_CONSTANT_P): Delete.
16474         * config/alpha/alpha.c (alpha_legitimate_constant_p): Add a mode
16475         argument.
16476         (TARGET_LEGITIMATE_CONSTANT_P): Define.
16477         * config/alpha/predicates.md (input_operand): Update call to
16478         alpha_legitimate_constant_p.
16479
16480         * config/arm/arm-protos.h (arm_cannot_force_const_mem): Delete.
16481         * config/arm/arm.h (ARM_LEGITIMATE_CONSTANT_P): Likewise.
16482         (THUMB_LEGITIMATE_CONSTANT_P, LEGITIMATE_CONSTANT_P): Likewise.
16483         * config/arm/arm.c (TARGET_LEGITIMATE_CONSTANT_P): Define.
16484         (arm_legitimate_constant_p_1, thumb_legitimate_constant_p)
16485         (arm_legitimate_constant_p): New functions.
16486         (arm_cannot_force_const_mem): Make static.
16487
16488         * config/avr/avr.h (LEGITIMATE_CONSTANT_P): Delete.
16489
16490         * config/bfin/bfin-protos.h (bfin_legitimate_constant_p): Delete.
16491         * config/bfin/bfin.h (LEGITIMATE_CONSTANT_P): Delete.
16492         * config/bfin/bfin.c (expand_move): Use targetm.legitimate_constant_p
16493         instead of bfin_legitimate_constant_p.
16494         (bfin_legitimate_constant_p): Make static.  Add a mode argument.
16495         (TARGET_LEGITIMATE_CONSTANT_P): Define.
16496
16497         * config/cris/cris.h (LEGITIMATE_CONSTANT_P): Delete.
16498
16499         * config/fr30/fr30.h (LEGITIMATE_CONSTANT_P): Delete.
16500
16501         * config/frv/frv-protos.h (frv_legitimate_constant_p): Delete.
16502         * config/frv/frv.h (LEGITIMATE_CONSTANT_P): Delete.
16503         * config/frv/frv.c (TARGET_LEGITIMATE_CONSTANT_P): Define.
16504         (frv_legitimate_constant_p): Make static.  Add a mode argument.
16505
16506         * config/h8300/h8300-protos.h (h8300_legitimate_constant_p): Delete.
16507         * config/h8300/h8300.h (LEGITIMATE_CONSTANT_P): Likewise.
16508         * config/h8300/h8300.c (h8300_legitimate_constant_p): Likewise.
16509
16510         * config/i386/i386-protos.h (legitimate_constant_p): Delete.
16511         * config/i386/i386.h (LEGITIMATE_CONSTANT_P): Likewise.
16512         * config/i386/i386.c (legitimate_constant_p): Rename to...
16513         (ix86_legitimate_constant_p): ...this.  Make static.  Add a mode
16514         argument.
16515         (ix86_cannot_force_const_mem): Update accordingly.
16516         (ix86_legitimate_address_p): Likewise.
16517         (TARGET_LEGITIMATE_CONSTANT_P): Define.
16518         * config/i386/i386.md: Update commentary.
16519
16520         * config/ia64/ia64-protos.h (ia64_legitimate_constant_p): Delete.
16521         * config/ia64/ia64.h (LEGITIMATE_CONSTANT_P): Likewise.
16522         * config/ia64/ia64.c (TARGET_LEGITIMATE_CONSTANT_P): Define.
16523         (ia64_legitimate_constant_p): Make static.  Add a mode argument.
16524
16525         * config/iq2000/iq2000.h (LEGITIMATE_CONSTANT_P): Delete.
16526
16527         * config/lm32/lm32-protos.h (lm32_legitimate_constant_p): Delete.
16528         * config/lm32/lm32.h (LEGITIMATE_CONSTANT_P): Likewise.
16529         * config/lm32/lm32.c (TARGET_LEGITIMATE_CONSTANT_P): Define.
16530         (lm32_legitimate_constant_p): Make static.  Add a mode argument.
16531
16532         * config/m32c/m32c-protos.h (m32c_legitimate_constant_p): Delete.
16533         * config/m32c/m32c.h (LEGITIMATE_CONSTANT_P): Likewise.
16534         * config/m32c/m32c.c (m32c_legitimate_constant_p): Likewise.
16535
16536         * config/m32r/m32r.h (LEGITIMATE_CONSTANT_P): Delete.
16537         * config/m32r/m32r.c (TARGET_LEGITIMATE_CONSTANT_P): Define.
16538         (m32r_legitimate_constant_p): New function.
16539
16540         * config/m68k/m68k-protos.h (m68k_legitimate_constant_p): Declare.
16541         * config/m68k/m68k.h (CONSTANT_ADDRESS_P): Call it instead of
16542         LEGITIMATE_CONSTANT_P.
16543         (LEGITIMATE_CONSTANT_P): Delete.
16544         * config/m68k/m68k.c (m68k_expand_prologue): Call
16545         m68k_legitimate_constant_p instead of LEGITIMATE_CONSTANT_P.
16546         (m68k_legitimate_constant_p): New function.
16547         * config/m68k/m68k.md: Update comments.
16548
16549         * config/mcore/mcore.h (LEGITIMATE_CONSTANT_P): Delete.
16550         * config/mcore/mcore.c (TARGET_LEGITIMATE_CONSTANT_P): Define.
16551         (mcore_legitimate_constant_p): New function.
16552
16553         * config/mep/mep-protos.h (mep_legitimate_constant_p): Delete.
16554         * config/mep/mep.h (LEGITIMATE_CONSTANT_P): Likewise.
16555         * config/mep/mep.c (mep_legitimate_constant_p): Make static.
16556         Add a mode argument.
16557         (mep_legitimate_address): Update accordingly.
16558         (TARGET_LEGITIMATE_CONSTANT_P): Define.
16559
16560         * config/microblaze/microblaze-protos.h (microblaze_const_double_ok):
16561         Delete.
16562         * config/microblaze/microblaze.h (LEGITIMATE_CONSTANT_P): Likewise.
16563         * config/microblaze/microblaze.c (microblaze_const_double_ok): Make
16564         static.  Check OP's mode for VOIDmode.
16565         (microblaze_legitimate_constant_p): New function.
16566         (TARGET_LEGITIMATE_CONSTANT_P): Define.
16567
16568         * config/mips/mips.h (LEGITIMATE_CONSTANT_P): Delete.
16569         * config/mips/mips.c (mips_legitimate_constant_p): New function.
16570         (mips_cannot_force_const_mem): Use it instead of LEGITIMATE_CONSTANT_P.
16571         (TARGET_LEGITIMATE_CONSTANT_P): Define.
16572         * config/mips/predicates.md: Update comments.
16573
16574         * config/mmix/mmix-protos.h (mmix_legitimate_constant_p): Delete.
16575         * config/mmix/mmix.h (LEGITIMATE_CONSTANT_P): Likewise.
16576         * config/mmix/mmix.c (TARGET_LEGITIMATE_CONSTANT_P): Define.
16577         (mmix_legitimate_constant_p): Make static, return a bool, and take
16578         a mode argument.
16579         (mmix_print_operand_address): Update accordingly.
16580
16581         * config/mn10300/mn10300-protos.h (mn10300_legitimate_constant_p):
16582         Delete.
16583         * config/mn10300/mn10300.h (LEGITIMATE_CONSTANT_P): Likewise.
16584         * config/mn10300/mn10300.c (mn10300_legitimate_constant_p): Make
16585         static.  Add a mode argument.
16586         (TARGET_LEGITIMATE_CONSTANT_P): Define.
16587
16588         * config/moxie/moxie.h (LEGITIMATE_CONSTANT_P): Delete.
16589
16590         * config/pa/pa.h (LEGITIMATE_CONSTANT_P): Delete.
16591         * config/pa/pa.c (TARGET_LEGITIMATE_CONSTANT_P): Define.
16592         (pa_legitimate_constant_p): New function.
16593
16594         * config/picochip/picochip.h (LEGITIMATE_CONSTANT_P): Delete.
16595
16596         * config/pdp11/pdp11.h (LEGITIMATE_CONSTANT_P): Delete.
16597         * config/pdp11/pdp11.c (TARGET_LEGITIMATE_CONSTANT_P): Define.
16598         (pdp11_legitimate_constant_p): New function.
16599
16600         * config/rs6000/rs6000.h (LEGITIMATE_CONSTANT_P): Delete.
16601         * config/rs6000/rs6000.c (TARGET_LEGITIMATE_CONSTANT_P): Define.
16602         (rs6000_legitimate_constant_p): New function.
16603
16604         * config/rx/rx-protos.h (rx_is_legitimate_constant): Replace with...
16605         (rx_legitimate_constant_p): ...this.
16606         * config/rx/rx.h (LEGITIMATE_CONSTANT_P): Delete.
16607         * config/rx/rx.c (rx_is_legitimate_constant): Replace with...
16608         (rx_legitimate_constant_p): ...this.
16609         (TARGET_LEGITIMATE_CONSTANT_P): Define.
16610         * config/rx/rx.md (mov<register_modes:mode>): Update accordingly.
16611
16612         * config/s390/s390-protos.h (legitimate_constant_p): Delete.
16613         * config/s390/s390.h (LEGITIMATE_CONSTANT_P): Likewise.
16614         * config/s390/s390.c (legitimate_constant_p): Rename to...
16615         (s390_legitimate_constant_p): ...this.  Make static, return a bool,
16616         and add a mode argument.
16617         (TARGET_LEGITIMATE_CONSTANT_P): Define.
16618
16619         * config/score/score.h (LEGITIMATE_CONSTANT_P): Delete.
16620
16621         * config/sh/sh.h (LEGITIMATE_CONSTANT_P): Delete.
16622         * config/sh/sh.c (TARGET_LEGITIMATE_CONSTANT_P): Define.
16623         (sh_legitimate_constant_p): New function.
16624
16625         * config/sparc/sparc-protos.h (legitimate_constant_p): Delete.
16626         * config/sparc/sparc.h (LEGITIMATE_CONSTANT_P): Delete.
16627         * config/sparc/sparc.c (TARGET_LEGITIMATE_CONSTANT_P): Define.
16628         (legitimate_constant_p): Rename to...
16629         (sparc_legitimate_constant_p): ...this.  Make static.  Add a mode
16630         argument.
16631         (constant_address_p): Update accordingly.
16632
16633         * config/spu/spu-protos.h (spu_legitimate_constant_p): Add a mode
16634         argument and return a bool.
16635         * config/spu/spu.h (LEGITIMATE_CONSTANT_P): Delete.
16636         * config/spu/spu.c (TARGET_LEGITIMATE_CONSTANT_P): Define.
16637         (spu_legitimate_constant_p): Add a mode argument and return a bool.
16638         (spu_rtx_costs): Update accordingly.
16639         * config/spu/predicates.md (vec_imm_operand): Likewise.
16640
16641         * config/stormy16/stormy16.h (LEGITIMATE_CONSTANT_P): Delete.
16642
16643         * config/v850/v850.h (LEGITIMATE_CONSTANT_P): Delete.
16644         * config/v850/v850.c (v850_legitimate_constant_p): New function.
16645         (TARGET_LEGITIMATE_CONSTANT_P): Define.
16646
16647         * config/vax/vax-protos.h (legitimate_constant_p): Delete.
16648         * config/vax/vax.h (LEGITIMATE_CONSTANT_P): Likewise.
16649         * config/vax/vax.c (legitimate_constant_p): Likewise.
16650
16651         * config/xtensa/xtensa.h (LEGITIMATE_CONSTANT_P): Delete.
16652         * config/xtensa/xtensa.c (TARGET_LEGITIMATE_CONSTANT_P): Define.
16653         (xtensa_legitimate_constant_p): New function.
16654
16655 2011-04-21  Richard Sandiford  <richard.sandiford@linaro.org>
16656
16657         * target.def (cannot_force_const_mem): Add a mode argument.
16658         * doc/tm.texi.in (TARGET_CANNOT_FORCE_CONST_MEM): Update accordingly.
16659         * doc/tm.texi: Regenerate.
16660         * hooks.h (hook_bool_mode_rtx_false): Declare.
16661         * hooks.c (hook_bool_mode_const_rtx_false): Fix commentary.
16662         (hook_bool_mode_const_rtx_true): Likewise.
16663         (hook_bool_mode_rtx_false): New function.
16664         * reload.c (CONST_POOL_OK_P): Take a mode argument and require it
16665         to be non-VOID.  Update call to cannot_force_const_mem.
16666         (find_reloads): Update accordingly.
16667         * varasm.c (force_const_mem): Update call to cannot_force_const_mem.
16668         * config/alpha/alpha.c (alpha_cannot_force_const_mem): Add a mode
16669         argument.
16670         * config/arm/arm-protos.h (arm_cannot_force_const_mem): Likewise.
16671         * config/arm/arm.h (LEGITIMATE_CONSTANT_P): Update call.
16672         * config/arm/arm.c (arm_cannot_force_const_mem): Add a mode argument.
16673         * config/bfin/bfin.c (bfin_cannot_force_const_mem): Likewise.
16674         * config/frv/frv.c (frv_cannot_force_const_mem): Likewise.
16675         * config/i386/i386.c (ix86_cannot_force_const_mem): Likewise.
16676         * config/ia64/ia64.c (ia64_cannot_force_const_mem): Likewise.
16677         * config/m68k/m68k.c (TARGET_CANNOT_FORCE_CONST_MEM): Redefine to...
16678         (m68k_cannot_force_const_mem): ...this new function.
16679         * config/mips/mips.c (mips_cannot_force_const_mem): Add a mode
16680         argument.
16681         (mips_const_insns, mips_legitimize_const_move): Update calls.
16682         (mips_secondary_reload_class): Likewise.
16683         * config/pa/pa.c (TARGET_CANNOT_FORCE_CONST_MEM): Redefine to...
16684         (pa_cannot_force_const_mem): ...this new function.
16685         * config/rs6000/rs6000.c (TARGET_CANNOT_FORCE_CONST_MEM): Reefine to...
16686         (rs6000_cannot_force_const_mem): ...this new function.
16687         * config/s390/s390.c (s390_cannot_force_const_mem): Add a mode
16688         argument.
16689         * config/sparc/sparc.c (sparc_cannot_force_const_mem): Likewise.
16690         * config/xtensa/xtensa.c (TARGET_CANNOT_FORCE_CONST_MEM): Redefine
16691         to...
16692         (xtensa_cannot_force_const_mem): ...this new function.
16693
16694 2011-04-20  Nathan Froyd  <froydnj@codesourcery.com>
16695
16696         * config/mips/mips.c (mips16_build_function_stub): Call
16697         build_function_type_list instead of build_function_type.
16698         (mips16_build_call_stub): Likewise.
16699
16700 2011-04-20  Nathan Froyd  <froydnj@codesourcery.com>
16701
16702         * config/mep/mep.c (mep_init_builtins): Call build_function_type_list
16703         instead of build_function_type.
16704
16705 2011-04-20  Nathan Froyd  <froydnj@codesourcery.com>
16706
16707         * config/pa/pa.c (pa_init_builtins): Call build_function_type_list
16708         instead of build_function_type.
16709
16710 2011-04-20  Uros Bizjak  <ubizjak@gmail.com>
16711
16712         PR target/48678
16713         * config/i386/i386.md (insv): Change operand 0 constraint to
16714         "register_operand".  Change operand 1 and 2 constraint to
16715         "const_int_operand".  Expand to pinsr{b,w,d,q} * when appropriate.
16716         * config/i386/sse.md (sse4_1_pinsrb): Export.
16717         (sse2_pinsrw): Ditto.
16718         (sse4_1_pinsrd): Ditto.
16719         (sse4_1_pinsrq): Ditto.
16720         * config/i386/i386-protos.h (ix86_expand_pinsr): Add prototype.
16721         * config/i386/i386.c (ix86_expand_pinsr): New.
16722
16723 2011-04-20  Easwaran Raman  <eraman@google.com>
16724
16725         * cfgexpand.c (add_alias_set_conflicts): Add conflicts with a variable
16726         containing union type only with -fstrict-aliasing.
16727
16728 2011-04-20  Jim Meyering  <meyering@redhat.com>
16729
16730         Remove useless if-before-free tests.
16731         * calls.c (expand_call, save_area): Likewise.
16732         * cfgcleanup.c (try_forward_edges): Likewise.
16733         * collect2.c (collect_execute): Likewise.
16734         * config/i386/i386.c (ix86_valid_target_attribute_tree): Likewise.
16735         * config/mcore/mcore.c (mcore_expand_prolog): Likewise.
16736         * coverage.c (coverage_checksum_string): Likewise.
16737         * cse.c (init_cse_reg_info, delete_trivially_dead_insns): Likewise.
16738         * cselib.c (cselib_init): Likewise.
16739         * df-core.c (rest_of_handle_df_finish, df_analyze): Likewise.
16740         (df_set_clean_cfg): Likewise.
16741         * function.c (free_after_compilation): Likewise.
16742         * gcc.c (do_spec_1, main): Likewise.
16743         * gcov.c (create_file_names): Likewise.
16744         * gensupport.c (identify_predicable_attribute): Likewise.
16745         * graphite-clast-to-gimple.c (save_clast_name_index): Likewise.
16746         * graphite-sese-to-poly.c (free_data_refs_aux): Likewise.
16747         * haifa-sched.c (haifa_finish_h_i_d): Likewise.
16748         * ipa-prop.c (ipa_free_node_params_substructures): Likewise.
16749         * ipa-pure-const.c (local_pure_const): Likewise.
16750         * ipa-reference.c (propagate): Likewise.
16751         * ira-costs.c (free_ira_costs): Likewise.
16752         * ira.c (free_register_move_costs, build_insn_chain): Likewise.
16753         * matrix-reorg.c (mat_free): Likewise.
16754         * prefix.c (get_key_value): Likewise.
16755         * profile.c (compute_value_histograms): Likewise.
16756         * reload1.c (free_reg_equiv): Likewise.
16757         * sched-deps.c (free_deps): Likewise.
16758         * sel-sched-ir.c (fence_clear): Likewise.
16759         * sese.c (set_rename, if_region_set_false_region): Likewise.
16760         * tree-data-ref.c (free_rdg): Likewise.
16761         * tree-eh.c (lower_try_finally): Likewise.
16762         * tree-ssa-coalesce.c (delete_coalesce_list): Likewise.
16763         * tree-ssa-live.c (delete_var_map): Likewise.
16764         * tree-ssa-loop-ivopts.c (free_loop_data): Likewise.
16765         * tree-ssa-pre.c (phi_trans_add): Likewise.
16766
16767 2011-04-20  Jakub Jelinek  <jakub@redhat.com>
16768
16769         PR tree-optimization/48611
16770         * tree-eh.c (note_eh_region_may_contain_throw): Don't propagate
16771         beyond ERT_MUST_NOT_THROW region.
16772
16773 2011-04-20  Catherine Moore  <clm@codesourcery.com>
16774
16775         * config/mips/mips.opt (mfix-24k): New.
16776         * config/mips/mips.h (ASM_SPEC): Handle -mfix-24k.
16777         * config/mips/mips.md (length): Increase by 4 for stores if
16778         fixing 24K errata.
16779         * config/mips/mips.c (mips_reorg_process_insns): Do not allow
16780         all noreorder if fixing 24K errata.
16781         * doc/invoke.texi: Document mfix-24k.
16782
16783 2011-04-20  Chung-Lin Tang  <cltang@codesourcery.com>
16784
16785         * config/arm/arm.c (arm_legitimize_reload_address): For NEON
16786         quad-word modes, reduce to 9-bit index range when above 1016 limit.
16787
16788 2011-04-20  Andrew Stubbs  <ams@codesourcery.com>
16789
16790         * config/arm/arm.c (arm_gen_constant): Move movw support ....
16791         (const_ok_for_op): ... to here.
16792
16793 2011-04-20  Kai Tietz  <ktietz@redhat.com>
16794
16795         * fold-const.c (fold_binary_loc): Add handling for (X & ~Y) | (~X & Y)
16796         and (X && !Y) | (!X && Y) optimization to (X ^ Y).
16797
16798 2011-04-20  Andrew Stubbs  <ams@codesourcery.com>
16799
16800         * config/arm/arm.c (arm_gen_constant): Remove redundant can_invert.
16801
16802 2011-04-20  Richard Guenther  <rguenther@suse.de>
16803
16804         PR tree-optimization/47892
16805         * tree-if-conv.c (if_convertible_stmt_p): Const builtins
16806         are if-convertible.
16807
16808 2011-04-20  Eric Botcazou  <ebotcazou@adacore.com>
16809
16810         * config/alpha/vms.h (ASM_OUTPUT_ADDR_DIFF_ELT): Do not redefine.
16811
16812 2011-04-20  Tristan Gingold  <gingold@adacore.com>
16813
16814         * config/alpha/vms.h (LINK_SPEC): Do not use vms-dwarf2.o for gnu-ld.
16815
16816 2011-04-20  Georg-Johann Lay  <avr@gjlay.de>
16817
16818         PR target/18145
16819
16820         * config/avr/avr.h (TARGET_ASM_INIT_SECTIONS): Delete.
16821         (ASM_OUTPUT_COMMON, ASM_OUTPUT_LOCAL): Delete.
16822         (ASM_OUTPUT_ALIGNED_DECL_COMMON): Define.
16823         (ASM_OUTPUT_ALIGNED_DECL_LOCAL): Define.
16824         (TARGET_ASM_NAMED_SECTION): Change to avr_asm_named_section.
16825
16826         * config/avr/avr-protos.h (avr_asm_output_aligned_common):
16827         New prototype.
16828
16829         * config/avr/avr.c (TARGET_ASM_INIT_SECTIONS): Define.
16830         (avr_asm_named_section, avr_asm_output_aligned_common,
16831         avr_output_data_section_asm_op, avr_output_bss_section_asm_op):
16832         New functions to update...
16833         (avr_need_clear_bss_p, avr_need_copy_data_p): ...these new variables.
16834         (avr_asm_init_sections): Overwrite section callbacks for
16835         data_section, bss_section.
16836         (avr_file_start): Move output of __do_copy_data, __do_clear_bss
16837         from here to...
16838         (avr_file_end): ...here.
16839
16840 2011-04-20  Richard Guenther  <rguenther@suse.de>
16841
16842         PR middle-end/48695
16843         * tree-ssa-alias.c (aliasing_component_refs_p): Compute base
16844         objects and types here.  Adjust for their offset before comparing.
16845
16846 2011-04-20  Richard Sandiford  <richard.sandiford@linaro.org>
16847
16848         * tree-vect-stmts.c (vectorizable_store): Only chain one related
16849         statement per copy.
16850
16851 2011-04-20  Richard Sandiford  <richard.sandiford@linaro.org>
16852
16853         * Makefile.in (INTERNAL_FN_DEF, INTERNAL_FN_H): Define.
16854         (GIMPLE_H): Include $(INTERNAL_FN_H).
16855         (OBJS-common): Add internal-fn.o.
16856         (internal-fn.o): New rule.
16857         * internal-fn.def: New file.
16858         * internal-fn.h: Likewise.
16859         * internal-fn.c: Likewise.
16860         * gimple.h: Include internal-fn.h.
16861         (GF_CALL_INTERNAL): New gf_mask.
16862         (gimple_statement_call): Put fntype into a union with a new
16863         internal_fn field.
16864         (gimple_build_call_internal): Declare.
16865         (gimple_build_call_internal_vec): Likewise.
16866         (gimple_call_same_target_p): Likewise.
16867         (gimple_call_internal_p): New function.
16868         (gimple_call_internal_fn): Likewise.
16869         (gimple_call_fntype): Return null for internal calls.
16870         (gimple_call_set_fntype): Assert that the function is not internal.
16871         (gimple_call_set_fn): Likewise.
16872         (gimple_call_set_fndecl): Likewise.
16873         (gimple_call_set_internal_fn): New function.
16874         (gimple_call_addr_fndecl): Handle null functions.
16875         (gimple_call_return_type): Likewise null types.
16876         * gimple.c (gimple_build_call_internal_1): New function.
16877         (gimple_build_call_internal): Likewise.
16878         (gimple_build_call_internal_vec): Likewise.
16879         (gimple_call_same_target_p): Likewise.
16880         (gimple_call_flags): Handle calls to internal functions.
16881         (gimple_call_fnspec): New function.
16882         (gimple_call_arg_flags, gimple_call_return_flags): Use it.
16883         (gimple_has_side_effects): Handle null functions.
16884         (gimple_rhs_has_side_effects): Likewise.
16885         (gimple_call_copy_skip_args): Handle calls to internal functions.
16886         * cfgexpand.c (expand_call_stmt): Likewise.
16887         * expr.c (expand_expr_real_1): Assert that the call isn't internal.
16888         * gimple-fold.c (gimple_fold_call): Handle null functions.
16889         (gimple_fold_stmt_to_constant_1): Don't fold
16890         calls to internal functions.
16891         * gimple-low.c (gimple_check_call_args): Handle calls to internal
16892         functions.
16893         * gimple-pretty-print.c (dump_gimple_call): Likewise.
16894         * ipa-prop.c (ipa_analyze_call_uses): Handle null functions.
16895         * tree-cfg.c (verify_gimple_call): Handle calls to internal functions.
16896         (do_warn_unused_result): Likewise.
16897         * tree-eh.c (same_handler_p): Use gimple_call_same_target_p.
16898         * tree-ssa-ccp.c (ccp_fold_stmt): Handle calls to internal functions.
16899         * tree-ssa-dom.c (hashable_expr): Use the gimple statement to record
16900         the target of a call.
16901         (initialize_hash_element): Update accordingly.
16902         (hashable_expr_equal_p): Use gimple_call_same_target_p.
16903         (iterative_hash_hashable_expr): Handle calls to internal functions.
16904         (print_expr_hash_elt): Likewise.
16905         * tree-ssa-pre.c (can_value_number_call): Likewise.
16906         (eliminate): Handle null functions.
16907         * tree-ssa-sccvn.c (visit_use): Handle calls to internal functions.
16908         * tree-ssa-structalias.c (get_fi_for_callee): Likewise.
16909         (find_func_aliases): Likewise.
16910         * value-prof.c (gimple_ic_transform): Likewise.
16911         (gimple_indirect_call_to_profile): Likewise.
16912         * lto-streamer-in.c (input_gimple_stmt): Likewise.
16913         * lto-streamer-out.c (output_gimple_stmt): Likewise.
16914
16915 2011-04-19  Jan Hubicka  <jh@suse.cz>
16916
16917         * ipa-inline-transform.c (save_inline_function_body): Add comments.
16918         * ipa-inline.c (inline_small_functions): Compute summaries first,
16919         populate heap later.
16920
16921 2011-04-19  Jan Hubicka  <jh@suse.cz>
16922
16923         * cgraph.h (save_inline_function_body): Remove.
16924         * ipa-inline-transform.c: New file, broke out of...
16925         * ipa-inline.c: ... this one; Update toplevel comment.
16926         (ncalls_inlined, nfunctions_inlined): Move to ipa-inline-transform.c;
16927         make global.
16928         (update_noncloned_frequencies): Move to ipa-inline-transform.c
16929         (cgraph_mark_inline_edge): Rename to inline_call; move to
16930         ipa-inline-transform.c.
16931         (cgraph_clone_inlined_nodes): Rename to clone_inlined_nodes;
16932         move to ipa-inline-transform.c
16933         (recursive_inlining, inline_small_functions, flatten_function,
16934         ipa_inline, inline_always_inline_functions,
16935         early_inline_small_functions): Update.
16936         (inline_transform): Move to ipa-inline-transform.c.
16937         * ipa-inline.h (inline_call, inline_transform, clone_inlined_nodes):
16938         Declare.
16939         * Makefile.in (ipa-inline-transform.o): New file.
16940         * cgraphunit.c (save_inline_function_body): Move to
16941         ipa-inline-transform.c
16942
16943 2011-04-19  DJ Delorie  <dj@redhat.com>
16944
16945         * config/m32c/m32c.c (m32c_emit_epilogue): Don't try to push
16946         registers if we already know there aren't any.
16947         (m32c_emit_epilogue): Don't emit a barrier here.
16948         (m32c_emit_eh_epilogue): Likewise.
16949         * config/m32c/blkmov.md (movstr): Don't fail on wrong-type
16950         operands at expand time.
16951         * config/m32c/m32c.h (WCHAR_TYPE_SIZE): Change to 4 to match "long
16952         int" wchar type.
16953         (REG_CLASS_CONTENTS, reg_class, REG_CLASS_NAMES): Remove
16954         duplicates.  Provide aliases instead.
16955         * config/m32c/prologue.md (eh_return): Emit a barrier here.
16956         (eh_epilogue): Add a "(return)" here as a hint to other parts of
16957         the compiler.
16958
16959 2011-04-19  Anatoly Sokolov  <aesok@post.ru>
16960
16961         * config/sparc/sparc.h (GENERAL_OR_I64, REGISTER_MOVE_COST): Remove.
16962         * config/sparc/sparc.c (TARGET_REGISTER_MOVE_COST): Define.
16963         (general_or_i64_p, sparc_register_move_cost): New function.
16964
16965 2011-04-19  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
16966
16967         * doc/install.texi (Configuration, --enable-threads): Remove mach.
16968         Add lynx, mipssde.  Sort table.
16969
16970 2011-04-19  Xinliang David Li  <davidxl@google.com>
16971
16972         * ipa-cp.c (ipcp_update_profiling): Assert that scale_completement is
16973         not negative.
16974
16975 2011-04-19  Jakub Jelinek  <jakub@redhat.com>
16976
16977         PR target/48678
16978         * config/i386/i386.md (movstrict<mode>): FAIL if operands[0]
16979         is a SUBREG with non-MODE_INT mode inside of it.
16980
16981 2011-04-19  Martin Jambor  <mjambor@suse.cz>
16982
16983         * ipa-cp.c (ipcp_process_devirtualization_opportunities): Devirtualize
16984         also according to actual contants.
16985         * gimple-fold.c (gimple_extract_devirt_binfo_from_cst): New function.
16986         (gimple_fold_call): Use it.
16987         * gimple.h (gimple_extract_devirt_binfo_from_cst): Declare.
16988
16989 2011-04-19  Martin Jambor  <mjambor@suse.cz>
16990
16991         * ipa-prop.c (stmt_may_be_vtbl_ptr_store): Return false for scalar
16992         non-pointer assignments.
16993
16994 2011-04-19  Martin Jambor  <mjambor@suse.cz>
16995
16996         * ipa-cp.c (ipcp_process_devirtualization_opportunities): Take into
16997         account anc_offset and otr_type from the indirect edge info.
16998         * ipa-prop.c (get_ancestor_addr_info): New function.
16999         (compute_complex_ancestor_jump_func): Assignment analysis moved to
17000         get_ancestor_addr_info, call it.
17001         (ipa_note_param_call): Do not initialize information about polymorphic
17002         calls, return the indirect call graph edge.  Remove the last
17003         parameter, adjust all callers.
17004         (ipa_analyze_virtual_call_uses): Process also calls to ancestors of
17005         parameters.  Initialize polymorphic information in the indirect edge.
17006
17007 2011-04-19  Eric Botcazou  <ebotcazou@adacore.com>
17008
17009         PR lto/48148
17010         * gimple.c (gimple_types_compatible_p_1) <ENUMERAL_TYPE>: Do not merge
17011         the types if they have different enumeration identifiers.
17012
17013 2011-04-19  Jan Hubicka  <jh@suse.cz>
17014
17015         * cgraph.h (cgraph_optimize_for_size_p): Declare.
17016         * ipa-cp.c (ipcp_insert_stage): Use cgraph_optimize_for_size_p.
17017         * predict.c (cgraph_optimize_for_size_p): Break out from ...
17018         (optimize_function_for_size_p) ... here.
17019
17020 2011-04-19  Richard Guenther  <rguenther@suse.de>
17021
17022         PR lto/48207
17023         * tree.c (free_lang_data): Do not reset the decl-assembler-name
17024         langhook.
17025
17026 2011-04-19  Eric Botcazou  <ebotcazou@adacore.com>
17027
17028         * tree-inline.c (expand_call_inline): Do not issue a -Winline warning
17029         if DECL_NO_INLINE_WARNING_P is set on the function.
17030
17031 2011-04-19  Bernd Schmidt  <bernds@codesourcery.com>
17032
17033         PR fortran/47976
17034         * reload1.c (inc_for_reload): Return void. All callers changed.
17035         (emit_input_reload_insns): Don't try to delete previous output
17036         reloads to a register, or record spill_reg_store for autoincs.
17037
17038 2011-04-19  Basile Starynkevitch  <basile@starynkevitch.net>
17039
17040         * gengtype.h: Updated copyright year.
17041         (struct input_file_st): Add inpisplugin field.
17042         (type_fileloc): New function.
17043         * gengtype.c
17044         (write_typed_struct_alloc_def): Add gcc_assert.
17045         (write_typed_alloc_defns): Ditto. Don't output for plugin files.
17046         (write_typed_alloc_defns): Don't output for plugin files.
17047         (input_file_by_name): Clear inpisplugin field.
17048         (main): Set inpisplugin field for plugin files.
17049
17050 2011-04-19  Nicola Pero  <nicola.pero@meta-innovation.com>
17051
17052         * gengtype-state.c (string_eq): New.
17053         (read_state): Use string_eq instead of strcmp when creating the
17054         state_ident_tab.
17055
17056 2011-04-19  Wei Guozhi  <carrot@google.com>
17057
17058         PR target/47855
17059         * config/arm/arm-protos.h (thumb1_legitimate_address_p): New prototype.
17060         * config/arm/arm.c (thumb1_legitimate_address_p): Remove the static
17061         linkage.
17062         * config/arm/constraints.md (Uu): New constraint.
17063         * config/arm/arm.md (*arm_movqi_insn): Compute attr "length".
17064
17065 2011-04-19  Tristan Gingold  <gingold@adacore.com>
17066
17067         * config.gcc (-*-*-*vms): Added.
17068         (alpha64-dec-*vms*,alpha*-dec-*vms*, ia64-hp-*vms*): Common
17069         definitions moved.
17070         * config/vms/vms-ld.c: New file.
17071         * config/vms/vms-ar.c: New file.
17072         * config/vms/t-vmsnative: New file.
17073
17074 2011-04-18  Xinliang David Li  <davidxl@google.com>
17075
17076         * final.c (dump_basic_block_info): Use ASM_COMMENT_START.
17077
17078 2011-04-18  Jakub Jelinek  <jakub@redhat.com>
17079
17080         PR middle-end/48661
17081         * gimple-fold.c (gimple_get_virt_method_for_binfo): Return NULL
17082         if TREE_TYPE (v) is non-NULL.
17083
17084         * gimple-fold.c (gimple_get_virt_method_for_binfo): Renamed from
17085         gimple_get_virt_mehtod_for_binfo.
17086         * gimple.h (gimple_get_virt_method_for_binfo): Likewise.
17087         * ipa-cp.c (ipcp_process_devirtualization_opportunities): Adjust
17088         callers.
17089         * ipa-prop.c (try_make_edge_direct_virtual_call): Likewise.
17090
17091 2011-04-18  Michael Matz  <matz@suse.de>
17092             Steve Ellcey  <sje@cup.hp.com>
17093
17094         * expr.c (expand_expr_real_2) <CASE_CONVERT>: If OP0 is a constant,
17095         use its mode as source mode if it isn't VOIDmode.
17096
17097 2011-04-18  Dennis, CHENG Renquan  <crquan@fedoraproject.org>
17098
17099         * doc/passes.texi: Fill crossref nodes.
17100
17101 2011-04-18  Jim Meyering  <meyering@redhat.com>
17102
17103         Fix doubled-word typos in comments and strings
17104         * config/alpha/vms-unwind.h: s/for for/for/
17105         * config/arm/unwind-arm.h: Likewise.
17106         * config/microblaze/microblaze.c: Likewise.
17107         * config/sh/constraints.md: s/in in/in/
17108         * tree-cfg.c (verify_types_in_gimple_reference): Likewise.
17109
17110 2011-04-18  Uros Bizjak  <ubizjak@gmail.com>
17111
17112         * config/i386/i386.h (SSE_VEC_FLOAT_MODE_P): Remove.
17113         (AVX_FLOAT_MODE_P): Ditto.
17114         (AVX128_VEC_FLOAT_MODE_P): Ditto.
17115         (AVX256_VEC_FLOAT_MODE_P): Ditto.
17116         (AVX_VEC_FLOAT_MODE_P): Ditto.
17117         * config/i386/i386.md (UNSPEC_MASKLOAD): Remove.
17118         (UNSPEC_MASKSTORE): Ditto.
17119         * config/i386/sse.md (<sse>_movmsk<ssemodesuffix><avxmodesuffix>):
17120         Merge from <sse>_movmsk<ssemodesuffix> and
17121         avx_movmsk<ssemodesuffix>256.  Use VF mode iterator.
17122         (*sse2_maskmovdqu): Merge with *sse2_maskmovdqu_rex64.  Use P mode
17123         iterator.
17124         (avx_maskload<ssemodesuffix><avxmodesuffix>): New expander.
17125         (avx_maskstore<ssemodesuffix><avxmodesuffix>): Ditto.
17126         (*avx_maskmov<ssemodesuffix><avxmodesuffix>): New insn.
17127
17128 2011-04-18  Jan Hubicka  <jh@suse.cz>
17129
17130         * ipa-inline.c (inline_small_functions): Fix pasto in previous patch.
17131
17132         * ipa-inline.c: Fix comment typos; do not inline gt-ipa-inline.h
17133         (want_inline_function_called_once_p): Break out the logic from
17134         ipa_inline.
17135         (edge_badness): Ensure that profile is not misupdated.
17136         (lookup_recursive_calls): Prioritize by call frequencies.
17137         (inline_small_functions): Move program size estimates here;
17138         actually process whole queue even when unit growth has been
17139         met. (to properly compute inline_failed reasons and for the
17140         case unit size decrease.) Revisit comments on recursive inlining.
17141         (ipa_inline): Remove unit summary code; first inline hot calls
17142         of functions called once, cold calls next.
17143         (order, nnodes): Remove unused variables.
17144         * Makefile.in (ipa-inline.o): No longer depent on ggc files.
17145         (GTFILES): Remove ipa-inline.c
17146         * sel-sched.c (fill_insns): Silence uninitialized var warning.
17147
17148 2011-04-18  Eric Botcazou  <ebotcazou@adacore.com>
17149
17150         * dwarf2out.c (is_redundant_typedef): Add 'inline' to prototype.
17151
17152 2011-04-18  Jie Zhang  <jie@codesourcery.com>
17153             Richard Earnshaw  <rearnsha@arm.com>
17154
17155         * arm.c (neon_builtin_type_bits): Remove.
17156         (typedef enum neon_builtin_mode): New.
17157         (T_MAX): Don't define.
17158         (typedef enum neon_builtin_datum): Remove bits, codes[],
17159         num_vars and base_fcode.  Add mode, code and fcode.
17160         (VAR1, VAR2, VAR3, VAR4, VAR5, VAR6, VAR7, VAR8, VAR9
17161         VAR10): Change accordingly.
17162         (neon_builtin_data[]): Change accordingly
17163         (arm_init_neon_builtins): Change accordingly.
17164         (neon_builtin_compare): Remove.
17165         (locate_neon_builtin_icode): Remove.
17166         (arm_expand_neon_builtin): Change accordingly.
17167
17168         * arm.h (enum arm_builtins): Move to ...
17169         * arm.c (enum arm_builtins): ... here; and rearrange builtin code.
17170
17171         * arm.c (arm_builtin_decl): Declare.
17172         (TARGET_BUILTIN_DECL): Define.
17173         (enum arm_builtins): Correct ARM_BUILTIN_MAX.
17174         (arm_builtin_decls[]): New.
17175         (arm_init_neon_builtins): Store builtin declarations in
17176         arm_builtin_decls[].
17177         (arm_init_tls_builtins): Likewise.
17178         (arm_init_iwmmxt_builtins): Likewise.  Refactor initialization code.
17179         (arm_builtin_decl): New.
17180
17181 2011-04-18  Richard Guenther  <rguenther@suse.de>
17182
17183         * tree.c (upper_bound_in_type): Build properly canonicalized
17184         INTEGER_CSTs.
17185         (lower_bound_in_type): Likewise.
17186
17187 2011-04-18  Richard Guenther  <rguenther@suse.de>
17188
17189         * gimple.h (gimple_call_addr_fndecl): New function.
17190         (gimple_call_fndecl): Use it.
17191         * gimple-fold.c (gimple_fold_call): Fold away OBJ_TYPE_REFs
17192         for direct calls.
17193         * tree-ssa-ccp.c (ccp_fold_stmt): Remove OBJ_TYPE_REF folding.
17194         * tree-ssa-pre.c (eliminate): Also simplify indirect OBJ_TYPE_REFs.
17195
17196 2011-04-18  Richard Guenther  <rguenther@suse.de>
17197
17198         PR middle-end/48650
17199         * tree.c (build_string): STRING_CST is now derived from tree_typed.
17200
17201 2011-04-18  Eric Botcazou  <ebotcazou@adacore.com>
17202
17203         PR lto/48492
17204         * cfgexpand.c (expand_debug_expr) <VAR_DECL>: Return NULL for a
17205         DECL_IN_CONSTANT_POOL without RTL.
17206
17207 2011-04-18  Ulrich Weigand  <ulrich.weigand@linaro.org>
17208             Ira Rosen  <ira.rosen@linaro.org>
17209
17210         PR target/48252
17211         * config/arm/arm.c (neon_emit_pair_result_insn): Swap arguments
17212         to match neon_vzip/vuzp/vtrn_internal.
17213         * config/arm/neon.md (neon_vtrn<mode>_internal): Make both
17214         outputs explicitly dependent on both inputs.
17215         (neon_vzip<mode>_internal, neon_vuzp<mode>_internal): Likewise.
17216
17217 2011-04-18  Jakub Jelinek  <jakub@redhat.com>
17218
17219         PR tree-optimization/48616
17220         * tree-vect-stmts.c (vectorizable_shift): If SLP, determine
17221         whether the shift is by scalar or vector based on whether all SLP
17222         scalar stmts have the same rhs.
17223
17224 2011-04-17  Chung-Lin Tang  <cltang@codesourcery.com>
17225
17226         * config/arm/arm.c (neon_struct_mem_operand): Support POST_INC/PRE_DEC
17227         memory operands.
17228
17229 2011-04-17  Richard Sandiford  <rdsandiford@googlemail.com>
17230
17231         PR target/43700
17232         * config/mips/mips.c (mips_cfun_call_saved_reg_p): Handle global
17233         registers.
17234
17235 2011-04-17  Jan Hubicka  <jh@suse.cz>
17236
17237         * cgrpah.h (struct cgraph_node): Remove finalized_by_frontend.
17238         * cgrpahunit.c (cgraph_finalize_function): Do not set
17239         finalized_by_frontend.
17240         * lto-cgraph.c (lto_output_node, input_overwrite_node): Do not stream
17241         finalized_by_frontend.
17242
17243 2011-04-17  Jan Hubicka  <jh@suse.cz>
17244
17245         * cgraph.c (cgraph_clone_node): Do not handle vtable_method
17246         * cgraph.h (struct cgraph_local_info): Drop vtable_method.
17247         * cgraphunit.c (cgraph_copy_node_for_versioning): Drop vtable_method.
17248         * lto-cgraph.c (lto_output_node, input_overwrite_node): Drop vtable
17249         method.
17250         * gimple-fold.c (can_refer_decl_in_current_unit_p): Mention PR20991 in
17251         gimple-fold.c
17252         * varasm.c (mark_decl_referenced): Drop vtable_method handling code.
17253
17254 2011-04-17  Eric Botcazou  <ebotcazou@adacore.com>
17255
17256         PR lto/48538
17257         * lto-cgraph.c (merge_profile_summaries): Check that lto_file_data
17258         is non-null before accessing it.
17259         (input_cgraph): Remove trailing spaces.
17260
17261 2011-04-17  Revital Eres  <revital.eres@linaro.org>
17262
17263         * params.def (sms-min-sc): New param flag.
17264         * modulo-sched.c (sms_schedule): Use it.
17265         * doc/invoke.texi (sms-min-sc): Document it.
17266
17267 2011-04-17  Jan Hubicka  <jh@suse.cz>
17268
17269         * lto-symtab.c (lto_cgraph_replace_node): When call statement is
17270         present, also set gimple_call_set_cannot_inline.
17271         * ipa-inline.c: Update toplevel comment.
17272         (MAX_TIME): Remove.
17273         (cgraph_clone_inlined_nodes): Fix linebreaks.
17274         (cgraph_check_inline_limits): Restructure to ...
17275         (caller_growth_limits): ... this one; be more tolerant
17276         on growth in nested inline chains; add explanatory comment;
17277         fix stack accounting thinko introduced by previous patch.
17278         (cgraph_default_inline_p): Remove.
17279         (report_inline_failed_reason): New function.
17280         (can_inline_edge_p): New function.
17281         (can_early_inline_edge_p): New function.
17282         (leaf_node_p): Move upwards in file.
17283         (want_early_inline_function_p): New function.
17284         (want_inline_small_function_p): New function.
17285         (want_inline_self_recursive_call_p): New function.
17286         (cgraph_edge_badness): Rename to ...
17287         (edge_badness) ... this one; fix linebreaks.
17288         (update_edge_key): Update call of edge_baddness; add
17289         detailed dump about queue updates.
17290         (update_caller_keys): Use can_inline_edge_p and
17291         want_inline_small_function_p.
17292         (cgraph_decide_recursive_inlining): Rename to...
17293         (recursive_inlining): Use can_inline_edge_p and
17294         want_inline_self_recursive_call_p; simplify and remove no longer
17295         valid FIXME.
17296         (cgraph_set_inline_failed): Remove.
17297         (add_new_edges_to_heap): Use can_inline_edge_p and
17298         want_inline_small_function_p.
17299         (cgraph_decide_inlining_of_small_functions): Rename to ...
17300         (inline_small_functions): ... this one; cleanup; use
17301         can/want predicates; cleanup debug ouput; work edges till fibheap
17302         is exhausted and do not stop once unit growth is reached; remove
17303         later loop processing remaining edges.
17304         (cgraph_flatten): Rename to ...
17305         (flatten_function): ... this one; use can_inline_edge_p
17306         and can_early_inline_edge_p predicates.
17307         (cgraph_decide_inlining): Rename to ...
17308         (ipa_inline): ... this one; remove unreachable nodes before
17309         inlining functions called once; simplify the pass.
17310         (cgraph_perform_always_inlining): Rename to ...
17311         (inline_always_inline_functions): ... this one; use
17312         DECL_DISREGARD_INLINE_LIMITS; use can_inline_edge_p predicate.
17313         (cgraph_decide_inlining_incrementally): Rename to ...
17314         (early_inline_small_functions): ... this one; simplify
17315         using new predicates; cleanup; make dumps prettier.
17316         (cgraph_early_inlining): Rename to ...
17317         (early_inliner): newer inline regular functions into always-inlines;
17318         fix updating of call stmt summaries.
17319         (pass_early_inline): Update for new names.
17320         (inline_transform): Fix formating.
17321         (gate_cgraph_decide_inlining): Rename to ...
17322         (pass_ipa_inline): ... this one.
17323         * ipa-inline.h (inline_summary): Remove disregard_inline_limits.
17324         * ipa-inline-analysis.c (dump_inline_summary): Update.
17325         (compute_inline_parameters): Do not compute disregard_inline_limits;
17326         look for mismatching arguments.
17327         (estimate_growth): Fix handlig of non-trivial self recursion.
17328         (inline_read_summary): Do not read info->disregard_inline_limits.
17329         (inline_write_summary): Do not write info->disregard_inline_limits.
17330         * tree-inline.c (inline_forbidden_into_p, tree_can_inline_p): Remove
17331         and move all checks into can_inline_edge_p predicate; re-enable code
17332         comparing optimization levels.
17333         (expand_call_inline): Do not test inline_forbidden_into_p.
17334         * Makefile.in (ipa-inline.o): Update arguments.
17335
17336 2011-04-17  Revital Eres  <revital.eres@linaro.org>
17337
17338         * ddg.c (free_ddg_all_sccs): Free sccs field in struct ddg_all_sccs.
17339
17340 2011-04-17  Revital Eres  <revital.eres@linaro.org>
17341
17342         * modulo-sched.c (sms_schedule): Avoid unfreed memory when SMS fails.
17343
17344 2011-04-17  Michael Matz  <matz@suse.de>
17345
17346         PR tree-optimization/48622
17347         PR lto/48645
17348         * ipa-inline-analysis.c (inline_read_summary): Read size/time
17349         in same order as they're written.
17350
17351 2011-04-16  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
17352
17353         * config/pa/predicates.md: Reorganize and simplify predicates.
17354         Eliminate duplicate code checks.
17355         (arith_operand): Rename to arith14_operand
17356         (reg_or_ior_operand): Rename to reg_or_cint_ior_operand.
17357         * config/pa/pa.md: Use renamed operands.
17358         * config/pa/pa-protos.h (symbolic_operand): Delete declaration.
17359         (tls_symbolic_operand, function_label_operand, lhs_lshift_cint_operand,
17360         arith11_operand, adddi3_operand, indexed_memory_operand,
17361         symbolic_memory_operand, int11_operand, reg_or_cint_move_operand,
17362         arith5_operand, uint5_operand, pic_label_operand, plus_xor_ior_operator,
17363         borx_reg_operand, shadd_operand, arith_operand, read_only_operand,
17364         move_dest_operand, move_src_operand, prefetch_cc_operand,
17365         prefetch_nocc_operand, and_operand, ior_operand, arith32_operand,
17366         uint32_operand, reg_before_reload_operand, reg_or_0_operand,
17367         reg_or_0_or_nonsymb_mem_operand, pre_cint_operand, post_cint_operand,
17368         div_operand, int5_operand, movb_comparison_operator,
17369         ireg_or_int5_operand, call_operand_address, ior_operand, fp_reg_operand,
17370         arith_double_operand, ireg_operand, lhs_lshift_operand,
17371         pc_or_label_operand, non_hard_reg_operand, eq_neq_comparison_operator,
17372         integer_store_memory_operand): Likewise.
17373         * config/pa/pa.c (adddi3_operand): Move to predicates.md.
17374         (integer_store_memory_operand, read_only_operand,
17375         function_label_operand, borx_reg_operand,
17376         non_hard_reg_operand): Likewise.
17377         (eq_neq_comparison_operator): Delete unused operator.
17378         (legitimize_pic_address): Use VOIDmode for mode argument in calls to
17379         function_label_operand.
17380         (emit_move_sequence): Likewise.
17381
17382 2011-04-16  Uros Bizjak  <ubizjak@gmail.com>
17383
17384         * config/i386/sse.md (sseunpackmode): New mode attribute.
17385         (ssepackmode): Ditto.
17386         (vec_pack_trunc_<mode>): Macroize expander from
17387         vec_pack_trunc_{v8hi,v4si,v2di} using VI248_128 mode iterator.
17388         (vec_unpacks_lo_<mode>): Macroize expander from
17389         vec_unpacks_lo_{v16qi,v8hi,v4si} using VI124_128 mode iterator.
17390         (vec_unpacks_hi_<mode>): Macroize expander from
17391         vec_unpacks_hi_{v16qi,v8hi,v4si} using VI124_128 mode iterator.
17392         (vec_unpacku_lo_<mode>): Macroize expander from
17393         vec_unpacku_lo_{v16qi,v8hi,v4si} using VI124_128 mode iterator.
17394         (vec_unpacku_hi_<mode>): Macroize expander from
17395         vec_unpacks_hi_{v16qi,v8hi,v4si} using VI124_128 mode iterator.
17396         * config/i386/i386.c (ix86_expand_sse_unpack): Merge with
17397         ix86_expand_sse4_unpack.
17398         * config/i386/i386-protos.h (ix86_expand_sse4_unpack): Remove.
17399
17400 2011-04-16  Jan Hubicka  <jh@suse.cz>
17401
17402         * cgraphbuild.c: Include ipa-inline.h.
17403         (reset_inline_failed): Use initialize_inline_failed.
17404         * cgraph.c: Include ipa-inline.h.
17405         (cgraph_create_node_1): Do not initialize estimated_growth.
17406         (initialize_inline_failed): More to ipa-inline-analysis.c
17407         (dump_cgraph_node): Do not dump inline flags.
17408         * cgraph.h (cgraph_local_info): Remove inlineable, versionable
17409         and disregard_inline_limits flags.
17410         (cgrpah_global_info): Remove estimated_stack_size, stack_frame_offset,
17411         time, size, estimated_growth.
17412         * ipa-cp.c (ipcp_versionable_function_p, ipcp_generate_summary):
17413         Update.
17414         * cgraphunit.c (cgraph_decide_is_function_needed): Use
17415         DECL_DISREGARD_INLINE_LIMITS.
17416         (cgraph_analyze_function): Do not initialize
17417         node->local.disregard_inline_limits.
17418         * lto-cgraph.c (lto_output_node, input_overwrite_node): Do not stream
17419         inlinable, versionable and disregard_inline_limits.
17420         * ipa-inline.c (cgraph_clone_inlined_nodes, cgraph_mark_inline_edge,
17421         cgraph_check_inline_limits, cgraph_default_inline_p,
17422         cgraph_edge_badness, update_caller_keys, update_callee_keys,
17423         add_new_edges_to_heap): Update.
17424         (cgraph_decide_inlining_of_small_function): Update; set
17425         CIF_FUNCTION_NOT_INLINABLE for uninlinable functions.
17426         (cgraph_decide_inlining, cgraph_edge_early_inlinable_p,
17427         cgraph_decide_inlining_incrementally): Update.
17428         * ipa-inline.h (inline_summary): Add inlinable, versionable,
17429         disregard_inline_limits, estimated_stack_size, stack_frame_offset,
17430         time, size and estimated_growth parameters.
17431         (estimate_edge_growth): Update.
17432         (initialize_inline_failed): Declare.
17433         * ipa-split.c: Include ipa-inline.h
17434         (execute_split_functions): Update.
17435         * ipa.c (cgraph_postorder): Use DECL_DISREGARD_INLINE_LIMITS.
17436         (cgraph_remove_unreachable_nodes): Do not clear inlinable flag.
17437         (record_cdtor_fn): Use DECL_DISREGARD_INLINE_LIMITS.
17438         * ipa-inline-analysis.c (inline_node_removal_hook): Update; set
17439         estimated_growth to INT_MIN.
17440         (inline_node_duplication_hook): Likewise.
17441         (dump_inline_summary): Dump new fields.
17442         (compute_inline_parameters): Update.
17443         (estimate_edge_time, estimate_time_after_inlining,
17444         estimate_size_after_inlining, estimate_growth, inline_read_summary,
17445         inline_write_summary):
17446         (initialize_inline_failed): Move here from cgraph.c.
17447         * tree-sra.c: Include ipa-inline.h.
17448         (ipa_sra_preliminary_function_checks): Update.
17449         * Makefile.in (cgraph.o, cgraphbuild.o): Add dependency on
17450         ipa-inline.h.
17451
17452 2011-04-16  Uros Bizjak  <ubizjak@gmail.com>
17453
17454         * config/i386/sse.md (V16): New mode iterator.
17455         (VI1, VI8): Ditto.
17456         (AVXMODEQI, AVXMODEDI): Remove.
17457         (sse2, sse3): New mode attribute.
17458         (mov<mode>): Use V16 mode iterator.
17459         (*mov<mode>_internal): Merge with *avx_mov<mode>_internal.
17460         (push<mode>1): Use V16 mode iterator.
17461         (movmisalign<mode>): Ditto.
17462         (<sse>_movu<ssemodesuffix><avxmodesuffix>): Merge from
17463         <sse>_movu<ssemodesuffix> and avx_movu<ssemodesuffix><avxmodesuffix>.
17464         (*<sse>_movu<ssemodesuffix><avxmodesuffix>): Merge from
17465         *<sse>_movu<ssemodesuffix> and *avx_movu<ssemodesuffix><avxmodesuffix>.
17466         (<sse2>_movdqu<avxmodesuffix>): Merge from sse2_movdqu and
17467         avx_movdqu<avxmodesuffix>.
17468         (*<sse2>_movdqu<avxmodesuffix>): Merge from *sse2_movdqu and
17469         *avx_movdqu<avxmodesuffix>.
17470         (<sse3>_lddqu<avxmodesuffix>) Merge from sse3_lddqu and
17471         avx_lddqu<avxmodesuffix>.
17472         (<sse>_movnt<mode>): Merge with avx_movnt<AVXMODEF2P:mode>.
17473         (<sse2>_movnt<mode>): Merge from sse2_movntv2di and
17474         avx_movnt<AVXMODEDI:mode>.
17475         * config/i386/i386.c (ix86_expand_vector_move_misalign): Update for
17476         renamed sse_movups, sse2_movupd and sse2_movdqu patterns.
17477
17478 2011-04-16  Bernd Schmidt  <bernds@codesourcery.com>
17479
17480         PR target/48629
17481         * haifa-sched.c (prune_ready_list, schedule_block): Use
17482         sched_pressure_p rather than flag_sched_pressure.
17483
17484 2011-04-15  Pat Haugen  <pthaugen@us.ibm.com>
17485
17486         * config/rs6000/rs6000.c (call_ABI_of_interest): Call
17487         cgraph_get_node instead of cgraph_get_create_node.
17488
17489 2011-04-15  Jakub Jelinek  <jakub@redhat.com>
17490
17491         * cfgexpand.c (expand_debug_expr): Use
17492         simplify_gen_{unary,binary,ternary} instead of gen_rtx_*.
17493
17494 2011-04-15  Michael Matz  <matz@suse.de>
17495
17496         * tree.h (ALLOCA_FOR_VAR_P): Rename to CALL_ALLOCA_FOR_VAR_P.
17497         * builtins.c (expand_builtin): Use CALL_ALLOCA_FOR_VAR_P.
17498         * function.c (gimplify_parameters): Ditto.
17499         * gimplify.c (gimplify_vla_decl): Ditto.
17500
17501         * gimple.h (enum gf_mask): Add GF_CALL_ALLOCA_FOR_VAR.
17502         (gimple_call_set_alloca_for_var): New inline function.
17503         (gimple_call_alloca_for_var_p): Ditto.
17504         * gimple.c (gimple_build_call_from_tree): Remember
17505         CALL_ALLOCA_FOR_VAR_P state.
17506         * cfgexpand.c (expand_call_stmt): Restore CALL_ALLOCA_FOR_VAR_P state.
17507
17508         * tree-inline.c (inline_forbidden_p_stmt): Don't reject alloca
17509         calls if they were for VLA objects.
17510
17511 2011-04-15  Martin Jambor  <mjambor@suse.cz>
17512
17513         * ipa-prop.c (ipa_analyze_virtual_call_uses): Remove handling
17514         of ADR_EXPRs.
17515
17516 2011-04-15  Martin Jambor  <mjambor@suse.cz>
17517
17518         PR middle-end/48601
17519         * tree-emutls.c (lower_emutls_function_body): Call
17520         cgraph_get_create_node instead of cgraph_get_node.  Do not assert the
17521         result is non-NULL.
17522
17523 2011-04-15  Nicola Pero  <nicola.pero@meta-innovation.com>
17524
17525         * c-decl.c (detect_field_duplicates): Call
17526         objc_detect_field_duplicates instead of objc_get_interface_ivars.
17527
17528 2011-04-15  Nathan Froyd  <froydnj@codesourcery.com>
17529
17530         * gimple.h (gimple_asm_clobbers_memory_p): Declare.
17531         * gimple.c (gimple_asm_clobbers_memory_p): Define.
17532         * ipa-pure-const.c (check_stmt): Call it.
17533         * tree-ssa-operands.c (get_asm_expr_operands): Likewise.
17534
17535 2011-04-15  Richard Guenther  <rguenther@suse.de>
17536
17537         PR tree-optimization/48290
17538         * tree-ssa-copy.c (copy_prop_visit_phi_node): Propagate constants.
17539         Properly decide inhibiting propagation based on the valueized
17540         operand.  Do loop-closed SSA form preserving here ...
17541         (init_copy_prop): ... not here.
17542
17543 2011-04-15  H.J. Lu  <hongjiu.lu@intel.com>
17544
17545         PR target/48612
17546         * config/i386/sse.md (*ieee_smin<mode>3): Switch mnemonics.
17547         (*ieee_smax<mode>3): Likewise.
17548
17549 2011-04-15  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
17550
17551         * config/s390/s390.md (popcountdi2, popcountsi2, popcounthi2):
17552         Replace match_operand with match_dup for the third operand in
17553         these expanders.
17554
17555 2011-04-15  Maxim Kuvyrkov  <maxim@codesourcery.com>
17556
17557         * combine.c (subst, combine_simlify_rtx): Add new argument, use it
17558         to track processing of conditionals.  Update all callers.
17559         (try_combine, simplify_if_then_else): Update.
17560
17561 2011-04-15  Maxim Kuvyrkov  <maxim@codesourcery.com>
17562
17563         * config/m68k/m68k.c (m68k_sched_variable_issue): Handle
17564         -fsched-pressure.
17565
17566 2011-04-15  Georg-Johann Lay  <avr@gjlay.de>
17567
17568         * config/avr/avr.md ("rotl<mode>3",mode=HIDI): Use match_dup
17569         instead of match_operand for operand 3.
17570
17571 2011-04-15  Richard Sandiford  <richard.sandiford@linaro.org>
17572
17573         * recog.h (insn_operand_data): Add an "allows_mem" field.
17574         * genoutput.c (output_operand_data): Initialize it.
17575         * optabs.c (maybe_legitimize_operand_same_code): New function.
17576         (maybe_legitimize_operand): Use it when matching the original
17577         op->value.
17578
17579 2011-04-15  Eric Botcazou  <ebotcazou@adacore.com>
17580
17581         * gimplify.c: Fix issues in comments throughout.
17582         (voidify_wrapper_expr): Fix long line.
17583         (build_stack_save_restore): Likewise.
17584         (gimplify_loop_expr): Likewise.
17585         (gimplify_compound_lval): Likewise.
17586         (gimplify_init_ctor_eval): Likewise.
17587         (gimplify_modify_expr_rhs): Likewise.
17588         (omp_notice_threadprivate_variable): Likewise.
17589
17590 2011-04-15  Eric Botcazou  <ebotcazou@adacore.com>
17591
17592         * cfgexpand.c (expand_call_stmt): Convert the function type to the
17593         original one if this is not a builtin function.
17594
17595 2011-04-14  Jakub Jelinek  <jakub@redhat.com>
17596
17597         PR target/48605
17598         * config/i386/sse.md (sse4_1_insertps): If operands[2] is a MEM,
17599         offset it as needed based on top 2 bits in operands[3], change
17600         MEM mode to SFmode and mask those 2 bits away from operands[3].
17601
17602 2011-04-14  Nicola Pero  <nicola.pero@meta-innovation.com>
17603
17604         * c-parser.c (c_parser_objc_protocol_definition): Updated for
17605         change from objc_declare_protocols() to objc_declare_protocol().
17606
17607 2011-04-14  Uros Bizjak  <ubizjak@gmail.com>
17608
17609         * config/i386/sse.md (sse4_1): New mode attribute.
17610         (<sse4_1>_blend<ssemodesuffix><avxmodesuffix>): Macroize from
17611         avx_blend<ssemodesuffix><avxmodesuffix> and
17612         sse4_1_blend<ssemodesuffix> using VF mode iterator.
17613         (<sse4_1>_blendv<ssemodesuffix><avxmodesuffix>): Macroize from
17614         avx_blendv<ssemodesuffix><avxmodesuffix> and
17615         sse4_1_blendv<ssemodesuffix> using VF mode iterator.
17616         (<sse4_1>_dp<ssemodesuffix><avxmodesuffix>): Macroize from
17617         avx_dp<ssemodesuffix><avxmodesuffix> and
17618         sse4_1_dp<ssemodesuffix> using VF mode iterator.
17619         (sse4_1_mpsadbw): Merge with *avx_mpsadbw.
17620         (sse4_1_packusdw): Merge with *avx_packusdw.
17621         (sse4_1_pblendvb): Merge with *avx_pblendvb.
17622         (sse4_1_pblendw): Merge with *avx_pblendw.
17623         (avx_vtest<ssemodesuffix><avxmodesuffix>): Use VF mode iterator.
17624         (<sse4_1>_round<ssemodesuffix><avxmodesuffix>): Macroize from
17625         avx_round<ssemodesuffix>256 and sse4_1_round<ssemodesuffix> using
17626         VF mode iterator.
17627         (sse4_1_round<ssescalarmodesuffix>): Merge with
17628         *avx_round<ssescalarmodesuffix>.
17629         (aesenc): Merge with *avx_aesenc.
17630         (aesenclast): Merge with *avx_aesenclast.
17631         (aesdec): Merge with *avx_aesdec.
17632         (aesdeclast): Merge with *avx_aesdeclast.
17633         (pclmulqdq): Merge with *pclmulqdq.
17634         * config/i386/predicates.md (reg_not_xmm0_operand_maybe_avx):
17635         New predicate.
17636         (nonimm_not_xmm0_operand_maybe_avx): Ditto.
17637
17638 2011-04-14  H.J. Lu  <hongjiu.lu@intel.com>
17639
17640         PR middle-end/48608
17641         * cfgexpand.c (get_decl_align_unit): Renamed to ...
17642         (align_local_variable): This.  Update DECL_ALIGN.
17643         (add_stack_var): Updated.
17644         (expand_one_stack_var): Likewise.
17645
17646 2011-04-14  Richard Guenther  <rguenther@suse.de>
17647
17648         * tree-ssa-dse.c (struct dse_global_data, struct dse_block_local_data):
17649         Remove.
17650         (dse_initialize_block_local_data, dse_leave_block,
17651         record_voperand_set, get_stmt_uid): Likewise.
17652         (dse_possible_dead_store_p): Allow any kind of killing stmt.
17653         (dse_optimize_stmt): Remove voperand set handling code.
17654         Simplify and improve to handle any kind of killing stmt.
17655         (dse_record_phi): Remove.
17656         (dse_enter_block): Simplify.
17657         (tree_ssa_dse): Likewise.
17658         * tree-ssa-alias.c (stmt_kills_ref_p_1): Handle some builtins.
17659
17660 2011-04-14  Jan Hubicka  <jh@suse.cz>
17661
17662         * cgraph.c (dump_cgraph_node): Do not dump inline summaries.
17663         * cgraph.h (struct inline_summary): Move to ipa-inline.h
17664         (cgraph_local_info): Remove inline_summary.
17665         * ipa-cp.c: Include ipa-inline.h.
17666         (ipcp_cloning_candidate_p, ipcp_estimate_growth,
17667         ipcp_estimate_cloning_cost, ipcp_insert_stage): Use inline_summary
17668         accesor.
17669         * lto-cgraph.c (lto_output_node): Do not stream inline summary.
17670         (input_overwrite_node): Do not set inline summary.
17671         (input_node): Do not stream inline summary.
17672         * ipa-inline.c (cgraph_decide_inlining): Dump inline summaries.
17673         (cgraph_decide_inlining_incrementally): Do not try to estimate overall
17674         growth; we do not have inline parameters computed for that anyway.
17675         (cgraph_early_inlining): After inlining compute call_stmt_sizes.
17676         * ipa-inline.h (struct inline_summary): Move here from ipa-inline.h
17677         (inline_summary_t): New type and VECtor.
17678         (debug_inline_summary, dump_inline_summaries): Declare.
17679         (inline_summary): Use VOCtor.
17680         (estimate_edge_growth): Kill hack computing call stmt size directly.
17681         * lto-section-in.c (lto_section_name): Add inline section.
17682         * ipa-inline-analysis.c: Include lto-streamer.h
17683         (node_removal_hook_holder, node_duplication_hook_holder): New holders
17684         (inline_node_removal_hook, inline_node_duplication_hook): New functions.
17685         (inline_summary_vec): Define.
17686         (inline_summary_alloc, dump_inline_summary, debug_inline_summary,
17687         dump_inline_summaries): New functions.
17688         (estimate_function_body_sizes): Properly compute size/time of outgoing
17689         calls.
17690         (compute_inline_parameters): Alloc inline_summary; do not compute
17691         size/time of incomming calls.
17692         (estimate_edge_time): Avoid missing time summary hack.
17693         (inline_read_summary): Read inline summary info.
17694         (inline_write_summary): Write inline summary info.
17695         (inline_free_summary): Free all hooks and inline summary vector.
17696         * lto-streamer.h: Add LTO_section_inline_summary section.
17697         * Makefile.in (ipa-cp.o, ipa-inline-analysis.o): Update dependencies.
17698         * ipa.c (cgraph_remove_unreachable_nodes): Fix dump file formating.
17699
17700 2011-04-14  Richard Sandiford  <richard.sandiford@linaro.org>
17701
17702         * tree-vectorizer.h (vect_strided_store_supported): Add a
17703         HOST_WIDE_INT argument.
17704         (vect_strided_load_supported): Likewise.
17705         (vect_permute_store_chain): Return void.
17706         (vect_transform_strided_load): Likewise.
17707         (vect_permute_load_chain): Delete.
17708         * tree-vect-data-refs.c (vect_strided_store_supported): Take a
17709         count argument.  Check that the count is a power of two.
17710         (vect_strided_load_supported): Likewise.
17711         (vect_permute_store_chain): Return void.  Update after above changes.
17712         Assert that the access is supported.
17713         (vect_permute_load_chain): Likewise.
17714         (vect_transform_strided_load): Return void.
17715         * tree-vect-stmts.c (vectorizable_store): Update calls after
17716         above interface changes.
17717         (vectorizable_load): Likewise.
17718         (vect_analyze_stmt): Don't check for strided powers of two here.
17719
17720 2011-04-14  Richard Guenther  <rguenther@suse.de>
17721
17722         PR tree-optimization/48590
17723         * tree-ssa-alias.c (ref_maybe_used_by_call_p_1): Handle
17724         BUILT_IN_ALLOCA, BUILT_IN_STACK_SAVE and BUILT_IN_STACK_RESTORE.
17725         (call_may_clobber_ref_p_1): Handle BUILT_IN_ALLOCA and
17726         BUILT_IN_STACK_SAVE.
17727         * tree-ssa-dce.c (propagate_necessity): Handle
17728         BUILT_IN_ALLOCA, BUILT_IN_STACK_SAVE and BUILT_IN_STACK_RESTORE.
17729
17730 2011-04-14  Nicola Pero  <nicola.pero@meta-innovation.com>
17731
17732         * c-parser.c (c_parser_objc_class_declaration): Updated call to
17733         objc_declare_class.
17734
17735 2011-04-14  Richard Guenther  <rguenther@suse.de>
17736
17737         * tree.h (get_object_alignment_1): Declare.
17738         * builtins.c (get_object_alignment_1): Split out worker from ...
17739         (get_object_alignment): ... here.
17740         * fold-const.c (get_pointer_modulus_and_residue): Use
17741         get_object_alignment_1.
17742
17743 2011-04-14  Richard Sandiford  <richard.sandiford@linaro.org>
17744
17745         * tree-vectorizer.h (vect_create_data_ref_ptr): Add an extra
17746         type parameter.
17747         * tree-vect-data-refs.c (vect_create_data_ref_ptr): Add an aggr_type
17748         parameter.  Generalise code to handle arrays as well as vectors.
17749         (vect_setup_realignment): Update accordingly.
17750         * tree-vect-stmts.c (vectorizable_store): Likewise.
17751         (vectorizable_load): Likewise.
17752
17753 2011-04-14  Richard Sandiford  <richard.sandiford@linaro.org>
17754
17755         * tree-vect-stmts.c (vectorizable_load): Allocate and free dr_chain
17756         within the per-copy loop.
17757
17758 2011-04-14  Richard Sandiford  <richard.sandiford@linaro.org>
17759
17760         * tree-vect-stmts.c (vectorizable_load): Print the number of copies
17761         in the dump file.
17762
17763 2011-04-14  Richard Sandiford  <richard.sandiford@linaro.org>
17764
17765         * doc/options.texi (Negative): Explicitly mention that the
17766         Negative chain must be circular.
17767
17768 2011-04-14  Nathan Froyd  <froydnj@codesourcery.com>
17769
17770         * function.h (block_chainon): Declare.
17771         * function.c (block_chainon): Define.
17772
17773 2011-04-14  Anatoly Sokolov  <aesok@post.ru>
17774             Eric Weddington  <eric.weddington@atmel.com>
17775             Georg-Johann Lay  <avr@gjlay.de>
17776
17777         * config/avr/avr.c ("insn-codes.h", "optabs.h", "langhooks.h"):
17778         New Includes
17779         (avr_init_builtins, avr_expand_builtin,
17780         avr_expand_delay_cycles, avr_expand_unop_builtin,
17781         avr_expand_binop_builtin ): New functions.
17782         (avr_builtin_id): New enum
17783         (struct avr_builtin_description): New struct
17784         (bdesc_1arg, bdesc_2arg): New arrays describing some RTL builtins.
17785         (TARGET_INIT_BUILTINS, TARGET_EXPAND_BUILTIN): Define.
17786
17787         * config/avr/avr.md (UNSPEC_FMUL, UNSPEC_FMULS, UNSPEC_FMULSU,
17788         UNSPECV_ENABLE_IRQS, UNSPECV_NOP, UNSPECV_SLEEP, UNSPECV_WDR,
17789         UNSPECV_DELAY_CYCLES): new enumeration values
17790         (UNSPEC_SEI, UNSPEC_CLI): Remove enumeration values
17791         ("enable_interrupt"): Use UNSPECV_ENABLE_IRQS
17792         ("disable_interrupt"): Use UNSPECV_ENABLE_IRQS
17793         ("*rotlqi3_4"): rename insn to "rotlqi3_4"
17794         ("delay_cycles_1", "delay_cycles_2", "delay_cycles_3",
17795         "delay_cycles_4", "nopv", "sleep", "wdr", "fmul", "fmuls",
17796         "fmulsu"): New insns
17797
17798         * config/avr/avr-c.c: fix line endings
17799         (avr_cpu_cpp_builtins): New builtin defines: __BUILTIN_AVR_NOP,
17800         __BUILTIN_AVR_SEI, __BUILTIN_AVR_CLI, __BUILTIN_AVR_WDR,
17801         __BUILTIN_AVR_SLEEP, __BUILTIN_AVR_SWAP,
17802         __BUILTIN_AVR_DELAY_CYCLES, __BUILTIN_AVR_FMUL,
17803         __BUILTIN_AVR_FMULS, __BUILTIN_AVR_FMULSU.
17804
17805         * doc/extend.texi (AVR Built-in Functions): New node
17806         (Target Builtins): Add documentation of AVR
17807         built-in functions.
17808
17809 2011-04-14  Georg-Johann Lay  <avr@gjlay.de>
17810
17811         PR target/44643
17812         * config/avr/avr.c (avr_insert_attributes): Leave TREE_READONLY
17813         alone. Error if non-const data has attribute progmem.
17814
17815 2011-04-13  Nathan Froyd  <froydnj@codesourcery.com>
17816
17817         * tree.h (struct tree_constructor): Include tree_typed instead of
17818         tree_common.
17819         * tree.c (initialize_tree_contains_struct): Mark TS_CONSTRUCTOR as
17820         TS_TYPED instead of TS_COMMON.
17821
17822 2011-04-13  Uros Bizjak  <ubizjak@gmail.com>
17823
17824         * config/i386/sse.md (*sse2_uavgv16qi3): Merge with *avx_uavgv16qi3.
17825         (*sse2_uavgv8hi3): Merge with *avx_uavgv8hi3.
17826         (sse2_psadbw): Merge with *avx_psadbw.
17827         (ssse3_phaddwv8hi3): Merge with *avx_phaddwv8hi3.
17828         (ssse3_phadddv4si3): Merge with *avx_phadddv4si3.
17829         (ssse3_phaddswv8hi3): Merge with *avx_phaddswv8hi3.
17830         (ssse3_phsubwv8hi3): Merge with *avx_phsubwv8hi3.
17831         (ssse3_phsubdv4si3): Merge with *avx_phsubdv4si3.
17832         (ssse3_phsubswv8hi3): Merge with *avx_phsubswv8hi3.
17833         (ssse3_pmaddubsw128): Merge with *avx_pmaddubsw128.
17834         (*ssse3_pmulhrswv8hi3): Merge with *avx_pmulhrswv8hi3.
17835         (ssse3_pshufbv16qi3): Merge with *avx_pshufbv16qi3.
17836         (ssse3_psign<mode>3): Merge with *avx_psign<mode>3.
17837         (ssse3_palignrti): Merge with *avx_palignrti.
17838
17839 2011-04-13  Nathan Froyd  <froydnj@codesourcery.com>
17840
17841         * tree-flow.h (struct gimple_df): Make free_ssanames a VEC.
17842         * tree-ssanames.c (fini_ssanames): VEC_free it.
17843         (make_ssa_name_fn): Update for VECness of free_ssanames.
17844         (release_ssa_name, release_dead_ssa_names): Likewise.
17845         * tree.h (struct tree_ssa_name): Include tree_typed instead of
17846         tree_common.
17847         * tree.c (initialize_tree_contains_struct): Mark TS_SSA_NAME as
17848         TS_TYPED instead of TS_COMMON.
17849
17850 2011-04-13  Nathan Froyd  <froydnj@codesourcery.com>
17851
17852         * postreload-gcse.c (gcse_after_reload_main): Add calls to
17853         statistics_counter_event.
17854         * tree-ssa-copyrename.c (stats): Define.
17855         (rename_ssa_copies): Count coalesced SSA_NAMEs.  Add call to
17856         statistics_counter_event.
17857         * tree-ssa-math-opts.c (reciprocal_stats, sincos_stats): Define.
17858         (bswap_stats, widen_mul_stats): Define.
17859         (insert_reciprocals): Increment rdivs_inserted.
17860         (execute_cse_reciprocals): Zeroize reciprocal_stats.  Increment
17861         rfuncs_inserted.  Add calls to statistics_counter_event.
17862         (execute_cse_sincos_1): Increment inserted.
17863         (execute_cse_sincos): Zeroize sincos_stats.  Add call to
17864         statistics_counter_event.
17865         (execute_optimize_bswap): Zeroize bswap_stats.  Increment fields
17866         of bswap_stats.  Add calls to statistics_counter_event.
17867         (convert_mult_to_widen): Increment widen_mults_inserted.
17868         (convert_plusminus_to_widen): Increment maccs_inserted.
17869         (convert_mult_to_fma): Increment fmas_inserted.
17870         (execute_optimize_widening_mul): Zeroize widen_mul_stats.  Add
17871         calls to statistics_counter_event.
17872
17873 2011-04-13  Vladimir Makarov  <vmakarov@redhat.com>
17874
17875         PR rtl-optimization/48455
17876         * ira-costs.c (find_costs_and_classes): Use i_mem_cost instead of
17877         `temp_costs->mem_cost'.
17878
17879 2011-04-13  Jan Hubicka  <jh@suse.cz>
17880
17881         * ipa-inline.h: New file.
17882         * ipa-inline-analysis.c: New file. Broken out of ...
17883         * ipa-inline.c: ... this file; update toplevel comment;
17884         include ipa-inline.h
17885         (inline_summary): Move to ipa-inline.h
17886         (cgraph_estimate_edge_time): Rename to estimate_edge_time; move to
17887         ipa-inline-analysis.c.
17888         (cgraph_estimate_time_after_inlining): Rename to
17889         estiamte_time_after_inlining; move to ipa-inline-analysis.c
17890         (cgraph_estimate_edge_growth): Move to ipa-inline-analysis.c; rename
17891         to estimate_edge_growth.
17892         (cgraph_estimate_size_after_inlining): Move to ipa-inline-analysis.c;
17893         rename to estimate_size_after_inlining.
17894         (cgraph_mark_inline_edge): Update for new naming convention.
17895         (cgraph_check_inline_limits): Likewise.
17896         (cgraph_edge_badness): Likewise.
17897         (cgraph_decide_recursive_inlining): Likewise.
17898         (cgraph_decide_inlining_of_small_functions): Likewise.
17899         (cgraph_decide_inlining_incrementally): Likewise.
17900         (cgraph_estimate_growth): Rename to estimate_growth; move to
17901         ipa-inline-analysis.c.
17902         (eliminated_by_inlining_prob): Move to ipa-inline-analysis.c.
17903         (estimate_function_body_sizes): Move to ipa-inline-analysis.c.
17904         (compute_inline_parameters): Likewise.
17905         (compute_inline_parameters_for_current): Likewise.
17906         (pass_inline_parameters): Likewise.
17907         (inline_indirect_intraprocedural_analysis): Likewise.
17908         (analyze_function): Rename to inline_analyze_function; likewise.
17909         (add_new_function): Move to ipa-inline-analysis.c.
17910         (inline_generate_summary): Likewise.
17911         (inline_read_summary): Likewise.
17912         (inline_write_summary): Likewise.
17913         * Makefile.in (ipa-inline-analysis.c): New file.
17914
17915 2011-04-13  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
17916
17917         * configure.ac (gcc_cv_as_sparc_gotdata_op): Remove GNU ld check.
17918         * configure: Regenerate.
17919
17920 2011-04-13  Nathan Froyd  <froydnj@codesourcery.com>
17921
17922         * tree.h (struct tree_int_cst, struct real_value): Include tree_typed
17923         instead of tree_common.
17924         (struct tree_fixed_cst, struct tree_string, struct tree_complex):
17925         Likewise.
17926         * tree.c (initialize_tree_contains_struct): Mark such nodes as being
17927         TS_TYPED rather than TS_COMMON.
17928         * print-tree.c (print_node) [STRING_CST]: Don't print TREE_CHAIN.
17929
17930 2011-04-01  Georg-Johann Lay  <avr@gjlay.de>
17931
17932         PR target/45263
17933         * config/avr/libgcc.S (__do_global_ctors, __do_global_dtors): Don't use
17934         r20 around calls of __tablejump_elpm__
17935
17936 2011-04-13  Jakub Jelinek  <jakub@redhat.com>
17937
17938         PR middle-end/48591
17939         * omp-low.c (expand_omp_atomic_fetch_op): Return false if decl is
17940         NULL.
17941         (expand_omp_atomic_pipeline): Return false if cmpxchg is NULL.
17942
17943 2011-04-13  Bernd Schmidt  <bernds@codesourcery.com>
17944
17945         * dwarf2out.c (struct dw_cfi_struct): Remove member dw_cfi_next.
17946         (dw_cfi_ref): Add DEF_VEC_P and some DEF_VEC_ALLOC_Ps.
17947         (cfi_vec): New typedef.
17948         (struct dw_fde_struct): Make dw_fde_cfi a cfi_vec. Replace
17949         dw_fde_switch_cfi with an integer dw_fde_switch_cfi_index.
17950         (cie_cfi_vec): New static variable.
17951         (cie_cfi_head): Delete.
17952         (add_cfi): Accept a cfi_vec * as first argument. All callers and
17953         declaration changed. Use vector rather than list operations.
17954         (new_cfi): Don't initialize the dw_cfi_next field.
17955         (add_fde_cfi): Allocate cie_cfi_vec if necessary. Use vector
17956         rather than list operations.
17957         (lookup_cfa): Use vector rather than list operations.
17958         (output_cfis): New argument upto. Accept a cfi_vec rather than
17959         a dw_cfi_ref list head as argument. All callers changed.
17960         Iterate over the vector using upto as a maximum index.
17961         (output_all_cfis): New static function.
17962         (output_fde): Use vector rather than list operations. Use the
17963         new upto argument for output_cfis rather than manipulating a
17964         list.
17965         (dwarf2out_begin_prologue): Change initializations to match
17966         new struct members.
17967         (dwarf2out_switch_text_section): Initialize dw_fde_switch_cfi_index
17968         from the vector length rather than searching for the end of a list.
17969         Use output_all_cfis.
17970         (convert_cfa_to_fb_loc_list): Use vector rather than list operations.
17971
17972 2011-04-13  Nick Clifton  <nickc@redhat.com>
17973
17974         * config/rx/rx.md (movmemsi): Do not use this pattern when
17975         volatile pointers are involved.
17976
17977 2011-04-13  Uros Bizjak  <ubizjak@gmail.com>
17978
17979         * config/i386/sse.md (pinsrbits): Remove.
17980         (sse2_packsswb): Merge with *avx_packsswb.
17981         (sse2_packssdw): Merge with *avx_packssdw.
17982         (sse2_packuswb): Merge with *avx_packuswb.
17983         (vec_interleave_highv16qi): Merge with *avx_interleave_highv16qi.
17984         (vec_interleave_lowv16qi): Merge with *avx_interleave_lowv16qi.
17985         (vec_interleave_highv8hi): Merge with *avx_interleave_highv8hi.
17986         (vec_interleave_lowv8hi): Merge with *avx_interleave_lowv8hi.
17987         (vec_interleave_highv4si): Merge with *avx_interleave_highv4si.
17988         (vec_interleave_lowv4si): Merge with *avx_interleave_lowv4si.
17989         (*sse4_1_pinsrb): Merge with *avx_pinsr<ssevecsize>.
17990         (*sse2_pinsrw): Merge with *avx_pinsr<ssevecsize>.
17991         (*sse4_1_pinsrd): Merge with *avx_pinsr<ssevecsize>.
17992         (*sse4_1_pinsrq): Merge with *avx_pinsrq.
17993         (sse2_loadld): Merge with *avx_loadld.
17994         (*vec_extractv2di_1_rex64): Merge with *vec_extractv2di_1_rex64_avx.
17995         (*vec_extractv2di_1_sse2): Merge with *vec_extractv2di_1_avx.
17996         (*vec_concatv2si_sse4_1): Merge with *vec_concatv2si_avx.
17997         (*vec_concatv2di_rex64_sse4_1): Merge with *vec_concatv2di_rex64_avx.
17998         (vec_concatv2di): Merge with *vec_concatv2di_avx.
17999
18000 2011-04-12  Nathan Froyd  <froydnj@codesourcery.com>
18001
18002         * c-decl.c (union lang_tree_node): Check for TS_COMMON before
18003         calling TREE_CHAIN.
18004         * print-tree.c (print_node): Likewise.
18005         * tree-inline.c (copy_tree_r): Likewise.
18006         * c-lang.c (LANG_HOOKS_INIT_TS): Define.
18007         * lto-streamer-in.c (lto_input_tree_pointers): Check for TS_TYPED
18008         instead of TS_COMMON.
18009         * lto-streamer-out.c (lto_output_tree_pointers): Likewise.
18010         * tree.c (initialize_tree_contains_struct): Handle TS_TYPED.
18011         (copy_node_stat): Zero TREE_CHAIN only if necessary.
18012         (MARK_TS_BASE, MARK_TS_TYPED, MARK_TS_COMMON): Move these...
18013         (MARK_TS_DECL_COMMON, MARK_TS_DECL_COMMON, MARK_TS_DECL_WRTL):
18014         ...and these...
18015         (MARK_TS_DECL_WITH_VIS, MARK_TS_DECL_NON_COMMON): ...and these...
18016         * tree.h: ...here.
18017         (TREE_CHAIN): Check for a TS_COMMON structure.
18018         (TREE_TYPE): Check for a TS_TYPED structure.
18019
18020 2011-04-12  Pat Haugen  <pthaugen@us.ibm.com>
18021
18022         * config/rs6000/rs6000.c (call_ABI_of_interest): Call
18023         cgraph_get_create_node instead of cgraph_node.
18024
18025 2011-04-12  Nicola Pero  <nicola.pero@meta-innovation.com>
18026
18027         * c-parser.c (c_parser_initelt): Updated call to
18028         objc_build_message_expr.
18029         (c_parser_postfix_expression): Likewise.
18030
18031 2011-04-12  Kai Tietz  <ktietz@redhat.com>
18032
18033         * config/i386/mingw32.h (TARGET_SUBTARGET_DEFAULT): Add
18034         MASK_MS_BITFIELD_LAYOUT bit.
18035
18036 2011-04-12  Jakub Jelinek  <jakub@redhat.com>
18037
18038         * combine.c (update_cfg_for_uncondjump): Instead of testing at_end
18039         assert it is always true.
18040         (try_combine): Don't call update_cfg_for_uncondjump for noop non-jump
18041         moves.
18042
18043 2011-04-12  Nicola Pero  <nicola.pero@meta-innovation.com>
18044
18045         * c-parser.c (c_lex_one_token): Rewritten conditional used when
18046         compiling Objective-C to be more efficient.
18047
18048 2011-04-12  Axel Freyn  <axel-freyn@gmx.de>
18049
18050         * opts-common.c (decode_cmdline_options_to_array): Remove variable
18051         argv_copied.
18052
18053 2011-04-12  Richard Sandiford  <richard.sandiford@linaro.org>
18054
18055         * recog.h, genoutput.c, optabs.c: Revert last patch.
18056
18057 2011-04-12  Ramana Radhakrishnan  <ramana.radhakrishnan@linaro.org>
18058
18059         PR target/48090
18060         * config/arm/arm.md (*arm_negdi2): Fix early clobber constraints.
18061
18062 2011-04-12  Richard Sandiford  <richard.sandiford@linaro.org>
18063
18064         * recog.h (insn_operand_data): Add an "allows_mem" field.
18065         * genoutput.c (output_operand_data): Initialize it.
18066         * optabs.c (maybe_legitimize_operand_same_code): New function.
18067         (maybe_legitimize_operand): Use it when matching the original
18068         op->value.
18069
18070 2011-04-12  Richard Sandiford  <richard.sandiford@linaro.org>
18071
18072         * genpreds.c (process_define_predicate): Move most processing
18073         to gensupport.c.  Continue to validate the expression.
18074         * genrecog.c (did_you_mean_codes, compute_predicate_codes)
18075         (process_define_predicate): Move processing to gensupport.c.
18076         (main): Remove DEFINE_PREDICATE and DEFINE_SPECIAL_PREDICATE cases.
18077         * gensupport.c (did_you_mean_codes): Moved from genrecog.c.
18078         (compute_predicate_codes): Moved from genrecog.c.  Add lineno
18079         argument.
18080         (valid_predicate_name_p): New function, split out from old
18081         genpreds.c:process_define_predicate.
18082         (process_define_predicate): New function, combining code from
18083         old genpreds.c and genrecog.c functions.
18084         (process_rtx): Call it for DEFINE_PREDICATE and
18085         DEFINE_SPECIAL_PREDICATE.
18086
18087 2011-04-12  Richard Sandiford  <richard.sandiford@linaro.org>
18088
18089         * config/arm/arm.c (arm_print_operand): Use MEM_SIZE to get the
18090         size of a '%A' memory reference.
18091         (T_DREG, T_QREG): New neon_builtin_type_bits.
18092         (arm_init_neon_builtins): Assert that the load and store operands
18093         are neon_struct_operands.
18094         (locate_neon_builtin_icode): Provide the neon_builtin_type_bits.
18095         (NEON_ARG_MEMORY): New builtin_arg.
18096         (neon_dereference_pointer): New function.
18097         (arm_expand_neon_args): Add a neon_builtin_type_bits argument.
18098         Handle NEON_ARG_MEMORY.
18099         (arm_expand_neon_builtin): Update after above interface changes.
18100         Use NEON_ARG_MEMORY for loads and stores.
18101         * config/arm/predicates.md (neon_struct_operand): New predicate.
18102         * config/arm/iterators.md (V_two_elem): Tweak formatting.
18103         (V_three_elem): Use BLKmode for accesses that have no associated mode.
18104         (V_four_elem): Tweak formatting.
18105         * config/arm/neon.md (neon_vld1<mode>, neon_vld1_dup<mode>)
18106         (neon_vst1_lane<mode>, neon_vst1<mode>, neon_vld2<mode>)
18107         (neon_vld2_lane<mode>, neon_vld2_dup<mode>, neon_vst2<mode>)
18108         (neon_vst2_lane<mode>, neon_vld3<mode>, neon_vld3_lane<mode>)
18109         (neon_vld3_dup<mode>, neon_vst3<mode>, neon_vst3_lane<mode>)
18110         (neon_vld4<mode>, neon_vld4_lane<mode>, neon_vld4_dup<mode>)
18111         (neon_vst4<mode>): Replace pointer operand with a memory operand.
18112         Use %A in the output template.
18113         (neon_vld3qa<mode>, neon_vld3qb<mode>, neon_vst3qa<mode>)
18114         (neon_vst3qb<mode>, neon_vld4qa<mode>, neon_vld4qb<mode>)
18115         (neon_vst4qa<mode>, neon_vst4qb<mode>): Likewise, but halve
18116         the width of the memory access.  Remove post-increment.
18117         * config/arm/neon-testgen.ml: Allow addresses to have an alignment.
18118
18119 2011-04-12  Nick Clifton  <nickc@redhat.com>
18120
18121         * config/v850/v850.c (expand_prologue): Do not use the CALLT
18122         instruction for interrupt handlers if the target is the basic V850
18123         architecture.
18124         (expand_epilogue): Likewise.
18125
18126 2011-04-12  Jakub Jelinek  <jakub@redhat.com>
18127
18128         PR rtl-optimization/48549
18129         * combine.c (propagate_for_debug): Also stop after BB_END of
18130         this_basic_block.  Process LAST and just stop processing after it.
18131         (combine_instructions): If last_combined_insn has been deleted,
18132         set last_combined_insn to its PREV_INSN.
18133
18134 2011-04-12  Richard Guenther  <rguenther@suse.de>
18135
18136         PR tree-optimization/46076
18137         * gimple.h (struct gimple_statement_call): Add fntype field.
18138         (gimple_call_fntype): Adjust.
18139         (gimple_call_set_fntype): New function.
18140         * gimple.c (gimple_build_call_1): Set the call function type.
18141         * gimplify.c (gimplify_call_expr): Preserve the function
18142         type the frontend used for the call.
18143         (gimplify_modify_expr): Likewise.
18144         * lto-streamer-in.c (input_gimple_stmt): Input the call stmts
18145         function type.
18146         * lto-streamer-out.c (output_gimple_stmt): Output the call stmts
18147         function type.
18148         * tree-ssa.c (useless_type_conversion_p): Function pointer
18149         conversions are useless.
18150
18151 2011-04-12  Martin Jambor  <mjambor@suse.cz>
18152
18153         * cgraph.h (cgraph_node): Remove function declaration.
18154         (cgraph_create_node): Declare.
18155         (cgraph_get_create_node): Likewise.
18156         * cgraph.c (cgraph_create_node): Renamed to cgraph_create_node_1.
18157         Updated all callers.
18158         (cgraph_node): Renamed to cgraph_create_node, assert that a node for
18159         the decl does not already exist.  Call cgraph_get_create_node instead
18160         of cgraph_node.
18161         (cgraph_get_create_node): New function.
18162         (cgraph_same_body_alias): Update comment.
18163         (cgraph_set_call_stmt): Call cgraph_get_node instead of cgraph_node,
18164         assert it does not return NULL.
18165         (cgraph_update_edges_for_call_stmt): Likewise.
18166         (cgraph_clone_edge): Likewise.
18167         (cgraph_create_virtual_clone): Likewise.
18168         (cgraph_update_edges_for_call_stmt_node): Call cgraph_get_create_node
18169         instead of cgraph_node.
18170         (cgraph_add_new_function): Call cgraph_create_node or
18171         cgraph_get_create_node instead of cgraph_node.
18172         * cgraphbuild.c (record_reference): Call cgraph_get_create_node
18173         instead of cgraph_node.
18174         (record_eh_tables): Likewise.
18175         (mark_address): Likewise.
18176         (mark_load): Likewise.
18177         (build_cgraph_edges): Call cgraph_get_create_node instead
18178         of cgraph_node.
18179         (rebuild_cgraph_edges): Likewise.
18180         * cgraphunit.c (cgraph_finalize_function): Call cgraph_get_create_node
18181         instead of cgraph_node.
18182         (cgraph_copy_node_for_versioning): Call cgraph_create_node instead of
18183         cgraph_node.
18184         * lto-symtab.c (lto_symtab_merge_cgraph_nodes_1): Call
18185         cgraph_create_node instead of cgraph_node.
18186         * c-decl.c (finish_function): Call cgraph_get_create_node instead
18187         of cgraph_node.
18188         * lto-cgraph.c (input_node): Likewise.
18189         * lto-streamer-in.c (input_function): Likewise.
18190         * varasm.c (mark_decl_referenced): Likewise.
18191         (assemble_alias): Likewise.
18192
18193 2011-04-12  Martin Jambor  <mjambor@suse.cz>
18194
18195         * tree-inline.c (tree_function_versioning): Call cgraph_get_node
18196         instead of cgraph_node and assert it does not return NULL.
18197         * lto-streamer-in.c (lto_read_body): Likewise.
18198         * omp-low.c (new_omp_context): Likewise.
18199         (create_task_copyfn): Likewise.
18200         * tree-emutls.c (lower_emutls_function_body): Likewise.
18201         * matrix-reorg.c (transform_allocation_sites): Likewise.
18202
18203 2011-04-12  Jakub Jelinek  <jakub@redhat.com>
18204
18205         PR c/48552
18206         * c-typeck.c (build_asm_expr): Error out on attempts to use
18207         void type outputs or inputs for constraints that allow reg or
18208         don't allow memory.
18209
18210 2011-04-11  Chung-Lin Tang  <cltang@codesourcery.com>
18211             Richard Earnshaw  <rearnsha@arm.com>
18212
18213         PR target/48250
18214         * config/arm/arm.c (arm_legitimize_reload_address): Update cases
18215         to use sign-magnitude offsets. Reject unsupported unaligned
18216         cases. Add detailed description in comments.
18217         * config/arm/arm.md (reload_outdf): Disable for ARM mode; change
18218         condition from TARGET_32BIT to TARGET_ARM.
18219
18220 2011-04-11  Nathan Froyd  <froydnj@codesourcery.com>
18221
18222         * tree.h (struct typed_tree): New.
18223         (struct tree_common): Include it instead of tree_base.
18224         (TREE_TYPE): Update for new location of type field.
18225         (TYPE_USER_ALIGN, TYPE_PACKED): Refer to base field directly.
18226         (DECL_USER_ALIGN, DECL_PACKED): Likewise.
18227         (union tree_node): Add typed field.
18228         * treestruct.def (TS_TYPED): New.
18229         * lto-streamer.c (check_handled_ts_structures): Handle it.
18230         * tree.c (MARK_TS_TYPED): New macro.
18231         (MARK_TS_COMMON): Call it instead of MARK_TS_BASE.
18232
18233 2011-04-11  Eric Botcazou  <ebotcazou@adacore.com>
18234
18235         * cfghooks.c (redirect_edge_and_branch_force): Localize variable.
18236         (force_nonfallthru): Do not alter the loop nest if no basic block
18237         was created.
18238
18239 2011-04-11  Uros Bizjak  <ubizjak@gmail.com>
18240
18241         * config/i386/sse.md (VI): New mode iterator.
18242         (SSEMODEI): Remove.
18243         (AVX256MODEI): Ditto.
18244         (AVXMODEF4P): Ditto.
18245         (avxvecpsmode): Ditto.
18246         (one_cmpl<mode>2): Enable for TARGET_SSE.  Use VI mode iterator.
18247         (sse2_andnot<mode>3): New expander.
18248         (*andnot<mode>3): Merge with *sse2_andnot<mode>3 and
18249         *avx_andnot<mode>3.  Enable for TARGET_SSE.  Use VI mode iterator.
18250         (<any_logic:code><mode>3): Use VI mode iterator.
18251         (*<any_logic:code><mode>3): Merge with *sse2_<any_logic:code><mode>3
18252         and *avx_<any_logic:code><mode>3.  Use VI mode iterator.
18253         (*andnottf3): Handle AVX three-operand constraints.
18254         (*<any_logic:code>tf3): Handle AVX three-operand constraints.
18255
18256 2011-04-11  Joseph Myers  <joseph@codesourcery.com>
18257             Robert Millan  <rmh@gnu.org>
18258
18259         * config.gcc (x86_64-*-kfreebsd*-gnu): Use i386/kfreebsd-gnu.h.
18260         * config/i386/kfreebsd-gnu.h (GNU_USER_DYNAMIC_LINKER32,
18261         GNU_USER_DYNAMIC_LINKER64): Define.
18262         (REG_NAME): Don't undefine.
18263         (MD_UNWIND_SUPPORT): Undefine.
18264         * config/i386/knetbsd-gnu.h (GNU_USER_LINK_EMULATION): Define.
18265         (REG_NAME): Don't undefine.
18266         (MD_UNWIND_SUPPORT): Undefine.
18267         * config/i386/kopensolaris-gnu.h (GNU_USER_LINK_EMULATION): Define.
18268
18269 2011-04-11  Joseph Myers  <joseph@codesourcery.com>
18270
18271         * config/i386/gnu.h (GNU_USER_LINK_EMULATION): Define.
18272         (CPP_SPEC, CC1_SPEC, ENDFILE_SPEC): Remove.
18273
18274 2011-04-11  Xinliang David Li  <davidxl@google.com>
18275
18276         * value-profile.c (check_ic_target): New function.
18277         (gimple_ic_transform): Sanity check indirect call target.
18278         * gimple-low.c (gimple_check_call_args): Interface change.
18279         (gimple_check_call_matching_types): New function.
18280         * tree-inline.c (tree_can_inline_p): Call new function.
18281
18282 2011-04-11  Basile Starynkevitch  <basile@starynkevitch.net>
18283
18284         * Makefile.in (PLUGIN_HEADERS): Add gimple-pretty-print.h
18285         tree-pretty-print.h & realmpfr.h.
18286
18287 2011-04-11  Vladimir Makarov  <vmakarov@redhat.com>
18288
18289         PR middle-end/48464
18290         * ira.c (setup_pressure_classes): Fix typo in loop condition.
18291         (setup_allocno_and_important_classes): Ditto.
18292
18293 2011-04-11  Joseph Myers  <joseph@codesourcery.com>
18294
18295         * config/alpha/linux-elf.h (LINUX_DYNAMIC_LINKER): Rename to
18296         GNU_USER_DYNAMIC_LINKER.
18297         * config/arm/linux-eabi.h (TARGET_OS_CPP_BUILTINS): Change
18298         LINUX_TARGET_OS_CPP_BUILTINS to GNU_USER_TARGET_OS_CPP_BUILTINS.
18299         * config/arm/linux-elf.h (LINUX_TARGET_LINK_SPEC): Change
18300         LINUX_DYNAMIC_LINKER to GNU_USER_DYNAMIC_LINKER.
18301         (TARGET_OS_CPP_BUILTINS): Change LINUX_TARGET_OS_CPP_BUILTINS to
18302         GNU_USER_TARGET_OS_CPP_BUILTINS.
18303         * config/bfin/linux.h (TARGET_OS_CPP_BUILTINS): Change
18304         LINUX_TARGET_OS_CPP_BUILTINS to GNU_USER_TARGET_OS_CPP_BUILTINS.
18305         * config/bfin/uclinux.h (TARGET_OS_CPP_BUILTINS): Change
18306         LINUX_TARGET_OS_CPP_BUILTINS to GNU_USER_TARGET_OS_CPP_BUILTINS.
18307         * config/cris/linux.h (CRIS_LINK_SUBTARGET_SPEC): Change
18308         LINUX_DYNAMIC_LINKER to GNU_USER_DYNAMIC_LINKER.
18309         (TARGET_OS_CPP_BUILTINS): Change LINUX_TARGET_OS_CPP_BUILTINS to
18310         GNU_USER_TARGET_OS_CPP_BUILTINS.
18311         * config/frv/linux.h (LINK_SPEC): Change LINUX_DYNAMIC_LINKER to
18312         GNU_USER_DYNAMIC_LINKER.
18313         * config/gnu.h (LINUX_TARGET_OS_CPP_BUILTINS): Rename to
18314         GNU_USER_TARGET_OS_CPP_BUILTINS.
18315         * config/i386/gnu-user.h (TARGET_OS_CPP_BUILTINS): Change
18316         LINUX_TARGET_OS_CPP_BUILTINS to GNU_USER_TARGET_OS_CPP_BUILTINS.
18317         * config/i386/gnu-user64.h (TARGET_OS_CPP_BUILTINS): Change
18318         LINUX_TARGET_OS_CPP_BUILTINS to GNU_USER_TARGET_OS_CPP_BUILTINS.
18319         * config/i386/linux.h (GNU_USER_DYNAMIC_LINKER): Remove.
18320         * config/i386/linux64.h (GNU_USER_DYNAMIC_LINKER32,
18321         GNU_USER_DYNAMIC_LINKER64): Remove.
18322         * config/ia64/linux.h (TARGET_OS_CPP_BUILTINS): Change
18323         LINUX_TARGET_OS_CPP_BUILTINS to GNU_USER_TARGET_OS_CPP_BUILTINS.
18324         (LINK_SPEC): Change LINUX_DYNAMIC_LINKER to
18325         GNU_USER_DYNAMIC_LINKER.
18326         * config/kfreebsd-gnu.h (LINUX_TARGET_OS_CPP_BUILTINS): Rename to
18327         GNU_USER_TARGET_OS_CPP_BUILTINS.
18328         * config/knetbsd-gnu.h (LINUX_TARGET_OS_CPP_BUILTINS): Rename to
18329         GNU_USER_TARGET_OS_CPP_BUILTINS.
18330         * config/kopensolaris-gnu.h (LINUX_TARGET_OS_CPP_BUILTINS): Rename
18331         to GNU_USER_TARGET_OS_CPP_BUILTINS.
18332         * config/linux.h (LINUX_TARGET_OS_CPP_BUILTINS): Rename to
18333         GNU_USER_TARGET_OS_CPP_BUILTINS.
18334         (LINUX_DYNAMIC_LINKER): Rename to GNU_USER_DYNAMIC_LINKER.
18335         (LINUX_DYNAMIC_LINKER32): Rename to GNU_USER_DYNAMIC_LINKER32.
18336         (LINUX_DYNAMIC_LINKER64): Rename to GNU_USER_DYNAMIC_LINKER64.
18337         * config/lm32/uclinux-elf.h (TARGET_OS_CPP_BUILTINS): Change
18338         LINUX_TARGET_OS_CPP_BUILTINS to GNU_USER_TARGET_OS_CPP_BUILTINS.
18339         * config/m32r/linux.h (LINK_SPEC): Change LINUX_DYNAMIC_LINKER to
18340         GNU_USER_DYNAMIC_LINKER.
18341         (TARGET_OS_CPP_BUILTINS): Change LINUX_TARGET_OS_CPP_BUILTINS to
18342         GNU_USER_TARGET_OS_CPP_BUILTINS.
18343         * config/m68k/linux.h (TARGET_OS_CPP_BUILTINS): Change
18344         LINUX_TARGET_OS_CPP_BUILTINS to GNU_USER_TARGET_OS_CPP_BUILTINS.
18345         (LINK_SPEC): Change LINUX_DYNAMIC_LINKER to
18346         GNU_USER_DYNAMIC_LINKER.
18347         * config/m68k/uclinux.h (TARGET_OS_CPP_BUILTINS): Change
18348         LINUX_TARGET_OS_CPP_BUILTINS to GNU_USER_TARGET_OS_CPP_BUILTINS.
18349         * config/mips/linux.h (TARGET_OS_CPP_BUILTINS): Change
18350         LINUX_TARGET_OS_CPP_BUILTINS to GNU_USER_TARGET_OS_CPP_BUILTINS.
18351         (LINK_SPEC): Change LINUX_DYNAMIC_LINKER to
18352         GNU_USER_DYNAMIC_LINKER.
18353         * config/mips/linux64.h (LINUX_DYNAMIC_LINKERN32): Rename to
18354         GNU_USER_DYNAMIC_LINKERN32.
18355         (LINK_SPEC): Change LINUX_DYNAMIC_LINKERN32 to
18356         GNU_USER_DYNAMIC_LINKERN32.  Change LINUX_DYNAMIC_LINKER64 to
18357         GNU_USER_DYNAMIC_LINKER64.  Change LINUX_DYNAMIC_LINKER32 to
18358         GNU_USER_DYNAMIC_LINKER32.
18359         * config/mn10300/linux.h (TARGET_OS_CPP_BUILTINS): Change
18360         LINUX_TARGET_OS_CPP_BUILTINS to GNU_USER_TARGET_OS_CPP_BUILTINS.
18361         (LINK_SPEC): Change LINUX_DYNAMIC_LINKER to
18362         GNU_USER_DYNAMIC_LINKER.
18363         * config/moxie/uclinux.h (TARGET_OS_CPP_BUILTINS): Change
18364         LINUX_TARGET_OS_CPP_BUILTINS to GNU_USER_TARGET_OS_CPP_BUILTINS.
18365         * config/pa/pa-linux.h (TARGET_OS_CPP_BUILTINS): Change
18366         LINUX_TARGET_OS_CPP_BUILTINS to GNU_USER_TARGET_OS_CPP_BUILTINS.
18367         (LINK_SPEC): Change LINUX_DYNAMIC_LINKER to GNU_USER_DYNAMIC_LINKER.
18368         * config/rs6000/linux64.h (LINUX_DYNAMIC_LINKER32): Rename to
18369         GNU_USER_DYNAMIC_LINKER32.
18370         (LINUX_DYNAMIC_LINKER64): Rename to GNU_USER_DYNAMIC_LINKER64.
18371         * config/rs6000/sysv4.h (LINUX_DYNAMIC_LINKER): Rename to
18372         GNU_USER_DYNAMIC_LINKER.
18373         * config/s390/linux.h (TARGET_OS_CPP_BUILTINS): Change
18374         LINUX_TARGET_OS_CPP_BUILTINS to GNU_USER_TARGET_OS_CPP_BUILTINS.
18375         (LINK_SPEC): Change LINUX_DYNAMIC_LINKER32 to
18376         GNU_USER_DYNAMIC_LINKER32.  Change LINUX_DYNAMIC_LINKER64 to
18377         GNU_USER_DYNAMIC_LINKER64.
18378         * config/sh/linux.h (TARGET_OS_CPP_BUILTINS): Change
18379         LINUX_TARGET_OS_CPP_BUILTINS to GNU_USER_TARGET_OS_CPP_BUILTINS.
18380         (SUBTARGET_LINK_SPEC): Change LINUX_DYNAMIC_LINKER to
18381         GNU_USER_DYNAMIC_LINKER.
18382         * config/sparc/linux.h (TARGET_OS_CPP_BUILTINS): Change
18383         LINUX_TARGET_OS_CPP_BUILTINS to GNU_USER_TARGET_OS_CPP_BUILTINS.
18384         (LINK_SPEC): Change LINUX_DYNAMIC_LINKER to
18385         GNU_USER_DYNAMIC_LINKER.
18386         * config/sparc/linux64.h (TARGET_OS_CPP_BUILTINS): Change
18387         LINUX_TARGET_OS_CPP_BUILTINS to GNU_USER_TARGET_OS_CPP_BUILTINS.
18388         (LINK_ARCH32_SPEC): Change LINUX_DYNAMIC_LINKER32 to
18389         GNU_USER_DYNAMIC_LINKER32.
18390         (LINK_ARCH64_SPEC): Change LINUX_DYNAMIC_LINKER64 to
18391         GNU_USER_DYNAMIC_LINKER64.
18392         (LINK_SPEC): Change LINUX_DYNAMIC_LINKER64 to
18393         GNU_USER_DYNAMIC_LINKER64.
18394         * config/vax/linux.h (TARGET_OS_CPP_BUILTINS): Change
18395         LINUX_TARGET_OS_CPP_BUILTINS to GNU_USER_TARGET_OS_CPP_BUILTINS.
18396         * config/xtensa/linux.h (TARGET_OS_CPP_BUILTINS): Change
18397         LINUX_TARGET_OS_CPP_BUILTINS to GNU_USER_TARGET_OS_CPP_BUILTINS.
18398         (LINK_SPEC): Change LINUX_DYNAMIC_LINKER to GNU_USER_DYNAMIC_LINKER.
18399
18400 2011-04-11  Joseph Myers  <joseph@codesourcery.com>
18401
18402         * config/i386/gnu-user.h: Copy from linux.h.  Update comments.
18403         (LINK_EMULATION, GLIBC_DYNAMIC_LINKER): Remove.
18404         (SUBTARGET_EXTRA_SPECS): Use GNU_USER_LINK_EMULATION and
18405         GNU_USER_DYNAMIC_LINKER.
18406         (MD_UNWIND_SUPPORT, REG_NAME): Remove.
18407         * config/i386/gnu-user64.h: Copy from linux64.h.  Update comments.
18408         (GLIBC_DYNAMIC_LINKER32, GLIBC_DYNAMIC_LINKER64): Remove.
18409         (LINK_SPEC): Use GNU_USER_DYNAMIC_LINKER32 and
18410         GNU_USER_DYNAMIC_LINKER64.
18411         (MD_UNWIND_SUPPORT, REG_NAME): Remove.
18412         * config/i386/kfreebsd-gnu.h (LINK_EMULATION): Change to
18413         GNU_USER_LINK_EMULATION.
18414         * config/i386/linux.h (TARGET_ASM_FILE_START_FILE_DIRECTIVE,
18415         DEFAULT_PCC_STRUCT_RETURN, TARGET_TLS_DIRECT_SEG_REFS_DEFAULT,
18416         ASM_COMMENT_START, DBX_REGISTER_NUMBER, NO_PROFILE_COUNTERS,
18417         MCOUNT_NAME, SUBTARGET_FRAME_POINTER_REQUIRED, SIZE_TYPE,
18418         PTRDIFF_TYPE, WCHAR_TYPE, WCHAR_TYPE_SIZE, TARGET_OS_CPP_BUILTINS,
18419         CPP_SPEC, CC1_SPEC): Remove.
18420         (LINK_EMULATION): Change to GNU_USER_LINK_EMULATION.
18421         (GNU_USER_DYNAMIC_LINKER): Define.
18422         (ASM_SPEC, SUBTARGET_EXTRA_SPECS, LINK_SPEC, ENDFILE_SPEC,
18423         ASM_OUTPUT_ALIGNED_BSS, ASM_OUTPUT_MAX_SKIP_ALIGN,
18424         ASM_MAYBE_OUTPUT_ENCODED_ADDR_RTX, CRT_GET_RFIB_DATA,
18425         LIBGCC2_HAS_TF_MODE, LIBGCC2_TF_CEXT, TF_SIZE,
18426         TARGET_ASM_FILE_END, STACK_CHECK_MOVING_SP,
18427         STACK_CHECK_STATIC_BUILTIN, TARGET_THREAD_SSP_OFFSET,
18428         TARGET_CAN_SPLIT_STACK, TARGET_THREAD_SPLIT_STACK_OFFSET): Remove.
18429         * config/i386/linux64.h (TARGET_OS_CPP_BUILTINS, CPP_SPEC,
18430         CC1_SPEC, DEFAULT_PCC_STRUCT_RETURN,
18431         TARGET_TLS_DIRECT_SEG_REFS_DEFAULT, SPEC_32, SPEC_64, ASM_SPEC,
18432         LINK_SPEC, ENDFILE_SPEC, MULTILIB_DEFAULTS, LIBGCC2_HAS_TF_MODE,
18433         LIBGCC2_TF_CEXT, TF_SIZE, TARGET_ASM_FILE_END): Remove.
18434         (GNU_USER_DYNAMIC_LINKER32, GNU_USER_DYNAMIC_LINKER64): Define.
18435         (STACK_CHECK_MOVING_SP, STACK_CHECK_STATIC_BUILTIN,
18436         TARGET_THREAD_SSP_OFFSET, TARGET_CAN_SPLIT_STACK,
18437         TARGET_THREAD_SPLIT_STACK_OFFSET): Remove.
18438         * config/i386/gnu.h (GLIBC_DYNAMIC_LINKER): Change to
18439         GNU_USER_DYNAMIC_LINKER.
18440         * config/kfreebsd-gnu.h (GLIBC_DYNAMIC_LINKER): Change to
18441         GNU_USER_DYNAMIC_LINKER.  Unconditionally undefine and redefine.
18442         * config/knetbsd-gnu.h (GLIBC_DYNAMIC_LINKER): Change to
18443         GNU_USER_DYNAMIC_LINKER.  Unconditionally undefine and redefine.
18444         * config/kopensolaris-gnu.h (GLIBC_DYNAMIC_LINKER): Change to
18445         GNU_USER_DYNAMIC_LINKER.  Unconditionally undefine and redefine.
18446         * config.gcc (i[34567]86-*-linux* | i[34567]86-*-kfreebsd*-gnu |
18447         i[34567]86-*-knetbsd*-gnu | i[34567]86-*-gnu* |
18448         i[34567]86-*-kopensolaris*-gnu, x86_64-*-linux* |
18449         x86_64-*-kfreebsd*-gnu | x86_64-*-knetbsd*-gnu): Use the new headers.
18450
18451 2011-04-11  Kai Tietz  <ktietz@redhat.com>
18452
18453         PR target/9601
18454         PR target/11772
18455         * config/i386/i386-protos.h (ix86_get_callcvt): New prototype.
18456         * config/i386/i386.c (ix86_handle_cconv_attribute): Adjust
18457         comment.
18458         (ix86_is_msabi_thiscall): Removed.
18459         (ix86_is_type_thiscall): Likewise.
18460         (ix86_get_callcvt): New function.
18461         (ix86_comp_type_attributes): Simplify check.
18462         (ix86_function_regparm): Use ix86_get_callcvt for calling
18463         convention attribute checks.
18464         (ix86_return_pops_args): Likewise.
18465         (ix86_static_chain): Likewise.
18466         (x86_this_parameter): Likewise.
18467         (x86_output_mi_thunk): Likewise.
18468         (ix86_function_type_abi): Optimize check for types without attributes.
18469         * config/i386/i386.h (IX86_CALLCVT_CDECL, IX86_CALLCVT_STDCALL,
18470         IX86_CALLCVT_FASTCALL, IX86_CALLCVT_THISCALL, IX86_CALLCVT_REGPARM,
18471         IX86_CALLCVT_SSEREGPARM): New macros to represent calling convention
18472         by flag-values.
18473         (IX86_BASE_CALLCVT): Helper macro.
18474         * config/i386/netware.c (i386_nlm_maybe_mangle_decl_assembler_name):
18475         Use ix86_get_callcvt for calling convention attribute checks and avoid
18476         symbol-decoration for stdcall in TARGET_RTD case.
18477         * config/i386/winnt.c (i386_pe_maybe_mangle_decl_assembler_name):
18478         Likewise.
18479         (gen_stdcall_or_fastcall_suffix): Adjust ident and use DECL_ORIGIN
18480         for declaration.
18481
18482 2011-04-11  Uros Bizjak  <ubizjak@gmail.com>
18483
18484         * config/i386/sse.md (VI_128): New mode iterator.
18485         (VI12_128): Rename from SSEMODE12.
18486         (VI14_128): Rename from SSEMODE14.
18487         (VI124_128): New mode iterator.
18488         (VI24_128): Rename from SSEMODE248.
18489         (VI248_128): Rename from SSEMODE248.
18490         (SSEMODE124C8): Remove.
18491         (*<plusminus_insn><mode>3): Merge with *avx_<plusminus_insn><mode>3.
18492         (*sse2_<plusminus_insn><mode>3): Merge with
18493         *avx_<plusminus_insn><mode>3.
18494         (*mulv8hi3): Merge with *avx_mulv8hi3.
18495         (*<s>mulv8hi3_highpart): Merge with *avx_<s>mulv8hi3_highpart.
18496         (*sse2_umulv2siv2di3): Merge with *avx_umulv2siv2di3.
18497         (*sse2_pmaddwd): Merge with *avx_pmaddwd.
18498         (*sse4_1_mulv4si3): Merge with *avx_mulv4si3.
18499         (ashr<mode>3): Merge with *avx_ashr<mode>3.
18500         (lshr<mode>3): Merge with *avx_lshr<mode>3.
18501         (ashl<mode>3): Merge with *avx_ashl<mode>3.
18502         (sse2_ashlv1ti3): Merge with *avx_ashlv1ti3.
18503         (sse2_lshrv1ti3): Merge with *avx_lshrv1ti3.
18504         (*sse4_1_<smaxmin:code><mode>3): Merge with *avx_<smaxmin:code><mode>3.
18505         (*<smaxmin:code>v8hi3): Ditto.
18506         (*sse4_1_<umaxmin:code><mode>3): Merge with *avx_<umaxmin:code><mode>3.
18507         (*<smaxmin:code>v16qi3): Ditto.
18508         (*sse4_1_eqv2di3): Merge with *avx_eq<mode>3.
18509         (*sse2_eq<mode>3): Ditto.
18510         (*sse4_2_eqv2di3): Merge with *avx_gt<mode>3.
18511         (*sse2_gt<mode>3): Ditto.
18512         (vcondv2di): Split out of vcond<mode>.
18513         (vconduv2di): Split out of vcondu<mode>.
18514
18515 2011-04-11  Richard Guenther  <rguenther@suse.de>
18516
18517         * gimplify.c (gimple_fold_indirect_ref): Check host_integerp
18518         before calling tree_low_cst.
18519
18520 2011-04-11  Richard Guenther  <rguenther@suse.de>
18521
18522         * stor-layout.c (layout_type): Compute all array index size operations
18523         in the original type.
18524         (initialize_sizetypes): Add comment.
18525         (set_sizetype): Do not set TREE_TYPE of a TREE_VEC.
18526
18527 2011-04-11  Joseph Myers  <joseph@codesourcery.com>
18528
18529         * common.opt (Tbss=, Tdata=, Ttext=): New options.
18530
18531 2011-04-11  Martin Jambor  <mjambor@suse.cz>
18532
18533         * cgraph.c (cgraph_local_info): Call cgraph_get_node instead
18534         of cgraph_node, handle NULL return value.
18535         (cgraph_global_info): Likewise.
18536         (cgraph_rtl_info): Likewise.
18537         * tree-inline.c (estimate_num_insns): Likewise.
18538         * gimplify.c (unshare_body): Likewise.
18539         (unvisit_body): Likewise.
18540         (gimplify_body): Likewise.
18541         * predict.c (optimize_function_for_size_p): Likewise.
18542         * tree-ssa-alias.c (ref_maybe_used_by_call_p_1): Likewise.
18543         (call_may_clobber_ref_p_1): Likewise.
18544         * varasm.c (function_section_1): Likewise.
18545         (assemble_start_function): Likewise.
18546
18547 2011-04-11  Martin Jambor  <mjambor@suse.cz>
18548
18549         * except.c (set_nothrow_function_flags): Call cgraph_get_node instead
18550         of cgraph_node.
18551         * final.c (rest_of_clean_state): Likewise.
18552         * gimple-iterator.c (update_call_edge_frequencies): Likewise.
18553         * passes.c (pass_init_dump_file): Likewise.
18554         (execute_all_ipa_transforms): Likewise.
18555         (function_called_by_processed_nodes_p): Likewise.
18556         * predict.c (maybe_hot_frequency_p): Likewise.
18557         (probably_never_executed_bb_p): Likewise.
18558         (compute_function_frequency): Likewise.
18559         * tree-nested.c (check_for_nested_with_variably_modified): Likewise.
18560         (unnest_nesting_tree_1): Likewise.
18561         (lower_nested_functions): Likewise.
18562         * tree-optimize.c (execute_fixup_cfg): Likewise.
18563         (tree_rest_of_compilation): Likewise.
18564         * tree-profile.c (gimple_gen_ic_func_profiler): Likewise.
18565         * tree-sra.c (ipa_early_sra): Likewise.
18566         * tree-ssa-loop-ivopts.c (computation_cost): Likewise.
18567         * config/i386/i386.c (ix86_compute_frame_layout): Likewise.
18568         * ipa.c (record_cdtor_fn): Likewise.
18569         * ipa-inline.c (cgraph_early_inlining): Likewise.
18570         (compute_inline_parameters_for_current): Likewise.
18571         * ipa-prop.c (ipa_make_edge_direct_to_target): Likewise.
18572         * ipa-pure-const.c (local_pure_const): Likewise.
18573         * ipa-split.c (split_function): Likewise.
18574         (execute_split_functions): Likewise.
18575         * cgraphbuild.c (build_cgraph_edges): Likewise.
18576         (rebuild_cgraph_edges): Likewise.
18577         (cgraph_rebuild_references): Likewise.
18578         (remove_cgraph_callee_edges): Likewise.
18579         * cgraphunit.c (cgraph_mark_if_needed): Likewise.
18580         (verify_cgraph_node): Likewise.
18581         (cgraph_analyze_functions): Likewise.
18582         (cgraph_preserve_function_body_p): Likewise.
18583         (save_inline_function_body): Likewise.
18584         (save_inline_function_body): Likewise.
18585         * tree-inline.c (copy_bb): Likewise.
18586         (optimize_inline_calls): Likewise.
18587
18588 2011-04-11  Martin Jambor  <mjambor@suse.cz>
18589
18590         PR tree-optimization/48195
18591         * ipa-cp.c (ipcp_driver): Call ipa_check_create_node_params and
18592         ipa_check_create_edge_args.
18593         (ipcp_generate_summary): Do not call ipa_check_create_node_params and
18594         ipa_check_create_edge_args.
18595         * ipa-inline.c (inline_generate_summary): Do not call
18596         ipa_check_create_node_params and ipa_check_create_edge_args.
18597         * ipa-prop.c (ipa_analyze_node): Call ipa_check_create_node_params and
18598         ipa_check_create_edge_args.
18599
18600 2011-04-09  Anatoly Sokolov  <aesok@post.ru>
18601
18602         * expr.c (expand_expr_real_1): Use add_to_hard_reg_set function
18603         instead of loop.
18604         * sel-sched.c (mark_unavailable_hard_regs): Likewise.
18605         * function.c (record_hard_reg_sets): Likewise.
18606         * ira.c (compute_regs_asm_clobbered): Likewise.
18607         * sched-deps.c (sched_analyze_1): Likewise.
18608         * reload1.c (mark_reload_reg_in_use, choose_reload_regs): Likewise.
18609
18610 2011-04-09  Xinliang David Li  <davidxl@google.com>
18611
18612         PR tree-optimization/PR48484
18613         * tree-ssa-uninit.c (convert_control_dep_chain_into_preds): Set
18614         has_valid_pred lazily
18615
18616 2011-04-09  Duncan Sands  <baldrick@free.fr>
18617
18618         * tree.c (array_type_nelts): Bail out if TYPE_MAX_VALUE not set.
18619
18620 2011-04-08  Eric Botcazou  <ebotcazou@adacore.com>
18621
18622         * combine.c (combine_validate_cost): Adjust comments.  Set registered
18623         cost of I0 to zero at the end, if any.
18624
18625 2011-04-08  Xinliang David Li  <davidxl@google.com>
18626
18627         * ipa-cp.c (ipcp_update_profiling): Correct negative scale factor due
18628         to insane profile data.
18629
18630 2011-04-08  Xinliang David Li  <davidxl@google.com>
18631
18632         * ipa-cp.c (ipcp_update_profiling): Correct
18633          negative scale factor due to insane profile data.
18634
18635 2011-04-08  Xinliang David Li  <davidxl@google.com>
18636
18637         * final.c (dump_basic_block_info): New function.
18638         (final): Dump basic block.
18639         (final_scan_insn): Remove old dump.
18640
18641 2011-04-08  Steven G. Kargl  <kargl@gcc.gnu.org>
18642
18643         PR target/47829
18644         * config.gcc (i386-*-freebsd): Disable unwind table generation for
18645         crtbegin/crtend.
18646
18647 2011-04-08  Michael Matz  <matz@suse.de>
18648
18649         PR middle-end/48389
18650         * jump.c (rebuild_jump_labels_1, rebuild_jump_labels_chain): New
18651         functions.
18652         (rebuild_jump_labels): Call rebuild_jump_labels_1.
18653         * rtl.h (rebuild_jump_labels_chain): Declare.
18654         * cfgexpand.c (gimple_expand_cfg): Initialize JUMP_LABEL also on
18655         insns inserted on edges.
18656
18657 2011-04-08  Joseph Myers  <joseph@codesourcery.com>
18658
18659         * config.gcc (arm*-*-*): Add arm/arm-tables.opt to extra_options.
18660         * config/arm/arm-arches.def: New.
18661         * config/arm/arm-opts.h: New.
18662         * config/arm/genopt.sh: New.
18663         * config/arm/arm-tables.opt: New (generated).
18664         * config/arm/arm.c (arm_handle_option, arm_target_help,
18665         TARGET_HANDLE_OPTION, TARGET_HELP, arm_find_cpu): Remove.
18666         (all_architectures): Get most table contents from arm-arches.def.
18667         (arm_option_override): Set arm_selected_arch, arm_selected_cpu and
18668         arm_selected_tune here.
18669         * config/arm/arm.h (enum processor_type): Move to arm-opts.h.
18670         * config/arm/arm.opt (config/arm/arm-opts.h): New HeaderInclude.
18671         (march=, mcpu=, mtune=): Use Enum and Var.
18672         * config/arm/t-arm ($(srcdir)/config/arm/arm-tables.opt): New.
18673         (arm.o): Update dependencies.
18674
18675 2011-04-08  Basile Starynkevitch  <basile@starynkevitch.net>
18676
18677         * gengtype.c (write_typed_alloc_def): New argument f. Use it instead
18678         of header_file.
18679         (write_typed_struct_alloc_def, write_typed_typedef_alloc_def)
18680         (write_typed_alloc_defns): Likewise.
18681         (main): Calls write_typed_alloc_defns with output_header.
18682
18683 2011-04-08  Vladimir Makarov  <vmakarov@redhat.com>
18684
18685         PR inline-asm/48435
18686         * ira-color.c (setup_profitable_hard_regs): Add comments.
18687         Don't take prohibited hard regs into account.
18688         (setup_conflict_profitable_regs): Rename to
18689         get_conflict_profitable_regs.
18690         (check_hard_reg_p): Check prohibited hard regs.
18691
18692 2011-04-08  Nathan Froyd  <froydnj@codesourcery.com>
18693
18694         * config/alpha/alpha.c (alpha_emit_xfloating_libcall): Call use_reg.
18695         * config/xtensa/xtensa.c (xtensa_call_tls_desc): Likewise.
18696         * config/sparc/sparc.c (sparc_legitimize_tls_address): Likewise.
18697
18698 2011-04-08  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
18699
18700         PR target/48366
18701         * config/pa/pa.c (hppa_register_move_cost): Increase to 18 cost of
18702         move from floating point to shift amount register.
18703         (emit_move_sequence): Remove secondary reload support for floating
18704         point to shift amount amount register copies.
18705         (pa_secondary_reload): Return GENERAL_REGS for floating point/shift
18706         amount register copies.
18707         * config/pa/pa32-regs.h (HARD_REGNO_MODE_OK): For shift amount
18708         register, return false if mode isn't a scalar integer mode.
18709         * config/pa/pa64-regs.h (HARD_REGNO_MODE_OK): Likewise.
18710
18711 2011-04-08  Richard Guenther  <rguenther@suse.de>
18712
18713         * gimple.c (gimple_call_flags): Remove kludge.
18714
18715 2011-04-08  Alexander Monakov  <amonakov@ispras.ru>
18716
18717         * sel-sched.c (sel_region_init): Move call to
18718         sel_setup_region_sched_flags after setup_current_loop_nest.
18719
18720 2011-04-08  Andrey Belevantsev  <abel@ispras.ru>
18721
18722         PR rtl-optimization/48272
18723         * sched-deps.c (setup_insn_reg_pressure_info): Export and rename to
18724         init_insn_reg_pressure_info.  Adjust a caller.
18725         * sched-int.h (init_insn_reg_pressure_info): Declare.
18726         * haifa-sched.c (haifa_init_insn): Call init_insn_reg_pressure_info
18727         when sched-pressure is enabled.
18728
18729 2011-04-08  Richard Guenther  <rguenther@suse.de>
18730
18731         * gimple.c (gimple_set_modified): Do not queue calls to
18732         MODIFIED_NORETURN_CALLS here ...
18733         * tree-ssa-operands.c (update_stmt_operands): ... but here.
18734
18735 2011-04-08  Richard Guenther  <rguenther@suse.de>
18736
18737         PR lto/48467
18738         * toplev.c (lang_dependent_init): Do not open asm_out_file
18739         in WPA mode, nor perform debug machinery initialization.
18740         (finalize): Do not unlink asm_out_file in WPA mode.
18741
18742 2011-04-08  Richard Guenther  <rguenther@suse.de>
18743
18744         * gimple.h (gimple_call_fntype): New function.
18745         (gimple_call_return_type): Use it.
18746         * expr.c (expand_expr_real_1): Use gimple_call_fntype.
18747         * gimple-low.c (gimple_check_call_args): Likewise.
18748         * gimple.c (gimple_call_flags): Likewise.
18749         (gimple_call_arg_flags): Likewise.
18750         (gimple_call_return_flags): Likewise.
18751         * tree-cfg.c (verify_gimple_call): Likewise.
18752         (do_warn_unused_result): Likewise.
18753         * tree-ssa-ccp.c (ccp_fold_stmt): Likewise.
18754         * value-prof.c (gimple_ic_transform): Fix fndecl check.
18755
18756 2011-04-08  Dmitry Melnik  <dm@ispras.ru>
18757
18758         PR rtl-optimization/48235
18759         * sel-sched.c (code_motion_process_successors): Recompute the last
18760         insn in basic block if control flow changed.
18761         (code_motion_path_driver): Ditto.  Recompute the first insn as well.
18762         Update condition for ilist_remove.
18763
18764 2011-04-08  Alexander Monakov  <amonakov@ispras.ru>
18765
18766         PR rtl-optimization/48302
18767         * sel-sched-ir.h (sel_add_loop_preheaders): Update prototype.
18768         * sel-sched-ir.c (sel_add_loop_preheaders): Add 'bbs' argument.  Use
18769         it to record added preheader blocks.
18770         * sel-sched.c (setup_current_loop_nest): Add 'bbs' argument.  Pass it
18771         on to sel_add_loop_preheaders.
18772         (sel_region_init): Move call to setup_current_loop_nest after
18773         sel_init_bbs.
18774
18775 2011-04-08  Alexander Monakov  <amonakov@ispras.ru>
18776
18777         PR target/48273
18778         * cfgloop.h (loop_has_exit_edges): New helper.
18779         * sel-sched-ir.c (init_global_and_expr_for_insn): Make CALLs
18780         non-clonable.
18781         * sel-sched.c (sel_setup_region_sched_flags): Don't pipeline loops
18782         that have no exit edges.
18783
18784 2011-04-08  Alexander Monakov  <amonakov@ispras.ru>
18785
18786         PR rtl-optimization/48442
18787         * sel-sched.c (init_seqno): Remove number_of_insns argument.  Update
18788         all callers.  Adjust assert.
18789
18790 2011-04-08  Jakub Jelinek  <jakub@redhat.com>
18791
18792         PR tree-optimization/48377
18793         * tree-vect-data-refs.c (vector_alignment_reachable_p): Set
18794         is_packed to true even for types with smaller TYPE_ALIGN than
18795         TYPE_SIZE.
18796
18797 2011-04-08  Richard Guenther  <rguenther@suse.de>
18798
18799         PR bootstrap/48513
18800         * doc/tm.texi: Re-generate.
18801
18802 2011-04-08  Wei Guozhi  <carrot@google.com>
18803
18804         PR target/47855
18805         * config/arm/arm-protos.h (arm_attr_length_push_multi): New prototype.
18806         * config/arm/arm.c (arm_attr_length_push_multi): New function.
18807         * config/arm/arm.md (*push_multi): Change the length computation to
18808         call a C function.
18809
18810 2011-04-08  Anatoly Sokolov  <aesok@post.ru>
18811
18812         * doc/tm.texi.in (ASM_OUTPUT_BSS): Remove documentation.
18813         (BSS_SECTION_ASM_OP, ASM_OUTPUT_ALIGNED_BSS): Update documentation.
18814         * doc/tm.texi: Regenerate.
18815         * system.h (ASM_OUTPUT_BSS): Poison.
18816         * varasm.c (asm_output_bss): Remove function.
18817         (emit_bss, init_varasm_once): Don't use ASM_OUTPUT_BSS macro.
18818
18819         * config/frv/frv.h (BSS_SECTION_ASM_OP): Remove comment.
18820         * config/frv/fr30.h (BSS_SECTION_ASM_OP): Likewise.
18821         * config/i386/djgpp.h (BSS_SECTION_ASM_OP): Likewise.
18822         * config/i386/i386elf.h (BSS_SECTION_ASM_OP, ASM_OUTPUT_ALIGNED_BSS):
18823         Likewise.
18824         * config/sh/sh.h (BSS_SECTION_ASM_OP, ASM_OUTPUT_ALIGNED_BSS):
18825         Likewise.
18826         * config/m68k/m68kelf.h (BSS_SECTION_ASM_OP, ASM_OUTPUT_ALIGNED_BSS):
18827         Likewise.
18828         * config/m68k/netbsd-elf.h (ASM_OUTPUT_ALIGNED_BSS): Likewise.
18829
18830 2011-04-07  Joseph Myers  <joseph@codesourcery.com>
18831
18832         * config/rx/rx.opt (rx610, rx200, rx600): Use Enum not Name on
18833         EnumValue lines.
18834
18835 2011-04-07  Joseph Myers  <joseph@codesourcery.com>
18836
18837         * config/m68k/m68k.c (m68k_handle_option): Don't handle
18838         OPT_m68000, OPT_mc68000, OPT_m68010, OPT_m68020, OPT_mc68020,
18839         OPT_m68030, OPT_m68040, OPT_m68060, OPT_m68302, OPT_m68332 and
18840         OPT_mcpu32.
18841         * config/m68k/m68k.h (OPTION_DEFAULT_SPECS, ASM_CPU_SPEC): Don't
18842         handle -mc68000, -m68000, -m68302, -m68010, -mc68020, -m68020,
18843         -m68030, -m68040, -m68060, -mcpu32 and -m68332.
18844         * config/m68k/m68k.opt (m68000, m68010, m68020, m68030, m68040,
18845         m68060, m68302, m68332, mc68000, mc68020, mcpu32): Use Alias.
18846         * config/m68k/t-mlibs (CANONICALIZE_OPTIONS): Remove.
18847         (MULTILIB_OPTIONS): Don't use $(CANONICALIZE_OPTIONS).
18848         (MULTILIB_MATCHES): Map -march= options to corresponding -mcpu=
18849         options.  Don't map other m68k options manually.  Don't handle
18850         old-style options as canonical.
18851         (MULTILIB_EXCEPTIONS): Don't use $(CANONICALIZE_OPTIONS).
18852         * doc/install.texi (m68k-*-*): Document binutils version requirement.
18853
18854 2011-04-07  Eric Botcazou  <ebotcazou@adacore.com>
18855
18856         * basic-block.h (force_nonfallthru): Move to...
18857         * cfghooks.h (struct cfg_hooks): Add force_nonfallthru hook.
18858         (force_nonfallthru): ...here.
18859         * cfghooks.c (force_nonfallthru): New function.
18860         * cfgrtl.c (force_nonfallthru): Rename into...
18861         (rtl_force_nonfallthru): ...this.
18862         (commit_one_edge_insertion): Do not set AUX field.
18863         (commit_edge_insertions): Do not discover new basic blocks.
18864         (rtl_cfg_hooks): Add rtl_force_nonfallthru.
18865         (cfg_layout_rtl_cfg_hooks): Likewise.
18866         * function.c (thread_prologue_and_epilogue_insns): Remove bogus
18867         ATTRIBUTE_UNUSED.  Discover new basic blocks in the prologue insns.
18868         * tree-cfg.c (gimple_cfg_hooks): Add NULL for force_nonfallthru.
18869
18870 2011-04-07  Anatoly Sokolov  <aesok@post.ru>
18871
18872         * config/mips/mips.h (REG_MODE_OK_FOR_BASE_P, REG_OK_FOR_INDEX_P):
18873         Remove macros.
18874
18875 2011-04-07  Uros Bizjak  <ubizjak@gmail.com>
18876
18877         * config/i386/sse.md: Update copyright year.
18878         (avxcvtvecmode): Remove.
18879         (sse_movhlps): Merge with *avx_movhlps.
18880         (sse_movlhps): Merge with *avx_movlhps.
18881         (vec_interleave_highv4sf): Merge with *avx_interleave_highv4sf.
18882         (vec_interleave_lowv4sf): Merge with *avx_interleave_lowv4sf.
18883         (sse_shufps_<mode>): Merge with *avx_shufps_<mode>.
18884         (sse_loadhps): Merge with *avx_loadhps.
18885         (sse_storelps): Merge with *avx_storelps.
18886         (sse_loadlps): Merge with *avx_loadlps.
18887         (sse_movss): Merge with *avx_movss.
18888         (*vec_concatv2sf_sse4_1): Merge with *vec_concatv2sf_avx.
18889         (*vec_concatv4sf_sse): Merge with *vec_concatv4sf_avx.
18890         (*vec_set<mode>_0_sse4_1): Merge with *vec_set<mode>_0_avx.
18891         (*vec_set<mode>_0_sse2): Split multi-unit alternative.
18892         (vec_set<mode>_0): Ditto.
18893         (*vec_setv4sf_sse4_1): Merge with *vec_setv4sf_avx.
18894         (sse4_1_insertps): Merge with *avx_insertps.
18895         (*sse3_interleave_highv2df): Merge with *avx_interleave_highv2df.
18896         (*sse3_interleave_lowv2df): Merge with *avx_interleave_lowv2df.
18897         (vec_interleave_highv2di): Merge with *avx_interleave_highv2di.
18898         (sse2_shufpd_<mode>): Merge with *avx_shufpd_<mode>.
18899         (sse2_storehpd): Merge with *avx_storehpd.
18900         (sse2_loadhpd): Merge with *avx_loadhpd.
18901         (sse2_loadlpd): Merge with *avx_loadlpd.
18902         (sse2_movsd): Merge with *avx_movsd.
18903         (*vec_concatv2df): Merge with *vec_concatv2df.
18904
18905 2011-04-07  Jakub Jelinek  <jakub@redhat.com>
18906
18907         PR debug/48343
18908         * combine.c (combine_instructions): Add last_combined_insn,
18909         update it if insn is after it, pass it to all try_combine calls.
18910         (try_combine): Add last_combined_insn parameter, pass it instead of
18911         i3 to propagate_for_debug.
18912
18913 2011-04-07  Nick Clifton  <nickc@redhat.com>
18914
18915         * config/mn10300/mn10300.md (movqi_internal): Add alternatives
18916         to handle MDR <-> data register transfers.
18917         (movhi_internal): Likewise.
18918
18919 2011-04-07  Alan Modra  <amodra@gmail.com>
18920
18921         * config/rs6000/rs6000.c (rs6000_stack_info): Don't compare against
18922         previous stack info.
18923
18924 2011-04-07  Tom de Vries  <tom@codesourcery.com>
18925
18926         PR target/43920
18927         * cfgcleanup.c (try_crossjump_to_edge): Add dir parameter.  Pass dir to
18928         flow_find_cross_jump.  Swap variables to implement backward replacement.
18929         (try_crossjump_bb): Add argument to try_crossjump_to_edge.
18930
18931 2011-04-07  Tom de Vries  <tom@codesourcery.com>
18932
18933         PR target/43920
18934         * cfgcleanup.c (walk_to_nondebug_insn): New function.
18935         (flow_find_cross_jump): Use walk_to_nondebug_insn.  Recalculate bb1
18936         and bb2.
18937         (try_crossjump_to_edge): Handle case that newpos1 or newpos2 is not
18938         src1 or src2.  Redirect edges to the last basic block.  Update
18939         frequency and count on multiple basic blocks in case of fallthru.
18940
18941 2011-04-07  Tom de Vries  <tom@codesourcery.com>
18942
18943         PR target/43920
18944         * cfgcleanup.c (equal_different_set_p, can_replace_by, merge_dir): New
18945         function.
18946         (old_insns_match_p): Change return type.  Replace return false/true
18947         with return dir_none/dir_both.  Use can_replace_by.
18948         (flow_find_cross_jump): Add dir_p parameter.  Init replacement
18949         direction from dir_p.  Register replacement direction in dir, last_dir
18950         and afterlast_dir.  Handle new return type of old_insns_match_p using
18951         merge_dir.  Return replacement direction in dir_p.
18952         (flow_find_head_matching_sequence, outgoing_edges_match): Handle new
18953         return type of old_insns_match_p.
18954         (try_crossjump_to_edge): Add argument to call to flow_find_cross_jump.
18955         * ifcvt.c ( cond_exec_process_if_block): Add argument to call to
18956         flow_find_cross_jump.
18957         * basic-block.h (enum replace_direction): New type.
18958         (flow_find_cross_jump): Add parameter to declaration.
18959
18960 2011-04-06  Uros Bizjak  <ubizjak@gmail.com>
18961
18962         * config/i386/sse.md (AVXMODEDCVTDQ2PS): Remove.
18963         (AVXMODEDCVTPS2DQ): Ditto.
18964         (VEC_FLOAT_MODE): Ditto.
18965         (<sse>_andnot<mode>3): Merge with avx_andnot<mode>3.  Use VF mode
18966         iterator.  Handle TARGET_SSE_PACKED_SINGLE_INSN_OPTIMAL target flag.
18967         (<any_logic:code><mode>3): Use VF mode iterator.
18968         (*<any_logic:code><mode>3): Merge with *avx_<any_logic:code><mode>3.
18969         Use VF mode iterator.
18970         (copysign<mode>3): Use VF mode iterator.
18971         (*andnot<MODEF:mode>3): Merge with *avx_andnot<MODEF:mode>3.  Handle
18972         TARGET_SSE_PACKED_SINGLE_INSN_OPTIMAL target flag.
18973         (*<any_logic:code><MODEF:mode>3): Merge with
18974         *avx_<any_logic:code><MODEF:mode>3.
18975         (sse_cvtsi2ss): Merge with *avx_cvtsi2ss.
18976         (sse_cvtsi2ssq): Merge with *avx_cvtsi2ssq.
18977         (avx_cvtdq2ps256): Split from avx_cvtdq2ps<avxmodesuffix>.
18978         (avx_cvtdq2ps<avxmodesuffix>): Remove.
18979         (sse2_cvtdq2ps): Use %v modifier.
18980         (avx_cvtps2dq256): Split from avx_cvtps2dq<avxmodesuffix>.
18981         (avx_cvtps2dq<avxmodesuffix>): Remove.
18982         (sse2_cvtps2dq): Use %v modifier.
18983         (avx_cvttps2dq256): Split from avx_cvttps2dq<avxmodesuffix>.
18984         (avx_cvttps2dq<avxmodesuffix>): Remove.
18985         (sse2_cvttps2dq): Use %v modifier.
18986         (sse2_cvtsi2sd): Merge with *avx_cvtsi2sd.
18987         (sse2_cvtsi2sdq): Merge with *avx_cvtsi2sdq.
18988         (sse2_cvtsd2siq): Fix insn template.
18989         (sse2_cvtsd2siq_2): Ditto.
18990         (sse2_cvttsd2siq): Ditto.
18991         (sse2_cvtsd2ss): Merge with *avx_cvtsd2ss.
18992         (sse2_cvtss2sd): Merge with *avx_cvtss2sd.
18993
18994 2011-04-06  Joseph Myers  <joseph@codesourcery.com>
18995
18996         * gcov-io.c: Use GCC Runtime Library Exception.
18997
18998 2011-04-06  Jakub Jelinek  <jakub@redhat.com>
18999
19000         PR debug/48466
19001         * dwarf2out.c (based_loc_descr): If drap_reg is INVALID_REGNUM, use
19002         as base_reg whatever register reg has been eliminated to, instead
19003         of hardcoding STACK_POINTER_REGNUM.
19004
19005 2011-04-06  Joseph Myers  <joseph@codesourcery.com>
19006
19007         * doc/tm.texi.in: Document C target hooks as separate from general
19008         target hooks.
19009         * doc/tm.texi: Regenerate.
19010         * genhooks.c (struct hook_desc): Add docname field.
19011         (HOOK_VECTOR_1, DEFHOOKPOD, DEFHOOK, DEFHOOK_UNDOC).  Initialize
19012         docname field.
19013         (hook_array): Include c-target.def.
19014         (emit_documentation): Use docname field in output.
19015         (emit_init_macros): Take docname argument.  Only emit definitions
19016         for hooks matching docname.
19017         (main): Expect additional arguments in all cases.  Pass argument
19018         to emit_init_macros.
19019         * target.def: Move initial macro definitions and comments to
19020         target-hooks-macros.h.
19021         (gcc_targetcm): Move to c-family/c-target.def.
19022         * target.h (targetcm): Move declaration to c-family/c-target.h.
19023         * targhooks.c (default_handle_c_option): Move to
19024         c-family/c-opts.c.
19025         * targhooks.h (default_handle_c_option): Move declaration to
19026         c-family/c-common.h.
19027         * target-hooks-macros.h: New file.
19028         * config.gcc (target_has_targetcm): Define and use to add to
19029         c_target_objs and cxx_target_objs.
19030         * config/default-c.c: New file.
19031         * config/darwin-c.c: Include c-target.h and c-target-def.h instead
19032         of target.h and target-def.h.
19033         (TARGET_HANDLE_C_OPTION, targetcm): Define later in file.
19034         (darwin_objc_construct_string, darwin_cfstring_ref_p,
19035         darwin_check_cfstring_format_arg): Make static.
19036         (TARGET_OBJC_CONSTRUCT_STRING_OBJECT,
19037         TARGET_STRING_OBJECT_REF_TYPE_P,
19038         TARGET_CHECK_STRING_OBJECT_FORMAT_ARG): Define here.
19039         * config/darwin-protos.h (darwin_objc_construct_string,
19040         darwin_cfstring_ref_p, darwin_check_cfstring_format_arg): Don't
19041         declare.
19042         * config/darwin.h (TARGET_OBJC_CONSTRUCT_STRING_OBJECT,
19043         TARGET_STRING_OBJECT_REF_TYPE_P,
19044         TARGET_CHECK_STRING_OBJECT_FORMAT_ARG, TARGET_HAS_TARGETCM): Remove.
19045         * config/t-darwin (darwin-c.o): Update dependencies.
19046         * system.h (TARGET_HAS_TARGETCM): Poison.
19047         * Makefile.in (TARGET_H): Update.
19048         (TARGET_DEF, C_TARGET_DEF, C_TARGET_H, C_TARGET_DEF_H): Define.
19049         (c-family/c-format.o, c-family/c-opts.o): Update dependencies.
19050         (default-c.o): New target.
19051         (s-target-hooks-def-h): Pass "Target Hook" string to genhooks.
19052         (c-family/c-target-hooks-def.h, s-c-target-hooks-def-h): New targets.
19053         (s-tm-texi): Pass -d option to genhooks.  Also test timestamp on
19054         c-target.def.
19055         (build/genhooks.o): Update dependencies.
19056
19057 2011-04-06  Richard Guenther  <rguenther@suse.de>
19058
19059         * ipa-inline.c (enum inlining_mode): Remove.
19060         (cgraph_flatten): Use some other token.
19061         (cgraph_edge_early_inlinable_p): New function, split out from ...
19062         (cgraph_perform_always_inlining): New function, split out from ...
19063         (cgraph_decide_inlining_incrementally): ... here.
19064         (cgraph_mark_inline_edge): Adjust.
19065         (cgraph_early_inlining): Re-structure.
19066         (pass_early_inline): Require SSA form.
19067
19068 2011-04-06  Andrew Stubbs  <ams@codesourcery.com>
19069             Julian Brown  <julian@codesourcery.com>
19070             Mark Shinwell  <shinwell@codesourcery.com>
19071
19072         * config/arm/arm.h (arm_class_likely_spilled_p): Check against
19073         LO_REGS only for Thumb-1.
19074         (MODE_BASE_REG_CLASS): Restrict base registers to those which can
19075         be used in short instructions when optimising for size on Thumb-2.
19076
19077 2011-04-06  Eric Botcazou  <ebotcazou@adacore.com>
19078
19079         * gimple-low.c (lower_gimple_return): When not optimizing, force labels
19080         associated with user returns to be preserved.
19081
19082 2011-04-06  Tristan Gingold  <gingold@adacore.com>
19083
19084         * dbxout.c (debug_nesting, symbol_queue, symbol_queue_index,
19085         symbol_queue_size, DBXOUT_DECR_NESTING,
19086         (DBXOUT_DECR_NESTING_AND_RETURN): Also define
19087         if XCOFF_DEBUGGING_INFO.
19088
19089 2011-04-06  Uros Bizjak  <ubizjak@gmail.com>
19090
19091         * config/i386/i386.md (attribute isa): New.
19092         (attribute enabled): New.
19093         (setcc_<mode>_sse): Merge from *{avx,sse}_setcc<mode>.
19094         (*fop_<mode>_comm_mixed): Merge with *fop_<mode>_comm_mixed_avx.
19095         (*fop_<mode>_comm_sse): Merge with *fop_<mode>_comm_avx.
19096         (*fop_<mode>_1_mixed): Merge with *fop_<mode>_1_mixed_avx.
19097         (*fop_<mode>_1_sse): Merge with *fop_<mode>_1_avx.
19098         (<smaxmin:code><mode>3): Merge with *avx_<smaxmin:code><mode>3.
19099         (*ieee_smin<mode>3): Merge with *avx_ieee_smin<mode>3.
19100         (*ieee_smax<mode>3): Merge with *avx_ieee_smax<mode>3.
19101
19102         * config/i386/sse.md (VF): New mode iterator.
19103         (VF1): Ditto.
19104         (VF2): Ditto.
19105         (VF_128): Ditto.
19106         (SSEMODEF4): Remove.
19107         (attribute sse): Handle V8SF and V4DF modes.
19108         (<absneg:code><mode>2): Use VF mode iterator.
19109         (*absneg<mode>2): Merge from *{avx,sse}_absneg<mode>2.  Use VF
19110         mode iterator.
19111         (<plusminus_insn><mode>3): Use VF mode iterator.
19112         (*<plusminus_insn><mode>3): Merge with *avx_<plusminus_insn><mode>3.
19113         Use VF mode iterator.
19114         (<sse>_vm<plusminus_insn><mode>3): Merge with
19115         *avx_vm<plusminus_insn><mode>3.  Use VF_128 mode iterator.
19116         (mul<mode>3): Use VF mode iterator.
19117         (*mul<mode>3): Merge with *avx_mul<mode>3.  Use VF mode iterator.
19118         (<sse>_vmmul<mode>3): Merge with *avx_vmmul<mode>3.  Use VF_128
19119         mode iterator.
19120         (div<VF2:mode>3): Merge from divv2df3 and divv4df3.
19121         (div<VF1:mode>3): Merge from divv4sf3 and divv8sf3.
19122         (<sse>_div<mode>3): Merge with *avx_div<mode>3.  Use VF mode iterator.
19123         (<sse>_vmdiv<mode>3): Merge with *avx_vmdiv<mode>3.  Use VF_128
19124         mode iterator.
19125         (<sse>_rcp<mode>2): Merge from avx_rcpv8sf2 and sse_rcpv4sf2.
19126         Use VF1 mode iterator.
19127         (sse_vmrcpv4sf2): Merge with *avx_vmrcpv4sf2.
19128         (sqrt<VF2:mode>2): New expander.
19129         (sqrt<VF1:mode>2): Merge from sqrtv4sf2 and sqrtv8sf2.
19130         (<sse>_sqrt<mode>2): Merge from avx_sqrtv8sf2, sse_sqrtv4sf, sqrtv4df2
19131         and sqrtv2df2.  Use VF mode iterator.
19132         (<sse>_vmsqrt<mode>2): Merge with *avx_vmsqrt<mode>2.  Use VF_128
19133         mode iterator.
19134         (rsqrt<VF1:mode>2): Merge from rsqrtv4sf2 and rsqrtv8sf2.
19135         (<sse>_rsqrt<mode>2): Merge from avx_rsqrtv8sf2 and sse_rsqrt4sf2.
19136         Use VF1 mode iterator.
19137         (sse_vmrsqrtv4sf2): Merge with *avx_vmrsqrtv4sf2.
19138         (<smaxmin:code><mode>3): Use VF mode iterator.
19139         (*<smaxmin:code><mode>3_finite): Merge with
19140         *avx_<smaxmin:code><mode>3_finite.  Use VF mode iterator.
19141         (*<smaxmin:code><mode>3): Merge with *avx_<smaxmin:code><mode>3.
19142         (<sse>_vm<smaxmin:code><mode>2): Merge with
19143         *avx_vm<smaxmin:code><mode>2.  Use VF_128 mode iterator.
19144         (*ieee_smin<mode>3): Merge with *avx_ieee_smin<mode>3.  Use VF
19145         mode iterator.
19146         (*ieee_smax<mode>3): Merge with *avx_ieee_smax<mode>3.  Use VF
19147         mode iterator.
19148         (sse3_addsubv2df3): Merge with *avx_addsubv2df3.
19149         (sse3_addsubv4sf3): Merge with *avx_addsubv4sf3.
19150         (sse3_h<plusminus_insn>v2df3): Merge with *avx_h<plusminus_insn>v2df3.
19151         (sse3_h<plusminus_insn>v4sf3): Merge with *avx_h<plusminus_insn>v4sf3.
19152         (avx_cmp<mode>3): Rename from avx_cmp<ssemodesuffix><mode>3.  Use
19153         VF mode iterator.
19154         (avx_vmcmp<mode>3): Rename from avx_cmp<ssescalarmodesuffix><mode>3.
19155         Use VF_128 mode iterator.
19156         (<sse>_maskcmp<mode>3): Merge with *avx_maskcmp<mode>3.  Use VF
19157         mode iterator.
19158         (<sse>_vmmaskcmp<mode>3): Merge with *avx_vmmaskcmp<mode>3.  Use
19159         VF_128 mode iterator.
19160         (vcond<mode>): Use VF mode iterator.
19161         * config/i386/predicates.md (sse_comparison_operator): Merge with
19162         avx_comparison_float_operator.  Do not declare as special_predicate.
19163         * config/i386/i386.c (struct builtin_description): Update for renamed
19164         compare patterns.
19165         (ix86_expand_args_builtin): Ditto.
19166         (ix86_expand_sse_compare_mask): Ditto.
19167
19168 2011-04-06  Richard Guenther  <rguenther@suse.de>
19169
19170         * tree-inline.c (estimate_num_insns): For calls simply account
19171         for all passed arguments and a used return value.
19172
19173 2011-04-06  Richard Guenther  <rguenther@suse.de>
19174
19175         PR tree-optimization/47663
19176         * cgraph.h (struct cgraph_edge): Add call_stmt_size and
19177         call_stmt_time fields.
19178         (cgraph_edge_inlinable_p): Declare.
19179         (cgraph_edge_recursive_p): New inline function.
19180         * cgraph.c (cgraph_create_edge_1): Initialize call_stmt_size.
19181         (cgraph_clone_edge): Copy it.
19182         * ipa-inline.c (cgraph_estimate_edge_time): New function.
19183         Account for call stmt time.
19184         (cgraph_estimate_time_after_inlining): Take edge argument.
19185         (cgraph_estimate_edge_growth): Account call stmt size.
19186         (cgraph_estimate_size_after_inlining): Take edge argument.
19187         (cgraph_mark_inline_edge): Adjust.
19188         (cgraph_check_inline_limits): Likewise.
19189         (cgraph_recursive_inlining_p): Remove.
19190         (cgraph_edge_badness): Use cgraph_edge_recursive_p.
19191         (cgraph_decide_recursive_inlining): Take edge argument and
19192         adjust.
19193         (cgraph_decide_inlining_of_small_functions): Do not avoid
19194         diags for recursive inlining here.
19195         (cgraph_flatten): Adjust.
19196         (cgraph_decide_inlining_incrementally): Likewise.
19197         (estimate_function_body_sizes): Remove call cost handling.
19198         (compute_inline_parameters): Initialize caller edge call costs.
19199         (cgraph_estimate_edge_growth): New function.
19200         (cgraph_estimate_growth): Use it.
19201         (cgraph_edge_badness): Likewise.
19202         (cgraph_check_inline_limits): Take an edge argument.
19203         (cgraph_decide_inlining_of_small_functions): Adjust.
19204         (cgraph_decide_inlining): Likewise.
19205         * tree-inline.c (estimate_num_insns): Only account for call
19206         return value if it is used.
19207         (expand_call_inline): Avoid diagnostics on recursive inline
19208         functions here.
19209         * lto-cgraph.c (lto_output_edge): Output edge call costs.
19210         (input_edge): Input edge call costs.
19211
19212 2011-04-06  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
19213
19214         * config/alpha/osf5.h (MAX_OFILE_ALIGNMENT): Define.
19215
19216 2011-04-06  Jonathan Wakely  <jwakely.gcc@gmail.com>
19217
19218         * doc/invoke.texi (Spec Files): Fix typo.
19219
19220 2011-04-06  Eric Botcazou  <ebotcazou@adacore.com>
19221
19222         * profile.c (branch_prob): Move declaration of local variable.  Remove
19223         obsolete ??? comment.  Expand the location explicitly instead of using
19224         the LOCATION_FILE and LOCATION_LINE macros.
19225
19226 2011-04-06  Wei Guozhi  <carrot@google.com>
19227
19228         PR target/47855
19229         * config/arm/arm.md (arm_cmpsi_insn): Compute attr "length".
19230         (arm_cond_branch): Likewise.
19231         (arm_cond_branch_reversed): Likewise.
19232         (arm_jump): Likewise.
19233         (push_multi): Likewise.
19234         * config/arm/constraints.md (Py): New constraint.
19235
19236 2011-04-05  Nathan Froyd  <froydnj@codesourcery.com>
19237
19238         PR bootstrap/48471
19239         * dbxout.c (debug_nesting, symbol_queue, symbol_queue_index):
19240         Move these...
19241         (symbol_queue_size, DBXOUT_DECR_NESTING): ...and these...
19242         (DBXOUT_DECR_NESTING_AND_RETURN): ...and this under
19243         #ifdef DBX_DEBUGGING_INFO.
19244
19245 2011-04-05  Bernd Schmidt  <bernds@codesourcery.com>
19246
19247         PR bootstrap/48403
19248         * haifa-sched.c (schedule_block): Increment cycle_issued_insns only
19249         if old and new states differ.
19250
19251 2011-04-05  Joseph Myers  <joseph@codesourcery.com>
19252
19253         * config/m68k/m68k.c (m68k_handle_option): Don't handle OPT_m5200,
19254         OPT_m5206e, OPT_m528x, OPT_m5307, OPT_m5407 and OPT_mcfv4e.
19255         * config/m68k/m68k.h (OPTION_DEFAULT_SPECS, ASM_CPU_SPEC): Don't
19256         handle -m5200, -m5206e, -m528x, -m5307, -m5407 and -mcfv4e.
19257         * config/m68k/m68k.opt (m5200, m5206e, m528x, m5307, m5407,
19258         mcfv4e): Use Alias.
19259         * config/m68k/t-mlibs (MULTILIB_MATCHES): Don't map legacy
19260         ColdFire options to -mcpu= options.
19261
19262 2011-04-05  Jeff Law  <law@redhat.com>
19263
19264         * tree-ssa-threadupdate.c (determine_bb_domination_status): Always
19265         check if BB is a successor of LOOP->header and return
19266         NONDOMINATING if it is not, regardless of ENABLE_CHECKING.
19267
19268 2011-04-05  Steven Bosscher  <steven@gcc.gnu.org>
19269
19270         * cprop.c (struct reg_use): Remove.
19271         (reg_use_table): Make an array of RTX.
19272         (find_used_regs, constprop_register, local_cprop_pass,
19273         bypass_block): Simplify users of reg_use_table.
19274         (cprop_insn): Likewise.  Iterate if copy propagation succeeded
19275         on one of the uses found by find_used_regs.
19276
19277 2011-04-05  Nathan Froyd  <froydnj@codesourcery.com>
19278
19279         PR bootstrap/48469
19280         * combine.c (combine_instructions): #ifdef AUTO_INC_DEC links
19281         declaration.
19282
19283 2011-04-05  Nathan Froyd  <froydnj@codesourcery.com>
19284
19285         * combine.c (combine_instructions) [AUTO_INC_DEC]: Declare links
19286         as an rtx.
19287         (try_combine) [AUTO_INC_DEC]: Declare a local link rtx.
19288
19289 2011-04-05  Steven Bosscher  <steven@gcc.gnu.org>
19290
19291         PR middle-end/48441
19292         * cprop.c (one_cprop_pass): Do not mark_oprs_set of deleted insns.
19293
19294 2011-04-05  Nathan Froyd  <froydnj@codesourcery.com>
19295
19296         * combine.c: Include obstack.h.
19297         (struct insn_link): Define.
19298         (uid_log_links): Adjust type.
19299         (FOR_EACH_LOG_LINK): New macro.
19300         (insn_link_obstack): Declare.
19301         (alloc_insn_link): Define.
19302         (create_log_links): Call it.  Use FOR_EACH_LOG_LINK and adjust
19303         type of link variables.
19304         (find_single_use, insn_a_feeds_b, combine_instructions): Likewise.
19305         (try_combine, record_promoted_values, distribute_notes): Likewise.
19306         (distribute_links): Likewise.  Tweak prototype.
19307         (clear_log_links): Delete.
19308         (adjust_for_new_dest): Call alloc_insn_link.
19309         * Makefile.in (combine.o): Depend on $(OBSTACK_H).
19310
19311 2011-04-05  Nathan Froyd  <froydnj@codesourcery.com>
19312
19313         * gcse.c (modify_mem_list): Convert to an array of VECs.
19314         (canon_modify_mem_list, compute_transp): Tweak formatting.
19315         (alloc_gcse_mem): Likewise.  Adjust for modify_mem_list change.
19316         (load_killed_in_block_p): Likewise.
19317         (record_last_mem_set_info): Likewise.
19318         (clear_modify_mem_tables): Likewise.
19319
19320 2011-04-05  Tom de Vries  <tom@codesourcery.com>
19321
19322         PR middle-end/48461
19323         * function.c (emit_use_return_register_into_block): Only define if
19324         HAVE_return.
19325
19326 2011-04-05  Eric Botcazou  <ebotcazou@adacore.com>
19327
19328         * stor-layout.c (self_referential_size): Fix 2010-07-13 commit.
19329
19330 2011-04-05  Joseph Myers  <joseph@codesourcery.com>
19331
19332         * config/rx/rx-opts.h: New.
19333         * config/rx/rx.c (rx_cpu_type): Remove.
19334         (rx_handle_option): Don't assert that global structures are in
19335         use.  Access variables via opts pointer.  Defer most handling of
19336         OPT_mint_register_.  Use error_at.
19337         (rx_option_override): Handle deferred OPT_mint_register_ here.
19338         * config/rx/rx.h (enum rx_cpu_types): Move to rx-opts.h.
19339         * config/rx/rx.opt (config/rx/rx-opts.h: New HeaderInclude.
19340         (mcpu=): Use Enum and specifiy rx_cpu_type with Var.
19341         (rx_cpu_types): New Enum and EnumValue entries.
19342         (mint-register=): Use Defer and use Var accordingly.
19343
19344 2011-04-05  Nathan Froyd  <froydnj@codesourcery.com>
19345
19346         * debug.h (debug_flush_symbol_queue, debug_queue_symbol): Delete.
19347         (debug_free_queue, debug_nesting, symbol_queue_index): Delete.
19348         * final.c (debug_flush_symbol_queue, debug_queue_symbol):
19349         Move these...
19350         (debug_free_queue, debug_nesting, symbol_queue_index):
19351         ...and these...
19352         * dbxout.c: ...to here.  Make static.
19353
19354 2011-04-05  Nathan Froyd  <froydnj@codesourcery.com>
19355
19356         * gcse.c (modify_pair): Define.  Define a VEC of it.
19357         (canon_modify_mem_list): Convert to an array of VECs.
19358         (free_insn_expr_list_list): Delete.
19359         (clear_modify_mem_tables): Call VEC_free instead.
19360         (record_last_mem_set_info): Don't modify canon_modify_mem_list.
19361         (alloc_gcse_mem): Adjust for canon_modify_mem_list change.
19362         (canon_list_insert, compute_transp): Likewise.
19363
19364 2011-04-05  Tom de Vries  <tom@codesourcery.com>
19365
19366         PR target/43920
19367         * config/arm/arm.h (BRANCH_COST): Set to 1 for Thumb-2 when optimizing
19368         for size.
19369
19370 2011-04-05  Tom de Vries  <tom@codesourcery.com>
19371
19372         PR target/43920
19373         * function.c (emit_use_return_register_into_block): New function.
19374         (thread_prologue_and_epilogue_insns): Use
19375         emit_use_return_register_into_block.
19376
19377 2011-04-05  Tom de Vries  <tom@codesourcery.com>
19378
19379         PR target/43920
19380         * cfgcleanup.c (flow_find_cross_jump): Don't count USE or CLOBBER as
19381         insn.
19382
19383 2011-04-05  Tom de Vries  <tom@codesourcery.com>
19384
19385         * cfgcleanup.c (try_crossjump_bb): Remove 2 superfluous variables.
19386
19387 2011-04-05  Yufeng Zhang  <yufeng.zhang@arm.com>
19388
19389         * config/arm/arm.md (define_constants for unspec): Replace with
19390         define_c_enum.
19391         (define_constants for unspecv): Replace with define_c_enum.
19392         * config/arm/neon.md (define_constants for unspec): Replace with
19393         define_c_enum.
19394
19395 2011-04-04  Richard Henderson  <rth@redhat.com>
19396
19397         PR bootstrap/48400
19398         * dwarf2out.c (output_line_info): Always emit line info from
19399         at least one section.
19400         (dwarf2out_init): Create text_section_line_info here ...
19401         (set_cur_line_info_table): ... not here.
19402
19403 2011-04-04  Vladimir Makarov  <vmakarov@redhat.com>
19404
19405         PR target/48380
19406         * ira.c (ira): Call grow_reg_equivs when fix_reg_equiv_init is
19407         not called.
19408
19409         * ira-emit.c (emit_move_list): Update reg_equiv_init insn list.
19410
19411 2011-04-04  Steven Bosscher  <steven@gcc.gnu.org>
19412
19413         * cprop.c (struct expr): Split 'expr' field in 'dest' and 'src'.
19414         (expr_equiv_p): Remove.
19415         (insert_set_in_table): Look at <dest, src> pair instead of expr.
19416         (hash_scan_set): Update call to insert_set_in_table.
19417         (dump_hash_table): Dump <dest, src> pair.
19418         (lookup_set): Simplify.  Lookup <dest, src> pair.
19419         (compute_transp): Remove, fold heavily simplified code into...
19420         (compute_local_properties): ...here.  Expect COMP and TRANSP
19421         unconditionally.
19422         (find_avail_set): Take set directly from struct expr.
19423         (find_bypass-set): Likewise.
19424         (bypass_block): Likewise.
19425         (cprop_insn): Likewise.  Remove redundant INSN_P test.
19426
19427         * cprop.c (implicit_set_cond_p): Assume nothing about COND, move
19428         checks on form of COND from find_implicit_sets to here.
19429         (find_implicit_sets): Cleanup control flow. Split critical edges
19430         if it exposes implicit sets.  Allocate/resize implicit_sets as
19431         necessary.
19432         (one_cprop_pass): Only delete unreachable blocks if local_cprop_pass
19433         changed something.  Run df_analyze after find_implicit_sets if any
19434         edges were split.  Do not allocate implicit_sets here.
19435
19436         * cprop.c: s/gcse/cprop/ everywhere except for flag_gcse.
19437         (gcse_obstack): Renamed to cprop_obstack.
19438         (GNEW, GNEWVEC, GNEWVAR): Remove.
19439         (gmalloc): Remove.
19440         (alloc_hash_table): Use XNEWVAR instead of GNEWVAR.
19441         (GOBNEW, GOBNEWVAR): Adjust for gcse_obstack renaming.
19442         (gcse_alloc): Likewise, and rename to cprop_alloc.
19443         (alloc_gcse_men, free_gcse_mem): Remove.
19444         (gcse_constant_p): Rename to cprop_constant_p, and adjust all callers.
19445         (compute_hash_table_work): Allocate and free reg_set_bitmap here.
19446         (one_cprop_pass): Likewise. Adjust for gcse_obstack renaming.
19447
19448         * cprop.c (oprs_not_set_p): Remove.
19449         (mark_set, mark_clobber): Remove.
19450         (mark_oprs_set): Rewrite using DF_INSN_INFO_DEFS cache.
19451         (reg_not_set_p): New function.
19452         (find_avail_set): Use reg_not_set_p instead of oprs_not_set_p.
19453         (cprop_insn): Likewise.
19454         (cprop_jump): Use FOR_EACH_EDGE.
19455
19456 2011-04-04  Bernd Schmidt  <bernds@codesourcery.com>
19457
19458         PR bootstrap/48403
19459         * haifa-sched.c (nonscheduled_insns_begin): New static variable.
19460         (rank_for_schedule): Use scheduled_insns vector instead of
19461         last_scheduled_insn.
19462         (ok_for_early_queue_removal): Likewise.
19463         (queue_to_ready): Search forward in nonscheduled_insns_begin if
19464         we have a dbg_cnt.
19465         (choose_ready): Likewise.
19466         (commit_schedule): Use VEC_iterate.
19467         (schedule_block): Initialize nonscheduled_insns_begin.  If we have
19468         a dbg_cnt, use it and ensure the first insn is in the ready list.
19469         (haifa_sched_init): Allocate scheduled_insns.
19470         (sched_extend_ready_list): Don't allocate it; reserve space.
19471         (haifa_sched_finish): Free it.
19472
19473 2011-04-04  Joseph Myers  <joseph@codesourcery.com>
19474
19475         * optc-gen.awk: Always remove type from Variable entry before
19476         recording in var_seen.
19477
19478 2011-04-04  Eric Botcazou  <ebotcazou@adacore.com>
19479
19480         * cfghooks.c (tidy_fallthru_edges): Add ??? comment.
19481         * tree-inline.c (delete_unreachable_blocks_update_callgraph): Remove
19482         call to tidy_fallthru_edges.
19483
19484 2011-04-04  Joseph Myers  <joseph@codesourcery.com>
19485
19486         * doc/options.texi (ToLower): Document.
19487         * opt-functions.awk (switch_bit_fields): Initialize cl_tolower field.
19488         * opts-common.c (decode_cmdline_option): Handle cl_tolower.
19489         * opts.h (cl_option): Add cl_tolower field.
19490         * config/rx/rx.c (rx_handle_option): Use strcmp of -mcpu=
19491         arguments with lowercase strings.
19492         * config/rx/rx.opt (mcpu=): Add ToLower.
19493         * config/rx/t-rx (MULTILIB_MATCHES): Don't handle uppercase -mcpu=
19494         argument.
19495
19496 2011-04-04  Richard Sandiford  <richard.sandiford@linaro.org>
19497
19498         * config/pdp11/pdp11.h (IRA_COVER_CLASSES): Delete.
19499
19500 2011-04-04  Richard Sandiford  <richard.sandiford@linaro.org>
19501
19502         * config/vax/vax.c: Include reload.h.
19503
19504 2011-04-04  Anatoly Sokolov  <aesok@post.ru>
19505
19506         * config/sparc/sparc.h (PREFERRED_RELOAD_CLASS): Remove.
19507         * config/sparc/sparc.c (TARGET_PREFERRED_RELOAD_CLASS): Define.
19508         (sparc_preferred_reload_class): New function.
19509
19510 2011-04-04  Jakub Jelinek  <jakub@redhat.com>
19511
19512         PR debug/48401
19513         * cfgexpand.c (expand_gimple_basic_block): Avoid useless assignment.
19514         Use PAT_VAR_LOCATION_LOC instead of INSN_VAR_LOCATION_LOC.
19515
19516 2011-04-03  Nathan Froyd  <froydnj@codesourcery.com>
19517
19518         * tree.h (struct tree_const_decl): Inherit from tree_decl_common.
19519         * tree.c (initialize_tree_contains_struct): Adjust accordingly.
19520
19521 2011-04-03  Anatoly Sokolov  <aesok@post.ru>
19522
19523         * config/avr/avr.h (ASM_OUTPUT_BSS): Remove.
19524         (ASM_OUTPUT_ALIGNED_BSS): Define.
19525
19526 2011-04-03  Michael Matz  <matz@suse.de>
19527
19528         * lto-streamer.h (struct lto_streamer_cache_d): Remove offsets
19529         and next_slot members.
19530         (lto_streamer_cache_insert, lto_streamer_cache_insert_at,
19531         lto_streamer_cache_lookup, lto_streamer_cache_get): Adjust prototypes.
19532         (lto_streamer_cache_append): Declare.
19533         * lto-streamer.c (lto_streamer_cache_add_to_node_array): Use
19534         unsigned index, remove offset parameter, ensure that we append
19535         or update existing entries.
19536         (lto_streamer_cache_insert_1): Use unsigned index, remove offset_p
19537         parameter, update next_slot for append.
19538         (lto_streamer_cache_insert): Use unsigned index, remove offset_p
19539         parameter.
19540         (lto_streamer_cache_insert_at): Likewise.
19541         (lto_streamer_cache_append): New function.
19542         (lto_streamer_cache_lookup): Use unsigned index.
19543         (lto_streamer_cache_get): Likewise.
19544         (lto_record_common_node): Don't test tree_node_can_be_shared.
19545         (preload_common_node): Adjust call to lto_streamer_cache_insert.
19546         (lto_streamer_cache_delete): Don't free offsets member.
19547         * lto-streamer-out.c (eq_string_slot_node): Use memcmp.
19548         (lto_output_string_with_length): Use lto_output_data_stream.
19549         (lto_output_tree_header): Remove ix parameter, don't write it.
19550         (lto_output_builtin_tree): Likewise.
19551         (lto_write_tree): Adjust callers to above, don't track and write
19552         offset, write unsigned index.
19553         (output_unreferenced_globals): Don't emit all global vars.
19554         (write_global_references): Use unsigned indices.
19555         (lto_output_decl_state_refs): Likewise.
19556         (write_symbol): Likewise.
19557         * lto-streamer-in.c (lto_input_chain): Move earlier.
19558         (input_function): Use unsigned index.
19559         (input_alias_pairs): Don't read and then ignore all global vars.
19560         (lto_materialize_tree): Remove ix_p parameter, don't read index,
19561         don't pass it back, use lto_streamer_cache_append.
19562         (lto_register_var_decl_in_symtab): Use unsigned index.
19563         (lto_register_function_decl_in_symtab): Likewise.
19564         (lto_get_pickled_tree): Don't read in or handle offset, read unsigned
19565         index.
19566         (lto_get_builtin_tree): Don't read index, use
19567         lto_streamer_cache_append.
19568         (lto_read_tree): Adjust call to lto_materialize_tree.
19569
19570         * ipa-inline.c (cgraph_edge_badness): Move growth calculaton,
19571         don't use function calls in arguments to MIN.
19572
19573         * varasm.c (decl_binds_to_current_def_p): Don't check TREE_PUBLIC
19574         twice.
19575
19576         * gimple.c (gimple_type_leader_entry): Mark deletable.
19577
19578 2011-04-03  Alan Modra  <amodra@gmail.com>
19579
19580         * dwarf2out.c (mem_loc_descriptor): Recurse on LO_SUM.
19581
19582 2011-04-03  Michael Matz  <matz@suse.de>
19583
19584         * tree.c (free_lang_data_in_decl): Zero DECL_VINDEX if it's not
19585         an integer.
19586         * tree.h (tree_decl_non_common.vindex): Adjust comment.
19587
19588 2011-04-03  Michael Matz  <matz@suse.de>
19589
19590         * cgraphbuild.c (record_reference): Canonicalize constructor values.
19591         * gimple-fold.c (canonicalize_constructor_val): Accept being called
19592         without function context.
19593         * cgraphunit.c (cgraph_finalize_compilation_unit): Clear
19594         current_function_decl and cfun.
19595
19596 2011-04-03  Michael Matz  <matz@suse.de>
19597
19598         * tree.c (decl_init_priority_insert): Don't create entry for
19599         default priority.
19600         (decl_fini_priority_insert): Ditto.
19601         (fields_compatible_p, find_compatible_field): Remove.
19602         * tree.h (fields_compatible_p, find_compatible_field): Remove.
19603         * gimple.c (gimple_compare_field_offset): Adjust block comment.
19604
19605 2011-04-03  Eric Botcazou  <ebotcazou@adacore.com>
19606
19607         * combine.c (try_combine): Remove useless local variable.
19608
19609 2011-04-03  Richard Guenther  <rguenther@suse.de>
19610             Ira Rosen  <ira.rosen@linaro.org>
19611
19612         * tree-if-conv.c (memrefs_read_or_written_unconditionally): Strip all
19613         non-variable offsets and compare the remaining bases of the two
19614         accesses instead of looking for exact same data-ref.
19615
19616 2011-04-02  Kai Tietz  <ktietz@redhat.com>
19617
19618         PR target/48416
19619         * i386.c (ix86_function_arg_boundary): Fix printf formatter.
19620
19621         * i386.c (ix86_is_msabi_thiscall): New helper function.
19622         (ix86_is_type_thiscall): New helper function.
19623         (ix86_comp_type_attributes): Handle thiscall for method-functions
19624         special.
19625         (init_cumulative_args): Likewise.
19626         (find_drap_reg): Likewise.
19627         (ix86_static_chain): Likewise.
19628         (x86_this_parameter): Likewise.
19629         (x86_output_mi_thunk): Likewise.
19630
19631 2011-04-01  Olivier Hainque  <hainque@adacore.com>
19632             Nicolas Setton  <setton@adacore.com>
19633             Eric Botcazou  <ebotcazou@adacore.com>
19634
19635         * dwarf2out.c (dwarf_attr_name): Map DW_AT_GNAT_descriptive_type.
19636         (add_gnat_descriptive_type_attribute): New function.
19637         (gen_array_type_die): Call it.
19638         (gen_enumeration_type_die): Likewise.
19639         (gen_struct_or_union_type_die): Likewise.
19640         (modified_type_die): Likewise.
19641         * langhooks.h (lang_hooks_for_types): New descriptive_type hook.
19642         * langhooks-def.h (LANG_HOOKS_DESCRIPTIVE_TYPE): Default to NULL.
19643         (LANG_HOOKS_FOR_TYPES_INITIALIZER): Add LANG_HOOKS_DESCRIPTIVE_TYPE.
19644
19645 2011-04-01  Jakub Jelinek  <jakub@redhat.com>
19646
19647         PR bootstrap/48148
19648         * dwarf2out.c (resolve_addr): Don't call force_decl_die
19649         if DECL_EXTERNAL has non-NULL DECL_ABSTRACT_ORIGIN.
19650
19651         Revert:
19652         2011-03-17  Richard Guenther  <rguenther@suse.de>
19653
19654         PR bootstrap/48148
19655         * lto-cgraph.c (input_overwrite_node): Clear the abstract
19656         origin for decls in other ltrans units.
19657         (input_varpool_node): Likewise.
19658
19659 2011-04-01  Jakub Jelinek  <jakub@redhat.com>
19660
19661         PR middle-end/48335
19662         * expr.c (expand_assignment): Handle all possibilities
19663         if TO_RTX is CONCAT.
19664         * expmed.c (store_bit_field_1): Avoid trying to create invalid SUBREGs.
19665         (store_split_bit_field): If SUBREG_REG (op0) or
19666         op0 itself has smaller mode than word, return it
19667         for offset 0 and const0_rtx for out-of-bounds stores.
19668         If word is const0_rtx, skip it.
19669
19670 2011-04-01  Naveen H.S  <naveen.S@kpitcummins.com>
19671
19672         * config/h8300/h8300.c (print_operand_address): Rename to...
19673         (h8300_print_operand_address): ...this. Make static. Adjust comments.
19674         Call h8300_print_operand and h8300_print_operand_address instead of
19675         print_operand and print_operand_address. Declare.
19676         (print_operand): Renake to...
19677         (h8300_print_operand): ...this. Make static. Adjust comments.
19678         Call h8300_print_operand instead of print_operand. Declare.
19679         (h8300_print_operand_punct_valid_p): Moved from h8300.h file.
19680         (h8300_register_move_cost): Likewise.
19681         (TARGET_PRINT_OPERAND_PUNCT_VALID_P, TARGET_PRINT_OPERAND
19682         TARGET_PRINT_OPERAND_ADDRESS, TARGET_REGISTER_MOVE_COST): Define.
19683         * config/h8300/h8300.h (PRINT_OPERAND_ADDRESS, PRINT_OPERAND
19684         PRINT_OPERAND_PUNCT_VALID_P, REGISTER_MOVE_COST): Delete.
19685         * config/h8300/h8300-protos.h (print_operand): Delete.
19686         (print_operand_address): Delete.
19687
19688 2011-04-01  Richard Henderson  <rth@redhat.com>
19689
19690         PR 48400
19691         * dwarf2out.c (dwarf2out_source_line): Disable discriminators
19692         in strict mode before dwarf4.  Re-order tests to early out
19693         before switching sections.
19694
19695 2011-04-01  Nathan Froyd  <froydnj@codesourcery.com>
19696
19697         * config/h8300/constraints.md: New file.
19698         * config/h8300/h8300.md: Include it.  Use satisfies_constraint_J,
19699         satisfies_constraint_L, and satisfies_constraint_N for peephole2s.
19700         (*tst_extzv_1_n, *tstsi_variable_bit_qi): Use satisfies_constraint_U.
19701         * config/h8300/predicates.md (bit_operand): Likewise.
19702         (incdec_operand): Use satisfies_constraint_M and
19703         satisfies_constraint_O.  Don't use C code block.
19704         * config/h8300/h8300-protos.h (h8300_reg_class_from_letter): Delete.
19705         * config/h8300/h8300.c (h8300_reg_class_from_letter): Delete.
19706         (compute_mov_length): Use satisfies_constraint_G.
19707         (fix_bit_operand): Use satisfies_constraint_U.
19708         * config/h8300/h8300.h (REG_CLASS_FROM_LETTER): Delete.
19709         (CONST_OK_FOR_I, CONST_OK_FOR_J, CONST_OK_FOR_L): Delete.
19710         (CONST_OK_FOR_M, CONST_OK_FOR_N, CONST_OK_FOR_O): Delete.
19711         (CONST_OK_FOR_Ppositive, CONST_OK_FOR_Pnegative): Delete.
19712         (CONST_OK_FOR_P, CONSTRAINT_LEN_FOR_P): Delete.
19713         (CONST_OK_FOR_CONSTRAINT_P, CONST_OK_FOR_LETTER_P): Delete.
19714         (CONST_DOUBLE_OK_FOR_LETTER_P): Delete.
19715         (OK_FOR_Q, OK_FOR_R, OK_FOR_S, OK_FOR_T, OK_FOR_U, OK_FOR_WU): Delete.
19716         (OK_FOR_W, CONSTRAINT_LEN_FOR_W, OK_FOR_Y2, OK_FOR_Y0): Delete.
19717         (OK_FOR_Y, CONSTRAINT_LEN_FOR_Y, OK_FOR_Z): Delete.
19718         (EXTRA_CONSTRAINT_STR, CONSTRAINT_LEN): Delete.
19719         (EXTRA_MEMORY_CONSTRAINT): Delete.
19720
19721 2011-04-01  Andrew Pinski  <pinskia@gmail.com>
19722             Michael Meissner  <meissner@linux.vnet.ibm.com>
19723
19724         PR target/48262
19725         * config/rs6000/vector.md (movmisalign<mode>): Allow for memory
19726         operands, as per the specifications.
19727
19728         * config/rs6000/altivec.md (vec_extract_evenv4si): Correct modes.
19729         (vec_extract_evenv4sf): Ditto.
19730         (vec_extract_evenv8hi): Ditto.
19731         (vec_extract_evenv16qi): Ditto.
19732         (vec_extract_oddv4si): Ditto.
19733
19734 2011-03-31  Mark Wielaard  <mjw@redhat.com>
19735
19736         * dwarf2out.c (dwarf2out_finish): Don't add low_pc and/or
19737         high_pc attribute if the CU has no associated code. Only output
19738         DW_AT_entry_pc for CU if not generating strict dwarf and
19739         dwarf_version < 4.
19740
19741 2011-04-01  Bernd Schmidt  <bernds@codesourcery.com>
19742
19743         * dwarf2out.h (dwarf2out_frame_debug_init): Declare.
19744         * dwarf2out.c (dwarf2out_frame_debug_init): New function, broken
19745         out of ...
19746         (dwarf2out_frame_debug): ... here. Don't handle a NULL argument.
19747         * final.c (final_start_function): Call the new function rather
19748         than using a NULL argument for dwarf2out_frame_debug.
19749
19750         * ifcvt.c (cond_exec_process_insns): Disallow converting a block
19751         that contains the prologue.
19752
19753         * haifa-sched.c (queue_insn): New arg REASON.  All callers
19754         changed.  Print it in debugging output.
19755
19756         * sched-ebb.c (schedule_ebbs): Honor the BB_DISABLE_SCHEDULE flag.
19757
19758         * sched-ebb.c (begin_schedule_ready): Remove second argument.
19759         Split most of the code into...
19760         (begin_move_insn): ... here.  New function.
19761         (ebb_sched_info): Add a pointer to it.
19762         * haifa-sched.c (scheduled_insns): New static variable.
19763         (sched_extend_ready_list): Allocate it.
19764         (schedule_block): Use it to record the order of scheduled insns.
19765         Perform RTL changes to move insns only after all scheduling
19766         decisions have been made.
19767         * modulo-sched.c (sms_sched_haifa_sched_info): Add NULL entry for the
19768         begin_move_insn field.
19769         * sel-sched-ir.c (sched_sel_haifa_sched_info): Likewise.
19770         * sched-int.h (struct haifa_sched_info): Remove second argument
19771         from begin_schedule_ready hook.  Add new member begin_move_insn.
19772         * sched-rgn.c (begin_schedule_ready): Remove second argument.
19773         (rgn_const_sched_info): Add NULL entry for the begin_move_insn field.
19774
19775         * haifa-sched.c (prune_ready_list): New function, broken out of
19776         schedule_block.
19777         (schedule_block): Use it.
19778
19779 2011-04-01  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
19780
19781         * config/spu/t-spu-elf (dp-bit.c): Use > instead of >>.
19782
19783 2011-04-01  Kai Tietz  <ktietz@redhat.com>
19784
19785         * config.gcc (*-*-mingw*): Allow as option the
19786         posix threading model.
19787         * config/i386/mingw32.h (SPEC_PTHREAD1,  SPEC_PTHREAD2):
19788         New macros defined dependent to TARGET_USE_PTHREAD_BY_DEFAULT
19789         definition.
19790         (CPP_SPEC): Add pthread/no-pthread handling.
19791         (LIB_SPEC): Likewise.
19792         * config/i386/mingw-w64.h (CPP_SPEC):Likewise.
19793         (LIB_SPEC): Likewise.
19794         * config/i386/t-cygming (SHLIB_PTHREAD_CFLAG): New
19795         flag to pass -pthread option for shared libgcc build.
19796         (SHLIB_PTHREAD_LDFLAG): New option to pass -lpthread
19797         for shared libgcc build.
19798         * config/i386/t-mingw-pthread: New file.
19799         * config/i386/mingw-pthread.h (TARGET_USE_PTHREAD_BY_DEFAULT):
19800         New define to enable use of library pthread by default.
19801         * config/i386/mingw.opt (pthread): New driver option.
19802         (no-pthread): New driver option.
19803         * config/i386/cygming.opt: Make sure trailing empty line is retained.
19804         * config/i386/mingw-w64.opt: Likewise.
19805
19806 2011-04-01  Gary Funck  <gary@intrepid.com>
19807
19808         * c-decl.c (grokdeclarator): Fix formatting.
19809
19810 2011-04-01  Richard Sandiford  <richard.sandiford@linaro.org>
19811
19812         * expr.c (emit_block_move_via_movmem): Use n_generator_args
19813         instead of n_operands.
19814         (set_storage_via_setmem): Likewise.
19815         * optabs.c (maybe_gen_insn): Likewise.
19816         * config/arm/arm.c (arm_init_neon_builtins): Likewise.
19817         * config/mips/mips.c (mips_expand_builtin_compare_1): Likewise.
19818         (mips_expand_builtin_direct): Likewise.
19819         * config/spu/spu.c (expand_builtin_args): Likewise.
19820
19821 2011-04-01  Richard Sandiford  <richard.sandiford@linaro.org>
19822
19823         * recog.h (insn_data_d): Add n_generator_args.
19824         * genoutput.c (data): Likewise.
19825         (output_insn_data): Print it.
19826         (max_opno, num_dups): Delete.
19827         (scan_operands): Just fill in "d->operand[...]".
19828         (gen_insn, gen_peephole, gen_expand, gen_split): Use get_pattern_stats.
19829
19830 2011-04-01  Richard Sandiford  <richard.sandiford@linaro.org>
19831
19832         * gensupport.h (pattern_stats): New structure.
19833         * gensupport.c (get_pattern_stats_1, get_pattern_stats): New functions.
19834         * genemit.c (max_opno, max_dupno, max_scratch_opno): Delete.
19835         (max_operand_1, max_operand_vec): Delete.
19836         (gen_insn, gen_expand, gen_split): Use get_pattern_stats.
19837
19838 2011-03-31  Nathan Froyd  <froydnj@codesourcery.com>
19839
19840         * emit-rtl.c (emit_pattern_after_setloc): New function.
19841         (emit_insn_after_setloc, emit_jump_insn_after_setloc): Call it.
19842         (emit_call_insn_after_setloc, emit_debug_insn_after_setloc): Likewise.
19843         (emit_pattern_after): New function.
19844         (emit_insn_after, emit_jump_insn_after): Call it.
19845         (emit_call_insn_after, emit_debug_insn_after): Likewise.
19846         (emit_pattern_before_setloc): New function.
19847         (emit_insn_before_setloc, emit_jump_insn_before_setloc): Call it.
19848         (emit_call_insn_before_setloc, emit_debug_insn_before_setloc):
19849         Likewise.
19850         (emit_pattern_before): New function.
19851         (emit_insn_before, emit_jump_insn_before): Call it.
19852         (emit_call_insn_before, emit_debug_insn_before): Likewise.
19853
19854 2011-03-31  Richard Henderson  <rth@redhat.com>
19855
19856         * dwarf2out.c (dw_separate_line_info_ref): Remove.
19857         (dw_separate_line_info_entry): Remove.
19858         (enum dw_line_info_opcode): New.
19859         (dw_line_info_entry): Use it.
19860         (dw_line_info_table, dw_line_info_table_p): New.
19861         (DWARF_LINE_OPCODE_BASE): Include dwarf3 opcodes.
19862         (line_info_table, line_info_label_num): Remove.
19863         (line_info_table_in_use): Remove.
19864         (separate_line_info_table): Remove.
19865         (separate_line_info_table_allocated): Remove.
19866         (separate_line_info_table_in_use): Remove.
19867         (LINE_INFO_TABLE_INCREMENT): Remove.
19868         (line_info_label_num): New.
19869         (cur_line_info_table): New.
19870         (text_section_line_info, cold_text_section_line_info): New.
19871         (separate_line_info): New.
19872         (SEPARATE_LINE_CODE_LABEL): Remove.
19873         (print_dwarf_line_table): Remove.
19874         (debug_dwarf): Don't dump it.
19875         (output_one_line_info_table): New.
19876         (output_line_info): Use it.
19877         (new_line_info_table): New.
19878         (set_cur_line_info_table): New.
19879         (dwarf2out_switch_text_section): Use it.
19880         (dwarf2out_begin_function): Likewise.
19881         (push_dw_line_info_entry): New.
19882         (dwarf2out_source_line): Rewrite for new line info tables.
19883         (dwarf2out_init): Remove dead initailizations.
19884
19885 2011-03-31  Joseph Myers  <joseph@codesourcery.com>
19886
19887         * opts.h (cl_option): Add comments to fields.  Add bit-fields for
19888         various flags.
19889         (CL_SEPARATE_NARGS_SHIFT, CL_SEPARATE_NARGS_MASK,
19890         CL_SEPARATE_ALIAS, CL_NO_DRIVER_ARG, CL_REJECT_DRIVER, CL_SAVE,
19891         CL_DISABLED, CL_REPOR, CL_REJECT_NEGATIVE, CL_MISSING_OK,
19892         CL_UINTEGER, CL_NEGATIVE_ALIAS): Remove.
19893         (CL_JOINED, CL_SEPARATE, CL_UNDOCUMENTED): Update bit positions.
19894         * opt-functions.awk (flag_init, switch_bit_fields): New.
19895         (switch_flags): Don't handle flags moved to bit-fields.  Don't
19896         generate CL_MISSING_OK or CL_SAVE.
19897         * optc-gen.awk: Update to generate bit-field output as well as
19898         flags field.
19899         * gcc.c (driver_wrong_lang_callback): Use cl_reject_driver
19900         bit-field instead of CL_REJECT_DRIVER flag.
19901         * opts-common.c (generate_canonical_option,
19902         decode_cmdline_option): Use bit-fields instead of CL_* flags.
19903         * opts.c (maybe_default_option): Use cl_reject_negative bit-field
19904         instead of CL_REJECT_NEGATIVE flag.
19905         * toplev.c (print_switch_values): Use cl_report bit-field instead
19906         of CL_REPORT flag.
19907
19908 2011-03-31  Eric Botcazou  <ebotcazou@adacore.com>
19909
19910         * tree-ssa-pre.c (create_component_ref_by_pieces_1) <ARRAY_REF>: Drop
19911         a zero minimum index only if it is redundant.
19912
19913 2011-03-31  Vladimir Makarov  <vmakarov@redhat.com>
19914
19915         PR rtl-optimization/48381
19916         * ira-color.c (assign_hard_reg): Use hard reg set intersection
19917         instead of ira_class_hard_reg_index for calculating conflicting
19918         hard registers.
19919
19920 2011-03-31  Steven Bosscher  <steven@gcc.gnu.org>
19921
19922         * cprop.c: Clean up hash table building.
19923         (reg_avail_info): Remove.
19924         (oprs_available_p): Remove.
19925         (record_last_reg_set_info): Remove.
19926         (record_last_set_info): Remove.
19927         (reg_available_p): New function.
19928         (gcse_constant_p): Do not treat unfolded conditions as constants.
19929         (make_set_regs_unavailable): New function.
19930         (hash_scan_set): Simplify with new reg_available_p.
19931         (compute_hash_table_work): Traverse insns stream only once.
19932         Do not compute reg_avail_info. Traverse insns in reverse order.
19933         Record implicit sets after recording explicit sets from the block.
19934
19935 2011-03-31  Michael Matz  <matz@suse.de>
19936
19937         * builtins.c (build_va_arg_indirect_ref): Use build_simple_mem_ref_loc.
19938
19939 2011-03-31  Anatoly Sokolov  <aesok@post.ru>
19940
19941         * config/h8300/h8300.h (GO_IF_MODE_DEPENDENT_ADDRESS): Remove macro.
19942         * config/h8300/h8300-protos.h (h8300_get_index): Remove.
19943         * config/h8300/h8300.c (TARGET_MODE_DEPENDENT_ADDRESS_P): Define.
19944         (h8300_mode_dependent_address_p): New function.
19945         (h8300_get_index): Make static.
19946
19947 2011-03-31  Jeff Law  <law@redhat.com>
19948
19949         * reload1.c (elimination_effects): Fix typo in recent change.
19950
19951         * tree-ssa-forwprop.c (forward_propagate_into_cond): Avoid
19952         typo potentially leading to null pointer dereference.
19953
19954         * caller-save.c (new_saved_hard_reg): Eliminate return value.
19955         (setup_save_areas): Corresponding changes to avoid useless
19956         assignments.
19957
19958         * jump.c (reversed_comparison_code_parts): Avoid successive return
19959         statements when REVERSE_CONDITION is defined.
19960
19961         * expr.c (expand_assignment): Avoid useless assignments.
19962         (expand_expr_real_1): Likewise.
19963         (expand_expr_real_2): Avoid useless statements.
19964
19965         * tree-ssa-phiopt.c (minmax_replacement): Avoid useless statement.
19966
19967         * cfgexpand.c (expand_gimple_basic_block): Avoid useless assignment.
19968
19969         * tree-ssa-dce.c (mark_stmt_if_obviously_necessary): Avoid useless
19970         statements.
19971
19972         * stmt.c (expand_expr_stmt): Avoid useless assignment.
19973
19974 2011-03-31  Joseph Myers  <joseph@codesourcery.com>
19975
19976         PR target/47109
19977         * doc/tm.texi.in (TARGET_VERSION): Remove.
19978         * doc/tm.texi: Regenerate.
19979         * system.h (TARGET_VERSION, MACHINE_TYPE): Poison.
19980         * collect2.c (main): Don't use TARGET_VERSION.
19981         * mips-tdump.c (main): Don't use TARGET_VERSION.
19982         * mips-tfile.c (main): Don't use TARGET_VERSION.
19983         * config.gcc (powerpc-wrs-vxworksae): Don't use rs6000/vxworksae.h.
19984         * config/rs6000/vxworksae.h: Remove.
19985         * config/alpha/alpha.h (TARGET_VERSION): Remove.
19986         * config/alpha/freebsd.h (TARGET_VERSION): Remove.
19987         * config/alpha/linux-elf.h (TARGET_VERSION): Remove.
19988         * config/alpha/netbsd.h (TARGET_VERSION): Remove.
19989         * config/alpha/vms.h (TARGET_NAME, TARGET_VERSION): Remove.
19990         * config/arm/arm.h (TARGET_VERSION): Remove.
19991         * config/arm/coff.h (TARGET_VERSION): Remove.
19992         * config/arm/ecos-elf.h (TARGET_VERSION): Remove.
19993         * config/arm/elf.h (TARGET_VERSION): Remove.
19994         * config/arm/freebsd.h (TARGET_VERSION): Remove.
19995         * config/arm/linux-elf.h (TARGET_VERSION): Remove.
19996         * config/arm/netbsd-elf.h (TARGET_VERSION): Remove.
19997         * config/arm/pe.h (TARGET_VERSION): Remove.
19998         * config/arm/rtems-elf.h (TARGET_VERSION): Remove.
19999         * config/arm/semi.h (TARGET_VERSION): Remove.
20000         * config/arm/uclinux-elf.h (TARGET_VERSION): Remove.
20001         * config/arm/unknown-elf.h (TARGET_VERSION): Remove.
20002         * config/arm/vxworks.h (TARGET_VERSION): Remove.
20003         * config/avr/avr.h (TARGET_VERSION): Remove.
20004         * config/bfin/bfin.h (TARGET_VERSION): Remove.
20005         * config/fr30/fr30.h (TARGET_VERSION): Remove.
20006         * config/frv/frv.h (TARGET_VERSION): Remove.
20007         * config/h8300/h8300.h (TARGET_VERSION): Remove.
20008         * config/i386/cygwin.h (TARGET_VERSION): Remove.
20009         * config/i386/darwin.h (TARGET_VERSION): Remove.
20010         * config/i386/darwin64.h (TARGET_VERSION): Remove.
20011         * config/i386/djgpp.h (TARGET_VERSION): Remove.
20012         * config/i386/freebsd.h (TARGET_VERSION): Remove.
20013         * config/i386/freebsd64.h (TARGET_VERSION): Remove.
20014         * config/i386/gnu.h (TARGET_VERSION): Remove.
20015         * config/i386/i386-interix.h (TARGET_VERSION): Remove.
20016         * config/i386/i386elf.h (TARGET_VERSION): Remove.
20017         * config/i386/linux.h (TARGET_VERSION): Remove.
20018         * config/i386/linux64.h (TARGET_VERSION): Remove.
20019         * config/i386/lynx.h (TARGET_VERSION): Remove.
20020         * config/i386/mingw32.h (TARGET_VERSION): Remove.
20021         * config/i386/netbsd-elf.h (TARGET_VERSION): Remove.
20022         * config/i386/netbsd64.h (TARGET_VERSION): Remove.
20023         * config/i386/netware.h (TARGET_VERSION): Remove.
20024         * config/i386/nto.h (TARGET_VERSION): Remove.
20025         * config/i386/openbsd.h (TARGET_VERSION): Remove.
20026         * config/i386/vxworks.h (TARGET_VERSION): Remove.
20027         * config/ia64/elf.h (TARGET_VERSION): Remove.
20028         * config/ia64/freebsd.h (TARGET_VERSION): Remove.
20029         * config/ia64/hpux.h (TARGET_VERSION): Remove.
20030         * config/ia64/linux.h (TARGET_VERSION): Remove.
20031         * config/ia64/vms.h (TARGET_NAME, TARGET_VERSION): Remove.
20032         * config/iq2000/iq2000.h (IQ2000_VERSION, MACHINE_TYPE,
20033         TARGET_VERSION_INTERNAL, TARGET_VERSION): Remove.
20034         * config/lm32/lm32.h (TARGET_VERSION): Remove.
20035         * config/lm32/uclinux-elf.h (TARGET_VERSION): Remove.
20036         * config/m32c/m32c.h (TARGET_VERSION): Remove.
20037         * config/m32r/linux.h (LINUX_DEFAULT_ELF, TARGET_VERSION): Remove.
20038         * config/m32r/m32r.h (TARGET_VERSION): Remove.
20039         * config/m68k/linux.h (TARGET_VERSION): Remove.
20040         * config/m68k/m68k.h (TARGET_VERSION): Remove.
20041         * config/m68k/netbsd-elf.h (TARGET_VERSION): Remove.
20042         * config/m68k/uclinux.h (TARGET_VERSION): Remove.
20043         * config/mcore/mcore-elf.h (TARGET_VERSION): Remove.
20044         * config/mep/mep.h (TARGET_VERSION): Remove.
20045         * config/microblaze/microblaze.h (MICROBLAZE_VERSION,
20046         MACHINE_TYPE, TARGET_VERSION_INTERNAL, TARGET_VERSION): Remove.
20047         * config/mips/iris6.h (MACHINE_TYPE): Remove.
20048         * config/mips/linux.h (TARGET_VERSION): Remove.
20049         * config/mips/netbsd.h (MACHINE_TYPE): Remove.
20050         * config/mips/vxworks.h (TARGET_VERSION): Remove.
20051         * config/mmix/mmix.h (TARGET_VERSION): Remove.
20052         * config/mn10300/linux.h (TARGET_VERSION): Remove.
20053         * config/mn10300/mn10300.h (TARGET_VERSION): Remove.
20054         * config/pa/pa.h (TARGET_VERSION): Remove.
20055         * config/pdp11/pdp11.h (TARGET_VERSION): Remove.
20056         * config/picochip/picochip.h (TARGET_VERSION): Remove.
20057         * config/rs6000/aix.h (TARGET_VERSION): Remove.
20058         * config/rs6000/darwin.h (TARGET_VERSION): Remove.
20059         * config/rs6000/darwin64.h (TARGET_VERSION): Remove.
20060         * config/rs6000/eabi.h (TARGET_VERSION): Remove.
20061         * config/rs6000/eabialtivec.h (TARGET_VERSION): Remove.
20062         * config/rs6000/eabisim.h (TARGET_VERSION): Remove.
20063         * config/rs6000/eabispe.h (TARGET_VERSION): Remove.
20064         * config/rs6000/freebsd.h (TARGET_VERSION): Remove.
20065         * config/rs6000/linux.h (TARGET_VERSION): Remove.
20066         * config/rs6000/linux64.h (TARGET_VERSION): Remove.
20067         * config/rs6000/linuxaltivec.h (TARGET_VERSION): Remove.
20068         * config/rs6000/linuxspe.h (TARGET_VERSION): Remove.
20069         * config/rs6000/lynx.h (TARGET_VERSION): Remove.
20070         * config/rs6000/netbsd.h (TARGET_VERSION): Remove.
20071         * config/rs6000/sysv4.h (TARGET_VERSION): Remove.
20072         * config/rs6000/vxworks.h (TARGET_VERSION): Remove.
20073         * config/s390/linux.h (TARGET_VERSION): Remove.
20074         * config/s390/s390.h (TARGET_VERSION): Remove.
20075         * config/s390/tpf.h (TARGET_VERSION): Remove.
20076         * config/score/score.h (TARGET_VERSION): Remove.
20077         * config/sh/linux.h (TARGET_VERSION): Remove.
20078         * config/sh/netbsd-elf.h (TARGET_VERSION_ENDIAN,
20079         TARGET_VERSION_CPU, TARGET_VERSION): Remove.
20080         * config/sh/sh.h (TARGET_VERSION): Remove.
20081         * config/sh/sh64.h (TARGET_VERSION): Remove.
20082         * config/sh/superh.h (TARGET_VERSION): Remove.
20083         * config/sh/vxworks.h (TARGET_VERSION): Remove.
20084         * config/sparc/freebsd.h (TARGET_VERSION): Remove.
20085         * config/sparc/linux.h (TARGET_VERSION): Remove.
20086         * config/sparc/linux64.h (TARGET_VERSION): Remove.
20087         * config/sparc/netbsd-elf.h (TARGET_VERSION, TARGET_NAME64,
20088         TARGET_NAME32, TARGET_NAME): Remove.
20089         * config/sparc/openbsd64.h (TARGET_VERSION): Remove.
20090         * config/sparc/sp-elf.h (TARGET_VERSION): Remove.
20091         * config/sparc/sp64-elf.h (TARGET_VERSION): Remove.
20092         * config/sparc/sysv4.h (TARGET_VERSION): Remove.
20093         * config/sparc/vxworks.h (TARGET_VERSION): Remove.
20094         * config/spu/spu.h (TARGET_VERSION): Remove.
20095         * config/stormy16/stormy16.h (TARGET_VERSION): Remove.
20096         * config/v850/v850.h (TARGET_VERSION): Remove.
20097         * config/vax/linux.h (TARGET_VERSION): Remove.
20098         * config/vax/vax.h (TARGET_NAME, TARGET_VERSION): Remove.
20099         * config/xtensa/elf.h (TARGET_VERSION): Remove.
20100         * config/xtensa/linux.h (TARGET_VERSION): Remove.
20101
20102 2011-03-31  Eric Botcazou  <ebotcazou@adacore.com>
20103
20104         PR target/48142
20105         * config/i386/i386.c (ix86_adjust_stack_and_probe): Differentiate
20106         frame-related from frame-unrelated adjustments to the stack pointer.
20107
20108 2011-03-31  Jakub Jelinek  <jakub@redhat.com>
20109
20110         * common.opt (fdebug-types-section): Move earlier.
20111         * doc/invoke.texi: Fix up -fno-debug-types-section documentation.
20112
20113 2011-03-31  Andreas Tobler  <andreast@fgznet.ch>
20114
20115         * config/rs6000/rs6000.c (rs6000_handle_option): Remove unused isel
20116         var.
20117
20118 2011-03-30  Nathan Froyd  <froydnj@codesourcery.com>
20119
20120         * tree.h (CASE_CHAIN): Define.
20121         * tree-cfg.c (edge_to_cases_cleanup, get_cases_for_edge): Use it.
20122         (gimple_redirect_edge_and_branch): Likewise.
20123
20124 2011-03-30  Vladimir Makarov  <vmakarov@redhat.com>
20125
20126         PR middle-end/48367
20127         * ira-costs.c (find_costs_and_classes): Fix a typo in i_mem_cost
20128         calculation.
20129
20130 2011-03-30  Jeff Law  <law@redhat.com>
20131
20132         * PR bootstrap/48371
20133         * reload1.c (reload): Fix botch in last change.
20134
20135         * reload.h (struct reload): Fix typo introduced in last change.
20136
20137 2011-03-30  Joseph Myers  <joseph@codesourcery.com>
20138
20139         * config/arm/arm.opt (mhard-float, msoft-float): Mark
20140         Undocumented.  Remove help text.
20141         * doc/invoke.texi (ARM Options): Don't document -msoft-float and
20142         -mhard-float.
20143
20144 2011-03-30  Joseph Myers  <joseph@codesourcery.com>
20145
20146         * doc/options.texi (NegativeAlias): Document.
20147         (Alias): Mention NegativeAlias.
20148         * opt-functions.awk: Handle NegativeAlias.
20149         * optc-gen.awk: Disallow NegativeAlias with multiple Alias arguments.
20150         * opts-common.c (decode_cmdline_option): Handle CL_NEGATIVE_ALIAS.
20151         * opts.h (CL_NEGATIVE_ALIAS): Define.
20152         * config/rs6000/rs6000.c (rs6000_parse_yes_no_option): Remove.
20153         (rs6000_handle_option): Don't handle OPT_mvrsave_, OPT_misel_ and
20154         OPT_mspe_.
20155         * config/rs6000/rs6000.opt (mvrsave=, misel=, mspe=): Replace with
20156         Alias entries.
20157         * config/rs6000/t-spe (MULTILIB_OPTIONS, MULTILIB_EXCEPTIONS): Use
20158         mno-spe and mno-isel instead of mspe=no and -misel=no.
20159
20160 2011-03-29  Mark Wielaard  <mjw@redhat.com>
20161
20162         * common.opt (fdebug-types-section): New flag.
20163         * doc/invoke.texi: Document new -fno-debug-types-section flag.
20164         * dwarf2out.c (use_debug_types): New define.
20165         (struct die_struct): Mark die_id with GTY desc use_debug_types.
20166         (print_die): Guard output of type unit signatures using
20167         use_debug_types.
20168         (build_abbrev_table): Replace assert of dwarf_version >= 4
20169         with assert on use_debug_types.
20170         (size_of_die): Likewise.
20171         (unmark_dies): Likewise.
20172         (value_format): Decide AT_ref_external form on use_debug_types.
20173         (output_die): Replace dwarf_version version check guard with
20174         use_debug_types where appropriate.
20175         (modified_type_die): Likewise.
20176         (gen_reference_type_die): Likewise.
20177         (dwarf2out_start_source_file): Likewise.
20178         (dwarf2out_end_source_file): Likewise.
20179         (prune_unused_types_walk_attribs): Likewise.
20180         (dwarf2out_finish): Likewise.
20181
20182 2011-03-30  Vladimir Makarov  <vmakarov@redhat.com>
20183
20184         * ira-color.c (ira_assign_hard_reg): Use only one variable 'mode'.
20185
20186 2011-03-30  Richard Sandiford  <richard.sandiford@linaro.org>
20187
20188         PR rtl-optimization/48332
20189         * optabs.c (expand_binop_directly): Set xmodeN to the target-mandated
20190         mode of input operand N and modeN to its actual mode.
20191
20192 2011-03-30  Jeff Law  <law@redhat.com>
20193
20194         * reload.h (reg_equiv_constant): Move into new structure reg_equivs,
20195         define accessor macro.
20196         (reg_equiv_invariant, reg_equiv_memory_loc): Likewise.
20197         (reg_equiv_address, reg_equiv_mem, reg_equiv_alt_mem_list): Likewise.
20198         (reg_equiv_init): Likewise.
20199         (reg_equivs_size): New variable.
20200         (reg_equiv_init_size): Remove.
20201         (allocate_initial_values): Move prototype to here from....
20202         * integrate.h (allocate_initial_values): Remove prototype.
20203         * integrate.c: Include reload.h.
20204         (allocate_initial_values): Corresponding changes.
20205         * ira.c (find_reg_equiv_invariant_cost): Corresponding changes.
20206         (fix_reg_equiv_init, no_equiv): Corresponding changes.
20207         (update_equiv_regs): Corresponding changes.
20208         (ira): Corresponding changes.
20209         * reload.c (push_reg_equiv_alt_mem): Corresponding changes.
20210         (push_secondary_reload): Corresponding changes.
20211         (push_reload, find_reloads, find_reloads_toplev): Corresponding changes.
20212         (make_memloc, find_reloads_address): Corresponding changes.
20213         (subst_reg_equivs, subst_indexed_address): Corresponding changes.
20214         (find_reloads_address_1): Corresponding changes.
20215         (find_reloads_subreg_address, subst_reloads): Corresponding changes.
20216         (refers_to_regno_for_reload_p): Corresponding changes.
20217         (reg_overlap_mentioned_for_reload_p): Corresponding changes.
20218         (refers_to_mem_for_reload_p, find_equiv_reg): Corresponding changes.
20219         * reload1.c: Include ggc.h.
20220         (grow_reg_equivs): New function.
20221         (replace_pseudos_in, reload): Corresponding changes.
20222         (calculate_needs_all_insns, alter_regs): Corresponding changes.
20223         (eliminate_regs_1, elimination_effects): Corresponding changes.
20224         (emit_input_reload_insns, emit_output_reload_insns): Likewise.
20225         (delete_output_reload): Likewise.
20226         * caller-save.c (mark_referenced_regs): Corresponding changes.
20227         * alpha/alpha.c (resolve_reload_operand): Corresponding changes.
20228         * frv/predicates.md (frv_load_operand): Corresponding changes.
20229         * microblaze/microblaze.c (double_memory_operand): Corresponding
20230         changes.
20231         * avr/avr.h (LEGITIMIZE_RELOAD_ADDRESS): Corresponding changes.
20232         * xtensa/xtensa.c (fixup_subreg_mem): Corresponding changes.
20233         * mn10300/mn10300.c (mn10300_secondary_reload): Corresponding changes.
20234         * m68k/m68k.c (emit_move_sequence): Corresponding changes.
20235         * arm/arm.c (arm_reload_in_hi, arm_reload_out_hi): Corresponding
20236         changes.
20237         * pa/pa.c (emit_move_sequence): Corresponding changes.
20238         * vax/vax.c (nonindexed_address_p): Corresponding changes.
20239
20240 2011-03-30  Richard Sandiford  <richard.sandiford@linaro.org>
20241
20242         PR target/47551
20243         * config/arm/arm.c (coproc_secondary_reload_class): Handle
20244         structure modes.  Don't check neon_vector_mem_operand for
20245         vector or structure modes.
20246
20247 2011-03-30  Richard Sandiford  <richard.sandiford@linaro.org>
20248             Ramana Radhakrishnan  <ramana.radhakrishnan@linaro.org>
20249
20250         PR target/43590
20251         * config/arm/neon.md (neon_vld3qa<mode>, neon_vld4qa<mode>): Remove
20252         operand 1 and reshuffle the operands to match.
20253         (neon_vld3<mode>, neon_vld4<mode>): Update accordingly.
20254
20255 2011-03-30  Christian Schüler  <cschueler@gmx.de>
20256
20257         PR driver/48208
20258         * config/c.opt (F): Added 'Driver' to -F option.
20259
20260         PR driver/48260
20261         * config/darwin-driver.c (darwin_driver_init): Add '-arch' to
20262           handler function.
20263         * config/darwin.opt: Added '-arch' option.
20264
20265 2011-03-30  Nick Clifton  <nickc@redhat.com>
20266
20267         * config/rx/rx.md: Add peepholes and patterns to combine
20268         extending loads and simple arithmetic instructions.
20269         * config/rx/rx.h (ADJUST_INSN_LENGTH): Define.
20270         * config/rx/rx-protos.h (rx_adjust_insn_length): Prototype.
20271         * config/rx/rx.c (rx_is_legitimate_address): Allow QI and HI
20272         modes to use pre-decrement and post-increment addressing.
20273         (rx_is_restricted_memory_address): Add range checking of REG+INT
20274         addresses.
20275         (rx_print_operand): Add support for %Q.  Fix handling of %Q.
20276         (rx_memory_move_cost): Adjust cost of stores.
20277         (rx_adjust_insn_length): New function.
20278
20279 2011-03-30  Jakub Jelinek  <jakub@redhat.com>
20280
20281         PR c/48305
20282         * fold-const.c (fold_binary_loc) <case EQ_EXPR, NE_EXPR>: Make sure
20283         arg10/arg11 in (X ^ Y) == (Z ^ W) are always fold converted to
20284         matching arg00/arg01 types.
20285
20286 2011-03-30  Eric Botcazou  <ebotcazou@adacore.com>
20287
20288         * cfglayout.c (insn_locators_alloc): Initialize curr_location and
20289         last_location to UNKNOWN_LOCATION.
20290
20291 2011-03-30  H.J. Lu  <hongjiu.lu@intel.com>
20292
20293         PR target/48349
20294         * config/i386/i386.h (REG_CLASS_CONTENTS): Fix a typo in
20295         FLOAT_SSE_REGS.
20296
20297 2011-03-30  Joseph Myers  <joseph@codesourcery.com>
20298             Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
20299
20300         PR bootstrap/48337
20301         * config/sparc/sparc.opt (sparc_cpu_and_features): Add
20302         Init(PROCESSOR_V7).
20303         (sparc_cpu): Likewise.
20304         * config/sparc/sparc.c (sparc_option_override): Replace 0 by
20305         PROCESSOR_V7.
20306
20307 2011-03-29  Vladimir Makarov  <vmakarov@redhat.com>
20308
20309         PR target/48336
20310         PR middle-end/48342
20311         PR rtl-optimization/48345
20312         * ira-color.c (setup_conflict_profitable_regs): Exclude prohibited
20313         hard regs for given mode from profitable regs when doing secondary
20314         allocation.
20315
20316 2011-03-29  Jeff Law  <law@redhat.com>
20317
20318         PR bootstrap/48327
20319         * tree-ssa-threadupdate.c (struct redirection_data): Remove
20320         do_not_duplicate field.
20321         (lookup_redirection_data): Corresponding changes.
20322         (create_duplicates): Always create a template block.
20323         (redirect_edges): Remove code which reused the original block
20324         when it was going to become unreachable code.
20325         (thread_block): Don't set do_not_duplicate field.
20326
20327 2011-03-29  Joseph Myers  <joseph@codesourcery.com>
20328
20329         * lto-opts.c (register_user_option_p, lto_register_user_option):
20330         Make type argument unsigned.
20331         * lto-streamer.h (lto_register_user_option): Make type argument
20332         unsigned.
20333         * opth-gen.awk: Make CL_* macros unsigned.
20334         * opts-common.c (find_opt): Make lang_mask argument unsigned.
20335         * opts.h (CL_PARAMS, CL_WARNING, CL_OPTIMIZATION, CL_DRIVER,
20336         CL_TARGET, CL_COMMON, CL_SEPARATE_NARGS_MASK, CL_SEPARATE_ALIAS,
20337         CL_NO_DRIVER_ARG, CL_REJECT_DRIVER, CL_SAVE, CL_DISABLED,
20338         CL_REPORT, CL_JOINED, CL_SEPARATE, CL_REJECT_NEGATIVE,
20339         CL_MISSING_OK, CL_UINTEGER, CL_UNDOCUMENTED): Make unsigned.
20340         (find_opt): Make lang_mask argument unsigned.
20341
20342 2011-03-29  Vladimir Makarov  <vmakarov@redhat.com>
20343
20344         PR rtl-optimization/48331
20345         PR rtl-optimization/48334
20346         * ira-color.c (color_allocnos): Call setup_profitable_hard_regs
20347         for any used algorithm.
20348
20349 2011-03-29  Vladimir Makarov  <vmakarov@redhat.com>
20350
20351         * ira-conflicts.c (build_object_conflicts): Add unused attribute
20352         to parent_max.
20353
20354 2011-03-29  Uros Bizjak  <ubizjak@gmail.com>
20355
20356         * config/alpha/alpha.c (alpha_sr_alias_set): Don't define.
20357         (alpha_option_override): Don't set alpha_sr_alias_set.
20358         (emit_frame_store_1): Use gen_frame_mem rather than calling
20359         set_mem_alias_set.
20360         (alpha_expand_epilogue): Ditto.
20361
20362 2011-03-29  Ira Rosen  <ira.rosen@linaro.org>
20363
20364         PR tree-optimization/48290
20365         * tree-vect-loop.c (vect_analyze_loop_operations): In outer loop
20366         vectorization, check that relevant phis in the basic block after
20367         the inner loop are really inner loop's exit phis.
20368
20369 2011-03-29  Richard Sandiford  <richard.sandiford@linaro.org>
20370
20371         PR debug/48190
20372         * dwarf2out.c (dw_loc_list_node): Add resolved_addr and replaced.
20373         (cached_dw_loc_list_def): New structure.
20374         (cached_dw_loc_list): New typedef.
20375         (cached_dw_loc_list_table): New variable.
20376         (cached_dw_loc_list_table_hash): New function.
20377         (cached_dw_loc_list_table_eq): Likewise.
20378         (add_location_or_const_value_attribute): Take a bool cache_p.
20379         Cache the list when the parameter is true.
20380         (gen_formal_parameter_die): Update caller.
20381         (gen_variable_die): Likewise.
20382         (dwarf2out_finish): Likewise.
20383         (dwarf2out_abstract_function): Nullify cached_dw_loc_list_table
20384         while generating debug info for the decl.
20385         (dwarf2out_function_decl): Clear cached_dw_loc_list_table.
20386         (dwarf2out_init): Initialize cached_dw_loc_list_table.
20387         (resolve_addr): Cache the result of resolving a chain of
20388         location lists.
20389
20390 2011-03-28  Vladimir Makarov  <vmakarov@redhat.com>
20391
20392         * ira-color.c (update_left_conflict_sizes_p): Don't assume that
20393         conflict object hard regset nodes have intersecting hard reg sets.
20394
20395         * regmove.c (regmove_optimize): Move ira_set_pseudo_classes call
20396         after regstat_init_n_sets_and_refs.
20397
20398         * ira.c: Add more comments at the top.
20399         (setup_stack_reg_pressure_class, setup_pressure_classes):
20400         Add comments how we compute the register pressure classes.
20401         (setup_allocno_and_important_classes): Add more comments.
20402         (setup_class_translate_array, reorder_important_classes)
20403         (setup_reg_class_relations): Add comments.
20404
20405         * ira-emit.c: Add 2011 to the Copyright line.  Add comments at the
20406         start of the file.
20407
20408         * ira-color.c: Add 2011 to the Copyright line.
20409         (assign_hard_reg):  Add more comments.
20410         (improve_allocation): Ditto.
20411
20412         * ira-costs.c: Add 2011 to the Copyright line.
20413         (setup_cost_classes, setup_regno_cost_classes_by_aclass): Add more
20414         comments.
20415         (setup_regno_cost_classes_by_mode): Ditto.
20416
20417         Initial patches from ira-improv branch:
20418
20419         2010-08-13  Vladimir Makarov  <vmakarov@redhat.com>
20420
20421         * ira-build.c (ira_create_object): Remove initialization of
20422         OBJECT_PROFITABLE_HARD_REGS.  Initialize OBJECT_ADD_DATA.
20423         (ira_create_allocno): Remove initialization of
20424         ALLOCNO_MEM_OPTIMIZED_DEST, ALLOCNO_MEM_OPTIMIZED_DEST_P,
20425         ALLOCNO_SOMEWHERE_RENAMED_P, ALLOCNO_CHILD_RENAMED_P,
20426         ALLOCNO_IN_GRAPH_P, ALLOCNO_MAY_BE_SPILLED_P, ALLOCNO_COLORABLE_P,
20427         ALLOCNO_NEXT_BUCKET_ALLOCNO, ALLOCNO_PREV_BUCKET_ALLOCNO,
20428         ALLOCNO_FIRST_COALESCED_ALLOCNO, ALLOCNO_NEXT_COALESCED_ALLOCNO.
20429         Initialize ALLOCNO_ADD_DATA.
20430         (copy_info_to_removed_store_destinations): Use ALLOCNO_EMIT_DATA
20431         and allocno_emit_reg instead of ALLOCNO_MEM_OPTIMIZED_DEST_P and
20432         ALLOCNO_REG.
20433         (ira_flattening): Ditto.  Use ALLOCNO_EMIT_DATA instead of
20434         ALLOCNO_MEM_OPTIMIZED_DEST and ALLOCNO_SOMEWHERE_RENAMED_P.
20435
20436         * ira.c (ira_reallocate): Remove.
20437         (setup_pressure_classes): Call
20438         ira_init_register_move_cost_if_necessary.  Use
20439         ira_register_move_cost instead of ira_get_register_move_cost.
20440         (setup_allocno_assignment_flags): Use ALLOCNO_EMIT_DATA.
20441         (ira): Call ira_initiate_emit_data and ira_finish_emit_data.
20442
20443         * ira-color.c: Use ALLOCNO_COLOR_DATA instead of
20444         ALLOCNO_IN_GRAPH_P, ALLOCNO_MAY_BE_SPILLED_P, ALLOCNO_COLORABLE_P,
20445         ALLOCNO_AVAILABLE_REGS_NUM, ALLOCNO_NEXT_BUCKET_ALLOCNO,
20446         ALLOCNO_PREV_BUCKET_ALLOCNO. ALLOCNO_TEMP. Use OBJECT_COLOR_DATA
20447         instead of OBJECT_PROFITABLE_HARD_REGS, OBJECT_HARD_REGS_NODE,
20448         OBJECT_HARD_REGS_SUBNODES_START, OBJECT_HARD_REGS_SUBNODES_NUM.
20449         Fix formatting.
20450         (object_hard_regs_t, object_hard_regs_node_t): Move from ira-int.h.
20451         (struct object_hard_regs, struct object_hard_regs_node): Ditto.
20452         (struct allocno_color_data): New.
20453         (allocno_color_data_t): New typedef.
20454         (allocno_color_data): New definition.
20455         (ALLOCNO_COLOR_DATA): New macro.
20456         (struct object_color_data): New.
20457         (object_color_data_t): New typedef.
20458         (object_color_data): New definition.
20459         (OBJECT_COLOR_DATA): New macro.
20460         (update_copy_costs, calculate_allocno_spill_cost): Call
20461         ira_init_register_move_cost_if_necessary.  Use
20462         ira_register_move_cost instead of ira_get_register_move_cost.
20463         (move_spill_restore, update_curr_costs): Ditto.
20464         (allocno_spill_priority): Make it inline.
20465         (color_pass): Allocate and free allocno_color_dat and object_color_data.
20466         (struct coalesce_data, coalesce_data_t): New.
20467         (allocno_coalesce_data): New definition.
20468         (ALLOCNO_COALESCE_DATA): New macro.
20469         (merge_allocnos, coalesced_allocno_conflict_p): Use
20470         ALLOCNO_COALESCED_DATA instead of ALLOCNO_FIRST_COALESCED_ALLOCNO,
20471         ALLOCNO_NEXT_COALESCED_ALLOCNO, ALLOCNO_TEMP.
20472         (coalesce_allocnos): Ditto.
20473         (setup_coalesced_allocno_costs_and_nums): Ditto.
20474         (collect_spilled_coalesced_allocnos): Ditto.
20475         (slot_coalesced_allocno_live_ranges_intersect_p): Ditto.
20476         (setup_slot_coalesced_allocno_live_ranges): Ditto.
20477         (coalesce_spill_slots): Ditto.
20478         (ira_sort_regnos_for_alter_reg): Ditto.  Allocate, initialize and
20479         free allocno_coalesce_data.
20480
20481         * ira-conflicts.c: Fix formatting.
20482         (process_regs_for_copy): Call
20483         ira_init_register_move_cost_if_necessary.  Use
20484         ira_register_move_cost instead of ira_get_register_move_cost.
20485         (build_object_conflicts): Optimize.
20486
20487         * ira-costs.c (record_reg_classes): Optimize.  Call
20488         ira_init_register_move_cost_if_necessary.  Use
20489         ira_register_move_cost, ira_may_move_in_cost, and
20490         ira_may_move_out_cost instead of ira_get_register_move_cost and
20491         ira_get_may_move_cost.
20492         (record_address_regs): Ditto.
20493         (scan_one_insn): Optimize.
20494         (find_costs_and_classes): Optimize.
20495         (process_bb_node_for_hard_reg_moves): Call
20496         ira_init_register_move_cost_if_necessary.  Use
20497         ira_register_move_cost instead of ira_get_register_move_cost.
20498
20499         * ira-emit.c: Use allocno_emit_reg, ALLOCNO_EMIT_DATA instead of
20500         ALLOCNO_REG, ALLOCNO_CHILD_RENAMED_P, ALLOCNO_MEM_OPTIMIZED_DEST,
20501         ALLOCNO_MEM_OPTIMIZED_DEST_P, and ALLOCNO_SOMEWHERE_RENAMED_P.
20502         (ira_allocno_emit_data, void_p, new_allocno_emit_data_vec): New
20503         definitions.
20504         (ira_initiate_emit_data, ira_finish_emit_data)
20505         (create_new_allocno): New functions.
20506         (modify_move_list): Call create_new_alloc instead of ira_create_allocno.
20507         (emit_move_list): Call ira_init_register_move_cost_if_necessary.
20508         Use ira_register_move_cost instead of ira_get_register_move_cost.
20509
20510         * ira-int.h: Fix some comments.
20511         (object_hard_regs_t, object_hard_regs_node_t): Move to ira-color.c.
20512         (struct object_hard_regs, struct object_hard_regs_node): Ditto.
20513         (struct ira_object): Remove profitable_hard_regs, hard_regs_node,
20514         hard_regs_subnodes_start, hard_regs_subnodes_num.  Add new member
20515         add_data.
20516         (struct ira_allocno): Make mode and aclass a bitfield.  Move other
20517         bitfield after mode.  Make hard_regno a short int.  Make
20518         hard_regno short.  Remove first_coalesced_allocno and
20519         next_coalesced_allocno.  Move mem_optimized_dest_p,
20520         somewhere_renamed_p, child_renamed_p, reg, and mem_optimized_dest
20521         into struct ira_emit_data.  Remove in_graph_p, may_be_spilled_p,
20522         available_regs_num, next_bucket_allocno, prev_bucket_allocno,
20523         temp, colorable_p.  Add new member add_data.
20524         (ALLOCNO_IN_GRAPH_P, ALLOCNO_MAY_BE_SPILLED_P): Remove.
20525         (ALLOCNO_COLORABLE_P, ALLOCNO_AVAILABLE_REGS_NUM): Remove.
20526         (ALLOCNO_NEXT_BUCKET_ALLOCNO, ALLOCNO_PREV_BUCKET_ALLOCNO): Remove.
20527         (ALLOCNO_TEMP, ALLOCNO_FIRST_COALESCED_ALLOCNO): Remove.
20528         (ALLOCNO_NEXT_COALESCED_ALLOCNO): Remove.
20529         (ALLOCNO_ADD_DATA): New macro.
20530         (ira_emit_data_t): New typedef.
20531         (struct ira_emit_data): New.  Move mem_optimized_dest_p,
20532         somewhere_renamed_p, child_renamed_p, reg, mem_optimized_dest
20533         from struct ira_allocno.
20534         (ALLOCNO_EMIT_DATA): New macro.
20535         (ira_allocno_emit_data, allocno_emit_reg): New.
20536         (ALLOCNO_PROFITABLE_HARD_REGS, OBJECT_HARD_REGS_NODE): Remove.
20537         (OBJECT_HARD_REGS_SUBNODES_STAR, OBJECT_HARD_REGS_SUBNODES_NUM): Remove.
20538         (OBJECT_ADD_DATA): New macro.
20539         (ira_reallocate): Remove.
20540         (ira_initiate_emit_data, ira_finish_emit_data): New.
20541         (ira_get_register_move_cost, ira_get_may_move_cost): Remove.
20542         (ira_init_register_move_cost_if_necessary): New.
20543         (ira_object_conflict_iter_next): Merge into
20544         ira_object_conflict_iter_cond.
20545         (FOR_EACH_OBJECT_CONFLICT): Don't use ira_object_conflict_iter_next.
20546
20547         * ira-live.c (process_single_reg_class_operands): Call
20548         ira_init_register_move_cost_if_necessary.  Use
20549         ira_register_move_cost instead of ira_get_register_move_cost.
20550
20551         2010-08-13  Vladimir Makarov  <vmakarov@redhat.com>
20552
20553         * ira-int.h (struct target_ira_int): Remove x_cost_classes.
20554
20555         * ira-costs.c: Fix formatting.
20556         (cost_classes, cost_classes_num): Remove.
20557         (struct cost_classes, cost_classes_t, const_cost_classes_t): New.
20558         (regno_cost_classes, cost_classes_hash, cost_classes_eq): New.
20559         (cost_classes_del, cost_classes_htab): New.
20560         (cost_classes_aclass_cache, cost_classes_mode_cache): New.
20561         (initiate_regno_cost_classes, setup_cost_classes): New.
20562         (setup_regno_cost_classes_by_aclass): New.
20563         (setup_regno_cost_classes_by_mode, finish_regno_cost_classes): New.
20564         (record_reg_classes): Use regno_cost_classes instead of
20565         cost_classes.  Move checking opposite operand up.
20566         (record_address_regs): Use regno_cost_classes
20567         instead of cost_classes.
20568         (scan_one_insn): Ditto.  Use always general register.
20569         (print_allocno_costs): Use regno_cost_classes instead of
20570         cost_classes.
20571         (print_pseudo_costs): Ditto.  Use Reg_N_REFS.
20572         (find_costs_and_classes): Set up cost classes for each registers.
20573         Use also their mode for this.  Use regno_cost_classes instead of
20574         cost_classes.
20575         (setup_allocno_class_and_costs): Use regno_cost_classes instead of
20576         cost_classes.
20577         (free_ira_costs, ira_init_costs): Don't use cost_classes.
20578         (ira_costs, ira_set_pseudo_classes): Call
20579         initiate_regno_cost_classes and finish_regno_cost_classes.
20580
20581         2010-10-04  Vladimir Makarov  <vmakarov@redhat.com>
20582
20583         * target-def.h (TARGET_IRA_COVER_CLASSES): Remove.
20584
20585         * target.def (ira_cover_classes): Remove.
20586
20587         * doc/tm.texi: Remove TARGET_IRA_COVER_CLASSES and IRA_COVER_CLASSES.
20588
20589         * doc/tm.texi.in: Ditto.
20590
20591         * ira-conflicts.c: Remove mentioning cover classes from the file.
20592         Use ALLOCNO_CLASS instead of ALLOCNO_COVER_CLASS.  Use
20593         ALLOCNO_COVER_CLASS_COST instead of ALLOCNO_CLASS_COST.  Fix formatting.
20594
20595         * targhooks.c (default_ira_cover_classes): Remove.
20596
20597         * targhooks.h (default_ira_cover_classes): Ditto.
20598
20599         * haifa-sched.c: Remove mentioning cover classes from the file.
20600         Use ira_reg_pressure_cover instead of ira_reg_class_cover.  Use
20601         ira_pressure_classes and ira_pressure_classes_num instead of
20602         ira_reg_class_cover_size and ira_reg_class_cover.  Use
20603         sched_regno_pressure_class instead of sched_regno_cover_class.
20604         (mark_regno_birth_or_death, setup_insn_reg_pressure_info): Use
20605         ira_reg_class_max_nregs instead of ira_reg_class_nregs.
20606
20607         * ira-int.h: Add 2010 to Copyright.  Remove mentioning cover
20608         classes from the file.
20609         (object_hard_regs_t, object_hard_regs_node_t): New typedefs.
20610         (struct object_hard_regs, struct object_hard_regs_node): New.
20611         (struct ira_object): New members profitable_hard_regs,
20612         hard_regs_node, hard_regs_subnodes_start, hard_regs_subnodes_num.
20613         (struct ira_allocno): Rename cover_class to aclass.  Rename
20614         cover_class_cost and updated_cover_class_cost to class_cost and
20615         updated_class_cost.  Remove splay_removed_p and
20616         left_conflict_size.  Add new members colorable_p.
20617         (ALLOCNO_SPLAY_REMOVED_P, ALLOCNO_LEFT_CONFLICTS_SIZE): Remove.
20618         (ALLOCNO_COLORABLE_P): New macro.
20619         (ALLOCNO_COVER_CLASS): Rename to ALLOCNO_CLASS.
20620         (ALLOCNO_COVER_CLASS_COST, ALLOCNO_UPDATED_COVER_CLASS_COST):
20621         Rename to ALLOCNO_CLASS_COST and ALLOCNO_UPDATED__CLASS_COST.
20622         (OBJECT_...): Rename parameter C to O.
20623         (OBJECT_PROFITABLE_HARD_REGS): New macro.
20624         (OBJECT_HARD_REGS_NODE, OBJECT_HARD_REGS_SUBNODES_START)
20625         (OBJECT_HARD_REGS_SUBNODES_NUM): New macros.
20626         (struct target_ira_int): New members x_ira_max_memory_move_cost,
20627         x_ira_max_register_move_cost, x_ira_max_may_move_in_cost,
20628         x_ira_max_may_move_out_cost, x_ira_reg_allocno_class_p,
20629         x_ira_reg_pressure_class_p, x_ira_important_class_nums,
20630         x_ira_reg_class_superunion.  Rename x_prohibited_class_mode_reg to
20631         x_ira_prohibited_class_mode_reg.  Rename x_ira_reg_class_union to
20632         x_ira_reg_class_subunion.
20633         (ira_max_memory_move_cost, ira_max_register_move_cost)
20634         (ira_max_may_move_in_cost, ira_max_may_move_out_cost)
20635         (ira_reg_allocno_class_p, ira_reg_pressure_class_p)
20636         (ira_important_class_nums, ira_reg_class_superunion): New macros.
20637         (prohibited_class_mode_regs): Rename to ira_prohibited_class_mode_regs.
20638         (ira_reg_class_union): Rename to ira_reg_class_subunion.
20639         (ira_debug_class_cover): Rename to ira_debug_allocno_classes.
20640         (ira_set_allocno_cover_class): Rename to ira_set_allocno_class.
20641         (ira_tune_allocno_costs_and_cover_classes): Rename to
20642         ira_tune_allocno_costs.
20643         (ira_debug_hard_regs_forest): New.
20644         (ira_object_conflict_iter_init, ira_object_conflict_iter_cond)
20645         (ira_object_conflict_iter_next): Fix comments.
20646         (ira_hard_reg_set_intersection_p, hard_reg_set_size): New functions.
20647         (ira_allocate_and_set_costs, ira_allocate_and_copy_costs): Rename
20648         cover_class to aclass.
20649         (ira_allocate_and_accumulate_costs): Ditto.
20650         (ira_allocate_and_set_or_copy_costs): Ditto.
20651
20652         * opts.c (decode_options): Remove ira_cover_class check.
20653
20654         * ira-color.c: Remove mentioning cover classes from the file.  Use
20655         ALLOCNO_CLASS, ALLOCNO_CLASS_COST, and ALLOCNO_UPDATED_CLASS_COST
20656         instead of ALLOCNO_COVER_CLASS, ALLOCNO_COVER_CLASS_COST, and
20657         ALLOCNO_UPDATED_COVER_CLASS_COST.  Fix formatting.
20658         (splay-tree.h): Remove include.
20659         (allocno_coalesced_p, processed_coalesced_allocno_bitmap): Move
20660         before copy_freq_compare_func.
20661         (allocnos_for_spilling, removed_splay_allocno_vec): Remove.
20662         (object_hard_regs_vec, object_hard_regs_htab, node_check_tick):
20663         New definitions.
20664         (hard_regs_roots, hard_regs_node_vec): Ditto.
20665         (object_hard_regs_hash, object_hard_regs_eq, find_hard_regs): Ditto.
20666         (insert_hard_regs, init_object_hard_regs, add_object_hard_regs): Ditto.
20667         (finish_object_hard_regs, object_hard_regs_compare): Ditto.
20668         (create_new_object_hard_regs_node): Ditto.
20669         (add_new_object_hard_regs_node_to_forest): Ditto.
20670         (add_object_hard_regs_to_forest, collect_object_hard_regs_cover): Ditto.
20671         (setup_object_hard_regs_nodes_parent, first_common_ancestor_node):
20672         Ditto.
20673         (print_hard_reg_set, print_hard_regs_subforest): Ditto.
20674         (print_hard_regs_forest, ira_debug_hard_regs_forest): Ditto.
20675         (remove_unused_object_hard_regs_nodes): Ditto.
20676         (enumerate_object_hard_regs_nodes): Ditto.
20677         (object_hard_regs_nodes_num, object_hard_regs_nodes): Ditto.
20678         (object_hard_regs_subnode_t): Ditto.
20679         (struct object_hard_regs_subnode): Ditto.
20680         (object_hard_regs_subnodes, object_hard_regs_subnode_index): Ditto.
20681         (setup_object_hard_regs_subnode_index): Ditto.
20682         (get_object_hard_regs_subnodes_num): Ditto.
20683         (form_object_hard_regs_nodes_forest): Ditto.
20684         (finish_object_hard_regs_nodes_tree): Ditto.
20685         (finish_object_hard_regs_nodes_forest): Ditto.
20686         (allocnos_have_intersected_live_ranges_p): Rename to
20687         allocnos_conflict_by_live_ranges_p.  Move before copy_freq_compare_func.
20688         (pseudos_have_intersected_live_ranges_p): Rename to
20689         conflict_by_live_ranges_p.  Move before copy_freq_compare_func.
20690         (setup_left_conflict_sizes_p, update_left_conflict_sizes_p): Ditto.
20691         (empty_profitable_hard_regs, setup_profitable_hard_regs): Ditto.
20692         (update_copy_costs): Remove assert.  Skip cost update if the hard
20693         reg does not belong the class.
20694         (assign_hard_reg): Process only profitable hard regs.
20695         (uncolorable_allocnos_num): Make it scalar.
20696         (allocno_spill_priority): Use ALLOCNO_EXCESS_PRESSURE_POINTS_NUM
20697         and ira_reg_class_max_nregs instead of ALLOCNO_LEFT_CONFLICTS_SIZE
20698         and ira_reg_class_max_nregs.
20699         (bucket_allocno_compare_func): Check frequency first.
20700         (sort_bucket): Add compare function as a parameter.
20701         (add_allocno_to_ordered_bucket): Assume no coalesced allocnos.
20702         (uncolorable_allocnos_splay_tree, USE_SPLAY_P): Remove.
20703         (push_allocno_to_stack): Rewrite for checking new allocno
20704         colorability.
20705         (remove_allocno_from_bucket_and_push): Print cost too.  Remove assert.
20706         (push_only_colorable): Pass new parameter to sort_bucket.
20707         (push_allocno_to_spill): Remove.
20708         (allocno_spill_priority_compare): Make it inline and rewrite.
20709         (splay_tree_allocate, splay_tree_free): Remove.
20710         (allocno_spill_sort_compare): New function.
20711         (push_allocnos_to_stack): Sort allocnos for spilling once.  Don't
20712         build and use splay tree.  Choose first allocno in uncolorable
20713         allocno bucket to spill.  Remove setting spill cost.
20714         (all_conflicting_hard_regs): Remove.
20715         (setup_allocno_available_regs_num): Check only profitable hard
20716         regs.  Print info about hard regs nodes.
20717         (setup_allocno_left_conflicts_size): Remove.
20718         (put_allocno_into_bucket): Don't call
20719         setup_allocno_left_conflicts_size.  Use setup_left_conflict_sizes_p.
20720         (improve_allocation): New.
20721         (color_allocnos): Call setup_profitable_hard_regs,
20722         form_object_hard_regs_nodes_forest, improve_allocation,
20723         finish_object_hard_regs_nodes_forest.  Setup spill cost.
20724         (print_loop_title): Use pressure classes.
20725         (color_allocnso): Ditto.
20726         (do_coloring): Remove allocation and freeing splay_tree_node_pool
20727         and allocnos_for_spilling.
20728         (ira_sort_regnos_for_alter_reg): Don't setup members
20729         {first,next}_coalesced_allocno.
20730         (color): Remove allocating and freeing removed_splay_allocno_vec.
20731         (fast_allocation): Use ira_prohibited_class_mode_regs instead of
20732         prohibited_class_mode_regs.
20733
20734         * ira-lives.c: Remove mentioning cover classes from the file.  Fix
20735         formatting.
20736         (update_allocno_pressure_excess_length): Use pressure classes.
20737         (inc_register_pressure, dec_register_pressure): Check for pressure
20738         class.
20739         (mark_pseudo_regno_live, mark_pseudo_regno_subword_live): Use
20740         pressure class.  Use ira_reg_class_nregs instead of
20741         ira_reg_class_max_nregs.
20742         (mark_pseudo_regno_dead, mark_pseudo_regno_subword_dead): Ditto.
20743         (mark_hard_reg_live, mark_hard_reg_dead): Use pressure class.
20744         (single_reg_class): Use ira_reg_class_nregs instead of
20745         ira_reg_class_max_nregs.
20746         (process_bb_node_lives): Use pressure classes.
20747
20748         * ira-emit.c: Remove mentioning cover classes from the file.  Use
20749         ALLOCNO_CLASS instead of ALLOCNO_COVER_CLASS.  Fix formatting.
20750         (change_loop): Use pressure classes.
20751         (modify_move_list): Call ira_set_allocno_class instead of
20752         ira_set_allocno_cover_class.
20753
20754         * ira-build.c: Remove mentioning cover classes from the file.  Use
20755         ALLOCNO_CLASS and ALLOCNO_CLASS_COST instead of
20756         ALLOCNO_COVER_CLASS and ALLOCNO_COVER_CLASS_COST.  Use
20757         ALLOCNO_UPDATED_CLASS_COST instead of
20758         ALLOCNO_UPDATED_COVER_CLASS_COST.  Fix formatting.
20759         (ira_create_object): Initiate OBJECT_PROFITABLE_HARD_REGS.
20760         (ira_create_allocno): Remove initialization of
20761         ALLOCNO_SPLAY_REMOVED_P, ALLOCNO_LEFT_CONFLICT_SIZE.  Initialize
20762         ALLOCNO_COLORABLE_P.
20763         (ira_set_allocno_cover_class): Rename to ira_set_allocno_class.
20764         Update conflict regs for the objects.
20765         (create_cap_allocno): Remove assert.  Don't propagate
20766         ALLOCNO_AVAILABLE_REGS_NUM.
20767         (ira_free_allocno_costs): New function.
20768         (finish_allocno): Change a part of code into call of
20769         ira_free_allocno_costs.
20770         (low_pressure_loop_node_p): Use pressure classes.
20771         (object_range_compare_func): Don't compare classes.
20772         (setup_min_max_conflict_allocno_ids): Ditto.
20773
20774         * loop-invariant.c: Remove mentioning cover classes from the file.
20775         Use ira_pressure_classes and ira_pressure_classes_num instead of
20776         ira_reg_class_cover_size and ira_reg_class_cover.  Fix formatting.
20777         (get_cover_class_and_nregs): Rename to get_cover_pressure_and_nregs.
20778         Use ira_reg_class_max_nregs instead of ira_reg_class_nregs.
20779         Use reg_allocno_class instead of reg_cover_class.
20780         (get_inv_cost): Use instead ira_stack_reg_pressure_class of
20781         STACK_REG_COVER_CLASS.
20782         (get_regno_cover_class): Rename to get_regno_pressure_class.
20783         (move_loop_invariants): Initialize and finalize regstat.
20784
20785         * ira.c: Remove mentioning cover classes from the file.  Add
20786         comments about coloring without cover classes.  Use ALLOCNO_CLASS
20787         instead of ALLOCNO_COVER_CLASS.  Fix formatting.
20788         (alloc_reg_class_subclasses, setup_reg_subclasses): Move it before
20789         setup_class_subset_and_memory_move_costs.
20790         (setup_stack_reg_pressure_class, setup_pressure_classes): New.
20791         (setup_cover_and_important_classes): Rename to
20792         setup_allocno_and_important_classes.
20793         (setup_class_translate_array): New.
20794         (setup_class_translate): Call it for allocno and pressure classes.
20795         (cover_class_order): Rename to allocno_class_order.
20796         (comp_reg_classes_func): Use ira_allocno_class_translate instead
20797         of ira_class_translate.
20798         (reorder_important_classes): Set up ira_important_class_nums.
20799         (setup_reg_class_relations): Set up ira_reg_class_superunion.
20800         (print_class_cover): Rename to print_classes.  Add parameter.
20801         (ira_debug_class_cover): Rename to ira_debug_allocno_classes.
20802         Print pressure classes too.
20803         (find_reg_class_closure): Rename to find_reg_classes.  Don't call
20804         setup_reg_subclasses.
20805         (ira_hard_regno_cover_class): Rename to ira_hard_regno_allocno_class.
20806         (ira_reg_class_nregs): Rename to ira_reg_class_max_nregs.
20807         (setup_prohibited_class_mode_regs): Use
20808         ira_prohibited_class_mode_regs instead of prohibited_class_mode_regs.
20809         (clarify_prohibited_class_mode_regs): New function.
20810         (ira_init_register_move_cost): Set up ira_max_register_move_cost,
20811         ira_max_may_move_in_cost, and ira_max_may_move_out_cost.
20812         (ira_init_once): Initialize them.
20813         (free_register_move_costs): Process them.
20814         (ira_init): Move calls of find_reg_classes and
20815         setup_hard_regno_aclass after setup_prohibited_class_mode_regs.
20816         Call clarify_prohibited_class_mode_regs.
20817         (ira_no_alloc_reg): Remove.
20818         (too_high_register_pressure_p): Use pressure classes.
20819
20820         * sched-deps.c: Remove mentioning cover classes from the file.
20821         Use ira_reg_pressure_cover instead of ira_reg_class_cover.  Use
20822         ira_pressure_classes and ira_pressure_classes_num instead of
20823         ira_reg_class_cover_size and ira_reg_class_cover.
20824         (mark_insn_hard_regno_birth, mark_hard_regno_death): Use
20825         sched_regno_pressure_class instead of sched_regno_cover_class.
20826         (mark_insn_pseudo_birth, mark_pseudo_death): Ditto.  Use
20827         ira_reg_class_max_nregs instead of ira_reg_class_nregs.
20828
20829         * ira.h: Add 2010 to Copyright.
20830         (ira_no_alloc_reg): Remove external.
20831         (struct target_ira): Rename x_ira_hard_regno_cover_class,
20832         x_ira_reg_class_cover_size, x_ira_reg_class_cover, and
20833         x_ira_class_translate to x_ira_hard_regno_allocno_class,
20834         x_ira_allocno_classes_num, x_ira_allocno_classes, and
20835         x_ira_allocno_class_translate.  Add x_ira_pressure_classes_num,
20836         x_ira_pressure_classes, x_ira_pressure_class_translate, and
20837         x_ira_stack_reg_pressure_class.  Rename x_ira_reg_class_nregs to
20838         x_ira_reg_class_max_nregs.  Add x_ira_reg_class_min_nregs and
20839         x_ira_no_alloc_regs.
20840         (ira_hard_regno_cover_class): Rename to ira_hard_regno_allocno_class.
20841         (ira_reg_class_cover_size, ira_reg_class_cover): Rename to
20842         ira_allocno_classes_num and ira_allocno_classes.
20843         (ira_class_translate): Rename to ira_allocno_class_translate.
20844         (ira_pressure_classes_num, ira_pressure_classes): New definitions.
20845         (ira_pressure_class_translate, ira_stack_reg_pressure_class): Ditto.
20846         (ira_reg_class_nregs): Rename to ira_reg_class_max_nregs.
20847         (ira_reg_class_min_nregs, ira_stack_reg_pressure_class): New
20848         (ira_no_alloc_regs): New.
20849
20850         * ira-costs.c: Add 2010 to Copyright.  Remove mentioning cover
20851         classes from the file.  Use ALLOCNO_CLASS instead of
20852         ALLOCNO_COVER_CLASS.  Use ALLOCNO_CLASS_COST instead of
20853         ALLOCNO_COVER_CLASS_COST.
20854         (regno_cover_class): Rename to regno_aclass.
20855         (record_reg_classes): Use ira_reg_class_subunion instead of
20856         ira_reg_class_union.
20857         (record_address_regs): Check overflow.
20858         (scan_one_insn): Ditto.
20859         (print_allocno_costs): Print total mem cost fore regional allocation.
20860         (print_pseudo_costs): Use REG_N_REFS.
20861         (find_costs_and_classes): Use classes intersected with them on the
20862         1st pass. Check overflow.  Use ira_reg_class_subunion instead of
20863         ira_reg_class_union.  Use ira_allocno_class_translate and
20864         regno_aclass instead of ira_class_translate and regno_cover_class.
20865         Modify code for finding regno_aclass.  Setup preferred classes for
20866         the next pass.
20867         (setup_allocno_cover_class_and_costs): Rename to
20868         setup_allocno_class_and_costs.  Use regno_aclass instead of
20869         regno_cover_class.  Use ira_set_allocno_class instead of
20870         ira_set_allocno_cover_class.
20871         (init_costs, finish_costs): Use regno_aclass instead of
20872         regno_cover_class.
20873         (ira_costs): Use setup_allocno_class_and_costs instead of
20874         setup_allocno_cover_class_and_costs.
20875         (ira_tune_allocno_costs_and_cover_classes): Rename to
20876         ira_tune_allocno_costs.  Check overflow.  Skip conflict hard regs
20877         by processing objects.  Use ira_reg_class_max_nregs instead of
20878         ira_reg_class_nregs.
20879
20880         * rtl.h (reg_cover_class): Rename to reg_allocno_class.
20881
20882         * sched-int.h: Remove mentioning cover classes from the file.
20883         (sched_regno_cover_class): Rename to sched_regno_pressure_class.
20884
20885         * reginfo.c: Add 2010 to Copyright.  Remove mentioning cover
20886         classes from the file.
20887         (struct reg_pref): Rename coverclass into allocnoclass.
20888         (reg_cover_class): Rename to reg_allocno_class.
20889
20890         * Makefile.in (ira-color.o): Remove SPLAY_TREE_H from dependencies.
20891
20892         * config/alpha/alpha.h (IRA_COVER_CLASSES): Remove.
20893
20894         * config/arm/arm.h (IRA_COVER_CLASSES): Ditto.
20895
20896         * config/avr/avr.h (IRA_COVER_CLASSES): Ditto.
20897
20898         * config/bfin/bfin.h (IRA_COVER_CLASSES): Ditto.
20899
20900         * config/cris/cris.h (IRA_COVER_CLASSES): Ditto.
20901
20902         * config/fr30/fr30.h (IRA_COVER_CLASSES): Ditto.
20903
20904         * config/frv/frv.h (IRA_COVER_CLASSES): Ditto.
20905
20906         * config/h8300/h8300.h (IRA_COVER_CLASSES): Ditto.
20907
20908         * config/i386/i386.h (STACK_REG_COVER_CLASS): Ditto.
20909
20910         * config/i386/i386.c (TARGET_IRA_COVER_CLASSES)
20911         (i386_ira_cover_classes): Ditto.
20912
20913         * config/ia64/ia64.h (IRA_COVER_CLASSES): Ditto.
20914
20915         * config/iq2000/iq2000.h (IRA_COVER_CLASSES): Ditto.
20916
20917         * config/m32r/m32r.h (IRA_COVER_CLASSES): Ditto.
20918
20919         * config/m68k/m68k.h (IRA_COVER_CLASSES): Ditto.
20920
20921         * config/mcore/mcore.h (IRA_COVER_CLASSES): Ditto.
20922
20923         * config/mep/mep.h (IRA_COVER_CLASSES): Ditto.
20924
20925         * config/mips/mips.c (TARGET_IRA_COVER_CLASSES)
20926         (mips_ira_cover_classes): Ditto.
20927
20928         * config/mn10300/mn10300.h (IRA_COVER_CLASSES): Ditto.
20929
20930         * config/moxie/moxie.h (IRA_COVER_CLASSES): Ditto.
20931
20932         * config/pa/pa64-regs.h (IRA_COVER_CLASSES): Ditto.
20933
20934         * config/pa/pa32-regs.h (IRA_COVER_CLASSES): Ditto.
20935
20936         * config/picochip/picochip.h (IRA_COVER_CLASSES): Ditto.
20937
20938         * config/rs6000/rs6000.h (IRA_COVER_CLASSES_PRE_VSX)
20939         (IRA_COVER_CLASSES_VSX): Ditto.
20940
20941         * config/rs6000/rs6000.c (TARGET_IRA_COVER_CLASSES)
20942         (rs6000_ira_cover_classes): Ditto.
20943
20944         * config/rx/rx.h (IRA_COVER_CLASSES): Ditto.
20945
20946         * config/s390/s390.h (IRA_COVER_CLASSES): Ditto.
20947
20948         * config/score/score.h (IRA_COVER_CLASSES): Ditto.
20949
20950         * config/sh/sh.h (IRA_COVER_CLASSES): Ditto.
20951
20952         * config/sparc/sparc.h (IRA_COVER_CLASSES): Ditto.
20953
20954         * config/spu/spu.h (IRA_COVER_CLASSES): Ditto.
20955
20956         * config/stormy16/stormy16.h (IRA_COVER_CLASSES): Ditto.
20957
20958         * config/v850/v850.h (IRA_COVER_CLASSES): Ditto.
20959
20960         * config/vax/vax.h (IRA_COVER_CLASSES): Ditto.
20961
20962         * config/xtensa/xtensa.h (IRA_COVER_CLASSES): Ditto.
20963
20964 2011-03-29  Jakub Jelinek  <jakub@redhat.com>
20965
20966         PR debug/48253
20967         * dwarf2out.c (struct dw_fde_struct): Remove dw_fde_hot_section_label,
20968         dw_fde_hot_section_end_label, dw_fde_unlikely_section_label,
20969         dw_fde_unlikely_section_end_label, cold_in_std_section,
20970         dw_fde_switched_sections and dw_fde_switched_cold_to_hot fields.
20971         Add dw_fde_second_begin, dw_fde_second_end and second_in_std_section
20972         fields.
20973         (output_fde): Use dw_fde_second_{begin,end} if second is
20974         true, otherwise dw_fde_{begin,end}.
20975         (output_call_frame_info): Test dw_fde_second_begin != NULL
20976         instead of dw_fde_switched_sections.
20977         (dwarf2out_begin_prologue): Stop initializing removed dw_fde_struct
20978         fields, initialize new fields.  Initialize in_std_section
20979         unconditionally from the first partition.
20980         (dwarf2out_end_epilogue): Don't override dw_fde_end when
20981         dw_fde_second_begin is non-NULL.
20982         (dwarf2out_switch_text_section): Stop initializing removed
20983         dw_fde_struct fields, initialize new fields, initialize
20984         also dw_fde_end here.  Set dw_fde_switch_cfi even when
20985         dwarf2out_do_cfi_asm ().  Call var_location_switch_text_section.
20986         (struct var_loc_list_def): Add last_before_switch field.
20987         (arange_table, arange_table_allocated, arange_table_in_use,
20988         ARANGE_TABLE_INCREMENT, add_arange): Removed.
20989         (size_of_aranges): Count !in_std_section and !second_in_std_section
20990         hunks in fdes, instead of looking at arange_table_in_use.
20991         (output_aranges): Add aranges_length argument, don't call
20992         size_of_aranges here.  Instead of using aranges_table*
20993         emit ranges for fdes when !in_std_section resp.
20994         !second_in_std_section.
20995         (dw_loc_list): Break ranges crossing section switch.
20996         (convert_cfa_to_fb_loc_list): Likewise.  If switched sections,
20997         use dw_fde_second_end instead of dw_fde_end as end of last range.
20998         (gen_subprogram_die): Don't call add_arange.  Use
20999         dw_fde_{begin,end} for first partition and if switched
21000         section dw_fde_second_{begin,end} for the second.
21001         (var_location_switch_text_section_1,
21002         var_location_switch_text_section): New functions.
21003         (dwarf2out_begin_function): Initialize cold_text_section even
21004         when function_section () isn't text_section.
21005         (prune_unused_types): Don't walk arange_table.
21006         (dwarf2out_finish): Don't needlessly test
21007         flag_reorder_blocks_and_partition when testing cold_text_section_used.
21008         If info_section_emitted, call size_of_aranges and if it indicates
21009         non-empty .debug_aranges, call output_aranges with the computed
21010         size.  Stop using removed dw_fde_struct fields, use
21011         dw_fde_{begin,end} for first partition and dw_fde_second_{begin,end}
21012         for second.
21013
21014         PR debug/48203
21015         * cfgexpand.c (expand_debug_expr) <case SSA_NAME>: Only
21016         create ENTRY_VALUE if incoming or address of incoming's MEM
21017         is a hard REG.
21018         * dwarf2out.c (mem_loc_descriptor): Don't emit
21019         DW_OP_GNU_entry_value of DW_OP_fbreg.
21020         * var-tracking.c (vt_add_function_parameter): Ensure cselib_lookup
21021         on ENTRY_VALUE is able to find the canonical parameter VALUE.
21022         * cselib.c (rtx_equal_for_cselib_1) <case ENTRY_VALUE>: Use
21023         rtx_equal_p instead of rtx_equal_for_cselib_1 to compare
21024         ENTRY_VALUE_EXPs.
21025         (cselib_hash_rtx) <case ENTRY_VALUE>: If ENTRY_VALUE_EXP
21026         is a REG_P or MEM_P with REG_P address, compute hash directly
21027         instead of calling cselib_hash_rtx on ENTRY_VALUE_EXP.
21028         (preserve_only_constants): Don't clear VALUES forwaring
21029         ENTRY_VALUE to some other VALUE.
21030
21031 2011-03-28  Richard Sandiford  <richard.sandiford@linaro.org>
21032
21033         * builtins.c (expand_builtin_memset_args): Use gen_int_mode
21034         instead of GEN_INT.
21035
21036 2011-03-28  Eric Botcazou  <ebotcazou@adacore.com>
21037
21038         * cfgexpand.c (expand_gimple_cond): Always set the source location and
21039         block before expanding the statement.
21040         (expand_gimple_stmt_1): Likewise.  Set them here...
21041         (expand_gimple_stmt): ...and not here.  Tidy.
21042         * cfglayout.c (curr_insn_locator): Return 0 if the current location is
21043         unknown.
21044
21045 2011-03-28  Steven Bosscher  <steven@gcc.gnu.org>
21046
21047         * Makefile.in: New rule for cprop.o.
21048         * gcse.c: Move constant/copy propagation to cprop.c.
21049         (compute_local_properties): Only handle expression tables.
21050         (hash_scan_set, compute_hash_table_work, alloc_hash_table,): Likewise.
21051         (one_pre_gcse_pass, one_code_hoisting_pass): Likewise.
21052         (hash_set, insert_set_in_table, gcse_constant_p, lookup_set,
21053         next_set, reset_opr_set_tables, oprs_not_set_p, mark_call, mark_set,
21054         mark_clobber, mark_oprs_set, alloc_cprop_mem, free_cprop_mem,
21055         compute_cprop_data, find_used_regs, try_replace_reg,
21056         find_avail_set, cprop_jump, constprop_register, cprop_insn,
21057         local_cprop_find_used_regs, do_local_cprop, local_cprop_pass,
21058         fis_get_condition, implicit_set_cond_p, find_implicit_sets,
21059         find_bypass_set, reg_killed_on_edge, bypass_block,
21060         bypass_conditional_jumps, one_cprop_pass, gate_rtl_cprop,
21061         execute_rtl_cprop, pass_rtl_cprop): Move to...
21062         * cprop.c: ...here.  New file, constant/copy propagation for RTL
21063         moved from gcse.c to here with minor cleanups in duplicated code.
21064
21065 2011-03-28  H.J. Lu  <hongjiu.lu@intel.com>
21066
21067         * config/i386/i386.c (flag_opts): Fix a typo in
21068         -mavx256-split-unaligned-store.
21069
21070 2011-03-28  Anatoly Sokolov  <aesok@post.ru>
21071
21072         * config/h8300/h8300.h (FUNCTION_VALUE_REGNO_P, FUNCTION_VALUE,
21073         LIBCALL_VALUE): Remove macros.
21074         * config/h8300/h8300.c (TARGET_FUNCTION_VALUE, TARGET_LIBCALL_VALUE,
21075         TARGET_FUNCTION_VALUE_REGNO_P): Define.
21076         (h8300_function_value, h8300_libcall_value,
21077         h8300_function_value_regno_p): New functions.
21078
21079 2011-03-28  Anatoly Sokolov  <aesok@post.ru>
21080
21081         * config/h8300/h8300.h (ASM_OUTPUT_BSS): Remove macro.
21082
21083 2011-03-28  Jeff Law  <law@redhat.com>
21084
21085         * tree-ssa-threadupdate.c (redirect_edges): Call
21086         create_edge_and_update_destination_phis as needed.
21087         (create_edge_and_update_destination_phis): Accept new BB argument.
21088         All callers updated.
21089         (thread_block): Do not update the profile when threading around
21090         intermediate blocks.
21091         (thread_single_edge): Likewise.
21092         (determine_bb_domination_status): If BB is not a successor of the
21093         loop header, return NONDOMINATING.
21094         (register_jump_thread): Note when we register a jump thread around
21095         an intermediate block.
21096         * tree-ssa-threadedge.c (thread_around_empty_block): New function.
21097         (thread_across_edge): Use it.
21098
21099 2011-03-28  Tristan Gingold  <gingold@adacore.com>
21100
21101         * config/ia64/ia64.c (ia64_promote_function_mode): Fix promotion
21102         when for_return is 2.
21103
21104 2011-03-28  Jeff Law  <law@redhat.com>
21105
21106         * var-tracking.c (canonicalize_values_mark): Delete unused
21107         lhs assignment.
21108         (canonicalize_values_star, set_variable_part): Likewise.
21109         (clobber_variable_part, delete_variable_part): Likewise.
21110
21111 2011-03-28  Steven Bosscher  <steven@gcc.gnu.org>
21112
21113         * gcse.c (free_gcse_mem): Free reg_set_bitmap.
21114
21115 2011-03-28  Martin Jambor  <mjambor@suse.cz>
21116
21117         * tree-inline.c (expand_call_inline): Do not check that destination
21118         node is analyzed.
21119         (optimize_inline_calls): Assert that destination node is analyzed.
21120         * cgraph.c (cgraph_add_new_function): Call cgraph_analyze_function, do
21121         not call tree_lowering_passes.
21122         * cgraph.h (cgraph_analyze_function): Declare.
21123         * cgraphunit.c (cgraph_analyze_function): Make public.
21124
21125 2011-03-28  Joseph Myers  <joseph@codesourcery.com>
21126
21127         * config/sparc/sparc-opts.h: New.
21128         * config/sparc/sparc.c (sparc_handle_option, sparc_select,
21129         sparc_cpu, fpu_option_set, TARGET_HANDLE_OPTION): Remove.
21130         (sparc_option_override): Store processor_type enumeration rather
21131         than string in cpu_default.  Remove name and enumeration from
21132         cpu_table.  Directly default -mcpu then default -mtune from -mcpu
21133         without using sparc_select.  Use target_flags_explicit instead of
21134         fpu_option_set.
21135         * config/sparc/sparc.h (enum processor_type): Move to
21136         sparc-opts.h.
21137         (sparc_cpu, struct sparc_cpu_select, sparc_select): Remove.
21138         * config/sparc/sparc.opt (config/sparc/sparc-opts.h): New
21139         HeaderInclude entry.
21140         (mcpu=, mtune=): Use Var and Enum.
21141         (sparc_processor_type): New Enum and EnumValue entries.
21142
21143 2011-03-28  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
21144             Iain Sandoe  <iains@gcc.gnu.org>
21145
21146         PR target/48245
21147         * config/darwin.h (LINK_COMMAND_SPEC_A): Use LINK_PLUGIN_SPEC.
21148
21149 2011-03-28  Eric Botcazou  <ebotcazou@adacore.com>
21150
21151         * tree-vectorizer.h (vect_create_data_ref_ptr): Adjust prototype.
21152         * tree-vect-data-refs.c (vect_create_data_ref_ptr): Add GSI parameter.
21153         Insert new statements at it in lieu of STMT.
21154         (vect_setup_realignment): Adjust call to vect_create_data_ref_ptr.
21155         * tree-vect-stmts.c (vectorizable_store): Likewise.
21156         (vectorizable_load): Likewise.
21157
21158 2011-03-28  Uros Bizjak  <ubizjak@gmail.com>
21159
21160         * config/alpha/alpha.md (addtf3): Change mode of operands to TFmode.
21161         (divtf3): Ditto.
21162         (multf3): Ditto.
21163         (subtf3): Ditto.
21164
21165 2011-03-27  H.J. Lu  <hongjiu.lu@intel.com>
21166
21167         * config/i386/sse.md (*avx_mov<mode>_internal): Don't assert
21168         unaligned 256bit load/store.
21169         (*avx_movu<ssemodesuffix><avxmodesuffix>): Likewise.
21170         (*avx_movdqu<avxmodesuffix>): Likewise.
21171
21172 2011-03-27  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
21173
21174         PR target/48288
21175         * config/pa/predicates.md (reg_or_ior_operand): New predicate.
21176         * config/pa/pa.md (iordi3): Use new predicate in expander.
21177         (iorsi3): Likewise.
21178
21179 2011-03-27  Anatoly Sokolov  <aesok@post.ru>
21180
21181         * config/mips/mips.h (LIBCALL_VALUE, FUNCTION_VALUE,
21182         FUNCTION_VALUE_REGNO_P): Remove macros.
21183         * config/mips/mips-protos.h (mips_function_value): Remove.
21184         * config/mips/mips.c (mips_function_value): Rename to...
21185         (mips_function_value_1): ... this. Make static.  Handle receiving
21186         the function type in 'fn_decl_or_type' argument.
21187         (mips_function_value, mips_libcall_value,
21188         mips_function_value_regno_p): New function.
21189         (TARGET_FUNCTION_VALUE, TARGET_LIBCALL_VALUE,
21190         TARGET_FUNCTION_VALUE_REGNO_P): Define.
21191
21192 2011-03-27  H.J. Lu  <hongjiu.lu@intel.com>
21193
21194         * config/i386/i386.c (flag_opts): Add -mavx256-split-unaligned-load
21195         and -mavx256-split-unaligned-store.
21196         (ix86_option_override_internal): Split 32-byte AVX unaligned
21197         load/store by default.
21198         (ix86_avx256_split_vector_move_misalign): New.
21199         (ix86_expand_vector_move_misalign): Use it.
21200
21201         * config/i386/i386.opt: Add -mavx256-split-unaligned-load and
21202         -mavx256-split-unaligned-store.
21203
21204         * config/i386/sse.md (*avx_mov<mode>_internal): Verify unaligned
21205         256bit load/store.  Generate unaligned store on misaligned memory
21206         operand.
21207         (*avx_movu<ssemodesuffix><avxmodesuffix>): Verify unaligned
21208         256bit load/store.
21209         (*avx_movdqu<avxmodesuffix>): Likewise.
21210
21211         * doc/invoke.texi: Document -mavx256-split-unaligned-load and
21212         -mavx256-split-unaligned-store.
21213
21214 2011-03-27  Richard Sandiford  <rdsandiford@googlemail.com>
21215
21216         PR target/38598
21217         * config/mips/mips.md (extendsidi2): Add an "l" alternative.
21218         Update commentary.
21219
21220 2011-03-27  Richard Sandiford  <rdsandiford@googlemail.com>
21221
21222         * config/mips/mips.c (mips_prepare_builtin_arg): Replace icode and
21223         opno arguments with an expand_operand.  Use create_input_operand.
21224         (mips_prepare_builtin_target): Delete.
21225         (mips_expand_builtin_insn, mips_expand_builtin_compare_1): New
21226         functions.
21227         (mips_expand_builtin_direct): Use create_output_operand and
21228         mips_expand_builtin_insn.  Update call to mips_prepare_builtin_arg.
21229         (mips_expand_builtin_movtf): Likewise.  Use mips_expand_fp_comparison.
21230         (mips_expand_builtin_compare): Use mips_expand_fp_comparison.
21231
21232 2011-03-27  Ira Rosen  <ira.rosen@linaro.org>
21233
21234         * config/arm/arm.c (arm_autovectorize_vector_sizes): New
21235         function.
21236         (TARGET_VECTORIZE_AUTOVECTORIZE_VECTOR_SIZES): Define.
21237
21238 2011-03-26  Eric Botcazou  <ebotcazou@adacore.com>
21239
21240         * basic-block.h (fixup_abnormal_edges): Adjust prototype.
21241         * reload1.c (reload): Adjust call to fixup_abnormal_edges.  Rediscover
21242         basic blocks and call commit_edge_insertions directly.
21243         (fixup_abnormal_edges): Move from here to...
21244         * cfgrtl.c (fixup_abnormal_edges): ...here.  Only insert instructions
21245         on the edges and return whether some have actually been inserted.
21246         * reg-stack.c (convert_regs): Fix up abnormal edges before inserting
21247         compensation code.
21248
21249 2011-03-26  Andrey Belevantsev  <abel@ispras.ru>
21250
21251         PR rtl-optimization/48144
21252         * sel-sched-ir.c (merge_history_vect): Factor out from ...
21253         (merge_expr_data): ... here.
21254         (av_set_intersect): Rename to av_set_code_motion_filter.
21255         Update all callers.  Call merge_history_vect when an expression
21256         is found in both sets.
21257         * sel-sched-ir.h (av_set_code_motion_filter): Add prototype.
21258
21259 2011-03-26  Alan Modra  <amodra@gmail.com>
21260
21261         * config/rs6000/predicates.md (word_offset_memref_op): Handle
21262         cmodel medium addresses.
21263         * config/rs6000/rs6000.c (rs6000_secondary_reload): Handle misaligned
21264         64-bit gpr loads and stores.
21265         (rs6000_secondary_reload_ppc64): New function.
21266         * config/rs6000/rs6000-protos.h: Declare it.
21267         * config/rs6000/rs6000.md (reload_di_store, reload_di_load): New.
21268
21269 2011-03-26  Alan Modra  <amodra@gmail.com>
21270
21271         PR target/47487
21272         * config/rs6000/rs6000.c (rs6000_output_function_epilogue): Support
21273         GNU Go in traceback table.
21274
21275 2011-03-25  Richard Henderson  <rth@redhat.com>
21276
21277         * expr.c (emit_block_move_via_movmem): Only use 6 operand variant
21278         if there are exactly 6 operands.
21279         (set_storage_via_setmem): Similarly.
21280
21281 2011-03-25  Kai Tietz  <ktietz@redhat.com>
21282
21283         * collect2.c (write_c_file_stat): Handle backslash
21284         as right-hand directory separator.
21285         (resolve_lib_name): Use IS_DIR_SEPARATOR instead of
21286         checking just for slash.
21287         * coverage.c (coverage_init): Use IS_ABSOLUTE_PATH
21288         instead of checking for trailing slash.
21289         * gcc.c (record_temp_file): Use filename_cmp instead
21290         of strcmp.
21291         (do_spec_1): Likewise.
21292         (replace_outfile_spec_function): Likewise.
21293         (is_directory): Use filename_ncmp instead of strncmp.
21294         (print_multilib_info): Likewise.
21295         * gcov.c (find_source): Use filename_cmp instead
21296         instead of strcmp.
21297         (make_gcov_file_name): Fix order of slash/backslash
21298         checks.
21299         * incpath.c (DIRS_EQ): Use filename_cmp instead of strcmp.
21300         (add_standard_paths): Likewise.
21301         * mips-tfile.c (saber_stop): Handle backslash.
21302         * prefix.c (update_path): Use filename_ncmp instead of
21303         strncmp.
21304         * profile.c (output_location): Use filename_cmp instead
21305         of strcmp.
21306         * read-md.c (handle_toplevel_file): Handle backslash.
21307         * tlink.c (frob_extension):  Likewise.
21308         * tree-cfg.c (same_line_p): Use filename_cmp instead of
21309         strcmp.
21310         * tree-dump.c (dequeue_and_dump): Handle backslash.
21311         * tree.c (get_file_function_name): Likewise.
21312         * gengtype.c (read_input_list): Likewise.
21313         (get_file_realbasename): Likewise.
21314         (get_output_file_with_visibility): Use filename_cmp
21315         instead of strcmp.
21316
21317 2011-03-25  Richard Sandiford  <richard.sandiford@linaro.org>
21318
21319         * config/arm/arm.h (CANNOT_CHANGE_MODE_CLASS): Restrict FPA_REGS
21320         case to VFPv1.
21321
21322 2011-03-25  Nathan Froyd  <froydnj@codesourcery.com>
21323
21324         * fold-const.c (expr_location_or): New function.
21325         (fold_truth_not_expr): Call it.
21326
21327 2011-03-25  Jeff Law  <law@redhat.com>
21328
21329         * dwarf2asm.c (dw2_asm_output_encoded_addr_rtx): Add missing
21330         va_end.
21331         * c-family/c-common.c (def_fn_type): Likewise.
21332         * ada/gcc-interface/utils.c (def_fn_type): Likewise.
21333         * emit-rtl.c (gen_rtvec): Likewise.
21334         * lto/lto-lang.c (def_fn_type): Likewise.
21335
21336 2011-03-25  Richard Guenther  <rguenther@suse.de>
21337
21338         * tree-ssa-copy.c (stmt_may_generate_copy): Copies from constants
21339         also generate copies.
21340         (fini_copy_prop): Handle constant values properly.
21341
21342 2011-03-25  Jakub Jelinek  <jakub@redhat.com>
21343
21344         * dwarf2out.c (mem_loc_descriptor) <case ZERO_EXTRACT>: Compare
21345         mode size instead of bitsize with DWARF2_ADDR_SIZE.
21346         (hash_loc_operands, compare_loc_operands): Handle
21347         DW_OP_GNU_entry_value.
21348
21349 2011-03-25  Kai Tietz  <ktietz@redhat.com>
21350
21351         * config/i386/cygming.h (DWARF_FRAME_REGISTERS): Adjust comment.
21352         (STACK_BOUNDARY): Check for bit-ness in case of MS_ABI.
21353         * config/i386/i386.c (ix86_conditional_register_usage): Adjust
21354         comment and use macro TARGET_64BIT_MS_ABI instead.
21355         (ix86_keep_aggregate_return_pointer): Optimize for 64-bit case
21356         and change default behavior for 32-bit MS_ABI.
21357         (ix86_reg_parm_stack_space): Check additionally for bit-ness.
21358         (ix86_function_type_abi): Allow check for ms_abi/sysv_abi for
21359         32-bit, too.
21360         (ix86_cfun_abi): Likewise.
21361         (ix86_maybe_switch_abi): Adjust comment.
21362         (init_cumulative_args): Check for bit-ness in MS_ABI case.
21363         (ix86_gimplify_va_arg): Check just for not TARGET_64BIT_MS_ABI
21364         instead of checking for SYSV_ABI.
21365         (ix86_nsaved_sseregs): Likewise.
21366         (ix86_compute_frame_layout): Set only for 64-bit MS_ABI alignment
21367         to 16 bytes.
21368         (ix86_expand_call): Use TARGET_64BIT_MS_ABI macro.
21369         * config/i386.h (TARGET_32BIT_MS_ABI): New macro.
21370         (ACCUMULATE_OUTGOING_ARGS): Check explicit for 64-bit MS_ABI.
21371         (OUTGOING_REG_PARM_STACK_SPACE): Likewise.
21372         * config/mingw32.h (DEFAULT_ABI): Change default always to MS_ABI.
21373
21374 2011-03-25  Richard Guenther  <rguenther@suse.de>
21375
21376         * tree-flow.h (verify_stmts): Rename to verify_gimple_in_cfg.
21377         (verify_types_in_gimple_seq): Rename to verify_gimple_in_seq.
21378         (verify_gimple): Remove.
21379         * tree-cfg.c (verify_gimple_call): Merge verification
21380         from verify_stmts.
21381         (verify_gimple_phi): Merge verification from verify_stmts.
21382         (verify_gimple_label): New function.
21383         (verify_types_in_gimple_seq_2): Rename to verify_gimple_in_seq_2.
21384         (verify_types_in_gimple_seq): Rename to verify_gimple_in_seq.
21385         (verify_stmt): Merge into verify_gimple_in_cfg and callees.
21386         (verify_stmts): Rename to verify_gimple_in_cfg.
21387         (verify_gimple_in_cfg): New function.
21388         * passes.c (execute_function_todo): Call verify_gimple_in_cfg.
21389         * tree-ssa.c (verify_ssa): Likewise.
21390         * gimplify.c (gimplify_body): Call verify_gimple_in_seq.
21391
21392 2011-03-25  Richard Guenther  <rguenther@suse.de>
21393
21394         * passes.c (init_optimization_passes): Add FRE pass after
21395         early SRA.
21396
21397 2011-03-25  Bernd Schmidt  <bernds@codesourcery.com>
21398             Andrew Stubbs  <ams@codesourcery.com>
21399
21400         * config/arm/vfp.md (arm_movdi_vfp): Enable only when not tuning
21401         for Cortex-A8.
21402         (arm_movdi_vfp_cortexa8): New pattern.
21403         * config/arm/neon.md (adddi3_neon, subdi3_neon, anddi3_neon,
21404         iordi3_neon, xordi3_neon): Add alternatives to discourage Neon
21405         instructions when tuning for Cortex-A8.  Set attribute "arch".
21406         * config/arm/arm.md: Move include arm-tune.md up a bit.
21407         (define_attr "arch"): Add "onlya8" and "nota8" values.
21408         (define_attr "arch_enabled"): Handle "onlya8" and "nota8".
21409
21410 2011-03-25  Nathan Froyd  <froydnj@codesourcery.com>
21411
21412         PR bootstrap/48282
21413         Revert:
21414         2011-03-24  Nathan Froyd  <froydnj@codesourcery.com>
21415
21416         * function.c (instantiate_virtual_regs): Use FOR_EACH_BB and
21417         FOR_BB_INSNS_SAFE to iterate through insns.  Re-indent.
21418         (pass_instantiate_virtual_regs): Require PROP_cfglayout.
21419         * passes.c (init_optimization_passes): Move
21420         pass_instantiate_virtual_regs after pass_into_cfg_layout_mode.
21421
21422 2011-03-25  Kai Tietz  <ktietz@redhat.com>
21423
21424         * c-typeck.c (comptypes_internal): Replace target
21425         hook call of comp_type_attributes by version in tree.c file.
21426         * gimple.c (gimple_types_compatible_p_1): Likewise.
21427         * tree-ssa.c (useless_type_conversion_p): Likewise.
21428         * tree.c (build_type_attribute_qual_variant): Likewise.
21429         (attribute_value_equal): New static helper function.
21430         (comp_type_attributes): New function.
21431         (merge_attributes): Use attribute_value_equal for comparison.
21432         (attribute_list_contained): Likewise.
21433         * tree.h (comp_type_attributes): New prototype.
21434
21435 2011-03-25  Richard Guenther  <rguenther@suse.de>
21436
21437         * tree-cfg.c (verify_gimple_assign_unary): Drop special casing
21438         of complex types at -O0.
21439         (verify_gimple_assign_binary): Likewise.
21440         (verify_gimple_assign_ternary): Likewise.
21441
21442 2011-03-24  Mark Wielaard  <mjw@redhat.com>
21443
21444         * dwarf2out.c (size_of_die): Modify comment to say DW_FORM_ref_sig8.
21445         (value_format): Use DW_FORM_ref_sig8, not DW_FORM_sig8.
21446
21447 2011-03-24  Mark Wielaard  <mjw@redhat.com>
21448
21449         PR debug/48041
21450         * dwarf2out.c (output_abbrev_section): Only write table when
21451         abbrev_die_table_in_use > 1.
21452
21453 2011-02-24  Richard Henderson  <rth@redhat.com>
21454
21455         * config/alpha/alpha.c (alpha_expand_unaligned_load): Use extql.
21456         (alpha_expand_unaligned_store): Use mskwl, mskll, mskql.
21457         (alpha_expand_unaligned_load_words): Use extql.
21458         (alpha_expand_unaligned_store_words): Use insqh, mskqh, mskql.
21459         (emit_insxl): Handle all modes for consistency.
21460
21461 2011-02-24  Richard Henderson  <rth@redhat.com>
21462
21463         * config/alpha/alpha.c (get_aligned_mem): Don't test WORDS_BIG_ENDIAN.
21464         (alpha_expand_unaligned_load): Likewise.
21465         (alpha_expand_unaligned_store): Likewise.
21466         (alpha_expand_unaligned_load_words): Likewise.
21467         (alpha_expand_unaligned_store_words): Likewise.
21468         (emit_insxl, alpha_split_compare_and_swap_12): Likewise.
21469         (alpha_split_lock_test_and_set_12): Likewise.
21470         (print_operand, alpha_fold_builtin_extxx): Likewise.
21471         (alpha_fold_builtin_insxx, alpha_fold_builtin_mskxx): Likewise.
21472         * config/alpha/alpha.md (bswapsi2, insv, extv, extzv): Likewise.
21473         (builtin_extwh, builtin_extlh, builtin_extql): Likewise.
21474         (unaligned_extendqidi_be, unaligned_extendhidi_be, extxl_be): Remove.
21475         (*extxl_1_be, *extql_2_be, extqh_be, extlh_be, extwh_be): Remove.
21476         (insbl_be, inswl_be, insll_be, insql_be, mskxl_be): Remove.
21477         (unaligned_loadqi_be, unaligned_loadhi_be): Remove.
21478         (unaligned_storeqi_be, unaligned_storehi_be): Remove.
21479         (extbl): Rename from builtin_extbl; don't test WORDS_BIG_ENDIAN.
21480         (extwl, extll, extql): Similarly.
21481         (inswh, inslh, insqh): Similarly.
21482         (mskbl, mskwl, mskll, mskql): Similarly.
21483         (mskwh, msklh, mskqh): Similarly.
21484
21485 2011-02-24  Richard Henderson  <rth@redhat.com>
21486
21487         * config/alpha/alpha.md (attribute isa): Add er, ner.
21488         (attribute enabled): Handle them.
21489         (*movdi): Merge *movdi_{er_nofix,nofix,er_fix,fix}.
21490
21491 2011-02-24  Richard Henderson  <rth@redhat.com>
21492
21493         * config/alpha/alpha.md (attribute isa): Add vms.
21494         (attribute enabled): Handle it.
21495         (*movsf): Merge *movsf_{nofix,fix,nofp}.
21496         (*movdf): Merge *movdf_{nofix,fix,nofp}.
21497         (*movtf): Rename from *movtf_internal for consistency.
21498         (*movsi): Merge with *movsi_nt_vms.
21499         (*movhi): Merge *movhi_nobwx, *movhi_bwx.
21500         (*movqi): Merge *movqi_nobwx, *movqi_bwx.
21501         (*mov<VEC>): Merge *mov<VEC>_fix, *mov<VEC>_nofix.
21502         * config/alpha/constraint.md ("f"): Use NO_REGS when fpu is disabled.
21503
21504 2011-02-24  Richard Henderson  <rth@redhat.com>
21505
21506         * config/alpha/alpha.md (extendqihi2): Implement for BWX only.
21507         (extendqisi2, extendhisi2): Likewise.
21508         (extendqidi2): Simplify BWX/non-BWX expansions.
21509         (extendhidi2): Similarly.
21510
21511 2011-02-24  Richard Henderson  <rth@redhat.com>
21512
21513         * config/alpha/alpha.md (attribute isa): New.
21514         (attribute enabled): New.
21515         (zero_extendqihi2): Merge from *zero_extendqihi2_{bwx,nobwx}.
21516         (zero_extendqisi2, zero_extendqidi2): Similarly.
21517         (zero_extendhisi2, zero_extendhidi2): Similarly.
21518         * config/alpha/predicates.md (reg_or_bwx_memory_operand): New.
21519
21520 2011-02-24  Richard Henderson  <rth@redhat.com>
21521
21522         * config/alpha/predicates.md (input_operand): Revert last change;
21523         update comment to mention 32-bit VMS rather than Windows.
21524
21525 2011-03-24  Nathan Froyd  <froydnj@codesourcery.com>
21526
21527         * function.c (instantiate_virtual_regs): Use FOR_EACH_BB and
21528         FOR_BB_INSNS_SAFE to iterate through insns.  Re-indent.
21529         (pass_instantiate_virtual_regs): Require PROP_cfglayout.
21530         * passes.c (init_optimization_passes): Move
21531         pass_instantiate_virtual_regs after pass_into_cfg_layout_mode.
21532
21533 2011-03-24  Eric Botcazou  <ebotcazou@adacore.com>
21534
21535         * dojump.c (do_jump_by_parts_greater_rtx): Optimize in specific cases.
21536
21537 2011-03-24  Uros Bizjak  <ubizjak@gmail.com>
21538
21539         * config/i386/i386.md (ix86_print_operand): Output DFmode const_double
21540         correctly.
21541
21542 2011-03-24  Jakub Jelinek  <jakub@redhat.com>
21543
21544         PR debug/48204
21545         * simplify-rtx.c (simplify_const_unary_operation): Call
21546         real_convert when changing mode class with FLOAT_EXTEND.
21547
21548 2011-03-24  Nick Clifton  <nickc@redhat.com>
21549
21550         * config/rx/rx.h (LABEL_ALIGN_FOR_BARRIER): Define.
21551         (ASM_OUTPUT_MAX_SKIP_ALIGN): Define.
21552         * config/rx/rx.c (rx_option_override): Set align_jumps,
21553         align_loops and align_labels if not set by the user.
21554         (rx_align_for_label): New function.
21555         (rx_max_skip_for_label): New function.
21556         (TARGET_ASM_JUMP_ALIGN_MAX_SKIP): Define.
21557         (TARGET_ASM_LOOP_ALIGN_MAX_SKIP): Define.
21558         (TARGET_ASM_LABEL_ALIGN_MAX_SKIP): Define.
21559         (TARGET_ASM_LABEL_ALIGN_AFTER_BARRIER_MAX_SKIP): Define.
21560         * config/rx/rx-protos.h (rx_align_for_label): Add prototype.
21561
21562 2011-03-24  Richard Sandiford  <richard.sandiford@linaro.org>
21563
21564         PR rtl-optimization/48263
21565         * optabs.c (expand_binop_directly): Reinstate convert_modes code
21566         and original commutative_p handling.  Use maybe_gen_insn.
21567
21568 2011-03-24  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
21569
21570         * reload.c (find_reloads_subreg_address): Add address_reloaded
21571         parameter and return true there if the full address has been
21572         reloaded.
21573         (find_reloads_toplev): Pass address_reloaded flag.
21574         (find_reloads_address_1): Don't use address_reloaded parameter.
21575
21576 2011-03-24  Jeff Law  <law@redhat.com>
21577
21578         * tree-ssa-live.c (remove_unused_scope_block_p): Remove set but
21579         unused variable "ann".
21580         (remove_unused_locals): Likewise.
21581
21582         * tree-ssa-copy.c (propagate_tree_value_into_stmt): Remove useless
21583         statement.
21584
21585         * cfglayout.c (fixup_reorder_chain): Do not dereference E_FALL
21586         after it is freed.
21587
21588 2011-03-24  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
21589
21590         * config/s390/s390.c (s390_preferred_reload_class): Return NO_REGS
21591         for invalid symbolic addresses.
21592         (s390_secondary_reload): Don't use s390_check_symref_alignment for
21593         larl operands.
21594
21595 2011-03-24  Eric Botcazou  <ebotcazou@adacore.com>
21596
21597         * fold-const.c (fold_ternary_loc): Preserve the location (if any) of
21598         the argument in calls to fold_truth_not_expr.
21599
21600 2011-03-24  Nathan Froyd  <froydnj@codesourcery.com>
21601
21602         * tree.c (record_node_allocation_statistics): New function.
21603         (make_node_stat, copy_node_stat, build_string): Call it.
21604         (make_tree_binfo_stat, make_tree_vec_stat, tree_cons_stat): Likewise.
21605         (build1_stat, build_omp_clause): Likewise.
21606
21607 2011-03-24  Richard Sandiford  <richard.sandiford@linaro.org>
21608
21609         * builtins.c (expand_movstr): Fix endp == 1 adjustment after
21610         last commit.
21611
21612 2011-03-24  Richard Guenther  <rguenther@suse.de>
21613
21614         PR tree-optimization/48271
21615         * tree-ssa-dom.c (tree_ssa_dominator_optimize): Only cleanup
21616         blocks that still exist.
21617
21618 2011-03-24  Richard Guenther  <rguenther@suse.de>
21619
21620         PR tree-optimization/48270
21621         * tree-ssa-phiopt.c (cond_if_else_store_replacement): Do
21622         not free datarefs before ddrs.
21623
21624 2011-03-24  Eric Botcazou  <ebotcazou@adacore.com>
21625
21626         * tree-sra.c (build_ref_for_offset): Strip useless type conversions
21627         from the address built for a reference with variable offset.
21628
21629 2011-03-24  Uros Bizjak  <ubizjak@gmail.com>
21630
21631         PR target/48237
21632         * config/i386/i386.md (*movdf_internal_rex64): Do not split
21633         alternatives that can be handled with movq or movabsq insn.
21634         (*movdf_internal): Disable for !TARGET_64BIT.
21635         (*movdf_internal_nointeger): Ditto.
21636         * config/i386/i386.c (ix86_print_operand): Handle DFmode immediates.
21637
21638 2011-03-24  Nathan Froyd  <froydnj@codesourcery.com>
21639
21640         * system.h (FUNCTION_ARG, FUNCTION_INCOMING_ARG): Poison.
21641         (FUNCTION_ARG_ADVANCE): Likewise.
21642         * tm.texi.in: Change references to them to hook references.
21643         * tm.texi: Regenerate.
21644         * targhooks.c (default_function_arg): Eliminate check for target macro.
21645         (default_function_incoming_arg): Likewise.
21646         (default_function_arg_advance): Likewise.
21647         * target.def (function_arg, function_incoming_arg): Change to DEFHOOK.
21648         (function_arg_advance): Likewise.
21649         * target-def.h: Eliminate FUNCTION_INCOMING_ARG check.
21650
21651 2011-03-24  Richard Guenther  <rguenther@suse.de>
21652
21653         PR middle-end/48269
21654         * tree-object-size.c (addr_object_size): Do not double-account
21655         for MEM_REF offsets.
21656
21657 2011-03-24  Diego Novillo  <dnovillo@google.com>
21658
21659         * lto-opts.c (input_data_block): Move to lto-streamer-in.c.
21660         * lto-streamer-in.c (input_string_internal): Add clarifying comments.
21661         (lto_input_data_block): Move from lto-opts.c.  Make extern.
21662         Update all users.
21663         (lto_input_string): Rename from input_string.  Make extern.
21664         Update all users.
21665         * lto-streamer-out.c (lto_output_string_with_length): Rename from
21666         output_string_with_length.
21667         Output 0 to indicate a non-NULL string.  Update all callers to
21668         not emit 0.
21669         (lto_output_string): Rename from output_string.  Make extern.
21670         Update all users.
21671         (lto_output_decl_state_streams): Make extern.
21672         (lto_output_decl_state_refs): Make extern.
21673         * lto-streamer.h (lto_input_string): Declare.
21674         (lto_input_data_block): Declare.
21675         (lto_output_string): Declare.
21676         (lto_output_string_with_length): Declare.
21677         (lto_output_decl_state_streams): Declare.
21678         (lto_output_decl_state_refs): Declare.
21679
21680 2011-03-24  Richard Guenther  <rguenther@suse.de>
21681
21682         PR tree-optimization/46562
21683         * tree.c (build_invariant_address): New function.
21684         * tree.h (build_invariant_address): Declare.
21685         * tree-dfa.c (get_addr_base_and_unit_offset): Wrap around
21686         a renamed function moved ...
21687         * tree-flow-inline.h (get_addr_base_and_unit_offset_1): ... here.
21688         Take valueization callback parameter.
21689         * tree-flow.h (gimple_fold_stmt_to_constant): Declare.
21690         * gimple-fold.h: New file.
21691         * tree-ssa-ccp.c (ccp_fold): Use gimple_fold_stmt_to_constant_1.
21692         (ccp_fold, fold_const_aggregate_ref,
21693         fold_ctor_reference, fold_nonarray_ctor_reference,
21694         fold_array_ctor_reference, fold_string_cst_ctor_reference,
21695         get_base_constructor): Move ...
21696         * gimple-fold.c: ... here.
21697         (gimple_fold_stmt_to_constant_1): New function
21698         split out from ccp_fold.  Take a valueization callback parameter.
21699         Valueize all operands.
21700         (gimple_fold_stmt_to_constant): New wrapper function.
21701         (fold_const_aggregate_ref_1): New function split out from
21702         fold_const_aggregate_ref.  Take a valueization callback parameter.
21703         (fold_const_aggregate_ref): Wrap fold_const_aggregate_ref_1.
21704         * tree-ssa-sccvn.c (simplify_binary_expression): Simplify
21705         invariant POINTER_PLUS_EXPRs to invariant form.
21706         (vn_valueize): New function.
21707         (try_to_simplify): Simplify by using gimple_fold_stmt_to_constant.
21708         * tree-vrp.c (vrp_valueize): New function.
21709         (vrp_visit_assignment_or_call): Use gimple_fold_stmt_to_constant
21710         to fold statements to constants.
21711         * tree-ssa-pre.c (eliminate): Properly guard propagation of
21712         function declarations.
21713         * Makefile.in (tree-ssa-sccvn.o, tree-vrp.o, gimple-fold.o,
21714         tree-ssa-ccp.o): Add gimple-fold.h dependencies.
21715
21716 2011-03-24  Richard Sandiford  <richard.sandiford@linaro.org>
21717
21718         * config/h8300/predicates.md (jump_address_operand): Fix register
21719         mode check.
21720
21721 2011-03-24  Ira Rosen  <ira.rosen@linaro.org>
21722
21723         * doc/invoke.texi (max-stores-to-sink): Document.
21724         * params.h (MAX_STORES_TO_SINK): Define.
21725         * opts.c (finish_options): Set MAX_STORES_TO_SINK to 0
21726         if either vectorization or if-conversion is disabled.
21727         * tree-data-ref.c (dr_equal_offsets_p1): Moved and renamed from
21728         tree-vect-data-refs.c vect_equal_offsets.
21729         (dr_equal_offsets_p): New function.
21730         (find_data_references_in_bb): Remove static.
21731         * tree-data-ref.h (find_data_references_in_bb): Declare.
21732         (dr_equal_offsets_p): Likewise.
21733         * tree-vect-data-refs.c (vect_equal_offsets): Move to tree-data-ref.c.
21734         (vect_drs_dependent_in_basic_block): Update calls to
21735         vect_equal_offsets.
21736         (vect_check_interleaving): Likewise.
21737         * tree-ssa-phiopt.c: Include cfgloop.h and tree-data-ref.h.
21738         (cond_if_else_store_replacement): Rename to...
21739         (cond_if_else_store_replacement_1): ... this.  Change arguments and
21740         documentation.
21741         (cond_if_else_store_replacement): New function.
21742         * Makefile.in (tree-ssa-phiopt.o): Adjust dependencies.
21743         * params.def (PARAM_MAX_STORES_TO_SINK): Define.
21744
21745 2011-03-23  Chung-Lin Tang  <cltang@codesourcery.com>
21746
21747         PR target/46934
21748         * config/arm/arm.md (casesi): Use the gen_int_mode() function
21749         to subtract lower bound instead of GEN_INT().
21750
21751 2011-03-23  Jonathan Wakely  <jwakely.gcc@gmail.com>
21752
21753         PR other/48179
21754         PR other/48221
21755         PR other/48234
21756         * doc/extend.texi (Alignment): Move section to match order in TOC.
21757         * doc/invoke.texi (i386 and x86-64 Windows Options): Likewise.
21758         (Warning Options): Adjust -Wno-cpp summary and remove stray backslash.
21759
21760 2011-03-23  Jeff Law  <law@redhat.com>
21761
21762         * cfg.c (redirect_edge_succ_nodup): Duplicate the varm map
21763         before removing the edge.
21764
21765         * cfgrtl.c (cfg_layout_redirect_edge_and_branch): Do not use E after
21766         it may have been freed by redirect_branch_edge or
21767         redirect_edge_succ_nodup.
21768
21769 2011-03-23  Richard Guenther  <rguenther@suse.de>
21770
21771         * tree-stdarg.c (va_list_counter_bump): Handle bumps via MEM_REF.
21772         (check_va_list_escapes): Likewise.
21773         (check_all_va_list_escapes): Likewise.
21774
21775 2011-03-23  Richard Guenther  <rguenther@suse.de>
21776
21777         * Makefile.in (IPA_TYPE_ESCAPE_H): Remove.
21778         (OBJS-archive): Remove ipa-struct-reorg.o and ipa-type-escape.o.
21779         (tree-ssa-alias.o): Do not depend on IPA_TYPE_ESCAPE_H.
21780         (alias.o): Likewise.
21781         (ipa-type-escape.o): Remove.
21782         (ipa-struct-reorg.o): Likewise.
21783         (GTFILES): Remove ipa-struct-reorg.c.
21784         * alias.c: Do not include ipa-type-escape.h.
21785         * tree-ssa-alias.c: Likewise.
21786         * common.opt (fipa-struct-reorg): Preserve for backward compatibility.
21787         * opts.c (finish_options): Do not reset flag_ipa_struct_reorg.
21788         * passes.c (init_optimization_passes): Remove ipa-struct-reorg
21789         and ipa-type-escape passes.
21790         * tree-pass.h (pass_ipa_type_escape): Remove.
21791         (pass_ipa_struct_reorg): Likewise.
21792         * ipa-struct-reorg.h: Remove.
21793         * ipa-struct-reorg.c: Likewise.
21794         * ipa-type-escape.h: Likewise.
21795         * ipa-type-escape.c: Likewise.
21796         * doc/invoke.texi (-fipa-struct-reorg): Remove.
21797         (--param struct-reorg-cold-struct-ratio): Likewise.
21798         * params.def (PARAM_STRUCT_REORG_COLD_STRUCT_RATIO): Likewise.
21799         * params.h (STRUCT_REORG_COLD_STRUCT_RATIO): Likewise.
21800         * timevar.def (TV_IPA_TYPE_ESCAPE): Likewise.
21801
21802 2011-03-23  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
21803
21804         * config/s390/2084.md: Enable all insn reservations also for z9_ec
21805         cpu attribute value.
21806         * config/s390/s390-opts.h (enum s390_arch_option): Remove.
21807         (enum processor_type): Add PROCESSOR_2094_Z9_EC.
21808         * config/s390/s390.c (processor_flags_table): New constant array.
21809         (s390_handle_arch_option): Remove.
21810         (s390_handle_option): Remove s390_handle_arch_option invocations
21811         and OPT_mwarn_framesize_ handling.
21812         (s390_option_override): Remove s390_handle_arch_option invocation.
21813         (s390_emit_prologue): Remove use of HOST_WIDE_INT_PRINT_DEC in
21814         warnings.
21815         * config/s390/s390.md (cpu attribute): Add z9_ec value.
21816         * config/s390/s390.opt (s390_tune, s390_arch)
21817         (march=): Replace s390_arch_option enum and values with
21818         processor_type.  Set variable name to s390_arch.  Set
21819         initialization value.
21820         (mtune=): Replace s390_arch_option with processor_type.  Set
21821         variable name to s390_tune.  Set initialization value.
21822
21823 2011-03-23  Julian Brown  <julian@codesourcery.com>
21824
21825         * expr.c (expand_expr_real_1): Only use BLKmode for volatile
21826         accesses which are not naturally aligned.
21827
21828 2011-03-23  Richard Sandiford  <richard.sandiford@linaro.org>
21829
21830         PR target/47553
21831         * config/arm/predicates.md (neon_lane_number): Accept 0..15.
21832
21833 2011-03-23  Richard Sandiford  <richard.sandiford@linaro.org>
21834
21835         * optabs.h (emit_unop_insn, maybe_emit_unop_insn): Change insn code
21836         parameter from "int" to "enum insn_code".
21837         (expand_operand_type): New enum.
21838         (expand_operand): New structure.
21839         (create_expand_operand): New function.
21840         (create_fixed_operand, create_output_operand): Likewise
21841         (create_input_operand, create_convert_operand_to): Likewise.
21842         (create_convert_operand_from, create_address_operand): Likewise.
21843         (create_integer_operand): Likewise.
21844         (create_convert_operand_from_type, maybe_legitimize_operands): Declare.
21845         (maybe_gen_insn, maybe_expand_insn, maybe_expand_jump_insn): Likewise.
21846         (expand_insn, expand_jump_insn): Likewise.
21847         * builtins.c (expand_builtin_prefetch): Use the new interfaces.
21848         (expand_builtin_interclass_mathfn, expand_builtin_strlen): Likewise.
21849         (expand_movstr, expand_builtin___clear_cache): Likewise.
21850         (expand_builtin_lock_release): Likewise.
21851         * explow.c (allocate_dynamic_stack_space): Likewise.
21852         (probe_stack_range): Likewise.  Allow check_stack to FAIL,
21853         and use the default handling in that case.
21854         * expmed.c (check_predicate_volatile_ok): Delete.
21855         (store_bit_field_1, extract_bit_field_1): Use the new interfaces.
21856         (emit_cstore): Likewise.
21857         * expr.c (emit_block_move_via_movmem): Likewise.
21858         (set_storage_via_setmem, expand_assignment): Likewise.
21859         (emit_storent_insn, try_casesi): Likewise.
21860         (emit_single_push_insn): Likewise.  Allow the expansion to fail.
21861         * optabs.c (expand_widen_pattern_expr, expand_ternary_op): Likewise.
21862         (expand_vec_shift_expr, expand_binop_directly): Likewise.
21863         (expand_twoval_unop, expand_twoval_binop): Likewise.
21864         (expand_unop_direct, emit_indirect_jump): Likewise.
21865         (emit_conditional_move, vector_compare_rtx): Likewise.
21866         (expand_vec_cond_expr, expand_val_compare_and_swap_1): Likewise.
21867         (expand_sync_operation, expand_sync_fetch_operation): Likewise.
21868         (expand_sync_lock_test_and_set): Likewise.
21869         (maybe_emit_unop_insn): Likewise.  Change icode to an insn_code.
21870         (emit_unop_insn): Likewise.
21871         (expand_copysign_absneg): Change icode to an insn_code.
21872         (create_convert_operand_from_type): New function.
21873         (maybe_legitimize_operand, maybe_legitimize_operands): Likewise.
21874         (maybe_gen_insn, maybe_expand_insn, maybe_expand_jump_insn): Likewise.
21875         (expand_insn, expand_jump_insn): Likewise.
21876         * config/i386/i386.md (setmem<mode>): Use nonmemory_operand rather
21877         than const_int_operand for operand 2.
21878
21879 2011-03-23  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
21880
21881         * dwarf2out.c (const_ok_for_output_1): Print the unspec enum name
21882         if possible.
21883
21884 2011-03-22  Nathan Froyd  <froydnj@codesourcery.com>
21885
21886         * emit-rtl.c (emit_pattern_before_noloc): New function.
21887         (emit_insn_before_noloc, emit_jump_insn_before_noloc): Call it.
21888         (emit_call_insn_before_noloc, emit_debug_insn_before_noloc): Likewise.
21889         (emit_pattern_after_noloc): New function.
21890         (emit_insn_after_noloc, emit_jump_insn_after_noloc): Call it.
21891         (emit_call_insn_after_noloc, emit_debug_insn_after_noloc): Likewise.
21892
21893 2011-03-22  Nathan Froyd  <froydnj@codesourcery.com>
21894
21895         * libgcc2.c (__lshrdi3, __ashldi3, __ashrdi3): Use W_TYPE_SIZE.
21896         (__ffsDI2): Likewise.
21897
21898 2011-03-22  Richard Henderson  <rth@redhat.com>
21899
21900         * config/alpha/alpha.c (direct_return): Use TARGET_ABI_OSF instead
21901         of !TARGET_ABI_OPEN_VMS.
21902         (alpha_trampoline_init, alpha_start_function): Likewise.
21903         (alpha_expand_epilogue, alpha_file_start): Likewise.
21904         * config/alpha/alpha.md (divsi3, modsi3): Likewise.
21905         (udivsi3, umodsi3, divdi3, moddi3, udivdi3, umoddi3): Likewise.
21906         (*divmodsi_internal_er, *divmodsi_internal_er_1): Likewise.
21907         (*divmodsi_internal, *divmoddi_internal_er): Likewise.
21908         (*divmoddi_internal_er_1, *divmoddi_internal): Likewise.
21909
21910 2011-03-22  Joseph Myers  <joseph@codesourcery.com>
21911
21912         * config/s390/s390-opts.h: New.
21913         * config/s390/s390.c (s390_tune, s390_tune_flags, s390_arch,
21914         s390_arch_flags, s390_warn_framesize, s390_stack_size,
21915         s390_stack_guard): Remove.
21916         (s390_handle_arch_option): Return void.  Take enum
21917         s390_arch_option value instead of string and searching array.
21918         (s390_handle_option): Don't assert that global structures are in
21919         use.  Access variables via opts pointer.  Use error_at.  Don't use
21920         sscanf for -mstack-guard= or -mstack-size=.  Update call to
21921         s390_handle_arch_option.
21922         (s390_option_override): Update call to s390_handle_arch_option.
21923         (s390_emit_prologue): Use %d format for s390_stack_size in
21924         diagnostic.  Use %wd for HOST_WIDE_INT.
21925         * config/s390/s390.h (enum processor_type): Move to s390-opts.h.
21926         (s390_tune, s390_tune_flags, s390_arch, s390_arch_flags): Remove.
21927         * config/s390/s390.opt (config/s390/s390-opts.h): New
21928         HeaderInclude entry.
21929         (s390_arch_string, s390_tune, s390_tune_flags, s390_arch,
21930         s390_arch_flags, s390_warn_framesize): New Variable entries.
21931         (s390_arch_option): New Enum and EnumValue entries.
21932         (march=): Use Enum instead of Var.
21933         (mstack-guard=, mstack-size=): Use UInteger and Var.
21934         (mtune=): Use Enum.
21935
21936 2011-03-22  Joseph Myers  <joseph@codesourcery.com>
21937
21938         * config/score/score.c (score_handle_option): Don't assert that
21939         global structures are in use.  Access target_flags via opts
21940         pointer.  Use value of -march= option to determine target_flags
21941         settings.
21942         * config/score/score.opt (march=): Use Enum.
21943         (score_arch): New Enum and EnumValue entries.
21944
21945 2011-03-22  Joseph Myers  <joseph@codesourcery.com>
21946
21947         * config/mep/mep.c (option_mtiny_specified): Remove.
21948         (mep_option_override): Move register handling for -mivc2 from
21949         mep_handle_option.  Use global_options_set.x_mep_tiny_cutoff
21950         instead of option_mtiny_specified.
21951         (mep_handle_option): Access target_flags via opts pointer.  Don't
21952         assert that global structures are in use.  Defer part of -mivc2
21953         handling and move it to mep_option_override.
21954         * config/mep/mep.opt (IVC2): New Mask entry.
21955         (mivc2): Use Var and Defer instead of Mask.
21956
21957 2011-03-22  Joseph Myers  <joseph@codesourcery.com>
21958
21959         * config/v850/v850-opts.h: New.
21960         * config/v850/v850.c (small_memory): Replace with
21961         small_memory_physical_max array.  Make that array static const.
21962         (v850_handle_memory_option): Take integer value of argument.  Take
21963         gcc_options pointer, option text and location.  Return void.
21964         Update for changes to small memory structures.
21965         (v850_handle_option): Access target_flags via opts pointer.  Don't
21966         assert that global structures are in use.  Update calls to
21967         v850_handle_memory_option.
21968         (v850_encode_data_area): Update references to small memory settings.
21969         * config/v850/v850.h (struct small_memory_info, small_memory): Remove.
21970         (enum small_memory_type): Move to v850-opts.h.
21971         * config/v850/v850.opt (config/v850/v850-opts.h): New
21972         HeaderInclude entry.
21973         (small_memory_max): New Variable entry.
21974         (msda): Replace by pair of options msda= and msda-.  Use UInteger.
21975         (mtda, mzda): Likewise.
21976
21977 2011-03-22  Joseph Myers  <joseph@codesourcery.com>
21978
21979         * config/sh/sh.c (sh_handle_option): Access target_flags via opts
21980         pointer.  Don't assert that global structures are in use.
21981
21982 2011-03-22  Joseph Myers  <joseph@codesourcery.com>
21983
21984         * config/pdp11/pdp11.c (pdp11_handle_option): Access target_flags
21985         via opts pointer.  Don't assert that global structures are in use.
21986
21987 2011-03-22  Joseph Myers  <joseph@codesourcery.com>
21988
21989         * config/pa/pa-hpux.opt (flag_pa_unix): New Variable entry.
21990         (munix=93): Use Var.
21991         * config/pa/pa-hpux1010.opt (munix=95): Use Var.
21992         * config/pa/pa-hpux1111.opt (munix=98): Use Var.
21993         * config/pa/pa-opts.h: New.
21994         * config/pa/pa.c (pa_cpu, flag_pa_unix): Remove.
21995         (pa_handle_option): Don't assert that global structures are in
21996         use.  Access target_flags via opts pointer.  Don't handle
21997         OPT_mschedule_, OPT_mfixed_range_, OPT_munix_93, OPT_munix_95 or
21998         OPT_munix_98 here.
21999         (pa_option_override): Handle deferred OPT_mfixed_range_.
22000
22001 2011-03-22  Joseph Myers  <joseph@codesourcery.com>
22002
22003         * config/mn10300/mn10300-opts.h: New.
22004         * config/mn10300/mn10300.c (mn10300_processor,
22005         mn10300_tune_string): Remove.
22006         (mn10300_handle_option): Don't assert that global structures are
22007         in use.  Access mn10300_processor via opts pointer.  Don't handle
22008         OPT_mtune_ here.
22009         * config/mn10300/mn10300.h (enum processor_type): Move to
22010         mn10300-opts.h.
22011         (mn10300_processor): Remove.
22012         * config/mn10300/mn10300.opt (config/mn10300/mn10300-opts.h): New
22013         HeaderInclude entry.
22014         (mn10300_processor): New Variable entry.
22015         (mtune=): Use Var.
22016
22017 2011-03-22  Joseph Myers  <joseph@codesourcery.com>
22018
22019         * config/microblaze/microblaze.c: Don't include opts.h.
22020         (microblaze_handle_option, TARGET_HANDLE_OPTION): Remove.
22021         * config/microblaze/microblaze.opt (mxl-stack-check): Use Warn.
22022         (mno-clearbss): Use Var and Warn.
22023
22024 2011-03-22  Joseph Myers  <joseph@codesourcery.com>
22025
22026         * config/m32r/m32r-opts.h: New.
22027         * config/m32r/m32r.c (m32r_model, m32r_sdata): Remove.
22028         (m32r_handle_option): Don't assert that global structures are in
22029         use.  Access target_flags and m32r_cache_flush_func via opts
22030         pointer.  Don't handle OPT_mmodel_, OPT_msdata_ or
22031         OPT_mno_flush_trap here.
22032         * config/m32r/m32r.h (Code Models, Small Data Area): Replace by
22033         include of m32r-opts.h.
22034         * config/m32r/m32r.opt (config/m32r/m32r-opts.h): New
22035         HeaderInclude entry.
22036         (m32r_model_selected, m32r_sdata_selected): New Variable entries.
22037         (mmodel=): Use Enum and Var.
22038         (m32r_model): New Enum and EnumValue entries.
22039         (mno-flush-trap): Use Var.
22040         (msdata=): Use Enum and Var.
22041         (m32r_sdata): New Enum and EnumValue entries.
22042
22043 2011-03-22  Joseph Myers  <joseph@codesourcery.com>
22044
22045         * config/m32c/m32c.c: Don't include opts.h.
22046         (target_memregs, target_memregs_set, TARGET_HANDLE_OPTION,
22047         m32c_handle_option): Remove.
22048         (m32c_option_override): Check global_options_set.x_target_memregs
22049         instead of target_memregs_set.
22050         * config/m32c/m32c.h (target_memregs): Remove.
22051         * config/m32c/m32c.opt (memregs=): Use UInteger with integer
22052         variable.
22053
22054 2011-03-22  Joseph Myers  <joseph@codesourcery.com>
22055
22056         * config/iq2000/iq2000-opts.h: New.
22057         * config/iq2000/iq2000.c: Don't include opts.h.
22058         (iq2000_tune, iq2000_handle_option, TARGET_HANDLE_OPTION): Remove.
22059         * config/iq2000/iq2000.h (enum processor_type, iq2000_tune): Remove.
22060         * config/iq2000/iq2000.opt (config/iq2000/iq2000-opts.h): New
22061         HeaderInclude entry.
22062         (iq2000_tune): New Variable entry.
22063         (march=): Add comment.  Use Enum.
22064         (iq2000_arch): New Enum and EnumValue entries.
22065         (mcpu=): Use Enum and Var.
22066         (iq2000_tune): New Enum and EnumValue entries.
22067
22068 2011-03-22  Joseph Myers  <joseph@codesourcery.com>
22069
22070         * config/ia64/ia64-opts.h: New.
22071         * config/ia64/ia64.c (ia64_tune): Remove.
22072         (ia64_handle_option): Don't handle OPT_mfixed_range_ or OPT_mtune_
22073         here.  Use error_at.
22074         (ia64_option_override): Handle deferred OPT_mfixed_range_.
22075         * config/ia64/ia64.h (enum processor_type, ia64_tune): Remove.
22076         * config/ia64/ia64.opt (config/ia64/ia64-opts.h): New
22077         HeaderInclude entry.
22078         (ia64_tune): New Variable entry.
22079         (mfixed-range=): Use Defer and Var.
22080         (mtune=): Use Enum and Var.
22081         (ia64_tune): New Enum and EnumValue entries.
22082
22083 2011-03-22  Joseph Myers  <joseph@codesourcery.com>
22084
22085         * config/frv/frv-opts.h: New.
22086         * config/frv/frv-protos.h (enum frv_cpu, frv_cpu_t): Move to
22087         frv-opts.h.
22088         (frv_cpu_type): Remove.
22089         * config/frv/frv.c: Don't include opts.h.
22090         (frv_cpu_type, frv_handle_option, TARGET_HANDLE_OPTION): Remove.
22091         * config/frv/frv.opt (config/frv/frv-opts.h): New HeaderInclude entry.
22092         (frv_cpu_type): New Variable entry.
22093         (frv_cpu): New Enum and EnumValue entries.
22094
22095 2011-03-22  Joseph Myers  <joseph@codesourcery.com>
22096
22097         * config/cris/cris.c (cris_handle_option): Access target_flags via
22098         opts pointer.  Don't assert that global structures are in use.
22099         Don't call CRIS_SUBTARGET_HANDLE_OPTION.
22100         * config/cris/cris.h (CRIS_SUBTARGET_HANDLE_OPTION): Don't define.
22101
22102 2011-03-22  Joseph Myers  <joseph@codesourcery.com>
22103
22104         * config/bfin/bfin-opts.h: New.
22105         * config/bfin/bfin.c (bfin_lib_id_given, bfin_cpu_type,
22106         bfin_si_revision, bfin_workarounds): Remove.
22107         (bfin_cpus): Make static const.
22108         (bfin_load_pic_reg): Check global_options_set.x_bfin_library_id
22109         not bfin_lib_id_given.
22110         (bfin_handle_option): Don't set bfin_lib_id_given.  Access
22111         bfin_cpu_type, bfin_si_revision and bfin_workarounds via opts
22112         pointer. Use error_at.  Don't assert that global structures are in use.
22113         * config/bfin/bfin.h: Include bfin-opts.h.
22114         (enum bfin_cpu_type, bfin_cpu_t): Move to bfin-opts.h.
22115         (bfin_cpu_type, bfin_si_revision, bfin_workarounds): Remove.
22116         * bfin.opt (config/bfin/bfin-opts.h): New HeaderInclude entry.
22117         (bfin_cpu_type, bfin_si_revision, bfin_workarounds): New Variable
22118         entries.
22119
22120 2011-03-22  Joseph Myers  <joseph@codesourcery.com>
22121
22122         * config/arm/arm.opt (mhard-float, msoft-float): Use Alias.
22123         * config/arm/arm.c (arm_handle_option): Don't handle -mhard-float
22124         or -msoft-float here.
22125         * config/arm/arm.h (CPP_SPEC): Handle -mfloat-abi=*, not
22126         -msoft-float and -mhard-float.
22127         (OPTION_DEFAULT_SPECS): Don't handle -mhard-float and -msoft-float.
22128         * config/arm/coff.h (MULTILIB_DEFAULTS): Use mfloat-abi=soft, not
22129         msoft-float.
22130         * config/arm/elf.h (ASM_SPEC): Don't handle -mhard-float and
22131         -msoft-float.
22132         (MULTILIB_DEFAULTS): Use mfloat-abi=soft, not msoft-float.
22133         * config/arm/linux-elf.h (MULTILIB_DEFAULTS): Use mfloat-abi=hard,
22134         not mhard-float.
22135         (LIBGCC_SPEC): Don't handle -msoft-float.
22136         * config/arm/netbsd-elf.h (SUBTARGET_ASM_FLOAT_SPEC): Don't handle
22137         -mhard-float.
22138         * config/arm/pe.h (MULTILIB_DEFAULTS): Use mfloat-abi=soft, not
22139         msoft-float.
22140         * config/arm/rtems-elf.h (SUBTARGET_EXTRA_ASM_SPEC): Handle
22141         -mfloat-abi=*, not -msoft-float and -mhard-float.
22142         * config/arm/semi.h((ASM_SPEC): Don't handle -mhard-float and
22143         -msoft-float.
22144         * config/arm/t-arm-elf (MULTILIB_OPTIONS, MULTILIB_EXCEPTIONS):
22145         Use mfloat-abi=hard and mfloat-abi=soft in comments, not
22146         mhard-float and msoft-float.
22147         * config/arm/t-linux (MULTILIB_OPTIONS): Use mfloat-abi=hard and
22148         mfloat-abi=soft in comments, not mhard-float and msoft-float.
22149         * config/arm/t-rtems (MULTILIB_OPTIONS, MULTILIB_EXCEPTIONS): Use
22150         mfloat-abi=soft and mfloat-abi=hard, not msoft-float and
22151         mhard-float.
22152         * config/arm/t-strongarm-elf (MULTILIB_OPTIONS): Use
22153         mfloat-abi=hard and mfloat-abi=soft, not mhard-float and
22154         msoft-float.
22155         * config/arm/t-wince-pe (MULTILIB_OPTIONS): Use mfloat-abi=hard,
22156         not mhard-float.
22157         * config/arm/wince-pe.h (MULTILIB_DEFAULTS): Use mfloat-abi=soft,
22158         not msoft-float.
22159
22160 2011-03-22  Richard Henderson  <rth@redhat.com>
22161
22162         * config/alpha/alpha.c (alpha_expand_prologue): Don't test
22163         TARGET_ABI_WINDOWS_NT.
22164         (alpha_output_function_end_prologue): Likewise.
22165         * config/alpha/alpha.h (TARGET_ABI_OSF): Likewise.
22166         (ASM_OUTPUT_ADDR_DIFF_ELT): Likewise.
22167         * config/alpha/alpha.md (call, call_value, tablejump): Likewise.
22168         (trap, *movsi_nt_vms): Likewise.
22169         (call_nt, call_value_nt, *call_nt_1, *call_value_nt_1): Remove.
22170         (*tablejump_osf_nt_internal): Remove.
22171         * config/alpha/predicates.md (input_operand): Only test Pmode.
22172
22173 2011-03-22  Joseph Myers  <joseph@codesourcery.com>
22174
22175         * config/alpha/alpha.c (alpha_handle_option): Access target_flags
22176         via opts pointer.  Use error_at.  Don't assert that global
22177         structures are in use.
22178
22179 2011-03-22  Joseph Myers  <joseph@codesourcery.com>
22180
22181         * config/i386/i386.c (ix86_isa_flags_explicit): Remove.
22182         (ix86_handle_option): Access ix86_isa_flags and
22183         ix86_isa_flags_explicit via opts pointer.  Don't assert that
22184         global structures are in use.
22185         (ix86_function_specific_save, ix86_function_specific_restore):
22186         Update ix86_isa_flags_explicit field name.
22187         * config/i386/i386.opt (ix86_isa_flags_explicit): New Variable entry.
22188         (ix86_isa_flags_explicit): Rename TargetSave entry to
22189         x_ix86_isa_flags_explicit.
22190
22191 2011-03-22  Richard Henderson  <rth@redhat.com>
22192
22193         * config/alpha/alpha.c (NUM_ARGS): Don't test TARGET_ABI_UNICOSMK.
22194         (alpha_option_override, direct_return): Likewise.
22195         (alpha_arg_partial_bytes, alpha_setup_incoming_varargs): Likewise.
22196         (alpha_va_start, alpha_gimplify_va_arg, alpha_sa_mask): Likewise.
22197         (alpha_sa_size, compute_frame_size, alpha_expand_prologue): Likewise.
22198         (alpha_start_function, alpha_output_function_end_prologue): Likewise.
22199         (alpha_expand_epilogue, alpha_end_function): Likewise.
22200         (alpha_init_libfuncs): Likewise.
22201         (struct machine_function): Remove unicosmk members.
22202         (print_operand) ['t']: Remove.
22203         (unicosmk_must_pass_in_stack, unicosmk_initial_elimination_offset,
22204         unicosmk_output_module_name, unicosmk_output_common,
22205         current_section_align, unicosmk_output_text_section_asm_op,
22206         unicosmk_output_data_section_asm_op, unicosmk_init_sections,
22207         unicosmk_section_type_flags, unicosmk_unique_section,
22208         unicosmk_asm_named_section, unicosmk_insert_attributes,
22209         unicosmk_output_align, unicosmk_defer_case_vector,
22210         unicosmk_output_addr_vec, unicosmk_output_deferred_case_vectors,
22211         SSIB_PREFIX, SSIB_PREFIX_LEN, unicosmk_ssib_name, unicosmk_gen_dsib,
22212         unicosmk_output_ssib, unicosmk_add_call_info_word,
22213         unicosmk_extern_head, unicosmk_output_default_externs,
22214         unicosmk_output_externs, unicosmk_add_extern, unicosmk_dex_list,
22215         unicosmk_dex_count, unicosmk_special_name, unicosmk_need_dex,
22216         unicosmk_output_dex, unicosmk_file_start, unicosmk_file_end): Remove.
22217         * config/alpha/alpha-protos.h: Update.
22218         * config/alpha/alpha.h (TARGET_ABI_OSF): Don't test TARGET_ABI_UNICOSMK.
22219         * config/alpha/alpha.md (UNSPEC_UMK_LAUM, UNSPEC_UMK_LALM): Remove.
22220         (UNSPEC_UMK_LAL, UNSPEC_UMK_LOAD_CIW): Remove.
22221         (mulsi3): Don't test TARGET_ABI_UNICOSMK.
22222         (*mulsi_se, mulvsi3): Likewise.
22223         (divsi3, udivsi3, modsi3, umodsi3, divdi3, udivdi3): Likewise.
22224         (*divmodsi_internal, call, call_value, realign): Likewise.
22225         (moddi3, umoddi3): Likewise; remove duplicate expander.
22226         (moddi3_umk, umoddi3_umk, call_umk, call_value_umk): Remove.
22227         (*call_umk_1, *movsi, umk_laum, umk_lalm, *umk_load_ciw): Remove.
22228         (*movdi_nofix): Remove r/U alternative.
22229         (umk_mismatch_args, arg_home_umk, *call_value_umk): Remove.
22230         * config/alpha/constraints.md ("U"): Remove.
22231         * config/alpha/predicates.md (call_operand"): Don't test
22232         TARGET_ABI_UNICOSMK.
22233
22234 2011-03-22  Joseph Myers  <joseph@codesourcery.com>
22235
22236         * target.def (handle_option): Take gcc_options and
22237         cl_decoded_option pointers and location_t.
22238         * doc/tm.texi.in (TARGET_HANDLE_OPTION): Update documentation.
22239         * doc/tm.texi: Regenerate.
22240         * hooks.c (hook_bool_size_t_constcharptr_int_true): Remove.
22241         * hooks.h (hook_bool_size_t_constcharptr_int_true): Don't declare.
22242         * lto-opts.c (lto_reissue_options): Generate option structure for
22243         targetm.handle_option call.
22244         * opts.c (target_handle_option): Update call to
22245         targetm.handle_option.  Remove assertions about values now passed
22246         down to hook.
22247         * targhooks.c (default_target_handle_option): New.
22248         * targhooks.h (default_target_handle_option): Declare.
22249         * config/alpha/alpha.c: Include opts.h.
22250         (alpha_handle_option): Update to new hook interface.
22251         * config/arm/arm.c: Include opts.h.
22252         (arm_handle_option): Update to new hook interface.
22253         * config/arm/t-arm (arm.o): Update dependencies.
22254         * config/bfin/bfin.c: Include opts.h.
22255         (bfin_handle_option): Update to new hook interface.
22256         * config/cris/cris.c: Include opts.h.
22257         (cris_handle_option): Update to new hook interface.
22258         * config/frv/frv.c: Include opts.h.
22259         (frv_handle_option): Update to new hook interface.
22260         * config/i386/i386.c: Include opts.h.
22261         (ix86_handle_option): Update to new hook interface.
22262         (ix86_valid_target_attribute_inner_p): Generate option structure
22263         for call to ix86_handle_option.
22264         * config/i386/t-i386 (i386.o): Update dependencies.
22265         * config/ia64/ia64.c: Include opts.h.
22266         (ia64_handle_option): Update to new hook interface.
22267         * config/ia64/t-ia64 (ia64.o): Update dependencies.
22268         * config/iq2000/iq2000.c: Include opts.h.
22269         (iq2000_handle_option): Update to new hook interface.
22270         * config/m32c/m32c.c: Include opts.h.
22271         (m32c_handle_option): Update to new hook interface.
22272         * config/m32r/m32r.c: Include opts.h.
22273         (m32r_handle_option): Update to new hook interface.
22274         * config/m68k/m68k.c: Include opts.h.
22275         (m68k_handle_option): Update to new hook interface.
22276         * config/mep/mep.c: Include opts.h.
22277         (mep_handle_option): Update to new hook interface.
22278         * config/microblaze/microblaze.c: Include opts.h.
22279         (microblaze_handle_option): Update to new hook interface.
22280         * config/mips/mips.c: Include opts.h.
22281         (mips_handle_option): Update to new hook interface.
22282         * config/mn10300/mn10300.c: Include opts.h.
22283         (mn10300_handle_option): Update to new hook interface.
22284         * config/pa/pa.c: Include opts.h.
22285         (pa_handle_option): Update to new hook interface.
22286         * config/pdp11/pdp11.c: Include opts.h.
22287         (pdp11_handle_option): Update to new hook interface.
22288         * config/rs6000/rs6000.c: Include opts.h.
22289         (rs6000_handle_option): Update to new hook interface.
22290         * config/rs6000/t-rs6000 (rs6000.o): Update dependencies.
22291         * config/rx/rx.c: Include opts.h.
22292         (rx_handle_option): Update to new hook interface.
22293         * config/s390/s390.c: Include opts.h.
22294         (s390_handle_option): Update to new hook interface.
22295         * config/score/score.c: Include opts.h.
22296         (score_handle_option): Update to new hook interface.
22297         * config/sh/sh.c: Include opts.h.
22298         (sh_handle_option): Update to new hook interface.
22299         * config/sparc/sparc.c: Include opts.h.
22300         (sparc_handle_option): Update to new hook interface.
22301         * config/v850/v850.c: Include opts.h.
22302         (v850_handle_option): Update to new hook interface.
22303
22304 2011-03-22  Joseph Myers  <joseph@codesourcery.com>
22305
22306         * gcc.c (driver_unknown_option_callback): Only permit and save
22307         unknown -Wno- options.
22308         (driver_wrong_lang_callback): Save options directly instead of via
22309         driver_unknown_option_callback.
22310
22311 2011-03-22  Eric Botcazou  <ebotcazou@adacore.com>
22312
22313         * combine.c (simplify_set): Try harder to find the best CC mode when
22314         simplifying a nested COMPARE on the RHS.
22315
22316 2011-03-22  Joseph Myers  <joseph@codesourcery.com>
22317
22318         * config/alpha/gnu.h: Remove.
22319         * config/arc: Remove directory.
22320         * config/arm/netbsd.h: Remove.
22321         * config/arm/t-pe: Remove.
22322         * config/crx: Remove directory.
22323         * config/i386/netbsd.h: Remove.
22324         * config/m68hc11: Remove directory.
22325         * config/m68k/uclinux-oldabi.h: Remove.
22326         * config/mcore/mcore-pe.h: Remove.
22327         * config/mcore/t-mcore-pe: Remove.
22328         * config/netbsd-aout.h: Remove.
22329         * config/rs6000/gnu.h: Remove.
22330         * config/sh/sh-symbian.h: Remove.
22331         * config/sh/symbian-base.c: Remove.
22332         * config/sh/symbian-c.c: Remove.
22333         * config/sh/symbian-cxx.c: Remove.
22334         * config/sh/symbian-post.h: Remove.
22335         * config/sh/symbian-pre.h: Remove.
22336         * config/sh/t-symbian: Remove.
22337         * config/svr3.h: Remove.
22338         * config/vax/netbsd.h: Remove.
22339         * config.build: Don't handle i[34567]86-*-pe.
22340         * config.gcc: Remove handling of deprecations for most deprecated
22341         targets.
22342         (m68k-*-uclinuxoldabi*): Add to second deprecated list.
22343         (alpha*-*-gnu*, arc-*-elf*, arm*-*-netbsd*, arm-*-pe*, crx-*-elf,
22344         i[34567]86-*-netbsd*, i[34567]86-*-pe, m68hc11-*-*|m6811-*-*,
22345         m68hc12-*-*|m6812-*-*, m68k-*-uclinuxoldabi*, mcore-*-pe*,
22346         powerpc64-*-gnu*, powerpc-*-gnu-gnualtivec*, powerpc-*-gnu*,
22347         sh-*-symbianelf* | sh[12346l]*-*-symbianelf*, vax-*-netbsd*):
22348         Remove cases.
22349         * config.host: Don't handle i[34567]86-*-pe.
22350         * config/rs6000/linux64.h (LINK_OS_GNU_SPEC): Remove.
22351         (ASM_SPEC32): Don't handle -mcall-gnu.
22352         * config/rs6000/sysv4.h (SUBTARGET_OVERRIDE_OPTIONS): Don't handle
22353         -mcall-gnu.
22354         (ASM_SPEC, CC1_SPEC, LINK_START_SPEC, LINK_OS_SPEC, CPP_SPEC,
22355         STARTFILE_SPEC, LIB_SPEC, ENDFILE_SPEC): Don't handle -mcall-gnu.
22356         (LIB_GNU_SPEC, STARTFILE_GNU_SPEC, ENDFILE_GNU_SPEC,
22357         LINK_START_GNU_SPEC, LINK_OS_GNU_SPEC, CPP_OS_GNU_SPEC): Remove.
22358         (SUBTARGET_EXTRA_SPECS): Remove *_gnu specs.
22359         * config/sh/sh-protos.h, config/sh/sh.c: Remove all code
22360         conditional on SYMBIAN.
22361         * configure.ac: Don't handle powerpc*-*-gnu*.
22362         * configure: Regenerate.
22363         * doc/extend.texi (interrupt attribute): Don't mention CRX.
22364         * doc/install-old.texi (m6811, m6812): Don't mention.
22365         * doc/install.texi (arc-*-elf*): Don't document multilib option.
22366         (arc-*-elf, CRX, m6811-elf, m6812-elf): Remove.
22367         (m68k-uclinuxoldabi): Don't mention.
22368         * doc/invoke.texi (ARC Options, CRX Options, M68hc1x Options):
22369         Remove.
22370         (-mcall-gnu): Remove.
22371         * doc/md.texi (CRX Architecture, Motorola 68HC11 & 68HC12
22372         families): Remove constraint documentation.
22373
22374 2011-03-22  Marius Strobl  <marius@FreeBSD.org>
22375
22376         * config/sparc/freebsd.h (CPP_CPU64_DEFAULT_SPEC): Replace with...
22377         (FBSD_TARGET_CPU_CPP_BUILTINS): ...this.
22378         (TARGET_GNU_TLS, TARGET_SUN_TLS): Define.
22379
22380 2011-03-21  Michael Meissner  <meissner@linux.vnet.ibm.com>
22381
22382         PR target/48226
22383         * config/rs6000/rs6000-c.c (rs6000_macro_to_expand): If we see a
22384         vector when peeking at the next token for vector, don't expand the
22385         keywords.
22386
22387 2011-03-21  Georg-Johann Lay  <avr@gjlay.de>
22388
22389         * config/avr/avr-protos.h (expand_epilogue): Change prototype
22390         * config/avr/avr.h (struct machine_function): Add field sibcall_fails.
22391         * config/avr/avr.c (init_cumulative_args)
22392         (avr_function_arg_advance): Use it.
22393         * config/avr/avr.c (expand_epilogue): Add bool parameter. Handle
22394         sibcall epilogues.
22395         (TARGET_FUNCTION_OK_FOR_SIBCALL): Define to...
22396         (avr_function_ok_for_sibcall): ...this new function.
22397         (avr_lookup_function_attribute1): New static Function.
22398         (avr_naked_function_p, interrupt_function_p)
22399         (signal_function_p, avr_OS_task_function_p)
22400         (avr_OS_main_function_p): Use it.
22401         * config/avr/avr.md ("sibcall", "sibcall_value")
22402         ("sibcall_epilogue"): New expander.
22403         ("*call_insn", "*call_value_insn"): New insn.
22404         ("call_insn", "call_value_insn"): Remove
22405         ("call", "call_value", "epilogue"): Change expander to handle
22406         sibling calls.
22407
22408 2011-03-21  Nick Clifton  <nickc@redhat.com>
22409
22410         * doc/invoke.texi (Overall Options): Move closing brace to end of
22411         options list.
22412         (Optimization Options): Add missing @gol.
22413         (Directory Options): Likewise.
22414         (i386 and x86-64 Options): Likewise.
22415         (RS6000 and PowerPC Options): Likewise.
22416         (i386 and x86-64 Windows Options): Likewise.
22417         (V850 Options): Add text missing from descriptions.
22418
22419 2011-03-22  Richard Henderson  <rth@redhat.com>
22420
22421         * config/avr/avr.c (TARGET_EXCEPT_UNWIND_INFO): New.
22422         (avr_incoming_return_addr_rtx): New.
22423         (emit_push_byte): New.
22424         (expand_prologue): Use it.  Remove incorrect dwarf annotation for
22425         SREG, RAMPZ, zero register.  Push frame pointer by bytes.  Add dwarf
22426         annotation for __prologue_saves__.  Fixup dwarf annotation for CFA.
22427         (emit_pop_byte): New.
22428         (expand_epilogue): Use it.  Pop frame pointer by bytes.
22429         * config/avr/avr.h (FRAME_POINTER_CFA_OFFSET): Remove.
22430         (INCOMING_RETURN_ADDR_RTX): New.
22431         (INCOMING_FRAME_SP_OFFSET): New.
22432         (ARG_POINTER_CFA_OFFSET): New.
22433         * config/avr/avr.md (*pushqi): Fix mode of auto-inc.
22434         (*pushhi, *pushsi, *pushsf, popqi): Likewise.
22435         (pophi): Remove.
22436
22437         * dwarf2out.c (dwarf2out_frame_debug_expr) [rule 11]: Handle post_dec.
22438
22439 2011-03-22  Nathan Froyd  <froydnj@codesourcery.com>
22440
22441         * system.h (FUNCTION_ARG, FUNCTION_INCOMING_ARG): Poison.
22442         (FUNCTION_ARG_ADVANCE): Likewise.
22443         * tm.texi.in: Change references to them to hook references.
22444         * tm.texi: Regenerate.
22445         * targhooks.c (default_function_arg): Eliminate check for target
22446         macro.
22447         (default_function_incoming_arg): Likewise.
22448         (default_function_arg_advance): Likewise.
22449         * target.def (function_arg, function_incoming_arg): Change to DEFHOOK.
22450         (function_arg_advance): Likewise.
22451         * target-def.h: Eliminate FUNCTION_INCOMING_ARG check.
22452
22453 2011-03-22  Nathan Froyd  <froydnj@codesourcery.com>
22454
22455         * tree.c (build_call_1): New function.
22456         (build_call_valist, build_call_array_loc, build_call_vec): Call it.
22457
22458 2011-03-22  Richard Guenther  <rguenther@suse.de>
22459
22460         PR tree-optimization/48228
22461         * tree-vrp.c (vrp_visit_phi_node): Do not stop propagating
22462         for single-arg PHIs.
22463
22464 2011-03-22  Andrey Belevantsev  <abel@ispras.ru>
22465
22466         PR rtl-optimization/48143
22467         * config/i386/sse.md (*sse2_cvtpd2dq): Add athlon_decode attribute.
22468         (*sse2_cvttpd2dq, sse2_cvtss2sd, *sse2_cvtpd2ps,
22469         sse2_cvtps2pd): Likewise.
22470
22471 2011-03-22  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
22472
22473         * recog.c (canonicalize_change_group): Use validate_unshare_change.
22474
22475 2011-03-22  Richard Guenther  <rguenther@suse.de>
22476
22477         * gimple.c (gimple_rhs_class_table): POLYNOMIAL_CHREC is not
22478         a valid RHS.  Make DOT_PROD_EXPR and REALIGN_LOAD_EXPR ternary.
22479         * tree-cfg.c (verify_gimple_assign_ternary): Allow DOT_PROD_EXPR
22480         and REALIGN_LOAD_EXPR.
22481         (verify_gimple_assign_single): Do not allow POLYNOMIAL_CHREC,
22482         DOT_PROD_EXPR or REALIGN_LOAD_EXPR.
22483         * expr.c (expand_expr_real_1): Move REALIGN_LOAD_EXPR and
22484         DOT_PROD_EXPR case ...
22485         (expand_expr_real_2): ... here.
22486         * gimple-pretty-print.c (dump_ternary_rhs): Handle DOT_PROD_EXPR
22487         and REALIGN_LOAD_EXPR.
22488         * tree-data-ref.c (split_constant_offset): Bail out for all CHRECs.
22489         * tree-vect-loop.c (vect_model_reduction_cost): Handle ternaries.
22490         (vect_create_epilog_for_reduction): Likewise.
22491         (vectorizable_reduction): Likewise.
22492         * tree-vect-patterns.c (vect_recog_dot_prod_pattern): Adjust.
22493         * tree-vect-stmts.c (vectorizable_load): Likewise.
22494
22495 2011-03-22  Eric Botcazou  <ebotcazou@adacore.com>
22496
22497         * gimplify.c (gimplify_cond_expr): Gimplify COMPOUND_EXPR conditions.
22498
22499 2011-03-22  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
22500
22501         * config/s390/s390.c (s390_delegitimize_address): Fix offset
22502         handling for PLTOFF/GOTOFF.
22503
22504 2011-03-22  Nick Clifton  <nickc@redhat.com>
22505
22506         * config/i386/cygming.h (SUBTARGET_OVERRIDE_OPTIONS): Remove
22507         trailing backslash from the end of the macro definition.
22508
22509 2011-03-22  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
22510
22511         * config/s390/s390.c (s390_delegitimize_address): Handle PLTOFF
22512         and PLT unspecs.
22513
22514 2011-03-21  Richard Sandiford  <richard.sandiford@linaro.org>
22515
22516         * expr.h (prepare_operand): Move to...
22517         * optabs.h (prepare_operand): ...here and change the insn code
22518         parameter from "int" to "enum insn_code".
22519         (insn_operand_matches): Declare.
22520         * expr.c (init_expr_target): Use insn_operand_matches.
22521         (compress_float_constant): Likewise.
22522         * function.c (safe_insn_predicate, assign_parm_setup_reg): Likewise.
22523         * optabs.c (can_compare_p, prepare_cmp_insn): Likewise.
22524         (emit_cmp_and_jump_insn_1, gen_add2_insn, gen_add3_insn): Likewise.
22525         (have_add2_insn, gen_sub2_insn, gen_sub3_insn, have_sub2_insn):
22526         Likewise.
22527         (gen_cond_trap): Likewise.
22528         (prepare_operand): Likewise.  Change icode to an insn_code.
22529         (insn_operand_matches): New function.
22530         * reload.c (find_reloads_address_1): Use insn_operand_matches.
22531         * reload1.c (gen_reload): Likewise.
22532         * targhooks.c (default_secondary_reload): Likewise.
22533
22534 2011-03-21  Uros Bizjak  <ubizjak@gmail.com>
22535
22536         * config/alpha/alpha.md (unspec): New define_c_enum.
22537         (unspecv): Ditto.
22538
22539 2011-03-21  Uros Bizjak  <ubizjak@gmail.com>
22540
22541         PR debug/48214
22542         * config/alpha/alpha.c (alpha_pad_noreturn): Do not emit an unop
22543         between a call and its CALL_ARG_LOCATION note.
22544
22545 2011-03-21  Eric Botcazou  <ebotcazou@adacore.com>
22546
22547         * gimplify.c (gimplify_vla_decl): Set TREE_THIS_NOTRAP flag.
22548
22549 2011-03-21  Jakub Jelinek  <jakub@redhat.com>
22550
22551         PR c/42544
22552         PR c/48197
22553         * c-common.c (shorten_compare): If primopN is first sign-extended
22554         to opN and then zero-extended to result type, set primopN to opN.
22555
22556 2011-03-21  Daniel Jacobowitz  <dan@codesourcery.com>
22557
22558         * config/arm/unwind-arm.c (__gnu_unwind_pr_common): Correct test
22559         for barrier handlers.
22560
22561 2011-03-21  Michael Meissner  <meissner@linux.vnet.ibm.com>
22562
22563         * config/rs6000/rs6000.md (UNSPEC_*, UNSPECV_*): Redefine all
22564         UNSPEC constants to be in the unspec enumeration, and redefine
22565         all UNSPECV constants to be in the unspecv enumeration, so that
22566         dumps print which unspec/unspec_volatile this is.
22567         * config/rs6000/vector.md (UNSPEC_*): Ditto.
22568         * config/rs6000/paired.md (UNSPEC_*): Ditto.
22569         * config/rs6000/vsx.md (UNSPEC_*): Ditto.
22570         * config/rs6000/altivec.md (UNSPEC_*, UNSPECV_*): Ditto.
22571         * config/rs6000/dfp.md (UNSPEC_*): Ditto.
22572
22573         * config/rs6000/rs6000.md (UNSPECV_ISYNC, UNSPECV_LWSYNC): Rename
22574         UNSPEC_ISYNC and UNSPEC_HWSYNC to UNSPECV_ISYNC and
22575         UNSPECV_LWSYNC, since these are used as unspec_volatile.
22576         * config/rs6000/sync.md (isync, lwsync): Ditto.
22577
22578 2011-03-21  Richard Guenther  <rguenther@suse.de>
22579
22580         * params.def (lto-min-partition): Fix typo.
22581
22582 2011-03-21  Richard Guenther  <rguenther@suse.de>
22583
22584         PR c/47939
22585         * c-decl.c (grokdeclarator): Drop to the main variant only
22586         for array types.  Drop flag_gen_aux_info check.
22587
22588 2011-03-21  Richard Guenther  <rguenther@suse.de>
22589
22590         PR translation/47911
22591         * params.def (lto-partitions): Fix typo.
22592         (lto-min-partition): Fix wording.
22593
22594 2011-03-21  Andreas Tobler  <andreast@fgznet.ch>
22595
22596         * config/rs6000/t-freebsd: Remove duplication from file.
22597
22598 2011-03-21  Richard Guenther  <rguenther@suse.de>
22599
22600         PR middle-end/47661
22601         * gimple.c (is_gimple_condexpr): Use tree_could_throw_p.
22602
22603 2011-03-21  Richard Guenther  <rguenther@suse.de>
22604
22605         PR lto/48210
22606         * params.def (lto-partitions): Require at least 1 partition.
22607
22608 2011-03-21  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
22609
22610         * gthr-solaris.h: Remove.
22611         * gthr.h (_SOLARIS_THREADS): Don't include gthr-solaris.h, remove.
22612         * config/sol2.h (CPP_SUBTARGET_SPEC): Remove -threads support.
22613         (LIB_SPEC): Likewise.
22614         * config/sol2.opt (threads): Remove.
22615         * config.gcc (i[34567]86-*-solaris2*): Remove solaris threads support.
22616         (sparc*-*-solaris2*): Likewise.
22617         * configure.ac (enable_threads): Enable solaris support.
22618         * configure: Regenerate.
22619         * doc/invoke.texi (Option Summary, Solaris 2 Options): Remove -threads.
22620         * doc/install.texi (Configuration, --enable-threads=lib): Remove
22621         solaris.
22622
22623 2011-03-21  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
22624
22625         * config.gcc: Obsolete *-*-solaris2.8*.
22626         * doc/install.texi (Specific, *-*-solaris2*): Document it.
22627
22628 2011-03-21  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
22629
22630         PR bootstrap/48135
22631         * doc/install.texi (Prerequisites, Perl): Remove Glob.pm
22632         reference.  Solaris 8 perl works.
22633
22634 2011-03-21  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
22635
22636         PR bootstrap/48135
22637         * doc/install.texi (Prerequisites): Move jar etc. up.
22638         Explain support library version requirements.
22639
22640 2011-03-21  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
22641
22642         PR bootstrap/48135
22643         * doc/install.texi (Prerequisites): Move Perl to build
22644         requirements.  Always necessary on Solaris 2 with Sun ld.
22645
22646 2011-03-21  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
22647
22648         * doc/install.texi (Specific, alpha*-dec-osf5.1): Update for
22649         binutils 2.21.
22650         (Specific, i?86-*-solaris2.[89]): Likewise.
22651         (Specific, i?86-*-solaris2.10): Likewise.
22652         (Specific, mips-sgi-irix6): Likewise.
22653         (Specific, *-*-solaris2*): Remove Sun Studio download URL.
22654         Update for binutils 2.21.
22655
22656 2011-03-21  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
22657
22658         * configure.ac (gcc_cv_lto_plugin): Fix typo.
22659         Allow -fuse-linker-plugin for non-default plugin linker.
22660         * configure: Regenerate.
22661
22662 2011-03-21  Nicola Pero  <nicola.pero@meta-innovation.com>
22663
22664         PR bootstrap/48167
22665         * gengtype.c (files_rules): Added rule for cp/parser.h.
22666
22667 2011-03-21  Jakub Jelinek  <jakub@redhat.com>
22668
22669         PR target/48213
22670         * config/s390/s390.c (s390_delegitimize_address): Don't call
22671         lowpart_subreg if orig_x has BLKmode.
22672
22673 2011-03-21  Kai Tietz  <ktietz@redhat.com>
22674
22675         PR target/12171
22676         * doc/plugins.texi: Adjust documentation for plugin register_callback.
22677         * tree.h (attribute_spec): Add new member affects_type_identity.
22678         * attribs.c (empty_attribute_table): Adjust attribute_spec
22679         initializers.
22680         * config/alpha/alpha.c: Likewise.
22681         * config/arc/arc.c: Likewise.
22682         * config/arm/arm.c: Likewise.
22683         * config/avr/avr.c: Likewise.
22684         * config/bfin/bfin.c: Likewise.
22685         * config/crx/crx.c: Likewise.
22686         * config/darwin.h: Likewise.
22687         * config/h8300/h8300.c: Likewise.
22688         * config/i386/cygming.h: Likewise.
22689         * config/i386/i386.c: Likewise.
22690         * config/ia64/ia64.c: Likewise.
22691         * config/m32c/m32c.c: Likewise.
22692         * config/m32r/m32r.c: Likewise.
22693         * config/m68hc11/m68hc11.c: Likewise.
22694         * config/m68k/m68k.c: Likewise.
22695         * config/mcore/mcore.c: Likewise.
22696         * config/mep/mep.c: Likewise.
22697         * config/microblaze/microblaze.c: Likewise.
22698         * config/mips/mips.c: Likewise.
22699         * config/rs6000/rs6000.c: Likewise.
22700         * config/rx/rx.c: Likewise.
22701         * config/sh/sh.c: Likewise.
22702         * config/sol2.h: Likewise.
22703         * config/sparc/sparc.c: Likewise.
22704         * config/spu/spu.c: Likewise.
22705         * config/stormy16/stormy16.c: Likewise.
22706         * config/v850/v850.c: Likewise.
22707
22708 2011-03-21  Chung-Lin Tang  <cltang@codesourcery.com>
22709
22710         * simplify-rtx.c (simplify_binary_operation_1): Handle
22711         (xor (and A B) C) case when B and C are both constants.
22712
22713 2011-03-21  Mingjie Xing  <mingjie.xing@gmail.com>
22714
22715         * tree-dfa.c (add_referenced_var): Fix typo in comment.
22716
22717 2011-03-20  Eric Botcazou  <ebotcazou@adacore.com>
22718
22719         PR bootstrap/48168
22720         * config/sparc/sparc.c (sparc_delegitimize_address): Add new pattern.
22721
22722 2011-03-20  Jakub Jelinek  <jakub@redhat.com>
22723
22724         PR rtl-optimization/48156
22725         * df-core.c (df_get_bb_dirty): Use df_lr if df_live is NULL,
22726         assume df and df_lr are not NULL.
22727
22728 2011-03-20  Ramana Radhakrishnan  <ramana.radhakrishnan@linaro.org>
22729
22730         PR debug/48023
22731         * config/arm/arm.c (create_fix_barrier): Do not emit a minipool
22732         between a call and its CALL_ARG_LOCATION note.
22733
22734 2011-03-19  Kaz Kojima  <kkojima@gcc.gnu.org>
22735
22736         PR debug/48178
22737         * config/sh/sh.c (find_barrier): Don't emit a constant pool
22738         between a call and its corresponding CALL_ARG_LOCATION note.
22739
22740 2011-03-19  Anatoly Sokolov  <aesok@post.ru>
22741
22742         * cfgcleanup.c (mark_effect): Use bitmap_set_range/bitmap_clear_range
22743         instead of loop. Use HARD_REGISTER_NUM_P predicate.
22744         * haifa-sched.c (setup_ref_regs): Ditto.
22745         * caller-save.c (add_used_regs_1): Ditto.
22746         * dse.c (look_for_hardregs): Ditto.
22747         * df-problems.c (df_simulate_one_insn_forwards): Ditto.
22748         * sched-rgn.c (check_live_1): Ditto.
22749
22750 2011-03-18  Joseph Myers  <joseph@codesourcery.com>
22751
22752         * c-decl.c (diagnose_mismatched_decls): Give an error for
22753         redefining a typedef with variably modified type.
22754
22755 2011-03-18  Joseph Myers  <joseph@codesourcery.com>
22756
22757         * c-decl.c (grokfield): Don't allow typedefs for structures or
22758         unions with no tag by default.
22759         * doc/extend.texi (Unnamed Fields): Update.
22760
22761 2011-03-18  Uros Bizjak  <ubizjak@gmail.com>
22762
22763         * config/i386/i386.md (float<SSEMODEI24:mode><X87MODEF:mode>2):
22764         Rewrite using indirect functions.
22765         (lwp_slwpcb): Ditto.
22766         * config/i386/sse.md (avx_vextractf128<mode>): Ditto.
22767         (avx_vinsertf128<mode>): Ditto.
22768
22769 2011-03-18  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
22770
22771         * config/s390/s390.c (s390_delegitimize_address): Handle GOTOFF
22772         unspecs.
22773
22774 2011-03-18  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
22775
22776         * config/s390/s390.c (s390_chunkify_start): Prevent literal pool
22777         splitting between a call and its corresponding CALL_ARG_LOCATION note.
22778
22779 2011-03-18  Maxim Kuvyrkov  <maxim@codesourcery.com>
22780
22781         PR rtl-optimization/48170
22782         * gcse.c (hoist_code): Remove bogus asserts.
22783
22784 2011-03-18  Georg-Johann Lay  <avr@gjlay.de>
22785
22786         * ira-color.c (assign_hard_reg): Honor LOCAL_REGNO in cost
22787         computation for prologue/epilogue.
22788
22789 2011-03-18  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
22790
22791         * Makefile.in (check-consistency): Remove.
22792
22793 2011-03-18  Jakub Jelinek  <jakub@redhat.com>
22794
22795         PR debug/48176
22796         * dwarf2out.c (dwarf2out_finish): Call output_aranges even when
22797         arange_table_in_use is 0, but either text_section_used or
22798         cold_text_section_used is true.  Don't call it if
22799         !info_section_emitted.
22800
22801 2011-03-18  Anatoly Sokolov  <aesok@post.ru>
22802
22803         * config/avr/avr.h (RET_REGISTER, LIBCALL_VALUE,
22804         FUNCTION_VALUE_REGNO_P): Remove.
22805         * config/avr/avr-protos.h (avr_ret_register, avr_libcall_value):
22806         Remove.
22807         * config/avr/avr.c (avr_ret_register): Make static inline.
22808         (avr_function_value_regno_p): New function.
22809         (avr_libcall_value): Make static. Add 'func' argument.
22810         (avr_function_value): Make static. Rename 'func' argument to
22811         'fn_decl_or_type', forward it to avr_libcall_value. Call
22812         avr_ret_register function instead of RET_REGISTER macro.
22813         (TARGET_LIBCALL_VALUE, TARGET_FUNCTION_VALUE_REGNO_P): Define.
22814
22815 2011-03-18  Jason Merrill  <jason@redhat.com>
22816
22817         PR c++/23372
22818         * gimplify.c (gimplify_arg): Strip redundant TARGET_EXPR.
22819
22820 2011-03-18  Richard Guenther  <rguenther@suse.de>
22821
22822         * doc/install.texi (--enable-gold): Remove.
22823         (--with-plugin-ld): Document.
22824         * doc/invoke.texi (-fuse-linker-plugin): Clarify.
22825
22826 2011-03-18  Andrew Pinski  <pinskia@gmail.com>
22827
22828         PR middle-end/47790
22829         * expr.c (optimize_bitfield_assignment_op): Revamp to work
22830         again after expansion changes.
22831
22832 2011-03-18  Chung-Lin Tang  <cltang@codesourcery.com>
22833
22834         * combine.c (try_combine): Do simplification only call of
22835         subst() on i2 even when i1 is present. Update comments.
22836
22837 2011-03-18  Kaz Kojima  <kkojima@gcc.gnu.org>
22838
22839         * config/sh/sh.c (sh_delegitimize_address): Handle UNSPEC_SYMOFF
22840         and UNSPEC_PCREL_SYMOFF.
22841
22842 2011-03-18  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
22843
22844         * config/s390/s390.md: Use define_c_enum for the unspec constant
22845         definitions.
22846
22847 2011-03-18  Richard Henderson  <rth@redhat.com>
22848             Jakub Jelinek  <jakub@redhat.com>
22849
22850         PR bootstrap/48161
22851         * expr.c (expand_expr_addr_expr_1): Use simplify_gen_binary
22852         instead of gen_rtx_PLUS if EXPAND_SUM or EXPAND_INITIALIZER.
22853
22854 2011-03-17  Anatoly Sokolov  <aesok@post.ru>
22855
22856         * config/v850/v850.h (OUTPUT_ADDR_CONST_EXTRA): Remove.
22857         * config/v850/v850-protos.h (v850_output_addr_const_extra): Remove.
22858         * config/v850/v850.c (v850_output_addr_const_extra): Make static.
22859         Change return type to bool.
22860         (TARGET_ASM_OUTPUT_ADDR_CONST_EXTRA): Define.
22861
22862 2011-03-17  Jakub Jelinek  <jakub@redhat.com>
22863
22864         PR debug/48163
22865         * var-tracking.c (prepare_call_arguments): If CALL target
22866         is a non-SYMBOL_REF CONSTANT_P, just add that into the list as
22867         pc instead of looking it up using cselib_lookup and use
22868         Pmode for it if x has VOIDmode.
22869         * dwarf2out.c (gen_subprogram_die): If also both first and
22870         second CONCAT arguments are VOIDmode, use mode of CONCAT itself.
22871
22872         PR debug/48163
22873         * function.c (assign_parms): For data.passed_pointer parms
22874         use MEM of data.entry_parm instead of data.entry_parm itself
22875         as DECL_INCOMING_RTL.
22876         * dwarf2out.c (rtl_for_decl_location): Use DECL_INCOMING_RTL
22877         also when passed and declared mode is the same, DECL_RTL
22878         is a MEM with pseudo as address and DECL_INCOMING_RTL is
22879         a MEM too.
22880
22881 2011-03-16  Jeff Law  <law@redhat.com>
22882
22883         PR rtl-optimization/37273
22884         * ira-costs.c (scan_one_insn): Detect constants living in memory and
22885         handle them like argument loads from stack slots.  Do not double
22886         count memory for memory constants and argument loads from stack slots.
22887
22888 2011-03-17  H.J. Lu  <hongjiu.lu@intel.com>
22889
22890         PR debug/48160
22891         * var-tracking.c (prepare_call_arguments): Check SUBREG.
22892
22893 2011-03-17  H.J. Lu  <hongjiu.lu@intel.com>
22894
22895         PR target/48171
22896         * config/i386/i386.opt: Add Save to -mavx and -mfma.
22897
22898 2011-03-17  Jakub Jelinek  <jakub@redhat.com>
22899
22900         PR bootstrap/48153
22901         * dwarf2out.c (mem_loc_descriptor) <case ENTRY_VALUE>: Return NULL
22902         if dwarf_strict.
22903         (gen_subprogram_die): Don't add call_site DIEs if dwarf_strict.
22904         Clear call_arg_locations and call_arg_loc_last always.
22905
22906         PR middle-end/48152
22907         * var-tracking.c (prepare_call_arguments): If argument needs to be
22908         passed by reference, adjust argtype and mode.
22909
22910 2011-03-17  Richard Guenther  <rguenther@suse.de>
22911
22912         PR middle-end/48134
22913         * tree-ssa.c (insert_debug_temp_for_var_def): If we propagated
22914         a value make sure to fold the statement.
22915
22916 2011-03-17  Chung-Lin Tang  <cltang@codesourcery.com>
22917
22918         PR target/43872
22919         * config/arm/arm.c (arm_get_frame_offsets): Adjust early
22920         return condition with !cfun->calls_alloca.
22921
22922 2011-03-17  Richard Guenther  <rguenther@suse.de>
22923
22924         PR bootstrap/48148
22925         * lto-cgraph.c (input_overwrite_node): Clear the abstract
22926         origin for decls in other ltrans units.
22927         (input_varpool_node): Likewise.
22928
22929 2011-03-17  Richard Guenther  <rguenther@suse.de>
22930
22931         PR middle-end/48165
22932         * tree-object-size.c (compute_object_offset): Properly return
22933         the offset operand of MEM_REFs as sizetype.
22934
22935 2011-03-17  Jakub Jelinek  <jakub@redhat.com>
22936
22937         PR rtl-optimization/48141
22938         * params.def (PARAM_MAX_DSE_ACTIVE_LOCAL_STORES): New.
22939         * dse.c: Include params.h.
22940         (active_local_stores_len): New variable.
22941         (add_wild_read, dse_step1): Clear it when setting active_local_stores
22942         to NULL.
22943         (record_store, check_mem_read_rtx): Decrease it when removing
22944         from the chain.
22945         (scan_insn): Likewise.  Increase it when adding to chain, if it
22946         reaches PARAM_MAX_DSE_ACTIVE_LOCAL_STORES limit, set to 1 and
22947         set active_local_stores to NULL before the addition.
22948         * Makefile.in (dse.o): Depend on $(PARAMS_H).
22949
22950         PR rtl-optimization/48141
22951         * dse.c (record_store): If no positions are needed in an insn
22952         that cannot be deleted, at least unchain it from active_local_stores.
22953
22954 2011-03-16  Dodji Seketeli  <dodji@redhat.com>
22955
22956         PR debug/47510
22957         * dwarf2out.c (strip_naming_typedef): Factorize out of ...
22958         (lookup_type_die_strip_naming_typedef): ... here.
22959         (get_context_die): Use it.
22960         (gen_typedef_die): Add a DW_AT_{,MIPS_}linkage_name attribute to
22961         the anonymous struct named by the naming typedef.
22962
22963 2011-03-16  H.J. Lu  <hongjiu.lu@intel.com>
22964
22965         PR target/48154
22966         * config/i386/i386.c (ix86_builtin_vectorized_function): Check
22967         TARGET_ROUND for BUILT_IN_{FLOOR,CEIL,TRUNC,RINT}{,F} builtins.
22968
22969 2011-03-16  Jeff Law  <law@redhat.com>
22970
22971         * tree-vrp.c (identify_jump_threads): Slightly simplify type
22972         check for operands of conditional.  Allow type to be a pointer.
22973
22974 2011-03-16  Richard Guenther  <rguenther@suse.de>
22975
22976         PR tree-optimization/48149
22977         * fold-const.c (fold_binary_loc): Fold
22978         COMPLEX_EXPR <REALPART_EXPR <x>, IMAGPART_EXPR <x>>.
22979
22980 2011-03-16  Richard Guenther  <rguenther@suse.de>
22981
22982         PR tree-optimization/26134
22983         * tree-ssa.c (maybe_rewrite_mem_ref_base): Handle rewriting
22984         complex part accesses to REALPART_EXPR and IMAGPART_EXPR.
22985         (non_rewritable_mem_ref_base): Handle complex type component
22986         accesses, constrain offsets for vector and complex extracts
22987         more properly.
22988
22989 2011-03-16  Richard Guenther  <rguenther@suse.de>
22990
22991         PR tree-optimization/48146
22992         * tree-ssa-sink.c (sink_code_in_bb): Manually update virtual
22993         operands avoiding the need for renaming.
22994
22995 2011-03-16  Richard Guenther  <rguenther@suse.de>
22996
22997         * gimple-fold.c (maybe_fold_reference): Open-code relevant
22998         constant folding.  Move MEM_REF canonicalization first.
22999         Rely on fold_const_aggregate_ref for initializer folding.
23000         * tree-ssa-ccp.c (ccp_fold): Handle constant vector extracts.
23001
23002 2011-03-16  Jakub Jelinek  <jakub@redhat.com>
23003
23004         PR middle-end/48136
23005         * fold-const.c (fold_binary_loc) <case EQ_EXPR, NE_EXPR>: Make sure
23006         arg0/arg1 or their arguments are always fold converted to matching
23007         types.
23008
23009         * var-tracking.c (prepare_call_arguments): Add ATTRIBUTE_UNUSED
23010         to nargs.
23011
23012 2011-03-16  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
23013
23014         PR lto/46944
23015         * configure.ac (gcc_cv_gld_major_version, gcc_cv_gld_minor):
23016         Handle in-tree gold.
23017         (ld_vers): Extract binutils version for gold.
23018         (gcc_cv_ld_hidden): Handle gold here.
23019         (gcc_cv_lto_plugin): Determine level of linker plugin support.
23020         * configure: Regenerate.
23021         * config.in: Regenerate.
23022         * gcc.c: Only use LTO plugin if HAVE_LTO_PLUGIN > 0, reject
23023         -fuse-linker-plugin otherwise.
23024         (LINK_PLUGIN_SPEC): Define.  Extract from LINK_COMMAND_SPEC.
23025         (LINK_COMMAND_SPEC): Use it.
23026         (main): Only look for LTOPLUGINSONAME if HAVE_LTO_PLUGIN > 0.
23027
23028 2011-03-16  Jakub Jelinek  <jakub@redhat.com>
23029
23030         * emit-rtl.c (try_split): Don't call copy_call_info debug hook.
23031         * calls.c: Remove debug.h include.
23032         (emit_call_1): Don't call virtual_call_token debug hook.
23033         * dwarf2out.c (debug_dcall_section, debug_vcall_section,
23034         dcall_entry, vcall_entry, dcall_table, vcall_table, vcall_insn,
23035         vcall_insn_table, DEBUG_DCALL_SECTION, DEBUG_VCALL_SECTION,
23036         size_of_dcall_table, output_dcall_table, size_of_vcall_table,
23037         output_vcall_table, dwarf2out_direct_call, vcall_insn_table_hash,
23038         vcall_insn_table_eq, store_vcall_insn, lookup_vcall_insn,
23039         dwarf2out_virtual_call_token, dwarf2out_copy_call_info,
23040         dwarf2out_virtual_call): Remove.
23041         (dwarf2_debug_hooks): Remove direct_call, virtual_call_token,
23042         copy_call_info and virtual_call hooks.
23043         (dwarf2out_init): Don't initialize vcall_insn_table,
23044         debug_dcall_section and debug_vcall_section.
23045         (prune_unused_types): Don't mark nodes from dcall_table.
23046         (dwarf2out_finish): Don't output dcall or vcall tables.
23047         * final.c (final_scan_insn): Don't call direct_call or
23048         virtual_call debug hooks.
23049         * debug.h (struct gcc_debug_hooks): Remove direct_call,
23050         virtual_call_token, copy_call_info and virtual_call hooks.
23051         (debug_nothing_uid): Remove prototype.
23052         * sdbout.c (sdb_debug_hooks): Remove direct_call, virtual_call_token,
23053         copy_call_info and virtual_call hooks.
23054         * vmsdbgout.c (vmsdbg_debug_hooks): Likewise.
23055         * dbxout.c (dbx_debug_hooks, xcoff_debug_hooks): Likewise.
23056         * debug.c (do_nothing_debug_hooks): Likewise.
23057         (debug_nothing_uid): Remove.
23058         * doc/invoke.texi (-fenable-icf-debug): Remove.
23059         * common.opt (-fenable-icf-debug): Likewise.
23060
23061         * calls.c (emit_call_1): Set MEM_EXPR on call's MEM.
23062         * var-tracking.c (prepare_call_arguments): Use MEM_EXPR on
23063         call's MEM.  Handle functions returning aggregate through a hidden
23064         first pointer.  For virtual calls add clobbered pc to call arguments
23065         chain.
23066         * dwarf2out.c (gen_subprogram_die): Emit
23067         DW_AT_GNU_call_site_target_clobbered if DW_AT_GNU_call_site_target
23068         can't be emitted.
23069
23070         PR debug/45882
23071         * rtl.def (ENTRY_VALUE): Change format from "e" to "0".
23072         * rtl.h (ENTRY_VALUE_EXP): Define.
23073         * rtl.c (rtx_equal_p_cb, rtx_equal_p): Handle ENTRY_VALUE.
23074         * cselib.c (rtx_equal_for_cselib_p, cselib_hash_rtx): Likewise.
23075         * print-rtl.c (print_rtx): Likewise.
23076         * gengtype.c (adjust_field_rtx_def): Likewise.
23077         * var-tracking.c (vt_add_function_parameter): Adjust
23078         gen_rtx_ENTRY_VALUE uses, use ENTRY_VALUE_EXP macro.
23079         * dwarf2out.c (mem_loc_descriptor): Use ENTRY_VALUE_EXP macro.
23080         * cfgexpand.c (expand_debug_expr): If a SSA_NAME without
23081         partition is a default definition of a PARM_DECL, use ENTRY_VALUE
23082         of its DECL_INCOMING_RTL if possible, or its DECL_RTL if set.
23083
23084         * final.c (final_scan_insn): Handle NOTE_INSN_CALL_ARG_LOCATION.
23085         Call var_location debug hook even on CALL_INSNs.
23086         (rest_of_clean_state): Don't print NOTE_INSN_CALL_ARG_LOCATION.
23087         * rtl.def (ENTRY_VALUE): New.
23088         * dwarf2out.c: Include cfglayout.h.
23089         (dwarf_stack_op_name, size_of_loc_descr, output_loc_operands,
23090         output_loc_operands_raw): Handle DW_OP_GNU_entry_value.
23091         (struct call_arg_loc_node): New type.
23092         (call_arg_locations, call_arg_loc_last, block_map, call_site_count,
23093         tail_call_site_count): New variables.
23094         (dwarf_tag_name): Handle DW_TAG_GNU_call_site and
23095         DW_TAG_GNU_call_site_parameter.
23096         (dwarf_attr_name): Handle DW_AT_GNU_call_site_value,
23097         DW_AT_GNU_call_site_data_value, DW_AT_GNU_call_site_target,
23098         DW_AT_GNU_call_site_target_clobbered, DW_AT_GNU_tail_call,
23099         DW_AT_GNU_all_tail_call_sites, DW_AT_GNU_all_call_sites
23100         and DW_AT_GNU_all_source_call_sites.
23101         (mem_loc_descriptor): Handle ENTRY_VALUE.
23102         (add_src_coords_attributes): Don't add enything if
23103         DECL_SOURCE_LOCATION is UNKNOWN_LOCATION.
23104         (dwarf2out_abstract_function): Save and clear call_arg_location,
23105         call_site_count and tail_call_site_count around dwarf2out_decl call.
23106         (gen_call_site_die): New function.
23107         (gen_subprogram_die): Emit DW_TAG_GNU_call_site DIEs for call sites.
23108         (gen_lexical_block_die, gen_inlined_subroutine_die): Update block_map.
23109         (dwarf2out_function_decl): Clear call_arg_locations,
23110         call_arg_loc_last, set call_site_count and tail_call_site_count
23111         to -1 and free block_map.
23112         (dwarf2out_var_location): Handle NOTE_INSN_CALL_ARG_LOCATION and
23113         CALL_INSNs.  Add NOTE_DURING_CALL_P var location notes even when not
23114         followed by any real instructions.
23115         (dwarf2out_begin_function): Set call_site_count and
23116         tail_call_site_count to 0.
23117         (resolve_addr): If DW_AT_abstract_origin of DW_TAG_GNU_call_site
23118         is dw_val_class_addr, attempt to look it up again, for DECL_EXTERNAL
23119         attempt to force a DIE for it and worst case remove the attribute.
23120         (resolve_one_addr): For TREE_CONSTANT_POOL_ADDRESS_P SYMBOL_REFs
23121         check TREE_ASM_WRITTEN of DECL_INITIAL of the decl instead of
23122         the decl itself.
23123         * var-tracking.c: Include tm_p.h.
23124         (vt_stack_adjustments): For calls call note_register_arguments.
23125         (argument_reg_set): New variable.
23126         (add_stores): For MO_VAL_SET of non-tracked regs from argument_reg_set
23127         ensure the VALUE is resolved.
23128         (call_arguments): New variable.
23129         (prepare_call_arguments): New function.
23130         (add_with_sets): For MO_CALL set u.loc from call_arguments and clear it.
23131         (struct expand_loc_callback_data): Add ignore_cur_loc field.
23132         (vt_expand_loc_callback): If ignore_cur_loc, don't look at cur_loc and
23133         always use the best expression.
23134         (vt_expand_loc): Add ignore_cur_loc argument.
23135         (vt_expand_loc_dummy): Clear ignore_cur_loc field.
23136         (emit_note_insn_var_location): Adjust vt_expand_loc callers.
23137         (emit_notes_in_bb) <case MO_CALL>: Add NOTE_INSN_CALL_ARG_LOCATION
23138         note for all calls.
23139         (vt_add_function_parameter): Use cselib_lookup_from_insn.
23140         If dv is a VALUE, enter into hash table also ENTRY_VALUE for the
23141         argument.  Don't call cselib_preserve_only_values and
23142         cselib_reset_table.
23143         (note_register_arguments): New function.
23144         (vt_initialize): Compute argument_reg_set.  Call
23145         vt_add_function_parameters before processing basic blocks instead of
23146         afterwards.  For calls call prepare_call_arguments before calling
23147         cselib_process_insn.
23148         * print-rtl.c (print_rtx): Handle NOTE_INSN_CALL_ARG_LOCATION.
23149         * Makefile.in (dwarf2out.o): Depend on $(CFGLAYOUT_H).
23150         (var-tracking.o): Depend on $(TM_P_H).
23151         * cfglayout.h (insn_scope): New prototype.
23152         * gengtype.c (adjust_field_rtx_def): Handle NOTE_INSN_CALL_ARG_LOCATION.
23153         * cfglayout.c (insn_scope): No longer static.
23154         * insn-notes.def (CALL_ARG_LOCATION): New.
23155         * calls.c (expand_call, emit_library_call_value_1): Put USEs for
23156         MEM arguments into CALL_INSN_FUNCTION_USAGE unconditionally.
23157         * integrate.c (set_block_origin_self, set_block_abstract_flags): Do
23158         nothing for DECL_EXTERNAL BLOCK_VARS.
23159
23160 2011-03-16  Alan Modra  <amodra@gmail.com>
23161
23162         PR target/45844
23163         * config/rs6000/rs6000.c (rs6000_legitimize_reload_address): Don't
23164         create invalid offset address for vsx splat insn.
23165         * config/rs6000/predicates.md (splat_input_operand): New.
23166         * config/rs6000/vsx.md (vsx_splat_*): Use it.
23167
23168 2011-03-15  Xinliang David Li  <davidxl@google.com>
23169
23170         PR c/47837
23171         * tree-ssa-uninit.c (pred_chain_length_cmp): New function.
23172         (normalize_preds): New function.
23173         (is_use_properly_guarded): Normalize def predicates.
23174
23175 2011-03-15  Ramana Radhakrishnan  <ramana.radhakrishnan@linaro.org>
23176
23177         PR target/46788
23178         * config/arm/arm.md (arm_movtas_ze): Use 'L' instead of 'c'
23179         in the output template.
23180
23181 2011-03-15  Richard Guenther  <rguenther@suse.de>
23182
23183         PR middle-end/47650
23184         * tree-pretty-print.c (dump_function_declaration): Properly
23185         dump unprototyped and varargs function types.
23186
23187 2011-03-15  Richard Guenther  <rguenther@suse.de>
23188
23189         PR tree-optimization/13954
23190         * tree-ssa-sccvn.c (vn_reference_lookup_3): Look through memcpy
23191         and friends.
23192
23193 2011-03-15  Richard Guenther  <rguenther@suse.de>
23194
23195         PR tree-optimization/48037
23196         * tree-ssa.c (maybe_rewrite_mem_ref_base): Rewrite vector
23197         selects into BIT_FIELD_REFs.
23198         (non_rewritable_mem_ref_base): Check if a MEM_REF is a
23199         vector select.
23200
23201 2011-03-15  Jakub Jelinek  <jakub@redhat.com>
23202
23203         PR tree-optimization/48129
23204         * builtins.c (fold_builtin_snprintf): Convert to type of
23205         built_in_decls[BUILT_IN_SNPRINTF] retval instead of
23206         implicit_built_in_decls[BUILT_IN_SNPRINTF] retval.
23207
23208 2011-03-15  Richard Guenther  <rguenther@suse.de>
23209
23210         PR tree-optimization/41490
23211         * tree-ssa-dce.c (propagate_necessity): Handle returns without
23212         value but with VUSE.
23213         * tree-ssa-operands.c (parse_ssa_operands): Add a VUSE on all
23214         return statements.
23215         * tree-ssa-sink.c (statement_sink_location): Fix store sinking.
23216         * tree-ssa-phiopt.c (tree_ssa_phiopt_worker): Handle virtual PHIs.
23217         * tree-tailcall.c (find_tail_calls): Ignore returns.
23218
23219 2011-03-15  Richard Guenther  <rguenther@suse.de>
23220
23221         PR middle-end/48031
23222         * fold-const.c (fold_indirect_ref_1): Do not create new variable-sized
23223         or variable-indexed array accesses when in gimple form.
23224
23225 2011-03-15  Richard Guenther  <rguenther@suse.de>
23226
23227         * config/i386/i386.c (ix86_emit_swdivsf): Implement more efficiently.
23228
23229 2011-03-15  Alan Modra  <amodra@gmail.com>
23230
23231         PR target/48032
23232         * config/rs6000/rs6000.c (offsettable_ok_by_alignment): Do not
23233         presume symbol_refs without a symbol_ref_decl are suitably
23234         aligned, nor other trees we may see here.  Handle anchor symbols.
23235         (legitimate_constant_pool_address_p): Comment.  Add mode param.
23236         Check cmodel=medium addresses.  Adjust all calls.
23237         (rs6000_emit_move): Don't call offsettable_ok_by_alignment on
23238         creating cmodel=medium optimized access to locals.
23239         * config/rs6000/constraints.md (R): Pass QImode to
23240         legitimate_constant_pool_address_p.
23241         * config/rs6000/predicates.md (input_operand): Pass mode to
23242         legitimate_constant_pool_address_p.
23243         * config/rs6000/rs6000-protos.h (legitimate_constant_pool_address_p):
23244         Update prototype.
23245
23246 2011-03-14  Michael Meissner  <meissner@linux.vnet.ibm.com>
23247
23248         PR target/48053
23249         * config/rs6000/rs6000.md (movdi split for 32-bit): Don't split up
23250         64-bit constants being loaded into registers other than GPRs such
23251         as loading 0 into a VSX register.
23252
23253 2011-03-14  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
23254
23255         * config/sol2.c (solaris_assemble_visibility): Remove obsolete URLs.
23256
23257 2011-03-14  Jakub Jelinek  <jakub@redhat.com>
23258
23259         PR middle-end/47917
23260         * builtins.c (fold_builtin_snprintf): New function.
23261         (fold_builtin_3): Call it for BUILT_IN_SNPRINTF.
23262         (fold_builtin_4): Likewise.
23263
23264         PR middle-end/38878
23265         * fold-const.c (fold_binary_loc) <case EQ_EXPR, NE_EXPR>: Add
23266         STRIP_NOPS on arg0 and arg1.  When optimizing X +- C == X
23267         and C - X == X also strip nops from +/-/p+ operand.
23268         When optimizing -X == C, fold C to arg0's type.
23269
23270         PR debug/47946
23271         * dwarf2out.c (add_bit_offset_attribute): If bit_offset is negative,
23272         emit it as add_AT_int instead of add_AT_unsigned.
23273
23274 2011-03-14  Tom Tromey  <tromey@redhat.com>
23275
23276         * unwind-dw2.c: Include sys/sdt.h if it exists.
23277         (_Unwind_DebugHook): Use STAP_PROBE2.
23278         * config.in, configure: Rebuild.
23279         * configure.ac: Check for sys/sdt.h.
23280
23281 2011-03-14  Uros Bizjak  <ubizjak@gmail.com>
23282
23283         * config/i386/i386.md (ROUND_FLOOR): New constant.
23284         (ROUND_CEIL): Ditto.
23285         (ROUND_TRUNC): Ditto.
23286         (ROUND_MXCSR): Ditto.
23287         (ROUND_NO_EXC): Ditto.
23288         (rint<mode>2): Use new defines instead of numerical constants.
23289         (floor<mode>2): Ditto.
23290         (ceil<mode>2): Ditto.
23291         (btrunc<mode>2): Ditto.
23292         * config/i386/i386-builtin-types.def: Define ROUND function type
23293         aliases.
23294         * config/i386/i386.c (enum ix86_builtins): Add
23295         IX86_BUILTIN_{FLOOR,CEIL,TRUNC,RINT}{PS,PD}{,256} defines.
23296         (struct builtin_description): Add
23297         __builtin_ia32_{floor,ceil,trunc,rint}{pd,ps}{,256} descriptions.
23298         (ix86_expand_sse_round): New static function.
23299         (ix86_expand_args_builtin): Call ix86_expand_sse_round for ROUND
23300         function types.
23301         (ix86_builtin_vectorized_function): Handle
23302         BUILT_IN_{FLOOR,CEIL,TRUNC,RINT}{,F} builtins.
23303
23304 2011-03-14  Tom Tromey  <tromey@redhat.com>
23305
23306         * c-parser.c (c_parser_asm_string_literal): Clear
23307         warn_overlength_strings.
23308
23309 2011-03-14  Tom Tromey  <tromey@redhat.com>
23310
23311         * c-parser.c (disable_extension_diagnostics): Save
23312         warn_overlength_strings.
23313         (restore_extension_diagnostics): Restore warn_overlength_strings.
23314
23315 2011-03-14  Jakub Jelinek  <jakub@redhat.com>
23316
23317         * BASE-VER: Change to 4.7.0.
23318
23319 2011-03-14  Richard Guenther  <rguenther@suse.de>
23320
23321         PR middle-end/48098
23322         * tree.c (build_vector_from_val): Adjust assert to requirements
23323         and reality.
23324
23325 2011-03-14  Jakub Jelinek  <jakub@redhat.com>
23326
23327         PR bootstrap/48102
23328         * graphite-cloog-compat.h (build_cloog_prog): Remove STATE parameter.
23329
23330 2011-03-14  Andreas Tobler  <andreast@fgznet.ch>
23331
23332         * config/rs6000/freebsd.h (RELOCATABLE_NEEDS_FIXUP): Define in
23333         terms of target_flags_explicit. Adjust copyright year.
23334
23335         * config.gcc: Add FreeBSD PowerPC soft-float libgcc bits.
23336         * config/rs6000/t-freebsd: New file. Add override for
23337         LIB2FUNCS_EXTRA.
23338
23339 2011-03-13  Chris Demetriou  <cgd@google.com>
23340
23341         * doc/invoke.texi (-fdiagnostics-show-option): Replace with...
23342         (-fno-diagnostics-show-option): this, to reflect current default.
23343         (-Werror=): Update text about -fno-diagnostics-show-option.
23344
23345 2011-03-12  Peter Bergner  <bergner@vnet.ibm.com>
23346
23347         PR target/48053
23348         * config/rs6000/predicates.md (easy_vector_constant_add_self,
23349         easy_vector_constant_msb): Do not handle V2DImode and V2DFmode.
23350         * config/rs6000/rs6000.c (const_vector_elt_as_int): Add assert that
23351         mode is not V2DImode or V2DFmode.
23352         (vspltis_constant): Do not handle V2DImode and V2DFmode.
23353         (rs6000_expand_vector_init): Replace copy_to_reg with copy_to_mode_reg.
23354         * config/rs6000/rs6000.md (movdi_internal32): Allow setting VSX
23355         registers to 0.
23356         (movdi_internal64): Likewise.
23357
23358 2011-03-12  Sebastian Pop  <sebastian.pop@amd.com>
23359
23360         PR tree-optimization/47127
23361         * graphite-clast-to-gimple.c (build_cloog_prog): Removed state
23362         parameter.
23363         (set_cloog_options): Same.
23364         (scop_to_clast): Same.
23365         (print_clast_stmt): Do not call cloog_state_malloc and
23366         cloog_state_free.
23367         (print_generated_program): Same.
23368         (gloog): Same.
23369         * graphite-clast-to-gimple.h (cloog_state): Declared.
23370         (scop_to_clast): Adjust declaration.
23371         * graphite.c (cloog_state): Defined here.
23372         (graphite_initialize): Call cloog_state_malloc.
23373         (graphite_finalize): Call cloog_state_free.
23374
23375 2011-03-11  Jason Merrill  <jason@redhat.com>
23376
23377         * attribs.c (lookup_attribute_spec): Take const_tree.
23378         * tree.h: Adjust.
23379
23380 2011-03-11  Joseph Myers  <joseph@codesourcery.com>
23381
23382         * config/sparc/sparc.c (sparc_option_override): Use
23383         PROCESSOR_NIAGARA2 not PROCESSOR_NIAGARA for "niagara2".
23384
23385 2011-03-11  Richard Guenther  <rguenther@suse.de>
23386
23387         PR tree-optimization/48067
23388         * tree-ssa-math-opts.c (convert_mult_to_fma): Verify the
23389         multiplication result will be only used once on the target
23390         stmt.
23391
23392 2011-03-11  Richard Guenther  <rguenther@suse.de>
23393
23394         * doc/invoke.texi (max-inline-insns-single): Adjust default value.
23395
23396 2011-03-11  Richard Guenther  <rguenther@suse.de>
23397
23398         PR lto/48073
23399         * tree.c (find_decls_types_r): Do not walk types only reachable
23400         from IDENTIFIER_NODEs.
23401
23402 2011-03-11  Jakub Jelinek  <jakub@redhat.com>
23403
23404         PR middle-end/48044
23405         * ipa.c (cgraph_remove_unreachable_nodes): Enqueue
23406         all vnode->force_output nodes as needed.
23407
23408 2011-03-11  Jason Merrill  <jason@redhat.com>
23409
23410         PR c++/48069
23411         * tree.c (type_hash_eq): Use COMPLETE_TYPE_P, not
23412         COMPLETE_OR_UNBOUND_ARRAY_TYPE_P.
23413
23414 2011-03-11  Martin Jambor  <mjambor@suse.cz>
23415
23416         * cgraphunit.c (verify_cgraph_node): Call cgraph_get_node instead of
23417         cgraph_node.
23418
23419 2011-03-11  Jakub Jelinek  <jakub@redhat.com>
23420
23421         PR tree-optimization/48063
23422         * ipa-inline.c (cgraph_decide_inlining): Don't try to
23423         inline functions called once if !tree_can_inline_p (node->callers).
23424
23425 2011-03-11  Chen Liqin  <liqin.gcc@gmail.com>
23426
23427         * config.gcc (score-*-elf): Add extra_parts .., update tmake_file and
23428         extra_objs.
23429         * config/score/score3.c: Delete.
23430         * config/score/score3.h: Delete.
23431         * config/score/mul-div.S: Delete.
23432         * config/score/sfp-machine.h: Add new file.
23433         * config/score/constraints.md: Add new file.
23434         * config/score/t-score-softfp: Add new file.
23435         * config/score/t-score-elf: Remove score3.o, do not generate multilib.
23436         * config/score/score7.c (score7_const_ok_for_letter_p): Delete.
23437         (score7_extra_constraint): Delete.
23438         (score7_option_override): Remove unused code.
23439         * config/score/score.c: Remove score3 and score5 define and code.
23440         * config/score/score.h: Remove score3 and score5 define and code.
23441         * config/score/score.md: Remove score3 template and unusual insn.
23442         * config/score/score.opt: Remove score3 and score5 options.
23443
23444 2011-03-10  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
23445
23446         * config/pa/pa-hpux10.h (TARGET_OS_CPP_BUILTINS): Define _REENTRANT
23447         when _HPUX_SOURCE is defined.
23448         (LIB_SPEC): Use -lc instead of -lc_r when -threads is specified.
23449
23450 2011-03-10  Jason Merrill  <jason@redhat.com>
23451
23452         PR c++/48029
23453         * stor-layout.c (layout_type): Don't set structural equality
23454         on arrays of incomplete type.
23455         * tree.c (type_hash_eq): Handle comparing them properly.
23456
23457 2011-03-10  Jakub Jelinek  <jakub@redhat.com>
23458
23459         PR debug/48043
23460         * config/s390/s390.c (s390_delegitimize_address): Make sure the
23461         result mode matches original rtl mode.
23462
23463 2011-03-10  Nick Clifton  <nickc@redhat.com>
23464
23465         * config/rx/rx.md (bitset_in_memory, bitclr_in_memory: Fix timings.
23466         (andsi3, andsi3_flags): Fix timings for three operand alternative.
23467
23468 2011-03-09  Jakub Jelinek  <jakub@redhat.com>
23469
23470         PR rtl-optimization/47866
23471         * expr.c (store_field): If MEM_SCALAR_P (target), don't use
23472         MEM_SET_IN_STRUCT_P (to_rtx, 1), just set MEM_IN_STRUCT_P (to_rtx)
23473         if target wasn't scalar.
23474         * function.c (assign_stack_temp_for_type): Assert that neither
23475         MEM_SCALAR_P nor MEM_IN_STRUCT_P is set previously, set either
23476         MEM_IN_STRUCT_P or MEM_SCALAR_P instead of using MEM_SET_IN_STRUCT_P
23477         macro.
23478         * rtl.h (MEM_SET_IN_STRUCT_P): Removed.
23479
23480 2011-03-09  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
23481
23482         * config/s390/s390-protos.h (s390_label_align): New prototype.
23483         * config/s390/s390.c (s390_label_align): New function.
23484         * config/s390/s390.h (LABEL_ALIGN): New target macro definition.
23485
23486 2011-03-08  Michael Meissner  <meissner@linux.vnet.ibm.com>
23487
23488         PR target/47755
23489         * config/rs6000/rs6000.c (easy_altivec_constant): Correctly handle
23490         V2DI/V2DF constants.  Only all 0's or all 1's are easy.
23491         (output_vec_const_move): Ditto.
23492
23493 2011-03-08  Anatoly Sokolov  <aesok@post.ru>
23494
23495         * config/mips/mips.h (PREFERRED_RELOAD_CLASS): Remove macro.
23496         * config/mips/mips-protos.h (mips_preferred_reload_class): Remove.
23497         * config/mips/mips.c (mips_preferred_reload_class): Make static.
23498         Change 'rclass' argument and result type to reg_class_t.
23499         (TARGET_PREFERRED_RELOAD_CLASS): Define.
23500
23501 2011-03-08  Georg-Johann Lay  <avr@gjlay.de>
23502
23503         * config/avr/avr.h (REGISTER_MOVE_COST, MEMORY_MOVE_COST): Remove.
23504         * config/avr/avr.c (TARGET_REGISTER_MOVE_COST)
23505         (TARGET_MEMORY_MOVE_COST): Define.
23506         (avr_register_move_cost, avr_memory_move_cost): New Functions.
23507
23508 2011-03-08  Jakub Jelinek  <jakub@redhat.com>
23509
23510         PR debug/47881
23511         * ira.c (ira): Call df_analyze again if delete_trivially_dead_insns
23512         removed anything.
23513
23514         PR tree-optimization/48022
23515         * fold-const.c (fold_comparison): Don't call fold_overflow_warning
23516         for EQ/NE_EXPR.
23517
23518 2011-03-07  Jakub Jelinek  <jakub@redhat.com>
23519
23520         PR debug/47991
23521         * var-tracking.c (find_use_val): Return NULL for
23522         cui->sets && cui->store_p BLKmode MEMs.
23523
23524 2011-03-07  Anatoly Sokolov  <aesok@post.ru>
23525
23526         * config/stormy16/stormy16.h (PRINT_OPERAND, PRINT_OPERAND_ADDRESS):
23527         Remove.
23528         * config/stormy16/stormy16-protos.h (xstormy16_print_operand,
23529         xstormy16_print_operand_address): Remove.
23530         * config/stormy16/stormy16.c (xstormy16_print_operand,
23531         xstormy16_print_operand_address): Make static.
23532         (TARGET_PRINT_OPERAND, TARGET_PRINT_OPERAND_ADDRESS): Define.
23533
23534 2011-03-07  Pat Haugen  <pthaugen@us.ibm.com>
23535
23536         PR target/47862
23537         * config/rs6000/rs6000.h (HARD_REGNO_CALLER_SAVE_MODE): Define.
23538         * config/rs6000/e500.h (HARD_REGNO_CALLER_SAVE_MODE): Undefine
23539         before definition.
23540
23541 2011-03-07  Zdenek Dvorak  <ook@ucw.cz>
23542
23543         PR bootstrap/48000
23544         * cfgloopmanip.c (fix_bb_placements): Return immediately
23545         if FROM is BASE_LOOP's header.
23546
23547 2011-03-07  Paul Wögerer  <paul_woegerer@mentor.com>
23548
23549         * gimplify.c (gimplify_function_tree): Fix building calls
23550         to __builtin_return_address.
23551
23552 2011-03-07  Alan Modra  <amodra@gmail.com>
23553
23554         * config/rs6000/linux.h (TARGET_ASM_FILE_END): Don't define.
23555         * config/rs6000/linux64.h (TARGET_ASM_FILE_END): Don't define.
23556         * config/rs6000/sysv4.h (TARGET_ASM_FILE_END): Define.
23557         * config/rs6000/rs6000-protos.h (init_cumulative_args): Add fndecl and
23558         return_mode args.
23559         * config/rs6000/rs6000.h (CUMULATIVE_ARGS): Add "escapes".
23560         (INIT_CUMULATIVE_ARGS): Pass FNDECL, VOIDmode.
23561         (INIT_CUMULATIVE_INCOMING_ARGS): Pass current_function_decl, VOIDmode.
23562         (INIT_CUMULATIVE_LIBCALL_ARGS): Pass NULL_TREE, MODE.
23563         * config/rs6000/rs6000.c
23564         (rs6000_elf_end_indicate_exec_stack): Rename to..
23565         (rs6000_elf_file_end): ..this.  Only call file_end_indicate_exec_stack
23566         for POWERPC_LINUX.  Move code emitting .gnu_attribute to here, from..
23567         (rs6000_file_start): ..here.
23568         (rs6000_passes_float, rs6000_passes_vector, rs6000_returns_struct): New
23569         file scope variables.
23570         (call_ABI_of_interest): New function.
23571         (init_cumulative_args): Set above vars when function return value
23572         is a float, vector, or small struct.
23573         (rs6000_function_arg_advance_1): Likewise for function args.
23574         (rs6000_va_start): Set rs6000_passes_float if variable arg function
23575         references float args.
23576
23577 2011-03-07  Mingjie Xing  <mingjie.xing@gmail.com>
23578
23579         * doc/cfg.texi: Remove "See" before @ref.
23580         * doc/invoke.texi: Likewise.
23581
23582 2011-03-05  Jason Merrill  <jason@redhat.com>
23583
23584         * doc/invoke.texi (C++ Dialect Options): Document ABI v5.
23585
23586 2011-03-05  Anthony Green  <green@moxielogic.com>
23587
23588         * config.gcc (moxie-*-elf): Add newlib-stdint.h to tmfile.
23589
23590 2011-03-05  Zdenek Dvorak  <ook@ucw.cz>
23591
23592         PR rtl-optimization/47899
23593         * cfgloopmanip.c (fix_bb_placements): Fix first argument
23594         to flow_loop_nested_p when moving the loop upward.
23595
23596 2011-03-05  Richard Earnshaw  <rearnsha@arm.com>
23597
23598         PR target/47719
23599         * arm.md (movhi_insn_arch4):  Accept any immediate constant.
23600
23601 2011-03-05  Jakub Jelinek  <jakub@redhat.com>
23602
23603         PR tree-optimization/47967
23604         * ipa-cp.c (build_const_val): Return NULL instead of creating
23605         VIEW_CONVERT_EXPR for mismatching sizes.
23606         (ipcp_create_replace_map): Return NULL if build_const_val failed.
23607         (ipcp_insert_stage): If ipcp_create_replace_map returns NULL,
23608         give up on versioning.
23609
23610 2011-03-05  Alan Modra  <amodra@gmail.com>
23611
23612         PR target/47986
23613         * config/rs6000/rs6000.c (rs6000_delegitimize_address): Handle
23614         full cmodel medium/large lo_sum + high addresses.
23615
23616 2011-03-04  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
23617
23618         * config/s390/s390.c (s390_decompose_address): Reject non-literal
23619         pool references in UNSPEC_LTREL_OFFSET.
23620
23621 2011-03-04  Jan Hubicka  <jh@suse.cz>
23622
23623         PR lto/47497
23624         * lto-symtab.c (lto_cgraph_replace_node): Do not set thunk.alias.
23625         (lto_symtab_merge_cgraph_nodes_1): Update thunk.alias pointers here.
23626         * cgraph.h (cgraph_same_body_alias, cgraph_add_thunk):
23627         Add node pointers.
23628         * cgraph.c (cgraph_same_body_alias_1, cgraph_same_body_alias,
23629         cgraph_add_thunk): Add node pointers.
23630         * lto-cgraph.c (lto_output_node): Verify that thunks&aliases are
23631         associated to right node.
23632         (input_node): Update use of cgraph_same_body_alias
23633         and cgraph_add_thunk.
23634
23635 2011-03-04  Changpeng Fang  <changpeng.fang@amd.com>
23636
23637         * config/i386/i386.opt (mprefer-avx128): New flag.
23638         * config/i386/i386.c (ix86_preferred_simd_mode): Prefer 128-bit AVX
23639         modes when the flag -mprefer-avx128 is on.
23640
23641 2011-03-04  Richard Sandiford  <richard.sandiford@linaro.org>
23642
23643         * dwarf2out.c (compare_loc_operands): Fix address handling.
23644
23645 2011-03-04  Alan Modra  <amodra@gmail.com>
23646
23647         * tree.h (TREE_ADDRESSABLE): Update FUNCTION_DECL comment.
23648
23649 2011-03-04  Richard Guenther  <rguenther@suse.de>
23650
23651         PR middle-end/47968
23652         * expmed.c (extract_bit_field_1): Prefer vector modes that
23653         vec_extract patterns can handle.
23654
23655 2011-03-04  Richard Guenther  <rguenther@suse.de>
23656
23657         PR middle-end/47975
23658         * optabs.c (optab_for_tree_code): Do not use VECTOR_MODE_P.
23659
23660 2011-03-04  Richard Henderson  <rth@redhat.com>
23661
23662         * explow.c (emit_stack_save): Remove 'after' parameter.
23663         (emit_stack_restore): Likewise.
23664         * expr.h: Update to match.
23665         * builtins.c, calls.c, stmt.c: Likewise.
23666         * config/alpha/alpha.md, config/avr/avr.md: Likewise.
23667         * config/mips/mips.md, config/pa/pa.md, config/vax/vax.md: Likewise.
23668         * function.c (expand_function_end): Insert the emit_stack_save
23669         sequence before parm_birth_insn instead of after.
23670
23671 2011-03-03  Uros Bizjak  <ubizjak@gmail.com>
23672
23673         * config/i386/sse.md (*avx_pmaddubsw128): Fix mode of VEC_SELECT RTX.
23674         (ssse3_pmaddubsw128): Ditto.
23675         (ssse3_pmaddubsw): Ditto.
23676
23677 2011-03-03  Steve Ellcey  <sje@cup.hp.com>
23678
23679         * config/ia64/t-hpux: Add $(srcdir)/unwind-c.c to LIB2ADDEH
23680
23681 2011-03-03  Jakub Jelinek  <jakub@redhat.com>
23682
23683         PR c/47963
23684         * gimplify.c (omp_add_variable): Only call omp_notice_variable
23685         on TYPE_SIZE_UNIT if it is a DECL.
23686
23687         PR debug/47283
23688         * cfgexpand.c (expand_debug_expr) <case MEM_REF>: If MEM_REF
23689         first operand is not is_gimple_mem_ref_addr, try to fold it.
23690         If the operand still isn't is_gimple_mem_ref_addr, clear
23691         MEM_EXPR on op0.
23692
23693 2011-03-03  Richard Guenther  <rguenther@suse.de>
23694
23695         PR middle-end/47283
23696         * tree-ssa-alias.c (ptr_deref_may_alias_decl_p): Make code
23697         match comment.
23698         (refs_may_alias_p_1): For release branches return true if
23699         we are confused by our input.
23700
23701 2011-03-03  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
23702
23703         * config/s390/s390.c (s390_function_value): Rename to ...
23704         (s390_function_and_libcall_value): ... this.
23705         (s390_function_value): New function.
23706         (s390_libcall_value): New function.
23707         (TARGET_FUNCTION_VALUE, TARGET_LIBCALL_VALUE): Define target hooks.
23708         * config/s390/s390.h (FUNCTION_VALUE, LIBCALL_VALUE): Remove
23709         target macro definitions.
23710         * config/s390/s390-protos.h (s390_function_value): Remove prototype.
23711
23712 2011-03-02  Joseph Myers  <joseph@codesourcery.com>
23713
23714         * config/i386/freebsd64.h (CC1_SPEC): Define.
23715         * config/i386/linux64.h (CC1_SPEC): Define.
23716         * config/i386/x86-64.h (CC1_SPEC): Don't define.
23717
23718 2011-03-02  Anatoly Sokolov  <aesok@post.ru>
23719
23720         * config/stormy16/stormy16.h (REGISTER_MOVE_COST, MEMORY_MOVE_COST):
23721         Remove.
23722         * config/stormy16/stormy16.c: Include reload.h.
23723         (xstormy16_memory_move_cost): New function.
23724         (TARGET_MEMORY_MOVE_COST): Define.
23725
23726 2011-03-02  Richard Sandiford  <richard.sandiford@linaro.org>
23727
23728         PR rtl-optimization/47925
23729         * cse.c (count_reg_usage): Don't ignore the SET_DEST of instructions
23730         with side effects.  Remove the more-specific check for volatile asms.
23731
23732 2011-03-02  Alan Modra  <amodra@gmail.com>
23733
23734         PR target/47935
23735         * config/rs6000/predicates.md (lwa_operand): Check cmodel medium
23736         toc relative addresses for valid offsets.
23737
23738 2011-03-01  Richard Guenther  <rguenther@suse.de>
23739
23740         PR tree-optimization/47890
23741         * tree-vect-loop.c (get_initial_def_for_induction): Set
23742         related stmt properly.
23743
23744 2011-03-01  Richard Guenther  <rguenther@suse.de>
23745
23746         PR lto/47924
23747         * lto-streamer.c (lto_record_common_node): Also register
23748         the canonical type.
23749
23750 2011-03-01  Richard Guenther  <rguenther@suse.de>
23751
23752         PR lto/46911
23753         * lto-streamer-in.c (lto_input_ts_decl_common_tree_pointers):
23754         Do not stream DECL_ABSTRACT_ORIGIN.
23755         (lto_input_ts_block_tree_pointers): Nor BLOCK_SOURCE_LOCATION,
23756         BLOCK_NONLOCALIZED_VARS or BLOCK_ABSTRACT_ORIGIN.
23757         * lto-streamer-out.c (lto_output_ts_decl_common_tree_pointers):
23758         Do not stream DECL_ABSTRACT_ORIGIN.
23759         (lto_output_ts_block_tree_pointers): Nor BLOCK_SOURCE_LOCATION,
23760         BLOCK_NONLOCALIZED_VARS or BLOCK_ABSTRACT_ORIGIN.
23761
23762 2011-02-28  Anatoly Sokolov  <aesok@post.ru>
23763
23764         * config/stormy16/stormy16.h (FUNCTION_VALUE, LIBCALL_VALUE,
23765         FUNCTION_VALUE_REGNO_P): Remove.
23766         * config/stormy16/stormy16-protos.h (xstormy16_function_value): Remove.
23767         * config/stormy16/stormy16.c (xstormy16_function_value): Make static.
23768         Add 'outgoing' argument.
23769         (xstormy16_libcall_value, xstormy16_function_value_regno_p): New
23770         function.
23771         (TARGET_FUNCTION_VALUE, TARGET_LIBCALL_VALUE,
23772         TARGET_FUNCTION_VALUE_REGNO_P): Define.
23773
23774 2011-02-28  Kai Tietz  <kai.tietz@onevision.com>
23775
23776         PR debug/28047
23777         * dwarf2out.c (file_table_eq): Use filename_cmp instead of strcmp.
23778         (lookup_filename): Likewise.
23779         * final.c (remap_debug_filename): Use filename_ncmp instead of strncmp.
23780
23781 2011-02-28  Bernd Schmidt  <bernds@codesourcery.com>
23782             Jakub Jelinek  <jakub@redhat.com>
23783
23784         PR middle-end/47893
23785         * rtl.h (ASLK_REDUCE_ALIGN, ASLK_RECORD_PAD): Define.
23786         (assign_stack_local_1): Change last argument type to int.
23787         * function.c (assign_stack_local_1): Replace reduce_alignment_ok
23788         argument with kind.  If bit ASLK_RECORD_PAD is not set in it,
23789         don't record padding space into frame_space_list nor use those areas.
23790         (assign_stack_local): Adjust caller.
23791         (assign_stack_temp_for_type): Call assign_stack_local_1 instead
23792         of assign_stack_local, pass 0 as last argument.
23793         * caller-save.c (setup_save_areas): Adjust assign_stack_local_1
23794         callers.
23795
23796 2011-02-28  Jakub Jelinek  <jakub@redhat.com>
23797
23798         PR debug/47283
23799         * cfgexpand.c (convert_debug_memory_address): Add AS parameter.
23800         Use target address_mode and pointer_mode hooks instead of hardcoded
23801         Pmode and ptr_mode.  Handle some simple cases of extending if
23802         POINTERS_EXTEND_UNSIGNED < 0.
23803         (expand_debug_expr) <case MEM_REF, INDIRECT_REF, TARGET_MEM_REF>:
23804         Call convert_debug_memory_address.
23805         (expand_debug_expr) <case ADDR_EXPR>: Pass as to
23806         convert_debug_memory_address.
23807
23808         PR middle-end/46790
23809         * configure.ac (HAVE_LD_EH_GC_SECTIONS_BUG): New test.
23810         * configure: Regenerated.
23811         * config.in: Regenerated.
23812         * varasm.c (default_function_section): Return NULL
23813         if HAVE_LD_EH_GC_SECTIONS_BUG and decl has implicit section name.
23814
23815 2011-02-28  Martin Jambor  <mjambor@suse.cz>
23816
23817         * ipa-inline.c (cgraph_decide_inlining_of_small_functions): Fix
23818         the description to match the printed values.
23819
23820 2011-02-28  Richard Guenther  <rguenther@suse.de>
23821
23822         * tree-inline.c (tree_function_versioning): Set BLOCK_SUPERCONTEXT
23823         of the copied scope tree.
23824
23825 2011-02-28  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
23826
23827         * doc/extend.texi (Function Attributes): Avoid deeply (and
23828         wrongly) nested tables.
23829
23830 2011-02-27  Jakub Jelinek  <jakub@redhat.com>
23831
23832         PR middle-end/47903
23833         * real.c (real_arithmetic) <case PLUS_EXPR, MINUS_EXPR,
23834         MULT_EXPR, RDIV_EXPR>: Clear padding bits in *r first if
23835         r isn't op0 nor op1.
23836
23837 2011-02-23  Georg-Johann Lay  <avr@gjlay.de>
23838
23839         * config/avr/avr.md: Remove magic comment for emacs.
23840
23841 2011-02-23  Georg-Johann Lay  <avr@gjlay.de>
23842
23843         PR target/45261
23844         * config/avr/avr.c (avr_option_override): Use error on bad options.
23845         (avr_help): New function.
23846         (TARGET_HELP): Define.
23847
23848 2011-02-22  Georg-Johann Lay  <avr@gjlay.de>
23849
23850         PR target/42240
23851         * config/avr/avr.c (avr_cannot_modify_jumps_p): New function.
23852         (TARGET_CANNOT_MODIFY_JUMPS_P): Define.
23853
23854 2011-02-26  Gerald Pfeifer  <gerald@pfeifer.com>
23855
23856         * doc/invoke.texi (ARC Options): Use CPU instead of cpu.
23857         (ARM Options): Ditto.
23858         (i386 and x86-64 Options): Ditto.
23859         (RX Options): Ditto.
23860         (SPARC Options): Ditto.
23861
23862 2011-02-26  Tijl Coosemans  <tijl@coosemans.org>
23863
23864         * config.gcc (i386-*-freebsd*): Make i486 the default arch on
23865         FreeBSD 6 and later.  Generally use cpu generic.
23866
23867 2011-02-25  Gerald Pfeifer  <gerald@pfeifer.com>
23868
23869         * doc/cpp.texi: Update copyright years.
23870
23871 2011-02-25  Sebastien Bourdeauducq  <sebastien@milkymist.org>
23872
23873         PR target/46898
23874         * config/lm32/lm32.md (ashrsi3): Added needed variable.
23875
23876 2011-02-25  Jon Beniston  <jon@beniston.com>
23877
23878         PR target/46898
23879         * config/lm32/lm32.h (INCOMING_RETURN_ADDR_RTX): New.
23880         * config/lm32/lm32.md (ashlsi3): Remove unused variable.
23881         * config/lm32/lm32.c (TARGET_EXCEPT_UNWIND_INFO): New.
23882         (lm32_block_move_inline): Add type cast to remove warning.
23883         (lm32_expand_prologue): Generate fp in a way compatible with dwarf2out.
23884         (gen_int_relational): Move declarations to start of function.
23885
23886 2011-02-25  Eric Botcazou  <ebotcazou@adacore.com>
23887
23888         PR tree-optimization/45470
23889         * tree-vect-data-refs.c (vect_analyze_data_refs): Fail if a statement
23890         can throw internally only.
23891         * tree-vect-stmts.c (vectorizable_call): Likewise.
23892
23893 2011-02-24  Anatoly Sokolov  <aesok@post.ru>
23894
23895         * config/stormy16/stormy16.h (PREFERRED_RELOAD_CLASS,
23896         PREFERRED_OUTPUT_RELOAD_CLASS): Remove.
23897         * config/stormy16/stormy16-protos.h
23898         (xstormy16_preferred_reload_class): Remove.
23899         * config/stormy16/stormy16.c (xstormy16_preferred_reload_class): Make
23900         static. Change 'rclass' argument and return type to reg_class_t.
23901         (TARGET_PREFERRED_RELOAD_CLASS,
23902         TARGET_PREFERRED_OUTPUT_RELOAD_CLASS): Define.
23903
23904 2011-02-24  Richard Guenther  <rguenther@suse.de>
23905
23906         * lto-streamer-in.c (input_bb): Do not find referenced vars
23907         in debug statements.
23908
23909 2011-02-23  Jason Merrill  <jason@redhat.com>
23910
23911         * common.opt (fabi-version): Document v5 and v6.
23912
23913 2011-02-23  Richard Guenther  <rguenther@suse.de>
23914
23915         PR tree-optimization/47849
23916         * tree-if-conv.c (main_tree_if_conversion): Free postdom info.
23917
23918 2011-02-23  Jie Zhang  <jie@codesourcery.com>
23919
23920         * opts-common.c (decode_cmdline_option): Print empty string
23921         argument as "" in decoded->orig_option_with_args_text.
23922         * gcc.c (execute): Print empty string argument as ""
23923         in the verbose output.
23924         (do_spec_1): Keep empty string argument.
23925
23926 2011-02-23  Nathan Froyd  <froydnj@codesourcery.com>
23927
23928         * config.gcc: Declare score-* and crx-* obsolete.
23929
23930 2011-02-23  Jie Zhang  <jie@codesourcery.com>
23931
23932         PR rtl-optimization/47763
23933         * web.c (web_main): Ignore naked clobber when replacing register.
23934
23935 2011-02-22  Anatoly Sokolov  <aesok@post.ru>
23936
23937         * config/stormy16/stormy16.h (REG_OK_FOR_BASE_P, REG_OK_FOR_INDEX_P):
23938         Remove.
23939
23940 2011-02-22  Sebastian Pop  <sebastian.pop@amd.com>
23941
23942         PR doc/47848
23943         * doc/invoke.texi: Do not mention -ftree-loop-if-convert-memory-writes.
23944
23945 2011-02-22  Mike Stump  <mikestump@comcast.net>
23946
23947         * acinclude.m4 (gcc_cv_gas_vers): Add -arch ppc for probing darwin
23948         assembler.
23949         * configure: Regenerate.
23950
23951 2011-02-21  Chung-Lin Tang  <cltang@codesourcery.com>
23952
23953         PR rtl-optimization/46002
23954         * ira-color.c (update_copy_costs): Change class intersection
23955         test to reg_class_contents[] test of 'hard_regno'.
23956
23957 2011-02-21  Joseph Myers  <joseph@codesourcery.com>
23958
23959         * config/alpha/osf5.opt (mno-mips-tfile): Mark as Target rather
23960         than Driver option.
23961         * config/hpux11.opt (mt): Likewise.
23962         * config/microblaze/microblaze.opt (mxl-mode-xilkernel): Likewise.
23963         * config/rs6000/xilinx.opt (mno-clearbss, mppcperflib): Likewise.
23964         * config/vax/elf.opt (mno-asm-pic): Likewise.
23965         * config/vms/vms.opt (map, mvms-return-codes): Likewise.
23966
23967 2011-02-21  Mike Stump  <mikestump@comcast.net>
23968
23969         PR target/47822
23970         * config/darwin-protos.h (darwin_init_cfstring_builtins): Return a
23971         tree so we can get save the type.
23972         * config/i386/darwin.h (SUBTARGET_INIT_BUILTINS): Reserve builtin slot
23973         for CFString instead of trying to use past the end of the builtins.
23974         * config/i386/i386.c (IX86_BUILTIN_CFSTRING): Likewise.
23975         * config/rs6000/rs6000-builtin.def (RS6000_BUILTIN_CFSTRING): Likewise.
23976         * config/rs6000/darwin.h (SUBTARGET_INIT_BUILTINS): Likewise.
23977         * config/darwin.c (DARWIN_BUILTIN_CFSTRINGMAKECONSTANTSTRING):
23978         Rename to darwin_builtin_cfstring.
23979         (darwin_init_cfstring_builtins): Return the built type.
23980
23981 2011-02-21  Uros Bizjak  <ubizjak@gmail.com>
23982
23983         PR target/47840
23984         * config/i386/avxintrin.h (_mm256_insert_epi32): Use _mm_insert_epi32.
23985         (_mm256_insert_epi64): Use _mm_insert_epi64.
23986
23987 2011-02-21  Anatoly Sokolov  <aesok@post.ru>
23988
23989         * config/stormy16/stormy16.h (GO_IF_MODE_DEPENDENT_ADDRESS): Remove.
23990         * config/stormy16/stormy16-protos.h
23991         (xstormy16_mode_dependent_address_p): Remove.
23992         * config/stormy16/stormy16.c (xstormy16_mode_dependent_address_p):
23993         Make static. Change return type to bool. Change argument type to
23994         const_rtx. Remove dead code.
23995         (TARGET_MODE_DEPENDENT_ADDRESS_P): Define.
23996
23997 2011-02-21  Richard Guenther  <rguenther@suse.de>
23998
23999         PR lto/47820
24000         * lto-streamer-in.c (lto_input_ts_decl_common_tree_pointers):
24001         Do not stream DECL_INITIAL for TRANSLATION_UNIT_DECLs.
24002         (lto_input_ts_block_tree_pointers): Hook a BLOCK into the
24003         TUs context.
24004         * lto-streamer-out.c (lto_output_ts_decl_common_tree_pointers):
24005         Do not stream DECL_INITIAL for TRANSLATION_UNIT_DECLs.
24006
24007 2011-02-20  Richard Guenther  <rguenther@suse.de>
24008
24009         PR lto/47822
24010         * tree.c (free_lang_data_in_decl): Clean builtins from
24011         the TU decl BLOCK_VARS.
24012
24013 2011-02-19  Alexandre Oliva  <aoliva@redhat.com>
24014
24015         PR debug/47620
24016         PR debug/47630
24017         * haifa-sched.c (fix_tick_ready): Skip tick computation
24018         for debug insns.
24019
24020 2011-02-19  Richard Guenther  <rguenther@suse.de>
24021
24022         PR lto/47647
24023         * lto-streamer-in.c (lto_input_ts_decl_minimal_tree_pointers):
24024         Remove lazy BLOCK_VARS streaming.
24025         (lto_input_ts_block_tree_pointers): Likewise.
24026         * lto-streamer-out.c (lto_output_ts_block_tree_pointers): Likewise.
24027
24028 2011-02-19  Joseph Myers  <joseph@codesourcery.com>
24029
24030         * config.gcc (i[34567]86-pc-msdosdjgpp*): Use i386/djgpp-stdint.h.
24031
24032 2011-02-19  Joseph Myers  <joseph@codesourcery.com>
24033
24034         * config/i386/biarch32.h, config/i386/mach.h,
24035         config/rs6000/aix.opt, config/sh/superh64.h: Remove.
24036
24037 2011-02-19  Jakub Jelinek  <jakub@redhat.com>
24038
24039         PR target/47800
24040         * config/i386/i386.md (peephole2 for shift and plus): Use
24041         operands[1] original mode in the first insn.
24042
24043 2011-02-18  Mike Stump  <mikestump@comcast.net>
24044
24045         * config/t-darwin (TM_H): Add dependency on darwin-sections.def.
24046
24047 2011-02-18  Jan Hubicka  <jh@suse.cz>
24048
24049         PR middle-end/47788
24050         * ipa-inline.c (compute_inline_parameters): Set disregard_inline_limits
24051         to zero when the function is not inlinable at all.
24052
24053 2011-02-18  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
24054
24055         * config.gcc (hppa[12]*-*-hpux11*): Set extra_parts.
24056         * config/pa/stublib.c (pthread_default_stacksize_np, pthread_mutex_lock,
24057         pthread_mutex_unlock, pthread_once): Reinstate pthread stubs.
24058         * config/pa/t-pa-hpux11: Add rules to build pthread stubs.
24059         * config/pa/t-pa64: Likewise.
24060         * config/pa/pa-hpux11.h (LINK_GCC_C_SEQUENCE_SPEC): Define.
24061
24062 2011-02-18  Jakub Jelinek  <jakub@redhat.com>
24063
24064         PR driver/47787
24065         * gcc.c (default_compilers): Clear combinable field for "@cpp-output".
24066
24067 2011-02-18  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
24068
24069         PR target/47792
24070         * gthr-dce.h (__gthread_mutx_destroy): Fix typo in name.
24071
24072 2011-02-18  Anatoly Sokolov  <aesok@post.ru>
24073
24074         * config/m32r/m32r.h (REG_OK_FOR_BASE_P, REG_OK_FOR_INDEX_P,
24075         RTX_OK_FOR_BASE_P, RTX_OK_FOR_OFFSET_P, LEGITIMATE_OFFSET_ADDRESS_P,
24076         LEGITIMATE_LO_SUM_ADDRESS_P, LOAD_POSTINC_P, STORE_PREINC_PREDEC_P,
24077         GO_IF_LEGITIMATE_ADDRESS): Remove macros.
24078         * config/m32r/m32r.c (TARGET_LEGITIMATE_ADDRESS_P): Define.
24079         (m32r_rtx_ok_for_base_p, m32r_rtx_ok_for_offset_p,
24080         m32r_legitimate_offset_addres_p, m32r_legitimate_lo_sum_addres_p,
24081         m32r_load_postinc_p, m32r_store_preinc_predec_p,
24082         m32r_legitimate_address_p): New functions.
24083         * config/m32r/constraints.md (constraint "S"): Don't use
24084         STORE_PREINC_PREDEC_P.
24085         (constraint "U"): Don't use LOAD_POSTINC_P.
24086
24087 2011-02-18  Chung-Lin Tang  <cltang@codesourcery.com>
24088
24089         PR rtl-optimization/46178
24090         * ira.c (setup_hard_regno_class): Use ira_class_translate[] to
24091         compute ira_hard_regno_cover_class[].
24092
24093 2011-02-18  Richard Guenther  <rguenther@suse.de>
24094
24095         PR lto/47798
24096         * lto-streamer.h (lto_global_var_decls): Declare.
24097         * lto-streamer-in.c (lto_register_var_decl_in_symtab): Register
24098         statics for global var processing.
24099
24100 2011-02-18  Richard Guenther  <rguenther@suse.de>
24101
24102         PR tree-optimization/47737
24103         * tree-ssa-loop-im.c (extract_true_false_args_from_phi): Fix
24104         edge dominance check.
24105
24106 2011-02-18  Jakub Jelinek  <jakub@redhat.com>
24107
24108         PR debug/47780
24109         * cfgexpand.c (expand_debug_expr) <case SSA_NAME>: Call copy_rtx to
24110         avoid invalid rtx sharing.
24111
24112 2011-02-18  Gerald Pfeifer  <gerald@pfeifer.com>
24113
24114         * doc/cpp.texi (Obsolete Features): Add background on the
24115         origin of assertions.
24116
24117 2011-02-17  Iain Sandoe  <iains@gcc.gnu.org>
24118
24119         * config/darwin-c.c (darwin_cpp_builtins): Define __OBJC2__ for
24120         objc_abi == 2.
24121         * config/darwin.c (output_objc_section_asm_op): Added support for
24122         ABI v1 and v2.
24123         (is_objc_metadata): New.
24124         (darwin_objc2_section): New.
24125         (darwin_objc1_section): New.
24126         (machopic_select_section): Added support for ABI v1 and v2.
24127         (darwin_emit_objc_zeroed): New.
24128         (darwin_output_aligned_bss): Detect objc metadata and treat it
24129         appropriately.
24130         (darwin_asm_output_aligned_decl_common): Same.
24131         (darwin_asm_output_aligned_decl_local): Same.
24132         * config/darwin-sections.def: Updated for ABI v1 and v2.
24133         * config/darwin.h (SUBTARGET_C_COMMON_OVERRIDE_OPTIONS): When
24134         compiling Objective-C code for the NeXT runtime, default to using
24135         ABI version 0 for 32-bit, and version 2 for 64-bit.
24136
24137 2011-02-17  Joseph Myers  <joseph@codesourcery.com>
24138
24139         * common.opt (optimize_fast): New Variable.
24140         * opts.c (default_options_optimization): Use opts->x_optimize_fast
24141         instead of local variable ofast.
24142
24143 2011-02-17  Nicola Pero  <nicola.pero@meta-innovation.com>
24144
24145         * doc/invoke.texi (fobjc-abi-version): Documented.
24146         (fobjc-nilcheck): Documented.
24147         (fno-nil-receiver): Updated documentation to refer to the NeXT ABI
24148         version.
24149
24150 2011-02-17  Joseph Myers  <joseph@codesourcery.com>
24151
24152         PR driver/47390
24153         * common.opt (export-dynamic): New Driver option.
24154         * gcc.c (LINK_COMMAND_SPEC): Add comment about %{e*}.
24155
24156 2011-02-17  Joseph Myers  <joseph@codesourcery.com>
24157
24158         * config/rx/rx.h (LIB_SPEC): Match -msim not -msim*.
24159
24160 2011-02-17  Alexandre Oliva  <aoliva@redhat.com>
24161             Jan Hubicka  <jh@suse.cz>
24162
24163         PR debug/47106
24164         PR debug/47402
24165         * cfgexpand.c (account_used_vars_for_block): Remove.
24166         (estimated_stack_frame_size): Use referenced vars.
24167         * tree-inline.c (remap_decl): Only mark VAR_DECLs as referenced
24168         that were referenced in the original function.  Test src_fn
24169         rather than cfun.  Drop redundant get_var_ann.
24170         (setup_one_parameter): Drop redundant get_var_ann.
24171         (declare_return_variable): Likewise.
24172         (copy_decl_for_dup_finish): Mark VAR_DECLs referenced in src_fn.
24173         (copy_arguments_for_versioning): Drop redundant get_var_ann.
24174         * ipa-inline.c (compute_inline_parameters): Do not compute
24175         disregard_inline_limits here.
24176         (compute_inlinable_for_current, pass_inlinable): New.
24177         (pass_inline_parameters): Require PROP_referenced_vars.
24178         * cgraphunit.c (cgraph_process_new_functions): Don't run
24179         compute_inline_parameters explicitly unless function is in SSA form.
24180         (cgraph_analyze_function): Set .disregard_inline_limits.
24181         * tree-sra.c (convert_callers): Compute inliner parameters
24182         only for functions already in SSA form.
24183
24184 2011-02-17  Joseph Myers  <joseph@codesourcery.com>
24185
24186         * config/sparc/sparc.h (CPP_ENDIAN_SPEC): Don't handle
24187         -mlittle-endian-data.
24188
24189 2011-02-17  Joseph Myers  <joseph@codesourcery.com>
24190
24191         * config/sparc/linux64.h (OPTION_DEFAULT_SPECS): Match -mfpu and
24192         -mno-fpu, not -fpu and -no-fpu.
24193         * config/sparc/sol2-bi.h (OPTION_DEFAULT_SPECS): Likewise.
24194         * config/sparc/sparc.h (OPTION_DEFAULT_SPECS): Likewise.
24195
24196 2011-02-17  Uros Bizjak  <ubizjak@gmail.com>
24197
24198         PR target/43653
24199         * config/i386/i386.c (ix86_secondary_reload): Handle SSE
24200         input reload with PLUS RTX.
24201
24202 2011-02-16  Joseph Myers  <joseph@codesourcery.com>
24203
24204         * config/mips/mips.opt (mno-mdmx): Use Var(TARGET_MDMX, 0) instead
24205         of InverseVar(MDMX).
24206
24207 2011-02-16  Joseph Myers  <joseph@codesourcery.com>
24208
24209         * config/sh/embed-elf.h (LIBGCC_SPEC): Match -m4-340 instead of
24210         --m4-340.
24211
24212 2011-02-16  Joseph Myers  <joseph@codesourcery.com>
24213
24214         * config/mn10300/mn10300.opt (mno-crt0): New.
24215
24216 2011-02-16  Joseph Myers  <joseph@codesourcery.com>
24217
24218         * config/m68k/uclinux.opt (static-libc): New Driver option.
24219
24220 2011-02-16  Joseph Myers  <joseph@codesourcery.com>
24221
24222         * config/m32c/m32c.h (LIB_SPEC): Match -msim not -msim*.
24223
24224 2011-02-16  Joseph Myers  <joseph@codesourcery.com>
24225
24226         * config/lm32/lm32.h (ASM_SPEC): Use %{muser-enabled} instead of
24227         %{muser-extend-enabled}.
24228
24229 2011-02-16  Richard Guenther  <rguenther@suse.de>
24230
24231         PR tree-optimization/47738
24232         * tree-ssa-loop.c (run_tree_predictive_commoning): Return
24233         the TODO from tree_predictive_commoning.
24234
24235 2011-02-15  Jeff Law  <law@redhat.com>
24236
24237         Revert
24238         2011-01-25  Jeff Law  <law@redhat.com>
24239
24240         PR rtl-optimization/37273
24241         * ira-costs.c (scan_one_insn): Detect constants living in memory and
24242         handle them like argument loads from stack slots.  Do not double
24243         count memory for memory constants and argument loads from stack slots.
24244
24245 2011-02-15  Michael Meissner  <meissner@linux.vnet.ibm.com>
24246
24247         PR target/47755
24248         * config/rs6000/predicates.md (easy_vector_constant): Allow V2DI
24249         mode for vector constants.  Remove code that checks for TImode.
24250
24251 2011-02-15  Alexandre Oliva  <aoliva@redhat.com>
24252
24253         PR debug/47106
24254         PR debug/47402
24255         * cgraph.h (compute_inline_parameters): Return void.
24256         * ipa-inline.c (compute_inline_parameters): Adjust.
24257
24258 2011-02-15  Alexandre Oliva  <aoliva@redhat.com>
24259
24260         PR debug/47106
24261         PR debug/47402
24262         * tree-inline.h (estimated_stack_frame_size): Take cgraph node
24263         rather than decl.
24264         * cfgexpand.c (estimated_stack_frame_size): Likewise.
24265         * ipa-inline.c (compute_inline_parameters): Adjust.
24266
24267 2011-02-15  Alexandre Oliva  <aoliva@redhat.com>
24268
24269         PR debug/47106
24270         PR debug/47402
24271         * tree-flow.h (FOR_EACH_REFERENCED_VAR): Add FN argument.
24272         Adjust all users.  Pass FN to...
24273         * tree-flow-inline.h (first_referenced_var): ... this.  Add
24274         fn argument.
24275         * ipa-struct-reorg.c: Adjust.
24276         * tree-dfa.c: Adjust.
24277         * tree-into-ssa.c: Adjust.
24278         * tree-sra.c: Adjust.
24279         * tree-ssa-alias.c: Adjust.
24280         * tree-ssa-live.c: Adjust.
24281         * tree-ssa.c: Adjust.
24282         * tree-ssanames.c: Adjust.
24283         * tree-tailcall.c: Adjust.
24284
24285 2011-02-15  Alexandre Oliva  <aoliva@redhat.com>
24286
24287         PR debug/47106
24288         PR debug/47402
24289         * tree-flow.h (referenced_var_lookup): Add fn parameter.
24290         Adjust all callers.
24291         * tree-dfa.c (referenced_var_lookup): Use fn instead of cfun.
24292         * tree-flow-inline.h: Adjust.
24293         * gimple-pretty-print.c: Adjust.
24294         * tree-into-ssa.c: Adjust.
24295         * tree-ssa.c: Adjust.
24296         * cfgexpand.c: Adjust.
24297
24298 2011-02-15  Nathan Froyd  <froydnj@codesourcery.com>
24299
24300         * config/iq2000/i2000.h (REG_CLASS_FROM_LETTER): Delete.
24301         (CONST_OK_FOR_LETTER_P, CONST_DOUBLE_OK_FOR_LETTER_P): Delete.
24302         (EXTRA_CONSTRAINT): Delete.
24303         * config/iq2000/constraints.md: New file.
24304         * config/iq2000/iq2000.md: Include it.
24305         (define_insn ""): Delete.
24306         (movsi_internal2, movhi_internal2, movqi_internal2): Delete
24307         unsupported constraint letters from patterns.
24308         (call_value, call_value_internal1): Likewise.
24309         (call_value_multiple_internal1): Likewise.
24310
24311 2011-02-15  Nick Clifton  <nickc@redhat.com>
24312
24313         * config/mn10300/mn10300.c: Include tm-constrs.h.
24314         (struct liw_data): New data structure describing an LIW candidate
24315         instruction.
24316         (extract_bundle): Use struct liw_data.  Allow small integer
24317         operands for some instructions.
24318         (check_liw_constraints): Use struct liw_data.  Remove swapped
24319         parameter.  Add comments describing the checks.  Fix bug when
24320         assigning the source of liw1 to the source of liw2.
24321         (liw_candidate): Delete.  Code moved into extract_bundle.
24322         (mn10300_bundle_liw): Use struct liw_data.  Check constraints
24323         before swapping.
24324         * config/mn10300/predicates.md (liw_operand): New predicate.
24325         Allows registers and small integer constants.
24326         * config/mn10300/constraints.md (O): New constraint.  Accetps
24327         integers in the range -8 to +7 inclusive.
24328         * config/mn10300/mn10300.md (movesi_internal): Add an alternative
24329         for moving a small integer into a register.  Give this alternative
24330         LIW attributes.
24331         (addsi3, subsi3, cmpsi, lshrsi3, ashrsi3): Likewise.
24332         (ashlsi3): Likewise, plus give LIW attributes to the alternatives
24333         using the J,K,L and M constraints,
24334         (liw): Remove SI mode on second operands to allow for HI and QI
24335         mode values.
24336         (cmp_liw, liw_cmp): Likewise.  Plus fix order of operands in the
24337         instruction.
24338
24339 2011-02-15  Richard Guenther  <rguenther@suse.de>
24340
24341         PR tree-optimization/47743
24342         * tree-ssa-pre.c (phi_translate_1): If we didn't get a value-number
24343         for a non-type-compatible VN lookup bail out.
24344
24345 2011-02-15  Nathan Froyd  <froydnj@codesourcery.com>
24346
24347         * config/fr30/constraints.md: New file.
24348         * config/fr30/fr30.md: Include it.
24349         * config/fr30/fr30.h (REG_CLASS_FROM_LETTER): Delete.
24350         (CONST_OK_FOR_LETTER_P, CONST_DOUBLE_OK_FOR_LETTER_P): Delete.
24351         (EXTRA_CONSTRAINT): Delete.
24352
24353 2011-02-15  Nathan Froyd  <froydnj@codesourcery.com>
24354
24355         * config/frv/constraints.md: New file.
24356         * config/frv/predicates.md: Include it.
24357         * config/frv/frv.c (reg_class_from_letter): Delete.
24358         (frv_option_override): Don't initialize it.
24359         * config/frv/frv.h (REG_CLASS_FROM_LETTER): Delete.
24360         (CONST_OK_FOR_I, CONST_OK_FOR_J, CONST_OK_FOR_K): Delete.
24361         (CONST_OK_FOR_L, CONST_OK_FOR_M, CONST_OK_FOR_N): Delete.
24362         (CONST_OK_FOR_O, CONST_OK_FOR_P, CONST_OK_FOR_LETTER_P): Delete.
24363         (CONST_DOUBLE_OK_FOR_G, CONST_DOUBLE_OK_FOR_H): Delete.
24364         (CONST_DOUBLE_OK_FOR_LETTER_P): Delete.
24365         (EXTRA_CONSTRAINT_FOR_Q, EXTRA_CONSTRAINT_FOR_R): Delete.
24366         (EXTRA_CONSTRAINT_FOR_S, EXTRA_CONSTRAINT_FOR_T): Delete.
24367         (EXTRA_CONSTRAINT_FOR_U, EXTRA_CONSTRAINT): Delete.
24368         (EXTRA_MEMORY_CONSTRAINT, CONSTRAINT_LEN): Delete.
24369         (REG_CLASS_FROM_CONSTRAINT): Delete.
24370
24371 2011-02-15  Jakub Jelinek  <jakub@redhat.com>
24372
24373         PR middle-end/47581
24374         * config/i386/i386.c (ix86_compute_frame_size): Don't align offset
24375         if frame size is 0 in a leaf function.
24376
24377 2011-02-15  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
24378
24379         PR pch/14940
24380         * config/alpha/host-osf.c: New file.
24381         * config/alpha/x-osf: New file.
24382         * config.host (alpha*-dec-osf*): Use it.
24383
24384 2011-02-14  Anatoly Sokolov  <aesok@post.ru>
24385
24386         * config/rx/rx.h (GO_IF_MODE_DEPENDENT_ADDRESS): Remove.
24387         * config/rx/rx-protos.h (rx_is_mode_dependent_addr): Remove.
24388         * config/xtensa/xtensa.c (rx_is_mode_dependent_addr): Rename to...
24389         (rx_mode_dependent_address_p): ...this. Make static. Change argument
24390         type to const_rtx.
24391         (TARGET_MODE_DEPENDENT_ADDRESS_P): Define.
24392
24393 2011-02-14  Nathan Froyd  <froydnj@codesourcery.com>
24394
24395         * config/stormy16/constraints.md: New file.
24396         * config/stormy16/predicates.md (nonimmediate_nonstack_operand):
24397         Use satisfies_constraint_Q and satisfies_constraint_R.
24398         * config/stormy16/stomry16-protos.h (xstormy16_extra_constraint_p):
24399         Delete.
24400         (xstormy16_legitiamte_address_p): Declare.
24401         * config/stormy16/stormy16.h (REG_CLASS_FROM_LETTER): Delete.
24402         (CONST_OK_FOR_LETTER_P, CONST_DOUBLE_OK_FOR_LETTER_P): Delete.
24403         (EXTRA_CONSTRAINT): Delete.
24404         * config/stormy16/stormy16.c (xstormy16_legitimate_address_p):
24405         Un-staticize.
24406         (xstormy16_extra_constraint_p): Delete.
24407
24408 2011-02-14  Eric Botcazou  <ebotcazou@adacore.com>
24409
24410         PR tree-optimization/46494
24411         * loop-unroll.c (split_edge_and_insert): Adjust comment.
24412         * loop-init.c (loop_optimizer_finalize): Do not call verify_flow_info.
24413         (pass_rtl_loop_done): Add TODO_verify_flow.
24414         * fwprop.c (pass_rtl_fwprop): Likewise.
24415         * modulo-sched.c (pass_sms): Likewise.
24416         * tree-ssa-dom.c (pass_dominator): Likewise.
24417         * tree-ssa-loop-ch.c (pass_ch): Likewise.
24418         * tree-ssa-loop.c (pass_complete_unrolli): Likewise.
24419         (pass_tree_loop_done): Likewise.
24420         * tree-ssa-pre.c (execute_pre): Likewise.
24421         * tree-ssa-reassoc.c (pass_reassoc): Likewise.
24422         * tree-ssa-sink.c (pass_sink_code): Likewise.
24423         * tree-vrp.c (pass_vrp): Likewise.
24424
24425 2011-02-14  Nathan Froyd  <froydnj@codesourcery.com>
24426
24427         * config/v850/constraints.md: New file.
24428         * config/v850/v850.md: Include it.
24429         * config/v850/predicates.md (reg_or_0_operand): Use
24430         satisfies_constraint_G.
24431         (special_symbolref_operand): Use satisfies_constraint_K.
24432         * config/v850/v850.h (CONSTANT_ADDRESS_P): Use constraint_satisfied_p.
24433         (GO_IF_LEGITIMATE_ADDRESS): Likewise.
24434         (REG_CLASS_FROM_LETTER, INT_7_BITS, INT_8_BITS): Delete.
24435         (CONST_OK_FOR_P, CONST_OK_FOR_LETTER_P): Delete.
24436         (EXTRA_CONSTRAINT): Delete.
24437         (CONST_OK_FOR_I, CONST_OK_FOR_J): Use insn_const_int_ok_for_constraint.
24438         (CONST_OK_FOR_K, CONST_OK_FOR_L, CONST_OK_FOR_M): Likewise.
24439         (CONST_OK_FOR_N, CONST_OK_FOR_O): Likewise.
24440
24441 2011-02-14  Anatoly Sokolov  <aesok@post.ru>
24442
24443         PR target/47696
24444         * config/avr/avr-devices.c (avr_mcu_types): Fix ATmega2560 device
24445         description.
24446
24447 2011-02-14  Nathan Froyd  <froydnj@codesourcery.com>
24448
24449         * config/mcore/constraints.md: New file.
24450         * config/mcore/mcore.md: Include it.
24451         * config/mcore/mcore.c (reg_class_from_letter): Delete.
24452         * config/mcore/mcore.h (reg_class_from_letter): Delete.
24453         (REG_CLASS_FROM_LETTER): Delete.
24454         (CONST_OK_FOR_I, CONST_OK_FOR_J, CONST_OK_FOR_L): Use
24455         insn_const_int_ok_for_constraint.
24456         (CONST_OK_FOR_K, CONST_OK_FOR_M, CONST_OK_FOR_N): Likewise.
24457         (CONST_OK_FOR_O, CONST_OK_FOR_P): Likewise.
24458         (CONST_OK_FOR_LETTER_P, CONST_DOUBLE_OK_FOR_LETTER_P): Delete.
24459         (EXTRA_CONSTRAINT): Delete.
24460
24461 2011-02-14  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
24462
24463         PR ada/41929
24464         * config/sparc/sol2-unwind.h: Include <sys/frame.h>, <sys/stack.h>
24465         (IS_SIGHANDLER): Define.
24466         (sparc64_is_sighandler): New function, split off from
24467         sparc64_fallback_frame_state.
24468         (sparc_is_sighandler): New function, split off from
24469         sparc_fallback_frame_state.
24470         (sparc64_fallback_frame_state): Merge with ...
24471         (sparc_fallback_frame_state): ... this into ...
24472         (MD_FALLBACK_FRAME_STATE_FOR): ... this.
24473         Change new_cfa to long.  Remove regs_off, fpu_save_off, fpu_save.
24474         Define nframes, mctx.  Use IS_SIGHANDLER, handler_args, mctx, walk
24475         stack instead of hardcoded offsets.
24476
24477 2011-02-14  Andriy Gapon  <avg@freebsd.org>
24478
24479         PR target/45808
24480         * config/freebsd-spec.h (FBSD_LIB_SPEC): Handle the shared case.
24481
24482 2011-02-13  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
24483
24484         * configure: Regenerate.
24485
24486 2011-02-12  Joseph Myers  <joseph@codesourcery.com>
24487
24488         PR driver/45731
24489         * gcc.c (asm_options): Correct spec matching --target-help.
24490
24491 2011-02-12  Martin Jambor  <mjambor@suse.cz>
24492
24493         * tree-cfg.c (verify_gimple_call): Return true upon invalid argument
24494         to gimple call error.
24495
24496 2011-02-12  Mike Stump  <mikestump@comcast.net>
24497
24498         * config/frv/frv.h (TRANSFER_FROM_TRAMPOLINE): Canonicalize
24499         comments in backslash regions.
24500
24501 2011-02-12  Mike Stump  <mikestump@comcast.net>
24502             Jakub Jelinek  <jakub@redhat.com>
24503             Iain Sandoe  <iains@gcc.gnu.org>
24504
24505         PR target/47324
24506         * dwarf2out.c (output_cfa_loc): When required, apply the
24507         DWARF2_FRAME_REG_OUT macro to adjust register numbers.
24508         (output_loc_sequence): Likewise.
24509         (output_loc_operands_raw): Likewise.
24510         (output_loc_sequence_raw): Likewise.
24511         (output_cfa_loc): Likewise.
24512         (output_loc_list): Suppress register number adjustment when
24513         calling output_loc_sequence()
24514         (output_die): Likewise.
24515
24516 2011-02-12  Anatoly Sokolov  <aesok@post.ru>
24517
24518         * config/xtensa/xtensa.h (REGISTER_MOVE_COST, MEMORY_MOVE_COST):
24519         Remove macros.
24520         * config/xtensa/xtensa.c (xtensa_register_move_cost,
24521         xtensa_memory_move_cost): New functions.
24522         (TARGET_REGISTER_MOVE_COST, TARGET_REGISTER_MOVE_COST): Define.
24523
24524 2011-02-12  Alexandre Oliva  <aoliva@redhat.com>
24525
24526         PR lto/47225
24527         * configure.ac (gcc_cv_lto_plugin): Test for liblto_plugin.la
24528         in the current directory.
24529         * configure: Rebuilt.
24530
24531 2011-02-12  Iain Sandoe  <iains@gcc.gnu.org>
24532
24533         * config/darwin.c (darwin_override_options): Add a hunk missed
24534         from the commit of r168571.  Trim comment line lengths and
24535         correct indents of the preceding block.
24536
24537 2011-02-12  Iain Sandoe  <iains@gcc.gnu.org>
24538
24539         * gcc.c (driver_handle_option): Concatenate the argument to -F with
24540         the switch.
24541
24542 2011-02-11  Joseph Myers  <joseph@codesourcery.com>
24543
24544         * common.opt (nostartfiles): New Driver option.
24545
24546 2011-02-11  Xinliang David Li  <davidxl@google.com>
24547
24548         PR tree-optimization/47707
24549         * tree-chrec.c (convert_affine_scev): Keep type precision.
24550
24551 2011-02-11  Eric Botcazou  <ebotcazou@adacore.com>
24552
24553         PR tree-optimization/47420
24554         * ipa-split.c (visit_bb): Punt on any kind of GIMPLE_RESX.
24555
24556 2011-02-11  Pat Haugen  <pthaugen@us.ibm.com>
24557
24558         PR rtl-optimization/47614
24559         * rtl.h (check_for_inc_dec): Declare.
24560         * dse.c (check_for_inc_dec): Externalize...
24561         * postreload.c (reload_cse_simplify): ...use it before deleting stmt.
24562         (reload_cse_simplify_operands): Don't simplify opnds with side effects.
24563
24564 2011-02-11  Joseph Myers  <joseph@codesourcery.com>
24565
24566         PR driver/47678
24567         * gcc.c (main): Do not compile inputs if there were errors in
24568         option handling.
24569         * opts-common.c (read_cmdline_option): Check for wrong language
24570         after other error checks.
24571
24572 2011-02-11  Nathan Froyd  <froydnj@codesourcery.com>
24573
24574         * cgraph.c: Fix comment typos.
24575         * cgraph.h: Likewise.
24576         * cgraphunit.c: Likewise.
24577         * ipa-cp.c: Likewise.
24578         * ipa-inline.c: Likewise.
24579         * ipa-prop.c: Likewise.
24580         * ipa-pure-const.c: Likewise.
24581         * ipa-ref.c: Likewise.
24582         * ipa-reference.c: Likewise.
24583
24584 2011-02-11  Jakub Jelinek  <jakub@redhat.com>
24585
24586         PR debug/47684
24587         * tree-predcom.c (single_nonlooparound_use): Ignore debug uses.
24588
24589 2011-02-11  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
24590
24591         PR testsuite/47400
24592         * doc/sourcebuild.texi (Require Support): Document
24593         dg-require-ascii-locale.
24594
24595 2011-02-11  Mingjie Xing  <mingjie.xing@gmail.com>
24596
24597         * doc/lto.texi (Write summary): Fix missing parentheses.
24598
24599 2011-02-10  DJ Delorie  <dj@redhat.com>
24600
24601         * config/m32c/m32c.c (m32c_option_override): Disable
24602         -fcombine-stack-adjustments until flag value tracking and compare
24603         optimization can be rewritten.
24604
24605 2011-02-10  Peter Bergner  <bergner@vnet.ibm.com>
24606
24607         * config/rs6000/linux64.h (PROCESSOR_DEFAULT): Change to
24608         PROCESSOR_POWER7.
24609         (PROCESSOR_DEFAULT64): Likewise.
24610
24611 2011-02-10  Richard Henderson  <rth@redhat.com>
24612
24613         * config/rx/predicates.md (rx_zs_comparison_operator): Revert
24614         change from 2011-02-03.
24615         * config/rx/rx.c (flags_from_code): Likewise.
24616         (rx_print_operand) ['B']: For LT/GE, use lt/ge if overflow flag
24617         is valid, n/pz otherwise.
24618         (rx_select_cc_mode): Return CCmode if Y is not zero.
24619
24620 2011-02-10  Richard Guenther  <rguenther@suse.de>
24621
24622         * tree-ssa-structalias.c (bitpos_of_field): Use BITS_PER_UNIT, not 8.
24623
24624 2011-02-10  Richard Guenther  <rguenther@suse.de>
24625
24626         PR tree-optimization/47677
24627         * tree-vrp.c (vrp_bitmap_equal_p): Fix comparison of empty bitmaps.
24628
24629 2011-02-10  Jakub Jelinek  <jakub@redhat.com>
24630
24631         PR target/47665
24632         * combine.c (make_compound_operation): Only change shifts into
24633         multiplication for SCALAR_INT_MODE_P.
24634
24635 2011-02-10  Jie Zhang  <jie@codesourcery.com>
24636
24637         PR testsuite/47622
24638         Revert
24639         2011-02-05  Jie Zhang  <jie@codesourcery.com>
24640         PR debug/42631
24641         * web.c (entry_register): Don't clobber the number of the
24642         first uninitialized reference in used[].
24643
24644 2011-02-09  Richard Guenther  <rguenther@suse.de>
24645
24646         PR tree-optimization/47664
24647         * ipa-inline.c (cgraph_decide_inlining_incrementally): Visit
24648         all edges again.
24649
24650 2011-02-09  David Edelsohn  <dje.gcc@gmail.com>
24651
24652         PR target/46481
24653         PR target/47032
24654         * config/rs6000/aix61.h (PROCESSOR_DEFAULT): Change to
24655         PROCESSOR_POWER7.
24656         (PROCESSOR_DEFAULT64): Same.
24657         (RS6000_DEFAULT_LONG_DOUBLE_SIZE): Delete.
24658
24659 2011-02-09  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
24660
24661         * config/mips/iris6.h (TARGET_C99_FUNCTIONS): Define.
24662
24663 2011-02-09  Martin Jambor  <mjambor@suse.cz>
24664
24665         PR middle-end/45505
24666         * tree-sra.c (struct access): New flags grp_scalar_read and
24667         grp_scalar_write.  Changed description of assignment read and write
24668         flags.
24669         (dump_access): Dump new flags, reorder all of them.
24670         (sort_and_splice_var_accesses): Set the new flag accordingly, use them
24671         to detect multiple scalar reads.
24672         (analyze_access_subtree): Use the new scalar read write flags instead
24673         of the old flags.  Adjusted comments.
24674
24675 2011-02-08  DJ Delorie  <dj@redhat.com>
24676
24677         PR target/47548
24678         * config/m32c/m32c.c (m32c_subreg): Don't try to validate interim
24679         patterns.
24680
24681 2011-02-08  Joseph Myers  <joseph@codesourcery.com>
24682
24683         * config/m68k/uclinux.opt: New.
24684         * config.gcc (m68k-*-uclinux*): Use m68k/uclinux.opt.
24685
24686 2011-02-08  Joseph Myers  <joseph@codesourcery.com>
24687
24688         * config/cris/elf.opt (sim): New Driver option.
24689
24690 2011-02-08  Joseph Myers  <joseph@codesourcery.com>
24691
24692         * config/xtensa/elf.opt: New.
24693         * config.gcc (xtensa*-*-elf*): Use xtensa/elf.opt.
24694
24695 2011-02-08  Joseph Myers  <joseph@codesourcery.com>
24696
24697         * config/vax/elf.opt: New.
24698         * config.gcc (vax-*-linux*, vax-*-netbsdelf*): Use vax/elf.opt.
24699
24700 2011-02-08  Joseph Myers  <joseph@codesourcery.com>
24701
24702         * config/rs6000/aix64.opt (posix, pthread): New Driver options.
24703
24704 2011-02-08  Joseph Myers  <joseph@codesourcery.com>
24705
24706         * config/gnu-user.opt: New.
24707         * config.gcc (*-*-linux* | frv-*-*linux* | *-*-kfreebsd*-gnu |
24708         *-*-knetbsd*-gnu | *-*-gnu* | *-*-kopensolaris*-gnu,
24709         *-*-uclinux*): Use gnu-user.opt.
24710
24711 2011-02-08  Thomas Schwinge  <thomas@schwinge.name>
24712
24713         * config/gnu.h (CPP_SPEC, LIB_SPEC): Remove handling of -bsd option.
24714         * config/i386/gnu.h (CPP_SPEC): Likewise.
24715
24716 2011-02-08  Ian Lance Taylor  <iant@google.com>
24717
24718         * common.opt (fcx-limited-range): Add SetByCombined flag.
24719         (ffinite-math-only, fmath-errno, frounding-math): Likewise.
24720         (fsignaling-nans, fsigned-zeros, ftrapping-math): Likewise.
24721         (fassociative-math, freciprocal-math): Likewise.
24722         (funsafe-math-optimizations): Likewise.
24723         * opth-gen.awk: Handle SetByCombined.
24724         * optc-gen.awk: Likewise.
24725         * opts.c (set_fast_math_flags): Don't override flag if set by frontend.
24726         (set_unsafe_math_optimizations_flags): Likewise.
24727         * doc/options.texi (Option properties): Document SetByCombined.
24728
24729 2011-02-08  Joseph Myers  <joseph@codesourcery.com>
24730
24731         * config.gcc (arc-*, alpha*-*-gnu*, arm*-*-netbsd*, arm-*-pe*,
24732         i[34567]86-*-interix3*, i[34567]86-*-netbsd*, i[34567]86-*-pe,
24733         m68hc11-*-*, m6811-*-*, m68hc12-*-*, m6812-*-*,
24734         m68k-*-uclinuxoldabi*, mcore-*-pe*, powerpc*-*-gnu*,
24735         sh*-*-symbianelf*, vax-*-netbsd*): Mark obsolete.
24736
24737 2011-02-08  Sebastian Pop  <sebastian.pop@amd.com>
24738
24739         PR tree-optimization/46834
24740         PR tree-optimization/46994
24741         PR tree-optimization/46995
24742         * graphite-sese-to-poly.c (used_outside_reduction): New.
24743         (detect_commutative_reduction): Call used_outside_reduction.
24744         (rewrite_commutative_reductions_out_of_ssa_close_phi): Call
24745         translate_scalar_reduction_to_array only when at least one
24746         loop-phi/close-phi tuple has been detected.
24747
24748 2011-02-08  Richard Guenther  <rguenther@suse.de>
24749
24750         PR middle-end/47639
24751         * tree-vect-generic.c (expand_vector_operations_1): Update
24752         stmts here ...
24753         (expand_vector_operations): ... not here.  Cleanup EH info
24754         and the CFG if required.
24755
24756 2011-02-08  Richard Guenther  <rguenther@suse.de>
24757
24758         PR tree-optimization/47641
24759         * tree-ssa.c (execute_update_addresses_taken): For asm outputs
24760         require type compatibility.
24761
24762 2011-02-08  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
24763
24764         * gimple-low.c (lower_function_body): Don't remove the location of
24765         the return statement here.
24766         (lower_gimple_return): Do it here instead but only if the return
24767         statement is actually used twice.
24768
24769 2011-02-08  Richard Guenther  <rguenther@suse.de>
24770
24771         PR tree-optimization/47632
24772         * tree-ssa-forwprop.c (remove_prop_source_from_use): Remove
24773         unused up_to_stmt parameter, return whether cfg-cleanup is
24774         necessary, remove EH info properly.
24775         (forward_propagate_into_gimple_cond): Adjust caller.
24776         (forward_propagate_into_cond): Likewise.
24777         (forward_propagate_comparison): Likewise.
24778         (tree_ssa_forward_propagate_single_use_vars): Make
24779         forward_propagate_comparison case similar to the two others.
24780
24781 2011-02-08  Nick Clifton  <nickc@redhat.com>
24782
24783         * config/mn10300/mn10300.opt (mliw): New command line option.
24784         * config/mn10300/mn10300.md (UNSPEC_LIW): New unspec.
24785         (liw_bundling): New automaton.
24786         (liw): New attribute.
24787         (liw_op): New attribute.
24788         (liw_op1, liw_op2, liw_both, liw_either): New reservations.
24789         (movsi_internal): Add LIW attributes.
24790         (andsi3): Likewise.
24791         (iorsi3): Likewise.
24792         (xorsi3): Likewise.
24793         (addsi3): Separate register and immediate alternatives.
24794         Add LIW attributes.
24795         (subsi3): Likewise.
24796         (cmpsi): Likewise.
24797         (aslsi3): Likewise.
24798         (lshrsi3): Likewise.
24799         (ashrsi3): Likewise.
24800         (liw): New pattern.
24801         * config/mn10300/mn10300.c (liw_op_names): New
24802         (mn10300_print_operand): Handle 'W' operand descriptor.
24803         (extract_bundle): New function.
24804         (check_liw_constraints): New function.
24805         (liw_candidate): New function.
24806         (mn10300_bundle_liw): New function.
24807         (mn10300_reorg): New function.
24808         (TARGET_MACHINE_DEPENDENT_REORG): Define.
24809         (TARGET_DEFAULT_TARGET_FLAGS): Add MASK_ALLOW_LIW.
24810         * config/mn10300/mn10300.h (TARGET_CPU_CPP_BUILTINS): Define
24811         __LIW__ or __NO_LIW__.
24812         * doc/invoke.texi: Describe the -mliw command line option.
24813
24814 2011-02-07  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
24815
24816         * config.gcc (hppa[12]*-*-hpux11*): Don't set extra_parts.
24817         * config/pa/stublib.c (pthread_default_stacksize_np, pthread_mutex_lock,
24818         pthread_mutex_unlock): Remove.
24819         * config/pa/t-pa-hpux11: Remove rules to build pthread stubs.
24820         * config/pa/t-pa64: Likewise.
24821         * config/pa/pa64-hpux.h (LIB_SPEC): In static links, link against
24822         shared libc if not linking against libpthread.
24823         * config/pa/pa-hpux11.h (LIB_SPEC): Likewise.
24824
24825 2011-02-07  Iain Sandoe  <iains@gcc.gnu.org>
24826
24827         PR target/47558
24828         * config/darwin10.h (LINK_GCC_C_SEQUENCE_SPEC): Put -lSystem first
24829         on 10.6 and later to ensure that we always use the unwinder from
24830         the system.  Only add -no_compact_unwind when tarteting darwin
24831         10.6 or later.
24832
24833 2011-02-07  Steve Ellcey  <sje@cup.hp.com>
24834
24835         PR target/46997
24836         * vect.md (vec_interleave_highv2sf): Change fmix for TARGET_BIG_ENDIAN.
24837         (vec_interleave_lowv2sf): Ditto.
24838         (vec_extract_evenv2sf): Add TARGET_BIG_ENDIAN check.
24839         (vec_extract_oddv2sf): Ditto.
24840
24841 2011-02-07  Mike Stump  <mikestump@comcast.net>
24842
24843         PR target/42333
24844         Add __ieee_divdc3 entry point.
24845         * config/i386/darwin.h (DECLARE_LIBRARY_RENAMES): Retain ___divdc3
24846         entry point.
24847         (SUBTARGET_INIT_BUILTINS): Call darwin_rename_builtins.
24848         * config/i386/i386.c (TARGET_INIT_LIBFUNCS): Likewise.
24849         * config/darwin.c (darwin_rename_builtins): Add.
24850         * config/darwin-protos.h (darwin_rename_builtins): Add.
24851
24852 2011-02-07  Michael Meissner  <meissner@linux.vnet.ibm.com>
24853
24854         PR target/47636
24855         * config/rs6000/rs6000.md (rsqrt<mode>2): Use the correct macro
24856         for the condition.
24857
24858 2011-02-07  Mike Stump  <mikestump@comcast.net>
24859
24860         * config/darwin.opt (mmacosx-version-min): Update default OS version.
24861
24862 2011-02-07  Denis Chertykov  <chertykov@gmail.com>
24863
24864         PR target/47534
24865         * config/avr/libgcc.S (exit): Move .endfunc
24866
24867 2011-02-07  Richard Guenther  <rguenther@suse.de>
24868
24869         PR tree-optimization/47615
24870         * tree-ssa-sccvn.h (run_scc_vn): Take a vn-walk mode argument.
24871         * tree-ssa-sccvn.c (default_vn_walk_kind): New global.
24872         (run_scc_vn): Initialize it.
24873         (visit_reference_op_load): Use it.
24874         * tree-ssa-pre.c (execute_pre): Use VN_WALK if in PRE.
24875
24876 2011-02-07  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
24877
24878         * config/spu/spu.c (spu_init_libfuncs): Install SImode and
24879         DImode trapping arithmetic libfuncs.
24880
24881 2011-02-07  Richard Guenther  <rguenther@suse.de>
24882
24883         PR tree-optimization/47621
24884         * tree-ssa.c (non_rewritable_lvalue_p): New function, split out from
24885         two duplicates ...
24886         (execute_update_addresses_taken): ... here.  Make it more
24887         conservative in what we accept.
24888
24889 2011-02-06  Joseph Myers  <joseph@codesourcery.com>
24890
24891         * config/sparc/freebsd.h (ASM_SPEC): Define.
24892         * config/sparc/vxworks.h (ASM_SPEC): Define.
24893
24894 2011-02-06  Joseph Myers  <joseph@codesourcery.com>
24895
24896         * config/sparc/sol2-bi.h (CC1_SPEC): Remove %{sun4:} %{target:}.
24897
24898 2011-02-06  Steven Bosscher  <steven@gcc.gnu.org>
24899
24900         * doc/invoke.texi: Remove reference to compiler internals from
24901         user documentation.
24902
24903         * reg-notes.def: Remove REG_VALUE_PROFILE.
24904         * combine.c (distribute_notes): Do not handle REG_VALUE_PROFILE.
24905
24906 2011-02-05  Jakub Jelinek  <jakub@redhat.com>
24907
24908         PR middle-end/47610
24909         * varasm.c (default_section_type_flags): If decl is NULL,
24910         and name is .data.rel.ro or .data.rel.ro.local, set SECTION_RELRO bit.
24911
24912 2011-02-05  Jie Zhang  <jie@codesourcery.com>
24913
24914         PR debug/42631
24915         * web.c (entry_register): Don't clobber the number of the
24916         first uninitialized reference in used[].
24917
24918 2011-02-04  Sebastian Pop  <sebastian.pop@amd.com>
24919
24920         PR tree-optimization/46194
24921         * tree-data-ref.c (analyze_miv_subscript): Remove comment.
24922         (build_classic_dist_vector_1): Do not represent classic distance
24923         vectors when the access functions are variating in different loops.
24924
24925 2011-02-04  Joseph Myers  <joseph@codesourcery.com>
24926
24927         * config/mips/iris6.opt: New.
24928         * config.gcc (mips-sgi-irix6.5*): Use mips/iris6.opt.
24929
24930 2011-02-04  Richard Henderson  <rth@redhat.com>
24931             Steve Ellcey  <sje@cup.hp.com>
24932
24933         PR target/46997
24934         * config/ia64/predicates.md (mux1_brcst_element): New.
24935         * config/ia64/ia64-protos.h (ia64_unpack_assemble): New.
24936         * config/ia64/ia64.c (ia64_unpack_assemble): New.
24937         (ia64_unpack_sign): New.
24938         (ia64_expand_unpack): Rewrite using new routines.
24939         (ia64_expand_widen_sum): Ditto.
24940         (ia64_expand_dot_prod_v8qi): Ditto.
24941         * config/ia64/vect.md (mulv8qi3): Rewrite to use new
24942         routines, add endian check.
24943         (pmpy2_even): Rename from pmpy2_r, add endian check.
24944         (pmpy2_odd): Rename from pmpy2_l, add endian check.
24945         (vec_widen_smult_lo_v4hi): Rewrite using new routines.
24946         (vec_widen_smult_hi_v4hi): Ditto.
24947         (vec_widen_umult_lo_v4hi): Ditto.
24948         (vec_widen_umult_hi_v4hi): Ditto.
24949         (mulv2si3): Change endian checks.
24950         (sdot_prodv4hi): Rewrite with new calls.
24951         (udot_prodv4hi): New.
24952         (vec_pack_ssat_v4hi): Add endian check.
24953         (vec_pack_usat_v4hi): Ditto.
24954         (vec_pack_ssat_v2si): Ditto.
24955         (max1_even): Rename from max1_r, add endian check.
24956         (max1_odd): Rename from max1_l, add endian check.
24957         (*mux1_rev): Format change.
24958         (*mux1_mix): Ditto.
24959         (*mux1_shuf): Ditto.
24960         (*mux1_alt): Ditto.
24961         (*mux1_brcst_v8qi): Use new predicate.
24962         (vec_extract_evenv8qi): Remove endian check.
24963         (vec_extract_oddv8qi): Ditto.
24964         (vec_interleave_lowv4hi): Format change.
24965         (vec_interleave_highv4hi): Ditto.
24966         (mix2_even): Rename from mix2_r, add endian check.
24967         (mix2_odd): Rename from mux2_l, add endian check.
24968         (*mux2): Fix mask setting for TARGET_BIG_ENDIAN.
24969         (vec_extract_evenodd_helper): Format change.
24970         (vec_extract_evenv4hi): Remove endian check.
24971         (vec_extract_oddv4hi): Remove endian check.
24972         (vec_interleave_lowv2si): Format change.
24973         (vec_interleave_highv2si): Format change.
24974         (vec_initv2si): Remove endian check.
24975         (vecinit_v2si): Add endian check.
24976         (reduc_splus_v2sf): Add endian check.
24977         (reduc_smax_v2sf): Ditto.
24978         (reduc_smin_v2sf): Ditto.
24979         (vec_initv2sf): Remove endian check.
24980         (fpack): Add endian check.
24981         (fswap): Add endian check.
24982         (vec_interleave_highv2sf): Add endian check.
24983         (vec_interleave_lowv2sf): Add endian check.
24984         (fmix_lr): Add endian check.
24985         (vec_setv2sf): Format change.
24986         (*vec_extractv2sf_0_be): Use shift to extract operand.
24987         (*vec_extractv2sf_1_be): New.
24988         (vec_pack_trunc_v4hi): Add endian check.
24989         (vec_pack_trunc_v2si): Format change.
24990
24991 2011-02-04  Jakub Jelinek  <jakub@redhat.com>
24992
24993         PR inline-asm/23200
24994         * tree-ssa-ter.c (is_replaceable_p): Add TER argument.  Don't
24995         do bb, locus and block comparison and disallow loads if it is not set.
24996         (stmt_is_replaceable_p): New function.
24997         (process_replaceable, find_replaceable_in_bb): Adjust is_replaceable_p
24998         callers.
24999         * expr.c (expand_expr_real_1) <case SSA_NAME>: If
25000         get_gimple_for_ssa_name try for EXPAND_INITIALIZER harder to use
25001         SSA_NAME_DEF_STMT.
25002         * tree-flow.h (stmt_is_replaceable_p): New prototype.
25003
25004 2011-02-04  Joseph Myers  <joseph@codesourcery.com>
25005
25006         * config/rs6000/xilinx.opt: New.
25007         * config.gcc (powerpc-xilinx-eabi*): Use rs6000/xilinx.opt.
25008
25009 2011-02-04  Joseph Myers  <joseph@codesourcery.com>
25010
25011         * config/mips/mips.opt (EB, EL, noasmopt): New Driver options.
25012
25013 2011-02-03  Anatoly Sokolov  <aesok@post.ru>
25014
25015         * config/xtensa/xtensa.h (PREFERRED_RELOAD_CLASS,
25016         PREFERRED_OUTPUT_RELOAD_CLASS): Remove.
25017         * config/xtensa/xtensa-protos.h (xtensa_preferred_reload_class,
25018         secondary_reload_info, xtensa_secondary_reload): Remove.
25019         * config/xtensa/xtensa.c (TARGET_PREFERRED_RELOAD_CLASS,
25020         TARGET_PREFERRED_OUTPUT_RELOAD_CLASS): Define.
25021         (xtensa_preferred_reload_class): Make static. Change return and
25022         'rclass' argument type to reg_class_t. Remove 'isoutput' argument.
25023         Use CONST_DOUBLE_P predicate.
25024         (xtensa_preferred_output_reload_class): New function.
25025         (xtensa_secondary_reload): Make static.
25026
25027 2011-02-03  Joseph Myers  <joseph@codesourcery.com>
25028
25029         * config/microblaze/microblaze.opt (Zxl-mode-bootstrap,
25030         Zxl-mode-executable, Zxl-mode-novectors, Zxl-mode-xilkernel,
25031         Zxl-mode-xmdstub, mxl-mode-xilkernel): New Driver options.
25032
25033 2011-02-03  Jakub Jelinek  <jakub@redhat.com>
25034
25035         PR middle-end/31490
25036         * output.h (SECTION_RELRO): Define.
25037         (SECTION_MACH_DEP): Adjust.
25038         (get_variable_section): New prototype.
25039         * varpool.c (varpool_finalize_named_section_flags): New function.
25040         (varpool_assemble_pending_decls): Call it.
25041         * cgraph.h (varpool_finalize_named_section_flags): New prototype.
25042         * cgraphunit.c (cgraph_output_in_order): Call
25043         varpool_finalize_named_section_flags.
25044         * varasm.c (get_section): Allow section flags conflicts between
25045         relro and read-only sections if the section hasn't been declared yet.
25046         Set SECTION_OVERRIDE after diagnosing section type conflict.
25047         (get_variable_section): No longer static.
25048         (default_section_type_flags): Use SECTION_WRITE | SECTION_RELRO for
25049         readonly sections that need relocations.
25050         (decl_readonly_section_1): New function.
25051         (decl_readonly_section): Use it.
25052
25053         Revert:
25054         2010-11-17  Dinar Temirbulatov  <dtemirbulatov@gmail.com>
25055                     Steve Ellcey  <sje@cup.hp.com>
25056
25057         PR middle-end/31490
25058         * varasm.c (categorize_decl_for_section): Ignore reloc_rw_mask
25059         if section attribute used.
25060
25061 2011-02-03  Jakub Jelinek  <jakub@redhat.com>
25062
25063         * config/darwin.h (SECTION_NO_ANCHOR): Remove.
25064         * config/darwin.c (SECTION_NO_ANCHOR): Define.
25065         (darwin_init_sections): Remove assertion.
25066
25067 2011-02-03  Nick Clifton  <nickc@redhat.com>
25068
25069         * config/rx/predicates.md (rx_zs_comparison_operator): Remove
25070         lt and ge.
25071         * config/rx/rx.md (abssi2_flags): Use CC_ZSmode rather than CC_ZSOmode.
25072         * config/rx/rx.c (rx_print_operand): Use "lt" and "ge" suffixes
25073         instead of "n" and "pz".
25074         (flags_from_code): LT and GE tests need CC_FLAG_O as well as
25075         CC_FLAG_S.
25076
25077 2011-02-03  Jakub Jelinek  <jakub@redhat.com>
25078
25079         PR target/47312
25080         * expr.c (expand_expr_real_2) <case FMA_EXPR>: If target doesn't expand
25081         fma, expand FMA_EXPR as fma{,f,l} call.
25082
25083         PR lto/47274
25084         * lto-streamer-out.c (write_symbol): When writing kind and visibility,
25085         copy them into a unsigned char variable and pass address of it to
25086         lto_output_data_stream.
25087
25088         PR target/47564
25089         * toplev.c (target_reinit): Save and restore *crtl and regno_reg_rtx
25090         around backend_init_target and lang_dependent_init_target calls.
25091         * cgraphunit.c (cgraph_debug_gimple_stmt): New function.
25092         (verify_cgraph_node): Don't call set_cfun here.  Use
25093         cgraph_debug_gimple_stmt instead of debug_gimple_stmt.
25094         Set error_found for incorrectly represented calls to thunks.
25095
25096 2011-02-03  Alexandre Oliva  <aoliva@redhat.com>
25097
25098         PR debug/43092
25099         PR rtl-optimization/43494
25100         * rtl.h (for_each_inc_dec_fn): New type.
25101         (for_each_inc_dec): Declare.
25102         * rtlanal.c (struct for_each_inc_dec_ops): New type.
25103         (for_each_inc_dec_find_inc_dec): New fn.
25104         (for_each_inc_dec_find_mem): New fn.
25105         (for_each_inc_dec): New fn.
25106         * dse.c (struct insn_size): Remove.
25107         (replace_inc_dec, replace_inc_dec_mem): Remove.
25108         (emit_inc_dec_insn_before): New fn.
25109         (check_for_inc_dec): Use it, along with for_each_inc_dec.
25110         (canon_address): Pass mem modes to cselib_lookup.
25111         * cselib.h (cselib_lookup): Add memmode argument.  Adjust callers.
25112         (cselib_lookup_from_insn): Likewise.
25113         (cselib_subst_to_values): Likewise.
25114         * cselib.c (find_slot_memmode): New var.
25115         (cselib_find_slot): New fn.  Use it instead of
25116         htab_find_slot_with_hash everywhere.
25117         (entry_and_rtx_equal_p): Use find_slot_memmode.
25118         (autoinc_split): New fn.
25119         (rtx_equal_for_cselib_p): Rename and implement in terms of...
25120         (rtx_equal_for_cselib_1): ... this.  Take memmode, pass it on.
25121         Deal with autoinc.  Special-case recursion into MEMs.
25122         (cselib_hash_rtx): Likewise.
25123         (cselib_lookup_mem): Infer pmode from address mode.  Distinguish
25124         address and MEM modes.
25125         (cselib_subst_to_values): Add memmode, pass it on.
25126         Deal with autoinc.
25127         (cselib_lookup): Add memmode argument, pass it on.
25128         (cselib_lookup_from_insn): Add memmode.
25129         (cselib_invalidate_rtx): Discard obsolete push_operand handling.
25130         (struct cselib_record_autoinc_data): New.
25131         (cselib_record_autoinc_cb): New fn.
25132         (cselib_record_sets): Use it, along with for_each_inc_dec.  Pass MEM
25133         mode to cselib_lookup.  Reset autoinced REGs here instead of...
25134         (cselib_process_insn): ... here.
25135         * var-tracking.c (replace_expr_with_values, use_type): Pass MEM mode
25136         to cselib_lookup.
25137         (add_uses): Likewise, also to cselib_subst_to_values.
25138         (add_stores): Likewise.
25139         * sched-deps.c (add_insn_mem_dependence): Pass mode to
25140         cselib_subst_to_values.
25141         (sched_analyze_1, sched_analyze_2): Likewise.  Adjusted.
25142         * gcse.c (do_local_cprop): Adjusted.
25143         * postreload.c (reload_cse_simplify_set): Adjusted.
25144         (reload_cse_simplify_operands): Adjusted.
25145         * sel-sched-dump (debug_mem_addr_value): Pass mode.
25146
25147 2011-02-03  Alexandre Oliva  <aoliva@redhat.com>
25148
25149         PR tree-optimization/45122
25150         * tree-ssa-loop-niter.c (number_of_iterations_exit): Don't make
25151         unsafe assumptions when there's more than one loop exit.
25152
25153 2011-02-02  Michael Meissner  <meissner@linux.vnet.ibm.com>
25154
25155         PR target/47272
25156         * doc/extend.texi (PowerPC AltiVec/VSX Built-in Functions):
25157         Document using vector double with the load/store builtins, and
25158         that the load/store builtins always use Altivec instructions.
25159
25160         * config/rs6000/vector.md (vector_altivec_load_<mode>): New insns
25161         to use altivec memory instructions, even on VSX.
25162         (vector_altivec_store_<mode>): Ditto.
25163
25164         * config/rs6000/rs6000-protos.h (rs6000_address_for_altivec): New
25165         function.
25166
25167         * config/rs6000/rs6000-c.c (altivec_overloaded_builtins): Add
25168         V2DF, V2DI support to load/store overloaded builtins.
25169
25170         * config/rs6000/rs6000-builtin.def (ALTIVEC_BUILTIN_*): Add
25171         altivec load/store builtins for V2DF/V2DI types.
25172
25173         * config/rs6000/rs6000.c (rs6000_option_override_internal): Don't
25174         set avoid indexed addresses on power6 if -maltivec.
25175         (altivec_expand_ld_builtin): Add V2DF, V2DI support, use
25176         vector_altivec_load/vector_altivec_store builtins.
25177         (altivec_expand_st_builtin): Ditto.
25178         (altivec_expand_builtin): Add VSX memory builtins.
25179         (rs6000_init_builtins): Add V2DI types to internal types.
25180         (altivec_init_builtins): Add support for V2DF/V2DI altivec
25181         load/store builtins.
25182         (rs6000_address_for_altivec): Insure memory address is appropriate
25183         for Altivec.
25184
25185         * config/rs6000/vsx.md (vsx_load_<mode>): New expanders for
25186         vec_vsx_ld and vec_vsx_st.
25187         (vsx_store_<mode>): Ditto.
25188
25189         * config/rs6000/rs6000.h (RS6000_BTI_long_long): New type
25190         variables to hold long long types for VSX vector memory builtins.
25191         (RS6000_BTI_unsigned_long_long): Ditto.
25192         (long_long_integer_type_internal_node): Ditti.
25193         (long_long_unsigned_type_internal_node): Ditti.
25194
25195         * config/rs6000/altivec.md (UNSPEC_LVX): New UNSPEC.
25196         (altivec_lvx_<mode>): Make altivec_lvx use a mode iterator.
25197         (altivec_stvx_<mode>): Make altivec_stvx use a mode iterator.
25198
25199         * config/rs6000/altivec.h (vec_vsx_ld): Define VSX memory builtin
25200         short cuts.
25201         (vec_vsx_st): Ditto.
25202
25203 2011-02-02  Joseph Myers  <joseph@codesourcery.com>
25204
25205         * config/pa/pa-hpux10.opt: New.
25206         * config/hpux11.opt (pthread): New Driver option.
25207         * config/pa/pa-hpux.opt (nolibdld, rdynamic): New Driver options.
25208         * config.gcc (hppa[12]*-*-hpux10*): Use pa/pa-hpux10.opt.
25209
25210 2011-02-02  Joseph Myers  <joseph@codesourcery.com>
25211
25212         * config/ia64/vms.opt: New.
25213         * config.gcc (ia64-hp-*vms*): Use ia64/vms.opt.
25214
25215 2011-02-01  Michael Meissner  <meissner@linux.vnet.ibm.com>
25216
25217         PR target/47580
25218         * config/rs6000/vsx.md (vsx_float<VSi><mode>2): Use
25219         gpc_reg_operand instead of vsx_register_operand to match rs6000.md
25220         generator functions.
25221         (vsx_floatuns<VSi><mode>2): Ditto.
25222         (vsx_fix_trunc<mode><VSi>2): Ditto.
25223         (vsx_fixuns_trunc<mode><VSi>2): Ditto.
25224
25225 2011-02-02  Joseph Myers  <joseph@codesourcery.com>
25226
25227         * config/i386/djgpp.opt (posix): New Driver option.
25228
25229 2011-02-02  Gerald Pfeifer  <gerald@pfeifer.com>
25230
25231         * config.gcc (*-*-freebsd[12], *-*-freebsd[12].*, *-*-freebsd*aout*):
25232         Move to the unsupported targets list.
25233
25234 2011-02-02  Peter Bergner  <bergner@vnet.ibm.com>
25235
25236         PR rtl-optimization/47525
25237         * df-scan.c: Update copyright years.
25238         (df_get_call_refs): Do not mark global registers as DF_REF_REG_USE
25239         and non-clobber DF_REF_REG_DEF for calls to const and pure functions.
25240
25241 2011-02-02  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
25242
25243         * config/i386/sysv4.h (TARGET_VERSION): Remove.
25244         (SUBTARGET_RETURN_IN_MEMORY): Remove.
25245         (ASM_OUTPUT_ASCII): Remove.
25246         * config/i386/sol2.h (SUBTARGET_RETURN_IN_MEMORY): Remove #undef.
25247
25248 2011-02-02  Jeff Law  <law@redhat.com>
25249
25250         PR middle-end/47543
25251         * reload.c (find_reloads_address): Handle reg+d address where both
25252         components are invalid by reloading the entire address.
25253
25254 2011-02-02  Sebastian Pop  <sebastian.pop@amd.com>
25255             Richard Guenther  <rguenther@suse.de>
25256
25257         PR tree-optimization/40979
25258         PR bootstrap/47044
25259         * passes.c (init_optimization_passes): After LIM call copy_prop
25260         and DCE to clean up.
25261         * tree-ssa-loop.c (pass_graphite_transforms): Add TODO_dump_func.
25262
25263 2011-02-02  Sebastian Pop  <sebastian.pop@amd.com>
25264
25265         PR tree-optimization/47576
25266         PR tree-optimization/47555
25267         * doc/invoke.texi (scev-max-expr-complexity): Documented.
25268         * params.def (PARAM_SCEV_MAX_EXPR_SIZE): Bump the value to 100.
25269         (PARAM_SCEV_MAX_EXPR_COMPLEXITY): Declared.
25270         * tree-scalar-evolution.c (follow_ssa_edge): Use
25271         PARAM_SCEV_MAX_EXPR_COMPLEXITY.
25272
25273 2011-02-02  Richard Guenther  <rguenther@suse.de>
25274
25275         PR tree-optimization/47566
25276         * builtins.c (builtin_save_expr): No SAVE_EXPR for SSA_NAMEs.
25277
25278 2011-02-02  Alexandre Oliva  <aoliva@redhat.com>
25279
25280         PR debug/47106
25281         PR debug/47402
25282         * tree-inline.c (declare_return_variable): Remove unused caller
25283         variable.
25284
25285         PR debug/47106
25286         PR debug/47402
25287         * tree-flow-inline.h (clear_is_used, is_used_p): New.
25288         * cfgexpand.c (account_used_vars_for_block): Use them.
25289         * tree-nrv.c (tree_nrv): Likewise.
25290         * tree-ssa-live.c (remove_unused_scope_block_p): Likewise.
25291         (dump_scope_block): Likewise.
25292         (remove_unused_locals): Likewise.
25293
25294         PR debug/47106
25295         PR debug/47402
25296         * tree-inline.c (declare_return_variable): Add result decl to
25297         local decls only once.
25298         * gimple-low.c (record_vars_into): Mark newly-created variables
25299         as referenced.
25300
25301 2011-02-02  Alexandre Oliva  <aoliva@redhat.com>
25302
25303         PR debug/47498
25304         PR debug/47501
25305         PR debug/45136
25306         PR debug/45130
25307         * haifa-sched.c (get_ebb_head_tail): Move notes across boundary
25308         debug insns.
25309         (no_real_insns_p, schedule_block, set_priorities): Drop special
25310         treatment of boundary debug insns.
25311         * sched-deps.c (sd_init_insn, sd_finish_insn): Don't mark debug insns.
25312         * sched-ebb.c (schedule_ebbs): Adjust skipping of debug insns.
25313         * sched-int.h (DEBUG_INSN_SCHED_P): Remove.
25314         (BOUNDARY_DEBUG_INSN_P): Likewise.
25315         (SCHEDULE_DEBUG_INSN_P): Likewise.
25316         * sched-rgn.c (init_ready_list): Drop special treatment of
25317         boundary debug insns.
25318         * final.c (rest_of_clean_state): Clear notes' BB.
25319
25320 2011-02-01  Joseph Myers  <joseph@codesourcery.com>
25321
25322         * config/openbsd.opt (assert=): New Driver option.
25323
25324 2011-02-01  Joseph Myers  <joseph@codesourcery.com>
25325
25326         * config/i386/nto.opt: New.
25327         * config.gcc (i[34567]86-*-nto-qnx*): Use i386/nto.opt.
25328
25329 2011-02-01  Joseph Myers  <joseph@codesourcery.com>
25330
25331         * config/i386/netware.opt: New.
25332         * config.gcc (i[3456x]86-*-netware*): Use i386/netware.opt.
25333
25334 2011-02-01  Joseph Myers  <joseph@codesourcery.com>
25335
25336         * config/interix.opt (posix): New Driver option.
25337
25338 2011-02-01  DJ Delorie  <dj@redhat.com>
25339
25340         * config/m32c/m32c.h (PTRDIFF_TYPE): Remove extra definition.
25341
25342         * config/m32c/m32c.c (m32c_regno_reg_class): Return smallest reg
25343         class for A0/A1.
25344
25345 2011-02-01  Sebastian Pop  <sebastian.pop@amd.com>
25346
25347         PR tree-optimization/47561
25348         * toplev.c (process_options): Print the Graphite flags.  Add
25349         flag_loop_flatten to the list of options requiring Graphite.
25350
25351 2011-02-01  Joseph Myers  <joseph@codesourcery.com>
25352
25353         * config/i386/cygming.opt (posix): New Driver option.
25354
25355 2011-02-01  Joseph Myers  <joseph@codesourcery.com>
25356
25357         * config/arm/vxworks.opt: New.
25358         * config.gcc (arm-wrs-vxworks): Use arm/vxworks.opt.
25359
25360 2011-02-01  Joseph Myers  <joseph@codesourcery.com>
25361
25362         * config/alpha/elf.opt: New.
25363         * config.gcc (alpha*-*-linux*, alpha*-*-gnu*, alpha*-*-freebsd*,
25364         alpha*-*-netbsd*, alpha*-*-openbsd*): Use alpha/elf.opt.
25365
25366 2011-02-01  Richard Guenther  <rguenther@suse.de>
25367
25368         PR tree-optimization/47559
25369         * tree-ssa-loop-im.c (can_sm_ref_p): Do not perform
25370         store-motion on references that can throw.
25371
25372 2011-02-01  Bernd Schmidt  <bernds@codesourcery.com>
25373
25374         * tree-dump.c (dump_option_value_info): Add entry for TDF_CSELIB.
25375         * tree-pass.h (TDF_CSELIB): New macro.
25376         * cselib.c (new_cselib_val, expand_loc, cselib_expand_value_rtx_1,
25377         cselib_lookup): Check for it rather than for TDF_DETAILS.
25378
25379 2011-02-01  H.J. Lu  <hongjiu.lu@intel.com>
25380
25381         PR driver/47547
25382         * lto-wrapper.c (run_gcc): Don't add -dumpdir if linker_output
25383         is HOST_BIT_BUCKET.
25384
25385         * opts.c (finish_options): Don't add x_aux_base_name if it is
25386         HOST_BIT_BUCKET.
25387
25388 2011-02-01  Richard Guenther  <rguenther@suse.de>
25389
25390         PR tree-optimization/47555
25391         Revert
25392         2010-07-15  Sebastian Pop  <sebastian.pop@amd.com>
25393
25394         * params.def (PARAM_SCEV_MAX_EXPR_SIZE): Bump the value to 100.
25395
25396 2011-02-01  Sebastien Bourdeauducq  <sebastien@milkymist.org>
25397
25398         PR gcc/46692
25399         * config/lm32/t-lm32: Add multilib for all CPU options.
25400
25401 2011-02-01  Richard Guenther  <rguenther@suse.de>
25402
25403         PR tree-optimization/47541
25404         * tree-ssa-structalias.c (push_fields_onto_fieldstack): Make
25405         sure to have a field at offset zero.
25406
25407 2011-01-31  Joseph Myers  <joseph@codesourcery.com>
25408
25409         * config/arc/arc.opt (EB, EL): New Driver options.
25410
25411 2011-01-31  Joseph Myers  <joseph@codesourcery.com>
25412
25413         * config/alpha/osf5.opt: New.
25414         * config.gcc (alpha*-dec-osf5.1*): Use alpha/osf5.opt.
25415
25416 2011-01-31  Joseph Myers  <joseph@codesourcery.com>
25417
25418         * config/vms/vms.opt (map, mvms-return-codes): New Driver options.
25419
25420 2011-01-31  Sebastian Pop  <sebastian.pop@amd.com>
25421
25422         * common.opt (ftree-loop-linear): Use Alias to make it an alias of
25423         -floop-interchange.
25424         * invoke.texi (-ftree-loop-linear): Make it clear that this flag
25425         is an alias of -floop-interchange and that it requires the
25426         Graphite infrastructure.
25427         * tree-ssa-loop.c (gate_graphite_transforms): Do not set
25428         flag_loop_interchange based on the value of flag_tree_loop_linear.
25429
25430 2011-01-31  Jakub Jelinek  <jakub@redhat.com>
25431             Richard Guenther  <rguenther@suse.de>
25432
25433         PR tree-optimization/47538
25434         * tree-ssa-ccp.c (bit_value_binop_1): For uns computation use
25435         type instead of r1type, except for comparisons.  For right
25436         shifts and comparisons punt if there are mismatches in
25437         sizetype vs. non-sizetype types.
25438
25439 2011-01-31  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
25440
25441         * doc/sourcebuild.texi (Effective-Target Keywords): Document
25442         avx_runtime.
25443
25444 2011-01-31  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
25445
25446         * configure.ac (gcc_cv_ld_eh_frame_hdr): Update minimal Sun ld
25447         version number.
25448         * configure: Regenerate.
25449
25450 2011-01-31  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
25451
25452         * configure.ac (gcc_cv_ld_static_option): Define.
25453         (gcc_cv_ld_dynamic_option): Define.
25454         (gcc_cv_ld_static_dynamic): Tru64 UNIX support -noso/-so_archive
25455         instead.
25456         (HAVE_LD_STATIC_DYNAMIC): Update message.
25457         (LD_STATIC_OPTION): Define.
25458         (LD_DYNAMIC_OPTION): Define.
25459         * configure: Regenerate.
25460         * config.in: Regenerate.
25461         * gcc.c (init_spec) [USE_LIBUNWIND_EXCEPTIONS &&
25462         HAVE_LD_STATIC_DYNAMIC]: Use them.
25463
25464 2011-01-31  Nick Clifton  <nickc@redhat.com>
25465
25466         * config/rx/rx.c (rx_get_stack_layout): Only save call clobbered
25467         registers inside interrupt handlers if the handler is not a leaf
25468         function.
25469
25470 2011-01-31  Nick Clifton  <nickc@redhat.com>
25471
25472         * config/mn10300/mn10300.c (mn10300_regno_in_class_p): Check for
25473         reg_renumber returning an INVALID_REGNUM.
25474
25475 2011-01-31  Alexandre Oliva  <aoliva@redhat.com>
25476
25477         PR libgcj/44341
25478         * doc/install.texi: Document host options discarded when cross
25479         configuring target libraries.
25480
25481 2011-01-31  Alexandre Oliva  <aoliva@redhat.com>
25482
25483         Reverted:
25484         2011-01-25  Alexandre Oliva  <aoliva@redhat.com>
25485         PR debug/45136
25486         PR debug/45130
25487         * haifa-sched.c (get_ebb_head_tail): Move notes across boundary
25488         debug insns.
25489         (no_real_insns_p, schedule_block, set_priorities): Drop special
25490         treatment of boundary debug insns.
25491         * sched-deps.c (sd_init_insn, sd_finish_insn): Don't mark debug insns.
25492         * sched-ebb.c (schedule_ebbs): Don't skip debug insns.
25493         * sched-int.h (DEBUG_INSN_SCHED_P): Remove.
25494         (BOUNDARY_DEBUG_INSN_P): Likewise.
25495         (SCHEDULE_DEBUG_INSN_P): Likewise.
25496         * sched-rgn.c (init_ready_list): Drop special treatment of
25497         boundary debug insns.
25498         * final.c (rest_of_clean-state): Clear notes' BB.
25499
25500 2011-01-31  Alan Modra  <amodra@gmail.com>
25501
25502         * config/rs6000/rs6000.c (print_operand): Rearrange addends in
25503         toc relative expressions as we do in print_operand_address.
25504
25505 2011-01-30  Kazu Hirata  <kazu@codesourcery.com>
25506
25507         * doc/extend.texi: Follow spelling conventions.
25508         * doc/invoke.texi: Fix a typo.
25509
25510 2011-01-30  Joseph Myers  <joseph@codesourcery.com>
25511
25512         * config/hpux11.opt: New.
25513         * config.gcc (hppa*64*-*-hpux11*, hppa[12]*-*-hpux11*,
25514         ia64*-*-hpux*): Use hpux11.opt.
25515
25516 2011-01-30  Jonathan Yong  <jon_y@users.sourceforge.net>
25517
25518         * config.gcc (i[34567]86-*-pe | i[34567]86-*-cygwin*): Add t-dfprules
25519         to tmake_file.
25520
25521 2011-01-30  Gerald Pfeifer  <gerald@pfeifer.com>
25522
25523         * doc/install.texi (hppa-hp-hpux10): Remove references to HP
25524         support sites.
25525
25526 2011-01-30  Gerald Pfeifer  <gerald@pfeifer.com>
25527
25528         * doc/install.texi (Binaries): Remove outdated reference for
25529         Motorola 68HC11/68HC12 downloads.
25530
25531 2011-01-30  Gerald Pfeifer  <gerald@pfeifer.com>
25532
25533         * doc/extend.texi (Thread-Local): Adjust reference to Ulrich
25534         Drepper's paper.
25535
25536 2011-01-29  Jonathan Wakely  <jwakely.gcc@gmail.com>
25537
25538         PR bootstrap/47147
25539         * ginclude/stddef.h: Check for _X86_64_ANSI_H_ and _I386_ANSI_H_ as
25540         used by NetBSD.
25541
25542 2011-01-28  Ahmad Sharif  <asharif@google.com>
25543
25544         * value-prof.c (check_counter): Corrected error message.
25545
25546 2011-01-29  Jie Zhang  <jie@codesourcery.com>
25547
25548         * config/arm/arm.c (arm_legitimize_reload_address): New.
25549         * config/arm/arm.h (ARM_LEGITIMIZE_RELOAD_ADDRESS): Use
25550         arm_legitimize_reload_address.
25551         * config/arm/arm-protos.h (arm_legitimize_reload_address): Declare.
25552
25553 2011-01-28  Ian Lance Taylor  <iant@google.com>
25554
25555         * godump.c (go_define): Ignore macros whose definitions include
25556         two adjacent operands.
25557
25558 2011-01-28  Jakub Jelinek  <jakub@redhat.com>
25559
25560         PR target/42894
25561         * varasm.c (force_const_mem): Store copy of x in desc->constant
25562         instead of x itself.
25563         * expr.c (emit_move_insn): Add a copy of y_cst instead of y_cst
25564         itself into REG_EQUAL note.
25565
25566 2011-01-28  Joseph Myers  <joseph@codesourcery.com>
25567
25568         * config/freebsd.opt (posix, rdynamic): New Driver options.
25569
25570 2011-01-28  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
25571
25572         * configure.ac (gcc_cv_ld_static_dynamic): IRIX 6 ld supports
25573         -Bstatic/-Bdynamic.
25574         * configure: Regenerate.
25575
25576 2011-01-27  Joseph Myers  <joseph@codesourcery.com>
25577
25578         * config/rs6000/sysv4.h (LIB_NETBSD_SPEC): Don't handle -profile.
25579         * config/rs6000/vxworks.h (CC1_SPEC): Don't handle -profile.
25580
25581 2011-01-27  Anatoly Sokolov  <aesok@post.ru>
25582
25583         * config/s390/s390.h (PREFERRED_RELOAD_CLASS): Remove.
25584         * config/s390/s390-protos.h (s390_preferred_reload_class): Remove.
25585         * config/s390/s390.c (TARGET_PREFERRED_RELOAD_CLASS): Define.
25586         (s390_preferred_reload_class): Make static. Change return and
25587         'rclass' argument type to reg_class_t.
25588
25589 2011-01-27  Jan Hubicka  <jh@suse.cz>
25590
25591         PR middle-end/46949
25592         * cgraphunit.c (process_common_attributes): Fix use of remove_attribute.
25593         (process_function_and_variable_attributes): Check defined weakrefs.
25594
25595 2011-01-27  Martin Jambor  <mjambor@suse.cz>
25596
25597         PR tree-optimization/47228
25598         * tree-sra.c (sra_modify_assign): Use build_ref_for_model instead of
25599         build_ref_for_offset.
25600
25601 2011-01-27  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
25602
25603         * config/spu/spu-elf.h (ASM_SPEC): Remove.
25604
25605 2011-01-26  Mikael Pettersson  <mikpe@it.uu.se>
25606
25607         PR rtl-optimization/46856
25608         * postreload.c (reload_combine_recognize_const_pattern): Do not
25609         separate cc0 setter and user on cc0 targets.
25610
25611 2011-01-26  Nicola Pero  <nicola.pero@meta-innovation.com>
25612
25613         PR c/43082
25614         * c-typeck.c (c_objc_common_truthvalue_conversion): If we are
25615         passed a VOID_TYPE expression, immediately emit an error and
25616         return error_mark_node.
25617
25618 2011-01-26  Jeff Law  <law@redhat.com>
25619
25620         PR rtl-optimization/47464
25621         * df-problems.c (can_move_insn_across): Use may_trap_or_fault_p
25622         rather than may_trap_p as needed.
25623
25624 2011-01-26  DJ Delorie  <dj@redhat.com>
25625
25626         PR rtl-optimization/46878
25627         * combine.c (insn_a_feeds_b): Check for the implicit cc0
25628         setter/user dependency as well.
25629
25630 2011-01-26  Eric Botcazou  <ebotcazou@adacore.com>
25631
25632         PR rtl-optimization/44469
25633         * cfgcleanup.c (try_optimize_cfg): Iterate in CFG layout mode too
25634         after removing trivially dead basic blocks.
25635
25636 2011-01-26  Joseph Myers  <joseph@codesourcery.com>
25637
25638         * config/bfin/bfin.h (LINK_SPEC): Remove %{Qy:} %{!Qn:-Qy}.
25639         * config/frv/frv.h (LINK_SPEC): Likewise.
25640         * config/i386/netware.h (LINK_SPEC): Likewise.
25641         * config/m68k/linux.h (ASM_SPEC): Likewise.
25642         * config/rs6000/linux64.h (ASM_SPEC_COMMON): Likewise.
25643         * config/rs6000/sysv4.h (LINK_SPEC): Likewise.
25644         * config/rs6000/vxworks.h (ASM_SPEC): Likewise.
25645         * config/sparc/linux.h (ASM_SPEC): Likewise.
25646         * config/sparc/linux64.h (ASM_SPEC): Likewise.
25647         * config/sparc/sp-elf.h (ASM_SPEC): Likewise.
25648
25649 2011-01-26  Joseph Myers  <joseph@codesourcery.com>
25650
25651         * config/bfin/bfin.h (ASM_SPEC): Remove %{Ym,*}.
25652         * config/frv/frv.h (ASM_SPEC): Likewise.
25653         * config/m68k/linux.h (ASM_SPEC): Likewise.
25654         * config/pa/pa-linux.h (ASM_SPEC): Likewise.
25655         * config/rs6000/linux64.h (ASM_SPEC): Likewise.
25656         * config/rs6000/vxworks.h (ASM_SPEC): Likewise.
25657         * config/sparc/linux.h (ASM_SPEC): Likewise.
25658         * config/sparc/linux64.h (ASM_SPEC): Likewise.
25659         * config/sparc/sp-elf.h (ASM_SPEC): Likewise.
25660
25661 2011-01-26  Joseph Myers  <joseph@codesourcery.com>
25662
25663         * config/bfin/bfin.h (LINK_SPEC): Remove %{YP,*}.
25664         * config/frv/frv.h (LINK_SPEC): Likewise.
25665         * config/rs6000/sysv4.h (LINK_SPEC): Likewise.
25666
25667 2011-01-26  Joseph Myers  <joseph@codesourcery.com>
25668
25669         * config/bfin/bfin.h (ASM_SPEC): Remove %{Yd,*}.
25670         * config/frv/frv.h (ASM_SPEC): Likewise.
25671         * config/i386/sol2-10.h (ASM_SPEC): Likewise.
25672         * config/m68k/linux.h (ASM_SPEC): Likewise.
25673         * config/pa/pa-linux.h (ASM_SPEC): Likewise.
25674         * config/rs6000/linux64.h (ASM_SPEC32): Likewise.
25675         * config/rs6000/vxworks.h (ASM_SPEC): Likewise.
25676         * config/sol2.h (ASM_SPEC): Remove comment about -Yd,.
25677         * config/sparc/linux.h (ASM_SPEC): Likewise.
25678         * config/sparc/linux64.h (ASM_SPEC): Likewise.
25679         * config/sparc/sp-elf.h (ASM_SPEC): Likewise.
25680         * config/sparc/sysv4.h (ASM_SPEC): Remove %{Yd,*}.
25681
25682 2011-01-26  Steve Ellcey  <sje@cup.hp.com>
25683
25684         PR target/46997
25685         * config/ia64/vect.md (mulv2si3): Enable and fix for TARGET_BIG_ENDIAN.
25686         (*mux2): Ditto.
25687         (vec_extract_evenodd_help): Ditto.
25688         (vec_extract_evenv4hi): Ditto.
25689         (vec_extract_oddv4hi): Ditto.
25690         (vec_interleave_lowv2si): Ditto.
25691         (vec_interleave_highv2si): Ditto.
25692         (vec_extract_evenv2si): Ditto.
25693         (vec_extract_oddv2si: Ditto.
25694         (vec_pack_trunc_v2si): Ditto.
25695
25696 2011-01-22  Jan Hubicka  <jh@suse.cz>
25697
25698         PR target/47237
25699         * cgraph.h (cgraph_local_info): New field can_change_signature.
25700         * ipa-cp.c (ipcp_update_callgraph): Only compute args_to_skip if callee
25701         signature can change.
25702         (ipcp_estimate_growth): Call sequence simplify only if calle signature
25703         can change.
25704         (ipcp_insert_stage): Only compute args_to_skip if signature can change.
25705         (cgraph_function_versioning): We can not change signature of functions
25706         that don't allow that.
25707         * lto-cgraph.c (lto_output_node): Stream local.can_change_signature.
25708         (lto_input_node): Likewise.
25709         * ipa-inline.c (compute_inline_parameters): Compute
25710         local.can_change_signature.
25711         * ipa-split.c (visit_bb): Never split away APPLY_ARGS.
25712         * tree-sra.c (ipa_sra_preliminary_function_checks): Give up on
25713         functions that can not change signature.
25714         * i386.c (ix86_function_regparm, ix86_function_sseregparm,
25715         init_cumulative_args): Do not use local calling conventions
25716         for functions that can not change signature.
25717
25718 2011-01-22  Jan Hubicka  <jh@suse.cz>
25719
25720         * doc/invoke.texi (hot-bb-frequency-fraction): Commit forgotten hunk.
25721
25722 2011-01-26  Richard Guenther  <rguenther@suse.de>
25723
25724         PR tree-optimization/47190
25725         * cgraphunit.c (process_common_attributes): New function.
25726         (process_function_and_variable_attributes): Use it.
25727
25728 2011-01-26  Richard Guenther  <rguenther@suse.de>
25729
25730         PR lto/47423
25731         * cgraphbuild.c (record_eh_tables): Record reference to personality
25732         function.
25733
25734 2011-01-26  Alexandre Oliva  <aoliva@redhat.com>
25735
25736         PR debug/45454
25737         * sel-sched.c (moveup_expr): Don't let debug insns prevent
25738         non-debug insns from moving up.
25739
25740 2011-01-26  Dave Korn  <dave.korn.cygwin@gmail.com>
25741
25742         PR target/40125
25743         * config.gcc (i[34567]86-*-pe | i[34567]86-*-cygwin*): Select suitable
25744         t-dlldir{,-x} fragment for build and add it to tmake_file.
25745         (i[34567]86-*-mingw* | x86_64-*-mingw*): Likewise.
25746         * Makefile.in (libgcc.mvars): Also export SHLIB_DLLDIR to libgcc.
25747         * config/i386/t-dlldir: New file.
25748         (SHLIB_DLLDIR): Define.
25749         * config/i386/t-dlldir-x: New file.
25750         (SHLIB_DLLDIR): Define.
25751         * config/i386/t-cygming: Error out if SHLIB_DLLDIR is not set.
25752         (SHLIB_INSTALL): Use it.
25753
25754 2011-01-26  Chung-Lin Tang  <cltang@codesourcery.com>
25755
25756         PR target/47246
25757         * config/arm/arm.c (thumb2_legitimate_index_p): Change the
25758         lower bound of the allowed Thumb-2 coprocessor load/store
25759         index range to -256. Add explaining comment.
25760
25761 2011-01-25  Ian Lance Taylor  <iant@google.com>
25762
25763         * godump.c (go_define): Improve lexing of macro expansion to only
25764         accept expressions which match Go spec.
25765
25766 2011-01-26  Dave Korn  <dave.korn.cygwin@gmail.com>
25767
25768         PR c++/43601
25769         * tree.c (handle_dll_attribute): Handle it.
25770         * doc/extend.texi (@item dllexport): Mention it.
25771         * doc/invoke.texi (@item -fno-keep-inline-dllexport): Document it.
25772
25773 2011-01-25  Ian Lance Taylor  <iant@google.com>
25774
25775         PR tree-optimization/26854
25776         * c-decl.c (struct c_scope): Add field has_jump_unsafe_decl.
25777         (decl_jump_unsafe): Move higher in file, with no other change.
25778         (bind): Set has_jump_unsafe_decl if appropriate.
25779         (update_label_decls): Test has_jump_unsafe_decl to avoid loop.
25780         (check_earlier_gotos): Likewise.
25781         (c_check_switch_jump_warnings): Likewise.
25782
25783 2011-01-25  Jonathan Wakely  <jwakely.gcc@gmail.com>
25784
25785         * doc/invoke.texi (Warning Options): Add missing hyphen.
25786         (-fprofile-dir): Minor grammatical fixes.
25787         (-fbranch-probabilities): Likewise.
25788
25789 2011-01-25  Alexandre Oliva  <aoliva@redhat.com>
25790
25791         PR debug/45136
25792         PR debug/45130
25793         * haifa-sched.c (get_ebb_head_tail): Move notes across boundary
25794         debug insns.
25795         (no_real_insns_p, schedule_block, set_priorities): Drop special
25796         treatment of boundary debug insns.
25797         * sched-deps.c (sd_init_insn, sd_finish_insn): Don't mark debug insns.
25798         * sched-ebb.c (schedule_ebbs): Don't skip debug insns.
25799         * sched-int.h (DEBUG_INSN_SCHED_P): Remove.
25800         (BOUNDARY_DEBUG_INSN_P): Likewise.
25801         (SCHEDULE_DEBUG_INSN_P): Likewise.
25802         * sched-rgn.c (init_ready_list): Drop special treatment of
25803         boundary debug insns.
25804         * final.c (rest_of_clean-state): Clear notes' BB.
25805
25806 2011-01-25  Sebastian Pop  <sebastian.pop@amd.com>
25807
25808         * Makefile.in (LAMBDA_H): Removed.
25809         (TREE_DATA_REF_H): Remove dependence on LAMBDA_H.
25810         (OBJS-common): Remove dependence on lambda-code.o, lambda-mat.o,
25811         lambda-trans.o, and tree-loop-linear.o.
25812         (lto-symtab.o): Remove dependence on LAMBDA_H.
25813         (tree-loop-linear.o): Remove rule.
25814         (lambda-mat.o): Same.
25815         (lambda-trans.o): Same.
25816         (lambda-code.o): Same.
25817         (tree-vect-loop.o): Add missing dependence on TREE_DATA_REF_H.
25818         (tree-vect-slp.o): Same.
25819         * hwint.h (gcd): Moved here.
25820         (least_common_multiple): Same.
25821         * lambda-code.c: Removed.
25822         * lambda-mat.c: Removed.
25823         * lambda-trans.c: Removed.
25824         * lambda.h: Removed.
25825         * tree-loop-linear.c: Removed.
25826         * lto-symtab.c: Do not include lambda.h.
25827         * omega.c (gcd): Removed.
25828         * passes.c (init_optimization_passes): Remove pass_linear_transform.
25829         * tree-data-ref.c (print_lambda_vector): Moved here.
25830         (lambda_vector_copy): Same.
25831         (lambda_matrix_copy): Same.
25832         (lambda_matrix_id): Same.
25833         (lambda_vector_first_nz): Same.
25834         (lambda_matrix_row_add): Same.
25835         (lambda_matrix_row_exchange): Same.
25836         (lambda_vector_mult_const): Same.
25837         (lambda_vector_negate): Same.
25838         (lambda_matrix_row_negate): Same.
25839         (lambda_vector_equal): Same.
25840         (lambda_matrix_right_hermite): Same.
25841         * tree-data-ref.h: Do not include lambda.h.
25842         (lambda_vector): Moved here.
25843         (lambda_matrix): Same.
25844         (dependence_level): Same.
25845         (lambda_transform_legal_p): Removed declaration.
25846         (lambda_collect_parameters): Same.
25847         (lambda_compute_access_matrices): Same.
25848         (lambda_vector_gcd): Same.
25849         (lambda_vector_new): Same.
25850         (lambda_vector_clear): Same.
25851         (lambda_vector_lexico_pos): Same.
25852         (lambda_vector_zerop): Same.
25853         (lambda_matrix_new): Same.
25854         * tree-flow.h (least_common_multiple): Removed declaration.
25855         * tree-parloops.c (lambda_trans_matrix): Moved here.
25856         (LTM_MATRIX): Same.
25857         (LTM_ROWSIZE): Same.
25858         (LTM_COLSIZE): Same.
25859         (LTM_DENOMINATOR): Same.
25860         (lambda_trans_matrix_new): Same.
25861         (lambda_matrix_vector_mult): Same.
25862         (lambda_transform_legal_p): Same.
25863         * tree-pass.h (pass_linear_transform): Removed declaration.
25864         * tree-ssa-loop.c (tree_linear_transform): Removed.
25865         (gate_tree_linear_transform): Removed.
25866         (pass_linear_transform): Removed.
25867         (gate_graphite_transforms): Make flag_tree_loop_linear an alias of
25868         flag_loop_interchange.
25869
25870 2011-01-25  Jakub Jelinek  <jakub@redhat.com>
25871
25872         PR tree-optimization/47265
25873         PR tree-optimization/47443
25874         * tree-ssa-forwprop.c (forward_propagate_addr_expr): Return false
25875         if name still has some uses.
25876
25877 2011-01-25  Martin Jambor  <mjambor@suse.cz>
25878
25879         PR tree-optimization/47382
25880         * gimple-fold.c (gimple_fold_obj_type_ref_call): Removed.
25881         (gimple_fold_call): Do not call gimple_fold_obj_type_ref_call.
25882
25883 2011-01-25  Joel Sherrill  <joel.sherrill@oarcorp.com>
25884
25885         * config/m32r/m32r.c: Define TARGET_EXCEPT_UNWIND_INFO to
25886         sjlj_except_unwind_info.
25887
25888 2011-01-25  Richard Guenther  <rguenther@suse.de>
25889
25890         PR tree-optimization/47426
25891         * tree-ssa-structalias.c (ipa_pta_execute): Make externally
25892         visible functions results escape.
25893
25894 2011-01-25  Jakub Jelinek  <jakub@redhat.com>
25895
25896         PR target/45701
25897         * config/arm/arm.c (any_sibcall_uses_r3): New function.
25898         (arm_get_frame_offsets): Use it.
25899
25900 2011-01-25  Sebastian Pop  <sebastian.pop@amd.com>
25901             Jakub Jelinek  <jakub@redhat.com>
25902
25903         PR tree-optimization/47271
25904         * tree-if-conv.c (bb_postdominates_preds): New.
25905         (if_convertible_bb_p): Call bb_postdominates_preds.
25906         (if_convertible_loop_p_1): Compute CDI_POST_DOMINATORS.
25907         (predicate_scalar_phi): Call bb_postdominates_preds.
25908
25909 2011-01-25  Nick Clifton  <nickc@redhat.com>
25910
25911         * config/rx/rx.h (LIBCALL_VALUE): Do not promote complex types.
25912         * config/rx/rx.c (rx_function_value): Likewise.
25913         (rx_promote_function_mode): Likewise.
25914         (gen_safe_add): Place an outsized immediate value inside an UNSPEC
25915         in order to make it legitimate.
25916         * config/rx/rx.md (adddi3_internal): If the second operand is a MEM
25917         make sure that the first operand is the same as the result register.
25918         (addsi3_unspec): Delete.
25919         (subdi3): Do not accept immediate operands.
25920         (subdi3_internal): Likewise.
25921
25922 2011-01-25  Jeff Law  <law@redhat.com>
25923
25924         PR rtl-optimization/37273
25925         * ira-costs.c (scan_one_insn): Detect constants living in memory and
25926         handle them like argument loads from stack slots.  Do not double
25927         count memory for memory constants and argument loads from stack slots.
25928
25929 2011-01-25  Jakub Jelinek  <jakub@redhat.com>
25930
25931         PR tree-optimization/47427
25932         PR tree-optimization/47428
25933         * tree-ssa-copyrename.c (copy_rename_partition_coalesce): Don't
25934         coalesce if the new root var would be TREE_READONLY.
25935
25936 2011-01-25  Richard Guenther  <rguenther@suse.de>
25937
25938         PR middle-end/47414
25939         * tree-ssa-alias.c (indirect_ref_may_alias_decl_p): Use the
25940         correct type for TBAA.
25941
25942 2011-01-25  Sebastian Pop  <sebastian.pop@amd.com>
25943
25944         * graphite-sese-to-poly.c (dr_indices_valid_in_loop): New.
25945         (close_phi_written_to_memory): Call for_each_index with
25946         dr_indices_valid_in_loop.
25947
25948 2011-01-25  Sebastian Pop  <sebastian.pop@amd.com>
25949
25950         * graphite-sese-to-poly.c (new_pbb_from_pbb): Only copy PBB_DOMAIN
25951         when it is initialized.
25952
25953 2011-01-25  Sebastian Pop  <sebastian.pop@amd.com>
25954
25955         * graphite-scop-detection.c (stmt_has_simple_data_refs_p): Update
25956         call to graphite_find_data_references_in_stmt.
25957         * graphite-sese-to-poly.c (outermost_loop_in_sese_1): New.
25958         (try_generate_gimple_bb): Call outermost_loop_in_sese_1.  Update
25959         call to graphite_find_data_references_in_stmt.
25960         (analyze_drs_in_stmts): Same.
25961         * tree-data-ref.c (dr_analyze_indices): Pass in parameter the loop
25962         in which the scalar analysis of indices is performed.
25963         (create_data_ref): Same.  Update call to dr_analyze_indices.
25964         (find_data_references_in_stmt): Update call to create_data_ref.
25965         (graphite_find_data_references_in_stmt): Same.
25966         * tree-data-ref.h (graphite_find_data_references_in_stmt): Update
25967         declaration.
25968         (create_data_ref): Same.
25969         * tree-ssa-loop-prefetch.c (determine_loop_nest_reuse): Update
25970         call to create_data_ref.
25971
25972 2011-01-25  Sebastian Pop  <sebastian.pop@amd.com>
25973
25974         * graphite-sese-to-poly.c (build_poly_scop): Move
25975         rewrite_commutative_reductions_out_of_ssa before find_scop_parameters.
25976
25977 2011-01-25  Sebastian Pop  <sebastian.pop@amd.com>
25978
25979         * graphite-sese-to-poly.c (close_phi_written_to_memory): Also allow
25980         VAR_DECL, PARM_DECL, and RESULT_DECL.
25981
25982 2011-01-25  Sebastian Pop  <sebastian.pop@amd.com>
25983
25984         * graphite-dependences.c (reduction_dr_1): Allow several reductions
25985         in a reduction PBB.
25986         * graphite-sese-to-poly.c (split_reduction_stmt): Do not split PBBs
25987         that have already been marked as PBB_IS_REDUCTION.
25988
25989 2011-01-25  Sebastian Pop  <sebastian.pop@amd.com>
25990
25991         * graphite-scop-detection.c (same_close_phi_node): New.
25992         (remove_duplicate_close_phi): New.
25993         (make_close_phi_nodes_unique): New.
25994         (canonicalize_loop_closed_ssa): Call make_close_phi_nodes_unique.
25995
25996 2011-01-25  Sebastian Pop  <sebastian.pop@amd.com>
25997
25998         * graphite-dependences.c (new_poly_ddr): Call same_pdr_p.
25999         * graphite-poly.h (same_pdr_p): Do not expect that the PDR_TYPE
26000         of both data references to be the same.
26001
26002 2011-01-25  Sebastian Pop  <sebastian.pop@amd.com>
26003
26004         * graphite-dependences.c (build_lexicographical_constraint): Remove
26005         the gdim parameter.
26006         (build_lexicographical_constraint): Adjust call to
26007         ppl_powerset_is_empty.
26008         (dependence_polyhedron): Same.
26009         (graphite_legal_transform_dr): Same.
26010         (graphite_carried_dependence_level_k): Same.
26011         * graphite-ppl.c (ppl_powerset_is_empty): Remove the nb_params
26012         parameter.
26013         * graphite-ppl.h (ppl_powerset_is_empty): Adjust declaration.
26014
26015 2011-01-25  Sebastian Pop  <sebastian.pop@amd.com>
26016
26017         * graphite-sese-to-poly.c
26018         (translate_scalar_reduction_to_array_for_stmt): Call unshare_expr.
26019         (close_phi_written_to_memory): New.
26020         (translate_scalar_reduction_to_array): Call close_phi_written_to_memory
26021         and unshare_expr.
26022
26023 2011-01-25  Sebastian Pop  <sebastian.pop@amd.com>
26024
26025         * doc/install.texi: Update the expected version number of PPL to 0.11.
26026         * graphite-ppl.c (ppl_powerset_is_empty): Remove now dead code under
26027         #if PPL_VERSION_MINOR < 11.
26028
26029 2011-01-25  Sebastian Pop  <sebastian.pop@amd.com>
26030
26031         * graphite-dependences.c: Include graphite-cloog-util.h.
26032         (new_poly_ddr): Inlined into dependence_polyhedron.
26033         (free_poly_ddr): Moved close by new_poly_ddr.
26034         (dependence_polyhedron_1): Renamed dependence_polyhedron.
26035         Early return NULL when ppl_powerset_is_empty returns true.
26036         (dependence_polyhedron): Renamed new_poly_ddr.  Call only once
26037         poly_drs_may_alias_p.  Avoid one call to ppl_powerset_is_empty.
26038         (graphite_legal_transform_dr): Call new_poly_ddr.
26039         (graphite_carried_dependence_level_k): Same.
26040         (dot_original_deps_stmt_1): Renamed dot_deps_stmt_2.  Use new_poly_ddr.
26041         (dot_transformed_deps_stmt_1): Removed.
26042         (dot_deps_stmt_1): Call dot_deps_stmt_2.
26043         (dot_original_deps): Renamed dot_deps_2.  Call new_poly_ddr.
26044         (dot_deps_1): Call dot_deps_2.
26045         * Makefile.in (graphite-dependences.o): Add missing dependence on
26046         graphite-cloog-util.h.
26047
26048 2011-01-25  Sebastian Pop  <sebastian.pop@amd.com>
26049
26050         * graphite-dependences.c (new_poly_dr): Call ppl_powerset_is_empty.
26051         (build_lexicographical_constraint): Same.
26052         (dependence_polyhedron_1): Same.
26053         (graphite_legal_transform_dr): Same.
26054         (graphite_carried_dependence_level_k): Same.
26055         * graphite-ppl.c (ppl_powerset_is_empty): New.
26056         * graphite-ppl.h (ppl_powerset_is_empty): Declared.
26057         * tree-data-ref.c (dump_data_reference): Print the basic block index.
26058
26059 2011-01-25  Sebastian Pop  <sebastian.pop@amd.com>
26060
26061         * graphite-dependences.c (build_pairwise_scheduling): Correctly compute
26062         the "a followed by b" relation and document it.
26063
26064 2011-01-25  Sebastian Pop  <sebastian.pop@amd.com>
26065
26066         * graphite-dependences.c (build_lexicographical_constraint): Stop the
26067         iteration when the bag of constraints is empty.
26068
26069 2011-01-25  Sebastian Pop  <sebastian.pop@amd.com>
26070
26071         * graphite-poly.c (pbb_remove_duplicate_pdrs): Make it work.
26072
26073 2011-01-25  Sebastian Pop  <sebastian.pop@amd.com>
26074
26075         * graphite-interchange.c (lst_interchange_profitable_p): Takes a loop
26076         nest and two loop depths as parameters.
26077         (lst_try_interchange_loops): Call lst_interchange_profitable_p after
26078         lst_perfect_nestify.
26079
26080 2011-01-25  Sebastian Pop  <sebastian.pop@amd.com>
26081
26082         * graphite-dependences.c (print_pddr): Call
26083         ppl_io_fprint_Pointset_Powerset_C_Polyhedron.
26084
26085 2011-01-25  Sebastian Pop  <sebastian.pop@amd.com>
26086
26087         * graphite-ppl.c (debug_gmp_value): New.
26088         * graphite-ppl.h (debug_gmp_value): Declared.
26089
26090 2011-01-25  Tobias Grosser  <grosser@fim.uni-passau.de>
26091
26092         * doc/install.texi: Document availability of cloog-0.16.
26093
26094 2011-01-25  Vladimir Kargov  <kargov@gmail.com>
26095
26096         * graphite-scop-detection.c (canonicalize_loop_closed_ssa): Free
26097         invalid postdominance info.
26098
26099 2011-01-24  Jan Hubicka  <jh@suse.cz>
26100
26101         PR c/21659
26102         * doc/extend.texi (weak pragma): Drop claim that it must
26103         appear before definition.
26104         * varasm.c (merge_weak, declare_weak): Only sanity check
26105         that DECL is not output at a time it is declared weak.
26106
26107 2011-01-24  Kenneth Zadeck  <zadeck@naturalbridge.com>
26108
26109         * machmode.def: Fixed comments.
26110
26111 2011-01-24  Kai Tietz  <kai.tietz@onevision.com>
26112
26113         * emit-rtl.c (reg_attrs_htab_hash): Replace long by intptr_t.
26114
26115 2011-01-24  Paul Koning  <ni1d@arrl.net>
26116
26117         * builtins.c (c_readstr): Fix byte order if BYTES_BIG_ENDIAN !=
26118         WORDS_BIG_ENDIAN.
26119
26120 2011-01-24  H.J. Lu  <hongjiu.lu@intel.com>
26121
26122         PR target/46519
26123         * config/i386/i386.c: Include sbitmap.h and fibheap.h.
26124         (block_info): Add scanned and prev.
26125         (move_or_delete_vzeroupper_2): Return if the basic block
26126         has been scanned and the upper 128bit state is unchanged
26127         from the last scan.
26128         (move_or_delete_vzeroupper_1): Return true if the exit
26129         state is changed.
26130         (move_or_delete_vzeroupper): Visit basic blocks using the
26131         work-list based algorithm based on vt_find_locations in
26132         var-tracking.c.
26133
26134         * config/i386/t-i386: Also depend on sbitmap.h and $(FIBHEAP_H).
26135
26136 2011-01-24  Nick Clifton  <nickc@redhat.com>
26137
26138         * config/v850/v850.opt (mv850es): New option - alias for -mv850e1.
26139         * config/v850/v850.h (ASM_SPEC): If -mv850es is specified pass
26140         -mv850e1 to the assembler.  If -mv850e1 or -mv850es is specified
26141         then define __v850e1__.
26142         * doc/invoke.texi: Document -mv850es.
26143
26144 2011-01-24  Richard Henderson  <rth@redhat.com>
26145
26146         * config/rx/predicates.md (rx_fp_comparison_operator): Don't accept
26147         compound unordered comparisons.
26148         * config/rx/rx.c (rx_split_fp_compare): Remove.
26149         * config/rx/rx-protos.h: Update.
26150         * config/rx/rx.md (gcc_conds, rx_conds): Remove.
26151         (cbranchsf4): Don't call rx_split_fp_compare.
26152         (*cbranchsf4): Use rx_split_cbranch.
26153         (*cmpsf): Don't accept "i" constraint.
26154         (*conditional_branch): Only valid after reload.
26155         (cstoresf4): Merge expander with insn.  Don't call rx_split_fp_compare.
26156
26157 2011-01-24  Michael Meissner  <meissner@linux.vnet.ibm.com>
26158
26159         PR target/47385
26160         * config/rs6000/altivec.md (vector constant splitters): Add
26161         support for creating vector single precision constants if -mvsx is
26162         used and we would create the constant using Altivec primitives.
26163
26164 2011-01-23  Bernd Schmidt  <bernds@codesourcery.com>
26165             Richard Sandiford  <rdsandiford@googlemail.com>
26166
26167         PR rtl-optimization/47166
26168         * reload1.c (emit_reload_insns): Disable the spill_reg_store
26169         mechanism for PRE_MODIFY and POST_MODIFY.
26170         (inc_for_reload): For PRE_MODIFY, return the insn that sets the
26171         reloadreg.
26172
26173 2011-01-23  Andreas Schwab  <schwab@linux-m68k.org>
26174
26175         * compare-elim.c (maybe_select_cc_mode): Add ATTRIBUTE_UNUSED markers.
26176
26177 2011-01-22  Jan Hubicka  <jh@suse.cz>
26178
26179         PR lto/47333
26180         * lto-cgraph.c (reachable_from_this_partition_p): Fix pasto.
26181
26182 2011-01-22  Jan Hubicka  <jh@suse.cz>
26183
26184         PR tree-optimization/43884
26185         PR lto/44334
26186         * predict.c (maybe_hot_frequency_p): Use entry block frequency as base.
26187         * doc/invoke.texi (hot-bb-frequency-fraction): Update docs.
26188
26189 2011-01-22  Anatoly Sokolov  <aesok@post.ru>
26190
26191         * config/s390/s390.h (REGISTER_MOVE_COST, MEMORY_MOVE_COST): Remove.
26192         * config/s390/s390.c (s390_register_move_cost,
26193         s390_memory_move_cost): New.
26194         (TARGET_REGISTER_MOVE_COST, TARGET_MEMORY_MOVE_COST): Define.
26195
26196 2011-01-22  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
26197
26198         PR middle-end/47401
26199         * except.c (sjlj_assign_call_site_values): Move setting the
26200         crtl->uses_eh_lsda flag to ...
26201         (sjlj_mark_call_sites): ... here.
26202         (sjlj_emit_function_enter): Support NULL dispatch label.
26203         (sjlj_build_landing_pads): In a function with no landing pads
26204         that still has must-not-throw regions, generate code to register
26205         a personality function with empty LSDA.
26206
26207 2011-01-21  Richard Henderson  <rth@redhat.com>
26208
26209         * config/rx/rx.c (TARGET_FLAGS_REGNUM): New.
26210
26211         * config/mn10300/mn10300.c (TARGET_FLAGS_REGNUM): New.
26212
26213         * compare-elim.c: New file.
26214         * Makefile.in (OBJS-common): Add it.
26215         (compare-elim.o): New.
26216         * common.opt (fcompare-elim): New.
26217         * opts.c (default_options_table): Add OPT_fcompare_elim.
26218         * tree-pass.h (pass_compare_elim_after_reload): New.
26219         * passes.c (init_optimization_passes): Add it.
26220         * recog.h: Protect against re-inclusion.
26221         * target.def (TARGET_FLAGS_REGNUM): New POD hook.
26222         * doc/invoke.texi (-fcompare-elim): Document it.
26223         * doc/tm.texi.in (TARGET_FLAGS_REGNUM): Document it.
26224         * doc/tm.texi: Rebuild.
26225
26226 2011-01-22  Nick Clifton  <nickc@redhat.com>
26227
26228         * config/rx/rx.md (cstoresf4): Pass comparison operator to
26229         rx_split_fp_compare.
26230
26231 2011-01-22  Nick Clifton  <nickc@redhat.com>
26232
26233         * config/rx/rx.md (UNSPEC_CONST): New.
26234         (deallocate_and_return): Wrap the amount popped off the stack in
26235         an UNSPEC_CONST in order to stop it being rejected by
26236         -mmax-constant-size.
26237         (pop_and_return): Add a "(return)" rtx.
26238         (call): Drop the immediate operand.
26239         (call_internal): Likewise.
26240         (call_value): Likewise.
26241         (call_value_internal): Likewise.
26242         (sibcall_internal): Likewise.
26243         (sibcall_value_internal): Likewise.
26244         (sibcall): Likewise.  Generate an explicit call using
26245         sibcall_internal.
26246         (sibcall_value): Likewise.
26247         (mov<>): FAIL if a constant operand is not legitimate.
26248         (addsi3_unpsec): New pattern.
26249
26250         * config/rx/rx.c (rx_print_operand_address): Handle UNSPEC CONSTs.
26251         (ok_for_max_constant): New function.
26252         (gen_safe_add): New function.
26253         (rx_expand_prologue): Use gen_safe_add.
26254         (rx_expand_epilogue): Likewise.
26255         (rx_is_legitimate_constant): Use ok_for_max_constant.  Handle
26256         UNSPEC CONSTs.
26257
26258 2011-01-21  Jeff Law  <law@redhat.com>
26259
26260         PR tree-optimization/47053
26261         * tree-ssa-dse.c (need_eh_cleanup): New bitmap.
26262         (dse_optimize_stmt): Set the appropriate bit in NEED_EH_CLEANUP when
26263         statements are deleted.
26264         (tree_ssa_dse): Allocate & free NEED_EH_CLEANUP.  If NEED_EH_CLEANUP
26265         is nonempty, then purge dead edges and cleanup the CFG.
26266
26267 2011-01-21  Alexandre Oliva  <aoliva@redhat.com>
26268
26269         PR debug/47402
26270         Temporarily revert:
26271         2011-01-21  Alexandre Oliva  <aoliva@redhat.com>
26272         PR debug/47106
26273         * tree-dfa.c (create_var_ann): Mark variable as used.
26274
26275 2011-01-21  Jakub Jelinek  <jakub@redhat.com>
26276
26277         PR middle-end/45566
26278         * except.c (convert_to_eh_region_ranges): Emit queued no-region
26279         notes from other section in hot/cold partitioning even if
26280         last_action is -3.  Increment call_site_base.
26281
26282         PR rtl-optimization/47366
26283         * fwprop.c (forward_propagate_into): Return bool.  If
26284         any changes are made, -fnon-call-exceptions is used and
26285         REG_EH_REGION note is present, call purge_dead_edges
26286         and return true if it purged anything.
26287         (fwprop_addr): Adjust callers, call cleanup_cfg (0) if
26288         any EH edges were purged.
26289
26290 2011-01-21  Jeff Law  <law@redhat.com>
26291
26292         PR rtl-optimization/41619
26293         * caller-save.c (setup_save_areas): Break out code to determine
26294         which hard regs are live across calls by examining the reload chains
26295         so that it is always used.
26296         Eliminate code which checked REG_N_CALLS_CROSSED.
26297
26298 2011-01-21  Jakub Jelinek  <jakub@redhat.com>
26299
26300         PR tree-optimization/47355
26301         * tree-eh.c (cleanup_empty_eh_merge_phis): Give up if
26302         NOP has non-debug uses beyond PHIs in new_bb.
26303
26304 2011-01-21  Alexandre Oliva  <aoliva@redhat.com>
26305
26306         PR debug/47106
26307         * cfgexpand.c (account_used_vars_for_block): Only account vars
26308         that are annotated as used.
26309         (estimated_stack_frame_size): Don't set TREE_USED.
26310         * tree-dfa.c (create_var_ann): Mark variable as used.
26311
26312 2011-01-21  Richard Guenther  <rguenther@suse.de>
26313
26314         PR middle-end/47395
26315         * tree.def (WIDEN_MULT_MINUS_EXPR): Fix printed name.
26316
26317 2011-01-21  Richard Guenther  <rguenther@suse.de>
26318
26319         PR tree-optimization/47365
26320         * tree-ssa-sccvn.h (vn_lookup_kind): Declare.
26321         (vn_reference_lookup_pieces): Adjust.
26322         (vn_reference_lookup): Likewise.
26323         * tree-ssa-sccvn.c (vn_walk_kind): New static global.
26324         (vn_reference_lookup_3): Only look through kills if in
26325         VN_WALKREWRITE mode.
26326         (vn_reference_lookup_pieces): Adjust.
26327         (vn_reference_lookup): Likewise.
26328         (visit_reference_op_load): Likewise.
26329         (visit_reference_op_store): Likewise.
26330         * tree-ssa-pre.c (phi_translate_1): Use VN_WALK mode.
26331         (compute_avail): Likewise.
26332         (eliminate): Likewise.
26333
26334 2011-01-21  Jakub Jelinek  <jakub@redhat.com>
26335
26336         * tree-ssa-live.c (remove_unused_scope_block_p): Don't remove
26337         DECL_IGNORED_P non-reg vars if they are used.
26338
26339         PR tree-optimization/47391
26340         * varpool.c (const_value_known_p): Return false if
26341         decl is volatile.
26342
26343 2011-01-21  Kai Tietz  <kai.tietz@onevision.com>
26344
26345         PR bootstrap/47215
26346         * config/i386/i386.c (ix86_local_alignment): Handle
26347         case for va_list_type_node is nil.
26348         (ix86_canonical_va_list_type): Likewise.
26349
26350 2011-01-21  Alan Modra  <amodra@gmail.com>
26351
26352         * config/rs6000/rs6000-c.c (rs6000_cpu_cpp_builtins): Add
26353         builtin_define __CMODEL_MEDIUM__ and __CMODEL_LARGE__.
26354
26355 2011-01-20  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
26356
26357         * config/arm/arm.md (define_attr type): Rename f_load
26358         and f_store to f_fpa_load and f_fpa_store. Update.
26359         (write_conflict): Deal with rename fallout.
26360         (*push_fp_multi): Likewise.
26361         * config/arm/fpa.md (f_load): Use f_fpa_load.
26362         (f_store): Use f_fpa_store.
26363         (*movsf_fpa): Likewise.
26364         (*movdf_fpa): Likewise.
26365         (*movxf_fpa): Likewise.
26366         (*thumb2_movsf_fpa): Likewise.
26367         (*thumb2_movdf_fpa): Likewise.
26368         (*thumb2_movxf_fpa): Likewise.
26369         * config/arm/vfp.md (*thumb2_movdf_vfp): Fix attribute to
26370         f_loadd and f_stored.
26371         (*thumb2_movdi_vfp): Likewise.
26372         (*thumb2_movsf_vfp): Fix attribute to f_loads.
26373         (*thumb2_movsi_vfp): Likewise.
26374         * config/arm/cortex-m4-fpu.md (cortex_m4_f_load):
26375         Use f_loads instead of f_load.
26376         * config/arm/cortex-a5.md (cortex_a5_f_loads): Remove f_load.
26377
26378 2011-01-20  Anatoly Sokolov  <aesok@post.ru>
26379
26380         * config/xtensa/xtensa.h (GO_IF_MODE_DEPENDENT_ADDRESS): Remove.
26381         * config/xtensa/xtensa-protos.h (constantpool_address_p): Remove.
26382         * config/xtensa/xtensa.c (TARGET_MODE_DEPENDENT_ADDRESS_P): Define.
26383         (xtensa_mode_dependent_address_p): New function.
26384         (constantpool_address_p): Make static. Change return type to bool.
26385         Change argument type to const_rtx. Use CONST_INT_P predicate.
26386
26387 2011-01-20  Alexandre Oliva  <aoliva@redhat.com>
26388
26389         PR debug/46583
26390         * tree-ssa-live.c (remove_unused_scope_block_p): Keep type decls.
26391
26392 2011-01-20  Jakub Jelinek  <jakub@redhat.com>
26393
26394         PR debug/47283
26395         * cfgexpand.c (expand_debug_expr): Instead of generating
26396         (mem (debug_implicit_ptr)) for MEM_REFs use COMPONENT_REF
26397         etc. handling.
26398
26399 2011-01-20  Richard Guenther  <rguenther@suse.de>
26400
26401         PR middle-end/47370
26402         * tree-inline.c (remap_gimple_op_r): Recurse manually for
26403         the pointer operand of MEM_REFs.
26404
26405 2011-01-20  Jakub Jelinek  <jakub@redhat.com>
26406
26407         PR tree-optimization/46130
26408         * ipa-split.c (consider_split): If return_bb contains non-virtual
26409         PHIs other than for retval or if split_function would not adjust it,
26410         refuse to split.
26411
26412 2011-01-20  Richard Guenther  <rguenther@suse.de>
26413
26414         PR tree-optimization/47167
26415         * tree-ssa-copyrename.c (copy_rename_partition_coalesce):
26416         Revert previous change, only avoid enumeral type changes.
26417
26418 2011-01-19  Mike Stump  <mikestump@comcast.net>
26419
26420         * doc/tm.texi.in (BRANCH_COST): Englishify.
26421         * doc/tm.texi (BRANCH_COST): Likewise.
26422
26423 2011-01-19  Dodji Seketeli  <dodji@redhat.com>
26424
26425         PR c++/47291
26426         * dwarf2out.c (generic_type_p, schedule_generic_params_dies_gen)
26427         (gen_scheduled_generic_parms_dies): New functions.
26428         (gen_struct_or_union_type_die): Schedule template parameters DIEs
26429         generation for the end of CU compilation.
26430         (dwarf2out_finish): Generate template parameters DIEs here.
26431
26432 2011-01-19  Alexandre Oliva  <aoliva@redhat.com>
26433
26434         PR debug/46240
26435         * tree-into-ssa.c (maybe_register_def): Do not attempt to add
26436         debug bind stmt on merge edges.
26437
26438 2011-01-19  Alexandre Oliva  <aoliva@redhat.com>
26439
26440         PR debug/47079
26441         PR debug/46724
26442         * function.c (instantiate_expr): Instantiate incoming rtl of
26443         implicit arguments, and recurse on VALUE_EXPRs.
26444         (instantiate_decls): Instantiate rtl and VALUE_EXPR of result.
26445         * var-tracking.c (adjust_mems): Reject virtual_incoming_args_rtx.
26446
26447 2011-01-19  Alexandre Oliva  <aoliva@redhat.com>
26448
26449         * c-parser.c (c_parser_for_statement): Initialize
26450         collection_expression.
26451
26452 2011-01-19  Joseph Myers  <joseph@codesourcery.com>
26453
26454         * config/spu/spu-elf.h (ASM_SPEC): Remove %{w:-W}.
26455
26456 2011-01-19  Joseph Myers  <joseph@codesourcery.com>
26457
26458         * config/rs6000/sysv4.h (LINK_PATH_SPEC): Remove.
26459         (LINK_SHLIB_SPEC): Don't use %(link_path).
26460         (SUBTARGET_EXTRA_SPECS): Remove link_path.
26461
26462 2011-01-19  Joseph Myers  <joseph@codesourcery.com>
26463
26464         * config/rs6000/sysv4.h (SHARED_LIB_SUPPORT): Remove conditional.
26465         (NO_SHARED_LIB_SUPPORT): Remove.
26466         (LINK_SHLIB_SPEC): Remove one conditional definition.
26467
26468 2011-01-19  Joseph Myers  <joseph@codesourcery.com>
26469
26470         * config/mips/linux64.h (LINK_SPEC): Remove %{non_shared}
26471         %{call_shared}.
26472         * config/mips/mips.h (LINK_SPEC): Remove %{non_shared}.
26473         * config/mips/netbsd.h (LINK_SPEC): Remove %{call_shared}.
26474         * config/mips/openbsd.h (LINK_SPEC): Remove %{non_shared}
26475         %{call_shared} and conditionals on these options not being passed.
26476         * config/mips/sde.h (LINK_SPEC): Remove %{non_shared}
26477         %{call_shared}.
26478
26479 2011-01-19  Jakub Jelinek  <jakub@redhat.com>
26480
26481         * ipa-split.c (find_return_bb): Use single_pred_p/single_pred_edge,
26482         simplify.
26483
26484         * ipa-split.c: Spelling fixes.
26485
26486 2011-01-19  Richard Henderson  <rth@redhat.com>
26487
26488         * config/mn10300/mn10300.md (mulsi3): Use reg_or_am33_const_operand.
26489         (*mulsi3): Likewise.
26490
26491         * longlong.h [__mn10300__] (count_leading_zeros): New.
26492         [__mn10300__] (umul_ppmm, smul_ppmm): New.
26493         [__mn10300__] (add_ssaaaa, subddmmss): New.
26494         [__mn10300__] (udiv_qrnnd, sdiv_qrnnd): New.
26495         [__mn10300__] (UMUL_TIME, UDIV_TIME): New.
26496
26497 2011-01-19  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
26498
26499         * config/spu/spu.h (MOVE_RATIO): Return 4 in the !speed case.
26500
26501 2011-01-19  Richard Henderson  <rth@redhat.com>
26502
26503         * config/mn10300/mn10300.md (addsi3_flags): New.
26504         (addc_internal, adddi3, adddi3_internal, *adddi3_degenerate): New.
26505         (subsi3_flags, subc_internal, subdi3): New.
26506         (subdi3_internal, *subdi3_degenerate): New.
26507         * config/mn10300/predicates.md (reg_or_am33_const_operand): New.
26508
26509         * config/mn10300/mn10300.c (mn10300_can_use_retf_insn): New.
26510         (mn10300_can_use_rets_insn): Rename from mn10300_can_use_return_insn.
26511         (mn10300_expand_epilogue): Use it.  Compute REG_SAVE_BYTES once.
26512         * config/mn10300/mn10300-protos.h: Update.
26513         * config/mn10300/mn10300.md (return): Use mn10300_can_use_retf_insn.
26514         (return_ret): Likewise.  Rename from return_internal_regs.
26515         (return_internal): Remove.
26516
26517         * config/mn10300/mn10300.c (mn10300_unspec_int_label_counter): Remove.
26518         (mn10300_asm_output_addr_const_extra): Don't handle UNSPEC_INT_LABEL.
26519         (mn10300_legitimate_constant_p): Likewise.
26520         (mn10300_can_use_return_insn): Use mn10300_initial_offset.
26521         (mn10300_frame_size): New.
26522         (mn10300_expand_prologue): Use it.
26523         (mn10300_expand_epilogue): Likewise.
26524         (mn10300_initial_offset): Likewise.
26525         * config/mn10300/mn10300-protos.h: Update.
26526         * config/mn10300/mn10300.h (mn10300_unspec_int_label_counter): Remove.
26527         * config/mn10300/mn10300.md (UNSPEC_INT_LABEL): Remove.
26528         (prologue, epilogue, return_internal): Tidy output code.
26529         (mn10300_store_multiple_operation, return): Likewise.
26530         (int_label, pop_pic_reg, GOTaddr2picreg): Remove.
26531         (am33_loadPC, mn10300_loadPC, call_next_insn): Remove.
26532         (add_GOT_to_pic_reg, add_GOT_to_any_reg): Remove.
26533         (load_pic, am33_load_pic): New.
26534         (mn10300_load_pic0, mn10300_load_pic1): New.
26535
26536         * config/mn10300/mn10300-modes.def (CCZN, CCZNC): New modes.
26537         * config/mn10300/mn10300.c (CC_FLAG_Z): New.
26538         (CC_FLAG_N, CC_FLAG_C, CC_FLAG_V): New.
26539         (cc_flags_for_mode, cc_flags_for_code): New.
26540         (mn10300_print_operand) ['B']: Use nc/ns for GE/LT when the
26541         overflow flag is not valid.  Validate that the flags we need
26542         for the comparison are valid.
26543         (mn10300_output_cmp): Remove.
26544         (mn10300_output_add): New.
26545         (mn10300_select_cc_mode): Use cc_flags_for_code.
26546         (mn10300_split_cbranch): New.
26547         (mn10300_match_ccmode): New.
26548         (mn10300_split_and_operand_count): New.
26549         * config/mn10300/mn10300.h (SELECT_CC_MODE): Pass all of the arguments
26550         to the function.
26551         * config/mn10300/mn10300.md (*am33_addsi3, *mn10300_addsi3): Merge...
26552         (addsi3): ... here.  Use mn10300_output_add.
26553         (*addsi3_flags): New.
26554         (*am33_subsi3, *mn10300_subsi3): Merge...
26555         (subsi3): ... here.  Use attribute isa.
26556         (*subsi3_flags): New.
26557         (negsi2): Rewrite from expander to insn_and_split.  Use NOT+INC
26558         when possible.
26559         (*am33_andsi3, *mn10300_andsi3): Merge...
26560         (andsi3): ... here.
26561         (*andsi3_flags): New.
26562         (andsi3 splitters): New.
26563         (*am33_iorsi3, *mn10300_iorsi3): Merge...
26564         (iorsi3): ... here.
26565         (*iorsi3_flags): New.
26566         (*am33_xorsi3, *mn10300_xorsi3): Merge...
26567         (xorsi3): ... here.
26568         (*xorsi3_flags): New.
26569         (*am33_cmpsi2, *mn10300_cmplsi2): Merge...
26570         (one_cmplsi2): ... here.
26571         (*one_cmplsi2_flags): New.
26572         (*cbranchsi4_cmp): Rename from cbranchsi4_post_reload.  Use "r"
26573         instead of "dax" in constraints.  Use mn10300_split_cbranch.
26574         (*cmpsi): Rename from cmpsi.  Do not use mn10300_output_cmp.  Do not
26575         use matching constraints to eliminate a self-comparison.
26576         (*integer_conditional_branch): Rename from integer_conditional_branch.
26577         Use int_mode_flags to match CC_REG.
26578         (*cbranchsi4_btst, *btstsi): New.
26579         (*cbranchsf4_cmp): Rename from *cbranchsf4_post_reload.  Use
26580         mn10300_split_cbranch.
26581         (*am33_cmpsf): Rename from am33_cmpsf.
26582         (*float_conditional_branch): Rename from float_conditional_branch.
26583         (*zero_extendqisi2_am33, *zero_extendqisi2_mn10300): Merge...
26584         (zero_extendqisi2): ... here.
26585         (*zero_extendhisi2_am33, *zero_extendhisi2_mn10300): Merge...
26586         (zero_extendhisi2): ... here.
26587         (*extendqisi2_am33, *extendqisi2_mn10300): Merge...
26588         (extendqisi2): ... here.
26589         (*extendhisi2_am33, *extendhisi2_mn10300): Merge...
26590         (extendhisi2): ... here.
26591         (*am33_ashlsi3, *mn10300_ashlsi3): Merge...
26592         (ashlsi3): ... here.
26593         (*am33_lshrsi3, *mn10300_lshrsi3): Merge...
26594         (lshrsi3): ... here.
26595         (*am33_ashrisi3, *mn10300_ashrsi3): Merge...
26596         (ashrsi3): ... here.
26597         (consecutive add peephole): Remove.
26598         * config/mn10300/predicates.md (label_ref_operand): New.
26599         (int_mode_flags): New.
26600         (CCZN_comparison_operator): New.
26601
26602         * config/mn10300/mn10300.md (UNSPEC_EXT): New.
26603         (throughput_42_latency_43): New reservation.
26604         (mulsidi3, umulsidi3): New expanders.
26605         (mulsidi3_internal): Rewrite from old mulsidi3 pattern.  Expose
26606         the MDR register to allocation; separately allocate the low and
26607         high parts of the DImode result.
26608         (umulsidi3_internal): Similarly.
26609         (*am33_mulsi3, *mn10300_mulsi3): Merge into ...
26610         (*mulsi3): ... here.  Clobber MDR as a scratch as necessary.
26611         (udivsi3, umodsi3): Remove.
26612         (udivmodsi4, divmodsi4): New expanders.
26613         (*udivmodsi4): Rename from udivmodsi4.  Expose MDR properly.
26614         (*divmodsi4): Simiarly.
26615         (ext_internal): New.
26616
26617         * config/mn10300/constraints.md ("z"): New constraint.
26618         * config/mn10300/mn10300.h (MDR_REGNUM): Remove.
26619         (FIXED_REGISTERS): Don't fix MDR.
26620         (CALL_USED_REGSITERS): Reformat nicely.
26621         (REG_ALLOC_ORDER): Add MDR.
26622         (enum regclass): Add MDR_REGS.
26623         (REG_CLASS_NAMES, REG_CLASS_CONTENTS): Update to match.
26624         (IRA_COVER_CLASSES): Add MDR_REGS.
26625         (REGNO_REG_CLASS): Handle MDR_REG.
26626         * config/mn10300/mn10300.c (mn10300_secondary_reload): Handle MDR_REGS.
26627         (mn10300_register_move_cost): Likewise.
26628         * config/mn10300/mn10300.md (MDR_REG): New.
26629         (*movsi_internal): Handle moves to/from MDR_REGS.
26630
26631         * config/mn10300/mn10300.c (mn10300_print_operand_address): Handle
26632         POST_MODIFY.
26633         (mn10300_secondary_reload): Tidy combination reload classes.
26634         (mn10300_legitimate_address_p): Allow post-modify and reg+reg
26635         addresses for AM33.  Allow symbolic offsets for reg+imm.
26636         (mn10300_regno_in_class_p): New.
26637         (mn10300_legitimize_reload_address): New.
26638         * config/mn10300/mn10300.h (enum reg_class): Remove
26639         DATA_OR_ADDRESS_REGS, DATA_OR_EXTENDED_REGS, ADDRESS_OR_EXTENDED_REGS,
26640         SP_OR_EXTENDED_REGS, SP_OR_ADDRESS_OR_EXTENDED_REGS.  Add
26641         SP_OR_GENERAL_REGS.
26642         (REG_CLASS_NAMES): Update to match.
26643         (REG_CLASS_CONTENTS): Likewise.
26644         (INDEX_REG_CLASS): Use GENERAL_REGS for AM33.
26645         (BASE_REG_CLASS): Use SP_OR_GENERAL_REGS for AM33.
26646         (REGNO_IN_RANGE_P): Remove.
26647         (REGNO_DATA_P): Use mn10300_regno_in_class_p.
26648         (REGNO_ADDRESS_P, REGNO_EXTENDED_P): Likewise.
26649         (REGNO_STRICT_OK_FOR_BASE_P): Likewise.
26650         (REGNO_STRICT_OK_FOR_BIT_BASE_P): Likewise.
26651         (REGNO_STRICT_OK_FOR_INDEX_P): Likewise.
26652         (REGNO_SP_P, REGNO_AM33_P, REGNO_FP_P): Remove.
26653         (REGNO_GENERAL_P): New.
26654         (HAVE_POST_MODIFY_DISP): New.
26655         (USE_LOAD_POST_INCREMENT, USE_STORE_POST_INCREMENT): New.
26656         (LEGITIMIZE_RELOAD_ADDRESS): New.
26657         * config/mn10300/mn10300-protos.h: Update.
26658
26659         * config/mn10300/mn10300.c (mn10300_preferred_reload_class): Allow
26660         DATA_REGS for AM33 stack-pointer destination.
26661         (mn10300_preferred_output_reload_class): Likewise.
26662         (mn10300_secondary_reload): Rearrange mn10300_secondary_reload_class
26663         into a form appropriate for ...
26664         (TARGET_SECONDARY_RELOAD): New.
26665         * config/mn10300/mn10300.h (SECONDARY_RELOAD_CLASS): Remove.
26666         * config/mn10300/mn10300-protos.h: Update.
26667         * config/mn10300/mn10300.md (reload_plus_sp_const): Rename from
26668         reload_insi; use the "A" constraint for the scratch; handle AM33
26669         moves of sp to non-address registers.
26670
26671         * config/mn10300/mn10300.md (*am33_movqi, *mn10300_movqi): Merge into
26672         (*movqi_internal): ... here.
26673         (*am33_movhi, *mn10300_movhi): Merge into...
26674         (*movhi_internal): ... here.
26675         (*movsi_internal): Use "r" instead of "dax" in constraints.  Use "A"
26676         as the source/destination of moves from/to SP.
26677         (movsf): Only allow for AM33-2.
26678         (*movsf_internal): Use "r" instead of "dax"; use "F" instead of
26679         any integer constant constraint.  Only allow for AM33-2.  Tidy
26680         all of the alternative outputs.
26681         (movdi, movdf, *am33_2_movdf, *mn10300_movdf): Remove.
26682         (udivmodsi4): Delete expander and promote *udivmodsi4.  Disallow
26683         for MN103.
26684         (udivsi3, umodsi3): New patterns for MN103 only.
26685
26686 2011-01-19  Joern Rennecke  <amylaar@spamcop.net>
26687
26688         * doc/tm.texi.in: Spell out that a lack of register class unions
26689         can lead to ICEs.
26690         * doc/tm.texi: Regenerate.
26691
26692 2011-01-19  Jakub Jelinek  <jakub@redhat.com>
26693
26694         PR rtl-optimization/47337
26695         * dce.c (check_argument_store): New function.
26696         (find_call_stack_args): Ignore debug insns.  Use check_argument_store.
26697
26698         PR tree-optimization/47290
26699         * tree-eh.c (infinite_empty_loop_p): New function.
26700         (cleanup_empty_eh): Use it.
26701
26702 2011-01-18  Steve Ellcey  <sje@cup.hp.com>
26703
26704         PR target/46997
26705         * ia64.c (ia64_expand_unpack): Fix code for TARGET_BIG_ENDIAN.
26706         (a64_expand_widen_sum): Ditto.
26707         * vect.md (mulv2si3): Disable for TARGET_BIG_ENDIAN.
26708         (vec_extract_evenodd_help): Ditto.
26709         (vec_extract_evenv4hi): Ditto.
26710         (vec_extract_oddv4hi): Ditto.
26711         (vec_extract_evenv2si): Ditto.
26712         (vec_extract_oddv2si): Ditto.
26713         (vec_extract_evenv2sf): Ditto.
26714         (vec_extract_oddv2sf): Ditto.
26715         (vec_pack_trunc_v4hi: Ditto.
26716         (vec_pack_trunc_v2si): Ditto.
26717         (vec_interleave_lowv8qi): Fix for TARGET_BIG_ENDIAN.
26718         (vec_interleave_highv8qi): Ditto.
26719         (mix1_r): Ditto.
26720         (vec_extract_oddv8qi): Ditto.
26721         (vec_interleave_lowv4hi): Ditto.
26722         (vec_interleave_highv4hi): Ditto.
26723         (vec_interleave_lowv2si): Ditto.
26724         (vec_interleave_highv2si): Ditto.
26725
26726 2011-01-18  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
26727
26728         * doc/extend.texi: Mention __float128 support on hppa HP-UX.
26729         * config/pa/pa-hpux.h (HPUX_LONG_DOUBLE_LIBRARY): Define to 1.
26730         * config/pa/pa.c (pa_expand_builtin): New.  Include "langhooks.h".
26731         (pa_c_mode_for_suffix): New.
26732         (TARGET_EXPAND_BUILTIN): Define.
26733         (TARGET_C_MODE_FOR_SUFFIX): Define.
26734         (pa_builtins): Define.
26735         (pa_init_builtins): Register __float128 type and init new support
26736         builtins.
26737         * config/pa/pa.h (HPUX_LONG_DOUBLE_LIBRARY): Define if not defined.
26738         * config/pa/quadlib.c (_U_Qfcopysign): New.
26739
26740 2011-01-18  Eric Botcazou  <ebotcazou@adacore.com>
26741
26742         PR middle-end/46894
26743         * explow.c (allocate_dynamic_stack_space): Do not assume more than
26744         BITS_PER_UNIT alignment if STACK_DYNAMIC_OFFSET or STACK_POINTER_OFFSET
26745         are defined.
26746
26747 2011-01-18  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
26748
26749         PR tree-optimization/47179
26750         * config/spu/spu.c (spu_ref_may_alias_errno): New function.
26751         (TARGET_REF_MAY_ALIAS_ERRNO): Define.
26752
26753 2011-01-18  Richard Guenther  <rguenther@suse.de>
26754
26755         PR rtl-optimization/47216
26756         * emit-rtl.c: Include tree-flow.h.
26757         (set_mem_attributes_minus_bitpos): Use tree_could_trap_p instead
26758         of replicating it with different semantics.
26759         * Makefile.in (emit-rtl.o): Adjust.
26760
26761 2011-01-18  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
26762
26763         * config/arm/cortex-a9.md (cortex-a9-neon.md): Actually include.
26764         (cortex_a9_dp): Handle neon types correctly.
26765
26766 2011-01-18  Jakub Jelinek  <jakub@redhat.com>
26767
26768         PR rtl-optimization/47299
26769         * expr.c (expand_expr_real_2) <case WIDEN_MULT_EXPR>: Don't use
26770         subtarget.  Use normal multiplication if both operands are constants.
26771         * expmed.c (expand_widening_mult): Don't try to optimize constant
26772         multiplication if op0 has VOIDmode.  Convert op1 constant to mode
26773         before using it.
26774
26775 2011-01-17  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
26776
26777         * doc/lto.texi (LTO): Ensure two spaces after period.  Fix
26778         spacing after 'e.g.', typos, comma, hyphenation.
26779
26780 2011-01-17  Richard Henderson  <rth@redhat.com>
26781
26782         * config/rx/predicates.md (rx_constshift_operand): Use match_test.
26783         (rx_restricted_mem_operand): New.
26784         (rx_shift_operand): Use register_operand.
26785         (rx_source_operand, rx_compare_operand): Likewise.
26786         * config/rx/rx.md (addsi3_flags): New expander.
26787         (adddi3): Rewrite as expander.
26788         (adc_internal, *adc_flags, adddi3_internal): New patterns.
26789         (subsi3_flags): New expander.
26790         (subdi3): Rewrite as expander.
26791         (sbb_internal, *sbb_flags, subdi3_internal): New patterns.
26792
26793         * config/rx/rx.c (RX_BUILTIN_SAT): Remove.
26794         (rx_init_builtins): Remove sat builtin.
26795         (rx_expand_builtin): Likewise.
26796         * config/rx/rx.md (ssaddsi3): New.
26797         (*sat): Rename from sat.  Represent the CC_REG input.
26798
26799         * config/rx/predicates.md (rshift_operator): New.
26800         * config/rx/rx.c (rx_expand_insv): Remove.
26801         * config/rx/rx-protos.h: Update.
26802         * config/rx/rx.md (*bitset): Rename from bitset.  Swap the ashift
26803         operand to the canonical position.
26804         (*bitset_in_memory, *bitinvert, *bitinvert_in_memory): Similarly.
26805         (*bitclr, *bitclr_in_memory): Similarly.
26806         (*insv_imm, rx_insv_reg, *insv_cond, *bmcc, *insv_cond_lt): New.
26807         (insv): Retain the zero_extract in the expansion.
26808
26809         * config/rx/rx.md (bswapsi2): Use = not + for output reload.
26810         (bswaphi2, bitinvert, revw): Likewise.
26811
26812         * config/rx/rx.c (gen_rx_store_vector): Use VOIDmode for gen_rtx_SET.
26813         (gen_rx_rtsd_vector, gen_rx_popm_vector): Likewise.
26814         * config/rx/rx.md (pop_and_return): Use VOIDmode for SET.
26815         (stack_push, stack_pushm, stack_pop, stack_popm): Likewise.
26816         (bitset, bitset_in_memory): Likewise.
26817         (bitinvert, bitinvert_in_memory): Likewise.
26818         (bitclr, bitclr_in_memory): Likewise.
26819         (insv, sync_lock_test_and_setsi, movstr, rx_movstr): Likewise.
26820         (rx_strend, rx_cmpstrn): Likewise.
26821         (rx_setmem): Likewise.  Make the source BLKmode to match the dest.
26822         (bitop peep2 patterns): Remove.
26823
26824         * config/rx/rx.c (rx_match_ccmode): New.
26825         * config/rx/rx-protos.h: Update.
26826         * config/rx/rx.md (abssi2): Clobber, don't set flags.
26827         (addsi3, adddi3, andsi3, negsi2, one_cmplsi2, iorsi3): Likewise.
26828         (rotlsi3, rotrsi3, ashrsi3, lshrsi3, ashlsi3): Likewise.
26829         (subsi3, subdi3, xorsi3, addsf3, divsf3, mulsf3, subsf3): Likewise.
26830         (fix_truncsfsi2, floatsisf2): Likewise.
26831         (*abssi2_flags, *addsi3_flags, *andsi3_flags, *negsi2_flags): New.
26832         (*one_cmplsi2_flags, *iorsi3_flags, *rotlsi3_flags): New.
26833         (*rotrsi3_flags, *ashrsi3_flags, *lshrsi3_flags, *ashlsi3_flags): New.
26834         (*subsi3_flags, *xorsi3_flags): New.
26835
26836         * config/rx/rx.md (cstoresf4, *cstoresf4): New patterns.
26837
26838         * config/rx/rx.c (rx_print_operand): Remove workaround for
26839         unsplit comparison operations.
26840
26841         * config/rx/rx.md (movsicc): Split after reload.
26842         (*movsicc): Merge *movsieq and *movsine via match_operator.
26843         (*stcc): New pattern.
26844
26845         * config/rx/rx.c (rx_float_compare_mode): Remove.
26846         * config/rx/rx.h (rx_float_compare_mode): Remove.
26847         * config/rx/rx.md (cstoresi4): Split after reload.
26848         (*sccc): New pattern.
26849
26850         * config/rx/predicates.md (label_ref_operand): New.
26851         (rx_z_comparison_operator): New.
26852         (rx_zs_comparison_operator): New.
26853         (rx_fp_comparison_operator): New.
26854         * config/rx/rx.c (rx_print_operand) [B]: Examine comparison modes.
26855         Validate that the flags are set properly for the comparison.
26856         (rx_gen_cond_branch_template): Remove.
26857         (rx_cc_modes_compatible): Remove.
26858         (mode_from_flags): New.
26859         (flags_from_code): Rename from flags_needed_for_conditional.
26860         (rx_cc_modes_compatible): Re-write in terms of flags_from_mode.
26861         (rx_select_cc_mode): Likewise.
26862         (rx_split_fp_compare): New.
26863         (rx_split_cbranch): New.
26864         * config/rx/rx.md (most_cond, zs_cond): Remove iterators.
26865         (*cbranchsi4): Use match_operator and rx_split_cbranch.
26866         (*cbranchsf4): Similarly.
26867         (*cbranchsi4_tst): Rename from *tstbranchsi4_<code>.  Use
26868         match_operator and rx_split_cbranch.
26869         (*cbranchsi4_tst_ext): Combine *tstbranchsi4m_eq and
26870         tstbranchsi4m_ne.  Use match_operator and rx_split_cbranch.
26871         (*cmpsi): Rename from cmpsi.
26872         (*tstsi): Rename from tstsi.
26873         (*cmpsf): Rename from cmpsf; use CC_Fmode.
26874         (*conditional_branch): Rename from conditional_branch.
26875         (*reveresed_conditional_branch): Remove.
26876         (b<code>): Remove expander.
26877         * config/rx/rx-protos.h: Update.
26878
26879         * config/rx/rx.c (rx_compare_redundant): Remove.
26880         * config/rx/rx.md (cmpsi): Don't use it.
26881         * config/rx/rx-protos.h: Update.
26882
26883         * config/rx/rx-modes.def (CC_F): New mode.
26884         * config/rx/rx.c (rx_select_cc_mode): New.
26885         * config/rx/rx.h (SELECT_CC_MODE): Use it.
26886         * config/rx/rx-protos.h: Update.
26887
26888 2011-01-17  Richard Henderson  <rth@redhat.com>
26889
26890         * except.c (dump_eh_tree): Fix stray ; after for statement.
26891
26892 2011-01-17  Richard Guenther  <rguenther@suse.de>
26893
26894         PR tree-optimization/47313
26895         * tree-inline.c (tree_function_versioning): Move DECL_RESULT
26896         handling before copying the body.  Properly deal with
26897         by-reference result in SSA form.
26898
26899 2011-01-17  Ian Lance Taylor  <iant@google.com>
26900
26901         PR target/47219
26902         * config/sparc/sparc.c (sparc_sr_alias_set): Don't define.
26903         (struct_value_alias_set): Don't define.
26904         (sparc_option_override): Don't set sparc_sr_alias_set and
26905         struct_value_alias_set.
26906         (save_or_restore_regs): Use gen_frame_mem rather than calling
26907         set_mem_alias_set.
26908         (sparc_struct_value_rtx): Likewise.
26909
26910 2011-01-17  H.J. Lu  <hongjiu.lu@intel.com>
26911
26912         PR target/47318
26913         * config/i386/avxintrin.h (_mm_maskload_pd): Change mask to __m128i.
26914         (_mm_maskstore_pd): Likewise.
26915         (_mm_maskload_ps): Likewise.
26916         (_mm_maskstore_ps): Likewise.
26917         (_mm256_maskload_pd): Change mask to __m256i.
26918         (_mm256_maskstore_pd): Likewise.
26919         (_mm256_maskload_ps): Likewise.
26920         (_mm256_maskstore_ps): Likewise.
26921
26922         * config/i386/i386-builtin-types.def: Updated.
26923         (ix86_expand_special_args_builtin): Likewise.
26924
26925         * config/i386/i386.c (bdesc_special_args): Update
26926         __builtin_ia32_maskloadpd, __builtin_ia32_maskloadps,
26927         __builtin_ia32_maskloadpd256, __builtin_ia32_maskloadps256,
26928         __builtin_ia32_maskstorepd, __builtin_ia32_maskstoreps,
26929         __builtin_ia32_maskstorepd256 and __builtin_ia32_maskstoreps256.
26930
26931         * config/i386/sse.md (avx_maskload<ssemodesuffix><avxmodesuffix>):
26932         Use <avxpermvecmode> on mask register.
26933         (avx_maskstore<ssemodesuffix><avxmodesuffix>): Likewise.
26934
26935 2011-01-17  Olivier Hainque  <hainque@adacore.com>
26936             Michael Haubenwallner  <michael.haubenwallner@salomon.at>
26937             Eric Botcazou  <ebotcazou@adacore.com>
26938
26939         PR target/46655
26940         * xcoffout.c (ASM_OUTPUT_LINE): Output line only if positive, and only
26941         if <= USHRT_MAX in 32-bit mode.
26942
26943 2011-01-17  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
26944
26945         * doc/install.texi (Configuration, Specific): Wrap long
26946         lines in examples.  Allow line wrapping in long options
26947         and URLs where beneficial for PDF output.
26948
26949 2011-01-16  Richard Sandiford  <rdsandiford@googlemail.com>
26950
26951         * config/mips/mips.c (mips_classify_symbol): Don't return
26952         SYMBOL_PC_RELATIVE for nonlocal labels.
26953
26954 2011-01-15  Eric Botcazou  <ebotcazou@adacore.com>
26955
26956         * config/sparc/sol2-bi.h (CC1_SPEC): Fix typo.
26957
26958 2011-01-15  Jan Hubicka  <jh@suse.cz>
26959
26960         PR tree-optimization/47276
26961         * ipa.c (function_and_variable_visibility): Do not try to mark alias
26962         declarations as needed.
26963
26964 2011-01-15  Martin Jambor  <mjambor@suse.cz>
26965
26966         * common.opt (fdevirtualize): New flag.
26967         * doc/invoke.texi (Option Summary): Document it.
26968         * opts.c (default_options_table): Add devirtualize flag.
26969         * ipa-prop.c (detect_type_change): Return immediately if
26970         devirtualize flag is not set.
26971         (detect_type_change_ssa): Likewise.
26972         (compute_known_type_jump_func): Likewise.
26973         (ipa_analyze_virtual_call_uses): Likewise.
26974
26975 2011-01-14  Martin Jambor  <mjambor@suse.cz>
26976
26977         PR tree-optimization/45934
26978         PR tree-optimization/46302
26979         * ipa-prop.c (type_change_info): New type.
26980         (stmt_may_be_vtbl_ptr_store): New function.
26981         (check_stmt_for_type_change): Likewise.
26982         (detect_type_change): Likewise.
26983         (detect_type_change_ssa): Likewise.
26984         (compute_complex_assign_jump_func): Check for dynamic type change.
26985         (compute_complex_ancestor_jump_func): Likewise.
26986         (compute_known_type_jump_func): Likewise.
26987         (compute_scalar_jump_functions): Likewise.
26988         (ipa_analyze_virtual_call_uses): Likewise.
26989         (ipa_analyze_node): Push and pop cfun, set current_function_decl.
26990
26991 2011-01-14  Joseph Myers  <joseph@codesourcery.com>
26992
26993         * config/i386/i386.h (CC1_CPU_SPEC_1): Don't handle -msse5.
26994         * config/i386/i386.opt (msse5): New Alias.
26995
26996 2011-01-14  Joseph Myers  <joseph@codesourcery.com>
26997
26998         * config/sparc/linux.h (CC1_SPEC): Remove %{sun4:} %{target:}.
26999         * config/sparc/linux64.h (CC1_SPEC): Likewise.
27000         * config/sparc/netbsd-elf.h (CC1_SPEC32, CC1_SPEC64): Likewise.
27001         * config/sparc/sparc.h (CC1_SPEC): Likewise.
27002
27003 2011-01-14  Joseph Myers  <joseph@codesourcery.com>
27004
27005         * config/sparc/linux.h (CC1_SPEC): Don't handle old equivalents of
27006         -mcpu options.
27007         * config/sparc/linux64.h (CC1_SPEC): Likewise.
27008         * config/sparc/netbsd-elf.h (CC1_SPEC32, CC1_SPEC64): Likewise.
27009         * config/sparc/sol2-bi.h (CPP_CPU_SPEC, CC1_SPEC): Likewise.
27010         * config/sparc/sparc.h (CPP_CPU_SPEC, CC1_SPEC, ASM_CPU_SPEC):
27011         Likewise.
27012         * config/sparc/t-elf (MULTILIB_MATCHES): Don't handle -mv8.
27013
27014 2011-01-14  Joseph Myers  <joseph@codesourcery.com>
27015
27016         * config/rs6000/vxworks.h (CC1_SPEC): Don't handle -fvec or -fvec-eabi.
27017
27018 2011-01-14  Mike Stump  <mikestump@comcast.net>
27019
27020         * config/alpha/alpha.md (umk_mismatch_args): Don't put a mode on set.
27021         * config/fr30/fr30.md: Likweise
27022         (movsi_push): Likewise.
27023         (movsi_pop): Likewise.
27024         (enter_func): Likewise.
27025         * config/moxie/moxie.md (movsi_push): Likewise.
27026         (movsi_pop): Likewise.
27027
27028 2011-01-14  Joseph Myers  <joseph@codesourcery.com>
27029
27030         * config/mips/linux64.h (LINK_SPEC): Remove %{bestGnum}
27031         %{no_archive} %{exact_version}.
27032         * config/mips/mips.h (LINK_SPEC): Remove %{bestGnum}.
27033         * config/mips/netbsd.h (LINK_SPEC): Remove %{bestGnum}
27034         %{no_archive} %{exact_version}.
27035         * config/mips/openbsd.h (LINK_SPEC): Likewise.
27036         * config/mips/sde.h (LINK_SPEC): Remove %{bestGnum}.
27037         * config/mips/vxworks.h: Likewise.
27038
27039 2011-01-14  Joseph Myers  <joseph@codesourcery.com>
27040
27041         * config/microblaze/microblaze.h (ASM_SPEC): Remove %{microblaze1}.
27042
27043 2011-01-14  Joseph Myers  <joseph@codesourcery.com>
27044
27045         * config/m32r/little.h (CPP_ENDIAN_SPEC, CC1_ENDIAN_SPEC,
27046         ASM_ENDIAN_SPEC, LINK_ENDIAN_SPEC): Remove.
27047
27048 2011-01-14  Joseph Myers  <joseph@codesourcery.com>
27049
27050         * config/i386/nwld.h (LINK_SPEC): Check -nodefaultlibs not
27051         -nodefaultlib.
27052
27053 2011-01-14  Joseph Myers  <joseph@codesourcery.com>
27054
27055         * config/cris/cris.h (ASM_SPEC, CRIS_ASM_SUBTARGET_SPEC): Check
27056         for mcpu not cpu.
27057         * config/cris/linux.h (CRIS_CPP_SUBTARGET_SPEC,
27058         CRIS_CC1_SUBTARGET_SPEC, CRIS_ASM_SUBTARGET_SPEC): Check for mcpu
27059         not cpu.
27060         (CRIS_LINK_SUBTARGET_SPEC): Don't generate -rpath-link options.
27061         Don't handle -shlib.
27062
27063 2011-01-14  Joseph Myers  <joseph@codesourcery.com>
27064
27065         * config/avr/avr.h (CPP_SPEC): Don't handle -posix.
27066         (CC1_SPEC): Don't handle -profile.
27067
27068 2011-01-14  Joseph Myers  <joseph@codesourcery.com>
27069
27070         * config/microblaze/microblaze.h (CC1_SPEC): Remove -gline spec.
27071         * config/mips/mips.h (CC1_SPEC): Likewise.
27072
27073 2011-01-14  Joseph Myers  <joseph@codesourcery.com>
27074
27075         * config/microblaze/microblaze.h (CC1_SPEC): Remove %{save-temps: }.
27076         * config/mips/mips.h (CC1_SPEC): Likewise.
27077
27078 2011-01-14  Joseph Myers  <joseph@codesourcery.com>
27079
27080         * config/i386/linux.h (LINK_SPEC): Don't use %{!ibcs:} conditional.
27081         * config/m32r/linux.h (LINK_SPEC): Likewise.
27082         * config/mips/linux.h (LINK_SPEC): Likewise.
27083         * config/mips/linux64.h (LINK_SPEC): Likewise.
27084         * config/sparc/linux.h (LINK_SPEC): Likewise.
27085         * config/sparc/linux64.h (LINK_ARCH32_SPEC, LINK_ARCH64_SPEC,
27086         LINK_SPEC): Likewise.
27087         * config/xtensa/linux.h (LINK_SPEC): Likewise.
27088
27089 2011-01-14  Joseph Myers  <joseph@codesourcery.com>
27090
27091         * config/arm/linux-elf.h (LINUX_TARGET_LINK_SPEC): Remove
27092         %{version:-v}.
27093         * config/lm32/uclinux-elf.h (LINK_SPEC): Likewise.
27094
27095 2011-01-14  Joseph Myers  <joseph@codesourcery.com>
27096
27097         * config/sparc/sp-elf.h (ASM_SPEC): Remove %{v:-V}.
27098         * config/sparc/sp64-elf.h (ASM_SPEC): Likewise.
27099
27100 2011-01-14  Joseph Myers  <joseph@codesourcery.com>
27101
27102         * config/arm/linux-elf.h (LINUX_TARGET_LINK_SPEC): Remove %{b}.
27103
27104 2011-01-14  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
27105
27106         * configure.ac (gcc_cv_ld_static_dynamic): Solaris 2 ld always
27107         supports -Bstatic/-Bdynamic.
27108         * configure: Regenerate.
27109
27110 2011-01-14  Jan Hubicka  <jh@suse.cz>
27111             Jack Howarth  <howarth@bromo.med.uc.edu>
27112
27113         PR target/46037
27114         * config/darwin.c (darwin_override_options): Honor flag_gtoggle
27115         when checking debug_info_level. Test write_symbols instead of
27116         debug_hooks->var_location when setting flag_var_tracking_uninit.
27117
27118 2011-01-14  Richard Guenther  <rguenther@suse.de>
27119
27120         PR tree-optimization/47179
27121         * target.def (ref_may_alias_errno): New target hook.
27122         * targhooks.h (default_ref_may_alias_errno): Declare.
27123         * targhooks.c: Include tree-ssa-alias.h and tree-flow.h.
27124         (default_ref_may_alias_errno): New function.
27125         * target.h (struct ao_ref_s): Declare.
27126         * tree-ssa-alias.c: Include target.h.
27127         (call_may_clobber_ref_p_1): Use the ref_may_alias_errno target hook.
27128         * Makefile.in (tree-ssa-alias.o): Adjust dependencies.
27129         (targhooks.o): Likewise.
27130         * doc/tm.texi.in (TARGET_REF_MAY_ALIAS_ERRNO): Document.
27131         * doc/tm.texi (TARGET_REF_MAY_ALIAS_ERRNO): Copy documentation.
27132
27133 2011-01-14  Richard Guenther  <rguenther@suse.de>
27134
27135         * tree-ssa-structalias.c  (new_var_info): Use DECL_HARD_REGISTER.
27136
27137 2011-01-14  Richard Guenther  <rguenther@suse.de>
27138
27139         PR tree-optimization/47280
27140         * tree-ssa-forwprop.c (associate_plusminus): Cleanup EH and
27141         return CFG changes.
27142         (tree_ssa_forward_propagate_single_use_vars): Deal with
27143         CFG changes from associate_plusminus.
27144
27145 2011-01-14  Richard Guenther  <rguenther@suse.de>
27146
27147         PR middle-end/47281
27148         Revert
27149         2011-01-11  Richard Guenther  <rguenther@suse.de>
27150
27151         PR tree-optimization/46076
27152         * tree-ssa.c (useless_type_conversion_p): Conversions from
27153         unprototyped to empty argument list function types are useless.
27154
27155 2011-01-14  Richard Guenther  <rguenther@suse.de>
27156
27157         PR tree-optimization/47286
27158         * tree-ssa-structalias.c (new_var_info): Register variables are global.
27159
27160 2011-01-14  Martin Jambor  <mjambor@suse.cz>
27161
27162         PR middle-end/46823
27163         * tree-inline.c (expand_call_inline): Get fndecl from call graph edge.
27164
27165 2011-01-13  Anatoly Sokolov  <aesok@post.ru>
27166
27167         * config/xtensa/xtensa.h (XTENSA_LIBCALL_VALUE, LIBCALL_VALUE,
27168         LIBCALL_OUTGOING_VALUE, FUNCTION_VALUE_REGNO_P): Remove macros.
27169         * config/xtensa/xtensa.c (xtensa_libcall_value,
27170         xtensa_function_value_regno_p): New functions.
27171         (TARGET_LIBCALL_VALUE, TARGET_FUNCTION_VALUE_REGNO_P): Define.
27172
27173 2011-01-13  Kai Tietz  <kai.tietz@onevision.com>
27174
27175         PR c++/47213
27176         * config/i386/cygming.h (TARGET_ASM_ASSEMBLE_VISIBILITY):
27177         PE specific hook.
27178         * config/i386/i386-protos.h (i386_pe_assemble_visibility):
27179         New function prototype.
27180         * config/i386/winnt.c (i386_pe_assemble_visibility):
27181         Warn only if attribute was specified by user.
27182
27183 2011-01-13  Michael Meissner  <meissner@linux.vnet.ibm.com>
27184
27185         PR target/47251
27186         * config/rs6000/rs6000.md (floatunsdidf2): Add check for hardware
27187         floating point.
27188         (floatunsdidf2_fcfidu): Ditto.
27189
27190 2011-01-13  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
27191
27192         * config/s390/s390.c (print_operand_address): Replace 'error' with
27193         'output_operand_lossage'.
27194         (print_operand): Likewise.
27195
27196 2011-01-13  Jeff Law  <law@redhat.com>
27197
27198         PR rtl-optimization/39077
27199         * doc/invoke.texi (max-gcse-insertion-ratio): Document.
27200         * params.h (MAX_GCSE_INSERTION_RATIO): Define.
27201         * params.def (PARAM_MAX_GCSE_INSERTION_RATIO): Define.
27202         * lcm.c (pre_edge_lcm): Properly initialize output sbitmaps.
27203         * gcse.c (prune_insertions_deletions): New function.
27204         (compute_pre_data): Use it.
27205
27206 2011-01-13  Dodji Seketeli  <dodji@redhat.com>
27207
27208         PR debug/PR46973
27209         * dwarf2out.c (prune_unused_types_mark_generic_parms_dies): New
27210         static function.
27211         (prune_unused_types_mark): Use it.
27212
27213 2011-01-13  Andrey Belevantsev  <abel@ispras.ru>
27214
27215         PR rtl-optimization/45352
27216         * sel-sched.c: Update copyright years.
27217         (reset_sched_cycles_in_current_ebb): Also recheck the DFA state
27218         in the advancing loop when we have issued issue_rate insns.
27219
27220 2011-01-12  Richard Henderson  <rth@redhat.com>
27221
27222         * config/mn10300/mn10300.c (mn10300_md_asm_clobbers): New.
27223         (TARGET_MD_ASM_CLOBBERS): New.
27224
27225         * config/mn10300/mn10300.c (mn10300_delegitimize_address): New.
27226         (TARGET_DELEGITIMIZE_ADDRESS): New.
27227
27228         * config/mn10300/mn10300.md (UNSPEC_BSCH): New.
27229         (clzsi2, *bsch): New patterns.
27230
27231         * config/mn10300/mn10300.md (INT): New mode iterator.
27232         (*mov<INT>_clr): New pattern, and peep2 to generate it.
27233
27234         * config/mn10300/mn10300.c (mn10300_option_override): Force enable
27235         flag_split_wide_types.
27236
27237         * config/mn10300/mn10300.c (mn10300_asm_trampoline_template): Remove.
27238         (mn10300_trampoline_init): Rewrite without a template, an immediate
27239         load and a direct branch.
27240         * config/mn10300/mn10300.h (TRAMPOLINE_SIZE): Reduce to 16.
27241
27242 2011-01-12  Anatoly Sokolov  <aesok@post.ru>
27243
27244         * config/s390/s390.h (OUTPUT_ADDR_CONST_EXTRA): Remove.
27245         * config/s390/s390-protos.h (s390_output_addr_const_extra): Remove.
27246         * config/s390/s390.c (s390_output_addr_const_extra): Make static.
27247         (TARGET_ASM_OUTPUT_ADDR_CONST_EXTRA): Define.
27248
27249 2011-01-12  Kai Tietz  <kai.tietz@onevision.com>
27250
27251         PR debug/47209
27252         * dwarfout2.c (should_emit_struct_debug): Use TYPE_MAIN_VARIANT
27253         of type.
27254
27255 2011-01-12  Jan Hubicka  <jh@suse.cz>
27256
27257         PR driver/47244
27258         * gcc.c (PLUGIN_COND): Update to disable plugin unless -flto is used.
27259         (PLUGIN_COND_CLOSE): New macro.
27260         (LINK_COMMAND_SPEC): Update to use PLUGIN_COND_CLOSE.
27261
27262 2011-01-12  Richard Guenther  <rguenther@suse.de>
27263
27264         PR lto/47259
27265         * lto-streamer-out.c (output_gimple_stmt): Do not wrap
27266         register variables in a MEM_REF.
27267
27268 2011-01-12  Joseph Myers  <joseph@codesourcery.com>
27269
27270         * config.gcc (arm*-*-linux*, bfin*-uclinux*, bfin*-linux-uclibc*,
27271         crisv32-*-linux* | cris-*-linux*, frv-*-*linux*, moxie-*-uclinux*,
27272         hppa*64*-*-linux*, hppa*-*-linux*, i[34567]86-*-linux* |
27273         i[34567]86-*-kfreebsd*-gnu | i[34567]86-*-knetbsd*-gnu |
27274         i[34567]86-*-gnu* | i[34567]86-*-kopensolaris*-gnu,
27275         x86_64-*-linux* | x86_64-*-kfreebsd*-gnu | x86_64-*-knetbsd*-gnu,
27276         ia64*-*-linux*, lm32-*-uclinux*, m32r-*-linux*, m32rle-*-linux*,
27277         m68k-*-uclinux*, m68k-*-linux*, microblaze*-linux*,
27278         mips64*-*-linux* | mipsisa64*-*-linux*, mips*-*-linux*,
27279         s390-*-linux*, s390x-*-linux*, sh*-*-linux*, sparc-*-linux*,
27280         sparc64-*-linux*, vax-*-linux*, xtensa*-*-linux*,
27281         am33_2.0-*-linux*): Use gnu-user.h before linux.h.
27282         * config/gnu-user.h: New.  Copied from linux.h.
27283         (LINUX_TARGET_STARTFILE_SPEC): Rename to
27284         GNU_USER_TARGET_STARTFILE_SPEC.
27285         (LINUX_TARGET_ENDFILE_SPEC): Rename to
27286         GNU_USER_TARGET_ENDFILE_SPEC.
27287         (LINUX_TARGET_CC1_SPEC): Rename to GNU_USER_TARGET_CC1_SPEC.
27288         (LINUX_TARGET_LIB_SPEC): Rename to GNU_USER_TARGET_LIB_SPEC.
27289         (OPTION_GLIBC, OPTION_UCLIBC, OPTION_BIONIC,
27290         LINUX_TARGET_OS_CPP_BUILTINS, CHOOSE_DYNAMIC_LINKER1,
27291         CHOOSE_DYNAMIC_LINKER, UCLIBC_DYNAMIC_LINKER,
27292         UCLIBC_DYNAMIC_LINKER32, UCLIBC_DYNAMIC_LINKER64,
27293         BIONIC_DYNAMIC_LINKER, BIONIC_DYNAMIC_LINKER32,
27294         BIONIC_DYNAMIC_LINKER64, LINUX_DYNAMIC_LINKER,
27295         LINUX_DYNAMIC_LINKER32, LINUX_DYNAMIC_LINKER64,
27296         TARGET_C99_FUNCTIONS, TARGET_HAS_SINCOS): Remove.
27297         * config/arm/linux-eabi.h (CC1_SPEC): Use
27298         GNU_USER_TARGET_CC1_SPEC.
27299         (LIB_SPEC): Use GNU_USER_TARGET_LIB_SPEC.
27300         (STARTFILE_SPEC): Use GNU_USER_TARGET_STARTFILE_SPEC.
27301         (ENDFILE_SPEC): Use GNU_USER_TARGET_ENDFILE_SPEC
27302         * config/linux.h (NO_IMPLICIT_EXTERN_C, ASM_APP_ON, ASM_APP_OFF,
27303         LINUX_TARGET_STARTFILE_SPEC, STARTFILE_SPEC,
27304         LINUX_TARGET_ENDFILE_SPEC, ENDFILE_SPEC, LINUX_TARGET_CC1_SPEC,
27305         CC1_SPEC, CPLUSPLUS_CPP_SPEC, LINUX_TARGET_LIB_SPEC, LIB_SPEC,
27306         LINK_EH_SPEC, LINK_GCC_C_SEQUENCE_SPEC, USE_LD_AS_NEEDED): Remove.
27307
27308 2011-01-12  Richard Guenther  <rguenther@suse.de>
27309
27310         PR other/46946
27311         * doc/invoke.texi (ffast-math): Document it is turned on
27312         with -Ofast.
27313
27314 2011-01-12  Jan Hubicka  <jh@suse.cz>
27315
27316         PR tree-optimization/47233
27317         * opts.c (common_handle_option): Disable ipa-reference with profile
27318         feedback.
27319
27320 2011-01-12  Nicola Pero  <nicola.pero@meta-innovation.com>
27321
27322         * c-parser.c (c_parser_objc_at_property_declaration): Improved
27323         error message.
27324
27325 2011-01-12  Nicola Pero  <nicola.pero@meta-innovation.com>
27326
27327         * c-parser.c (c_lex_one_token): Updated and reindented some
27328         comments.  No changes in code.
27329
27330 2011-01-11  Ian Lance Taylor  <iant@google.com>
27331
27332         * godump.c (go_output_var): Don't output the variable if there is
27333         already a type with the same name.
27334
27335 2011-01-11  Ian Lance Taylor  <iant@google.com>
27336
27337         * godump.c (go_format_type): Don't generate float80.
27338
27339 2011-01-11  Richard Henderson  <rth@redhat.com>
27340
27341         * config/mn10300/mn10300.c (mn10300_address_cost): Remove forward
27342         declaration.  Rewrite for both speed and size.
27343         (mn10300_address_cost_1): Remove.
27344         (mn10300_register_move_cost): New.
27345         (mn10300_memory_move_cost): New.
27346         (mn10300_rtx_costs): Rewrite for both speed and size.  Don't handle
27347         ZERO_EXTRACT.  Do handle UNSPEC, arithmetic, logicals, compare,
27348         extensions, shifts, BSWAP, CLZ.
27349         (mn10300_wide_const_load_uses_clr): Remove.
27350         (TARGET_REGISTER_MOVE_COST): New.
27351         (TARGET_MEMORY_MOVE_COST): New.
27352         * config/mn10300/mn10300-protos.h: Update.
27353         * config/mn10300/mn10300.h (REGISTER_MOVE_COST): Remove.
27354
27355         * config/mn10300/constraints.md ("R", "T"): Remove constraints.
27356         * config/mn10300/mn10300.c (mn10300_mask_ok_for_mem_btst): Remove.
27357         * config/mn10300/mn10300-protos.h: Update.
27358         * config/mn10300/mn10300.md (movsi_internal): Don't use "R".
27359         (*byte_clear, *byte_set, *bit_clear1, *bit_clear2, *bit_set): Remove.
27360         (iorqi3, *am33_iorqi3, *mn10300_iorqi3): Remove.
27361         (*test_int_bitfield, *test_byte_bitfield): Remove.
27362         (*bit_test, *subreg_bit_test): Remove.
27363         * config/mn10300/predicates.md (const_8bit_operand): Remove.
27364
27365         * config/mn10300/constraints.md ("c"): Rename from "A".
27366         ("A", "D"): New constraint letters.
27367         * config/mn10300/mn10300.md (fmasf4): Use the "c" constraint.
27368         (fmssf4, fnmasf4, fnmssf4): Likewise.
27369
27370         * config/mn10300/mn10300.md (isa): New attribute.
27371         (enabled): New attribute.
27372
27373         * config/mn10300/mn10300.md (absdf2, negdf2): Remove.
27374         (abssf2, negsf2): Define only for hardware fp.
27375         (sqrtsf2): Reformat.
27376         (addsf3, subsf3, mulsf3): Merge expander and insn.
27377
27378         * config/mn10300/mn10300.h (ARG_PIONTER_CFA_OFFSET): New.
27379         (DEBUGGER_AUTO_OFFSET): Remove.
27380         (DEBUGGER_ARG_OFFSET): Remove.
27381
27382         * config/mn10300/mn10300.c (mn10300_gen_multiple_store): Make static.
27383         Emit register stores with the same offsets as the hardware.
27384         (mn10300_store_multiple_operation): Don't check that the register
27385         save offsets are monotonic.
27386         * config/mn10300/mn10300-protos.h: Update.
27387
27388         * config/mn10300/mn10300.h (ASM_PN_FORMAT): Delete.
27389
27390         * config/mn10300/mn10300.h (INCOMING_RETURN_ADDR_RTX): Define
27391         in terms of the value on the stack, not the MDR register.
27392
27393 2011-01-11  Jan Hubicka  <jh@suse.cz>
27394
27395         PR lto/45721
27396         PR lto/45375
27397         * tree.h (symbol_alias_set_t): Move typedef here from varasm.c
27398         (symbol_alias_set_destroy, symbol_alias_set_contains,
27399         propagate_aliases_backward): Declare.
27400         * lto-streamer-out.c (struct sets): New sturcture.
27401         (trivally_defined_alias): New function.
27402         (output_alias_pair_p): Rewrite.
27403         (output_unreferenced_globals): Fix output of alias pairs.
27404         (produce_symtab): Likewise.
27405         * ipa.c (function_and_variable_visibility): Set weak alias destination
27406         as needed in lto.
27407         * varasm.c (symbol_alias_set_t): Remove.
27408         (symbol_alias_set_destroy): Export.
27409         (propagate_aliases_forward, propagate_aliases_backward): New functions
27410         based on ...
27411         (compute_visible_aliases): ... this one; remove.
27412         (trivially_visible_alias): New
27413         (trivially_defined_alias): New.
27414         (remove_unreachable_alias_pairs): Rewrite.
27415         (finish_aliases_1): Reorganize code checking if alias is defined.
27416         * passes.c (rest_of_decl_compilation): Do not call assemble_alias when
27417         in LTO mode.
27418
27419 2011-01-11  Richard Guenther  <rguenther@suse.de>
27420
27421         PR tree-optimization/46076
27422         * tree-ssa.c (useless_type_conversion_p): Conversions from
27423         unprototyped to empty argument list function types are useless.
27424
27425 2011-01-11  Richard Guenther  <rguenther@suse.de>
27426
27427         PR middle-end/45235
27428         * emit-rtl.c (set_mem_attributes_minus_bitpos): Do not mark
27429         volatile MEMs as MEM_READONLY_P.
27430
27431 2011-01-11  Richard Guenther  <rguenther@suse.de>
27432
27433         PR tree-optimization/47239
27434         * tree-ssa-ccp.c (get_value_from_alignment): Punt for FUNCTION_DECLs.
27435
27436 2011-01-11  Jeff Law  <law@redhat.com>
27437
27438         PR tree-optimization/47086
27439         * tree-ssa-loop-ivopts.c (find_givs_in_stmt_scev): Do not record
27440         IVs from statements that might throw.
27441
27442 2011-01-10  Jan Hubicka  <jh@suse.cz>
27443
27444         PR lto/45375
27445         * lto-cgraph.c (input_profile_summary): Remove overactive sanity check.
27446
27447 2011-01-10  Jan Hubicka  <jh@suse.cz>
27448
27449         PR lto/45375
27450         * profile.c (read_profile_edge_counts): Ignore profile inconistency
27451         when correcting profile.
27452
27453 2011-01-10  Jan Hubicka  <jh@suse.cz>
27454
27455         PR lto/46083
27456         * lto-streamer-out.c (pack_ts_function_decl_value_fields): Store
27457         DECL_FINI_PRIORITY.
27458         * lto-streamer-in.c (unpack_ts_function_decl_value_fields):
27459         Restore DECL_FINI_PRIORITY.
27460
27461 2011-01-10  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
27462
27463         * doc/gimple.texi: Fix quoting of multi-word return values in
27464         @deftypefn statements.  Ensure presence of return value.  Wrap
27465         overlong @deftypefn lines.
27466         (is_gimple_operand, is_gimple_min_invariant_address): Remove
27467         descriptions of removed functions.
27468         * doc/hostconfig.texi (Host Common): Wrap long line, fix quoting
27469         of multi-word return value in @deftypefn statement.
27470
27471 2011-01-10  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
27472
27473         * doc/gimple.texi (Temporaries, Operands, Compound Lvalues)
27474         (Conditional Expressions, Logical Operators)
27475         (Statement and operand traversals): Do not indent smallexample
27476         code.  Fix duplicate function argument in example.
27477
27478 2011-01-10  Jeff Law  <law@redhat.com>
27479
27480         PR tree-optimization/47141
27481         * ipa-split.c (split_function): Handle case where we are
27482         returning a value and the return block has a virtual operand phi.
27483
27484 2011-01-10  Jan Hubicka  <jh@suse.cz>
27485
27486         PR tree-optimization/47234
27487         * tree-pass.h (TODO_rebuild_cgraph_edges): New TODO.
27488         (pass_feedback_split_functions): Declare.
27489         * passes.c (init_optimization_passes): Add ipa-split as subpass of
27490         tree-profile.
27491         * ipa-split.c (gate_split_functions): Update comments; disable
27492         split-functions for profile_arc_flag and branch_probabilities.
27493         (gate_feedback_split_functions): New function.
27494         (execute_feedback_split_functions): New function.
27495         (pass_feedback_split_functions): New global var.
27496
27497 2011-01-10  H.J. Lu  <hongjiu.lu@intel.com>
27498
27499         PR lto/46760
27500         * tree-inline.c (tree_can_inline_p): Check e->call_stmt before
27501         calling gimple_call_set_cannot_inline.
27502
27503 2011-01-10  Iain Sandoe  <iains@gcc.gnu.org>
27504
27505         * config/darwin-sections.def: Remove unused section.
27506
27507 2011-01-10  Dave Korn  <dave.korn.cygwin@gmail.com>
27508
27509         PR c++/47218
27510         * cgraphunit.c (assemble_thunk): Call resolve_unique_section.
27511
27512 2011-01-09  Nicola Pero  <nicola.pero@meta-innovation.com>
27513
27514         PR objc/47232
27515         * c-parser.c (c_parser_declaration_or_fndef): Improved
27516         error message.
27517
27518 2011-01-09  Kai Tietz  <kai.tietz@onevision.com>
27519
27520         * config/i386/winnt.c (i386_pe_start_function): Make sure
27521         to switch back to function's section.
27522
27523 2011-01-09  Iain Sandoe  <iains@gcc.gnu.org>
27524
27525         PR gcc/46902
27526         PR testsuite/46912
27527         * plugin.c: Move include of dlfcn.h from here...
27528         * system.h: ... to here.
27529
27530 2011-01-09  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
27531
27532         * doc/cpp.texi (C++ Named Operators): Fix markup for header
27533         file name.
27534         * doc/cppinternals.texi (Top): Wrap node in @ifnottex to avoid
27535         two extra empty pages in PDF output.
27536
27537 2011-01-08  Nicola Pero  <nicola.pero@meta-innovation.com>
27538
27539         PR objc/47078
27540         * c-parser.c (c_parser_objc_type_name): If the type is unknown,
27541         for error recovery purposes behave as if it was not specified so
27542         that the default type is usd.
27543
27544 2011-01-07  Jan Hubicka  <jh@suse.cz>
27545
27546         PR tree-optmization/46469
27547         * ipa.c (function_and_variable_visibility): Clear needed flags on
27548         nodes with external decls; handle weakrefs merging correctly.
27549
27550 2011-01-07  Joseph Myers  <joseph@codesourcery.com>
27551
27552         * opts.c (finish_options): Set opts->x_flag_opts_finished to true,
27553         not false.
27554
27555 2011-01-07  Jan Hubicka  <jh@suse.cz>
27556
27557         * doc/invoke.texi (-flto, -fuse-linker-plugin): Update defaults
27558         and no longer claim that gold is required for linker plugin.
27559         * configure: Regenerate.
27560         * gcc.c (PLUGIN_COND): New macro.
27561         (LINK_COMMAND_SPEC): Use it.
27562         (main): Default to plugin enabled with HAVE_LTO_PLUGIN is set.
27563         * config.in (HAVE_LTO_PLUGIN): New.
27564         * configure.ac (--with-lto-plugin): New parameter; autodetect
27565         HAVE_LTO_PLUGIN.
27566
27567 2011-01-07  Jan Hubicka  <jh@suse.cz>
27568
27569         PR tree-optimization/46367
27570         * ipa-inline.c (cgraph_clone_inlined_nodes): Use original function only
27571         when we can update original.
27572         (cgraph_mark_inline_edge): Sanity check.
27573         * ipa-prop.c (ipa_make_edge_direct_to_target): Sanity check.
27574
27575 2011-01-07  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
27576
27577         * config/spu/spu.h (ASM_COMMENT_START): Define.
27578
27579 2011-01-07  H.J. Lu  <hongjiu.lu@intel.com>
27580
27581         PR driver/42445
27582         * gcc.c (%>S): New.
27583         (SWITCH_KEEP_FOR_GCC): Likewise.
27584         (set_collect_gcc_options): Check SWITCH_KEEP_FOR_GCC.
27585         (do_spec_1): Handle "%>".
27586
27587         * config/i386/i386.h (CC1_CPU_SPEC): Replace "%<" with "%>".
27588
27589 2011-01-07  Jakub Jelinek  <jakub@redhat.com>
27590
27591         PR target/47201
27592         * config/i386/i386.c (ix86_delegitimize_address): If
27593         simplify_gen_subreg fails, return orig_x.
27594
27595         PR bootstrap/47187
27596         * value-prof.c (gimple_stringop_fixed_value): Handle
27597         lhs of the call properly.
27598
27599 2011-01-07  Jan Hubicka  <jh@suse.cz>
27600
27601         PR lto/45375
27602         * lto-opt.c (lto_reissue_options): Set flag_shlib.
27603
27604 2011-01-07  Iain Sandoe  <iains@gcc.gnu.org>
27605
27606         * target.def (function_switched_text_sections): New hook.
27607         * doc/tm.texi: Regenerated.
27608         * doc/tm.texi.in (TARGET_ASM_FUNCTION_SWITCHED_TEXT_SECTIONS): New.
27609         * final.c (default_function_switched_text_sections): New.
27610         (final_scan_insn): Call function_switched_text_sections when a
27611         mid-function section change occurs.
27612         * output.h (default_function_switched_text_sections): Declare.
27613         * config/darwin-protos.h (darwin_function_switched_text_sections):
27614         Likewise.
27615         * config/darwin.c (darwin_function_switched_text_sections): New.
27616         * config/darwin.h (TARGET_ASM_FUNCTION_SWITCHED_TEXT_SECTIONS): New.
27617
27618 2011-01-07  Iain Sandoe  <iains@gcc.gnu.org>
27619
27620         * dwarf2out.c (gen_subprogram_die):  Add pubnames with code ranges for
27621         DWARF >= 3.  Add pubnames for the primary section and a reduced DIE for
27622         the secondary code fragment when outputting for DWARF == 2.
27623
27624 2011-01-07  Anatoly Sokolov  <aesok@post.ru>
27625
27626         * config/xtensa/xtensa.h (OUTPUT_ADDR_CONST_EXTRA): Remove.
27627         * config/xtensa/xtensa-protos.h (xtensa_output_addr_const_extra):
27628         Remove.
27629         * config/xtensa/xtensa.c (xtensa_output_addr_const_extra): Make static.
27630         (TARGET_ASM_OUTPUT_ADDR_CONST_EXTRA): Define.
27631
27632 2011-01-06  Eric Botcazou  <ebotcazou@adacore.com>
27633
27634         PR debug/46704
27635         * dwarf2out.c (dwarf2out_finish): Output the debug_aranges section only
27636         when it is not empty.
27637
27638 2011-01-06  Changpeng Fang  <changpeng.fang@amd.com>
27639
27640         Bobcat Enablement
27641         * config.gcc (i[34567]86-*-linux* | ...): Add btver1.
27642         (case ${target}): Add btver1.
27643         * config/i386/driver-i386.c (host_detect_local_cpu): Let
27644         -march=native recognize btver1 processors.
27645         * config/i386/i386-c.c (ix86_target_macros_internal): Add
27646         btver1 def_and_undef
27647         * config/i386/i386.c (struct processor_costs btver1_cost): New
27648         btver1 cost table.
27649         (m_BTVER1): New definition.
27650         (m_AMD_MULTIPLE): Includes m_BTVER1.
27651         (initial_ix86_tune_features): Add btver1 tune.
27652         (processor_target_table): Add btver1 entry.
27653         (static const char *const cpu_names): Add btver1 entry.
27654         (software_prefetching_beneficial_p): Add btver1.
27655         (ix86_option_override_internal): Add btver1 instruction sets.
27656         (ix86_issue_rate): Add btver1.
27657         (ix86_adjust_cost): Add btver1.
27658         * config/i386/i386.h (TARGET_BTVER1): New definition.
27659         (enum target_cpu_default): Add TARGET_CPU_DEFAULT_btver1.
27660         (enum processor_type): Add PROCESSOR_BTVER1.
27661         * config/i386/i386.md (define_attr "cpu"): Add btver1.
27662
27663 2011-01-06  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
27664
27665         PR target/43309
27666         * config/i386/i386.c (legitimize_tls_address)
27667         <TLS_MODEL_INITIAL_EXEC>: Handle TARGET_64BIT && TARGET_SUN_TLS.
27668         * config/i386/i386.md (UNSPEC_TLS_IE_SUN): Declare.
27669         (tls_initial_exec_64_sun): New pattern.
27670
27671 2011-01-06  Gerald Pfeifer  <gerald@pfeifer.com>
27672
27673         * doc/invoke.texi (Overall Options): Improve wording and markup
27674         of the description of -wrapper.
27675
27676 2011-01-06  Joseph Myers  <joseph@codesourcery.com>
27677
27678         * config/sol2.opt (G, YP,, Ym,, compat-bsd, pthread, pthreads,
27679         rdynamic, threads): New Driver options.
27680
27681 2011-01-06  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
27682
27683         PR target/38118
27684         * config/sol2.h (ASM_OUTPUT_ALIGNED_COMMON): Also switch to .bss
27685         if coming from .tdata.
27686         * config/i386/sol2-10.h (ASM_OUTPUT_ALIGNED_COMMON): Likewise.
27687
27688 2011-01-06  Jan Hubicka  <jh@suse.cz>
27689
27690         PR lto/47188
27691         * collect2.c (main): Do not enable LTOmode when plugin is active.
27692
27693 2011-01-06  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
27694
27695         PR other/45915
27696         * configure.ac (gcc_cv_as_gnu_unique_object): Only use ldd
27697         --version output if supported.
27698         * configure: Regenerate.
27699
27700 2011-01-06  Joseph Myers  <joseph@codesourcery.com>
27701
27702         * config/linux-android.opt (tno-android-cc, tno-android-ld): New
27703         Driver options.
27704
27705 2011-01-06  Jakub Jelinek  <jakub@redhat.com>
27706
27707         PR c/47150
27708         * c-convert.c (convert): When converting a complex expression
27709         other than COMPLEX_EXPR to a different complex type, ensure
27710         c_save_expr is called instead of save_expr, unless in_late_binary_op.
27711         * c-typeck.c (convert_for_assignment): Set in_late_binary_op also
27712         when converting COMPLEX_TYPE.
27713
27714 2011-01-06  Ira Rosen  <irar@il.ibm.com>
27715
27716         PR tree-optimization/47139
27717         * tree-vect-loop.c (vect_is_simple_reduction_1): Check that
27718         only the last reduction value is used outside the loop.  Update
27719         documentation.
27720
27721 2011-01-05  Joseph Myers  <joseph@codesourcery.com>
27722
27723         * config/rtems.opt: New.
27724         * config.gcc (*-*-rtems*): Use rtems.opt.
27725
27726 2011-01-05  Changpeng Fang  <changpeng.fang@amd.com>
27727
27728         * config/i386/i386.c (ix86_option_override_internal): Bulldozer
27729         processors do not support 3DNow instructions.
27730
27731 2011-01-05  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
27732
27733         * config/spu/spu.c (spu_option_override): Set parameter
27734         PARAM_MAX_COMPLETELY_PEEL_TIMES to 4 instead of 1.
27735
27736 2011-01-05  Jan Hubicka  <jh@suse.cz>
27737
27738         * lto-wrapper.c (run_gcc): Default to WHOPR mode when none is specified
27739         at the command line.
27740
27741 2011-01-05  Martin Jambor  <mjambor@suse.cz>
27742
27743         PR lto/47162
27744         * lto-cgraph.c (output_cgraph_opt_summary_p): Also check for thunk
27745         deltas on streamed outgoing edges.
27746         (output_node_opt_summary): Output info for outgoing edges only when
27747         the node is in new parameter set.
27748         (output_cgraph_opt_summary): New parameter set, passed to the two
27749         aforementioned functions.  Update its forward declaration and its
27750         callee too.
27751
27752 2011-01-05  Tom Tromey  <tromey@redhat.com>
27753
27754         * c-parser.c (c_parser_omp_atomic): Pass location of assignment
27755         operator to c_finish_omp_atomic.
27756         * c-typeck.c (lvalue_or_else): Add 'loc' argument.
27757         (build_unary_op): Update.
27758         (build_modify_expr): Update.
27759         (build_asm_expr): Update.
27760
27761 2011-01-05  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
27762
27763         * config/spu/spu.c (emit_nop_for_insn): Set INSN_LOCATOR for
27764         newly inserted insns.
27765         (pad_bb): Likewise.
27766         (spu_emit_branch_hint): Likewise.
27767         (insert_hbrp_for_ilb_runout): Likewise.
27768         (spu_machine_dependent_reorg): Call df_finish_pass after
27769         schedule_insns returns.
27770
27771 2011-01-05  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
27772
27773         * config/spu/spu.c (spu_expand_prologue): Support -fstack-usage.
27774
27775 2011-01-05  Eric Botcazou  <ebotcazou@adacore.com>
27776
27777         PR tree-optimization/47005
27778         * tree-sra.c (struct access): Add 'non_addressable' bit.
27779         (create_access): Set it for a DECL_NONADDRESSABLE_P field.
27780         (decide_one_param_reduction): Return 0 if the parameter is passed by
27781         reference and one of the accesses in the group is non_addressable.
27782
27783 2011-01-04  Eric Botcazou  <ebotcazou@adacore.com>
27784
27785         PR tree-optimization/47056
27786         * cgraphbuild.c (mark_address): Remove ATTRIBUTE_UNUSED markers.
27787         (mark_load): Likewise.  Handle FUNCTION_DECL specially.
27788         (mark_store): Likewise.  Pass STMT to ipa_record_reference.
27789
27790 2011-01-04  Eric Botcazou  <ebotcazou@adacore.com>
27791
27792         * dwarf2out.c (rtl_for_decl_init): Strip no-op conversions off the
27793         initializer.  Skip view conversions from aggregate types.
27794
27795 2011-01-04  Kai Tietz  <kai.tietz@onevision.com>
27796
27797         PR bootstrap/47055
27798         * libgcov.c (gcov_exit): Check for HAS_DRIVE_SPEC.
27799
27800 2011-01-04  Philipp Thomas  <pth@suse.de>
27801
27802         * config/microblaze/microbalse.opt (mxl-float-convert): Fix
27803         obvious typo.
27804
27805 2011-01-04  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
27806
27807         * function.c (thread_prologue_and_epilogue_insns): Do not crash
27808         on empty epilogue sequences.
27809
27810 2011-01-04  Joseph Myers  <joseph@codesourcery.com>
27811
27812         * config/vxworks.opt (Bdynamic, Bstatic, Xbind-lazy, Xbind-now,
27813         non-static): New Driver options.
27814
27815 2011-01-04  Jie Zhang  <jie@codesourcery.com>
27816
27817         PR driver/47137
27818         * gcc.c (default_compilers[]): Set combinable field to 0
27819         for all assembly languages.
27820
27821 2011-01-04  Mingjie Xing  <mingjie.xing@gmail.com>
27822
27823         * config/mips/loongson3a.md: New file.
27824         * config/mips/mips.md: Include loongson3a.md.
27825         * config/mips/mips.c (mips_multipass_dfa_lookahead): Return 4 when
27826         TUNE_LOONGSON_3A.
27827
27828 2011-01-03  Eric Botcazou  <ebotcazou@adacore.com>
27829
27830         PR middle-end/47017
27831         * expr.c (expand_expr_real_1) <MEM_REF>: Call memory_address_addr_space
27832         instead of convert_memory_address_addr_space on the base expression.
27833
27834 2011-01-03  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
27835
27836         * config/spu/spu.c (spu_option_override): Update error text
27837         for bad -march= / -mtune= values.
27838
27839 2011-01-03  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
27840
27841         * config/spu/spu.c (asm_file_start): Only reset flag_var_tracking
27842         if branch-hint optimization will be performed.
27843
27844 2011-01-03  Jakub Jelinek  <jakub@redhat.com>
27845
27846         PR tree-optimization/47148
27847         * ipa-split.c (split_function): Convert arguments to
27848         DECL_ARG_TYPE if possible.
27849
27850         PR tree-optimization/47155
27851         * tree-ssa-ccp.c (bit_value_binop_1): Use r1type instead of type
27852         when computing uns.
27853
27854         PR rtl-optimization/47157
27855         * combine.c (try_combine): If undobuf.other_insn becomes
27856         (set (pc) (pc)) jump, call update_cfg_for_uncondjump on it
27857         and set *new_direct_jump_p too.
27858
27859 2011-01-03  Sebastian Pop  <sebastian.pop@amd.com>
27860
27861         PR tree-optimization/47021
27862         * graphite-sese-to-poly.c (scan_tree_for_params): Handle ADDR_EXPR.
27863
27864 2011-01-03  Jakub Jelinek  <jakub@redhat.com>
27865
27866         * gcc.c (process_command): Update copyright notice dates.
27867         * gcov.c (print_version): Likewise.
27868         * gcov-dump.c (print_version): Likewise.
27869         * mips-tfile.c (main): Likewise.
27870         * mips-tdump.c (main): Likewise.
27871
27872 2011-01-03  Martin Jambor  <mjambor@suse.cz>
27873
27874         PR tree-optimization/46801
27875         * tree-sra.c (type_internals_preclude_sra_p): Check whether
27876         aggregate fields start at byte boundary instead of the bit-field flag.
27877
27878 2011-01-03  H.J. Lu  <hongjiu.lu@intel.com>
27879
27880         PR driver/47137
27881         * gcc.c (main): Revert revision 168407.
27882
27883 2011-01-03  Martin Jambor  <mjambor@suse.cz>
27884
27885         * lto-cgraph.c (input_cgraph_opt_section): Use the correct section type.
27886
27887 2011-01-03  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
27888
27889         * tree-vect-generic.c (expand_vector_operations_1): When using vector/
27890         vector optab to expand vector/scalar shift, update gimple to vector.
27891
27892 2011-01-03  Martin Jambor  <mjambor@suse.cz>
27893
27894         * cgraphunit.c (verify_cgraph_node): Verify there is no direct call to
27895         a thunk.
27896
27897 2011-01-03  Martin Jambor  <mjambor@suse.cz>
27898
27899         PR tree-optimization/46984
27900         * cgraph.h (cgraph_indirect_call_info): make field thunk_delta
27901         HOST_WIDE_INT.
27902         (cgraph_create_indirect_edge): Fixed line length.
27903         (cgraph_indirect_call_info): Declare.
27904         (cgraph_make_edge_direct) Update declaration.
27905         * cgraph.c (cgraph_allocate_init_indirect_info): New function.
27906         (cgraph_create_indirect_edge): Use it.
27907         (cgraph_make_edge_direct): Made delta HOST_WIDE_INT.  Updated all
27908         callees.
27909         * cgraphunit.c (cgraph_redirect_edge_call_stmt_to_callee): Update for
27910         the new thunk_delta representation.
27911         * ipa-prop.c (ipa_make_edge_direct_to_target): Convert delta to
27912         HOST_WIDE_INT.
27913         (ipa_write_indirect_edge_info): Remove streaming of thunk_delta.
27914         (ipa_read_indirect_edge_info): Likewise.
27915         * lto-cgraph.c (output_edge_opt_summary): New function.
27916         (output_node_opt_summary): Call it on all outgoing edges.
27917         (input_edge_opt_summary): New function.
27918         (input_node_opt_summary): Call it on all outgoing edges.
27919
27920 2011-01-02  H.J. Lu  <hongjiu.lu@intel.com>
27921
27922         PR driver/47137
27923         * gcc.c (main): Don't check have_o when settting combine_inputs.
27924
27925 2011-01-02  Eric Botcazou  <ebotcazou@adacore.com>
27926
27927         * regrename.c: Add general comment describing the pass.
27928         (struct du_head): Remove 'length' field.
27929         (get_element, merge_sort_comparison, merge, sort_du_head): Remove.
27930         (regrename_optimize): Do not sort chains.  Rework comments, add others.
27931         Force renaming to the preferred class (if any) in the first pass and do
27932         not consider registers that belong to it in the second pass.
27933         (create_new_chain): Do not set 'length' field.
27934         (scan_rtx_reg): Likewise.
27935
27936 2011-01-02  Jakub Jelinek  <jakub@redhat.com>
27937
27938         PR tree-optimization/47140
27939         * tree-ssa-ccp.c (evaluate_stmt): For binary assignments, use
27940         TREE_TYPE (lhs) instead of TREE_TYPE (rhs1) as second argument
27941         to bit_value_binop.
27942
27943         PR rtl-optimization/47028
27944         * cfgexpand.c (gimple_expand_cfg): Insert entry edge insertions after
27945         parm_birth_insn instead of at the beginning of first bb.
27946
27947 2011-01-02  Mingjie Xing  <mingjie.xing@gmail.com>
27948
27949         * doc/generic.texi: Remove duplicated "@subsubsection Statements".
27950         Remove the word "see" before "@pxref".
27951         * doc/rtl.texi: Remove the word "see" before "@pxref".
27952
27953 2011-01-01  Jan Hubicka  <jh@suse.cz>
27954
27955         * tree-loop-distribution.c (tree_loop_distribution): Do not use freed
27956         memory.
27957
27958 2011-01-01  Kai Tietz  <kai.tietz@onevision.com>
27959
27960         PR target/38662
27961         * tree.c (type_hash_eq): Call language hook for METHOD_TYPEs, too.
27962
27963 \f
27964 Copyright (C) 2011 Free Software Foundation, Inc.
27965
27966 Copying and distribution of this file, with or without modification,
27967 are permitted in any medium without royalty provided the copyright
27968 notice and this notice are preserved.