PR target/41813
[official-gcc.git] / gcc / ChangeLog
bloba9a16933e03c2f4c2846ba03160b28f898d3ee53
1 2009-10-25  Kaz Kojima  <kkojima@gcc.gnu.org>
3         PR target/41813
4         * config/sh/sh.md (stuff_delay_slot): Don't set T_REG in pattern.
6 2009-10-25  Richard Guenther  <rguenther@suse.de>
8         * lto-streamer-in.c (unpack_ts_decl_common_value_fields):
9         Stream DECL_RESTRICTED_P.
10         * lto-streamer-out.c (pack_ts_decl_common_value_fields): Likewise.
12 2009-10-25  Richard Sandiford  <rdsandiford@googlemail.com>
14         * config/mips/mips.c (mips_restore_gp_from_cprestore_slot): Emit
15         a note when expanding to nothing.
17 2009-10-25  Richard Guenther  <rguenther@suse.de>
19         PR middle-end/41814
20         * tree.c (find_decls_types_r): Deal with Java overloading
21         BINFO_VIRTUALS for its own purpose.
23 2009-10-24  Adam Nemet  <anemet@caviumnetworks.com>
25         * config/mips/predicates.md (hilo_operand): New predicate.
26         * config/mips/mips.md (<u>mulsidi3_64bit): Change it to a
27         define_insn.  Correct !ISA_HAS_EXT_INS length from 24 to 28.  Move
28         splitter part from here ...:
29         (<u>mulsidi3_64bit splitter for !ISA_HAS_EXT_INS): ... to here.  Swap
30         op0 and op4 to match the DINS case.
31         (<u>mulsidi3_64bit splitter for ISA_HAS_EXT_INS): New splitter.
33 2009-10-24  Andy Hutchinson  <hutchinsonandy@gcc.gnu.org>
35         PR middle-end/19154
36         * avr.md (QIDI): Add new mode iterator.
37         (sbrx_branch<mode>): Create new zero extract bit, test and jump
38         patterns for all QI thru DI modes combinations.
39         (sbrx_and_branch<mode>): Create new and based bit test and jump
40         patterns for QI thru SI modes.
41         avr.c (avr_out_sbxx_branch): Use only bit number.
43 2009-10-24  Jan Hubicka  <jh@suse.cz>
45         * ipa-reference.c (check_call): Noreturn notrhow calls do not write
46         to memory.
47         (analyze_function): When analyzing noreturn nothrow call, do not compute
48         written stats; free bitmaps of vars early if possible.
49         (generate_summary): Only update bitmaps if computed.
50         (propagate): Only dump bitmaps if computed.
51         (ipa_reference_read_summary): Fix pasto.
53 2009-10-24  Eric Botcazou  <ebotcazou@adacore.com>
55         * tree-ssa-alias.c (nonaliasing_component_refs_p): Rename into...
56         (aliasing_component_refs_p): ...this.  Return true if there is no
57         common base and the base access types have the same alias set.
58         (indirect_ref_may_alias_decl_p): Adjust for above renaming.
59         (indirect_refs_may_alias_p): Likewise.
61 2009-10-23  Joseph Myers  <joseph@codesourcery.com>
63         PR c/40033
64         * c-typeck.c (c_finish_stmt_expr): Do not wrap error_mark_node in
65         a C_MAYBE_CONST_EXPR.
67 2009-10-23  Michael Meissner  <meissner@linux.vnet.ibm.com>
69         PR target/41787
70         * config/rs6000/rs6000.c (struct machine_function): Add
71         vsx_or_altivec_used_p to record if vector types are used.
72         (rs6000_expand_to_rtl_hook): Rename from
73         rs6000_alloc_sdmode_stack_slot.  If VSX, check to see if there are
74         any vector operations, so if there are, we can set VRSAVE to
75         non-zero when only floating point vector registers are used.
76         (TARGET_EXPAND_TO_RTL_HOOK): Use rs6000_expand_to_rtl_hook.
77         (rs6000_check_vector_mode): Inner function to check if vector
78         types are used in the code.
79         (compute_vrsave_mask): If VSX, make sure VRSAVE is non-zero if
80         vector instructions are used.
82         * config/rs6000/rs6000.h (HARD_REGNO_CALL_PART_CLOBBERED):
83         Indicate that VSX registers which overlap floating point
84         registers, can't be used across a call, since the ABI only states
85         the scalar part of the register will be saved and restored.
87 2009-10-23  Joseph Myers  <joseph@codesourcery.com>
89         PR c/41673
90         * alias.c (get_alias_set): Call langhook before returning 0 for
91         types with structural equality.
92         * c-common.c (c_common_get_alias_set): Use alias set of element
93         type for arrays with structural comparison.
95 2009-10-23  Richard Guenther  <rguenther@suse.de>
97         PR middle-end/41805
98         * cfgexpand.c (expand_call_stmt): Use gimple_has_side_effects and
99         gimple_call_nothrow_p.
101 2009-10-23  Richard Guenther  <rguenther@suse.de>
103         PR tree-optimization/41778
104         * tree-ssa-pre.c (do_regular_insertion): Only insert if a
105         redundancy along a path in the CFG we want to optimize for speed
106         is going to be removed.
107         (execute_pre): Do partial-PRE only if the function is to be
108         optimized for speed.
109         (gate_pre): Do not turn off all of PRE when not optimizing a
110         function for speed.
112 2009-10-23  Kaveh R. Ghazi  <ghazi@caip.rutgers.edu>
114         * builtins.c (fold_builtin_cabs): Use validate_arg().
115         (fold_builtin_cexp): Fix if-logic.
116         (fold_builtin_1): Check subtype for BUILT_IN_CIMAG.
118 2009-10-22  Jeff Law  <law@redhat.com>
120         * ira-lives.c (process_single_reg_class_operands): Update the
121         hard reg costs for all the hard registers desired by the
122         single reg class operand.
124 2009-10-22  Richard Sandiford  <rdsandiford@googlemail.com>
126         * simplify-rtx.c (simplify_replace_fn_rtx): Add a fallback case
127         for rtxes that aren't handled specially.
129 2009-10-22  Richard Sandiford  <rdsandiford@googlemail.com>
131         * rtl.h (shallow_copy_rtvec): Declare.
132         * rtl.c (shallow_copy_rtvec): New function.
133         * cselib.c (cselib_subst_to_values): Use it.  Only modify an
134         rtx field if the subrtx has changed.
136 2009-10-22  Anatoly Sokolov  <aesok@post.ru>
138         * config/m32c/m32c.c (m32c_function_value_regno_p): New function.
139         (m32c_function_value): Make static, add new 'outgoing' argument.
140         (m32c_libcall_value): Make static, add new 'fun' argument.
141         (TARGET_FUNCTION_VALUE, TARGET_LIBCALL_VALUE): Declare.
142         * config/m32c/m32c.h: (FUNCTION_VALUE, LIBCALL_VALUE): Remove.
143         (FUNCTION_VALUE_REGNO_P): Redefine, use m32c_function_value_regno_p.
144         * config/m32c/m32c-protos.h (m32c_function_value_regno_p): Declare.
145         (m32c_function_value, m32c_libcall_value): Delete declaration.
147 2009-10-22  Diego Novillo  <dnovillo@google.com>
149         * Makefile.in (PLUGIN_HEADERS): Add output.h and IPA_UTILS_H.
151 2009-10-22  Razya Ladelsky  <razya@il.ibm.com>
152         
153         * testsuite/gcc.dg/autopar/outer-4.c: Adjust scan.
154         * testsuite/gcc.dg/autopar/outer-5.c: Adjust scan.
155         * testsuite/gcc.dg/autopar/outer-5.c: Add scan optimized.
156         * tree-cfg.c (gimple_duplicate_sese_tail): Fix typos/indentation/white
157         space.
159 2009-10-22  Richard Guenther  <rguenther@suse.de>
161         * lto-streamer.h (lto_symtab_merge_cgraph_nodes): Declare.
162         * lto-symtab.c (struct lto_symtab_entry_def): Add node member.
163         (lto_symtab_merge): Do not merge cgraph nodes here.
164         (lto_symtab_resolve_can_prevail_p): Simplify.
165         (lto_symtab_resolve_symbols): Store cgraph node.
166         (lto_symtab_merge_decls_1): Simplify.  Do not drop non-prevailing
167         functions from the symtab.
168         (lto_symtab_merge_cgraph_nodes_1): New function.
169         (lto_symtab_merge_cgraph_nodes): Likewise.
171 2009-10-22  Richard Guenther  <rguenther@suse.de>
173         PR lto/41791
174         * lto-streamer-out.c (lto_output_location): Stream the
175         system header flag.
176         * lto-streamer-in.c (lto_input_location): Likewise.
178 2009-10-22  Razya Ladelsky  <razya@il.ibm.com>
179         
180         * cfgloopmanip.c  (duplicate_subloops): Export. 
181         * tree-parloops.c (loop_parallel_p): Dump if loop is innermost.
182         (transform_to_exit_first_loop): Duplicate bbs starting from 
183         header up to loop->latch instead of exit->src.
184         Initialize control variable to the correct number of iterations.
185         (gather_scalar_reductions): Do not register double reductions.
186         (parallelize_loops): Dump which loop is tested. 
187         Indicate whether the parallelized loop is inner or not. 
188         Remove the innermost-loop requirement.
189         * cfgloop.h (duplicate_subloops): Export. 
190         * tree-cfg.c (add_phi_args_after_redirect): New function.
191         (gimple_duplicate_sese_tail): Remove the no-subloops constraint.
192         Call duplicate_subloops.
193         Update number of iterations at the exit condition.
194         Don't redirect nexits always to the loop exit.
195         Redirect copied edges from latch to the loop exit.
196         * testsuite/libgomp.graphite/force-parallel-2.c: Adjust scan.
197         * testsuite/gcc.dg/autopar/outer-1.c: New testcase.
198         * testsuite/gcc.dg/autopar/outer-2.c: New testcase.
199         * testsuite/gcc.dg/autopar/outer-3.c: New testcase.
200         * testsuite/gcc.dg/autopar/outer-4.c: New testcase.
201         * testsuite/gcc.dg/autopar/outer-5.c: New testcase.
202         * testsuite/gcc.dg/autopar/outer-6.c: New testcase.
204 2009-10-22  Jan Hubicka  <jh@suse.cz>
206         * ipa-cp.c (ipcp_read_summary): Remove now invalid FIXME and
207         flag_ltrans check.
208         * ipa-inline.c (cgraph_mark_inline_edge,
209         cgraph_decide_inlining_of_small_function,
210         cgraph_decide_inlining, inline_read_summary): Disable indirect inlining
211         for WPA for time being.
213         PR tree-optimize/40556                                                                                                                                         
214         * ipa-inline.c (cgraph_early_inlining): Fix iterations condition.
216 2009-10-22  Richard Guenther  <rguenther@suse.de>
218         * lto-streamer.h (lto_symtab_clear_resolution): Remove.
219         * lto-symtab.c (lto_symtab_clear_resolution): Likewise.
221 2009-10-22  Jan Hubicka  <jh@suse.cz>
223         PR lto/41730
224         * ipa-reference.c (has_proper_scope_for_analysis): Add fixme about
225         global vars.
226         (check_call): Handle only indirect calls.
227         (propagate_bits): Update comment.
228         (write_node_summary_p): Turn bogus check to assert.
229         (ipa_reference_write_summary): Stream calls_read_all properly.
230         (ipa_reference_read_summary): Stream in calls_read_all properly.
231         (read_write_all_from_decl): New function.
232         (propagate): Handle OVERWRITABLE nodes and external calls here.
233         * ipa-pre-const.c (check_call): In IPA mode handle indirect calls
234         only.
235         (analyze_function): Do not check visibility here.
236         (add_new_function): We summary OVERWRITABLE too.
237         (generate_summary): Stream OVERWRITABLE nodes too.
238         (propagate): Handle external calls and OVERWRITABLE nodes here.
239         (local_pure_const): Check visibility here.
241 2009-10-22  Jan Hubicka  <jh@suse.cz>
243         * ipa-cp.c (ipcp_write_summary, ipcp_read_summary): New functions.
244         (pass_ipa_cp): Register them.
245         (ipcp_init_stage): Analyze all functions for whopr/lto.
246         (ipcp_propagate_stage): Skip external calls.
247         (ipcp_iterate_stage): Call ipa_update_after_lto_read if needed.
248         * ipa-reference.c (write_node_summary_p): Fix thinko about availability.
249         * cgraphunit.c (ipa_passes): When in lto, ne er produce new summaries;
250         when in ltrans, skip executing of ipa passes since everything should've
251         been done.
252         * ipa-inline.c (cgraph_decide_inlining): Remove FIXMEs.
253         (inline_generate_summary): Likewise.
254         (inline_read_summary): New function.
255         (inline_write_summary): New function.
256         (pass_ipa_inline): Register new hooks.
257         * ipa-prop.c: Inlcude lto-streamer.h
258         (ipa_edge_args_vector): Update declaration.
259         (ipa_count_arguments, ipa_compute_jump_functions,
260         ipa_free_edge_args_substructures): Move ipa_edge_args_vector into ggc.
261         (ipa_write_jump_function, ipa_read_jump_function, ipa_write_node_info,
262         ipa_read_node_info): New static functions.
263         (ipa_prop_write_jump_functions, ipa_prop_read_jump_functions): Update.
264         (duplicate_array): Use xmalloc.
265         (duplicate_ggc_array): New.
266         (ipa_edge_duplication_hook): Use it.
267         (ipa_update_after_lto_read): New function.
268         * ipa-prop.h (ipa_prop_write_jump_functions,
269         ipa_prop_read_jump_functions): Declare.
270         (ipa_pass_through_data, ipa_ancestor_jf_data, ipa_member_ptr_cst,
271         jump_func_value, ipa_member_ptr_cst, ipa_edge_args): Add GTY markers.
272         (ipa_edge_args_vector): Move into GGC.
273         (ipa_check_create_edge_args): Update.
274         (ipa_update_after_lto_read): New.
275         * passes.c (ipa_write_summaries_1): When in wpa, do not write summaries.
276         (ipa_read_summaries): When in ltrans, so not read summaries.
277         * lto-streamer.c (lto_get_section_name): Add LTO_section_jump_functions.
278         * lto-streamer.h (LTO_section_jump_functions): New section.
279         (produce_asm): Declare.
280         * lto-cgraph.c (output_cgraph): Output edges in reverse order.
281         * lto-streamer-out.c (produce_asm): Export.
282         * lto-streamer-in.c: Include tree-pass.h
283         (input_function): Free dominance info when done.
284         (lto_read_body): Push ipa_inline in ltrans stage.
285         * gengtype.c (open_base_files): Add ipa-prop.h into includes.
286         * Makefile.in (GTFILES): Add ipa-prop.h
288 2009-10-22  Matthias Klose  <doko@ubuntu.com>
290         * doc/install.texi: Document --enable-browser-plugin.
292 2009-10-21  Vladimir Makarov  <vmakarov@redhat.com>
294         * doc/invoke.texi (fira-loop-pressure): Update default value.
295         * opts.c (decode_options): Remove default value setting for
296         flag_ira_loop_pressure.
297         * config/ia64/ia64.c (ia64_override_options): Set
298         flag_ira_loop_pressure up for -O3.
299         * config/rs6000/rs6000.c (rs6000_override_options): Ditto.
300         
301 2009-10-21  Sebastian Pop  <sebastian.pop@amd.com>
303         PR tree-optimization/41497
304         * tree-scalar-evolution.c (analyze_evolution_in_loop): Return
305         chrec_dont_know if the evolution function returned by follow_ssa_edge
306         is constant in the analyzed loop and is not compatible with the
307         initial value before the loop.
308         * tree-chrec.h (no_evolution_in_loop_p): Call STRIP_NOPS.
310 2009-10-21  Joseph Myers  <joseph@codesourcery.com>
312         * config/sh/sh.c (nonpic_symbol_mentioned_p): Allow UNSPEC_TPOFF.
314 2009-10-21  Jakub Jelinek  <jakub@redhat.com>
316         PR other/25507
317         * doc/invoke.texi: Document -print-multi-os-directory.
319 2009-10-21  Jack Howarth  <howarth@bromo.med.uc.edu>
321         PR c++/41313
322         * gcc/config/darwin10.h: Use default_emit_unwind_label.
323         * gcc/config/darwin.c: Disable -freorder-blocks-and-partition
324         when darwin_emit_unwind_label is used.
326 2009-10-21  Eric Botcazou  <ebotcazou@adacore.com>
328         * tree-vect-stmts.c (exist_non_indexing_operands_for_use_p): Tweak
329         order of checks.
331 2009-10-20  Richard Henderson  <rth@redhat.com>
333         * tree-eh.c (lower_try_finally_copy): Do lower_eh_constructs_1
334         before emit_post_landing_pad.
336 2009-10-20  Adam Nemet  <anemet@caviumnetworks.com>
338         * config/mips/mips.c (mips_binary_cost): Add new argument speed.
339         Use when calling rtx_costs.
340         (mips_rtx_costs): Fix formatting.  Use argument speed rather than the
341         global optimize_size.  Pass speed to mips_binary_cost.
343 2009-10-20  Jakub Jelinek  <jakub@redhat.com>
345         * config/rs6000/rs6000.c (def_builtin): Set TREE_READONLY instead
346         of TREE_CONSTANT.
348 2009-10-20  Richard Sandiford  <rdsandiford@googlemail.com>
350         * rtl.h (simplify_replace_fn_rtx): Declare.
351         (wrap_constant, unwrap_constant): Delete.
352         * cfgexpand.c (unwrap_constant, wrap_constant): Delete.
353         (expand_debug_expr): Don't call wrap_constant.
354         * combine.c (rtx_subst_pair): Only define for AUTO_INC_DEC.
355         (auto_adjust_pair): Fold into...
356         (propagate_for_debug_subst): ...here.  Only define for AUTO_INC_DEC.
357         Just return a new value.
358         (propagate_for_debug): Use simplify_replace_fn_rtx for AUTO_INC_DEC,
359         otherwise use simplify_replace_rtx.
360         * cselib.c (wrap_constant): Reinstate old definition.
361         (cselib_expand_value_rtx_1): Don't wrap constants.
362         * gcse.c (try_replace_reg): Don't use copy_rtx in the call to
363         simplify_replace_rtx.
364         (bypass_block): Fix formatting in calls to simplify_replace_rtx.
365         * reload1.c (reload): Skip all uses for an insn before adjusting it.
366         Use simplify_replace_rtx.
367         * simplify-rtx.c (simplify_replace_fn_rtx): New function,
368         adapted from...
369         (simplify_replace_rtx): ...here.  Turn into a wrapper for
370         simplify_replace_fn_rtx.
371         (simplify_unary_operation): Don't unwrap CONSTs.
372         * var-tracking.c (check_wrap_constant): Delete.
373         (vt_expand_loc_callback): Don't call it.
374         (vt_expand_loc): Likewise.
376 2009-10-20  Pascal Obry  <obry@adacore.com>
377             Eric Botcazou  <ebotcazou@adacore.com>
379         * config/i386/cygming.h (DWARF_FRAME_REGNUM): Add enclosing parens.
381 2009-10-20  Michael Matz  <matz@suse.de>
383         * loop-invariant.c (create_new_invariant): Use different magic number.
385 2009-10-20  Richard Earnshaw  <rearnsha@arm.com>
387         PR target/39247
388         * arm.c (arm_override_options): Forcibly disable hot/cold block
389         partitioning.
391 2009-10-20  Alexandre Oliva  <aoliva@redhat.com>
393         PR debug/41739
394         * haifa-sched.c (try_ready): Skip debug deps updating speculation
395         status.
397 2009-10-20  Richard Guenther  <rguenther@suse.de>
399         * ggc-page.c: Include cfgloop.h.
400         (struct max_alignment): Drop long double, add void *.
401         (extra_order_size_table): Add low non-power-of-two multiples
402         of MAX_ALIGNMENT.  Drop small type-based entries, add
403         tree_type, cgraph_node and loop.
404         * alloc-pool.c (struct allocation_object_def): Drop long double
405         aligning element.
407 2009-10-20  Jakub Jelinek  <jakub@redhat.com>
409         PR debug/41340
410         * loop-invariant.c (calculate_loop_reg_pressure): Don't count regs
411         referenced just in DEBUG_INSNs.
413 2009-10-20  Richard Guenther  <rguenther@suse.de>
415         PR lto/41761
416         * gimple.c (gimple_register_type): Make sure we register
417         the types main variant first.
419 2009-10-20  Richard Guenther  <rguenther@suse.de>
421         * gimple.c (gimple_types_compatible_p): Simplify.  Move
422         cheap checks before hashtable queries.  Add checks for
423         TYPE_NONALIASED_COMPONENT and DECL_NONADDRESSABLE_P.
425 2009-10-20  Eric Botcazou  <ebotcazou@adacore.com>
427         * tree-sra.c (build_ref_for_offset_1) <RECORD_TYPE>: Skip fields
428         without size or with size that can't be represented as a host integer.
430 2009-10-20  Alexandre Oliva  <aoliva@redhat.com>
432         * tree-ssa-dce.c (eliminate_unnecessary_stmts): Don't regard
433         the removal of a debug stmt as a significant change.
435 2009-10-20  Wolfgang Gellerich  <gellerich@de.ibm.com>
437         * config/s390/s390.md: Added agen condition to operand
438         forwarding bypasses. 
439         Added bypass for early address generation use of int results.
440         Updated comments.
442 2009-10-20  Stefan Dösinger  <stefan@codeweavers.com>
444         * config/i386/i386.c: Remove signal.h #include.
446 2009-10-20  Jie Zhang  <jie.zhang@analog.com>
448         * simplify-rtx.c (simplify_const_unary_operation): Handle SS_ABS.
449         * doc/rtl.texi: Document ss_abs.
451 2009-10-19  Jakub Jelinek  <jakub@redhat.com>
453         * c-common.c (c_parse_error): Handle CPP_UTF8STRING.
454         * c-lex.c (c_lex_with_flags): Likewise.  Test C_LEX_STRING_NO_JOIN
455         instead of C_LEX_RAW_STRINGS.
456         (lex_string): Handle CPP_UTF8STRING.
457         * c-parser.c (c_parser_postfix_expression): Likewise.
458         * c-pragma.h (C_LEX_RAW_STRINGS): Rename to ...
459         (C_LEX_STRING_NO_JOIN): ... this.
461 2009-10-19  Anatoly Sokolov  <aesok@post.ru>
463         * config/cris/cris.c (cris_function_value, cris_libcall_value,
464         cris_function_value_regno_p): New functions.
465         (cris_promote_function_mode): Update comment.
466         (TARGET_FUNCTION_VALUE, TARGET_LIBCALL_VALUE): Declare.
467         * config/cris/cris.h (FUNCTION_VALUE, LIBCALL_VALUE): Remove.
468         (FUNCTION_VALUE_REGNO_P): Redefine, use cris_function_value_regno_p.
469         * config/cris/cris-protos.h (cris_function_value_regno_p): Declare.
471 2009-10-19  Jakub Jelinek  <jakub@redhat.com>
473         * unwind-dw2.c (execute_stack_op): Fix operand order for
474         DW_OP_le, DW_OP_ge, DW_OP_lt and DW_OP_gt.
476 2009-10-19  Eric Botcazou  <ebotcazou@adacore.com>
478         * gimple-low.c (struct lower_data): Add cannot_fallthru field.
479         (lower_stmt) <GIMPLE_BIND>: Add comment.
480         <GIMPLE_COND, GIMPLE_GOTO, GIMPLE_SWITCH>: Set cannot_fallthru to true
481         and return.
482         <GIMPLE_RETURN>: Remove the statement if cannot_fallthru is set.
483         Otherwise lower it and set cannot_fallthru to true.
484         <GIMPLE_TRY>: Update cannot_fallthru for GIMPLE_TRY_FINALLY and return.
485         <GIMPLE_CATCH, GIMPLE_EH_FILTER>: Set cannot_fallthru to false.
486         <GIMPLE_CALL>: Set cannot_fallthru to false for BUILT_IN_SETJMP and
487         to true for a noreturn call.  Do not remove statements.
488         <GIMPLE_OMP_PARALLEL, GIMPLE_OMP_TASK>: Set cannot_fallthru to false.
489         Set cannot_fallthru to false on function exit.
490         (gimple_stmt_may_fallthru) <GIMPLE_SWITCH>: Really return false.
491         <GIMPLE_ASSIGN>: Remove.
493 2009-10-19  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
495         * config/s390/s390.c (s390_z10_optimize_cmp): Don't touch FP compares.
497 2009-10-19  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
499         * config/s390/s390.c (s390_z10_optimize_cmp): Use
500         next/prev_active_insn to skip DEBUG_INSNs as well.
502 2009-10-19  Joseph Myers  <joseph@codesourcery.com>
504         * config/arm/arm.c (output_move_neon): Use DImode in call to
505         adjust_address.
507 2009-10-19  Matthias Klose  <doko@ubuntu.com>
509         PR target/40134
510         * config.gcc (arm*-*-linux-*eabi): Use config/t-slibgcc-libgcc.
512 2009-10-19  Jakub Jelinek  <jakub@redhat.com>
514         * cfgexpand.c (expand_debug_expr): Fail if bitpos < 0 for non-MEM op0.
516 2009-10-17  Andy Hutchinson  <hutchinsonandy@gcc.gnu.org>
518         PR middle-end/41738
519         * optabs.c (expand_binop): Make mode of shift count expression mode
520         of shift count not target.
521         Remove indent nit.
523 2009-10-17  Eric Botcazou  <ebotcazou@adacore.com>
525         * tree-nested.c (convert_nonlocal_reference_stmt) <GIMPLE_COND>: New
526         case.  Force using values to replace references within the statement.
527         (convert_local_reference_stmt): Likewise.
529 2009-10-17  Eric Botcazou  <ebotcazou@adacore.com>
531         * gimple-low.c (lower_stmt) <GIMPLE_CALL>: If the call is noreturn,
532         remove a subsequent GOTO or RETURN statement.
534 2009-10-17  Andy Hutchinson  <hutchinsonandy@aim.com>
536         * config/avr.md (*movqi): Add zero as equally preferable constraint
537         as general register.
538         (*movhi): Ditto.
540 2009-10-17  Eric Botcazou  <ebotcazou@adacore.com>
542         * print-tree.c (print_node): Fix string for DECL_STRUCT_FUNCTION.
544 2009-10-17  Richard Guenther  <rguenther@suse.de>
546         * lto-streamer-in.c (lto_input_location): Try to reuse previous maps.
548 2009-10-17  Richard Guenther  <rguenther@suse.de>
550         * lto-streamer-in.c (input_gimple_stmt): Fixup FIELD_DECL
551         operands in COMPONENT_REFs.
553 2009-10-17  Anatoly Sokolov  <aesok@post.ru>
555         * targhooks.c (default_libcall_value): Don't use LIBCALL_VALUE macro
556         if not defined. Change type of second argument to const_rtx.
557         (default_function_value): Call gcc_unreachable if FUNCTION_VALUE
558         macro not defined.
559         * targhooks.h (default_libcall_value): Update prototype.
560         * target.h (struct gcc_target): Change type of second argument of
561         libcall_value to const_rtx.
562         * config/arm/arm.c (arm_libcall_value): Change type of second argument
563         to const_rtx.
564         (arm_libcall_uses_aapcs_base): Change type of argument to const_rtx.
565         * doc/tm.texi (TARGET_LIBCALL_VALUE):  Revise documentation.
567 2009-10-17  Jakub Jelinek  <jakub@redhat.com>
569         PR debug/40521
570         * debug.h (struct gcc_debug_hooks): Add assembly_start hook.
571         * cgraphunit.c (cgraph_optimize): Call it.
572         * dwarf2out.c (dwarf2out_init): Move .cfi_sections printing into...
573         (dwarf2out_assembly_start): ... here.  New hook.
574         (dwarf2out_debug_hooks): Add dwarf2out_assembly_start.
575         * debug.c (do_nothing_debug_hooks): Do nothing for assembly_start
576         hook.
577         * dbxout.c (dbx_debug_hooks, xcoff_debug_hooks): Likewise.
578         * sdbout.c (sdb_debug_hooks): Likewise.
579         * vmsdbgout.c (vmsdbg_debug_hooks): Add vmsdbgout_assembly_start.
580         (vmsdbgout_assembly_start): New hook.
582 2009-10-17  Alexandre Oliva  <aoliva@redhat.com>
584         * rtl.h (RTL_LOCATION): Fix typo.
586 2009-10-17  Alexandre Oliva  <aoliva@redhat.com>
588         * print-rtl.c (print_rtx): Print locators in asm_operands
589         and asm_input.
591 2009-10-17  Alexandre Oliva  <aoliva@redhat.com>
593         PR debug/41535
594         * sched-deps.c (depl_on_debug_p): New.
595         (attach_dep_link): Reject debug deps before nondebug deps.
596         (add_to_deps_list): Insert debug deps after nondebug deps.
597         (sd_lists_empty_p): Stop at first nonempty list.  Disregard debug
598         deps.
599         (sd_add_dep): Do not reject debug deps.
600         (add_insn_mem_dependence): Don't count debug deps.
601         (remove_from_deps): Likewise.
602         (sched_analyze_2): Set up mem deps on debug insns.
603         (sched_analyze_insn): Record reg uses for deps on debug insns.
604         * haifa-sched.c (schedule_insn): Reset deferred debug insn.  Don't
605         try_ready nondebug insn after debug insn.
606         * ddg.c (create_ddg_dep_from_intra_loop_link,
607         create_ddg_dep_no_link): Don't reject debug deps.
609 2009-10-16  Richard Guenther  <rguenther@suse.de>
611         * lto-symtab.c (merge_incomplete_and_complete_type): Remove.
612         (maybe_merge_incomplete_and_complete_type): Likewise.
613         (lto_symtab_merge): Do not call them.  Do not warn for
614         complete vs. incomplete compatible types.
615         (lto_symtab_merge_decls_2): Simplify.
616         * gimple.c (gimple_force_type_merge): Remove.
617         (gimple_types_compatible_p): Make it static.
618         * gimple.h (gimple_force_type_merge): Remove.
619         (gimple_types_compatible_p): Likewise.
621 2009-10-16  Jakub Jelinek  <jakub@redhat.com>
623         * dwarf2out.c (mem_loc_descriptor) <case ZERO_EXTRACT>: Cast
624         DWARF2_ADDR_SIZE to int to avoid signed vs. unsigned warnings.
626 2009-10-16  Richard Guenther  <rguenther@suse.de>
628         PR tree-optimization/41728
629         * tree-ssa-dom.c (optimize_stmt): Mark the stmt modified
630         if fold_stmt did anything.
632 2009-10-16  Richard Guenther  <rguenther@suse.de>
634         PR lto/41715
635         * lto-streamer-in.c (lto_input_tree_ref): Revert last change.
636         (maybe_fixup_handled_component): New function.
637         (input_gimple_stmt): Fixup mismatched decl replacements.
639 2009-10-16  Richard Guenther  <rguenther@suse.de>
641         PR lto/41713
642         * lto-streamer-out.c (lto_output_tree_ref): Handle DEBUG_EXPR_DECL
643         the same as VAR_DECL.
645 2009-10-16  Richard Guenther  <rguenther@suse.de>
647         * gimple.c (iterative_hash_gimple_type): For integer types
648         also hash their minimum and maximum values and the string flag.
649         For array types hash their domain and the string flag.
651 2009-10-16  Richard Guenther  <rguenther@suse.de>
653         * gimple.c (gimple_types_compatible_p): Restrict completing
654         types to record or unions.  Simplify completion.
655         Do not merge records or unions with different
656         TYPE_STRUCTURAL_EQUALITY_P tag.
657         (iterative_hash_gimple_type): Restrict non-recursing into
658         pointer targets for records and unions.
660 2009-10-15  Jakub Jelinek  <jakub@redhat.com>
662         PR debug/41717
663         * cfgexpand.c (expand_debug_expr): Handle CONJ_EXPR.
664         * dwarf2out.c (mem_loc_descriptor): Don't handle
665         POST_INT/POST_DEC/POST_MODIFY like SUBREG.  For SUBREG
666         punt if it is not lowpart subreg or if inner mode isn't
667         MODE_INT.
669 2009-10-16  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
671         * config/s390/s390.c (s390_z10_optimize_cmp): Skip notes when
672         investigating previous or next insns.
674 2009-10-16  Eric Botcazou  <ebotcazou@adacore.com>
676         * tree-sra.c (build_ref_for_offset_1): Update comment.
678 2009-10-16  Wolfgang Gellerich  <gellerich@de.ibm.com>
680         * config/s390/s390.md (atype): Added missing values.
682 2009-10-15  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
684         PR target/41702
685         * pa.md (casesi): Use sign extended index in call to gen_casesi64p.
686         (casesi64p): Update pattern to reflect above.
688 2009-10-15  Steve Ellcey  <sje@cup.hp.com>
690         PR rtl-optimization/41697
691         * sel-sched-ir.h (_eligible_successor_edge_p): Check successor count.
693 2009-10-15  Michael Meissner  <meissner@linux.vnet.ibm.com>
695         PR target/23983
696         * config/rs6000/predicates.md: Update copyright year.
697         * config/rs6000/altivec.md: Ditto.
698         
699         * config/rs6000/t-rs6000 (TM_H): Add rs6000-builtin.def.
700         (MD_INCLUDES): Add a2.md.
701         
702         * config/rs6000/rs6000.c (rs6000_builtin_decls): Change
703         RS6000_BUILTIN_COUNT to MAX_RS6000_BUILTINS.
704         (builtin_classify): New static vector to classify various builtins
705         to get the tree attributes correct.
706         (def_builtin): Set the attributes of builtins based on what the
707         builtin does (i.e. memory operation, floating point, saturation
708         need special attributes, others are pure functions).
710         * config/rs6000/rs6000.h (enum rs6000_btc): New enum to classify
711         the builtins.
712         (enum rs6000_builtins): Include rs6000-builtin.def to define the
713         builtins.  Change the end marker to MAX_RS6000_BUILTINS from
714         RS6000_BUILTIN_COUNT.
715         (rs6000_builtin_decls): Change RS6000_BUILTIN_COUNT to
716         MAX_RS6000_BUILTINS.
718         * config/rs6000/rs6000-builtin.def: New file that combines the
719         builtin enumeration name and attributes.
721 2009-10-15  H.J. Lu  <hongjiu.lu@intel.com>
723         * config/i386/linux.h (ASM_SPEC): Add --32.
725 2009-10-15  Jakub Jelinek  <jakub@redhat.com>
727         * dwarf2out.c (dwarf_tag_name): Handle DW_TAG_rvalue_reference_type
728         and DW_TAG_template_alias.
729         (dwarf_attr_name): Handle DW_AT_main_subprogram,
730         DW_AT_data_bit_offset, DW_AT_const_expr, DW_AT_enum_class,
731         DW_AT_linkage_name, DW_AT_GNU_guarded_by, DW_AT_GNU_pt_guarded_by,
732         DW_AT_GNU_guarded, DW_AT_GNU_pt_guarded, DW_AT_GNU_locks_excluded,
733         DW_AT_GNU_exclusive_locks_required, DW_AT_GNU_shared_locks_required
734         and DW_AT_GNU_odr_signature.
735         (dwarf_form_name): Handle DW_FORM_sec_offset, DW_FORM_exprloc,
736         DW_FORM_flag_present and DW_FORM_ref_sig8.
737         (output_signature): Only print name on the first byte.
738         (output_die): Likewise for dw_val_class_data8.
740 2009-10-15  Alexander Monakov  <amonakov@ispras.ru>
742         * doc/invoke.texi: Clarify that most optimizations are not enabled
743         without -O.
745 2009-10-15  Richard Guenther  <rguenther@suse.de>
747         PR lto/41668
748         * gimple.c (compare_type_names_p): Handle anonymous names
749         differently based on new mode argument.
750         (gimple_types_compatible_p): For structs also compare the tags.
751         (iterative_hash_type_name): Rename to ...
752         (iterative_hash_name): ... this.  Hash all names.
753         (iterative_hash_gimple_type): Fix hashing the struct tag of
754         pointer targets.  Hash field decl names.
756 2009-10-15  Richard Guenther  <rguenther@suse.de>
758         PR lto/41669
759         * gimple.c (gimple_get_alias_set): Avoid recursing on
760         invalid type topology.
762 2009-10-15  Andrew Pinski  <andrew_pinski@playstation.sony.com>
764         * config/spu/spu.c (get_branch_target): Use extract_asm_operands.
766 2009-10-15  Richard Guenther  <rguenther@suse.de>
768         * tree.c (free_lang_data_in_decl): Free DECL_FCONTEXT.
770 2009-10-15  Jakub Jelinek  <jakub@redhat.com>
772         * config/rs6000/option-defaults.h (OPTION_DEFAULT_SPECS): Don't
773         add --with-tune{,-32,-64} configured default for -mtune if explicit
774         -mcpu is used.
776 2009-10-14  Daniel Gutson  <dgutson@codesourcery.com>
778         * config/arm/neon.md (neon_vshll_n<mode>): Checking Bounds fixed.
780 2009-10-14  DJ Delorie  <dj@redhat.com>
781         
782         * config/h8300/h8300.c (F): New.
783         (Fpa): New.
784         (h8300_emit_stack_adjustment): Call them.
785         (push): Likewise.
786         (h8300_push_pop): Likewise.
787         (h8300_expand_prologue): Likewise.
788         * config/h8300/h8300.h (DWARF2_DEBUGGING_INFO): Define.
789         (MUST_USE_SJLJ_EXCEPTIONS): Define.
790         (INCOMING_RETURN_ADDR_RTX): Define.
791         (INCOMING_FRAME_SP_OFFSET): Define.
792         (DWARF_CIE_DATA_ALIGNMENT): Define.
794 2009-10-14  Jakub Jelinek  <jakub@redhat.com>
796         * stor-layout.c (place_field): Don't emit -Wpadded warnings for
797         fields in builtin structs.
798         (finalize_record_size): Likewise.
800 2009-10-14  Richard Guenther  <rguenther@suse.de>
802         * gimple.c (gtc_ob): New global.
803         (struct type_pair_d): Replace pointers with type UIDs.
804         (type_pair_hash): Adjust.
805         (type_pair_eq): Likewise.
806         (lookup_type_pair): Likewise.  Allocate from an obstack.
807         (gimple_force_type_merge): Adjust.
808         (gimple_types_compatible_p): Likewise.
809         (free_gimple_type_tables): Free the obstack.
811 2009-10-14  Jakub Jelinek  <jakub@redhat.com>
813         * tree-parloops.c (separate_decls_in_region_debug_bind): Drop debug
814         stmts setting DEBUG_EXPR_DECLs.
816         * cfgexpand.c (expand_debug_expr): Ignore zero-length bitfields.
817         Don't crash if mode1 is VOIDmode.
819 2009-09-26  Vladimir Makarov  <vmakarov@redhat.com>
821         * params.def (PARAM_IRA_LOOP_RESERVED_REGS): New.
822         * params.h (IRA_LOOP_RESERVED_REGS): New.
823         * tree-pass.h (pass_subregs_of_mode_init,
824         pass_subregs_of_mode_finish): Remove.
825         * passes.c (pass_subregs_of_mode_init,
826         pass_subregs_of_mode_finish): Remove.
827         (pass_reginfo_init): Move before loop optimizations.
828         * config/i386/i386.h (STACK_REG_COVER_CLASS): Define.
829         * common.opt (fira-loop-pressure): New.
830         * toplev.h (flag_ira_loop_pressure): New.
831         * rtl.h (init_subregs_of_mode, finish_subregs_of_mode): New externals.
832         * reginfo.c (init_subregs_of_mode, finish_subregs_of_mode):
833         Make external and void type functions.
834         (gate_subregs_of_mode_init, pass_subregs_of_mode_init,
835         pass_subregs_of_mode_finish): Remove.
836         * ira-costs.c (init_costs): Call init_subregs_of_mode.
837         * regmove.c: Include ira.h.
838         (regmove_optimize): Call ira_set_pseudo_classes after IRA based
839         register pressure calculation in loops.
840         * loop-invariant.c: Include REGS_H and ira.h.
841         (struct loop_data): New members max_reg_pressure, regs_ref, and
842         regs_live.
843         (struct invariant): New member orig_regno.
844         (curr_loop): New variable.
845         (find_exits): Initialize regs_ref and regs_live.
846         (create_new_invariant): Initialize orig_regno.
847         (get_cover_class_and_nregs): New.
848         (get_inv_cost): Make aregs_needed an array.  Use regs_needed as an
849         array.  Add code for flag_ira_loop_pressure.
850         (gain_for_invariant): Make new_regs an array.  Add code for
851         flag_ira_loop_pressure.
852         (best_gain_for_invariant): Ditto.
853         (set_move_mark): New parameter gain.  Use it for debugging output.
854         (find_invariants_to_move): Make regs_needed and new_regs an array.
855         Add code for flag_ira_loop_pressure.
856         (move_invariant_reg): Set up orig_regno.
857         (move_invariants): Set up reg classes for pseudos for
858         flag_ira_loop_pressure.
859         (free_loop_data): Clear regs_ref and regs_live.
860         (curr_regs_live, curr_reg_pressure, regs_set, n_regs_set,
861         get_regno_cover_class, change_pressure, mark_regno_live,
862         mark_regno_death, mark_reg_store, mark_reg_clobber,
863         mark_reg_death, mark_ref_regs, calculate_loop_reg_pressure): New.
864         (move_loop_invariants): Calculate pressure.  Initialize curr_loop.
865         * ira.c (ira): Call ira_set_pseudo_classes after IRA based
866         register pressure calculation in loops if new regs were added.
867         Call finish_subregs_of_mode.
868         * opts.c (decode_options): Set up flag_ira_loop_pressure.
869         * Makefile.in (loop-invariant.o): Add ira.h.
870         (regmove.o): Ditto.
871         * doc/invoke.texi (-fira-loop-pressure, ira-loop-reserved-regs):
872         Describe.
873         * doc/tm.texi (STACK_REG_COVER_CLASS): Describe.
874         
875 2009-10-14  Richard Guenther  <rguenther@suse.de>
877         * lto-symtab.c (lto_symtab_compatible): Fold in ...
878         (lto_symtab_merge): ... here.  Rewrite both to take the
879         prevailing and a to-be-merged entry and to queue diagnostics properly.
880         (lto_symtab_resolve_replaceable_p): New predicate for
881         symbol resolution.
882         (lto_symtab_resolve_can_prevail_p): Likewise.
883         (lto_symtab_resolve_symbols): Rewrite.  Fold in code that
884         handles merging commons by choosing the largest decl.  Fold
885         in code that gives ODR errors.
886         (lto_symtab_merge_decls_2): Simplify a lot.  Emit queued
887         diagnostics here.
888         (lto_symtab_merge_decls_1): Re-structure.  Deal with the
889         case of no prevailing decl here.  Diagnose mismatches
890         in object types here.  Drop all but the prevailing decls.
891         (lto_symtab_prevailing_decl): Return the single prevailing decl.
892         * lto-streamer-in.c (lto_input_tree_ref): Deal with
893         VIEW_CONVERT_EXPRs in decl slots.  Unshare the tree in this case.
895 2009-10-14  Richard Guenther  <rguenther@suse.de>
897         PR lto/41521
898         * lto-streamer-in.c (input_bb): Replace debug stmts with
899         nops instead of dropping them.
901 2009-10-14  Nick Clifton  <nickc@redhat.com>
903         * gcc/doc/extended.texi: Replace the dash character with @minus{}
904         in situations where it is being used as a minus symbol.
905         * gcc/doc/tm.texi: Likewise.
906         * gcc/doc/md.texi: Likewise.
908 2009-10-14  Jakub Jelinek  <jakub@redhat.com>
910         PR preprocessor/41543
911         * input.h (BUILTINS_LOCATION): Change to 1 from 2.
912         Assert BUILTINS_LOCATION < RESERVED_LOCATION_COUNT.
913         * tree.c: Include intl.h.
914         (expand_location): Handle BUILTINS_LOCATION.
915         * Makefile.in (tree.o): Depend on intl.h.
917         PR debug/41695
918         * dwarf2out.c (dwarf2out_var_location): Always clear
919         last_postcall_label when changing last_label.
921 2009-10-14  Pascal Obry  <obry@adacore.com>
923         * gcc.c (DEFAULT_SWITCH_CURTAILS_COMPILATION): Add -E.
924         (process_command): Handle -E as done with -c and -S.  Do not add
925         the target executable suffix to the output file when -E is used.
926         (main): Adjust error message accordingly.
928 2009-10-14  Alexandre Oliva  <aoliva@redhat.com>
930         PR debug/41343
931         PR debug/41447
932         PR debug/41264
933         PR debug/41338
934         * tree.c (tree_node_structure_for_code): DEBUG_EXPR_DECL uses
935         decl with rtl.
936         (tree_code_size): Likewise.
938 2009-10-13  Kaveh R. Ghazi  <ghazi@caip.rutgers.edu>
940         * builtins.c (fold_builtin_1): Support complex "arc" functions.
941         * real.h (HAVE_mpc_arc): Define.
943 2009-10-14  Kaz Kojima  <kkojima@gcc.gnu.org>
945         * config/sh/sh.c (TARGET_BUILTIN_DECL): Define.
946         (struct builtin_description): Add fndecl field.
947         (bdesc): Remove const qualifier.  Update initializer.
948         (sh_media_init_builtins): Remove const qualifier for d.  Record
949         the result of add_builtin_function to the fndecl field.
950         (sh_builtin_decl): New.
951         (sh_media_builtin_decl): New.
953 2009-10-14  Hans-Peter Nilsson  <hp@axis.com>
955         PR target/38948
956         * config/cris/cris.h (SECONDARY_RELOAD_CLASS): Handle reload
957         requests between special registers.
959 2009-10-13  Eric Botcazou  <ebotcazou@adacore.com>
961         * dwarf2out.c (mem_loc_descriptor): Accept UNGT as well.
963 2009-10-13  Richard Henderson  <rth@redhat.com>
965         PR tree-optimization/41377
966         * tree-eh.c (unsplit_eh): Propagate degenerate PHIs.
967         (cleanup_empty_eh_merge_phis): New change_region parameter;
968         pass it on to redirect_eh_edge_1.  Update callers.
969         (cleanup_empty_eh_unsplit): Don't require an existing EH label
970         at the destination block.
972 2009-10-13  Basile Starynkevitch  <basile@starynkevitch.net>
974         * passes.c (register_pass): Replaced gcc_unreachable by
975         fatal_error on failure. Mentions plugins in comments & messages.
977 2009-10-13  Jakub Jelinek  <jakub@redhat.com>
979         PR target/41693
980         * rtl.h (DEBUG_EXPR_TREE_DECL): Define.
981         * sched-vis.c (print_value): Use it.
982         * cselib.c (cselib_hash_rtx): Likewise.
983         * print-rtl.c (print_rtx): Likewise.
984         * cfgexpand.c (expand_debug_rtx): Likewise.
985         * var-tracking.c (vt_expand_loc_callback): Likewise.
987 2009-10-13  Richard Guenther  <rguenther@suse.de>
989         PR lto/41565
990         * opts.c (handle_option): Split out code to handle setting
991         the options flag var ...
992         (set_option): ... here.
993         * opts.h (set_option): Declare.
994         * lto-opts.c (register_user_option_p): Include -fexceptions
995         and all position independent code variants.
996         (handle_common_option): Remove.
997         (lto_reissue_options): Use set_option.
999 2009-10-13  Martin Jambor  <mjambor@suse.cz>
1001         PR tree-optimization/41661
1002         * ipa-prop.c (compute_complex_pass_through): Allow only operations
1003         that are tcc_comparisons or do not change the type in any
1004         un-usleless way.
1005         * ipa-cp.c (ipcp_lattice_from_jfunc): Request boolean type when
1006         folding tcc_comparison operations.
1008 2009-10-13  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
1010         * config/s390/s390.c (s390_encode_section_info): Handle BLKmode
1011         properly.
1013 2009-10-12  Alexandre Oliva  <aoliva@redhat.com>
1015         PR debug/41343
1016         PR debug/41447
1017         PR debug/41264
1018         PR debug/41338
1019         * tree.def (DEBUG_EXPR_DECL): New.
1020         * rtl.def (DEBUG_EXPR): New.
1021         * gengtype.c (adjust_field_rtx_def): Handle it.
1022         * tree-ssa.c (propagate_var_def_into_debug_stmts): Rename to...
1023         (insert_debug_temp_for_var_def): ... this.  Drop support for
1024         moving.  Take iterator for def stmt; insert debug stmt before it.
1025         Scan early for use count and kind in debug stmts.
1026         (propagate_defs_into_debug_stmts): Rename to...
1027         (insert_debug_temps_for_defs): ... this.  Likewise.
1028         * tree.h (DEBUG_TEMP_UID): New.
1029         * tree.c (next_debug_decl_uid): New.
1030         (make_node_stat): Count debug decls separately.
1031         (copy_node_stat): Likewise.
1032         * cfgexpand.c (expand_debug_expr): Handle DEBUG_EXPR_DECL.
1033         * var-tracking.c (dv_is_decl_p): Recognize it.
1034         (VALUE_RECURSED_INTO): Apply to DEBUG_EXPRs too.
1035         (track_expr_p): Track expanded DEBUG_EXPR_DECLs.
1036         (vt_expand_loc_callback): Expand DEBUG_EXPRs.
1037         (emit_note_insn_var_location): Don't emit notes for DEBUG_EXPR_DECLs.
1038         * cselib.c (rtx_equal_for_cselib_p): Handle DEBUG_EXPR.
1039         (cselib_hash_rtx): Likewise.
1040         (cselib_expand_value_rtx_1): Use callback for DEBUG_EXPR.
1041         * tree-ssa-operands.c (get_expr_operands): Skip DEBUG_EXPR_DECLs in
1042         debug bind stmts.
1043         * emit-rtl.c (verify_rtx_sharing): Handle DEBUG_EXPR and VALUE.
1044         (copy_rtx_if_shared_1, reset_used_flags, set_used_flags): Likewise.
1045         * rtl.c (copy_rtx): Likewise.
1046         (rtx_equal_p_cb, rtx_equal_p): Handle DEBUG_EXPR.
1047         * print-rtl.c (print_rtx): Likewise.
1048         * sched-vis.c (print_value): Likewise.
1049         (print_insn): Handle DEBUG_EXPR_DECL.
1050         * tree-dump.c (dequeue_and_dump): Likewise.
1051         * tree-pretty-print.c (dump_decl_name, dump_generic_node): Likewise.
1052         * gimple-iterator (gsi_replace): Check for same lhs.
1053         (gsi_remove): Insert debug temps.
1054         * tree-ssa-loop-im.c (rewrite_reciprocal): Replace with same lhs.
1055         (move_computations_stmt): Drop explicit propagation into debug stmts.
1056         (rewrite_bittest): Likewise.  Use gsi_remove for propagation.
1057         * tree-ssa-reassoc.c (rewrite_expr_tree, linearize_expr): Likewise.
1058         * tree-ssa-sink.c (statement_sink_location): Likewise.
1059         * tree-ssa-forwprop (forward_propagate_addr_expr): Likewise.
1060         * tree-ssanames.c (release_ssa_name): Adjust for rename.
1061         * tree-flow.h: Likewise.
1062         * tree-ssa-dce.c (mark_stmt_if_obviously_necessary): Don't mark
1063         debug temps without values.
1064         (eliminate_unnecessary_stmts): Don't discard just-inserted
1065         debug stmts.
1067 2009-10-12  Hans-Peter Nilsson  <hp@axis.com>
1069         PR target/26515
1070         * config/cris/cris.md (andu): Check that operand 1 is one of the
1071         general registers.  Fix typo in head comment.
1073 2009-10-12  Stefan Dösinger  <stefan@codeweavers.com>
1075         * config/i386/i386.md (vswapmov): New.
1076         * config/i386/i386.c (ix86_handle_fndecl_attribute): New.
1077         (ix86_function_ms_hook_prologue): New.
1078         (ix86_expand_prologue): Handle ms_hook_prologue attribute.
1079         * configure.ac: Test for swap suffix support in as.
1080         * configure: Rebuild.
1082 2009-10-12  Jakub Jelinek  <jakub@redhat.com>
1084         PR target/41680
1085         * config/i386/i386.md (split after *testqi_ext_3_rex64): Only narrow
1086         paradoxical subregs to prevent partial register stalls if the inner
1087         mode is integer mode.
1089 2009-10-12  Uros Bizjak  <ubizjak@gmail.com>
1091         * config/i386/i386.md (*setcc_<mode>_2): Remove insn pattern.
1093 2009-10-12  Dodji Seketeli  <dodji@redhat.com>
1095         PR c++/41570
1096         * gcc/dwarf2out.c (template_parameter_pack_die,
1097         gen_formal_parameter_pack_die): Use add_name_and_src_coords_attributes.
1099 2009-10-12  Alexandre Oliva  <aoliva@redhat.com>
1101         PR debug/41616
1102         * tree-into-ssa.c (insert_phi_nodes_for): Build debug bind stmts
1103         on updates too.
1104         (maybe_register_def): Likewise.  Take stmt iterator.
1105         (rewrite_update_stmt): Take stmt iterator and pass it on.
1106         (rewrite_update_enter_block): Pass stmt iterator.
1108 2009-10-11  Andrew Pinski  <andrew_pinski@playstation.sony.com>
1110         * config/spu/spu.c (TARGET_BUILTIN_DECL): Define.
1111         (spu_builtin_decl): New function.
1113 2009-10-12  Uros Bizjak  <ubizjak@gmail.com>
1115         * config/i386/i386.md (SWIM): New mode iterator.
1116         (mov<mode>cc): Macroize expander from mov{qi,hi,si,di}cc patterns
1117         using SWIM mode iterator.
1118         (x86_mov<mode>cc_0_m1): Macroize insn from x86_mov{si,di}cc_0_m1
1119         patterns using SWI48 mode iterator.
1120         (*x86_mov<mode>cc_0_m1_se):  Macroize insn from
1121         *x86_mov{si,di}cc_0_m1_se patterns using SWI48 mode iterator.
1122         (*x86_mov<mode>cc_0_m1_neg): New insn pattern.
1123         (*mov<mode>cc_noc): Macroize insn from *mov{hi,si,di}cc_noc
1124         patterns using SWI248 mode iterator.
1125         * config/i386/i386.c (ix86_expand_int_movcc): Update the call to
1126         gen_x86_movdicc_0_m1_rex64 for renamed function
1128 2009-10-11  Jose Ruiz  <ruiz@adacore.com>
1129             Eric Botcazou  <ebotcazou@adacore.com>
1131         PR target/33743
1132         * config/sparc/sol2.h (MD_UNWIND_SUPPORT): Define.
1133         * config/sparc/sol2-unwind.h: New file.
1135 2009-10-11  Olivier Hainque  <hainque@adacore.com>
1136             Eric Botcazou  <ebotcazou@adacore.com>
1138         PR target/33743
1139         * config/i386/sol2.h (MD_UNWIND_SUPPORT): Define.
1140         * config/i386/sol2-unwind.h: New file.
1142 2009-10-11  H.J. Lu  <hongjiu.lu@intel.com>
1144         PR target/41665
1145         * config/i386/i386.md (addsi_1_zext): Get the proper second
1146         operand for lea.
1148 2009-10-11  Richard Sandiford  <rdsandiford@googlemail.com>
1150         * simplify-rtx.c (simplify_replace_rtx): Use rtx_equal_p for
1151         all OLD_RTXes, not just REGs.  Use copy_rtx to create the
1152         replacement value.
1154 2009-10-11  Richard Guenther  <rguenther@suse.de>
1156         * gimple.c (iterative_hash_type_name): Do not handle special
1157         anonymous names.
1159 2009-10-11  Uros Bizjak  <ubizjak@gmail.com>
1161         * config/i386/i386.md (*setcc_di_1): New insn_and_split pattern.
1162         (*setcc_si_1_and): Ditto.
1163         (*setcc_si_1_movzbl): Ditto.
1164         (*setcc_<mode>_2): Ditto.
1165         (*setcc_qi): Rename from *setcc_1.
1166         (*setcc_qi_slp): Rename from *setcc_2.
1168         (*zero_extendqihi2_movzbw_and splitter): Use ix86_expand_clear.
1169         (*zero_extendqisi2_movzbw_and splitter): Ditto.
1171         * config/i386/i386.c (ix86_expand_clear): Remove reload_completed from
1172         "if" condition, there is already assert with reload_completed present.
1174 2009-10-11  Gerald Pfeifer  <gerald@pfeifer.com>
1176         * plugin.c (try_init_one_plugin): Improve constness of variable err.
1178 2009-10-10  Gerald Pfeifer  <gerald@pfeifer.com>
1180         * doc/install.texi (Final install): Refer to
1181         http://gcc.gnu.org/bugs/ for bug reporting.
1183 2009-10-10  Peter Bergner  <bergner@vnet.ibm.com>
1185         * configure.ac: Add test for dci instruction.
1186         * configure: Regenerate.
1187         * config.in: Likewise.
1188         * config.gcc: Handle --with-cpu=476 and --with-cpu=476fp.
1189         * doc/invoke.texi: Add cpu_type 476 and 476fp.
1190         (-mmulhw): Add 476 to description.
1191         (-mdlmzb): Likewise.
1192         * config/rs6000/t-fprules (MULTILIB_MATCHES_FLOAT): Include -mcpu=476.
1193         * config/rs6000/rs6000.c (processor_costs): Add ppc476_cost.
1194         (processor_target_table): Add 476 and 476fp entries.
1195         (rs6000_override_options): Use ppc476_cost for PROCESSOR_PPC476.
1196         (rs6000_issue_rate): Add CPU_PPC476.
1197         * config/rs6000/rs6000.h (ASM_CPU_476_SPEC): Define.
1198         (ASM_CPU_SPEC): Pass %(asm_cpu_476) for -mcpu=476 and -mcpu=476fp.
1199         (processor_type): Add PROCESSOR_PPC476.
1200         (EXTRA_SPECS): Add asm_cpu_476 string.
1201         * config/rs6000/rs6000.md (define_attr "type"): Add isel attribute.
1202         (define_attr "cpu"): Add ppc476.
1203         Include 476.md.
1204         Update comments for 476.
1205         (isel_signed, isel_unsigned): Change to use "isel" type attribute.
1206         * config/rs6000/vxworks.h (CPP_SPEC): Handle 464 and 476.
1207         Update copyright year.
1208         * config/rs6000/476.md: New file.
1209         * config/rs6000/40x.md: Add description for "isel" attribute.
1210         Update copyright year.
1211         * config/rs6000/440.md: Likewise.
1212         * config/rs6000/603.md: Likewise.
1213         * config/rs6000/6xx.md: Likewise.
1214         * config/rs6000/7450.md: Likewise.
1215         * config/rs6000/7xx.md: Likewise.
1216         * config/rs6000/8540.md: Likewise.
1217         * config/rs6000/cell.md: Likewise.
1218         * config/rs6000/e300c2c3.md: Likewise.
1219         * config/rs6000/e500mc.md: Likewise.
1220         * config/rs6000/mpc.md: Likewise.
1221         * config/rs6000/power4.md: Likewise.
1222         * config/rs6000/power5.md: Likewise.
1223         * config/rs6000/power6.md: Likewise.
1224         * config/rs6000/power7.md: Likewise.
1225         * config/rs6000/rios1.md: Likewise.
1226         * config/rs6000/rios2.md: Likewise.
1227         * config/rs6000/rs64.md: Likewise.
1229 2009-10-10  Richard Guenther  <rguenther@suse.de>
1231         PR tree-optimization/41654
1232         * tree-ssa-ifcombine.c (ifcombine_ifandif): Properly canonicalize
1233         a cond expr before calling gimple_cond_set_condition_from_tree.
1234         (ifcombine_iforif): Likewise.
1236 2009-10-09  Ian Lance Taylor  <iant@google.com>
1238         * configure.ac: Use AC_SEARCH_LIBS to find dlopen.
1239         * configure: Rebuild.
1241 2009-10-09  Neil Vachharajani <nvachhar@google.com>
1243         * doc/cpp.texi (Other Directives): Do not list #ident and #sccs as
1244         deprecated.
1246 2009-10-09  Richard Guenther  <rguenther@suse.de>
1248         PR lto/41638
1249         * target-def.h (TARGET_BUILTIN_DECL): Define.
1250         (TARGET_INITIALIZER): Add TARGET_BUILTIN_DECL.
1251         * target.h (struct gcc_target): Add builtin_decl target hook.
1252         * doc/tm.texi (TARGET_BUILTIN_DECL): Document.
1253         * lto-streamer-in.c (lto_get_builtin_tree): Fix handling of
1254         target builtins.
1255         * lto-streamer-out.c (lto_output_tree_pointers): Use sorry,
1256         not gcc_unreachable.
1257         (lto_output_builtin_tree): Sorry if the target does not support
1258         streaming target builtins.
1259         * config/rs6000/rs6000.c (TARGET_BUILTIN_DECL): Define.
1260         (rs6000_builtin_decl): New function.
1261         * config/i386/i386.c (TARGET_BUILTIN_DECL): Define.
1262         (ix86_builtin_decl): New function.
1264 2009-10-09  Jakub Jelinek  <jakub@redhat.com>
1266         PR preprocessor/41445
1267         * c-ppoutput.c (do_line_change): New function.
1268         (cb_line_change): Use it.
1269         (scan_translation_unit): Call do_line_change if
1270         avoid_paste or PREV_WHITE and token location is on a different line
1271         than print.src_line.
1273         PR debug/40521
1274         * dwarf2out.c (dwarf2out_init): Test whether
1275         HAVE_GAS_CFI_SECTIONS_DIRECTIVE is non-zero instead of checking
1276         it is defined.
1278         PR rtl-optimization/41646
1279         * calls.c (expand_call): For BLKmode types returned in registers
1280         avoid likely spilled hard regs in copy_blkmode_from_reg generated
1281         insns.
1283 2009-10-09  Richard Guenther  <rguenther@suse.de>
1285         PR tree-optimization/41634
1286         * tree-ssa-dom.c (remove_local_expressions_from_table): Assert
1287         we remove the correct elements.
1288         (optimize_stmt): Make sure to update stmt operands before
1289         optimizing redundancies.
1291 2009-10-09  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
1293         * config/s390/s390.md ("prefetch"): Remove stcmh for prefetching.
1295 2009-10-09  Richard Guenther  <rguenther@suse.de>
1297         PR driver/41637
1298         * lto-wrapper.c (ltrans_output_file, flto_out, args_name): New
1299         globals.
1300         (lto_wrapper_exit): New function.
1301         (fatal): Use it.
1302         (fatal_perror): Likewise.
1303         (fork_execute): Use global args_name, do not free it.
1304         (run_gcc): Use global ltrans_output_file, flto_out, do not free them.
1305         * lto-streamer.h: Remove duplicate prototypes.
1307 2009-10-09  Richard Guenther  <rguenther@suse.de>
1309         * cgraph.c (cgraph_create_edge): Check for NULL call_stmt
1310         before calling stmt_can_throw_external.
1312 2009-10-09  Eric Botcazou  <ebotcazou@adacore.com>
1314         PR tree-optimization/40071
1315         * tree-vect-data-refs.c (vect_create_data_ref_ptr): Build a ref-all
1316         pointer if the original data reference doesn't conflict with the
1317         created vector data reference.  Fix long line.
1319 2009-10-09  Uros Bizjak  <ubizjak@gmail.com>
1321         * config/i386/i386.md (any_div): New code iterator.
1322         (u): Handle div and udiv.
1323         (sgnprefix): Ditto.
1324         (<u>divqi3): Macroize insn from {,u}divqi3  using any_div
1325         code iterator.
1326         (lfloor<MODEF:mode><SWI48:mode>2): Macroize insn from
1327         lfloor<mode>{si,di}2 patterns using SWI48 mode iterator.
1328         (lceil<MODEF:mode><SWI48:mode>2): Macroize insn from
1329         lceil<mode>{si,di}2 patterns using SWI48 mode iterator.
1331 2009-10-08  Joseph Myers  <joseph@codesourcery.com>
1333         * gcc.c (main): Remove trailing "." from diagnostics.
1335 2009-10-08  Cary Coutant  <ccoutant@google.com>
1337         Add support for debugging with ICF (Identical Code Folding).
1338         * calls.c (debug.h): New #include.
1339         (emit_call_1): Call virtual_call_token debug hook.
1340         * common.opt (-fenable-icf-debug): New option.
1341         * dwarf2out.c (dwarf2_debug_hooks): Add entries for new hooks (two
1342         locations in the source).
1343         (poc_label_num): New variable.
1344         (dcall_entry, vcall_entry): New typedefs.
1345         (dcall_table, vcall_table): New variables.
1346         (struct vcall_insn): New type.
1347         (vcall_insn_table): New variable.
1348         (DEBUG_DCALL_SECTION, DEBUG_VCALL_SECTION): New macros.
1349         (size_of_dcall_table): New function.
1350         (output_dcall_table): New function.
1351         (size_of_vcall_table): New function.
1352         (output_vcall_table): New function.
1353         (dwarf2out_direct_call): New function.
1354         (vcall_insn_table_hash): New function.
1355         (vcall_insn_table_eq): New function.
1356         (dwarf2out_virtual_call_token): New function.
1357         (dwarf2out_virtual_call): New function.
1358         (dwarf2out_init): Allocate new tables and sections.
1359         (prune_unused_types): Mark DIEs referenced from direct call table.
1360         (dwarf2out_finish): Output direct and virtual call tables.
1361         * final.c (final_scan_insn): Call direct_call and virtual_call
1362         debug hooks.
1363         * debug.h (struct gcc_debug_hooks): Add direct_call,
1364         virtual_call_token, virtual_call hooks.
1365         (debug_nothing_uid): New function.
1366         * debug.c (do_nothing_debug_hooks): Add dummy entries for new hooks.
1367         (debug_nothing_uid): New function.
1368         * dbxout.c (dbx_debug_hooks): Add dummy entries for new hooks.
1369         (xcoff_debug_hooks): Likewise.
1370         * sdbout.c (sdb_debug_hooks): Likewise.
1371         * vmsdbgout.c (vmsdbg_debug_hooks): Likewise.
1372         * doc/invoke.texi (-fenable-icf-debug): New option.
1374 2009-10-08  Alexandre Oliva  <aoliva@redhat.com>
1376         PR debug/41353
1377         * regmove.c (regmove_backward_pass): Replace src with dst in the
1378         debug insn, and check for dst before rather than after.
1380 2009-10-08  Janis Johnson <janis187@us.ibm.com>
1382         * config/rs6000/rs6000.c (rs6000_delegitimize_address): Remove.
1383         (TARGET_DELEGITIMIZE_ADDRESS): Likewise.
1385 2009-10-08  Jan Hubicka  <jh@suse.cz>
1387         PR middle-end/41626
1388         * cgraphbuild.c (record_reference): When parameter DATA is NULL,
1389         do not mark cgraph nodes as needed.
1390         (record_references_in_initializer): Add new only_vars parameter.
1391         * cgraph.h (record_references_in_initializer): New parameter.
1392         * varasm.c (assemble_variable): Update call.
1393         * varpool.c (varpool_analyze_pending_decls): Always look for
1394         referenced vars.
1396 2009-10-08  Anatoly Sokolov  <aesok@post.ru>
1398         * config/avr/avr.c (last_insn_address) Remove variable.
1399         (expand_prologue): Don't initialise last_insn_address variable.
1400         (final_prescan_insn): Don't output insn size.
1401         * config/avr/avr.opt (msize): Remove switch.
1402         * doc/invoke.texi (AVR Options): Remove documentation of -msize
1403         switch.
1405 2009-10-08  Adam Nemet  <anemet@caviumnetworks.com>
1407         * combine.c (label_tick_ebb_start): Fix comment.
1408         (combine_instructions): Set label_tick and label_tick_ebb_start before
1409         calling setup_incoming_promotions.  Start them from 1.  Increment
1410         label_tick instead of deriving it from the BB index.  Rather than
1411         comparing ticks use the block from the previous iteration to decide
1412         whether to start a new EBB.  Remove empty lines before function.
1414 2009-10-08  Michael Matz  <matz@suse.de>
1416         PR middle-end/41573
1417         * builtins.c (fold_builtin_isascii): Use fold_build2.
1418         (fold_builtin_isdigit): Ditto.
1419         * except.c (duplicate_eh_regions_1): Tolerate NULL labels.
1420         * tree-cfg.c (struct rus_data, remove_useless_stmts_warn_notreached,
1421         remove_useless_stmts_cond, remove_useless_stmts_tf,
1422         remove_useless_stmts_tc, remove_useless_stmts_bind,
1423         remove_useless_stmts_goto, remove_useless_stmts_label,
1424         remove_useless_stmts_1, remove_useless_stmts,
1425         pass_remove_useless_stmts): Remove.
1426         * tree-pass.h (pass_remove_useless_stmts): Don't declare.
1427         * passes.c (init_optimization_passes): Don't add
1428         pass_remove_useless_stmts.
1429         * tree-eh.c (lower_eh_constructs_2): Handle empty cleanups.
1430         * tree.c (free_lang_data_in_decl): Don't clear DECL_INITIAL of
1431         static constants.
1432         * lto-symtab.c (lto_symtab_register_decl): Accepts DECL_INITIAL
1433         for static constants.
1434         * lto-streamer-out.c (output_gimple_stmt): Handle GIMPLE_NOP.
1435         * lto-streamer-in.c (input_gimple_stmt): Handle GIMPLE_NOP.
1437 2009-10-08  Richard Guenther  <rguenther@suse.de>
1439         * gimple.c (free_gimple_type_tables): New function.
1440         * gimple.h (free_gimple_type_tables): Declare.
1442 2009-10-07  Mark Heffernan  <meheff@google.com>
1444         * ipa-prop.c (ipa_print_node_params) Only print
1445         names of named arguments.
1447 2009-10-08  Rafael Avila de Espindola  <espindola@google.com>
1449         * gcc.c (LINK_COMMAND_SPEC): Pass libc with -pass-through if it is
1450         being statically linked.
1452 2009-10-08  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
1454         * collect2.c (add_lto_object): Only define if OBJECT_FORMAT_NONE.
1456 2009-10-08  Jan Hubicka  <jh@suse.cz>
1458         PR bootstrap/41620
1459         * ipa.c (cgraph_externally_visible_p,
1460         function_and_variable_visibility,
1461         whole_program_function_and_variable_visibility): Skip non-finalized
1462         nodes.
1464 2009-10-08  Nick Clifton  <nickc@redhat.com>
1466         * config/mn10300/mn10300.h (CONSTANT_ADDRESS_P): Do not allow
1467         CONST_DOUBLEs.
1469 2009-10-08  Andreas Tobler  <a.tobler@schweiz.org>
1471         PR bootstrap/37739
1472         * config.host: Use config/x-cflags-O1 for powerpc FreeBSD.
1474 2009-10-07  Joseph Myers  <joseph@codesourcery.com>
1476         PR c/41182
1477         * c-common.c (c_fully_fold_internal): Strip nops from the result
1478         of recursive calls to c_fully_fold_internal.
1479         (c_wrap_maybe_const): New.
1480         (c_save_expr): Use c_wrap_maybe_const.
1481         * c-common.h (c_wrap_maybe_const): Declare.
1482         * c-typeck.c (build_conditional_expr, c_finish_stmt_expr,
1483         build_binary_op): Use c_wrap_maybe_const.
1485 2009-10-07  Kaveh R. Ghazi  <ghazi@caip.rutgers.edu>
1487         * real.c: Fix comment to reflect actual exponent size.
1489 2009-10-08  Ben Elliston  <bje@au.ibm.com>
1491         * config/rs6000/a2.md: Add FSF comment header.
1493 2009-10-07  Uros Bizjak  <ubizjak@gmail.com>
1495         * config/i386/i386.md (any_extend): New code iterator.
1496         (u, s): New code attributes.
1497         (sgnprefix): Ditto.
1498         (DWIH): Rewrite as code iterator for SI and DI modes.
1499         (DWI): Rewrite as mode attribute.
1500         (dwi): New mode attribute.
1501         (di): Depend on SI mode and DI mode.
1502         (doubleint_general_operand): Remove mode attribute.
1504         (*lea_1): Macroize insn from *lea_1_rex64 and *lea_1 patterns using
1505         DWIH mode iterator.
1507         (*add<mode>3_doubleword): Use DWIH as the base mode iterator.
1508         (*sub<mode>3_doubleword): Ditto.
1510         (mul<mode>3): Macroize expander from mul{hi,si,di}3 patterns
1511         using SWIM248 mode iterator.
1512         (*mul<mode>3_1): Macroize insn from mul{si,di}3_1 patterns
1513         using SWI48 mode iterator.
1514         (<u>mul<mode><dwi>3): Macroize expander from {,u}mul{sidi,diti}3
1515         patterns using DWIH mode iterator and any_extend code iterator.
1516         (<u>mulqihi3): Macroize expander from {,u}mulqihi3 patterns
1517         using any_extend code iterator.
1518         (*<u>mul<mode><dwi>3_1): Macroize insn from {,u}mul{sidi,diti}3_1
1519         patterns using DWIH mode iterator and any_extend code iterator.
1520         (*<u>mulqihi3_1): Macroize insn from {,u}mulqihi3_1 patterns
1521         using any_extend code iterator.
1522         (<s>mul<mode>3_highpart): Macroize expander from
1523         {s,u}mul{si,di}3_highpart patterns using DWIH mode iterator
1524         and any_extend code iterator.
1525         (*<s>muldi3_highpart_1): Macroize insn from
1526         *{s,u}muldi3_highpart_rex64 patterns using any_extend code iterator.
1527         (*<s>mulsi3_highpart_1): Macroize insn from *{s,u}mulsi3_highpart_1
1528         patterns using any_extend code iterator.
1529         (*<s>mulsi3_highpart_zext): Macroize insn from
1530         *{s,u}mulsi3_highpart_zext patterns using any_extend code iterator.
1532 2009-10-07  Jakub Jelinek  <jakub@redhat.com>
1534         * dwarf2out.c (tree_add_const_value_attribute_for_decl): Don't add
1535         DW_AT_const_value if VAR_DIE already has DW_AT_abstract_origin
1536         refering to a DIE with DW_AT_const_value.
1538 2009-10-07  Vladimir Makarov  <vmakarov@redhat.com>
1540         PR middle-end/22072
1541         * ira-lives.c (check_and_make_def_conflict): Process all operands.
1543 2009-10-06  Jan Hubicka  <jh@suse.cz>
1545         * cgraph.c (cgraph_node_can_be_local): Handle externally visible nodes
1546         correctly.
1548 2009-10-06  Uros Bizjak  <ubizjak@gmail.com>
1550         * config/i386/i386.md (*lea_1_rex64, *lea_1, *lea_1_zext,
1551         *lea_2_rex64): Move before *add<mode>_1 pattern.
1553 2009-10-07  Jan Hubicka  <jh@suse.cz>
1555         * collect2.c (main): Add -fno-whole-program.
1556         * gcc.c (set_collect_gcc_options): Do not remove whole program here.
1558 2009-10-07  Jan Hubicka  <jh@suse.cz>
1560         * lto-symtab.c (lto_cgraph_replace_node): Assert that inline clones
1561         has no address taken.
1562         * cgraph.c (cgraph_mark_needed_node): Assert that inline clones are
1563         never needed.
1564         (cgraph_clone_node): Clear externally_visible flag for clones.
1565         * cgraph.h (cgraph_only_called_directly_p,
1566         cgraph_can_remove_if_no_direct_calls_p): New predicates.
1567         * tree-pass.h (pass_ipa_whole_program_visibility): Declare.
1568         * ipa-cp.c (ipcp_cloning_candidate_p): Use new predicate.
1569         (ipcp_initialize_node_lattices, ipcp_estimate_growth,
1570         ipcp_insert_stage): Likwise.
1571         * cgraphunit.c (cgraph_decide_is_function_needed): Do not compute
1572         externally_visible flag.
1573         (verify_cgraph_node): Verify that inline clones look right.
1574         (process_function_and_variable_attributes): Do not set
1575         externally_visible flags.
1576         (ipa_passes): Avoid executing small_ipa_passes at LTO stage; they've
1577         been already run.
1578         * lto-cgraph.c (lto_output_node): Assert that inline clones are not
1579         boundaries.
1580         * ipa-inline.c (cgraph_clone_inlined_nodes): Use new predicates;
1581         clear externally_visible when turning into inline clones
1582         (cgraph_mark_inline_edge): Use new predicates.
1583         (cgraph_estimate_growth): Likewise.
1584         (cgraph_decide_inlining): Likewise.
1585         * ipa.c (cgraph_postorder): Likewise.
1586         (cgraph_remove_unreachable_nodes): Likewise; sanity check
1587         that inline clones are not needed.
1588         (cgraph_externally_visible_p): New predicate.
1589         (function_and_variable_visibility): Add whole_program parameter;
1590         always set externally_visible flag; handle COMDAT function
1591         privatization.
1592         (local_function_and_variable_visibility): New function.
1593         (gate_whole_program_function_and_variable_visibility): New function.
1594         (whole_program_function_and_variable_visibility): New function.
1595         (pass_ipa_whole_program_visibility): New function.
1596         * passes.c  (init_optimization_passes): Add whole program visibility
1597         pass.
1598         (do_per_function_toporder, function_called_by_processed_nodes_p): Do
1599         not care about needed/reachable flags.
1600         * varpool.c: Include flags.h
1601         (decide_is_variable_needed): When doing LTO assume whole-program mode.
1602         (varpool_finalize_decl): When we are in LTO read-back, all variables
1603         are analyzed.
1604         (varpool_analyze_pending_decls): Skip analyzis of analyzed vars.
1606 2009-10-07  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
1608         * config/s390/tpf.h (TARGET_DEFAULT): Remove MASK_HARD_FLOAT and
1609         add MASK_HARD_DFP.
1611 2009-10-07  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
1613         * config.gcc: Don't include the makefile fragments intended for
1614         libgcc.
1615         * config/s390/fixdfdi.h: File removed.
1616         * config/s390/libgcc-glibc.ver: File removed.
1617         * config/s390/s390.h: Remove the fixdfdi.h hack.
1618         * config/s390/t-crtstuff: File moved to libgcc dir.
1619         * config/s390/t-linux: Likewise.
1620         * config/s390/t-tpf: libgcc specific parts removed.
1621         * config/s390/t-linux64: Likewise.
1623 2009-10-06  Jerry Quinn  <jlquinn@optonline.net>
1625         * Makefile.in (lto-wrapper): Use COMPILER and ALL_COMPILERFLAGS.
1626         (lto-compress.o): Likewise.
1628 2009-10-07  Danny Smith  <dannysmith@users.sourceforge.net>
1630         PR target/41512
1631         * config/i386/winnt.c (i386_pe_determine_dllexport_p): Don't propagate
1632         dllexport to class members here.
1633         (i386_pe_determine_dllimport_p): Only check static class data for
1634         definition.
1635         (i386_pe_encode_section_info): Don't recheck DECL_DLLIMPORT_P.
1636         * config/i386/winnt-cxx.c (i386_pe_type_dllimport_p): Only check
1637         functions for vague linkage.
1638         (i386_pe_type_dllexport_p): Fix formatting.
1639         (maybe_add_dllexport) New function.
1640         (i386_pe_adjust_class_at_definition): Use it to propagate dllexport
1641         to class members.
1643 2009-10-07  Ben Elliston  <bje@au.ibm.com>
1645         * config/rs6000/a2.md: Remove duplicated lines.
1647 2009-10-07  Ben Elliston  <bje@au.ibm.com>
1649         * config.gcc (powerpc*-*-*): Handle a2.
1650         * config/rs6000/rs6000.md (cpu): Add ppca2.  Include "a2.md".
1651         * config/rs6000/a2.md: New file.
1652         * config/rs6000/rs6000.opt (mno-update): New.
1653         (mupdate): Return to using a mask, not a var.
1654         * config/rs6000/rs6000.h (ASM_CPU_SPEC): Add support for a2.
1655         (enum processor_type): Add PROCESSOR_PPCA2.
1656         * config/rs6000/rs6000.c (ppca2_cost): New costs.
1657         (rs6000_override_options): Add "a2" to processor_target_table.
1658         Update rs6000_always_hint logic.  Correctly set rs6000_cost for a2.
1659         * doc/invoke.texi (RS/6000 and PowerPC Options): Document -mcpu=a2.
1661 2009-10-06  Uros Bizjak  <ubizjak@gmail.com>
1663         * config/i386/i386.md (float<SSEMODEI24:mode><X87MODEF:mode>2):
1664         Use explicit gen_truncxfsf2 and gen_truncxfdf2 references to avoid
1665         reference to nonexistent gen_truncxfxf2 function.
1667 2009-10-06  Uros Bizjak  <ubizjak@gmail.com>
1669         * config/i386/i386.md (SWI48, SDWIM, DWI): New mode iterators.
1670         (DWIH, g, di, doubleint_general_operand): New mode attributes.
1671         (general_operand): Handle TI mode.
1672         (add<mode>3): Macroize expander from add{qi,hi,si,di,ti}3 patterns
1673         using SDWIM mode iterator.
1674         (*add<mode>3_doubleword): New insn_and_split pattern.  Macroize
1675         pattern from *add{di,ti}3_1 patterns and corresponding splitters
1676         using DWI mode iterator.
1677         (add<mode>3_carry): Macroize insn from add{qi,hi,si,di}3_carry
1678         patterns using SWI mode iterator.
1679         (*add<mode>3_cc): Macroize insn from add{si,di}3_cc patterns
1680         using SWI48 mode iterator.
1681         (*add<mode>_1): Ditto from add{si,di}_1 patterns.
1682         (*add<mode>_2): Ditto from add{si,di}_2 patterns.
1683         (*add<mode>_3): Ditto from add{si,di}_3 patterns.
1684         (*add<mode>_5): Ditto from add{si,di}_5 patterns.
1685         (sub<mode>3): Macroize expander from sub{qi,hi,si,di,ti}3 patterns
1686         using SDWIM mode iterator.
1687         (*sub<mode>3_doubleword): New insn_and_split pattern.  Macroize
1688         pattern from *sub{di,ti}3_1 patterns and corresponding splitters
1689         using DWI mode iterator.
1690         (sub<mode>3_carry): Macroize insn from sub{qi,hi,si,di}3_carry
1691         patterns using SWI mode iterator.
1692         (*sub<mode>_1): Ditto from from sub{qi,hi,si,di}_1 patterns.
1693         (*sub<mode>_2): Ditto from sub{qi,hi,si,di}_2 patterns.
1694         (*sub<mode>_3): Ditto from sub{qi,hi,si,di}_3 patterns.
1695         (<plusminus_insn>xf3): Macroize expander from addxf3 and subxf3
1696         patterns using plusminus code iterator.
1697         (<plusminus_insn><mode>3): Macroize expander from add<mode>3 and
1698         sub<mode>3 patterns using plusminus code iterator.
1699         * config/i386/i386.c (override_options): Update the call to
1700         gen_subdi_carry_rex64 for renamed function.
1701         (ix86_expand_int_addcc): Update calls to gen_subdi3_carry_rex64
1702         and gen_adddi3_carry_rex64 for renamed functions.  Use indirect
1703         calls to instruction expanders.
1705 2009-10-06  Martin Jambor  <mjambor@suse.cz>
1707         PR bootstrap/41395
1708         * opts.c (decode_options): Run IPA-SRA at -O2.
1710 2009-10-06  Richard Guenther  <rguenther@suse.de>
1712         * lto-symtab.c (lto_symtab_entry_hash): Hash strings, not pointers.
1714 2009-10-06  Tobias Burnus  <burnus@net-b.de>
1716         PR lto/41591
1717         * doc/invoke.texi (-flto,-fwhole-program): Make clear that the
1718         -flto and -fwhole-program flags can be combined.
1720 2009-10-06  Ryan Mansfield  <rmansfield@qnx.com>
1722         PR driver/41217
1723         * gcc.c (process_command): Check that -o argument was specified.
1725 2009-10-06  Jerry Quinn  <jlquinn@optonline.net>
1727         * gimple.c (gimple_type_hash): Use CONST_CAST_TREE to fix compilation.
1729 2009-10-05  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
1731         * c.opt (Wjump-misses-init): Fix typo to enable for ObjC.
1732         * doc/invoke.texi (Warning Options): Annotate allowed languages
1733         for -Wunsuffixed-float-constants.
1735 2009-10-05  Jakub Jelinek  <jakub@redhat.com>
1737         * dwarf2out.c (modified_type_die): Don't add DW_AT_name to
1738         DW_TAG_{const,volatile}_type if its DW_AT_type already has the
1739         same name and isn't the main variant.
1741         PR debug/41558
1742         * dwarf2out.c (loc_by_reference): Removed.
1743         (dw_loc_list_1): New function.
1744         (dw_loc_list): Remove toplev argument, add want_address argument.
1745         Don't look at decl_by_reference_p at all.  Use dw_loc_list_1.
1746         (loc_list_from_tree) <case VAR_DECL>: Pass want_address rather than
1747         want_address == 2 to dw_loc_list.  For successful dw_loc_list
1748         set have_address to 1 only if want_address is not 0.
1750 2009-10-05  Richard Sandiford  <rdsandiford@googlemail.com>
1752         * config/mips/mips-protos.h (mips_trampoline_code_size): Declare.
1753         * config/mips/mips.h (TRAMPOLINE_SIZE): Redefine as the size of
1754         a code block followed by two pointers.
1755         (TRAMPOLINE_ALIGNMENT): Define to 64 for 32-bit targets too.
1756         * config/mips/mips.c (MIPS_LOAD_PTR): New macro.
1757         (MIPS_MOVE): Likewise.
1758         (MIPS_LUI): Likewise.
1759         (MIPS_JR): Likewise.
1760         (MIPS_BAL): Likewise.
1761         (MIPS_NOP): Likewise.
1762         (mips_asm_trampoline_template): Delete.
1763         (mips_trampoline_code_size): New function.
1764         (mips_trampoline_init): Add shorter sequences for all cases
1765         except Pmode == DImoe && !TARGET_USE_PIC_FN_ADDR_REG.
1766         Calculate the opcodes directly, rather than copying from a template.
1767         Only flush the code part of the trampoline.
1768         (TARGET_ASM_TRAMPOLINE_TEMPLATE): Delete.
1770 2009-10-05  Richard Sandiford  <rdsandiford@googlemail.com>
1772         * config/mips/mips.h (DWARF_FRAME_RETURN_COLUMN): Replace
1773         GP_REG_FIRST + 31 with RETURN_ADDR_REGNUM.
1774         (INCOMING_RETURN_ADDR_RTX): Likewise.
1775         (FUNCTION_PROFILER): Likewise.  Replace GP_REG_FIRST + 1
1776         with AT_REGNUM.
1777         * config/mips/sdemtk.h (FUNCTION_PROFILER): Replace GP_REG_FIRST + 31
1778         with RETURN_ADDR_REGNUM.
1779         (MIPS_SAVE_REG_FOR_PROFILING_P): Likewise.
1780         * config/mips/mips.c (mips16_build_call_stub): Replace
1781         GP_REG_FIRST + 31 with RETURN_ADDR_REGNUM, GP_REG_FIRST + 1
1782         with AT_REGNUM and 31 with RETURN_ADDR_REGNUM.
1783         (mips_print_operand_punctuation): Likewise.
1784         (mips_frame_set): Likewise.
1785         (mips16e_output_save_restore): Likewise.
1786         (mips_cfun_might_clobber_call_saved_reg_p): Likewise.
1787         (mips_save_reg_p): Likewise.
1788         (mips_return_addr): Likewise.
1789         (mips_set_return_address): Likewise.
1790         (mips_direct_save_slot_move_p): Likewise.
1791         (mips_output_function_prologue): Likewise.
1792         (mips_restore_reg): Likewise.
1793         (mips_expand_epilogue): Likewise.
1794         (mips_epilogue_uses): Likewise.
1795         * config/mips/mips.md (RETURN_ADD_REGNUM): Define.
1796         (*mov<mode>_ra): Use it instead of a hard-coded 31.
1797         (clear_hazard_<mode>): Likewise.
1798         (call_internal): Likewise.
1799         (call_internal_direct): Likewise.
1800         (call_direct_split): Likewise.
1801         (call_value_internal): Likewise.
1802         (call_value_split): Likewise.
1803         (call_value_internal_direct): Likewise.
1804         (call_value_direct_split): Likewise.
1805         (call_value_multiple_internal): Likewise.
1806         (call_value_multiple_split): Likewise.
1808 2009-10-05  Eric Botcazou  <ebotcazou@adacore.com>
1809             Jakub Jelinek  <jakub@redhat.com>
1811         PR rtl-optimization/41511
1812         * combine.c (record_value_for_reg): Pass explicit values as argument
1813         to get_last_value_validate.
1814         (get_last_value_validate): Document INSN parameter.
1815         For non-readonly MEMs, assume they might have been modified if INSN
1816         was in another basic block.
1817         (get_last_value): Minor reformatting.
1819 2009-10-05  Andrew Pinski  <andrew_pinski@playstation.sony.com>
1821         PR tree-opt/40992
1822         * final.c (asm_str_count): Split out from asm_insn_count.
1823         * rtl.h (asm_str_count): New prototype.
1824         * tree-inline (estimate_num_insns) <case GIMPLE_ASM>: Call
1825         asm_str_count.
1827 2009-10-05  Sriraman Tallam  <tmsriram@google.com>
1829         * doc/plugins.texi: Change plugin_pass to register_pass_info.
1831 2009-10-05  Basile Starynkevitch  <basile@starynkevitch.net>
1832             Rafael Espindola  <espindola@google.com>
1834         * gengtype.c (write_types): Moved call to write_func_for_structure
1835         into seperate loops.
1837 2009-10-05  Richard Guenther  <rguenther@suse.de>
1839         PR lto/41281
1840         * lto-cgraph.c (output_cgraph): Output toplevel asms.
1841         (input_cgraph_1): Input toplevel asms.
1843 2009-10-05  Richard Guenther  <rguenther@suse.de>
1845         PR lto/40902
1846         * lto-symtab.c (lto_compatible_attributes_p): Remove.
1847         (external_aggregate_decl_p): Likewise.
1848         (lto_symtab_compatible): Re-structure.  Remove dead code.
1849         For variables ignore toplevel qualifiers when comparing types.
1850         Issue warnings, not errors for mismatched user-alignment.
1852 2009-10-05  Richard Guenther  <rguenther@suse.de>
1854         PR lto/41552
1855         PR lto/41487
1856         * lto-symtab.c (struct lto_symtab_base_def): Remove.
1857         (struct lto_symtab_identifier_def): Likewise.
1858         (struct lto_symtab_decl_def): Likewise.
1859         (struct lto_symtab_entry_def): New.
1860         (lto_symtab_identifier_t): Rename to ...
1861         (lto_symtab_entry_t): ... this.
1862         (lto_symtab_decls): Remove.
1863         (lto_symtab_base_hash): Rename to ...
1864         (lto_symtab_entry_hash): ... this.
1865         (lto_symtab_base_eq): Rename to ...
1866         (lto_symtab_entry_eq): ... this.
1867         (lto_symtab_base_marked_p): Rename to ...
1868         (lto_symtab_entry_marked_p): ... this.
1869         (lto_symtab_identifier_marked_p): Remove.
1870         (lto_symtab_decl_marked_p): Likewise.
1871         (lto_symtab_maybe_init_hash_tables): Rename to ...
1872         (lto_symtab_maybe_init_hash_table): ... this.
1873         (lto_symtab_set_resolution_and_file_data): Remove.
1874         (lto_symtab_register_decl): New function.
1875         (lto_symtab_get_identifier): Remove.
1876         (lto_symtab_get): New function.
1877         (lto_symtab_get_resolution): Adjust.
1878         (lto_symtab_get_identifier_decl): Remove.
1879         (lto_symtab_set_identifier_decl): Likewise.
1880         (lto_symtab_merge_decl): Rename to ...
1881         (lto_symtab_merge): ... this.  Rewrite.
1882         (lto_symtab_merge_var): Remove.
1883         (lto_symtab_merge_fn): Likewise.
1884         (lto_symtab_prevailing_decl): Adjust.
1885         (lto_cgraph_replace_node): New function.
1886         (lto_symtab_merge_decls_2): Likewise.
1887         (lto_symtab_merge_decls_1): Likewise.
1888         (lto_symtab_fixup_var_decls): Likewise.
1889         (lto_symtab_resolve_symbols): Likewise.
1890         (lto_symtab_merge_decls): Likewise.
1891         (lto_symtab_prevailing_decl): Adjust.
1892         (lto_symtab_get_symtab_def): Remove.
1893         (lto_symtab_get_file_data): Likewise.
1894         (lto_symtab_clear_resolution): Adjust.
1895         (lto_symtab_clear_resolution): Likewise.
1896         * lto-cgraph.c (input_edge): Do not merge cgraph nodes here.
1897         (input_cgraph_1): Likewise.
1898         * lto-streamer-in.c (get_resolution): Do not provide fake
1899         symbol resolutions here.
1900         (deferred_global_decls): Remove.
1901         (lto_register_deferred_decls_in_symtab): Likewise.
1902         (lto_register_var_decl_in_symtab): Change signature, register
1903         variable via lto_symtab_register_decl.
1904         (lto_register_function_decl_in_symtab): Likewise.
1905         (lto_read_tree): Adjust.
1906         * lto-streamer.h (lto_register_deferred_decls_in_symtab): Remove.
1907         (lto_symtab_merge_var): Likewise.
1908         (lto_symtab_merge_fn): Likewise.
1909         (lto_symtab_register_decl): Declare.
1910         (lto_symtab_merge_decls): Likewise.
1912 2009-10-05  Richard Guenther  <rguenther@suse.de>
1914         PR tree-optimization/23821
1915         * tree-vrp.c (vrp_finalize): Do not perform copy propagation.
1916         * tree-ssa-dom.c (cprop_operand): Do not propagate copies into
1917         simple IV increments.
1919 2009-10-05  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
1921         * config/arm/arm.c (arm_override_options): Really initialize
1922         flag_dwarf2_cfi_asm to 0.
1924 2009-10-05  Doug Kwan  <dougkwan@google.com>
1926         PR rtl-optimization/41574
1927         * combine.c (distribute_and_simplify_rtx): Quit if RTX mode is
1928         floating point and we are not doing unsafe math optimizations.
1930 2009-10-03  Simon Baldwin  <simonb@google.com>
1931             Cary Coutant  <ccoutant@google.com>
1932             Rafael Espindola  <espindola@google.com>
1933             Richard Guenther  <rguenther@suse.de>
1934             Jan Hubicka  <jh@suse.cz>
1935             Doug Kwan <dougkwan@google.com>
1936             H.J. Lu  <hongjiu.lu@intel.com>
1937             Bill Maddox  <maddox@google.com>
1938             Ryan Mansfield  <rmansfield@qnx.com>
1939             Diego Novillo  <dnovillo@google.com>
1940             Ollie Wild  <aaw@google.com>
1941             Kenneth Zadeck <zadeck@naturalbridge.com>
1943         * lto-cgraph.c: New file.
1944         * lto-compress.c: New file.
1945         * lto-compress.h: New file.
1946         * lto-opts.c: New file.
1947         * lto-section-in.c: New file.
1948         * lto-section-out.c: New file.
1949         * lto-streamer-in.c: New file.
1950         * lto-streamer-out.c: New file.
1951         * lto-streamer.c: New file.
1952         * lto-streamer.h: New file.
1953         * lto-symtab.c: New file.
1954         * lto-wpa-fixup.c: New file.
1955         * lto-wrapper.c: New file.
1957 2009-10-03  Simon Baldwin  <baldwin@google.com>
1958             Ben Elliston  <bje@au.ibm.com>
1959             Rafael Espindola  <espindola@google.com>
1960             Nathan Froyd  <froydnj@codesourcery.com>
1961             Jan Hubicka  <jh@suse.cz>
1962             Doug Kwan  <dougkwan@google.com>
1963             Diego Novillo  <dnovillo@google.com>
1964             Kenneth Zadeck  <zadeck@naturalbridge.com>
1966         * Makefile.in (enable_lto): New.
1967         (site.exp): If @enable_lto@ is set to 'yes' define ENABLE_LTO.
1968         (LINKER_PLUGIN_API_H): Define.
1969         (LTO_SYMTAB_H): Define.
1970         (LTO_STREAMER_H): Define.
1971         (TREE_VECTORIZER_H): Define.
1972         (INCLUDES): Add LIBELFINC.
1973         (OBJS-common): Add lto-cgraph.o, lto-streamer-in.o,
1974         lto-streamer-out.o, lto-section-in.o, lto-section-out.o, lto-symtab.o,
1975         lto-opts.o, lto-streamer.o, lto-wpa-fixup.o, lto-compress.o.
1976         (MOSTLYCLEANFILES): Add lto-wrapper$(exeext)
1977         (native): Add lto-wrapper$(exeext)
1978         (lto-compress.o, lto-cgraph.o, lto-streamer-in.o,
1979         lto-streamer-out.o, lto-section-in.o, lto-section-out.o,
1980         lto-symtab.o, lto-opts.o, lto-streamer.o, lto-wpa-fixup.o): New rules.
1981         (gimple.o): Add dependency on LTO_HEADER_H and LTO_SECTION_OUT_H.
1982         (varasm.o): Add dependency on tree-iterator.h.
1983         (cgraph.o): Add dependency on cif-code.def.
1984         (ipa-reference.o): Add dependency on LTO_STREAMER_H.
1985         (ipa-pure-const.o): Likewise.
1986         (GTFILES): Add lto-symtab.c.
1987         (install-lto-wrapper): New.
1988         * configure.ac: If 'lto' is in enable_languages, define ENABLE_LTO
1989         and enable_lto.  If LIBELFLIBS is set, define HAVE_libelf.
1990         * config.in: Regenerate.
1992 2009-10-03  Rafael Espindola  <espindola@google.com>
1993             Diego Novillo  <dnovillo@google.com>
1995         * cgraphunit.c (ipa_passes): Prevent lto1 from calling
1996         ipa_write_summaries.
1997         Call execute_ipa_summary_passes for all_regular_ipa_passes and
1998         all_lto_gen_passes.
1999         (cgraph_optimize): Make extern.
2001 2009-10-03  Nathan Froyd  <froydnj@codesourcery.com>
2002             Kenneth Zadeck <zadeck@naturalbridge.com>
2004         * toplev.c (in_lto_p): Declare.
2005         * collect2.c (scan_prog_file): Read all the output when reading
2006         information for LTO.
2007         (enum lto_mode_d): Declare.
2009 2009-10-03  Richard Guenther  <rguenther@suse.de>
2010             Diego Novillo  <dnovillo@google.com>
2012         * gimple.c: Include target.h and alias.h.
2013         (gimple_types): Declare.
2014         (type_hash_cache): Declare.
2015         (gimple_alloc_stat): Make extern.
2016         (gimple_build_eh_must_not_throw): Call
2017         gimple_eh_must_not_throw_set_fndecl.
2018         (struct type_pair_d): Declare.
2019         (type_pair_t): Declare.
2020         (type_pair_hash): New.
2021         (type_pair_eq): New.
2022         (lookup_type_pair): New.
2023         (gimple_force_type_merge): New.
2024         (compare_type_names_p): New.
2025         (compare_field_offset): New.
2026         (gimple_types_compatible_p): New.
2027         (struct sccs): Declare.
2028         (next_dfs_num): Declare.
2029         (iterative_hash_gimple_type): New.
2030         (visit): New.
2031         (iterative_hash_type_name): New.
2032         (iterative_hash_gimple_type): New.
2033         (gimple_type_hash): New.
2034         (gimple_type_eq): New.
2035         (gimple_register_type): New.
2036         (print_gimple_types_stats): New.
2037         (gimple_signed_or_unsigned_type): New.
2038         (gimple_unsigned_type): New.
2039         (gimple_signed_type): New.
2040         (gimple_get_alias_set): New.
2041         (gimple_decl_printable_name): Do not use DMGL_TYPES.
2042         * gimple.h (gimple_alloc, gimple_alloc_stat): Declare.
2043         (gimple_force_type_merge): Declare.
2044         (gimple_types_compatible_p): Declare.
2045         (gimple_register_type): Declare.
2046         (print_gimple_types_stats): Declare.
2047         (gimple_unsigned_type): Declare.
2048         (gimple_signed_type): Declare.
2049         (gimple_get_alias_set): Declare.
2050         (gimple_eh_must_not_throw_set_fndecl): New.
2052 2009-10-03  Jan Hubicka  <jh@suse.cz>
2053             Kenneth Zadeck <zadeck@naturalbridge.com>
2055         * ipa-pure-const.c: Include lto-streamer.h.
2056         (register_hooks): Factor out of ...
2057         (generate_summary): ... here.
2058         (pure_const_write_summary): New.
2059         (pure_const_read_summary): New.
2060         (pass_ipa_pure_const): Add pure_const_write_summary and
2061         pure_const_read_summary.
2062         * ipa-reference.c: Include lto-streamer.h.
2063         (add_new_function): New.
2064         (remove_node_data): New.
2065         (duplicate_node_data): New.
2066         (ipa_init): Guard against multiple calls.
2067         Move hook setup from analyze_function.
2068         (write_node_summary_p): New.
2069         (ipa_reference_write_summary): New.
2070         (ipa_reference_read_summary): New.
2071         (pass_ipa_reference): Add ipa_reference_write_summary and
2072         ipa_reference_read_summary.
2073         * cgraph.h (cgraph_local_info): Add field lto_file_data.
2074         (struct cgraph_edge): Add fields lto_stmt_uid and
2075         call_stmt_cannot_inline_p.
2076         (cgraph_optimize): Declare.
2077         (cgraph_decide_is_function_needed): Declare.
2078         (reset_inline_failed): Declare.
2079         (enum LTO_cgraph_tags): Declare.
2080         (LTO_cgraph_tag_names): Declare.
2081         (LCC_NOT_FOUND): Define.
2083 2009-10-03  Doug Kwan  <dougkwan@google.com>
2084             Rafael Espindola  <espindola@google.com>
2085             Jan Hubicka  <jh@suse.cz>
2086             Diego Novillo  <dnovillo@google.com>
2087             Kenneth Zadeck  <zadeck@naturalbridge.com>
2089         * passes.c (all_regular_ipa_passes): New.
2090         (all_ipa_passes): Rename to all_small_ipa_passes.
2091         (init_optimization_passes): Init all_regular_ipa_passes.
2092         * tree-pass.h (all_regular_ipa_passes): New.
2093         (all_ipa_passes): Rename to all_small_ipa_passes.
2094         * passes.c (all_lto_gen_passes): New.
2095         (init_optimization_passes): Initialize all_lto_gen_passes.
2096         (execute_ipa_summary_passes): Make non-static.
2097         (ipa_write_summaries_1): New.
2098         (ipa_write_summaries_2): New.
2099         (ipa_write_summaries): New.
2100         (ipa_write_summaries_of_cgraph_node_set): New.
2101         (ipa_read_summaries_1): New.
2102         (ipa_read_summaries): New.
2103         (execute_ipa_pass_list): Call cgraph_process_new_functions.
2104         (execute_regular_ipa_pass_list): Remove.
2105         (init_optimization_passes): Schedule
2106         pass_rebuild_cgraph_edges and pass_early_inline outside
2107         of pass_all_early_optimizations.  Document reason.
2108         (pass_ipa_lto_gimple_out, pass_ipa_lto_wpa_fixup,
2109         pass_ipa_lto_finish_out): New pass.
2110         (pass_ipa_summary_passes): Start and stop timers if the pass has them.
2111         (execute_all_ipa_transforms): New.
2112         (execute_one_pass): Don't call execute_one_ipa_transform_pass.
2113         (dump_properties, debug_properties): New.
2114         * tree-optimize.c (gate_all_early_local_passes): Return
2115         false if we are in lto1.
2116         (tree_rest_of_compilation): Call execute_all_ipa_transforms.
2117         * tree-pass.h (execute_all_ipa_transforms): Declare.
2118         (pass_ipa_function_and_variable_visibility): Declare.
2119         (pass_ipa_early_inline): Declare.
2120         (pass_ipa_lto_gimple_out): Declare.
2121         (pass_ipa_lto_wpa_fixup): Declare.
2122         (pass_ipa_lto_finish_out): Declare.
2123         (all_small_ipa_passes, all_regular_ipa_passes,
2124         all_lto_gen_passes): Declare.
2125         (execute_ipa_summary_passes): Declare.
2126         (execute_all_ipa_transforms): Declare.
2127         (ipa_write_summaries): Declare
2128         (ipa_write_summaries_of_cgraph_node_set): Declare.
2129         (ipa_read_summaries): Declare.
2131 2009-10-03  Doug Kwan  <dougkwan@google.com>
2132             Ollie Wild  <aaw@google.com>
2134         * ipa-prop.c (ipa_propagate_indirect_call_infos): Do nothing in WPA.
2136         * collect2.c (LTO_MODE_NONE, LTO_MODE_LTO, LTO_MODE_WPA): New enums.
2137         (lto_mode): New variable.
2138         (maybe_run_lto_and_relink): Handle the -fwpa option.
2139         (main): Handle the -fwpa option.
2140         (maybe_unlink_list): New function.
2141         * gcc.c (link_lto_options): Replace -flto with -fwpa.
2142         * common.opt (flto): New flag.
2143         * toplev.c (flag_generate_lto): Declare.
2145 2009-10-03  Simon Baldwin  <simonb@google.com>
2147         * common.opt (flto-compression-level): New flag.
2149         * opts.c: Include lto-opts.h.
2150         (handle_option): Call lto_register_user_option for each
2151         valid option handled.
2152         (decode_options): Clear registered options before the options
2153         handling loop.
2155 2009-10-03  Cary Coutant  <ccoutant@google.com>
2157         * collect2.c (is_elf): New function.
2158         (scan_prog_file): Require LTO object to be in ELF format.
2160 2009-10-03  Rafael Espindola  <espindola@google.com>
2162         * gcc.c (LINK_COMMAND_SPEC): Use the -pass-through option to pass
2163         libgcc to the linker.
2165         * ipa-cp.c (cgraph_gate_cp): Return false if LTRANS is running.
2167         * collect2.c (maybe_run_lto_and_relink): Execute lto-wrapper.
2168         (collect_execute): Add flags argument. Pass flags to pex_run. Update
2169         all callers.
2170         * collect2.h (collect_execute): Add flags argument.
2171         * tlink.c (tlink_execute): Update call to collect_execute.
2172         * gcc.c (main): Set the COLLECT_LTO_WRAPPER environment variable.
2173         (use_linker_plugin): New.
2174         (use_linker_plugin_spec_function): New.
2175         (LINK_COMMAND_SPEC): Pass plugin options to the linker.
2176         (linker_plugin_file_spec): New.
2177         (lto_wrapper_spec): New.
2178         (lto_gcc_spec): New.
2179         (static_specs): Add linker_plugin_file, lto_wrapper and lto_gcc.
2180         (static_spec_functions): Add use-linker-plugin.
2181         (process_command): Handle -use-linker-plugin.
2182         (main): Use lto_wrapper_spec instead of lto_wrapper. Set
2183         linker_plugin_file_spec and lto_gcc_spec.
2184         (use_linker_plugin_spec_function): New.
2186 2009-10-03  Richard Guenther  <rguenther@suse.de>
2188         PR lto/41547
2189         PR lto/41548
2190         * tree.h (is_lang_specific): Include LANG_TYPE.
2191         * tree.c (find_decls_types_r): Manually add interesting parts
2192         of TYPE_FIELDS.  Walk BINFO_VIRTUALS.  Do not walk TYPE_METHODS.
2194         * gimple.c (type_pair_hash): Make symmetric.
2195         (type_pair_eq): Likewise.
2196         (lookup_type_pair): Increase initial hashtable size.
2197         (gimple_force_type_merge): Rely on type-pair symmetry.
2198         (visit): Remove excessive checking code.
2199         (iterative_hash_type_name): Do not hash TYPE_NAME of anonymous unions.
2200         (gimple_register_type): Remove getenv calls, shrink initial
2201         hashtable size.
2203         PR middle-end/41502
2204         * cgraphunit.c (ipa_passes): Do not remove bodies of extern
2205         inline functions if not generating lto output.
2207         PR lto/41379
2208         * toplev.c (finalize): In WPA mode remove the asm file.
2210 2009-10-03  Doug Kwan  <dougkwan@google.com>
2212         * ipa-inline.c (cgraph_mark_inline): Check
2213         edge->call_stmt_cannot_inline_p instead of calling
2214         gimple_call_cannot_inline_p.
2215         (cgraph_decide_inlining): Do nothing in WPA and LTRANS.
2216         (cgraph_gate_ipa_early_inlining): Return false if in_lto_p is set.
2217         (inline_generate_summary): Do nothing in LTRANS.
2218         * cgraph.c (initialize_inline_failed): Make sure e->call_stmt
2219         exists before calling gimple_call_cannot_inline_p.
2220         (cgraph_create_edge): Set edge->call_stmt_cannot_inline_p.
2221         (cgraph_clone_edge): Add argument STMT_UID.  Modify all callers.
2222         Update new_edge->lto_stmt_uid.
2223         * cgraphbuild.c (reset_inline_failed): New.
2225         * common.opt (fwpa): New flag.
2226         (fltrans): New option.
2227         * gcc.c (gcc_lto_option_t): New type.
2228         (current_lto_option): New variable.
2229         (lto_single_spec_function): Remove and is replaced by ..
2230         (lto_option_spec_function): New function.
2231         (LINK_COMMAND_SPEC): Use link_lto_option spec instead of just
2232         passing the -flto flag.
2233         (cc1_options): Separate non-LTO related parts into ..
2234         (cc1_non_lto_options): Non-LTO related options shared by all FEs.
2235         (lto1_options): New spec for lto FE.
2236         (link_lto_options): New spec for handling LTO flags in linker.
2237         (invoke_lto_single): Re-format to fit in 80 column.  Replace
2238         lto-single with lto-option.
2239         (static_specs): Add cc1_non_lto_options, lto1_options and
2240         link_lto_options.
2241         (static_spec_function): Replace lto-single with lto-option.
2242         (process_command): Handle -flto, -fwpa and -fltran by setting
2243         current_lto_option and not passing it to subprocess unconditionally.
2245 2009-10-03  Bill Maddox  <maddox@google.com>
2247         Add `gcc' driver support for link-time code generation (LTO).
2249         * collect2.c (enum pass): Add new literal PASS_LTOINFO.
2250         (lto_flag, lto_objects, lto_o_file): New variables.
2251         (struct lto_object, struct lto_object_list): New structures.
2252         (collect_exit, handler): Remove LTO temporary output file on exit.
2253         (add_lto_object): New function.
2254         (maybe_run_lto_and_relink): New function. Perform link time code
2255         generation and relinking for object files containing LTO information.
2256         (main): Invoke maybe_run_lto_and_relink().
2257         (dump_argv): New function.  For debugging, currently disabled.
2258         (scan_prog_file): Add LTO information pass.
2259         * gcc.c (LINK_COMMAND_SPEC): Pass `-flto' switch to linker, i.e.,
2260         collect2.
2261         * toplev.c (compile_file): Emit assembler directive to create
2262         the `gnu_lto_v1' marker symbol when compiling with `-flto'.
2264 2009-10-03  Diego Novillo  <dnovillo@google.com>
2266         * c.opt: Add LTO to warn_abi and warn_psabi.
2268         * tree.c (fld_worklist_push): Rename from PUSH.  Convert to static
2269         inline function.  Ignore language-specific nodes.  Update all users.
2270         (find_decls_types_r): Do not traverse the subtrees of
2271         language-specific nodes.  Do not traverse DECL_INITIAL for TYPE_DECLs.
2272         * tree.h (is_lang_specific): New.
2273         * langhooks.h (struct lang_hooks_for_decls): Remove
2274         may_need_assembler_name_p.  Update all users.
2276         * c-common.c (set_builtin_user_assembler_name): Move ...
2277         * builtins.c (set_builtin_user_assembler_name): ... here.
2278         (is_builtin_name): Add comment
2279         (is_builtin_fn): New.
2280         * except.c (output_ttype): Only call
2281         lookup_type_for_runtime if TYPE is not a runtime type.
2283         * passes.c (register_pass): Call position_pass on
2284         all_small_ipa_passes, all_regular_ipa_passes and all_lto_gen_passes.
2285         * timevar.def (TV_IPA_LTO_GIMPLE_IO): Define.
2286         (TV_IPA_LTO_DECL_IO): Define.
2287         (TV_IPA_LTO_CGRAPH_IO): Define.
2288         (TV_LTO): Define.
2289         (TV_WHOPR_WPA): Define.
2290         (TV_WHOPR_WPA_IO): Define.
2291         (TV_WHOPR_LTRANS): Define.
2292         (TV_WHOPR_WPA_FIXUP): Define.
2293         (TV_WHOPR_WPA_LTRANS_EXEC): Define.
2294         * tree-cfg.c (tree_node_can_be_shared): Make extern.
2295         * tree-flow.h (tree_node_can_be_shared): Declare.
2296         * tree-inline.c (tree_can_inline_p): Check that E has a
2297         statement associated with it.
2298         * tree.c (free_lang_data_in_binf): Factor out of ...
2299         (free_lang_data_in_type): ... here.
2300         Call RECORD_OR_UNION_TYPE_P.
2301         (need_assembler_name_p): Ignore DECL if it does not have TREE_PUBLIC
2302         set.  Call lang_hooks.decls.may_need_assembler_name_p if set.
2303         (free_lang_data_in_decl): Do not clear DECL_CONTEXT for CONST_DECLs.
2304         (free_lang_data): Set debug_info_level to DINFO_LEVEL_NONE.  Set
2305         write_symbols to NO_DEBUG.  Set debug_hooks to do_nothing_debug_hooks.
2306         (gate_free_lang_data): Return true if flag_generate_lto is set.
2307         (walk_tree_1): Call RECORD_OR_UNION_TYPE_P.
2308         * c-common.h (set_builtin_user_assembler_name): Move ...
2309         * tree.h (set_builtin_user_assembler_name): ... here.
2311         * common.opt (flto-report): New flag.
2312         * opts.c (complain_wrong_lang): Do not complain if running lto1.
2313         * collect2.c (scan_prog_file): Send the error output of
2314         'nm' to HOST_BIT_BUCKET.
2316 2009-10-03  Ollie Wild  <aaw@google.com>
2318         * langhooks-def.h (lhd_begin_section): New function declaration.
2319         (lhd_write_section): New function declaration.
2320         (lhd_end_section): New function declaration.
2321         (LANG_HOOKS_BEGIN_SECTION): New macro.
2322         (LANG_HOOKS_WRITE_SECTION_DATA): New macro.
2323         (LANG_HOOKS_END_SECTION): New macro.
2324         (LANG_HOOKS_LTO): New macro.
2325         (LANG_HOOKS_INITIALIZER): Add LANG_HOOKS_LTO.
2326         * langhooks.c (output.h): Add include.
2327         (saved_section): New static variable.
2328         (lhd_begin_section): New function.
2329         (lhd_write_section_data): New function.
2330         (lhd_end_section): New function.
2331         * langhooks.h (struct lang_hooks_for_lto): New structure.
2332         (struct lang_hooks): Add member lto.
2333         * Makefile.in (langhooks.o): Add dependency on output.h.
2335         * c-opts.c (c_common_post_options): Handle -flto and -fwhopr.
2337 2009-10-03  Richard Guenther  <rguenther@suse.de>
2339         * config/rs6000/rs6000.c (rs6000_output_function_epilogue):
2340         Handle LTO.
2342 2009-10-03  Simon Baldwin  <simonb@google.com>
2343             Richard Guenther  <rguenther@suse.de>
2344             Janis Johnson  <janis187@us.ibm.com>
2345             Doug Kwan  <dougkwan@google.com>
2346             Diego Novillo  <dnovillo@google.com>
2347             Ramana Radhakrishnan  <ramana.r@gmail.com>
2348             Ollie Wild  <aaw@google.com>
2350         * doc/install.texi: Add documentation for libelf and --enable-lto.
2351         * doc/invoke.texi: Document -fwpa, -flto, -fwhopr, -fltrans,
2352         -flto-report, -flto-compression-level and -use-linker-plugin.
2353         * doc/sourcebuild.texi: Document use of zlib.  Document lto-plugin.
2354         Add section for LTO Testing.
2356 2009-10-02  Cary Coutant  <ccoutant@google.com>
2358         Add support for comdat type sections for DWARF v4.
2359         Merge from dwarf4 branch.
2361         * dwarf2out.c (DWARF_TYPE_SIGNATURE_SIZE): New constant.
2362         (dw_die_ref): Define vector type.
2363         (enum dw_val_class): Add dw_val_class_data8.
2364         (struct dw_val_struct): Add v.val_data8.
2365         (comdat_type_node_ref): New type.
2366         (struct die_struct): Move die_symbol into a union; add new field
2367         die_type_node.  Change all uses.
2368         (comdat_type_node): New type.
2369         (skeleton_chain_node): New type.
2370         (DWARF_COMDAT_TYPE_UNIT_HEADER_SIZE): New constant.
2371         (comdat_type_list): New variable.
2372         (dwarf_tag_name): Add DW_TAG_type_unit.
2373         (dwarf_attr_name): Add DW_AT_signature.
2374         (add_AT_data8): New function.
2375         (replace_child): New function.
2376         (move_all_children): New function.
2377         (print_signature): New function.
2378         (print_die): Print signature information; add dw_val_class_data8.
2379         (attr_checksum): Support dw_val_class_data8.
2380         (CHECKSUM_STRING): Redefine for DWARF-4 to include trailing NULL byte.
2381         (CHECKSUM_SLEB128, CHECKSUM_ULEB128): New macros.
2382         (checksum_sleb128, checksum_uleb128): New functions.
2383         (checksum_die_context): New function.
2384         (loc_checksum_ordered): New function.
2385         (attr_checksum_ordered): New function.
2386         (struct checksum_attributes): New structure.
2387         (collect_checksum_attributes): New function.
2388         (die_checksum_ordered): New function.
2389         (generate_type_signature): New function.
2390         (same_dw_val_p): Add dw_val_class_data8.
2391         (is_symbol_die): Use new is_declaration_die function.
2392         (is_declaration_die): New function.
2393         (should_move_die_to_comdat): New function.
2394         (clone_die): New function.
2395         (clone_tree): New function.
2396         (clone_as_declaration): New function.
2397         (copy_declaration_context): New function.
2398         (generate_skeleton_ancestor_tree): New function.
2399         (generate_skeleton_bottom_up): New function.
2400         (generate_skeleton): New function.
2401         (remove_child_or_replace_with_skeleton): New function.
2402         (break_out_comdat_types): New function.
2403         (struct decl_table_entry): New type.
2404         (htab_decl_hash): New function.
2405         (htab_decl_eq): New function.
2406         (htab_decl_del): New function.
2407         (copy_ancestor_tree): New function.
2408         (copy_decls_walk): New function.
2409         (copy_decls_for_unworthy_types): New function.
2410         (build_abbrev_table): Don't assert on missing die_symbol when doing
2411         comdat type sections.
2412         (size_of_die): Use DW_FORM_sig8 for external references.  Add
2413         dw_val_class_data8.
2414         (unmark_dies): Don't assert for unmarked dies when doing comdat
2415         type sections.
2416         (value_format): Support DW_FORM_sig8 and dw_val_class_data8.
2417         (output_signature): New function.
2418         (output_die): Likewise.
2419         (output_compilation_unit_header): Mark output as DWARF version 3
2420         even if generating DWARF 4.
2421         (output_comdat_type_unit): New function.
2422         (output_line_info): Mark output as DWARF version 3 even if generating
2423         DWARF 4.
2424         (dwarf2out_start_source_file): Don't do eliminate_dwarf2_dups with
2425         DWARF-4.
2426         (dwarf2out_end_source_file): Likewise.
2427         (prune_unused_types_walk_attribs): Don't follow references into
2428         comdat type sections.
2429         (prune_unused_types_mark): When generating type units, do not mark
2430         children of non-defining declarations of types; do mark children of
2431         type entries.
2432         (prune_unused_types): Process comdat type sections.
2433         (htab_ct_hash): New function.
2434         (htab_ct_eq): New function.
2435         (dwarf2out_finish): Move types to comdat sections when using DWARF-4.
2436         Add a pointer to the line table from type unit entries so
2437         DW_AT_decl_file has meaning.
2438         * varasm.c (default_elf_asm_named_section): Use identifier name as
2439         comdat key instead of lang hook.
2441 2009-10-02  Neil Vachharajani  <nvachhar@google.com>
2443         * gcov-io.c (gcov_open): Open files read-only when MODE < 0.
2445 2009-10-02  Uros Bizjak  <ubizjak@gmail.com>
2447         * config/i386/i386.md (SWIM248): New mode iterator.
2448         (divmod<mode>4) Macroize expander from divmoddi4, divmodsi4 and
2449         divmodhi4 patterns using SWIM248 macro.
2450         (*divmod<mode>4): Macroize insn_and_split pattern from
2451         *divmoddi4_cltd_rex64, *divmodsi4_cltd and divmodhi4 insn patterns
2452         and their corresponding splitters usign SWIM248 macro.  Split SImode
2453         insn to generate cltd and DImode insn to generate cqto instead of
2454         move+shift when optimizing for size or TARGET_USE_CLTD is in effect.
2455         (*divmoddi4_nocltd_rex64, *divmodsi4_nocltd): Remove insn patterns.
2456         (*divmod<mode>4_noext): Macroize insn from *divmoddi_noext_rex64 and
2457         *divmodsi_noext patterns using SWIM248 macro.
2458         (udivmod<mode>4): Macroize expander from udivmoddi4, udivmodsi4 and
2459         udivmodhi4 patterns using SWIM248 macro.
2460         (*udivmod<mode>4): Macroize insn_and_split pattern from
2461         *udivmoddi4, udivmodsi4 and udivmodhi4 patterns and their
2462         corresponding splitters using SWIM248 macro.
2463         (*udivmod<mode>4_noext): Macroize insn from *udivmoddi4_noext,
2464         *udivmodsi4_noext and *udivmodhi_noext patterns using SWIM248 macro.
2466 2009-10-02  Eric Botcazou  <ebotcazou@adacore.com>
2468         * stor-layout.c (layout_type) <ARRAY_TYPE>: Make sure that an array
2469         of zero-sized element is zero-sized regardless of its extent.
2471 2009-10-02  Jakub Jelinek  <jakub@redhat.com>
2473         PR debug/40521
2474         * configure.ac (HAVE_GAS_CFI_SECTIONS_DIRECTIVE): New test.
2475         * configure: Regenerated.
2476         * config.in: Regenerated.
2477         * dwarf2out.c (dwarf2out_do_cfi_asm): Return false if
2478         !HAVE_GAS_CFI_SECTIONS_DIRECTIVE and not emitting .eh_frame.
2479         (dwarf2out_init): If HAVE_GAS_CFI_SECTIONS_DIRECTIVE and
2480         not emitting .eh_frame, emit .cfi_sections .debug_frame
2481         directive.
2483         PR debug/41404
2484         PR debug/41353
2485         * cfgexpand.c (expand_debug_expr) <case STRING_CST>: Don't create
2486         CONST_STRING if STRING_CST contains embedded '\0's or doesn't end
2487         with '\0'.
2488         (expand_debug_expr) <case VAR_DECL>: For TREE_STATIC !DECL_EXTERNAL
2489         vars use DECL_RTL with resetting it back to NULL afterwards.
2490         * dwarf2out.c (same_dw_val_p): For dw_val_class_addr compare with
2491         rtx_equal_p instead of asserting it is a SYMBOL_REF.
2492         (value_format): For dw_val_class_addr only use DW_FORM_addr if
2493         the attribute type allows it, otherwise use DW_FORM_dataN.
2494         (mem_loc_descriptor): Handle CONST_STRING.
2495         (add_const_value_attribute): Handle CONST_STRING using add_AT_addr.
2496         Handle MEM with CONST_STRING address using add_AT_string.
2497         (rtl_for_decl_init): Return MEM with CONST_STRING address instead of
2498         CONST_STRING for const arrays initialized with a string literal.
2499         (resolve_one_addr, resolve_addr_in_expr, resolve_addr): New functions.
2500         (dwarf2out_finish): Call resolve_addr.
2502 2009-10-02  Andreas Schwab  <schwab@linux-m68k.org>
2503             Maxim Kuvyrkov  <maxim@codesourcery.com>
2505         * config/m68k/lb1sf68.asm (PICCALL): Use variable sized branch.
2507 2009-10-02  Nick Clifton  <nickc@redhat.com>
2509         * config/mn10300/mn10300.h (USER_LABEL_PREFIX): Define.
2510         (ASM_OUTPUT_LABELREF): Use asm_fprintf and %U.
2512 2009-10-01  Jan Hubicka  <jh@suse.cz>
2514         * cgraph.c (cgraph_clone_node): Add redirect_callers parameter.
2515         (cgraph_create_virtual_clone): Just pass redirect_callers
2516         around.
2517         * cgraph.h (cgraph_clone_node): Update prototype.
2518         * ipa-pure-const.c (self_recursive_p): New function.
2519         (propagate): Use it.
2520         * ipa-inline.c (cgraph_clone_inlined_nodes,
2521         cgraph_decide_recursive_inlining): Update.
2523 2009-10-01  David Daney  <ddaney@caviumnetworks.com>
2525         * gcc/config/mips/mips.c (mips_process_sync_loop) Emit syncw
2526         instructions for TARGET_OCTEON.
2528 2009-10-01  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
2530         * config/arm/arm.c (arm_override_options): Turn off
2531         flag_dwarf2_cfi_asm for AAPCS variants.
2533 2009-10-01  Martin Jambor  <mjambor@suse.cz>
2535         PR middle-end/12392
2536         * tree-sra.c (convert_callers): Do not call
2537         compute_inline_parameters on one caller more than once.
2539 2009-10-01  Nick Clifton  <nickc@redhat.com>
2541         * config/vax/netbsd-elf.h (NETBSD_CC1_AND_CC1PLUS_SPEC): Define as
2542         an empty string if not already defined.
2544 2009-10-01  Martin Jambor  <mjambor@suse.cz>
2546         PR bootstrap/41395
2547         * tree-sra.c (is_va_list_type): New function.
2548         (find_var_candidates): Call is_va_list_type.
2549         (find_param_candidates): Check that the type or the type pointed
2550         to are not va_list types.
2552 2009-10-01  Martin Jambor  <mjambor@suse.cz>
2554         PR c++/41503
2555         * cp/pt.c (function_parameter_expanded_from_pack_p): Return false if
2556         DECL_ARTIFICIAL (param_decl) is true.
2558 2009-09-30  Gabriel Dos Reis  <gdr@cs.tamu.edu>
2560         * tree.h (tree_decl_common::lang_flag_8): New.
2561         * c-common.c (c_common_reswords): Include "constexpr" as C++0x
2562         keyword.
2563         * c-common.h (RID_CONSTEXPR): New.
2565 2009-09-30  Uros Bizjak  <ubizjak@gmail.com>
2567         * config/alpha/alpha.c (alpha_gimplify_va_arg_1):
2568         Use ref-all pointers.
2569         (alpha_gimplify_va_arg): Ditto.
2571 2009-09-30  Jakub Jelinek  <jakub@redhat.com>
2573         PR target/41279
2574         * cfgloopanal.c (num_loop_insns): Don't increment ninsns for each bb
2575         before insn counting loop now that BB_END (bb) is counted.  Ensure
2576         the return value isn't zero.
2578 2009-09-30  Nick Clifton  <nickc@redhat.com>
2580         * config.gcc (sh-symbianelf): Replace definition of extra_objs
2581         with separate definitions of c_target_objs and cxx_target_objs.
2582         * config/sh/t-sh: Add rules to build symbian-cxx.o, symbian-c.o
2583         and symbian-base.o.
2584         * config/sh/sh.c (TARGET_CXX_INPUT_EXPORT_CLASS): Use
2585         sh_symbian_import_export_class.
2586         * config/sh/sh-protos.h: Fix names of exported symbian functions.
2587         * config/sh/symbian.c: Delete, moving code into...
2588         * config/sh/symbian-base.c: ... here
2589         * config/sh/symbian-c.c: ... and here
2590         * config/sh/symbian-cxx.c: ... and here.
2592 2009-09-30  Uros Bizjak  <ubizjak@gmail.com>
2594         PR target/22093
2595         * config/alpha/alpha.md (unaligned_storehi_be): Force operand
2596         of plus RTX into register.
2598 2009-09-30  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
2600         * doc/install.texi: Linguistic and markup fixes.
2601         (Configuration) <--disable-cpp>: Remove description.
2602         <--enable-maintainer-mode>: Autotools files are affected, too.
2603         <--with-sysroot>: Improve description.
2604         (Building): Bump required GNU make version.
2606 2009-09-29  Harsha Jagasia  <harsha.jagasia@amd.com>
2608         * config.gcc (i[34567]86-*-*): Include fma4intrin.h.
2609         (x86_64-*-*): Ditto.
2611         * config/i386/fma4intrin.h: New file, provide common x86 compiler
2612         intrinisics for FMA4.
2613         * config/i386/cpuid.h (bit_FMA4): Define FMA4 bit.
2614         * config/i386/x86intrin.h: Fix typo to SSE4A instead of SSE4a.
2615         Add FMA4 check and fma4intrin.h.
2616         * config/i386/i386-c.c(ix86_target_macros_internal): Check
2617         ISA_FLAG for FMA4.
2618         * config/i386/i386.h(TARGET_FMA4): New macro for FMA4.
2619         * config/i386/i386.md (UNSPEC_FMA4_INTRINSIC): Add new UNSPEC
2620         constant for FMA4 support.
2621         (UNSPEC_FMA4_FMADDSUB): Ditto.
2622         (UNSPEC_FMA4_FMSUBADD): Ditto.
2623         * config/i386/i386.opt (-mfma4): New switch for FMA4 support.
2624         * config/i386/i386-protos.h (ix86_fma4_valid_op_p): Add declaration.
2625         (ix86_expand_fma4_multiple_memory): Ditto.
2626         * config/i386/i386.c (OPTION_MASK_ISA_FMA4_SET): New.
2627         (OPTION_MASK_ISA_FMA4_UNSET): New.
2628         (OPTION_MASK_ISA_SSE4A_UNSET): Change definition to depend on FMA4.
2629         (OPTION_MASK_ISA_AVX_UNSET): Change definition to depend on FMA4.
2630         (ix86_handle_option): Handle -mfma4.
2631         (isa_opts): Handle -mfma4.
2632         (enum pta_flags): Add PTA_FMA4.
2633         (override_options): Add FMA4 support.
2634         (IX86_BUILTIN_VFMADDSS): New for FMA4 intrinsic.
2635         (IX86_BUILTIN_VFMADDSD): Ditto.
2636         (IX86_BUILTIN_VFMADDPS): Ditto.
2637         (IX86_BUILTIN_VFMADDPD): Ditto.
2638         (IX86_BUILTIN_VFMSUBSS): Ditto.
2639         (IX86_BUILTIN_VFMSUBSD): Ditto.
2640         (IX86_BUILTIN_VFMSUBPS): Ditto.
2641         (IX86_BUILTIN_VFMSUBPD): Ditto.
2642         (IX86_BUILTIN_VFMADDSUBPS): Ditto.
2643         (IX86_BUILTIN_VFMADDSUBPD): Ditto.
2644         (IX86_BUILTIN_VFMSUBADDPS): Ditto.
2645         (IX86_BUILTIN_VFMSUBADDPD): Ditto.
2646         (IX86_BUILTIN_VFNMADDSS): Ditto.
2647         (IX86_BUILTIN_VFNMADDSD): Ditto.
2648         (IX86_BUILTIN_VFNMADDPS): Ditto.
2649         (IX86_BUILTIN_VFNMADDPD): Ditto.
2650         (IX86_BUILTIN_VFNMSUBSS): Ditto.
2651         (IX86_BUILTIN_VFNMSUBSD): Ditto.
2652         (IX86_BUILTIN_VFNMSUBPS): Ditto.
2653         (IX86_BUILTIN_VFNMSUBPD): Ditto.
2654         (IX86_BUILTIN_VFMADDPS256): Ditto.
2655         (IX86_BUILTIN_VFMADDPD256): Ditto.
2656         (IX86_BUILTIN_VFMSUBPS256): Ditto.
2657         (IX86_BUILTIN_VFMSUBPD256): Ditto.
2658         (IX86_BUILTIN_VFMADDSUBPS256): Ditto.
2659         (IX86_BUILTIN_VFMADDSUBPD256): Ditto.
2660         (IX86_BUILTIN_VFMSUBADDPS256): Ditto.
2661         (IX86_BUILTIN_VFMSUBADDPD256): Ditto.
2662         (IX86_BUILTIN_VFNMADDPS256): Ditto.
2663         (IX86_BUILTIN_VFNMADDPD256): Ditto.
2664         (IX86_BUILTIN_VFNMSUBPS256): Ditto.
2665         (IX86_BUILTIN_VFNMSUBPD256): Ditto.
2666         (enum multi_arg_type): New enum for describing the various FMA4
2667         intrinsic argument types.
2668         (bdesc_multi_arg): New table for FMA4 intrinsics.
2669         (ix86_init_mmx_sse_builtins): Add FMA4 intrinsic support.
2670         (ix86_expand_multi_arg_builtin): New function for creating FMA4
2671         intrinsics.
2672         (ix86_expand_builtin): Add FMA4 intrinsic support.
2673         (ix86_fma4_valid_op_p): New function to validate FMA4 3 and 4
2674         operand instructions.
2675         (ix86_expand_fma4_multiple_memory): New function to split the
2676         second memory reference from FMA4 instructions.
2677         * config/i386/sse.md (ssemodesuffixf4): New mode attribute for FMA4.
2678         (ssemodesuffixf2s): Ditto.
2679         (fma4_fmadd<mode>4): Add FMA4 floating point multiply/add
2680         instructions.
2681         (fma4_fmsub<mode>4): Ditto.
2682         (fma4_fnmadd<mode>4): Ditto.
2683         (fma4_fnmsub<mode>4): Ditto.
2684         (fma4_vmfmadd<mode>4): Ditto.
2685         (fma4_vmfmsub<mode>4): Ditto.
2686         (fma4_vmfnmadd<mode>4): Ditto.
2687         (fma4_vmfnmsub<mode>4): Ditto.
2688         (fma4_fmadd<mode>4256): Ditto.
2689         (fma4_fmsub<mode>4256): Ditto.
2690         (fma4_fnmadd<mode>4256): Ditto.
2691         (fma4_fnmsub<mode>4256): Ditto.
2692         (fma4_fmaddsubv8sf4): Ditto.
2693         (fma4_fmaddsubv4sf4): Ditto.
2694         (fma4_fmaddsubv4df4): Ditto.
2695         (fma4_fmaddsubv2df4): Ditto.
2696         (fma4_fmsubaddv8sf4): Ditto.
2697         (fma4_fmsubaddv4sf4): Ditto.
2698         (fma4_fmsubaddv4df4): Ditto.
2699         (fma4_fmsubaddv2df4): Ditto.
2700         (fma4i_fmadd<mode>4): Add FMA4 floating point multiply/add
2701         instructions for intrinsics.
2702         (fma4i_fmsub<mode>4): Ditto.
2703         (fma4i_fnmadd<mode>4): Ditto.
2704         (fma4i_fnmsub<mode>4): Ditto.
2705         (fma4i_vmfmadd<mode>4): Ditto.
2706         (fma4i_vmfmsub<mode>4): Ditto.
2707         (fma4i_vmfnmadd<mode>4): Ditto.
2708         (fma4i_vmfnmsub<mode>4): Ditto.
2709         (fma4i_fmadd<mode>4256): Ditto.
2710         (fma4i_fmsub<mode>4256): Ditto.
2711         (fma4i_fnmadd<mode>4256): Ditto.
2712         (fma4i_fnmsub<mode>4256): Ditto.
2713         (fma4i_fmaddsubv8sf4): Ditto.
2714         (fma4i_fmaddsubv4sf4): Ditto.
2715         (fma4i_fmaddsubv4df4): Ditto.
2716         (fma4i_fmaddsubv2df4): Ditto.
2717         (fma4i_fmsubaddv8sf4): Ditto.
2718         (fma4i_fmsubaddv4sf4): Ditto.
2719         (fma4i_fmsubaddv4df4): Ditto.
2720         (fma4i_fmsubaddv2df4): Ditto.
2722         * doc/invoke.texi (-mfma4): Add documentation.
2723         * doc/extend.texi (x86 intrinsics): Add FMA4 intrinsics.
2725 2009-09-29  Richard Henderson  <rth@redhat.com>
2727         * tree-eh.c (unsplit_eh): Do not unsplit if there's already
2728         an edge to the new destination block.
2730 2009-09-29  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
2732         PR target/41393
2733         * pa.c (hppa_profile_hook): Use
2734         make_reg_eh_region_note_nothrow_nononlocal to add REG_EH_REGION note.
2736 2009-09-29  Steve Ellcey  <sje@cup.hp.com>
2737             Alexander Monakov  <amonakov@ispras.ru>
2739         PR target/41365
2740         * config/ia64/predicates.md (not_postinc_destination_operand): New.
2741         (not_postinc_memory_operand): New.
2742         (not_postinc_move_operand): New.
2743         * config/ia64/ia64.md (*cmovdi_internal): Disallow autoincrement.
2744         (*cmovsi_internal): Ditto.
2746 2009-09-29  Pat Haugen  <pthaugen@us.ibm.com>
2748         * config/rs6000/rs6000.c (rs6000_issue_rate): Don't artificially
2749         restrict issue_rate in first pass when scheduling for register
2750         pressure.
2752 2009-09-29  Basile Starynkevitch  <basile@starynkevitch.net>
2753             Rafael Avila de Espindola  <espindola@google.com>
2755         * gengtype.c (plugin_output): New.
2756         (get_output_file_with_visibility): Return plugin_output for plugins.
2757         (main): Parse and use the -P option.
2758         * gty.texi: Update the command line format.
2760 2009-09-29  Jakub Jelinek  <jakub@redhat.com>
2762         PR debug/41438
2763         * dwarf2out.c (const_ok_for_output_1, const_ok_for_output): New
2764         functions.
2765         (mem_loc_descriptor, loc_descriptor, add_const_value_attribute): Bail
2766         out if !const_ok_for_output.
2768         PR debug/41474
2769         * dwarf2out.c (mem_loc_descriptor) <case CONCAT, case CONCATN,
2770         case VAR_LOCATION>: Remove gcc_unreachable ().
2772 2009-09-29  Harsha Jagasia  <harsha.jagasia@amd.com>
2774         * config.gcc (i[34567]86-*-*): Remove mmintrin-common.h.
2775         (x86_64-*-*): Ditto.
2776         * config/i386/smmintrin.h: Move instructions in mmintrin-common.h
2777         back to smmintrin.h.
2778         * config/i386/cpuid.h (bit_SSE5): Remove SSE5 bit.
2779         * config/i386/x86intrin.h: Remove SSE5.
2780         * config/i386/mmintrin-common.h: Delete file.
2781         * doc/extend.texi (x86 intrinsics): Remove SSE5 flags and builtins.
2783 2009-09-29  Richard Guenther  <rguenther@suse.de>
2785         * alias.c (ao_ref_from_mem): Properly deal with off decl accesses
2786         resulting from stack temporaries on STRICT_ALIGNMENT targets.
2788 2009-09-29  Nick Clifton  <nickc@redhat.com>
2790         * function.c (current_function_name): If there is no current
2791         function just return "<none>".
2793 2009-09-28  Sriraman Tallam  <tmsriram@google.com>
2795         * tree-pass.h (register_pass_info): New structure.
2796         (pass_positioning_ops): Move enum from gcc-plugin.h.
2797         (register_pass): New function.
2798         * gcc-plugin.h (plugin_pass): Delete structure.
2799         (pass_positioning_ops): Delete enum.
2800         * plugin.c (regsiter_pass): Delete function.
2801         (position_pass): Delete function.
2802         (added_pass_nodes): Delete variable.
2803         (prev_added_pass_nodes): Delete variable.
2804         (pass_list_node): Delete structure.
2805         * passes.c (make_pass_instance): New function.
2806         (next_pass_1): Change to call make_pass_instance.
2807         (pass_list_node): Move structure from gcc-plugin.h.
2808         (added_pass_nodes): Move variable from plugin.c.
2809         (prev_added_pass_nodes): Move variable from plugin.c.
2810         (position_pass): New function.
2811         (register_pass): New function.
2813 2009-09-28  Easwaran Raman  <eraman@google.com>
2815         * ifcvt.c (noce_try_abs): Recognize pattern and call
2816         expand_one_cmpl_abs_nojump.
2817         * optabs.c (expand_one_cmpl_abs_nojump): New function.
2818         * optabs.h (expand_one_cmpl_abs_nojump): Declare.
2820 2009-09-28  Ian Lance Taylor  <iant@google.com>
2822         PR middle-end/40500
2823         * c-opts.c (c_common_handle_option): Don't set
2824         warn_jump_misses_init for -Wall.
2825         * doc/invoke.texi (Warning Options): Update documentation.
2827 2009-09-28  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
2829         * Makefile.in ($(out_object_file)): Depend on
2830         gt-$(basename $(notdir $(out_file))).h.
2832 2009-09-28  Richard Henderson  <rth@redhat.com>
2834         * except.h (struct eh_region_d): Add use_cxa_end_cleanup.
2835         * except.c (gen_eh_region): Set it.
2836         (duplicate_eh_regions_1): Copy it.
2837         * tree-eh.c (lower_resx): Use it to determine which function
2838         to call to resume.
2840         * langhooks.h (struct lang_hooks): Add eh_use_cxa_end_cleanup.
2841         * langhooks-def.h (LANG_HOOKS_EH_USE_CXA_END_CLEANUP): New.
2842         * builtins.def (BUILT_IN_CXA_END_CLEANUP): New.
2843         * tree.c (build_common_builtin_nodes): Remove parameter.  Build
2844         BUILT_IN_CXA_END_CLEANUP if necessary.
2846         * c-common.c (c_define_builtins): Update call to
2847         build_common_builtin_nodes.
2849 2009-09-28  Andrew Pinski  <andrew_pinski@playstation.sony.com>
2851         * spu.c (get_branch_target): Return NULL for ASM_OPERANDS patterns.
2853 2009-09-28  Michael Matz  <matz@suse.de>
2855         * builtins.c (interclass_mathfn_icode): New helper.
2856         (expand_builtin_interclass_mathfn): Use it here, and split folding
2857         into ...
2858         (fold_builtin_interclass_mathfn): ... this new folder.
2859         (build_call_nofold_loc): New static helper.
2860         (build_call_nofold): New wrapper macro for above.
2861         (expand_builtin_int_roundingfn): Use it instead of build_call_expr.
2862         (expand_builtin_pow): Ditto.
2863         (expand_builtin_memset_args): Ditto.
2864         (expand_builtin_printf): Ditto.
2865         (expand_builtin_fprintf): Ditto.
2866         (expand_builtin_sprintf): Ditto.
2867         (expand_builtin_memory_chk): Ditto.
2868         (expand_builtin_mempcpy_args): Ditto and don't call folders.
2869         (expand_builtin_stpcpy): Ditto.
2870         (expand_builtin_strcmp): Ditto.
2871         (expand_builtin_strncmp): Ditto.
2872         (expand_builtin_strcpy): Remove FNDECL and MODE arguments.
2873         (expand_builtin_strcpy_args): Don't call folders.
2874         (expand_builtin_memcmp): Ditto.
2875         (expand_builtin_strncpy): Ditto, and use target.
2876         (expand_builtin_memcpy): Ditto.
2877         (expand_builtin_strstr, expand_builtin_strchr, expand_builtin_strrchr,
2878         expand_builtin_strpbrk, expand_builtin_memmove,
2879         expand_builtin_memmove_args, expand_builtin_bcopy,
2880         expand_builtin_memchr, expand_builtin_strcat, expand_builtin_strncat,
2881         expand_builtin_strspn, expand_builtin_strcspn,
2882         expand_builtin_fputs): Remove these.
2883         (expand_builtin): Don't call the above, change calls to other
2884         expanders that changed prototype.
2885         (fold_builtin_stpcpy): New folder split out from expand_builtin_stpcpy.
2886         (fold_builtin_1 <ISFINITE, ISINF, ISNORMAL>): Call
2887         fold_builtin_interclass_mathfn.
2888         (fold_builtin_2 <STPCPY>): Call fold_builtin_stpcpy.
2889         (fold_builtin_strcat): Add folding split from expand_builtin_strcat.
2891         * fold-const.c (fold_binary_loc <NE_EXPR>): Add !exp != 0 -> !exp.
2892         * passes.c (init_optimization_passes): Move pass_fold_builtins
2893         after last phiopt pass.
2894         * tree-inline.c (fold_marked_statements): When folding builtins
2895         iterate over all instruction potentially generated.
2896         * tree-ssa-ccp.c (gimplify_and_update_call_from_tree): Declare
2897         earlier.
2898         (fold_gimple_call): Use it to always fold calls (into potentially
2899         multiple instructions).
2900         * tree-ssa-dom.c (optimize_stmt): Resolve __builtin_constant_p
2901         calls into zero at this time.
2902         * tree-ssa-propagate.c (substitute_and_fold): Ignore multiple
2903         statements generated by builtin folding.
2905 2009-09-28  Nick Clifton  <nickc@redhat.com>
2907         * config/m32r/m32r.c (m32r_is_insn): Return false for debugging insns.
2909 2009-09-28  Duncan Sands  <baldrick@free.fr>
2911         * gcc-plugin.h (PLUGIN_REGISTER_GGC_CACHES): New event.
2912         * plugin.c (plugin_event_name): Add PLUGIN_REGISTER_GGC_CACHES.
2913         (register_callback): Dispatch it.
2914         (invoke_plugin_callbacks): Incorporate in sanity check.
2915         * ggc.h (ggc_register_cache_tab): Add declaration.
2916         * ggc-common.c (ggc_register_root_tab): Simplify.
2917         (const_ggc_cache_tab_t): New typedef.
2918         (extra_cache_vec): New vector of dynamically added cache tables.
2919         (ggc_register_cache_tab): New function.
2920         (ggc_scan_cache_tab): New function.
2921         (ggc_mark_roots): Simplify dynamic roots.  Handle dynamic caches.
2922         * doc/plugins.texi: Document PLUGIN_REGISTER_GGC_CACHES.
2924 2009-09-27  Richard Henderson  <rth@redhat.com>
2926         * tree-ssa-ccp.c (optimize_stack_restore): Relax the conditions under
2927         which we remove __builtin_stack_restore.
2929 2009-09-27  Bernd Schmidt  <bernd.schmidt@analog.com>
2931         * loop-iv.c (iv_analyze_op): Use function_invariant_p, not CONSTANT_P,
2932         to test for GRD_INVARIANT.
2933         (simple_rhs_p): Anything that's function_invariant_p is fine.
2935 2009-09-27  Rafael Avila de Espindola  <espindola@google.com>
2937         * gengtype.c (main): Use plunge_files instead of plugin_output.
2939 2009-09-27  Basile Starynkevitch  <basile@starynkevitch.net>
2940             Rafael Avila de Espindola  <espindola@google.com>
2942         * gengtype.c (write_root, write_roots): Add a emit_pch argument.
2943         Don't print pch related info if it is false.
2944         (main): Don't print pch info in plugin mode.
2946 2009-09-27  Eric Botcazou  <ebotcazou@adacore.com>
2948         * dwarf2out.c (enum dw_val_class): Replace dw_val_class_long_long
2949         with dw_val_class_const_double.
2950         (struct dw_val_struct): Replace val_long_long with val_double and
2951         adjust for above change.
2952         (output_loc_operands): Likewise.
2953         (add_AT_long_long): Rename into...
2954         (add_AT_double): ...this.
2955         (print_die): Replace dw_val_class_long_long with
2956         dw_val_class_const_double and adjust.
2957         (attr_checksum): Likewise.
2958         (same_dw_val_p): Likewise.
2959         (size_of_die): Likewise.
2960         (value_format): Likewise.
2961         (output_die): Likewise.
2962         (loc_descriptor) <CONST_DOUBLE>: Likewise.
2963         (add_const_value_attribute) <CONST_DOUBLE>: Call add_AT_double
2964         instead of add_AT_long_long.
2965         (add_bound_info) <INTEGER_CST>: Generate the bound as an unsigned
2966         value with the precision of its type.
2968 2009-09-27  Andreas Schwab  <schwab@linux-m68k.org>
2970         PR c/41476
2971         * c-typeck.c (build_conditional_expr): Use the readonly and
2972         volatile flags of the operand types, not of the operands itself.
2974 2009-09-27  Peter O'Gorman  <pogma@thewrittenword.com>
2976         * collect2.c (main): Look for -brtl before adding libraries.
2978 2009-09-27  Jonathan Gray  <jsg@openbsd.org>
2980         * config.gcc: Update OpenBSD targets.
2981         * config/openbsd-stdint.h: New file.
2982         * config/openbsd-libpthread.h: New file.
2983         * config/openbsd.h: Update and break out LIB_SPEC definition.
2984         * config/alpha/openbsd.h: Overhaul to reflect ELF migration.
2985         * config/i386/openbsdelf.h: Correct types.
2986         * config/m68k/openbsd.h: Likewise.
2987         * config/mips/openbsd.h: Likewise.
2988         * config/vax/openbsd.h: Likewise.
2990 2009-09-27  Eric Botcazou  <ebotcazou@adacore.com>
2992         * fold-const.c (maybe_lvalue_p): Return false for M(IN|AX)_EXPR.
2993         (extract_muldiv_1) <MINUS_EXPR>: Swap operands if necessary.
2994         * stor-layout.c (layout_type) <ARRAY_TYPE>: Do not take the maximum
2995         of the length and zero.
2997 2009-09-27  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
2999         * Makefile.in (TOPLEV_H): Use $(INPUT_H) not input.h.
3000         (FLAGS_H): Add options.h $(REAL_H).
3001         (SEL_SCHED_IR_H): Add $(BITMAP_H) vecprim.h $(CFGLOOP_H).
3002         (TREE_VECTORIZER_H): New.
3003         (EBITMAP_H): Renamed from EBIMAP_H.
3004         (c-decl.o, c-objc-common.o, c-pretty-print.o, attribs.o, c-omp.o)
3005         (gtype-desc.o, ggc-common.o, ggc-page.o, ggc-zone.o, langhooks.o)
3006         (tree.o, tree-ssa-structalias.o, tree-ssa-ter.o, tree-ssanames.o)
3007         (tree-phinodes.o, tree-ssa-loop.o, tree-ssa-math-opts.o)
3008         (gimple-low.o, omp-low.o, sese.o, graphite-blocking.o)
3009         (graphite-clast-to-gimple.o, graphite-dependences.o)
3010         (graphite-interchange.o, graphite-poly.o, graphite-scop-detection.o)
3011         (graphite-sese-to-poly.o, tree-vect-loop.o, tree-vect-loop-manip.o)
3012         (tree-vect-patterns.o, tree-vect-slp.o, tree-vect-stmts.o)
3013         (tree-vect-data-refs.o, tree-vectorizer.o, gimple.o, tree-mudflap.o)
3014         (targhooks.o, stmt.o, emit-rtl.o, ipa.o, matrix-reorg.o, ipa-inline.o)
3015         (gcse.o, tree-ssa-ccp.o, df-byte-scan.o, vec.o, caller-save.o)
3016         (ira-build.o, ira-costs.o, ira-color.o, ira-emit.o, ira.o)
3017         (haifa-sched.o, sched-rgn.o, sel-sched.o, sel-sched-dump.o)
3018         (sel-sched-ir.o, final.o, $(out_object_file)): Dependencies
3019         updated and fixed as per above changes and per
3020         check_makefile_deps.sh output.
3022         PR bootstrap/40928
3023         * configure.ac: Use $LIBS for '-ldl', not $LDFLAGS.
3024         * configure: Regenerate.
3026 2009-09-26  Kaveh R. Ghazi  <ghazi@caip.rutgers.edu>
3028         * doc/install.texi: Update minimum MPC version to 0.7.
3030 2009-09-26  Gerald Pfeifer  <gerald@pfeifer.com>
3032         * doc/install.texi (Binaries): Remove reference to the binary
3033         distribution CD-ROM from the FSF.
3035 2009-09-26  Michael Matz  <matz@suse.de>
3037         PR lto/40758
3038         PR middle-end/41470
3039         * tree-ssa-coalesce.c (coalesce_ssa_name): Add only SSA names
3040         that are mentioned in the body.
3042 2009-09-26  Michael Matz  <matz@suse.de>
3044         PR tree-optimization/41454
3045         * tree-ssa-dom (stmts_to_rescan): Remove variable.
3046         (tree_ssa_dominator_optimize): Don't allocate and free it.
3047         (dom_opt_leave_block): Don't iterate over it.
3048         (eliminate_redundant_computations): Don't return a value.
3049         (cprop_operand, cprop_into_stmt): Ditto.
3050         (optimize_stmt): Don't defer updating stmts.
3052 2009-09-25  Dodji Seketeli  <dodji@redhat.com>
3054         * dwarf2out.c (dwarf_tag_name, gen_generic_params_dies,
3055         generic_parameter_die, template_parameter_pack_die,
3056         gen_formal_parameter_die, gen_subprogram_die): Adjust after
3057         renaming DW_TAG_formal_parameter_pack and
3058         DW_TAG_template_parameter_pack into DW_TAG_GNU_formal_parameter_pack
3059         and DW_TAG_GNU_template_parameter_pack.
3061 2009-09-25  Anatoly Sokolov  <aesok@post.ru>
3063         * config/v850/v850.h (FUNCTION_VALUE): Remove.
3064         * config/v850/v850.c (v850_function_value): New function.
3065         (TARGET_FUNCTION_VALUE): Define.
3067 2009-09-25  Jakub Jelinek  <jakub@redhat.com>
3069         * tree-vect-stmts.c (vectorizable_call): Call
3070         mark_symbols_for_renaming after vect_finish_stmt_generation.
3072         * dwarf2out.c (tls_mem_loc_descriptor): Pass 1 instead of 2
3073         to loc_descriptor_from_tree.
3074         (add_location_or_const_value_attribute): Pass 0 instead of 2
3075         for decl_by_reference_p decls.
3077 2009-09-25  Richard Guenther  <rguenther@suse.de>
3079         PR middle-end/41463
3080         * tree-dfa.c (get_ref_base_and_extent): Fix issue with trailing
3081         arrays again.
3083 2009-09-25  Ben Elliston  <bje@au.ibm.com>
3085         * doc/invoke.texi (RS/6000 and PowerPC Options): Add missing comma
3086         after `power7'.
3088 2009-09-25  Alan Modra  <amodra@bigpond.net.au>
3090         * config/rs6000/rs6000.md (load_toc_v4_PIC_3c): Correct POWER
3091         form of instruction.
3093 2009-09-24  Kaveh R. Ghazi  <ghazi@caip.rutgers.edu>
3095         PR middle-end/41435
3096         * fold-const.c (const_binop): Handle complex int division.
3097         * tree-complex.c (expand_complex_div_straight,
3098         expand_complex_div_wide): Update comments.
3100 2009-09-24  DJ Delorie  <dj@redhat.com>
3102         PR target/41456
3103         * config/m32c/m32c.h (REG_CLASS_CONTENTS): Add R13.
3104         (reg_class): Likewise.
3105         (REG_CLASS_NAMES): Likewise.
3106         * config/m32c/m32c.c (m32c_reg_class_from_constraint): Likewise.
3107         (m32c_override_options): Disable -fivopts for M32C.
3109 2009-09-24  Michael Meissner  <meissner@linux.vnet.ibm.com>
3111         * config/rs6000/predicates.md (indexed_or_indirect_operand):
3112         Delete VSX load/store with update support.
3113         * config/rs6000/rs6000.c (rs6000_legitimate_address_p): Ditto.
3114         * config/rs6000/vsx.md (vsx_mov<mode>): Ditto.
3115         (vsx_movti): Ditto.
3116         (VSX_U): Delete.
3117         (VSbit): Ditto.
3118         (VStype_load_update): Ditto.
3119         (VStype_store_update): Ditto.
3120         (vsx_load<VSX_U:mode>_update_<P:mptrsize>): Ditto.
3121         (vsx_store<VSX_U:mode>_update_<P:mptrsize>): Ditto.
3123         * config/rs6000/rs6000.h (enum rs6000_builtins): Delete VSX
3124         load/store with update builtins.
3126 2009-09-24  Kai Tietz  <kai.tietz@onevision.com>
3128         * libgcc2.c (L_trampoline): Prototype for getpagesize
3129         and mprotect in WINNT case.
3131 2009-09-24  Anatoly Sokolov  <aesok@post.ru>
3133         * config/rs6000/rs6000.h (FUNCTION_VALUE): Remove macro.
3134         * config/rs6000/rs6000-protos.h (rs6000_function_value): Remove.
3135         * config/rs6000/rs6000.c (rs6000_function_value): Make static, add
3136         'outgoing' argument.
3137         (TARGET_FUNCTION_VALUE): Define.
3139 2009-09-24  Iain Sandoe  <iain.sandoe@sandoe-acoustics.co.uk>
3141         * config/darwin.h (DWARF2_DEBUGGING_INFO): Define as 1.
3143 2009-09-24  Iain Sandoe  <iain.sandoe@sandoe-acoustics.co.uk>
3145         PR bootstrap/41405
3146         * common.opt: Initialize dwarf_strict to -1.
3147         * toplev.c (process_options): Catch unset dwarf_strict
3148         and set to 0 for all targets not overriding.
3149         * config/darwin.c (darwin_override_options): Catch unset
3150         dwarf_strict and override to 1.
3152 2009-09-24  Jeff Law  <law@redhat.com>
3154         * tree-into-ssa.c (rewrite_into_ssa): Free interesting_blocks.
3156 2009-09-24  Richard Guenther  <rguenther@suse.de>
3158         PR tree-optimization/36143
3159         PR tree-optimization/38747
3160         * tree-ssa-forwprop.c (forward_propagate_addr_expr_1): Only
3161         create VIEW_CONVERT_EXPRs for TBAA compatible accesses.
3163 2009-09-24  Jakub Jelinek  <jakub@redhat.com>
3165         PR bootstrap/41457
3166         * dwarf2out.c (add_const_value_attribute): For HIGH and CONST_FIXED,
3167         return false instead of gcc_unreachable ().  For CONST return the
3168         value returned by recursive call instead of always returning true.
3169         (tree_add_const_value_attribute): Return the value returned by
3170         add_const_value_attribute instead of always returning true if rtl
3171         is non-NULL.
3173 2009-09-23  Justin Seyster  <jrseys@gmail.com>
3175         * Makefile.in (PLUGIN_HEADERS): Include real.h.
3177 2009-09-24  Jakub Jelinek  <jakub@redhat.com>
3179         * cgraphunit.c (cgraph_lower_function): Revert last change.
3180         * targhooks.c (default_static_chain): Use !DECL_STATIC_CHAIN
3181         instead of DECL_NO_STATIC_CHAIN.
3182         * tree-cfg.c (verify_gimple_call): Likewise.
3183         * tree-nested.c (get_chain_decl, get_chain_field,
3184         convert_tramp_reference_op, convert_gimple_call): Likewise.
3185         (convert_all_function_calls): Likewise.  Always set or clear
3186         DECL_STATIC_CHAIN initially, for !n->outer clear it.
3187         (lower_nested_functions): Remove DECL_NO_STATIC_CHAIN checking code.
3188         * c-parser.c (c_parser_declaration_or_fndef): Set DECL_STATIC_CHAIN
3189         if nested.
3190         * print-tree.c (print_node): Handle DECL_STATIC_CHAIN instead of
3191         DECL_NO_STATIC_CHAIN.
3192         * config/i386/i386.c (ix86_static_chain): Use !DECL_STATIC_CHAIN
3193         instead of DECL_NO_STATIC_CHAIN.
3194         (ix86_function_regparm, find_drap_reg): Likewise.  Don't test
3195         decl_function_context.
3196         * varasm.c (initializer_constant_valid_p): Likewise.
3197         * tree.h (DECL_NO_STATIC_CHAIN): Renamed to ...
3198         (DECL_STATIC_CHAIN): ... this.
3199         * config/moxie/moxie.c (moxie_static_chain): Use !DECL_STATIC_CHAIN
3200         instead of DECL_NO_STATIC_CHAIN.
3202 2009-09-23  Basile Starynkevitch  <basile@starynkevitch.net>
3203             Rafael Avila de Espindola  <espindola@google.com>
3205         * gengtype.c (nb_plugin_files): Make it unsigned to match
3206         num_gt_files. Adjust other variables to avoid warnings.
3207         (main): Allocate an all zero lang_bitmap before each plugin file name
3208         to match regular file names.
3210 2009-09-23  Richard Henderson  <rth@redhat.com>
3212         * doc/tm.texi (STATIC_CHAIN, STATIC_CHAIN_INCOMING): Remove.
3213         (TARGET_STATIC_CHAIN): Mention that this hook must be used for
3214         static chain passed in memory.
3215         * system.h (STATIC_CHAIN, STATIC_CHAIN_INCOMING): Poison.
3216         * targhooks.c (default_static_chain): Don't handle STATIC_CHAIN,
3217         STATIC_CHAIN_INCOMING.  Issue a sorry if there's no
3218         STATIC_CHAIN_REGNUM defined.
3220         * config/picochip/picochip-protos.h: s/class/klass/.
3221         * config/picochip/picochip.c (TARGET_STATIC_CHAIN): New.
3222         (picochip_static_chain): New.
3223         * config/picochip/picochip.h (STATIC_CHAIN): Remove.
3224         (STATIC_CHAIN_INCOMING): Remove.
3226         * config/xtensa/xtensa.c (TARGET_STATIC_CHAIN): New.
3227         (xtensa_static_chain): New.
3228         * config/xtensa/xtensa.h (STATIC_CHAIN): Remove.
3229         (STATIC_CHAIN_INCOMING): Remove.
3231 2009-09-23  Anatoly Sokolov  <aesok@post.ru>
3233         * config/pa/pa.h (FUNCTION_VALUE): Remove macro.
3234         * config/pa/pa-protos.h (function_value): Remove.
3235         * config/pa/pa.c (pa_function_value): Rename from function_value.
3236         Make static, add 'outgoing' argument.
3237         (TARGET_FUNCTION_VALUE): Define.
3239 2009-09-23  Anatoly Sokolov  <aesok@post.ru>
3241         * config/avr/avr.c (avr_regs_to_save): Use current_function_is_leaf
3242         instead of cfun->machine->is_leaf.
3243         * config/avr/avr.h (machine_function): Remove is_leaf field.
3245 2009-09-23  Jakub Jelinek  <jakub@redhat.com>
3247         PR debug/41439
3248         * dwarf2out.c (address_of_int_loc_descriptor): Don't emit
3249         DW_OP_piece after DW_OP_stack_value, adjust size calculations
3250         for it, when DW_OP_stack_value and DW_OP_implicit_value has
3251         the same size, prefer DW_OP_stack_value.
3252         (loc_descriptor, loc_list_for_address_of_addr_expr_of_indirect_ref,
3253         loc_list_from_tree): Don't emit DW_OP_piece after DW_OP_stack_value.
3255 2009-09-23  Alexandre Oliva  <aoliva@redhat.com>
3257         PR debug/41353
3258         * var-tracking.c (add_with_sets): Sort MO_VAL_LOC last among uses.
3260 2009-09-23  Alexandre Oliva  <aoliva@redhat.com>
3262         PR debug/41248
3263         * cfgexpand.c (convert_debug_memory_address): New.
3264         (expand_debug_expr): Convert base address and offset to the same
3265         mode.  Use it to convert addresses to other modes.  Accept
3266         ptr_mode addresses.
3268 2009-09-23  Richard Guenther  <rguenther@suse.de>
3270         * alias.c (ao_ref_from_mem): Correct for negative MEM_OFFSET
3271         produced for bigendian targets with promoted subregs.
3273 2009-09-23  Richard Guenther  <rguenther@suse.de>
3275         * value-prof.c (gimple_ic): Purge old EH edges only after building
3276         the new ones.
3278 2009-09-23  Nick Clifton  <nickc@redhat.com>
3280         * config/arc/arc.c (arc_trampoline_init): Fix typo.
3282 2009-09-23  Jakub Jelinek  <jakub@redhat.com>
3284         PR bootstrap/41405
3285         * doc/invoke.texi: Document -gstrict-dwarf and -gno-strict-dwarf.
3287         PR bootstrap/41436
3288         * cgraphunit.c (cgraph_lower_function): Set DECL_NO_STATIC_CHAIN
3289         on non-nested functions.
3291 2009-09-23  Jakub Jelinek  <jakub@redhat.com>
3292             Jan Hubicka  <jh@suse.cz>
3294         * dwarf2out.c (loc_list_plus_const): Only define if
3295         DWARF2_DEBUGGING_INFO.
3296         (address_of_int_loc_descriptor): Likewise.
3298         PR debug/41411
3299         * dwarf2out.c (mem_loc_descriptor): Handle HIGH.
3301 2009-09-23  Uros Bizjak  <ubizjak@gmail.com>
3303         PR c/39779
3304         * c-typeck.c (build_binary_op) <short_shift>: Check that integer
3305         constant is more than zero.
3307 2009-09-23  Alan Modra  <amodra@bigpond.net.au>
3309         PR target/40473
3310         * config/rs6000/rs6000.c (rs6000_output_function_prologue): Don't
3311         call final to emit non-scheduled prologue, instead insert at entry.
3313 2009-09-22  Loren J. Rittle  <ljrittle@acm.org>
3314             Joseph S. Myers  <joseph@codesourcery.com>
3316         * doc/install.texi (*-*-freebsd*): Add proper format codes.
3318 2009-09-22  Basile Starynkevitch  <basile@starynkevitch.net>
3319             Rafael Avila de Espindola  <espindola@google.com>
3321         * gengtype.c (is_file_equal): New function.
3322         (close_output_files): Use is_file_equal. Free of->buf.
3324 2009-09-22  Basile Starynkevitch  <basile@starynkevitch.net>
3325             Rafael Avila de Espindola  <espindola@google.com>
3327         * gengtype.c (write_types, write_local): Add the output_header
3328         argument. Update all callers.
3330 2009-09-22  Dodji Seketeli  <dodji@redhat.com>
3332         * dwarf2out.c (template_parameter_pack_die,
3333         gen_formal_parameter_pack_die ): New functions.
3334         (make_ith_pack_parameter_name): Remove this function.
3335         (dwarf_tag_name): Support printing DW_TAG_template_parameter_pack and
3336         DW_TAG_formal_parameter_pack.
3337         (gen_generic_params_dies): Represent each template parameter pack
3338         by a DW_TAG_template_parameter_pack DIE. Argument pack elements are
3339         represented by usual DW_TAG_template_*_parameter DIEs that are
3340         children of the DW_TAG_template_parameter_pack element DIE.
3341         (generic_parameter_die): This doesn't deal with parameter pack
3342         names anymore. Don't generate DW_AT_name for some DIEs, e.g. children
3343         of parameter pack DIEs.
3344         (gen_formal_parameter_die): Add a flag to not emit DW_AT_name
3345         in certain cases, e.g. for pack elements.
3346         (gen_formal_types_die, gen_decl_die): Adjust usage of
3347         gen_formal_parameter_die.
3348         (gen_subprogram_die): Represent each function parameter pack by a
3349         DW_TAG_formal_parameter_pack DIE. Arguments of of the pack are
3350         represented by usual DW_TAG_formal_parameter DIEs that are children
3351         of the DW_TAG_formal_parameter_pack DIE. Remove references to
3352         ____builtin_va_alist decls as no part of the compiler uses those
3353         anymore.
3354         * langhooks.h (struct lang_hooks_for_decls): Add
3355         function_parm_expanded_from_pack_p, get_generic_function_decl
3356         and function_parameter_pack_p hooks.  Fix comment for
3357         get_innermost_generic_parms hook.
3358         * langhooks-def.h (LANG_HOOKS_FUNCTION_PARAMETER_PACK_P,
3359         LANG_HOOKS_FUNCTION_PARM_EXPANDED_FROM_PACK_P ): Declare new hook
3360         macros and use them to initialize lang_hook.
3362 2009-09-22  Richard Henderson  <rth@redhat.com>
3364         * system.h (TRAMPOLINE_TEMPLATE, INITIALIZE_TRAMPOLINE): Poison.
3365         (TRAMPOLINE_ADJUST_ADDRESS): Poison.
3366         * target-def.h (TARGET_ASM_TRAMPOLINE_TEMPLATE): Don't conditionalize
3367         on TRAMPOLINE_TEMPLATE.
3368         (TARGET_TRAMPOLINE_ADJUST_ADDRESS): Don't conditionalize on
3369         TRAMPOLINE_ADJUST_ADDRESS.
3370         * targhooks.c (default_asm_trampoline_template): Remove.
3371         (default_trampoline_adjust_address): Remove.
3372         (default_trampoline_init): Don't handle INITIALIZE_TRAMPOLINE.
3373         * targhooks.h: Update decls.
3375 2009-09-22  Dave Korn  <dave.korn.cygwin@gmail.com>
3377         * config/i386/cygming.h (TARGET_USE_JCR_SECTION): Enable.
3378         * config/i386/cygwin.h (LIBGCJ_SONAME): Define.
3379         * config/i386/mingw32.h (LIBGCJ_SONAME): Likewise.
3381 2009-09-22  Alexandre Oliva  <aoliva@redhat.com>
3383         PR debug/41295
3384         * reload1.c (reload): Reset debug insns with pseudos without
3385         equivalences.
3387 2009-09-22  Janis Johnson  <janis187@us.ibm.com>
3389         * config/i386/i386.c (ix86_scalar_mode_supported_p): Don't return
3390         unconditional true for decimal float modes.
3391         * config/rs6000/rs6000.c (rs6000_scalar_mode_supported_p): Ditto.
3392         * config/s390/s390.c (s390_scalar_mode_supported_p): Ditto.
3394 2009-09-22  Loren J. Rittle  <ljrittle@acm.org>
3396         * unwind-dw2-fde-glibc.c: Define and use USE_PT_GNU_EH_FRAME.
3397         Enable a new case for __FreeBSD__ >= 7.
3398         * crtstuff.c:  Define USE_PT_GNU_EH_FRAME for __FreeBSD__ >= 7.
3399         * config/t-freebsd: Define LIB2ADDEH and LIB2ADDEHDEP.
3400         * config/freebsd-spec.h: Conditionally define LINK_EH_SPEC
3401         and USE_LD_AS_NEEDED.
3403         * doc/install.texi (*-*-freebsd*): Update target information.
3405 2009-09-22  Richard Guenther  <rguenther@suse.de>
3407         PR middle-end/41395
3408         * tree-dfa.c (get_ref_base_and_extent): Handle trailing
3409         arrays really properly.
3411 2009-09-22  Richard Henderson  <rth@redhat.com>
3413         PR target/41246
3414         * target.h (struct gcc_target): Add asm_out.trampoline_template,
3415         calls.static_chain, calls.trampoline_init,
3416         calls.trampoline_adjust_address.
3417         * target-def.h (TARGET_ASM_TRAMPOLINE_TEMPLATE): New.
3418         (TARGET_STATIC_CHAIN, TARGET_TRAMPOLINE_INIT): New.
3419         (TARGET_TRAMPOLINE_ADJUST_ADDRESS): New.
3420         * builtins.c (expand_builtin_setjmp_receiver): Use
3421         targetm.calls.static_chain; only clobber registers.
3422         (expand_builtin_init_trampoline): Use targetm.calls.trampoline_init;
3423         set up memory attributes properly for the trampoline block.
3424         (expand_builtin_adjust_trampoline): Use
3425         targetm.calls.trampoline_adjust_address.
3426         * calls.c (prepare_call_address): Add fndecl argument.  Use
3427         targetm.calls.static_chain.
3428         * df-scan.c (df_need_static_chain_reg): Remove.
3429         (df_get_entry_block_def_set): Use targetm.calls.static_chain;
3430         consolodate static chain handling.
3431         * doc/tm.texi: Document new hooks.
3432         * emit-rtl.c (static_chain_rtx, static_chain_incoming_rtx): Remove.
3433         (init_emit_regs): Don't initialize them.
3434         * expr.h (prepare_call_address): Update decl.
3435         * final.c (profile_function): Use targetm.calls.static_chain.
3436         * function.c (expand_function_start): Likewise.
3437         * rtl.h (static_chain_rtx, static_chain_incoming_rtx): Remove.
3438         * stmt.c (expand_nl_goto_receiver): Use targetm.calls.static_chain;
3439         only clobber registers.
3440         * targhooks.c (default_static_chain): New.
3441         (default_asm_trampoline_template, default_trampoline_init): New.
3442         (default_trampoline_adjust_address): New.
3443         * targhooks.h: Declare them.
3444         * varasm.c (assemble_trampoline_template): Use
3445         targetm.asm_out.trampoline_template.  Make the memory block const
3446         and set its size.
3448         * config/alpha/alpha.c (alpha_trampoline_init): Rename from
3449         alpha_initialize_trampoline.  Make static.  Merge VMS parameter
3450         differences into the TARGET_ABI_OPEN_VMS code block.
3451         (TARGET_TRAMPOLINE_INIT): New.
3452         * config/alpha/alpha.h (TRAMPOLINE_TEMPLATE): Remove.
3453         (TRAMPOLINE_SECTION, INITIALIZE_TRAMPOLINE): Remove.
3454         * config/alpha/vms.h (TRAMPOLINE_SIZE, TRAMPOLINE_ALIGNMENT): Remove.
3455         (INITIALIZE_TRAMPOLINE): Remove.
3457         * config/arc/arc.h (TRAMPOLINE_ALIGNMENT): New.
3458         (TRAMPOLINE_TEMPLATE): Merge with ...
3459         (INITIALIZE_TRAMPOLINE): ... this and move ...
3460         * config/arc/arc.c (arc_trampoline_init): ... here.
3461         (TARGET_TRAMPOLINE_INIT): New.
3463         * config/arm/arm.c (TARGET_ASM_TRAMPOLINE_TEMPLATE): New.
3464         (TARGET_TRAMPOLINE_INIT, TARGET_TRAMPOLINE_ADJUST_ADDRESS): New.
3465         (arm_asm_trampoline_template): New.
3466         (arm_trampoline_init, arm_trampoline_adjust_address): New.
3467         * config/arm/arm.h (TRAMPOLINE_TEMPLATE, ARM_TRAMPOLINE_TEMPLATE,
3468         THUMB2_TRAMPOLINE_TEMPLATE, THUMB1_TRAMPOLINE_TEMPLATE): Move all
3469         code to arm_asm_trampoline_template.
3470         (TRAMPOLINE_ADJUST_ADDRESS): Move code to
3471         arm_trampoline_adjust_address.
3472         (INITIALIZE_TRAMPOLINE): Move code to arm_trampoline_init;
3473         adjust for target hook parameters.
3475         * config/avr/avr.h (TRAMPOLINE_TEMPLATE, INITIALIZE_TRAMPOLINE):
3476         Remove.
3478         * config/bfin/bfin-protos.h (initialize_trampoline): Remove.
3479         * config/bfin/bfin.c (bfin_asm_trampoline_template): New.
3480         (bfin_trampoline_init): Rename from initialize_trampoline;
3481         make static; update for target hook parameters.
3482         (TARGET_ASM_TRAMPOLINE_TEMPLATE, TARGET_TRAMPOLINE_INIT): New.
3483         * config/bfin/bfin.h (TRAMPOLINE_TEMPLATE): Move code to
3484         bfin_asm_trampoline_template.
3485         (INITIALIZE_TRAMPOLINE): Remove.
3487         * config/cris/cris.c (TARGET_ASM_TRAMPOLINE_TEMPLATE,
3488         TARGET_TRAMPOLINE_INIT, cris_asm_trampoline_template,
3489         cris_trampoline_init): New.
3490         * config/cris/cris.h (TRAMPOLINE_TEMPLATE): Move code to
3491         cris_asm_trampoline_template.
3492         (INITIALIZE_TRAMPOLINE): Move code to cris_trampoline_init;
3493         adjust for target hook parameters.
3495         * config/crx/crx.h (INITIALIZE_TRAMPOLINE): Remove.
3497         * config/fr30/fr30.c (TARGET_ASM_TRAMPOLINE_TEMPLATE,
3498         TARGET_TRAMPOLINE_INIT, fr30_asm_trampoline_template,
3499         fr30_trampoline_init): New.
3500         * config/fr30/fr30.h (TRAMPOLINE_TEMPLATE): Move code to
3501         fr30_asm_trampoline_template.
3502         (INITIALIZE_TRAMPOLINE): Move code to fr30_trampoline_init;
3503         adjust for target hook parameters.
3505         * config/frv/frv.c (TARGET_TRAMPOLINE_INIT): New.
3506         (frv_trampoline_init): Rename from frv_initialize_trampoline;
3507         make static, adjust arguments for TARGET_TRAMPOLINE_INIT hook.
3508         * config/frv/frv.h (INITIALIZE_TRAMPOLINE): Remove.
3509         * config/frv/frv-protos.h (frv_initialize_trampoline): Remove.
3511         * config/h8300/h8300.c (h8300_trampoline_init): New.
3512         (TARGET_TRAMPOLINE_INIT): New.
3513         * config/h8300/h8300.h (INITIALIZE_TRAMPOLINE): Move code
3514         to h8300_trampoline_init and adjust for hook parameters.
3516         * config/ia64/ia64-protos.h (ia64_initialize_trampoline): Remove.
3517         * config/ia64/ia64.c (TARGET_TRAMPOLINE_INIT): New.
3518         (ia64_trampoline_init): Rename from ia64_initialize_trampoline;
3519         make static; adjust for hook parameters.
3520         * config/ia64/ia64.h (INITIALIZE_TRAMPOLINE): Remove.
3522         * config/iq2000/iq2000.c (TARGET_ASM_TRAMPOLINE_TEMPLATE): New.
3523         (TARGET_TRAMPOLINE_INIT): New.
3524         (iq2000_asm_trampoline_template, iq2000_trampoline_init): New.
3525         * config/iq2000/iq2000.h (TRAMPOLINE_TEMPLATE): Move code to
3526         iq2000_asm_trampoline_template.
3527         (INITIALIZE_TRAMPOLINE): Move code to iq2000_trampoline_init.
3528         (TRAMPOLINE_CODE_SIZE): New.
3529         (TRAMPOLINE_SIZE): Use it.
3530         (TRAMPOLINE_ALIGNMENT): Follow Pmode.
3532         * config/m32c/m32c-protos.h (m32c_initialize_trampoline): Remove.
3533         * config/m32c/m32c.c (TARGET_TRAMPOLINE_INIT): New.
3534         (m32c_trampoline_init): Rename from m32c_initialize_trampoline;
3535         adjust for hook parameters.
3536         * config/m32c/m32c.h (INITIALIZE_TRAMPOLINE): Remove.
3538         * config/m32r/m32r.c (TARGET_TRAMPOLINE_INIT): New.
3539         (m32r_trampoline_init): New.
3540         * config/m32r/m32r.h (INITIALIZE_TRAMPOLINE): Move code to
3541         m32r_trampoline_init.
3543         * config/m68hc11/m68hc11.c (TARGET_TRAMPOLINE_INIT): New.
3544         (m68hc11_trampoline_init): Rename from m68hc11_initialize_trampoline;
3545         make static; update for hook parameters.
3546         * config/m68hc11/m68hc11-protos.h: Update.
3547         * config/m68hc11/m68hc11.h (INITIALIZE_TRAMPOLINE): Remove.
3549         * config/mcore/mcore.c (TARGET_ASM_TRAMPOLINE_TEMPLATE): New.
3550         (TARGET_TRAMPOLINE_INIT): New.
3551         (mcore_function_value): Fix typo.
3552         (mcore_asm_trampoline_template, mcore_trampoline_init): New.
3553         * config/mcore/mcore.h (TRAMPOLINE_TEMPLATE): Move code
3554         to mcore_asm_trampoline_template.
3555         (INITIALIZE_TRAMPOLINE): Move code to mcore_trampoline_init.
3557         * config/mep/mep.h (INITIALIZE_TRAMPOLINE): Remove.
3558         * config/mep/mep.c (TARGET_TRAMPOLINE_INIT): New.
3559         (mep_trampoline_init): Rename from mep_init_trampoline; make static;
3560         update for hook parameters.
3561         * config/mep/mep-protos.h (mep_init_trampoline): Remove.
3563         * config/mips/mips.c (TARGET_ASM_TRAMPOLINE_TEMPLATE,
3564         mips_asm_trampoline_template, TARGET_TRAMPOLINE_INIT,
3565         mips_trampoline_init): New.
3566         * config/mips/mips.h (TRAMPOLINE_TEMPLATE): Move code to
3567         mips_asm_trampoline_template.
3568         (INITIALIZE_TRAMPOLINE): Move code to mips_trampoline_init;
3569         update for hook parameters.
3571         * gcc/config/mmix/mmix.c (TARGET_ASM_TRAMPOLINE_TEMPLATE): New.
3572         (TARGET_TRAMPOLINE_INIT): New.
3573         (mmix_trampoline_size): Remove.
3574         (mmix_asm_trampoline_template): Rename from mmix_trampoline_template;
3575         make static.  Remove out-of-date tetra vs octa comment.
3576         (mmix_trampoline_init): Rename from mmix_initialize_trampoline;
3577         make static; update for hook parameters.
3578         * config/mmix/mmix.h (TRAMPOLINE_TEMPLATE): Remove.
3579         (INITIALIZE_TRAMPOLINE): Remove.
3580         (TRAMPOLINE_SIZE): Use a constant instead of mmix_trampoline_size.
3581         (TRAMPOLINE_ALIGNMENT): New.
3582         * gcc/config/mmix/mmix-protos.h: Update.
3584         * config/mn10300/mn10300.c (TARGET_ASM_TRAMPOLINE_TEMPLATE,
3585         mn10300_asm_trampoline_template, TARGET_TRAMPOLINE_INIT,
3586         mn10300_trampoline_init): New.
3587         * config/mn10300/mn10300.h (TRAMPOLINE_TEMPLATE): Move code to
3588         mn10300_asm_trampoline_template.
3589         (INITIALIZE_TRAMPOLINE): Move code to mn10300_trampoline_init.
3591         * config/moxie/moxie.c (moxie_static_chain,
3592         moxie_asm_trampoline_template, moxie_trampoline_init,
3593         TARGET_STATIC_CHAIN, TARGET_ASM_TRAMPOLINE_TEMPLATE,
3594         TARGET_TRAMPOLINE_INIT): New.
3595         * config/moxie/moxie.h (INITIALIZE_TRAMPOLINE): Move code to
3596         moxie_trampoline_init.
3597         (TRAMPOLINE_TEMPLATE): Move code to moxie_asm_trampoline_template.
3598         (STATIC_CHAIN, STATIC_CHAIN_INCOMING): Remove.
3600         * gcc/config/pa/pa.c (TARGET_ASM_TRAMPOLINE_TEMPLATE,
3601         pa_asm_trampoline_template, TARGET_TRAMPOLINE_INIT,
3602         pa_trampoline_init, TARGET_TRAMPOLINE_ADJUST_ADDRESS,
3603         pa_trampoline_adjust_address): New.
3604         * config/pa/pa.h (TRAMPOLINE_TEMPLATE): Move code to
3605         pa_asm_trampoline_template.
3606         (TRAMPOLINE_ALIGNMENT): New.
3607         (TRAMPOLINE_CODE_SIZE): Move to pa.c.
3608         (INITIALIZE_TRAMPOLINE): Move code to pa_trampoline_init;
3609         adjust for hook parameters.
3610         (TRAMPOLINE_ADJUST_ADDRESS): Move code to pa_trampoline_adjust_address.
3612         * config/pdp11/pdp11.c (pdp11_trampoline_init): New.
3613         (TARGET_TRAMPOLINE_INIT): New.
3614         * config/pdp11/pdp11.h (TRAMPOLINE_TEMPLATE): Remove.
3615         (INITIALIZE_TRAMPOLINE): Move code to pdp11_trampoline_init.
3617         * config/picochip/picochip.h (INITIALIZE_TRAMPOLINE): Remove.
3619         * config/rs6000/rs6000-protos.h (rs6000_initialize_trampoline): Remove.
3620         * config/rs6000/rs6000.c (TARGET_TRAMPOLINE_INIT): New.
3621         (rs6000_trampoline_init): Rename from rs6000_initialize_trampoline;
3622         make static; adjust parameters for the hook.
3623         * config/rs6000/rs6000.h (INITIALIZE_TRAMPOLINE): Remove.
3625         * config/s390/s390.c (s390_asm_trampoline_template): Rename from
3626         s390_trampoline_template; make static.
3627         (s390_trampoline_init): Rename from s390_initialize_trampoline;
3628         make static; adjust for target hook.
3629         (TARGET_ASM_TRAMPOLINE_TEMPLATE, TARGET_TRAMPOLINE_INIT): New.
3630         * config/s390/s390-protos.h: Remove trampoline decls.
3631         * config/s390/s390.h (INITIALIZE_TRAMPOLINE): Remove.
3632         (TRAMPOLINE_TEMPLATE): Remove.
3633         (TRAMPOLINE_ALIGNMENT): New.
3635         * config/score/score-protos.h (score_initialize_trampoline): Remove.
3636         * config/score/score.c (TARGET_ASM_TRAMPOLINE_TEMPLATE): New.
3637         (TARGET_TRAMPOLINE_INIT): New.
3638         (score_asm_trampoline_template): New.
3639         (score_trampoline_init): Rename from score_initialize_trampoline;
3640         make static; adjust for hook parameters.
3641         * config/score/score.h (TRAMPOLINE_TEMPLATE): Move code to
3642         score[37]_asm_trampoline_template.
3643         (INITIALIZE_TRAMPOLINE): Remove.
3644         * config/score/score3.c (score3_asm_trampoline_template): New.
3645         (score3_trampoline_init): Rename from score3_initialize_trampoline;
3646         adjust for target hook.
3647         * config/score/score7.c (score7_asm_trampoline_template): New.
3648         (score7_trampoline_init): Rename from score7_initialize_trampoline;
3649         adjust for target hook.
3650         * config/score/score3.h, config/score/score7.h: Update.
3652         * config/sh/sh-protos.h (sh_initialize_trampoline): Remove.
3653         * config/sh/sh.c (TARGET_TRAMPOLINE_INIT): New.
3654         (TARGET_TRAMPOLINE_ADJUST_ADDRESS): New.
3655         (sh_trampoline_init): Rename from sh_initialize_trampoline;
3656         make static; adjust for target hook parameters.
3657         (sh_trampoline_adjust_address): New.
3658         * config/sh/sh.h (INITIALIZE_TRAMPOLINE): New.
3659         (TRAMPOLINE_ADJUST_ADDRESS): Move code to sh_trampoline_adjust_address.
3661         * config/sparc/sparc.c (TARGET_TRAMPOLINE_INIT): New.
3662         (sparc32_initialize_trampoline): Rename from
3663         sparc_initialize_trampoline; make static; replace tramp parameter
3664         with m_tramp and update memory accesses.
3665         (sparc64_initialize_trampoline): Similarly.
3666         (sparc_trampoline_init): New.
3667         * config/sparc/sparc-protos.h: Remove trampoline decls.
3668         * config/sparc/sparc.h (INITIALIZE_TRAMPOLINE): Remove.
3669         * config/sparc/sparc.md (nonlocal_goto): Don't use static_chain_rtx.
3671         * config/spu/spu.c (TARGET_TRAMPOLINE_INIT): New.
3672         (array_to_constant): Make ARR parameter const.
3673         (spu_trampoline_init): Rename from spu_initialize_trampoline;
3674         make static; update for hook parameters.
3675         * config/spu/spu-protos.h: Update decls.
3676         * config/spu/spu.h (INITIALIZE_TRAMPOLINE): Remove.
3678         * config/stormy16/stormy16.c (xstormy16_trampoline_init): Rename
3679         from xstormy16_initialize_trampoline; make static; update for
3680         hook parameters.
3681         (TARGET_TRAMPOLINE_INIT): New.
3682         * config/stormy16/stormy16.h (INITIALIZE_TRAMPOLINE): Remove.
3684         * config/v850/v850.c (TARGET_ASM_TRAMPOLINE_TEMPLATE): New.
3685         (TARGET_TRAMPOLINE_INIT): New.
3686         (v850_can_eliminate): Make static.
3687         (v850_asm_trampoline_template, v850_trampoline_init): New.
3688         * config/v850/v850.h (TRAMPOLINE_TEMPLATE): Move code to
3689         v850_asm_trampoline_template.
3690         (INITIALIZE_TRAMPOLINE): Move code to v850_trampoline_init
3691         and adjust for target hook parameters.
3693         * config/vax/vax.c (TARGET_ASM_TRAMPOLINE_TEMPLATE): New.
3694         (TARGET_TRAMPOLINE_INIT): New.
3695         (vax_asm_trampoline_template, vax_trampoline_init): New.
3696         * config/vax/vax.h (TRAMPOLINE_TEMPLATE): Move code to
3697         vax_asm_trampoline_template.
3698         (INITIALIZE_TRAMPOLINE): Move code to vax_trampoline_init.
3700         * config/xtensa/xtensa.c (TARGET_ASM_TRAMPOLINE_TEMPLATE): New.
3701         (TARGET_TRAMPOLINE_INIT): New.
3702         (xtensa_asm_trampoline_template): Rename from
3703         xtensa_trampoline_template; make static.
3704         (xtensa_trampoline_init): Rename from xtensa_initialize_trampoline;
3705         make static; update for hook parameters.
3706         * config/xtensa/xtensa-protos.h: Remove trampoline decls.
3707         * config/xtensa/xtensa.h (TRAMPOLINE_TEMPLATE): Remove.
3708         (INITIALIZE_TRAMPOLINE): Remove.
3710         * config/i386/i386.c (ix86_function_regparm): Do not issue an
3711         error for nested functions with regparm=3.
3712         (ix86_compute_frame_layout): Adjust frame pointer offset for
3713         ix86_static_chain_on_stack.
3714         (ix86_expand_prologue): Handle ix86_static_chain_on_stack.
3715         (ix86_emit_restore_reg_using_pop): Increment ix86_cfa_state->offset,
3716         don't reset to UNITS_PER_WORD.
3717         (ix86_emit_leave): Adjust ix86_cfa_state.
3718         (ix86_expand_epilogue): Handle ix86_static_chain_on_stack.
3719         (ix86_static_chain): New.
3720         (ix86_trampoline_init): Rename from x86_initialize_trampoline;
3721         make static; update for target hook parameters; use ix86_static_chain.
3722         (TARGET_STATIC_CHAIN, TARGET_TRAMPOLINE_INIT): New.
3723         * config/i386/i386.h (STATIC_CHAIN_REGNUM): Remove.
3724         (INITIALIZE_TRAMPOLINE): Remove.
3725         (TRAMPOLINE_SIZE): Use 24 for 64-bit.
3726         (struct machine_function): Use BOOL_BITFIELD; rearrange bitfields
3727         to the end.  Add static_chain_on_stack.
3728         (ix86_static_chain_on_stack): New.
3730         * config/m68k/m68k.c (TARGET_TRAMPOLINE_INIT): New.
3731         (m68k_output_mi_thunk): Don't use static_chain_rtx.
3732         (m68k_trampoline_init): New.
3733         * config/m68k/m68k.h (INITIALIZE_TRAMPOLINE): Move code to
3734         m68k_trampoline_init and adjust for hook parameters.
3735         * config/m68k/netbsd-elf.h (TRAMPOLINE_TEMPLATE): Remove.
3736         (TRAMPOLINE_SIZE, INITIALIZE_TRAMPOLINE): Remove.
3738 2009-09-22  Jakub Jelinek  <jakub@redhat.com>
3740         * config/rs6000/rs6000.c (bdesc_2arg): Fix CODE_FOR_vector_gt* codes
3741         for __builtin_altivec_vcmpgt{sb,uh,sh,uw}.
3743         * reload1.c (reload): Call wrap_constant when substituting
3744         reg for equiv inside of DEBUG_INSNs.
3746         PR bootstrap/41405
3747         * dwarf2out.c (base_type_die, record_type_tag, gen_subprogram_die,
3748         add_call_src_coords_attributes, add_high_low_attributes,
3749         gen_compile_unit_die, gen_type_die_with_usage force_decl_die,
3750         gen_decl_die, dwarf2out_imported_module_or_decl_1, dwarf2out_finish,
3751         dwarf2out_imported_module_or_decl): Avoid using DWARF3 additions
3752         when -gdwarf-2 -gstrict-dwarf.
3753         (loc_list_from_tree): Likewise.  Avoid using DWARF4 additions when
3754         -gdwarf-[23] -gstrict-dwarf.
3755         (address_of_int_loc_descriptor, loc_descriptor,
3756         loc_list_for_address_of_addr_expr_of_indirect_ref): Avoid using
3757         DWARF4 additions when -gdwarf-[23] -gstrict-dwarf.
3758         * common.opt (gno-strict-dwarf, gstrict-dwarf): New options.
3760 2009-09-22  Richard Guenther  <rguenther@suse.de>
3762         PR tree-optimization/41428
3763         * tree-ssa-ccp.c (ccp_fold_stmt): New function.
3764         (ccp_finalize): Pass it to substitute_and_fold.
3766 2009-09-22  Richard Guenther  <rguenther@suse.de>
3768         * tree-ssa-propagate.h (ssa_prop_fold_stmt_fn): Declare.
3769         (substitute_and_fold): Adjust prototype.
3770         * tree-vrp.c (vrp_evaluate_conditional): Make static.
3771         (simplify_stmt_using_ranges): Likewise.
3772         (fold_predicate_in): Move here from tree-ssa-propagate.c.
3773         (vrp_fold_stmt): New function.
3774         (vrp_finalize): Pass it to substitute_and_fold.
3775         * tree-flow.h (vrp_evaluate_conditional): Remove.
3776         (simplify_stmt_using_ranges): Likewise.
3777         * tree-ssa-ccp.c (ccp_finalize): Adjust call to substitute_and_fold.
3778         * tree-ssa-copy.c (fini_copy_prop): Likewise.
3779         * tree-ssa-propagate.c (struct prop_stats_d): Rename num_pred_folded
3780         member.
3781         (fold_predicate_in): Move to tree-vrp.c.
3782         (substitute_and_fold): Use the callback instead of calling into
3783         tree-vrp.c functions directly.
3785 2009-09-22  Jakub Jelinek  <jakub@redhat.com>
3787         * dwarf2out.c (address_of_int_loc_descriptor): Avoid signed/unsigned
3788         comparison warning on rs6000.
3790         PR middle-end/41429
3791         * tree-cfg.c (remove_useless_stmts_tc): Call gsi_next (gsi) even for
3792         GIMPLE_EH_MUST_NOT_THROW cleanup.
3793         (verify_types_in_gimple_stmt): Handle GIMPLE_EH_MUST_NOT_THROW.
3795 2009-09-22  Jack Howarth  <howarth@bromo.med.uc.edu>
3797         PR middle-end/41260
3798         * gcc/config.gcc: Use darwin9.h and darwin10.h on darwin10 and later.
3799         * gcc/config/darwin10.h: Add file to pass -no_compact_unwind on
3800         LIB_SPEC for darwin10 and later since it always uses the unwinder in
3801         libSystem which is derived from the gcc 4.2.1 unwinder.
3803 2009-09-22  Dave Korn  <dave.korn.cygwin@gmail.com>
3805         PR middle-end/41357
3806         * varasm.c (default_encode_section_info): Copy TLS model into
3807         sym_ref flags regardless of backend support for TLS, for all
3808         model types except TLS_MODEL_EMULATED.
3810 2009-09-22  Dave Korn  <dave.korn.cygwin@gmail.com>
3812         PR bootstrap/41404
3813         * dwarf2out.c (mem_loc_descriptor): Punt on CONST_STRING until
3814         we can handle it correctly.
3816 2009-09-21  Gerald Pfeifer  <gerald@pfeifer.com>
3818         * doc/install.texi (os2): Remove section.
3820 2009-09-21  Gerald Pfeifer  <gerald@pfeifer.com>
3822         * doc/standards.texi (Objective-C): Adjust two URLs.
3824 2009-09-21  Giuseppe Scrivano <gscrivano@gnu.org>
3826         * tree-tailcall.c (process_assignment): Don't check if a
3827         multiplication or an addition are already present.
3828         (find_tail_calls): Combine multiple additions and multiplications.
3829         (adjust_accumulator_values): Emit accumulators.
3831 2009-09-21  Kai Tietz  <kai.tietz@onevision.com>
3833         * config/i386/i386.c (ix86_expand_epilogue): Adjust offset for
3834         xmm register restore.
3836 2009-09-21  Jan Hubicka  <jh@suse.cz>
3838         * dwarf2out.c (decl_loc_table_eq): Allow decl_loc_table to be NULL.
3839         (dwarf2out_abstract_function): NULLify decl_loc_table at begginig and
3840         restore at the end.
3842 2009-09-21  Eric Botcazou  <ebotcazou@adacore.com>
3844         * stor-layout.c (layout_type): Remove obsolete code.
3846 2009-09-20  H.J. Lu  <hongjiu.lu@intel.com>
3848         PR middle-end/41395
3849         * opts.c (decode_options): Don't turn on flag_ipa_sra for opt2.
3851 2009-09-20  Kaveh R. Ghazi  <ghazi@caip.rutgers.edu>
3853         PR middle-end/30789
3854         * builtins.c (do_mpc_arg2): Accept DO_NONFINITE parameter.
3855         (do_mpc_ckconv): Accept FORCE_CONVERT parameter.
3856         (fold_builtin_2, do_mpc_arg1): Update accordingly.
3857         * fold-const.c (const_binop): Likewise.
3858         * real.h (do_mpc_arg2): Update prototype.
3860 2009-09-20  Jan Hubicka  <jh@suse.cz>
3862         * dwarf2out.c (add_const_value_attribute): Return true if successful.
3863         (add_location_or_const_value_attribute): Rewrite using
3864         loc_list_from_tree.
3865         (tree_add_const_value_attribute): Return true if successful.
3866         (tree_add_const_value_attribute_for_decl): Likewise.
3868         * dwarf2out.c (address_of_int_loc_descriptor): Break out from ...
3869         (loc_descriptor): ... here;
3870         (loc_list_for_address_of_addr_expr_of_indirect_ref): New function.
3871         (cst_pool_loc_descr): Break out from ...; do not reffer constant
3872         pool items that was not marked for output.
3873         (loc_list_from_tree): ... here; handle special cases of ADDR_EXPR;
3874         (loc_list_for_address_of_addr_expr_of_indirect_ref): New function.
3875         (loc_list_for_address_of_addr_expr_of_indirect_ref): New function.
3876         handle ALIGN_INDIRECT_REF, MISALIGNED_INDIRECT_REF, REALPART_EXPR,
3877         IMAGPART_EXPR; handle address of INTEGER_CST; improve handling of
3878         CONSTRUCTOR; handle REAL_CST, STRING_CST, COMPLEX_CST; use
3879         DW_OP_stack_value to get address of items that are not available
3880         as addresses.
3881         (dw_loc_list): Handle single element lists correctly.
3883 2009-09-20  Kai Tietz  <kai.tietz@onevision.com>
3884             Pascal Obry  <obry@adacore.com>
3886         * unwind-dw2-fde.c (classify_object_over_fdes):
3887         Cast the constant 1 to _Unwind_Ptr.
3888         (add_fdes): Likewise.
3889         (linear_search_fdes): Likewise.
3891 2009-09-20  Eric Botcazou  <ebotcazou@adacore.com>
3893         * stor-layout.c (set_sizetype): Avoid useless type copy.
3895 2009-09-20  Richard Sandiford  <rdsandiford@googlemail.com>
3897         * configure.ac (gcc_cv_ld_mips_personality_relaxation): New
3898         feature check.
3899         (HAVE_LD_PERSONALITY_RELAXATION): New macro definition.
3900         * configure, config.in: Regenerate.
3901         * dwarf2asm.c (eh_data_format_name): Handle DW_EH_PE_indirect |
3902         DW_EH_PE_absptr.
3903         * config/mips/mips.h (TARGET_WRITABLE_EH_FRAME): New macro.
3904         (ASM_PREFERRED_EH_DATA_FORMAT): Define.  Use MIPS_EH_INDIRECT
3905         for global data if the output could be used in a shared library.
3906         * config/mips/mips.c (mips_override_options): Set flag_dwarf2_cfi_asm
3907         to 0 if TARGET_WRITABLE_EH_FRAME.
3909 2009-09-20  Paolo Bonzini <bonzini@gnu.org>
3911         PR rtl-optimization/39886
3912         * combine.c (update_cfg_for_uncondjump): Set EDGE_FALLTHRU
3913         just when insn is equal to BB_END (bb).
3915 2009-09-19  Adam Nemet  <anemet@caviumnetworks.com>
3917         * config/mips/mips.opt (mrelax-pic-calls): New option.
3918         * config/mips/mips.c (mips_strip_unspec_address): Move it up in
3919         the file.
3920         (mips_unspec_call): Change "unspec_call" expander into this.
3921         (mips_strip_unspec_call): New function.
3922         (mips_got_load): Call mips_unspec_call instead of
3923         gen_unspec_call<mode>.
3924         (mips16_build_call_stub): Fix comment for fp_code.  Adjust call to
3925         MIPS_CALL.
3926         (mips_cfg_in_reorg): New function.
3927         (mips16_lay_out_constants): Use it to decide whether to call
3928         CFG-aware insn splitting.
3929         (r10k_insert_cache_barriers): Move CFG set-up code from here to
3930         mips_reorg.  Move DF set-up code from here ...
3931         (mips_df_reorg): ... to here.  Call r10k_insert_cache_barriers
3932         from here.
3933         (mips_reorg): Call mips_df_reorg instead of
3934         r10k_insert_cache_barriers.  Move CFG set-up code here from
3935         r10k_insert_cache_barriers.
3936         (mips_call_expr_from_insn): New function.
3937         (mips_pic_call_symbol_from_set): Likewise.
3938         (mips_find_pic_call_symbol): Likewise.
3939         (mips_annotate_pic_call_expr): Likewise.
3940         (mips_get_pic_call_symbol): Likewise.
3941         (mips_annotate_pic_calls): Likewise.
3942         (mips_override_options): Disable -mrelax-pic-calls unless PIC
3943         calls are used.
3944         (mips_set_mips16_mode): Disable -mrelax-pic-calls for MIPS16.
3945         * config/mips/mips-protos.h (mips_get_pic_call_symbol): Declare it.
3946         * config/mips/mips.h (MIPS_CALL): Use it to print the .reloc
3947         directive.
3948         * config/mips/mips.md (UNSPEC_CALL_ATTR): New unspec.
3949         (unspec_call<mode>): Remove it.
3950         (sibcall_internal, sibcall_value_internal,
3951         sibcall_value_multiple_internal, call_internal, call_split,
3952         call_value_internal, call_value_split,
3953         call_value_multiple_internal, call_value_multiple_split): Pass
3954         SIZE_OPNO to MIPS_CALL.
3955         (call_internal_direct, call_direct_split,
3956         call_value_internal_direct, call_value_direct_split): Pass -1 as
3957         SIZE_OPNO to MIPS_CALL.
3958         * configure.ac <mips*-*-*>: Add test for .reloc R_MIPS_JALR.
3959         * configure: Regenerate.
3960         * doc/invoke.texi (Option Summary): Add -mrelax-pic-calls
3961         and -mno-relax-pic-calls.
3962         (MIPS Options): Document -mrelax-pic-calls and -mno-relax-pic-calls.
3964 2009-09-19  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
3966         PR bootstrap/35619
3967         * Makefile.in (stmp-fixinc): Ensure `include-fixed' is created
3968         in the directory this rule is called from, rather than the
3969         toplevel 'gcc' directory, to fix in-tree build.
3971 2009-09-19  Chris Demetriou  <cgd@google.com>
3973         PR preprocessor/28435:
3974         * c-opts.c (c_common_handle_option): For -MD and -MMD, indicate
3975         to cpplib that the preprocessor output is needed.
3977 2009-09-19  Jakub Jelinek  <jakub@redhat.com>
3979         * config/rs6000/rs6000.md (*save_gpregs_<mode>, *save_fpregs_<mode>,
3980         *restore_gpregs_<mode>, *return_and_restore_gpregs_<mode>,
3981         *return_and_restore_fpregs_<mode>,
3982         *return_and_restore_fpregs_aix_<mode>): Remove 'z' operand modifier.
3984         PR bootstrap/41397
3985         * dwarf2out.c (mem_loc_descriptor) <case SUBREG>: Recurse
3986         instead of assuming it has always a REG inside of it.
3988 2009-09-18  Gerald Pfeifer  <gerald@pfeifer.com>
3990         * config/freebsd.h: Update comment on types.
3991         (WINT_TYPE): Define.
3993 2009-09-18  Jason Merrill  <jason@redhat.com>
3995         * c.opt: Add -fno-deduce-init-list.
3997 2009-09-18  Neil Vachharajani  <nvachhar@google.com>
3999         * value-prof.c (interesting_stringop_to_profile_p): Added output
4000         argument to indicate which parameter is the size parameter.
4001         * value-prof.c (gimple_stringop_fixed_value): Use
4002         INTERESTING_STRINGOP_TO_PROFILE_P to find size argument.
4003         * value-prof.c (gimple_stringops_transform): Update call sites to
4004         INTERESTING_STRINGOP_TO_PROFILE_P to reflect parameter change.
4006 2009-09-18  Uros Bizjak  <ubizjak@gmail.com>
4008         PR target/38288
4009         From David Binderman <dcb314@hotmail.com>:
4010         * gcc/config/i386/i386.c (ix86_function_regparm): Remove useless
4011         local variable f.  Remove stale comments.
4012         (ix86_compute_frame_layout): Remove useless local variable total_size.
4013         Remove #if 0'd code.
4014         (legitimate_address_p): Remove useless local variables
4015         reason_rtx and reason.
4016         (ix86_split_copysign_const): Remove useless local variable op1.
4017         (scale_counter): Remove useless local variable piece_size_mask.
4019 2009-09-18  Jakub Jelinek  <jakub@redhat.com>
4021         * stmt.c (expand_asm_operands): Set REG_ATTRS on the temporary from
4022         output decl.
4024 2009-09-17  Michael Haubenwallner  <michael.haubenwallner@salomon.at>
4026         PR target/40913
4027         * config/pa/t-hpux-shlib: Set soname in libgcc_s.sl.
4029 2009-09-17  Jakub Jelinek  <jakub@redhat.com>
4031         * c-decl.c (finish_struct): Adjust DECL_SOURCE_LOCATION of
4032         TYPE_STUB_DECL.
4034 2009-09-17  Alexandre Oliva  <aoliva@redhat.com>
4036         * dwarf2out.c (loc_descriptor): Emit DW_OP_stack_value and
4037         DW_OP_implicit_value even without dwarf_version 4.
4039 2009-09-17  Jan Hubicka  <jh@suse.cz>
4041         * dwarf2out.c: Include tree-pass.h and gimple.h.
4042         (loc_list_plus_const): New function.
4043         (loc_descriptor_from_tree_1): Rename to ...
4044         (loc_descriptor_from_tree): ... remove original.
4045         (loc_list_from_tree): New function.
4046         (add_AT_location_description): Accept location list.
4047         (tls_mem_loc_descriptor): Update call of loc_descriptor_from_tree.
4048         (concatn_mem_loc_descriptor): Remove.
4049         (mem_loc_descriptor): Handle CONCAT/CONCATN and VAR_LOCATION by
4050         returning NULL.
4051         (secname_for_decl): Move up.
4052         (hidden_reference_p): New function; break out from ...
4053         (loc_by_refernece): ... here; move up.
4054         (dw_loc_list): New function.
4055         (single_element_loc_list): New function.
4056         (single_element_loc_list_p): New function.
4057         (add_loc_descr_to_each): New function.
4058         (add_loc_list): New function.
4059         (loc_descr_from_tree): Make wraper of loc_list_from_tree.
4060         (loc_list_from_tree): Reroganized from loc_descr_from_tree;
4061         add diagnostics why expansion failed.
4062         (add_location_or_const_value_attribute): Support location lists.
4063         (add_bound_info): Likewise.
4064         (descr_info_loc): Update call of loc_descriptor_from_tree.
4065         (gen_variable_die): Work on location lists.
4066         * final.c (pass_final): Add dump file.
4067         * Makefile.in (dwarf2out.o): Add new dependencies.
4069 2009-09-17  Janis Johnson  <janis187@us.ibm.com>
4071         PR c/41049
4072         * real.c decimal_from_integer, decimal_integer_string): New.
4073         (real_from_integer): Use them as special case for decimal float.
4074         * config/dfp-bit.c (_si_to_sd, _usi_to_sd): Use default rounding.
4075         (_di_to_sd, _di_to_dd, _di_to_td, _udi_to_sd, _udi_to_dd, _udi_to_td):
4076         Do not append zero after the decimal point in string to convert.
4078 2009-09-17  Alexander Monakov  <amonakov@ispras.ru>
4080         * graphite-sese-to-poly.c (pdr_add_data_dimensions): Add bounds only
4081         for ARRAY_REFs.  Use array_ref_{low,up}_bound to determine bounds.
4083 2009-09-17  Martin Jambor  <mjambor@suse.cz>
4085         * common.opt (fipa-sra): New switch.
4086         * opts.c (decode_options): Turn flag_ipa_sra on for opt2.
4087         * timevar.def (TV_IPA_SRA): New timevar.
4088         * params.def (ipa-sra-ptr-growth-factor): New parameter.
4089         * doc/invoke.texi: Document -fipa-sra and ipa-sra-ptr-growth-factor.
4090         * tree-sra.c: Include cgraph.c.
4091         (enum sra_mode): Added SRA_MODE_EARLY_IPA.
4092         (struct access): Added fields stmt, grp_maybe_modified, grp_scalar_ptr
4093         and grp_not_necessarilly_dereferenced.
4094         (func_param_count): New variable.
4095         (encountered_apply_args): New variable.
4096         (bb_dereferences): New variable.
4097         (final_bbs): New variable.
4098         (no_accesses_representant): New variable.
4099         (no_accesses_p): New function.
4100         (dump_access): Dump the new fields.
4101         (sra_initialize): Set encountered_apply_args to false.
4102         (get_ssa_base_param): New function.
4103         (mark_parm_dereference): New function.
4104         (create_access): Caring for INIDRECT_REFs and different handling of
4105         varialble length accesses in early IPA SRA.  Store the stmt - a new
4106         parameter - to the new access.
4107         (build_access_from_expr_1): New parameter stmt, passed to
4108         create_access.  Handle INDIRECT_REFs.
4109         (build_access_from_expr): Pass the current statement to
4110         build_access_from_expr_1.
4111         (disqualify_ops_if_throwing_stmt): Trigger only in intraprocedural
4112         passes.
4113         (build_accesses_from_assign): Pass the current statement to
4114         build_access_from_expr_1.  Do not create assign links in IPA-SRA.
4115         (scan_function): Call handle_ssa_defs on phi nodes.  Set bits in
4116         final_bbs when necessary.  Check for calls to __builtin_apply_args.
4117         Fixup EH info if anythng was changed.
4118         (is_unused_scalar_param): New function.
4119         (ptr_parm_has_direct_uses): New function.
4120         (find_param_candidates): New function.
4121         (mark_maybe_modified): New function.
4122         (analyze_modified_params): New function.
4123         (propagate_dereference_distances): New function.
4124         (dump_dereferences_table): New function.
4125         (analyze_caller_dereference_legality): New function.
4126         (unmodified_by_ref_scalar_representative): New function.
4127         (splice_param_accesses): New function.
4128         (decide_one_param_reduction): New function.
4129         (enum ipa_splicing_result): New type.
4130         (splice_all_param_accesses): New function.
4131         (get_param_index): New function.
4132         (turn_representatives_into_adjustments): New function.
4133         (analyze_all_param_acesses): New function.
4134         (get_replaced_param_substitute): New function.
4135         (get_adjustment_for_base): New function.
4136         (replace_removed_params_ssa_names): New function.
4137         (sra_ipa_reset_debug_stmts): New function.
4138         (sra_ipa_modify_expr): New function.
4139         (sra_ipa_modify_assign): New function.
4140         (convert_callers): New function.
4141         (modify_function): New function.
4142         (ipa_sra_preliminary_function_checks): New function.
4143         (ipa_early_sra): New function.
4144         (ipa_early_sra_gate): New function.
4145         (pass_early_ipa_sra): New variable.
4146         * Makefile.in (tree-sra.o): Add cgraph.h to dependencies.
4148 2009-09-17  Michael Matz  <matz@suse.de>
4150         PR middle-end/41347
4151         * tree.c (build_type_attribute_qual_variant): Export.
4152         * tree.h (build_type_attribute_qual_variant): Declare.
4153         * tree-inline.c (remap_type_1): Use it to build variants with
4154         the original qualifiers and attributes.
4156 2009-09-17  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
4158         * cfglayout.c (fixup_reorder_chain): Accept conditional jumps
4159         without a fallthrough edge.
4161 2009-09-16  DJ Delorie  <dj@redhat.com>
4163         * config/m32c/m32c.c (m32c_emit_epilogue): Check for R8C or M16C
4164         chip and ignore the "fast_interrupt" attribute if so.
4166 2009-09-16  Richard Henderson  <rth@redhat.com>
4168         PR middle-end/41360
4169         * cfgbuild.c (find_bb_boundaries): Really re-instate 2009-09-02
4170         barrier fix.
4172 2009-09-16  Richard Henderson  <rth@redhat.com>
4174         PR target/41246
4175         * tree-cfg.c (verify_gimple_call): Validate that gimple_call_chain
4176         is set only if DECL_NO_STATIC_CHAIN is unset.
4177         * tree-nested.c (iter_nestinfo_start, iter_nestinfo_next): New.
4178         (FOR_EACH_NEST_INFO): New.
4179         (walk_all_functions): Use it.
4180         (finalize_nesting_tree): Likewise.
4181         (unnest_nesting_tree): Likewise.
4182         (free_nesting_tree): Use iter_nestinfo_start, iter_nestinfo_next.
4183         (get_chain_decl, get_chain_field): Reset DECL_NO_STATIC_CHAIN.
4184         (convert_gimple_call): Early out if gimple_call_chain already set.
4185         (convert_all_function_calls): Iterate until no new functions
4186         require a static chain.
4187         (finalize_nesting_tree_1): Assert DECL_NO_STATIC_CHAIN is unset
4188         when building a trampoline.  Use dump_function_to_file instead
4189         of dump_function.
4190         (lower_nested_functions): Open dump_file.  Validate that decls
4191         that have DECL_NO_STATIC_CHAIN from the front end don't have that
4192         bit reset by this pass.
4194 2009-09-16  Michael Matz  <matz@suse.de>
4196         PR fortran/41212
4197         * tree.h (struct tree_decl_common): Add decl_restricted_flag,
4198         shorten decl_common_unused.
4199         (DECL_RESTRICTED_P): New accessor.
4200         * tree-ssa-alias.c (ptr_deref_may_alias_decl_p): Use it
4201         to disambiguate marked decls and restrict pointers.
4203 2009-09-16  Richard Henderson  <rth@redhat.com>
4205         PR middle-end/41360
4206         * cfgbuild.c (find_bb_boundaries): Re-instate 2009-09-02 barrier fix.
4208 2009-09-16  Jakub Jelinek  <jakub@redhat.com>
4210         * integrate.c (set_block_abstract_flags): Call
4211         set_decl_abstract_flags also on BLOCK_NONLOCALIZED_VARs.
4213 2009-09-16  Richard Guenther  <rguenther@suse.de>
4215         PR middle-end/34011
4216         * tree-flow-inline.h (may_be_aliased): Compute readonly variables
4217         as non-aliased.
4219 2009-09-16  DJ Delorie  <dj@redhat.com>
4220             Kaz Kojima  <kkojima@gcc.gnu.org>
4222         * config/sh/sh.c (output_stack_adjust): Add new argument frame_p.
4223         (sh_expand_prologue): Update calls to output_stack_adjust.
4224         (sh_expand_epilogue): Likewise.
4226 2009-09-15  Adam Nemet  <anemet@caviumnetworks.com>
4228         PR bootstrap/41349
4229         * reorg.c (redundant_insn): Don't count notes or DEBUG_INSNs when
4230         trying to limit the extent of searches in the insn stream.
4232 2009-09-15  Nathan Froyd  <froydnj@codesourcery.com>
4233             Jakub Jelinek  <jakub@redhat.com>
4235         PR target/41175
4236         PR target/40677
4237         * config/rs6000/rs6000.c (no_global_regs_above): Fix precedence
4238         problem.
4239         (SAVRES_NOINLINE_GPRS_SAVES_LR, SAVRES_NOINLINE_FPRS_SAVES_LR,
4240         SAVRES_NOINLINE_FPRS_DOESNT_RESTORE_LR): New strategy bits.
4241         (rs6000_savres_strategy): Always save FP registers inline if the
4242         target doesn't support hardware double-precision.  Set the above
4243         bits in return value when needed.
4244         (rs6000_savres_routine_sym): Fix computation for cache selector.
4245         Mark the generated symbol as a function.  Rename exitp argument to
4246         lr.  Move code for determining the name of the symbol...
4247         (rs6000_savres_routine_name): ...here.  New function.  Add cases for
4248         getting the names right on AIX and 64-bit Linux.
4249         (savres_routine_name): New variable.
4250         (rs6000_make_savres_rtx): Rename exitp argument to lr.  Don't assert
4251         lr isn't set when savep.  Use r12 resp. r1 instead of r11 depending
4252         on what the target routine uses as a base register.  If savep && lr
4253         describe saving of r0 into memory slot.
4254         (rs6000_emit_prologue): Correct use of call_used_regs.  Fix out of
4255         line calls for AIX ABI.
4256         (rs6000_output_function_prologue): Use rs6000_savres_routine_name to
4257         determine FP save/restore functions.
4258         (rs6000_emit_stack_reset): Handle savres if sp_offset != 0 and
4259         frame_reg_rtx != sp_reg_rtx.  Use gen_add3_insn instead of
4260         gen_addsi3.
4261         (rs6000_emit_epilogue): Adjust computation of restore_lr.
4262         Duplicate restoration of LR and execute the appropriate one
4263         depending on whether GPRs are being restored inline.  Set r11 from
4264         offsetted frame_reg_rtx instead of sp_reg_rtx; if frame_reg_rtx is
4265         r11, adjust sp_offset.  Use gen_add3_insn instead of gen_addsi3.
4266         Fix out of line calls for AIX ABI.
4267         * config/rs6000/rs6000.md (*return_and_restore_fpregs_aix_<mode>):
4268         New insn.
4269         * config/rs6000/spe.md (*save_gpregs_spe): Use explicit match for
4270         register 11.
4271         (*restore_gpregs_spe): Likewise.
4272         (*return_and_restore_gpregs_spe): Likewise.
4273         * config/rs6000/linux64.h (SAVE_FP_SUFFIX, RESTORE_FP_SUFFIX):
4274         Define to empty string unconditionally.
4275         * config/rs6000/sysv4.h (SAVE_FP_SUFFIX, RESTORE_FP_SUFFIX):
4276         Define to empty string unconditionally.
4277         (GP_SAVE_INLINE, FP_SAVE_INLINE): Handle TARGET_64BIT the same as
4278         !TARGET_64BIT.
4280 2009-09-15  Jan Hubicka  <jh@suse.cz>
4282         * doc/invoke.texi (inline-insns-auto): Drop from 60 to 50.
4283         * params.def (inline-insns-auto): Likewise.
4285 2009-09-15  Martin Jambor  <mjambor@suse.cz>
4287         * ipa-inline.c (estimate_function_body_sizes): Dump info about
4288         individual statements only at TDF_DETAILS dump level.  Format
4289         source for 80 characters per line.
4291 2009-09-15  Christian Bruel  <christian.bruel@st.com>
4293         * regrename.c (do_replace): Update REG_DEAD notes.
4295 2009-09-15  Revital Eres  <eres@il.ibm.com>
4297         * doc/tm.texi (TARGET_SUPPORT_VECTOR_MISALIGNMENT): Document.
4298         * targhooks.c (default_builtin_support_vector_misalignment):
4299         New builtin function.
4300         * targhooks.h (default_builtin_support_vector_misalignment):
4301         Declare.
4302         * target.h (builtin_support_vector_misalignment):
4303         New field in struct gcc_target.
4304         * tree-vect-data-refs.c (vect_supportable_dr_alignment): Call
4305         new builtin function.
4306         * target-def.h (TARGET_SUPPORT_VECTOR_MISALIGNMENT):
4307         Define.
4308         * config/rs6000/rs6000.c
4309         (rs6000_builtin_support_vector_misalignment): New function.
4310         (TARGET_SUPPORT_VECTOR_MISALIGNMENT): Define.
4312 2009-09-15  Jie Zhang  <jie.zhang@analog.com>
4314         * config/bfin/bfin.c (length_for_loop): Use NONDEBUG_INSN_P
4315         instead of INSN_P.
4316         (bfin_optimize_loop): Likewise.
4317         (bfin_gen_bundles): Likewise.
4318         (workaround_speculation): Likewise.
4319         (find_load): Return NULL_RTX for debug_insn.
4321 2009-09-15  Uros Bizjak  <ubizjak@gmail.com>
4323         * config/alpha/alpha.md (smaxsf3): Disable for IEEE mode.
4324         (sminsf3): Ditto.
4326 2009-09-14  DJ Delorie  <dj@redhat.com>
4328         * config/mep/mep.h (JUMP_TABLES_IN_TEXT_SECTION): Define.
4329         * config/mep/mep.c (mep_emit_cbranch): Don't use BEQZ/BNEI in
4330         VLIW mode.
4332 2009-09-14  Richard Henderson  <rth@redhat.com>
4333             Jakub Jelinek  <jakub@redhat.com>
4335         * builtins.c (expand_builtin_synchronize): Use gimple_build_asm_vec.
4336         * cfgbuild.c (make_edges): Handle asm goto.
4337         * cfglayout.c (fixup_reorder_chain): Likewise.
4338         * cfgrtl.c (patch_jump_insn): Likewise.
4339         * gimple-pretty-print.c (dump_gimple_asm): Likewise.
4340         * gimple.c (gimple_build_asm_1): Add and use nlabels parameter.
4341         (gimple_build_asm_vec): Add and use labels parameter.
4342         (gimple_build_asm): Remove.
4343         (walk_gimple_asm): Walk labels too.
4344         * gimple.def (GIMPLE_ASM): Update docs.
4345         * gimple.h: Update decls.
4346         (struct gimple_statement_asm): Change nc to use unsigned char;
4347         add nl member.
4348         (gimple_asm_nlabels): New.
4349         (gimple_asm_label_op, gimple_asm_set_label_op): New.
4350         * gimplify.c (gimplify_asm_expr): Copy labels from ASM_EXPR
4351         into gimple_build_asm_vec.
4352         * jump.c (mark_jump_label_asm): New.
4353         (mark_jump_label): Use it.
4354         (redirect_jump_1): Handle asm goto.
4355         (invert_jump_1): Soft fail if X is null.
4356         * recog.c (extract_asm_operands): New.
4357         (asm_noperands): Use it; handle asm labels.
4358         (decode_asm_operands): Use extract_asm_operands.
4359         (asm_operand_ok): Properly handle empty string.
4360         * reg-stack.c (get_asm_operands_in_out): Rename from
4361         get_asm_operand_n_inputs; use extract_asm_operands; return both
4362         inputs and outputs by reference; update all callers.
4363         * rtl.def (ASM_OPERANDS): Add label vector as operand 6.
4364         * rtl.h (ASM_OPERANDS_LABEL_VEC): New.
4365         (ASM_OPERANDS_LABEL_LENGTH, ASM_OPERANDS_LABEL): New.
4366         (ASM_OPERANDS_SOURCE_LOCATION): Renumber.
4367         (extract_asm_operands): Declare.
4368         * stmt.c (expand_asm_operands): Add and use labels parameter.
4369         (check_unique_operand_names): Likewise.
4370         (resolve_asm_operand_names, resolve_operand_name_1): Likewise.
4371         (expand_asm_stmt): Handle asm labels.
4372         * tree-cfg.c (make_gimple_asm_edges): New.
4373         (make_edges): Use it.
4374         (cleanup_dead_labels): Handle asm labels.
4375         (is_ctrl_altering_stmt): Likewise.
4376         (gimple_redirect_edge_and_branch): Likewise.
4377         * tree.def (ASM_EXPR): Add 5th operand.
4378         * tree.h (ASM_LABELS): New.
4379         (resolve_asm_operand_names): Update decl.
4381         * c-parser.c (c_parser_asm_statement): Parse asm goto.
4382         (c_parser_asm_goto_operands): New.
4383         * c-tree.h (build_asm_expr): Update decl.
4384         * c-typeck.c (build_asm_expr): Add and use labels parameter.
4385         * doc/extend.texi: Document asm goto.
4387 2009-09-14  Richard Henderson  <rth@redhat.com>
4389         * except.h: Update declarations.
4390         (struct pointer_map_t): Forward declare.
4391         (ERT_UNKNOWN, ERT_THROW, ERT_CATCH): Remove.
4392         (struct eh_landing_pad_d, eh_landing_pad): New.
4393         (struct eh_catch_d, eh_catch): New.
4394         (struct eh_region_d): Remove next_region_sharing_label, aka,
4395         label, tree_label, landing_pad, post_landing_pad, resume,
4396         may_contain_throw.  Rename region_number to index.  Remove
4397         u.eh_catch, u.eh_throw.  Rename u.eh_try.eh_catch to first_catch.
4398         Add u.must_not_throw, landing_pads, exc_ptr_reg, filter_reg.
4399         (VEC(eh_landing_pad,gc)): New.
4400         (struct eh_status): Remove last_region_number.  Add lp_array,
4401         throw_stmt_table, ttype_data, ehspec_data.
4402         (ehr_next, FOR_ALL_EH_REGION_AT): New.
4403         (FOR_ALL_EH_REGION_FN, FOR_ALL_EH_REGION): New.
4404         * except.c (lang_protect_cleanup_actions): Return tree.
4405         (struct ehl_map_entry): Remove.
4406         (init_eh_for_function): Push zero entries for region and lp_array.
4407         (gen_eh_region): Add to region_array immediately.
4408         (gen_eh_region_catch): Operate on eh_catch objects.
4409         (gen_eh_landing_pad): New.
4410         (get_eh_region_may_contain_throw, get_eh_region_tree_label): Remove.
4411         (get_eh_region_no_tree_label, set_eh_region_tree_label): Remove.
4412         (get_eh_region_from_number, get_eh_region_from_number_fn): New.
4413         (get_eh_landing_pad_from_number_fn): New.
4414         (get_eh_landing_pad_from_number): New.
4415         (get_eh_region_from_lp_number_fn): New.
4416         (get_eh_region_from_lp_number): New.
4417         (expand_resx_stmt, note_eh_region_may_contain_throw): Remove.
4418         (get_exception_pointer, get_exception_filter): Remove.
4419         (collect_eh_region_array, can_be_reached_by_runtime): Remove.
4420         (current_function_has_exception_handlers): Simplify.
4421         (bring_to_root, eh_region_replaceable_by_p): Remove.
4422         (replace_region, hash_type_list, hash_eh_region): Remove.
4423         (eh_regions_equal_p, merge_peers, remove_unreachable_regions): Remove.
4424         (label_to_region_map, num_eh_regions): Remove.
4425         (get_next_region_sharing_label, must_not_throw_labels): Remove.
4426         (find_exception_handler_labels): Remove.
4427         (duplicate_eh_regions_0, find_prev_try): Remove.
4428         (struct duplicate_eh_regions_data): New.
4429         (duplicate_eh_regions_1): Rewrite.
4430         (duplicate_eh_regions): Return a pointer map instead of an
4431         integer offset.
4432         (copy_eh_region_1, copy_eh_region, push_reachable_handler): Remove.
4433         (redirect_eh_edge_to_label): Remove.
4434         (eh_region_outermost): Rewrite using eh_region pointers
4435         instead of integers.
4436         (add_ttypes_entry): Update for ttype_data move to eh_status.
4437         (add_ehspec_entry): Rewrite with VEC instead of varray.
4438         (assign_filter_values): Likewise.  Export.
4439         (build_post_landing_pads, connect_post_landing_pads): Remove.
4440         (dw2_build_landing_pads): Rewrite to use lp_array.
4441         (struct sjlj_lp_info, sjlj_find_directly_reachable_regions): Remove.
4442         (sjlj_assign_call_site_values): Rewrite to use lp_array.
4443         (sjlj_emit_dispatch_table, sjlj_build_landing_pads): Likewise.
4444         (sjlj_mark_call_sites): Update for landing pad numbers.
4445         (finish_eh_generation): Rewrite.
4446         (gate_handle_eh): Do nothing for no eh tree.
4447         (pass_rtl_eh): Move up near finish_eh_generation.
4448         (remove_eh_landing_pad): New.
4449         (remove_eh_handler): Export.
4450         (remove_eh_region, remove_eh_handler_and_replace): Remove.
4451         (for_each_eh_label): Rewrite to use lp_array.
4452         (make_reg_eh_region_note): New.
4453         (make_reg_eh_region_note_nothrow_nononlocal): New.
4454         (insn_could_throw_p): New.
4455         (copy_reg_eh_region_note_forward): New.
4456         (copy_reg_eh_region_note_backward): New.
4457         (check_handled, add_reachable_handler): Remove.
4458         (reachable_next_level, foreach_reachable_handler): Remove.
4459         (arh_to_landing_pad, arh_to_label, reachable_handlers): Remove.
4460         (get_eh_region_and_lp_from_rtx): New.
4461         (get_eh_region_from_rtx): New.
4462         (can_throw_internal_1, can_throw_external_1): Remove.
4463         (can_throw_internal): Use get_eh_region_from_rtx.
4464         (can_throw_external): Use get_eh_region_and_lp_from_rtx.
4465         (insn_nothrow_p, can_nonlocal_goto): New.
4466         (expand_builtin_eh_common, expand_builtin_eh_pointer): New.
4467         (expand_builtin_eh_filter, expand_builtin_eh_copy_values): New.
4468         (add_action_record): Use VEC not varray.
4469         (collect_one_action_chain): Update for eh_region changes.
4470         (convert_to_eh_region_ranges): Make static.  Use VEC not varray.
4471         Use get_eh_region_and_lp_from_rtx.
4472         (gate_convert_to_eh_region_ranges): New.
4473         (pass_convert_to_eh_region_ranges): Use it.
4474         (push_uleb128, push_sleb128): Use VEC not varray.
4475         (output_one_function_exception_table): Likewise.
4476         (dump_eh_tree): Update for eh_region changes.
4477         (verify_eh_tree): Likewise.
4478         (verify_eh_region, default_init_unwind_resume_libfunc): Remove.
4479         * tree-eh.c: Include target.h.
4480         (add_stmt_to_eh_lp_fn): Rename from add_stmt_to_eh_region_fn.
4481         Don't disallow GIMPLE_RESX; adjust argument check.
4482         (add_stmt_to_eh_lp): Rename from add_stmt_to_eh_region.
4483         (record_stmt_eh_region): Update for landing pad numbers;
4484         generate a landing pad if necessary.
4485         (remove_stmt_from_eh_lp): Rename from remove_stmt_from_eh_region.
4486         (remove_stmt_from_eh_lp_fn): Similarly.
4487         (lookup_stmt_eh_lp_fn): Rename from lookup_stmt_eh_region_fn.
4488         Update for lp numbers; don't special case missing throw_stmt_table.
4489         (lookup_expr_eh_lp): Similarly.
4490         (lookup_stmt_eh_lp): Rename from lookup_stmt_eh_region.
4491         (eh_seq, eh_region_may_contain_throw): New.
4492         (struct leh_state): Add ehp_region.
4493         (struct leh_tf_state): Remove eh_label.
4494         (emit_post_landing_pad): New.
4495         (emit_resx, emit_eh_dispatch): New.
4496         (note_eh_region_may_contain_throw): New.
4497         (frob_into_branch_around): Take eh_region not eh label;
4498         emit eh code into eh_seq.
4499         (honor_protect_cleanup_actions): Early exit for no actions.  Don't
4500         handle EXC_PTR_EXPR, FILTER_EXPR.  Use gimple_build_eh_must_not_throw,
4501         lower_eh_must_not_throw.  Emit code to eh_seq.
4502         (lower_try_finally_nofallthru): Emit eh code to eh_seq.
4503         (lower_try_finally_onedest): Likewise.
4504         (lower_try_finally_copy): Likewise.
4505         (lower_try_finally_switch): Likewise.
4506         (lower_try_finally): Initialize ehp_region.
4507         (lower_catch): Update for eh_catch objects.
4508         (lower_eh_filter): Don't handle must_not_throw.
4509         (lower_eh_must_not_throw): New.
4510         (lower_cleanup): Don't set eh_label.
4511         (lower_eh_constructs_2): Resolve eh builtins.
4512         Handle GIMPLE_EH_MUST_NOT_THROW.
4513         (lower_eh_constructs): Initialize eh_region_may_contain_throw.
4514         Add eh_seq to the end of the function body.
4515         (make_eh_dispatch_edges): New.
4516         (make_eh_edge): Remove.
4517         (make_eh_edges): Simplify for landing pads.
4518         (redirect_eh_edge_1): New.
4519         (redirect_eh_edge): Use it.
4520         (redirect_eh_dispatch_edge): New.
4521         (stmt_could_throw_p): Use a switch.  Allow RESX.
4522         (stmt_can_throw_external): Use lookup_stmt_eh_lp.
4523         (stmt_can_throw_internal): Likewise.
4524         (maybe_clean_eh_stmt_fn, maybe_clean_eh_stmt): New.
4525         (maybe_clean_or_replace_eh_stmt): Update for landing pads.
4526         (maybe_duplicate_eh_stmt_fn, maybe_duplicate_eh_stmt): New.
4527         (gate_refactor_eh): New.
4528         (pass_refactor_eh): Use it.
4529         (lower_resx, execute_lower_resx, pass_lower_resx): New.
4530         (lower_eh_dispatch, execute_lower_eh_dispatch): New.
4531         (gate_lower_ehcontrol, pass_lower_eh_dispatch): New.
4532         (remove_unreachable_handlers): Rename from
4533         tree_remove_unreachable_handlers; rewrite for landing pads;
4534         call remove_eh_handler directly.
4535         (remove_unreachable_handlers_no_lp): New.
4536         (unsplit_eh, unsplit_all_eh): New.
4537         (tree_empty_eh_handler_p, all_phis_safe_to_merge): Remove.
4538         (cleanup_empty_eh_merge_phis, cleanup_empty_eh_move_lp): New.
4539         (cleanup_empty_eh_unsplit): New.
4540         (cleanup_empty_eh): Rewrite.
4541         (cleanup_all_empty_eh): New.
4542         (execute_cleanup_eh): Rename from cleanup_eh.  Remove unreachable
4543         handlers first.  Use unsplit_all_eh, cleanup_all_empty_eh.
4544         (gate_cleanup_eh): New.
4545         (pass_cleanup_eh): Use it.
4546         (verify_eh_edges): Move later in file.  Expect one EH edge.
4547         (verify_eh_dispatch_edge): New.
4549         * Makefile.in (FUNCTION_H): Use vecprim.h, not varray.h.
4550         (gtype-desc.o): Add TARGET_H.
4551         (tree.o): Use EXCEPT_H, not except.h.
4552         (cfgbuild.o): Add EXPR_H.
4553         (GTFILES): Add vecprim.h.
4554         * builtins.c (expand_builtin): Handle BUILT_IN_EH_POINTER,
4555         BUILT_IN_EH_FILTER, BUILT_IN_EH_COPY_VALUES.
4556         * builtins.def (BUILT_IN_UNWIND_RESUME, BUILT_IN_EH_POINTER,
4557         BUILT_IN_EH_FILTER, BUILT_IN_EH_COPY_VALUES): New.
4558         * calls.c (emit_call_1): Use make_reg_eh_region_note.
4559         * cfgbuild.c (control_flow_insn_p): Use can_nonlocal_goto; tidy
4560         calls to can_throw_internal.
4561         (rtl_make_eh_edge): Use get_eh_landing_pad_from_rtx.
4562         (make_edges): Don't handle RESX; use can_nonlocal_goto.
4563         * cfgexpand.c (expand_gimple_stmt_1): Don't handle RESX.
4564         (expand_gimple_stmt): Use make_reg_eh_region_note.
4565         (expand_debug_expr): Don't handle EXC_PTR_EXPR and FILTER_EXPR.
4566         (gimple_expand_cfg): Don't call convert_from_eh_region_ranges,
4567         or find_exception_handler_labels.
4568         * cfgrtl.c (rtl_verify_flow_info_1): Don't handle RESX.  Assert
4569         there is exacly one EH edge.  Use can_nonlocal_goto and
4570         can_throw_internal.
4571         * cgraphunit.c (update_call_expr): Use maybe_clean_eh_stmt_fn.
4572         (cgraph_materialize_all_clones): Use maybe_clean_or_replace_eh_stmt.
4573         * combine.c (can_combine_p, try_combine): Use insn_nothrow_p.
4574         * cse.c (count_reg_usage, insn_live_p): Use insn_could_throw_p.
4575         * dce.c (deletable_insn_p_1): Don't test may_trap_p.
4576         (deletable_insn_p): Use insn_nothrow_p; reorder nonjump insn test.
4577         * dse.c (scan_insn): Use insn_could_throw_p.
4578         * emit-rtl.c (try_split): Use copy_reg_eh_region_note_backward.
4579         * expr.c (expand_expr_real): Use make_reg_eh_region_note.
4580         (expand_expr_real_1): Don't handle RESX, EXC_PTR, or FILTER_EXPR.
4581         * fold-const.c (tree_expr_nonnegative_warnv_p): Don't handle
4582         EXC_PTR_EXPR or FILTER_EXPR.
4583         (tree_expr_nonzero_warnv_p): Likewise.
4584         * function.h: Include vecprim.h, not varray.h
4585         (struct rtl_eh): Remove filter, exc_ptr, built_landing_pad members;
4586         move ttype_data and ehspec_data members to struct eh_status; change
4587         action_record_data member to a VEC.
4588         * gcse.c (hash_scan_set): Use can_throw_internal.
4589         * gengtype.c (open_base_files): Add target.h to gtype-desc.c.
4590         * gimple-iterator.c (gsi_replace): Use maybe_clean_or_replace_eh_stmt.
4591         * gimple-low.c (lower_stmt): Handle GIMPLE_EH_MUST_NOT_THROW.
4592         (block_may_fallthru): Don't handle RESX_EXPR.
4593         * gimple-pretty-print.c (dump_gimple_label): Dump EH_LANDING_PAD_NR.
4594         (dump_gimple_eh_must_not_throw, dump_gimple_eh_dispatch): New.
4595         (dump_gimple_stmt): Dump landing pad information with TDF_EH;
4596         handle GIMPLE_EH_MUST_NOT_THROW, GIMPLE_EH_DISPATCH.
4597         * gimple.c (gss_for_code): Handle GIMPLE_EH_MUST_NOT_THROW,
4598         GIMPLE_EH_DISPATCH, GIMPLE_RESX.
4599         (gimple_size): Likewise.
4600         (gimple_build_eh_dispatch, gimple_build_eh_must_not_throw): New.
4601         (gimple_build_resx): Use gimple_build_with_ops.
4602         (DEFTREECODE): Don't handle EXC_PTR_EXPR, FILTER_EXPR.
4603         (is_gimple_val): Likewise.
4604         (is_gimple_stmt): Remove RESX_EXPR.
4605         * gimple.def (GIMPLE_EH_MUST_NOT_THROW, GIMPLE_EH_DISPATCH): New.
4606         (GIMPLE_RESX): Reorder with other EH constructs.
4607         * gimple.h (struct gimple_statement_eh_mnt): New.
4608         (struct gimple_statement_eh_ctrl): Rename from gimple_statement_resx.
4609         (gimple_eh_filter_must_not_throw): Remove.
4610         (gimple_eh_filter_set_must_not_throw): Remove.
4611         (gimple_eh_must_not_throw_fndecl): New.
4612         (gimple_eh_dispatch_region, gimple_eh_dispatch_set_region): New.
4613         (is_gimple_resx): New.
4614         * gimplify.c (gimplify_expr): Don't handle EXC_PTR_EXPR, RESX_EXPR.
4615         Don't copy EH_FILTER_MUST_NOT_THROW.
4616         * gsstruct.def (GSS_EH_MNT, GSS_EHCONTROL): New.
4617         * ipa-inline.c (estimate_function_body_sizes): Don't try to
4618         handle must_not_throw_labels specially.
4619         * ipa-pure-const.c (check_call): Update debug statement for LP.
4620         * ipa-type-escape.c (check_operand): Don't handle EXC_PTR or FILTER.
4621         * ipa-utils.c (get_base_var): Likewise.
4622         * libfunc.h (LTI_unwind_resume, unwind_resume_libfunc): Remove.
4623         * lower-subreg.c (move_eh_region_note): Remove.
4624         (resolve_simple_move): Use copy_reg_eh_region_note_forward.
4625         * omp-low.c (new_omp_context): Update for eh_lp_nr.
4626         (create_task_copyfn): Likewise.
4627         (maybe_catch_exception): Use gimple_build_eh_filter.
4628         * optabs.c (emit_libcall_block): Update test for no-nonlocal-goto
4629         REG_EH_REGION.  Use make_reg_eh_region_note_nothrow_nononlocal.
4630         * passes.c (init_optimization_passes): Add pass_lower_eh_dispatch
4631         and pass_lower_resx.
4632         * print-tree.c (print_node): Dump EH_LANDING_PAD_NR.
4633         * recog.c (peephole2_optimize): Use copy_reg_eh_region_note_backward,
4634         can_throw_internal, can_nonlocal_goto.
4635         * reload1.c (fixup_eh_region_note): Use insn_could_throw_p,
4636         copy_reg_eh_region_note_forward.
4637         (emit_input_reload_insns): Use copy_reg_eh_region_note_forward.
4638         (emit_output_reload_insns): Likewise.
4639         (copy_eh_notes): Remove.
4640         * rtl.def (RESX): Remove.
4641         * rtl.h: Update declarations.
4642         * sese.c (graphite_copy_stmts_from_block): Use maybe_duplicate_eh_stmt.
4643         * tree-cfg.c (make_edges): Handle GIMPLE_EH_DISPATCH.
4644         (update_eh_label): Remove.
4645         (cleanup_dead_labels_eh): New.
4646         (cleanup_deal_labels): Use it instead of update_eh_label.
4647         (gimple_merge_blocks): Update landing pad data structure when
4648         removing a landing pad label.
4649         (remove_useless_stmts_tc): Remove gimple_eh_filter_must_not_throw
4650         test; handle GIMPLE_EH_MUST_NOT_THROW.
4651         (is_ctrl_altering_stmt): Handle GIMPLE_EH_DISPATCH.
4652         (verify_gimple_assign_single): Don't handle EXC_PTR or FILTER_EXPR.
4653         (verify_types_in_gimple_stmt): Handle GIMPLE_EH_DISPATCH.
4654         (verify_stmt): Likewise.  Verify landing pads.
4655         (gimple_redirect_edge_and_branch): Handle GIMPLE_EH_DISPATCH.
4656         (gimple_duplicate_bb): Use maybe_duplicate_eh_stmt.
4657         (struct move_stmt_d): Add eh_map.
4658         (move_stmt_eh_region_nr, move_stmt_eh_region_tree_nr): New.
4659         (move_stmt_r): Remap eh region numbers in builtin calls,
4660         resx and eh_dispatch.
4661         (move_block_to_fn): Remove eh_offset parameter.  Use
4662         maybe_duplicate_eh_stmt_fn.
4663         (find_outermost_region_in_block): Operate on eh_region pointers
4664         instead of region numbers.
4665         (move_sese_region_to_fn): Expect eh_map instead of eh_offset from
4666         duplicate_eh_regions.
4667         * tree-cfgcleanup.c (tree_forwarder_block_p): Move entry block edge
4668         test earlier.  Disallow EH landing pads.
4669         * tree-cfa.c (create_tree_common_ann): Don't set ann->rn.
4670         * tree-flow.h: Update declarations.
4671         (struct tree_ann_common_d): Replace rn with lp_nr.
4672         * tree-inline.c (copy_tree_body_r): Don't handle RESX_EXPR.
4673         (remap_eh_region_nr, remap_eh_region_tree_nr): New.
4674         (remap_gimple_stmt): Remap eh region numbers in builtin calls,
4675         resx and eh_dispatch.
4676         (copy_bb): Use maybe_duplicate_eh_stmt_fn.
4677         (copy_edges_for_bb): Use make_eh_dispatch_edges.
4678         (copy_cfg_body): Expect eh_map instead of eh_region_offset
4679         from duplicate_eh_regions.
4680         (estimate_num_insns): Don't handle EXC_PTR_EXPR or FILTER_EXPR;
4681         update RESX; handle EH_DISPATCH.
4682         (expand_call_inline): Set eh_lp_nr, not eh_region.
4683         (maybe_inline_call_in_expr): Likewise.
4684         * tree-inline.h (struct copy_body_data): Replace eh_region with
4685         eh_lp_nr, eh_region_offset with eh_map.
4686         * tree-optimize.c (execute_fixup_cfg): Use maybe_clean_eh_stmt.
4687         * tree-pass.h (pass_lower_eh_dispatch, pass_lower_resx): New.
4688         * tree-pretty-print.c (dump_generic_node): Don't handle
4689         EXC_PTR_EXPR, FILTER_EXPR, RESX_EXPR.
4690         * tree-sra.c (scan_function): Use maybe_clean_eh_stmt.
4691         * tree-ssa-alias.c (ref_maybe_used_by_call_p_1): Don't handle
4692         EXC_PTR_EXPR, FILTER_EXPR.
4693         * tree-ssa-operands.c (get_expr_operands): Likewise.
4694         * tree-ssa-propagate.c (valid_gimple_rhs_p): Likewise.
4695         * tree-ssa-sccvn.c (copy_reference_ops_from_ref): Likewise.
4696         (ao_ref_init_from_vn_reference): Likewise.
4697         * tree-ssa-sink.c (statement_sink_location): Likewise.
4698         * tree-ssa-dce.c (mark_stmt_if_obviously_necessary): Likewise.
4699         (mark_virtual_phi_result_for_renaming): Export.  Tidy.
4700         * tree-ssa-pre.c (get_or_alloc_expr_for): Don't handle
4701         EXC_PTR_EXPR, FILTER_EXPR.
4702         (is_exception_related): Remove.
4703         (compute_avail): Don't call it.
4704         * tree-ssa-structalias.c: Remove VEC definitions for int and unsigned.
4705         * tree.c (find_decls_types_in_eh_region): Update for eh_region changes.
4706         (find_decls_types_in_node): Use FOR_ALL_EH_REGION_FN.
4707         (build_common_builtin_nodes): Add enable_cxa_end_cleanup parameter.
4708         Build EH builtins.
4709         (build_resx): Remove.
4710         * tree.def (EXC_PTR_EXPR, FILTER_EXPR, RESX_EXPR): Remove.
4711         * tree.h: Update declarations.
4712         (EH_FILTER_MUST_NOT_THROW): Remove.
4713         (struct tree_label_decl): Add eh_landing_pad_nr.
4714         (EH_LANDING_PAD_NR): New.
4715         * value-prof.c (gimple_ic): Tidy variable names.  Update for
4716         landing pad numbers.
4717         (gimple_stringop_fixed_value): Tidy variable names.  Assert
4718         that neither call stmt can throw.
4719         * vecprim.h (uchar): New.
4720         (VEC(uchar,heap), VEC(uchar,gc)): New.
4722         * c-common.c (c_define_builtins): Update call to
4723         build_common_builtin_nodes.
4724         * c-parser.c (c_parse_file): Don't call
4725         default_init_unwind_resume_libfunc.
4727 2009-09-14  Richard Sandiford  <rdsandiford@googlemail.com>
4729         * config/mips/mips-protos.h (mips_cfun_has_cprestore_slot_p): Declare.
4730         (mips_cprestore_address_p): Likewise.
4731         (mips_save_gp_to_cprestore_slot): Likewise.
4732         (mips_restore_gp): Rename to...
4733         (mips_restore_gp_from_cprestore_slot): ...this.
4734         (mips_must_initialize_gp_p): Declare.
4735         (mips_emit_save_slot_move): Likewise.
4736         (mips_output_load_label): Return nothing.
4737         (mips_eh_uses): Declare.
4738         * config/mips/mips.h (TARGET_SPLIT_CALLS): Require epilogue_completed.
4739         (TARGET_CPRESTORE_DIRECTIVE): New macro.
4740         (TARGET_ABSOLUTE_JUMPS): Likewise.
4741         (EH_USES): Likewise.
4742         (FIRST_PSEUDO_REGISTER): Update comment.
4743         (MIPS_ABSOLUTE_JUMP): New macro, extracted from...
4744         (MIPS_CALL): ...here.
4745         (REGISTER_NAMES): Add $cprestore.
4746         * config/mips/mips.c (machine_function): Remove has_gp_insn_p.
4747         Add load_label_length, has_inflexible_gp_insn_p,
4748         has_flexible_gp_insn_p, must_initialize_gp_p and
4749         must_restore_gp_when_clobbered_p.
4750         (mips_expand_call): Don't generate split instructions here.
4751         (mips_split_call): Update the call to mips_restore_gp after
4752         the above name change.
4753         (mips16_cfun_returns_in_fpr_p): Move earlier in file.
4754         (mips_find_gp_ref): New function.
4755         (mips_insn_has_inflexible_gp_ref_p): Likewise.
4756         (mips_cfun_has_inflexible_gp_ref_p): Likewise.
4757         (mips_insn_has_flexible_gp_ref_p): Likewise.
4758         (mips_cfun_has_flexible_gp_ref_p): Likewise.
4759         (mips_function_has_gp_insn): Delete.
4760         (mips_global_pointer): Drop the df_regs_ever_live_p check.
4761         Use the new functions above.  Only return INVALID_REGNUM
4762         for TARGET_ABSOLUTE_JUMPS.
4763         (mips_must_initialize_gp_p): New function.
4764         (mips_get_cprestore_base_and_offset): New function, extracted from...
4765         (mips_cprestore_slot): ...here.  Take a bool parameter.
4766         (mips_cfun_has_cprestore_slot_p): New function.
4767         (mips_cprestore_address_p): Likewise.
4768         (mips_save_gp_to_cprestore_slot): Likewise.
4769         (mips_restore_gp): Rename to...
4770         (mips_restore_gp_from_cprestore_slot): ...this.  Assert
4771         epilogue_completed.  Update the call to mips_cprestore_slot.
4772         Test cfun->machine->must_restore_gp_when_clobbered_p.
4773         (mips_direct_save_slot_move_p): New function.
4774         (mips_emit_save_slot_move): Likewise.
4775         (mips_output_cplocal): Test mips_must_initialize_gp_p () instead
4776         of cfun->machine->global_pointer.
4777         (mips_output_function_prologue): Check mips_must_initialize_gp_p ().
4778         (mips_save_reg): Use mips_emit_save_slot_move.
4779         (mips_expand_prologue): Set must_initialize_gp_p.
4780         Use mips_cfun_has_cprestore_slot_p.  Use gen_potential_cprestore
4781         for all cprestore saves.  Emit a use_cprestore instruction after
4782         setting up the cprestore slot.
4783         (mips_restore_reg): Use mips_emit_save_slot_move.
4784         (mips_process_load_label): New function.
4785         (mips_load_label_length): Likewise.
4786         (mips_output_load_label): Don't return asm: output it here instead.
4787         Use mips_process_load_label.
4788         (mips_adjust_insn_length): Adjust the length of branch instructions
4789         that have length MAX_PIC_BRANCH_LENGTH.
4790         (mips_output_conditional_branch): Update the call to
4791         mips_output_load_label.  Assume the branch target is OPERANDS[0]
4792         rather than OPERANDS[1].  Use MIPS_ABSOLUTE_JUMP for absolute jumps.
4793         (mips_output_order_conditional_branch): Swap the meaning of
4794         OPERANDS[0] and OPERANDS[1].
4795         (mips_variable_issue): Don't count ghost instructions.
4796         (mips_expand_ghost_gp_insns): New function.
4797         (mips_reorg): Rerun mips_reorg_process_insns if it returns true.
4798         (mips_output_mi_thunk): Set must_initialize_gp_p.
4799         (mips_eh_uses): New function.
4800         * config/mips/predicates.md (cprestore_save_slot_operand)
4801         (cprestore_load_slot_operand): New predicates.
4802         * config/mips/mips.md (UNSPEC_POTENTIAL_CPRESTORE): New unspec.
4803         (UNSPEC_MOVE_GP): Likewise.
4804         (UNSPEC_CPRESTORE, UNSPEC_RESTORE_GP, UNSPEC_EH_RETURN)
4805         (UNSPEC_CONSTTABLE_INT, UNSPEC_CONSTTABLE_FLOAT): Bump to make room.
4806         (CPRESTORE_SLOT_REGNUM): New register.
4807         (MAX_PIC_BRANCH_LENGTH): New constant.
4808         (jal_macro): Use MIPS_ABSOLUTE_JUMPS.
4809         (length): Use MAX_PIC_BRANCH_LENGTH as a placeholder for PIC long
4810         branches.  Fix commentary.
4811         (loadgp_newabi_<mode>): Change from unspec_volatile to unspec.
4812         Only split if mips_must_initialize_gp_p; expand to nothing otherwise.
4813         Change type to "ghost".
4814         (loadgp_absolute_<mode>): Likewise.
4815         (loadgp_rtp_<mode>): Likewise.
4816         (copygp_mips16): Likewise.
4817         (loadgp_blockage): Remove redundant mode attribute.
4818         (potential_cprestore): New instruction.
4819         (cprestore): Turn into an unspec set.
4820         (use_cprestore): New instruction.
4821         (*branch_fp): Swap operands 0 and 1.  Remove redundant mode attribute.
4822         (*branch_fp_inverted): Likewise.
4823         (*branch_order<mode>): Likewise.
4824         (*branch_order<mode>_inverted): Likewise.
4825         (*branch_equality<mode>): Likewise.
4826         (*branch_equality<mode>_inverted): Likewise.
4827         (*branch_bit<bbv><mode>): Likewise.
4828         (*branch_bit<bbv><mode>_inverted): Likewise.
4829         (*branch_equality<mode>_mips16): Remove redundant mode.
4830         (jump): Turn into a define_expand.
4831         (*jump_absolute): New instruction.
4832         (*jump_pic): Likewise.
4833         (*jump_mips16): Rename previously-unnamed pattern.  Remove
4834         redundant mode attribute.
4835         (restore_gp): Split on epilogue_completed rather than
4836         reload_completed.  Change type to "ghost".
4837         (move_gp<mode>): New instruction.
4838         * config/mips/mips-dsp.md (mips_bposge): Swap operands 0 and 1.
4839         Remove redundant mode attribute.
4840         * config/mips/mips-ps-3d.md (bc1any4t): Likewise.
4841         (bc1any4f, bc1any2t, bc1any2f): Likewise.
4842         (*branch_upper_lower, *branch_upper_lower_inverted): Likewise.
4844 2009-09-14  Michael Meissner  <meissner@linux.vnet.ibm.com>
4846         PR target/41210
4847         * config/rs6000/rs6000.c (rs6000_function_value): V2DF and V2DI
4848         are returned in the same register (vs34 or v2) that Altivec vector
4849         types are returned in.
4850         (rs6000_libcall_value): Ditto.
4852         PR target/41331
4853         * config/rs6000/rs6000.c (rs6000_emit_move): Use gen_add3_insn
4854         instead of explicit addsi3/adddi3 calls.
4855         (rs6000_split_multireg_move): Ditto.
4856         (rs6000_emit_allocate_stack): Ditto.
4857         (rs6000_emit_prologue): Ditto.
4858         (rs6000_output_mi_thunk): Ditto.
4860         * config/rs6000/rs6000.md (bswapdi*): Don't assume the pointer
4861         size is 64 bits if we can use 64-bit registers.
4863 2009-09-14  Bernd Schmidt  <bernd.schmidt@analog.com>
4865         * config/bfin/bfin.c (bfin_longcall_p): Don't use short calls for weak
4866         symbols.
4868         From Jie Zhang <jie.zhang@analog.com>:
4869         * config/bfin/bfin.c (bfin_expand_prologue): Ask do_link to
4870         save FP and RETS with saveall attribute.
4871         (bfin_expand_epilogue): Ask do_unlink to restore FP and RETS
4872         with saveall attribute.
4874         * config/bfin/bfin.c (bfin_expand_builtin,
4875         case BFIN_BUILTIN_MULT_1X32X32): Force constants to registers for the
4876         operands.
4878         From Jie Zhang <jie.zhang@analog.com>:
4879         * config/bfin/bfin.c (bfin_expand_builtin): Initialize icodes
4880         before use in two places.
4881         * config/bfin/bfin.md (AREG): Define mode iterator.
4882         (reload_in, reload_out): Use mode iterator AREG.
4884 2009-09-14  Richard Guenther  <rguenther@suse.de>
4886         PR middle-end/41350
4887         * dwarf2out.c (dwarf2out_begin_prologue): Adjust non-CFI asm
4888         EH personality path.
4890 2009-09-13  Richard Guenther  <rguenther@suse.de>
4891             Rafael Avila de Espindola  <espindola@google.com>
4893         * langhooks-def.h (LANG_HOOKS_EH_RUNTIME_TYPE): Define.
4894         (LANG_HOOKS_EH_PERSONALITY): Likewise.
4895         (LANG_HOOKS_INITIALIZER): Adjust.
4896         (lhd_pass_through_t): Declare.
4897         * langhooks.h (struct lang_hooks): Add eh_runtime_type and
4898         eh_personality.
4899         * langhooks.c (lhd_pass_through_t): New function.
4900         * dwarf2out.c (output_call_frame_info, dwarf2out_do_cfi_startproc,
4901         dwarf2out_begin_prologue): Use personality from current_function_decl.
4902         * expr.h (get_personality_function): Declare.
4903         * expr.c (get_personality_function): New function.
4904         (build_personality_function): Likewise.
4905         * libfuncs.h (libfunc_index): Remove LTI_eh_personality.
4906         (eh_personality_libfunc): Remove.
4907         * optabs.c (build_libfunc_function): New function split out from ...
4908         (init_one_libfunc): ... here.
4909         * tree.h (DECL_FUNCTION_PERSONALITY): New.
4910         (tree_function_decl): Add personality.
4911         (lhd_gcc_personality): Declare.
4912         (build_personality_function): Likewise.
4913         * tree.c (gcc_eh_personality_decl): New.
4914         (lhd_gcc_personality): New function.
4915         * except.h (lang_eh_runtime_type): Remove.
4916         (enum eh_personality_kind): New.
4917         (build_personality_function): Declare.
4918         (function_needs_eh_personality): Declare.
4919         * except.c (lang_eh_runtime_type): Remove.
4920         (function_needs_eh_personality): New function.
4921         (add_type_for_runtime): Call lang_hooks.type_for_runtime instead.
4922         (sjlj_emit_function_enter, output_function_exception_table):
4923         Use personality from current_function_decl.
4924         * tree-eh.c (lower_eh_constructs): Set DECL_FUNCTION_PERSONALITY.
4925         * tree-inline.c (tree_can_inline_p): Do not inline across different
4926         EH personalities.
4927         (expand_call_inline): Likewise.  Adjust the callers EH personality.
4928         (tree_function_versioning): Copy DECL_FUNCTION_PERSONALITY.
4929         * cgraph.c (cgraph_add_new_function): Set DECL_FUNCTION_PERSONALITY.
4930         * Makefile.in (cgraph.o): Add $(EXCEPT_H) dependency.
4931         (c-parser.o): Likewise
4932         * c-tree.h (c_eh_initialized_p): Remove.
4933         (c_maybe_initialize_eh): Likewise.
4934         * c-decl.c (finish_decl): Don't call c_maybe_initialize_eh.
4935         (finish_decl): Don't call c_maybe_initialize_eh.
4936         (c_eh_initialized_p): Remove.
4937         (c_maybe_initialize_eh): Likewise.
4938         * c-parser.c (c_parser_omp_construct): Likewise.
4939         (c_parse_file): Initialize exception handling.
4941 2009-09-13  Kai Tietz  <kai.tietz@onevision.com>
4943         * config.gcc (tm_file): Remove i386/biarch32.h
4944         for i?86-w64-mingw* case.
4945         (i?86-*-mingw* andx86_64-*-mingw*): Add multilib
4946         support.
4947         * config.host: Set for x64 mingw the option
4948         use_long_long_for_widest_fast_int to yes.
4950 2009-09-13  Eric Botcazou  <ebotcazou@adacore.com>
4952         * tree.h (DECL_IGNORED_P): Document further effect for FUNCTION_DECL.
4953         * dbxout.c (dbxout_function_end): Do not test DECL_IGNORED_P.
4954         (dbxout_begin_function): Likewise.
4955         * final.c (dwarf2_debug_info_emitted_p): New predicate.
4956         (final_start_function): Do not emit debug info if DECL_IGNORED_P is
4957         set on the function.
4958         (final_end_function): Likewise.
4959         (final_scan_insn): Likewise.
4960         (rest_of_handle_final): Likewise.
4961         * varasm.c (assemble_start_function): Likewise.
4962         * config/rs6000/xcoff.h (ASM_DECLARE_FUNCTION_NAME): Likewise.
4964 2009-09-12  Jason Merrill  <jason@redhat.com>
4966         * dbgcnt.c (dbg_cnt_process_single_pair): constify.
4967         * opts.c (common_handle_option): constify.
4969 2009-09-12  Gerald Pfeifer  <gerald@pfeifer.com>
4971         * doc/install.texi (avr): Remove obsolete reference site.
4973 2009-09-12  Gerald Pfeifer  <gerald@pfeifer.com>
4975         * doc/install.texi (Binaries): Adjust AIX link.
4977 2009-09-12  Akim Demaille  <demaille@gostai.com>
4979         * doc/invoke.texi (-fstrict-aliasing): Correct two examples.
4980         Use an imperative sentence.
4982 2009-09-11  Richard Henderson  <rth@redhat.com>
4984         * gsstruct.def (DEFGSSTRUCT): Remove printable-name argument; add
4985         structure-name and has-tree-operands arguments; update all entries.
4986         * gimple.def (DEFGSCODE): Replace 3rd argument with GSS_symbol;
4987         update all entries.
4988         * gimple.c (gimple_ops_offset_): Use HAS_TREE_OP argument.
4989         (gsstruct_code_size): New.
4990         (gss_for_code_): New.
4991         (gss_for_code): Remove.
4992         (gimple_size): Rewrite using gsstruct_code_size.
4993         (gimple_statement_structure): Move to gimple.h.
4994         * gimple.h (gimple_ops_offset_, gss_for_code_): Declare.
4995         (gss_for_code, gimple_statement_structure): New.
4996         (gimple_ops): Use new arrays; tidy.
4998 2009-09-11  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
5000         * config/pa/predicates.md (symbolic_operand): Require a CONST symbolic
5001         operand to be a PLUS expression.
5002         * config/pa/pa.c (pa_secondary_reload): Likewise.
5004 2009-09-11  Jakub Jelinek  <jakub@redhat.com>
5006         * combine.c (propagate_for_debug_subst): Call wrap_constant on top.
5008         * print-rtl.c (print_rtx): Use JUMP_LABEL (in_rtx) instead of
5009         XEXP (in_rtx, 8).
5011 2009-09-11  Bernd Schmidt  <bernd.schmidt@analog.com>
5013         From Jie Zhang <jie.zhang@analog.com>:
5014         * doc/extend.texi (node Function Attributes): Document l2
5015         function attribute.
5016         (node Blackfin Variable Attributes): Document l2 variable attributes.
5018 2009-09-11  Loren J. Rittle  <ljrittle@acm.org>
5020         * config.gcc (*-*-freebsd*): Enable default_use_cxa_atexit
5021         to match the system compiler's configuration at inflection point.
5022         Add comment to remark a remaining difference with system compiler.
5024         * configure.ac (*-*-freebsd*): Enable check for __stack_chk_fail.
5025         * configure: Regenerate.
5027 2009-09-11  Bernd Schmidt  <bernd.schmidt@analog.com>
5029         From Jie Zhang <jie.zhang@analog.com>:
5030         * config/bfin/bfin.c (bfin_expand_call): Handle L2 functions.
5031         (bfin_handle_l2_attribute): New.
5032         (bfin_attribute_table): Add l2 attribute.
5034 2009-09-11  Michael Matz  <matz@suse.de>
5036         PR middle-end/41275
5037         * tree-inline.c (remap_decls): Don't put DECL_EXTERNAL decls
5038         on the local_decls list.
5040 2009-09-11  Alexandre Oliva  <aoliva@redhat.com>
5042         PR debug/41276
5043         PR debug/41307
5044         * cselib.c (cselib_expand_value_rtx_cb): Document callback
5045         interface.
5046         (cselib_expand_value_rtx_1): Use callback for SUBREGs.  Adjust
5047         for VALUEs, to implement the documented interface.
5048         * var-tracking.c (vt_expand_loc_callback): Handle SUBREGs.
5049         Adjust for VALUEs and anything else, to implement the
5050         documented interface.
5052 2009-09-10  Nathan Froyd  <froydnj@codesourcery.com>
5054         * config/rs6000/rs6000.h (DATA_ALIGNMENT): Check that we are dealing
5055         with actual SPE/paired vector modes before using 64-bit alignment.
5056         Check that TYPE is a REAL_TYPE for TARGET_E500_DOUBLE.
5058 2009-09-10  DJ Delorie  <dj@redhat.com>
5060         * config/mep/mep.md (eh_epilogue): Defer until after epilogue is
5061         emitted.
5063         * config/mep/mep.h (LEGITIMATE_CONSTANT_P): New.
5064         * config/mep/mep.c (mep_legitimate_constant_p): New.
5065         * config/mep/mep-protos.h: Prototype it.
5067 2009-09-10  Richard Henderson  <rth@redhat.com>
5069         * print-rtl.c (print_rtx): Fix JUMP_LABEL index.
5071 2009-09-10  Jason Merrill  <jason@redhat.com>
5073         * tree.c (chain_index): New fn.
5074         * tree.h: Declare it.
5076 2009-09-10  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
5078         * config/sol2-c.c (cmn_err_length_specs): Initialize
5079         scalar_identity_flag.
5081 2009-09-10  Richard Henderson  <rth@redhat.com>
5083         * tree.h (struct tree_decl_common): Move align member earlier;
5084         move label_decl_uid member ...
5085         (struct tree_label_decl): ... here.
5086         (LABEL_DECL_UID): Update to match.
5088         * tree-cfg.c (dump_function_to_file): Dump eh tree with TDF_EH,
5089         not TDF_DETAILS.
5091         * tree-cfg.c (gimple_redirect_edge_and_branch): Do
5092         gimple_try_redirect_by_replacing_jump test after no-op and EH tests.
5094         * tree-cfg.c (split_edge_bb_loc): Don't disallow placement at
5095         dest_prev if the edge is complex.
5097         * tree-cfg.c (is_ctrl_stmt): Use a switch.
5099         * tree-cfg.c (gimple_can_merge_blocks_p): Move label and
5100         loop latch tests earlier.
5102         * gimple-iterator.c (gimple_find_edge_insert_loc): Insert
5103         before GIMPLE_RETURN, not after its predecessor; insert
5104         before GIMPLE_RESX.
5106         * gimple-iterator.c (gimple_find_edge_insert_loc): Use
5107         gimple_seq_empty_p to test for no PHI nodes.
5108         * tree-cfg.c (split_critical_edges): Likewise.
5110         * c-common.h (c_dialect_cxx, c_dialect_objc): Boolify.
5112 2009-09-10  Hariharan Sandanagobalane  <hariharan@picochip.com>
5114         * final.c (shorten_branches) : Ignore DEBUG_INSN_P instructions
5115         introduced by the VTA branch merge.
5117 2009-09-10  Uros Bizjak  <ubizjak@gmail.com>
5119         * ira-conflicts.c: Use fputs or putc instead of fprintf
5120         where appropriate.
5121         * cfg.c: Ditto.
5122         * toplev.c: Ditto.
5123         * tree-switch-conversion.c: Ditto.
5125 2009-09-10  Hariharan Sandanagobalane  <hariharan@picochip.com>
5127         * config/picochip/picochip.c : Ignore DEBUG_INSN_P instructions
5128         introduced by the VTA branch merge.
5130 2009-09-10  Uros Bizjak  <ubizjak@gmail.com>
5132         Revert:
5133         2009-09-09  Uros Bizjak  <ubizjak@gmail.com>
5135         PR rtl-optimization/39779
5136         * expr.c (convert_modes): Return when mode == oldmode after
5137         CONST_INTs are processed.
5139 2009-09-10  Nick Clifton  <nickc@redhat.com>
5141         * config/mep/mep.c (mep_encode_section_info): Copy weakness
5142         attribute and referring decl when creating renamed symbol.
5144 2009-09-10  Richard Guenther  <rguenther@suse.de>
5146         PR middle-end/41257
5147         * cgraphunit.c (cgraph_emit_thunks): Emit thunks only for
5148         reachable nodes.
5149         (cgraph_finalize_compilation_unit): Compute reachability
5150         before emitting thunks.  Properly process aliases before
5151         possibly removing unreachable nodes.
5153 2009-09-10  Richard Guenther  <rguenther@suse.de>
5155         PR middle-end/41254
5156         * tree.c (struct free_lang_data_d): Add worklist member.
5157         (find_decls_types_r): Push onto the worklist instead of recursing.
5158         Handle TREE_BINFOs properly.
5159         (find_decls_types): New function wrapped around find_decls_types_r
5160         to process the worklist.
5161         (find_decls_types_in_eh_region): Use it.
5162         (find_decls_types_in_node): Likewise.
5163         (find_decls_types_in_var): Likewise.
5164         (free_lang_data_in_cgraph): Likewise.  Free the worklist.
5165         * tree.h (RECORD_OR_UNION_TYPE_P): New.
5166         (AGGREGATE_TYPE_P): Adjust.
5168 2009-09-09  Jason Merrill  <jason@redhat.com>
5170         * configure.ac: Check glibc version even if we have an in-tree
5171         assembler.
5173 2009-09-09  Anthony Green  <green@moxielogic.com>
5175         * config/moxie/moxie.md (*movsi, *movhi, *movqi): Use xor to load
5176         the constant 0 when appropriate.
5177         * config/moxie/constraints.md: Add constraint O.
5179         * config/moxie/moxie.c (moxie_setup_incoming_varargs): Adjust
5180         to pass up to 6 32-bit argument values in registers.
5181         (moxie_function_arg): Ditto.
5182         (moxie_arg_partial_bytes): Ditto.
5183         * config/moxie/moxie.h (FUNCTION_ARG_ADVANCE): Ditto.
5184         (REG_PARM_STACK_SPACE): Ditto.
5185         (FUNCTION_ARG_REGNO_P): Ditto.
5187         * config/moxie/moxie.c (moxie_expand_prologue): Use dec
5188         instruction to allocate stack space.
5190 2009-09-09  Segher Boessenkool  <segher@kernel.crashing.org>
5192         * config/rs6000/rs6000.md (bswapdi2_64bit): Fix
5193         unnecessarily stringent constraints.  Fix address
5194         calculation in the splitters.
5196 2009-09-09  Uros Bizjak  <ubizjak@gmail.com>
5198         PR rtl-optimization/39779
5199         * expr.c (convert_modes): Return when mode == oldmode after
5200         CONST_INTs are processed.
5202 2009-09-09  Kai Tietz  <kai.tietz@onevision.com>
5204         PR/41315
5205         * config/i386.c (ix86_can_use_return_insn_p): Check for padding0, too.
5206         (ix86_expand_prologue): Take frame.padding0 into logic of
5207         to_allocate checks.
5208         (ix86_expand_epilogue): Likewise.
5210 2009-09-09  Jakub Jelinek  <jakub@redhat.com>
5212         * config/t-slibgcc-elf-ver (SHLIB_MAKE_SOLINK, SHLIB_INSTALL_SOLINK):
5213         New variables.
5214         (SHLIB_LINK, SHLIB_INSTALL): Use them.
5215         * config/t-slibgcc-libgcc: New file.
5216         * config.gcc (powerpc*-*-linux*, powerpc*-*-gnu*): Use it.
5218 2009-09-09  Martin Jambor  <mjambor@suse.cz>
5220         PR tree-optimization/41089
5221         * tree-sra.c (find_var_candidates): Do not consider va_lists in
5222         early SRA.
5224 2009-09-09  Richard Henderson  <rth@redhat.com>
5226         * gimple.h (CASE_GIMPLE_OMP): New.
5227         (is_gimple_omp): Use it.
5228         * tree-cfg.c (is_ctrl_altering_stmt): Likewise.
5229         (verify_gimple_debug): Likewise.
5231 2009-09-09  Richard Guenther  <rguenther@suse.de>
5233         PR tree-optimization/41101
5234         * tree-ssa-pre.c (maximal_set): Remove.
5235         (compute_antic_aux): Treat the maximal set as implicitly all ones.
5236         Defer all blocks we didn't visit at least one successor.
5237         (add_to_exp_gen): Do not add to the maximal set.
5238         (make_values_for_phi): Likewise.
5239         (compute_avail): Likewise.
5240         (init_pre): Do not allocate the maximal set.
5241         (execute_pre): Do not dump it.
5243 2009-09-09  Martin Jambor  <mjambor@suse.cz>
5245         * tree-cfg.c (verify_gimple_phi): Check that gimple_phi_result is
5246         an SSA_NAME rather than a is_gimple_variable.
5248 2009-09-09  Richard Guenther  <rguenther@suse.de>
5250         PR middle-end/41317
5251         * tree-ssa-ccp.c (maybe_fold_offset_to_component_ref): Remove
5252         code dealing with plain pointer bases.
5253         (maybe_fold_offset_to_reference): Likewise.
5254         (maybe_fold_stmt_addition): Adjust.
5256 2009-09-09  Richard Guenther  <rguenther@suse.de>
5258         * tree.c (free_lang_data_in_type): Do not free the type variant
5259         chains.
5260         (free_lang_data): Merge char_type_node with its properly signed
5261         variant.
5262         (pass_ipa_free): Collect after freeing language specific data.
5264 2009-09-09  Michael Matz  <matz@suse.de>
5266         PR middle-end/41268
5267         * cfgexpand.c (expand_gimple_stmt_1): Use an int for storing
5268         SUBREG_PROMOTED_UNSIGNED_P, instead of a bool.
5269         * rtl.h (struct rtx, SUBREG_PROMOTED_UNSIGNED_P): Update comments
5270         to reflect reality.
5272 2009-09-08  DJ Delorie  <dj@redhat.com>
5274         * config/mep/mep.c (conversions[]): Add "ml" pattern.
5276 2009-09-04  Jason Merrill  <jason@redhat.com>
5278         * tree.c (tree_find_value): Remove.
5279         * tree.h: Remove prototype.
5280         * varasm.c (assemble_external): Use value_member instead.
5282 2009-09-08  Alexandre Oliva  <aoliva@redhat.com>
5284         * toplev.c (process_options): Choose default debugging type when
5285         gtoggle enables debug info and type is unset.
5287 2009-09-08  Alexandre Oliva  <aoliva@redhat.com>
5289         PR debug/41276
5290         PR debug/41307
5291         * cselib.c (cselib_expand_value_rtx_1): Don't return copy of
5292         invalid subreg.
5294 2009-09-08  Alexandre Oliva  <aoliva@redhat.com>
5296         * configure: Rebuilt with modified libtool.m4.
5298 2009-09-08  Alexandre Oliva  <aoliva@redhat.com>
5300         PR debug/41229
5301         PR debug/41291
5302         PR debug/41300
5303         * tree-ssa.c (execute_update_addresses_taken): Update debug insns.
5305 2009-09-08  Alexandre Oliva  <aoliva@redhat.com>
5307         * tree-ssa-loop-ivopts.c (get_phi_with_result): Remove.
5308         (remove_statement): Likewise.
5309         (rewrite_use_nonlinear_expr): Adjust.
5310         (remove_unused_ivs): Collect SSA NAMEs to remove and call...
5311         * tree-ssa.c (release_defs_bitset): ... this.  New.
5312         * tree-flow.h (release_defs_bitset): Declare.
5314 2009-09-08  Alexandre Oliva  <aoliva@redhat.com>
5316         PR debug/41232
5317         * tree-ssa-phiopt.c (minmax_replacement): Skip debug stmts
5318         in the middle block.
5320 2009-09-08  Kai Tietz  <kai.tietz@onevision.com>
5322         * tree-ssa-reassoc.c (find_operand_rank): Cast pointer
5323         via intptr_t to long type.
5324         (insert_operand_rank): Cast long type via intptr_t to
5325         pointer type.
5326         * genattrtab.c (RTL_HASH): Use intptr_t to cast from
5327         pointer to scalar.
5328         * c-pretty-print.c (pp_c_tree_decl_identifier): Cast
5329         from pointer to unsigned via uintptr_t.
5331         * configure.ac (GCC_STDINT_TYPES): Initialize intptr_t,
5332         uintptr_t, HAVE_INTTYPES_H, HAVE_STDINT_H, HAVE_UINTPTR_T,
5333         and HAVE_INTPTR_T.
5334         * configure: Regenerated.
5335         * config.in: Regenerated
5336         * system.h (stdint.h): Add include.
5337         (inttypes.h): Likewise.
5338         * Makefile.in (aclocal): Add config/stdint.m4.
5339         * aclocal.m4: Regenerated.
5341 2009-09-08  Bernd Schmidt  <bernd.schmidt@analog.com>
5343         * config/bfin/bfin.c (np_check_regno, np_after_branch): New static
5344         variables.
5345         (note_np_check_stores): New function.
5346         (harmless_null_pointer_p): New function.
5347         (trapping_loads_p): New args NP_REG and AFTER_NP_BRANCH.  Callers
5348         changed.  Take into account whether we're in the shadow of a condjump
5349         that tested NP_REG for NULL.
5350         Lose all code that tested for SEQUENCEs.
5351         (workaround_speculation): Avoid inserting NOPs for loads that are
5352         either always executed or a NULL pointer.
5354 2009-09-08  Jan Hubicka  <jh@suse.cz>
5356         * doc/invoke.texi (early-inlining-insns): Reduce from 12 to 8.
5357         * params.def (early-inlining-insns): Likewise.
5359 2009-09-08  Jakub Jelinek  <jakub@redhat.com>
5361         PR rtl-optimization/41239
5362         * sched-int.h (struct deps): Add last_function_call_may_noreturn field.
5363         * sched-rgn.c (deps_join): Join also last_function_call_may_noreturn
5364         lists.
5365         * sched-deps.c (sched_analyze_insn): Prevent moving trapping insns
5366         across calls, as the calls might not always return normally.
5367         (call_may_noreturn_p): New function.
5368         (deps_analyze_insn): Update last_function_call_may_noreturn list.
5369         (init_deps): Initialize it.
5370         (remove_from_deps): Also remove calls from
5371         last_function_call_may_noreturn list.
5373 2009-09-07  Richard Henderson  <rth@redhat.com>
5375         * tree-ssa-sccvn.c (vn_reference_lookup_3): Don't assume there are
5376         more VR->OPERANDS than LHS operands.  Free LHS before returning.
5378 2009-09-07  Bernd Schmidt  <bernd.schmidt@analog.com>
5380         * config/bfin/bfin.md (UNSPEC_VOLATILE_STALL): New constant.
5381         (attr "addrtype"): New member "spreg".
5382         Use it if mem_spfp_address_operand is true for the address.
5383         (attr "type"): New entry "stall".
5384         (cpu_unit "load"): New.
5385         (insn_reservations "load32", "loadp", "loadi"): Add reservation of
5386         "load".
5387         (insn_reservation "loadsp"): New.
5388         (insn_reservation "load_stall1"): New.
5389         (insn_reservation "load_stall3"): New.
5390         (stall): New insn.
5391         * config/bfin/predicates.md (const1_operand, const3_operand): New.
5392         (mem_p_address_operand): Exclude stack and frame pointer based
5393         addresses.
5394         (mem_spfp_address_operand): New; match them here.
5395         * config/bfin/bfin.c (add_sched_insns_for_speculation): New function.
5396         (bfin_reorg): Call it if scheduling insns.
5397         (bfin_gen_bundles): Remove dummy insns created by
5398         add_sched_insns_for_speculation.
5400         From Jie Zhang <jie.zhang@analog.com>:
5401         * config/bfin/bfin-protos.h (enum bfin_cpu_type, bfin_cpu_type,
5402         bfin_si_revision, bfin_workarounds): Move these ...
5403         * config/bfin/bfin.h: ... here.
5405         From Mike Frysinger  <michael.frysinger@analog.com>
5406         * config/bfin/bfin-protos.h (bfin_cpu_type): Add BFIN_CPU_BF542M,
5407         BFIN_CPU_BF544M, BFIN_CPU_BF547M, BFIN_CPU_BF548M, and BFIN_CPU_BF549M.
5408         * config/bfin/bfin.c (bfin_cpus[]): Add 0.3 for bf542m, bf544m,
5409         bf547m, bf548m, and bf549m.
5410         * config/bfin/bfin.h (TARGET_CPU_CPP_BUILTINS): Define __ADSPBF542M__
5411         for BFIN_CPU_BF542M, __ADSPBF544M__ for BFIN_CPU_BF544M,
5412         __ADSPBF547M__ for BFIN_CPU_BF547M, __ADSPBF548M__ for
5413         BFIN_CPU_BF548M, and __ADSPBF549M__ for BFIN_CPU_BF549M.
5414         * config/bfin/t-bfin-elf (MULTILIB_MATCHES): Select bf532-none for
5415         bf542m-none, bf544m-none, bf547m-none, bf548m-none, and bf549m-none.
5416         * config/bfin/t-bfin-linux (MULTILIB_MATCHES): Likewise.
5417         * config/bfin/t-bfin-uclinux (MULTILIB_MATCHES): Likewise.
5418         * doc/invoke.texi (Blackfin Options): Document that -mcpu now accepts
5419         bf542m, bf544m, bf547m, bf548m, and bf549m.
5421         From Jie Zhang <jie.zhang@analog.com>:
5422         * config/bfin/predicates.md (p_register_operand): New predicate.
5423         (dp_register_operand): New predicate.
5424         * config/bfin/bfin-protos.h (WA_05000074): Define.
5425         (ENABLE_WA_05000074): Define.
5426         * config/bfin/bfin.c (bfin_cpus[]): Add WA_05000074 for all cpus.
5427         (bfin_gen_bundles): Put dsp32shiftimm instruction in slot[0].
5428         * config/bfin/bfin.md (define_attr type): Add dsp32shiftimm.
5429         (define_attr addrtype): Allow load/store register to be P register.
5430         (define_attr storereg): New.
5431         (define_cpu_unit anomaly_05000074): New.
5432         (define_insn_reservation dsp32shiftimm): New.
5433         (define_insn_reservation dsp32shiftimm_anomaly_05000074): New.
5434         (define_insn_reservation loadp): Cannot use slot2.
5435         (define_insn_reservation loadsp): Cannot use slot2.
5436         (define_insn_reservation storep): Cannot use slot2. Does not
5437         apply when working around 05000074.
5438         (define_insn_reservation storep_anomaly_05000074): New.
5439         (define_insn_reservation storei): Does not apply when working
5440         around 05000074.
5441         (define_insn_reservation storei_anomaly_05000074): New.
5442         (define_attr length): Add dsp32shiftimm case.
5443         (define_insn movsi_insn32, movsi_insv, ashlsi3_insn, ashrsi3,
5444         ror_one, rol_one, lshrsi3, lshrpdi3, ashrpdi3, movhiv2hi_low,
5445         movhiv2hi_high, composev2hi, packv2hi, movv2hi_hi,
5446         ssashiftv2hi3, ssashifthi3, ssashiftsi3, lshiftv2hi3, lshifthi3):
5447         Set type as dsp32shiftimm for dsp32shiftimm alternatives.
5449 2009-09-07  Martin Jambor  <mjambor@suse.cz>
5451         PR middle-end/41282
5452         * tree-sra.c (create_artificial_child_access): Return NULL if
5453         build_ref_for_offset fails.
5454         (propagate_subacesses_accross_link): Allow build_ref_for_offset
5455         and create_artificial_child_access to fail.
5457 2009-09-06  Dmitry Gorbachev  <d.g.gorbachev@gmail.com>
5459         PR c++/41214
5460         * unwind-dw2.c (uw_init_context_1): Mark noinline.
5461         * config/ia64/unwind-ia64.c (uw_init_context_1): Likewise.
5462         * config/xtensa/unwind-dw2-xtensa.c (uw_init_context_1): Likewise.
5464 2009-09-07  Bernd Schmidt  <bernd.schmidt@analog.com>
5466         * config/bfin/bfin.c (bfin_optimize_loop): When creating a new basic
5467         block, ensure it has an exit edge.  Emit a barrier after a jump.
5469 2009-09-07  Nick Clifton  <nickc@redhat.com>
5471         * gcc.c (this_is_linker_script): New variable.  Like
5472         this_is_library_file but for the %T constructor.
5473         (end_going_arg): If this_is_linker_script is set then locate the
5474         script and insert a --script switch before it
5475         (do_spec_2): Initialise this_is_linker_script.
5476         (do_spec_1): Likewise.  Handle %T construct.
5477         (eval_spec_function): Preserve this_is_linker_script.
5478         * doc/invoke.texi: Document %T construct in spec files.
5479         * config/m32c/m32c.h (LIB_SPEC): Use it.
5481 2009-09-07  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
5483         * rtl.h (PREFETCH_SCHEDULE_BARRIER_P): New macro.
5484         * sched-deps.c (sched_analyze_2): Make prefetches a hard barrier
5485         when volatile flag is set.
5486         * doc/rtl.texi (PREFETCH_SCHEDULE_BARRIER_P): Add documentation pieces.
5488 2009-09-06  Eric Botcazou  <ebotcazou@adacore.com>
5490         PR bootstrap/41241
5491         * combine-stack-adj.c (try_apply_stack_adjustment): Handle stores.
5492         (combine_stack_adjustments_for_block): Allow insns between stack
5493         adjustments and stores with corresponding pre-(dec|inc)rement or
5494         pre-modify operation.
5496 2009-09-06  Jakub Jelinek  <jakub@redhat.com>
5498         PR bootstrap/41241
5499         * combine-stack-adj.c (struct csa_memlist): Rename to...
5500         (struct csa_reflist): ... this.  Rename mem field to ref.
5501         (free_csa_memlist): Rename to...
5502         (free_csa_reflist): ... this.
5503         (record_one_stack_memref): Rename to...
5504         (record_one_stack_ref): ... this.  Handle also REG_P.
5505         (try_apply_stack_adjustment): Handle also REG_P.
5506         (struct record_stack_memrefs_data): Rename to...
5507         (struct record_stack_refs_data): ... this.  Rename memlist field to
5508         reflist.
5509         (record_stack_memrefs): Rename to...
5510         (record_stack_refs): ... this.  For DEBUG_INSNs keep traversing
5511         subexpressions instead of failing when a MEM contains SP references.
5512         For SP itself in DEBUG_INSNs queue it also onto reflist chain.
5513         (combine_stack_adjustments_for_block): Adjust for mem to ref renaming.
5515 2009-09-06  Richard Guenther  <rguenther@suse.de>
5517         PR middle-end/41144
5518         * tree.c (build_array_type): Do not record types marked
5519         with structural equality in the canonical type hashtable.
5521 2009-09-06  Richard Guenther  <rguenther@suse.de>
5523         PR middle-end/41261
5524         * tree-ssa-alias.c (refs_may_alias_p_1): Bail out for function decls.
5526 2009-09-05  Richard Guenther  <rguenther@suse.de>
5528         PR middle-end/41181
5529         * tree-ssa-ccp.c (maybe_fold_stmt_addition): Use the correct type.
5531 2009-09-05  Richard Guenther  <rguenther@suse.de>
5533         PR debug/41273
5534         * tree-ssa-operands.c (get_tmr_operands): Pass through opf_no_vops.
5536 2009-09-05  Richard Guenther  <rguenther@suse.de>
5538         PR middle-end/41271
5539         * tree-ssa.c (useless_type_conversion_p): Drop qualifiers
5540         before comparing function argument types.
5542 2009-09-05  Francois-Xavier Coudert  <fxcoudert@gcc.gnu.org>
5544         PR target/41024
5545         * config/i386/mingw-w64.h (ASM_SPEC): Pass -v instead of -V to
5546         the assembler.
5548 2009-09-04  Uros Bizjak  <ubizjak@gmail.com>
5550         Revert:
5551         2009-08-18  Uros Bizjak  <ubizjak@gmail.com>
5553         * config/alpha/alpha.c (alpha_output_mi_thunk_osf): Allocate insn
5554         locators before emit_insn is called.
5556 2009-09-04  Vladimir Makarov  <vmakarov@redhat.com>
5558         PR bootstrap/41241
5559         * ira.c (update_equiv_reg): Revert my previous patch for the PR.
5560         * reginfo.c (resize_reg_info): Call allocate_reg_info if necessary.
5561         (reginfo_init): Don't call allocate_reg_info.
5563 2009-09-04  Uros Bizjak  <ubizjak@gmail.com>
5565         PR target/41262
5566         * config/alpha/alpha.c (alpha_does_function_need_gp): Use
5567         NONDEBUG_INSN_P instead of INSN_P.
5569 2009-09-04  Alexandre Oliva  <aoliva@redhat.com>
5571         PR debug/41225
5572         * tree-vect-stmts.c (vect_stmt_relevant_p): Skip debug uses.
5574 2009-09-04  Alexandre Oliva  <aoliva@redhat.com>
5576         PR target/41252
5577         * config/arm/vfp.md (*cmpdf_split_vfp): Fix src mode in the second
5578         pattern of the split.
5580 2009-09-04  Alexandre Oliva  <aoliva@redhat.com>
5582         * toplev.c (process_options): Move setter of flag_var_tracking
5583         before other tests that depend on it.  Move down setter of
5584         flag_rename_registers.  Don't enable var-tracking-assignments
5585         by default if selective scheduling is enabled.  Warn if both
5586         are enabled.
5588 2009-09-04  Alexandre Oliva  <aoliva@redhat.com>
5590         * var-tracking.c (dv_is_decl_p): Adjust NULL behavior to match
5591         comment.  Use switch statement to catch overlaps between rtx
5592         and tree codes.  Accept FUNCTION_DECLs in addition to those in...
5593         (IS_DECL_CODE): ... here. Remove.
5594         (check_value_is_not_decl): Remove.
5595         (dv_from_decl, dv_from_value): Check after conversion.
5597 2009-09-04  Richard Guenther  <rguenther@suse.de>
5599         PR middle-end/41257
5600         * (cgraph_finalize_compilation_unit): Move finalizing aliases
5601         after emitting tunks.  Move emitting thunks and ctors from ...
5602         (cgraph_optimize): ... here.  Remove redundant
5603         cgraph_analyze_functions.
5604         * varasm.c (find_decl_and_mark_needed): Remove no longer
5605         necessary check.
5606         (finish_aliases_1): Adjust check for thunk aliases.
5608 2009-09-04  Daniel Gutson  <dgutson@codesourcery.com>
5610         * config/arm/arm.md (ctzsi2): Added braces
5611         to avoid warning that broke booststrap.
5613 2009-09-04  Martin Jambor  <mjambor@suse.cz>
5615         PR tree-optimization/41112
5616         * tree-sra.c (build_ref_for_offset_1): Signal that we cannot
5617         handle variable-bounded arrays.
5618         (expr_with_var_bounded_array_refs_p): New function.
5619         (analyze_access_subtree): Call expr_with_var_bounded_array_refs_p.
5621 2009-09-04  Wolfgang Gellerich  <gellerich@de.ibm.com>
5623         * config/s390/2097.md: Removed two incorrect bypasses.
5624         (z10_fsimpdf): Fixed latency.
5625         (z10_fhex): New insn_reservation.
5626         (z10_floaddf): Fixed latency.
5627         (z10_floadsf): Fixed latency.
5628         (z10_ftrunctf): Fixed latency.
5629         (z10_ftruncdf): Fixed latency.
5630         * config/s390/s390.c (z10_cost): Fixed values.
5631         (s390_adjust_priority): Added z10 path.
5632         * config/s390/s390.md (type): Added fhex.
5633         (*mov<mode>_64dfp): Updated type attribute.
5634         (*mov<mode>_64): Updated type attribute.
5635         (*mov<mode>_31): Updated type attribute.
5636         (*mov<mode>"): Likewise.
5637         * config/s390/2084.md (x_fsimpdf): Updated condition.
5639 2009-09-04  Andreas Krebbel  <krebbel1@de.ibm.com>
5641         * config/s390/s390.md ("*fmadd<mode>", "*fmsub<mode>"): Enable mem
5642         RTXs in the predicate for operand 1.
5644 2009-09-03  Daniel Gutson  <dgutson@codesourcery.com>
5646         * config/arm/arm.md (UNSPEC_RBIT): New constant.
5647         (rbitsi2): New insn.
5648         (ctzsi2): New expand.
5649         * config/arm/arm.h (CTZ_DEFINED_VALUE_AT_ZERO): New macro.
5651 2009-09-03  Martin Jambor  <mjambor@suse.cz>
5653         * tree-sra.c (duplicate_expr_for_different_base): Removed.
5654         (create_artificial_child_access): Use build_ref_for_offset instead
5655         of duplicate_expr_for_different_base.
5656         (propagate_subacesses_accross_link): Likewise.
5658 2009-09-03  Richard Sandiford  <rdsandiford@googlemail.com>
5660         * config/mips/mips.c (USEFUL_INSN_P): Use NONDEBUG_INSN_P instead
5661         of INSN_P.
5662         (mips16e_collect_argument_saves): Skip debug instructions.
5663         (mips_74k_agen_init): Use CALL_P || JUMP_P instead of !NONJUMP_INSN_P.
5664         (mips16_lay_out_constants): Use USEFUL_INSN_P instead of INSN_P.
5665         (r10k_insert_cache_barriers): Likewise.
5666         (mips_reorg_process_insns): Likewise.
5668 2009-09-03  Vladimir Makarov  <vmakarov@redhat.com>
5670         PR bootstrap/41241
5671         * ira.c (update_equiv_reg): Remove check on class likely spill.
5673 2009-09-03  Jakub Jelinek  <jakub@redhat.com>
5675         PR debug/41236
5676         * dwarf2out.c (loc_descriptor): Don't use SUBREG_REG macro on
5677         SIGN_EXTEND or ZERO_EXTEND.  Don't assume there is a REG inside of
5678         it or SUBREG.
5680         PR debug/41238
5681         * function.c (assign_parm_find_stack_rtl): Don't set mem attributes on
5682         the stack slot if it is passed by invisible reference.
5683         * var-tracking.c (vt_add_function_parameters): Handle arguments passed
5684         by invisible reference.
5686 2009-09-03  Bernd Schmidt  <bernd.schmidt@analog.com>
5688         * config/bfin/linux.h (TARGET_SUPPORTS_SYNC_CALLS): Define to 1.
5689         * config/bfin/uclinux.h (TARGET_SUPPORTS_SYNC_CALLS): Define to 1.
5690         * config/bfin/bfin.h (TARGET_SUPPORTS_SYNC_CALLS): Provide default of
5691         0.
5692         * config/bfin/sync.md: New file.
5693         * config/bfin/bfin.md: Include it.
5694         (UNSPEC_ATOMIC): New.
5695         (UNSPEC_ONES): Provide a unique number.
5697         From Jie Zhang <jie.zhang@analog.com>:
5698         * config/bfin/bfin.c (ret_regs): New.
5699         (must_save_fp_p): Don't return true because of frame_pointer_needed.
5700         (must_save_rets_p): New.
5701         (n_regs_saved_by_prologue): Use must_save_rets_p instead of
5702         current_function_is_leaf.
5703         (do_link): Likewise.
5704         (do_unlink): Likewise.
5705         (expand_interrupt_handler_prologue): Use ret_regs array.
5706         (expand_interrupt_handler_epilogue): Use ret_regs array and
5707         pass return register to gen_return_internal.
5708         (bfin_expand_epilogue): Pass return register to
5709         gen_return_internal.
5710         (bfin_expand_call): Explicitly clobber RETS.
5711         * config/bfin/bfin.h (FUNCTION_RETURN_REGISTERS): Define.
5712         * config/bfin/bfin.md (call_symbol_fdpic, call_value_symbol_fdpic,
5713         call_insn_fdpic, call_value_insn_fdpic, call_symbol,
5714         call_value_symbol, call_insn, call_value_insn): Explicitly clobber
5715         RETS.
5716         (return_internal): Take a reg rtx rather than the register number.
5718 2009-09-03  H.J. Lu  <hongjiu.lu@intel.com>
5720         * tree-parloops.c (parallelize_loops): Cast to HOST_WIDE_INT
5721         when comparing against estimated_loop_iterations_int return.
5723 2009-09-03  Richard Guenther  <rguenther@suse.de>
5725         * dwarf2out.c (dwarf2out_do_cfi_asm): Remove check of
5726         eh_personality_libfunc.
5728 2009-09-03  Razya Ladelsky  <razya@il.ibm.com>
5730         * tree-parloops.c (separate_decls_in_region): Add space.
5732 2009-09-03  Razya Ladelsky  <razya@il.ibm.com>
5734         * tree-parloops.c (separate_decls_in_region): Change the condition
5735         checking if there are reductions in the loop.
5737 2009-09-03  Razya Ladelsky  <razya@il.ibm.com>
5739         PR tree-optimization/38275
5740         * tree-parloops.c (parallelize_loops): Replace profitability condition
5741         for expected number of iterations.
5743 2009-09-03  Alexandre Oliva  <aoliva@redhat.com>
5745         * doc/invoke.texi (BUILD_CONFIG): Document --with-build-config.
5746         (bootstrap-debug): Explain conditions in which it becomes default.
5747         (bootstrap-debug-big): Rather than duplicate bootstrap-debug,
5748         make it add to it.
5750 2009-09-03  Namhyung Kim  <namhyung@gmail.com>
5752         * doc/invoke.texi (Optimize Options): Move
5753         -finline-small-functions to the -O2 list.
5755 2009-09-03  Alexandre Oliva  <aoliva@redhat.com>
5757         * toplev.c (process_options): Enable var-tracking-assignments
5758         by default if var-tracking is enabled.
5760 2009-09-02  David Daney  <ddaney@caviumnetworks.com>
5762         * cfgbuild.c (find_bb_boundaries): Split blocks containing a
5763         barrier.
5764         * emit-rtl.c (prev_nonnote_insn_bb): New function.
5765         * rtl.h (prev_nonnote_insn_bb): Declare it.
5767 2009-09-03  Diego Novillo  <dnovillo@google.com>
5769         * cgraph.c (cgraph_node_for_decl): New.
5770         * cgraph.h (cgraph_node_for_decl): Declare.
5771         * tree.c (host_integerp): Return 0 if T is NULL.
5773 2009-09-03  Diego Novillo  <dnovillo@google.com>
5775         * tree.h (struct alias_pair): Move from varasm.c.
5776         (alias_pairs): Likewise.
5777         (TYPE_MAXVAL): Define.
5778         (TYPE_MINVAL): Define.
5779         (iterative_hash_host_wide_int): Declare.
5780         (remove_unreachable_alias_pairs): Declare.
5781         * tree-pass.h (pass_ipa_free_lang_data): Declare.
5782         * diagnostic.c (default_diagnostic_starter): Make extern.
5783         (default_diagnostic_finalizer): Make extern.
5784         * diagnostic.h (default_diagnostic_starter): Declare.
5785         (default_diagnostic_finalizer): Declare.
5786         (default_tree_printer): Declare.
5787         * toplev.c (default_tree_printer): Make extern.
5789 2009-09-03  Richard Guenther  <rguenther@suse.de>
5790             Diego Novillo  <dnovillo@google.com>
5792         * cgraph.c (cgraph_add_new_function): Remove gimplification.
5793         * cgraphunit.c (cgraph_expand_function): Do not emit
5794         associated thunks from here.
5795         (cgraph_emit_thunks): New.
5796         (cgraph_optimize): Call it.
5797         Return if any IPA pass finds an error.
5798         * varasm.c (finish_aliases_1): Ignore errorneous aliases used
5799         by thunks.
5801 2009-09-03  Simon Baldwin  <simonb@google.com>
5802             Rafael Espindola  <espindola@google.com>
5803             Richard Guenther  <rguenther@suse.de>
5804             Doug Kwan  <dougkwan@google.com>
5805             Diego Novillo  <dnovillo@google.com>
5807         * tree.c: Include tree-pass.h, langhooks-def.h,
5808         diagnostic.h, cgraph.h, timevar.h, except.h and debug.h.
5809         (free_lang_data_in_type): New.
5810         (need_assembler_name_p): New.
5811         (free_lang_data_in_block): New.
5812         (free_lang_data_in_decl): New.
5813         (struct free_lang_data_d): New.
5814         (add_tree_to_fld_list): New.
5815         (find_decls_types_r): New.
5816         (get_eh_types_for_runtime): New.
5817         (find_decls_types_in_eh_region): New.
5818         (find_decls_types_in_node): New.
5819         (find_decls_types_in_var): New.
5820         (free_lang_data_in_cgraph): New.
5821         (free_lang_data): New.
5822         (gate_free_lang_data): New.
5823         (pass_ipa_free_lang_data): New.
5825 2009-09-03  Diego Novillo  <dnovillo@google.com>
5827         * timevar.def (TV_IPA_FREE_LANG_DATA): Define.
5828         * langhooks.h (struct lang_hooks): Add field free_lang_data.
5829         (lang_hooks): Remove const qualifier.
5830         * ipa.c (cgraph_remove_unreachable_nodes): Call
5831         remove_unreachable_alias_pairs.
5832         * except.c (add_type_for_runtime): Check if TYPE has
5833         already been converted.
5834         (lookup_type_for_runtime): Likewise.
5835         (check_handled): Handle converted types.
5836         * varasm.c (remove_unreachable_alias_pairs): New.
5837         * gimple.c: Include demangle.h.
5838         (gimple_decl_printable_name): New.
5839         (gimple_fold_obj_type_ref): New.
5840         * gimple.h (gimple_decl_printable_name): Declare.
5841         (gimple_fold_obj_type_ref): Declare.
5842         * passes.c (init_optimization_passes): Add pass
5843         pass_ipa_free_lang_data.
5844         * langhooks-def.h (LANG_HOOKS_FREE_LANG_DATA): Define.
5845         (LANG_HOOKS_INITIALIZER): Add LANG_HOOKS_FREE_LANG_DATA.
5847 2009-09-03  Diego Novillo  <dnovillo@google.com>
5849         * c-lang.c (lang_hooks): Remove const qualifier.
5851 2009-09-02  Loren James Rittle  <ljrittle@acm.org>
5853         * doc/install.texi (*-*-freebsd*): Update target information.
5855 2009-09-02  Anatoly Sokolov  <aesok@post.ru>
5857         * hard-reg-set.h (call_fixed_regs): Remove.
5858         * reginfo.c (call_fixed_regs): Remove.
5859         (init_reg_sets_1): Remove initialization of call_fixed_regs.
5860         (globalize_reg): Don't use call_fixed_regs.
5861         * caller-save.c (init_caller_save): Use call_fixed_reg_set instead of
5862         call_fixed_regs.
5864 2009-09-01  Michael Matz  <matz@suse.de>
5866         * expr.h (emit_storent_insn, expand_expr_real_1,
5867         expand_expr_real_2): Declare.
5868         * expr.c (emit_storent_insn, expand_expr_real_1,
5869         expand_expr_real_2): Export.
5870         (store_expr): Setting and evaluating dont_return_target is useless.
5871         (expand_expr_real_1, <case GOTO_EXPR, RETURN_EXPR, SWITCH_EXPR,
5872         LABEL_EXPR and ASM_EXPR>): Move to gcc_unreachable.
5873         * except.c (expand_resx_expr): Rename to ...
5874         (expand_resx_stmt): ... this.  Rewrite to take gimple statement.
5875         * except.h (expand_resx_stmt): Declare.
5876         * stmt.c: Add include gimple.h
5877         (expand_asm_expr): Rename to ...
5878         (expand_asm_stmt): ... this. Rewrite to take gimple statement.
5879         (expand_case): Rewrite to take gimple statement.
5880         * tree.h (expand_asm_stmt): Declare.
5881         (expand_case): Change prototype.
5882         * Makefile.in (stmt.o): Depend on gimple.h.
5883         * builtins.c (expand_builtin_synchronize): Build gimple asm
5884         statement, not an ASM_EXPR.
5885         * cfgexpand.c (gimple_cond_pred_to_tree, set_expr_location_r,
5886         gimple_to_tree, release_stmt_tree): Remove.
5887         (expand_gimple_cond): Don't call gimple_cond_pred_to_tree or
5888         ggc_free, but hold comparison code and operands separately.
5889         Call jumpif_1 and jumpifnot_1 instead of jumpif and jumpifnot.
5890         (expand_call_stmt, expand_gimple_stmt_1,
5891         expand_gimple_stmt): New helpers.
5892         (expand_gimple_tailcall): Don't call gimple_to_tree, expand_expr_stmt,
5893         release_stmt_tree.  Call expand_gimple_stmt instead.
5894         (expand_gimple_basic_block): Ditto.
5896         * calls.c (emit_call_1): Don't look at EH regions here, make
5897         fntree parameter useless.
5898         (expand_call): New local rettype for TREE_TYPE(exp), use it
5899         throughout.  Remove local p, use addr instead.
5900         Don't look at EH regions here.
5902 2009-09-02  Vladimir Makarov  <vmakarov@redhat.com>
5904         * doc/invoke.texi (-fsched-pressure): Document it.
5905         (-fsched-reg-pressure-heuristic): Remove it.
5907         * reload.c (ira.h): Include.
5908         (find_reloads): Add choosing reload on number of small spilled
5909         classes.
5911         * haifa-sched.c (ira.h): Include.
5912         (sched_pressure_p, sched_regno_cover_class, curr_reg_pressure,
5913         saved_reg_pressure, curr_reg_live, saved_reg_live,
5914         region_ref_regs): New variables.
5915         (sched_init_region_reg_pressure_info, mark_regno_birth_or_death,
5916         initiate_reg_pressure_info, setup_ref_regs,
5917         initiate_bb_reg_pressure_info, save_reg_pressure,
5918         restore_reg_pressure, dying_use_p, print_curr_reg_pressure): New
5919         functions.
5920         (setup_insn_reg_pressure_info): New function.
5921         (rank_for_schedule): Add pressure checking and insn issue time.
5922         Remove comparison of insn reg weights.
5923         (ready_sort): Set insn reg pressure info.
5924         (update_register_pressure, setup_insn_max_reg_pressure,
5925         update_reg_and_insn_max_reg_pressure,
5926         sched_setup_bb_reg_pressure_info): New functions.
5927         (schedule_insn): Add code for printing and updating reg pressure info.
5928         (find_set_reg_weight, find_insn_reg_weight): Remove.
5929         (ok_for_early_queue_removal): Do nothing if pressure_only_p.
5930         (debug_ready_list): Print reg pressure info.
5931         (schedule_block): Ditto.  Check insn issue time.
5932         (sched_init): Set up sched_pressure_p.  Allocate and set up some
5933         reg pressure related info.
5934         (sched_finish): Free some reg pressure related info.
5935         (fix_tick_ready): Make insn always ready if pressure_p.
5936         (init_h_i_d): Don't call find_insn_reg_weight.
5937         (haifa_finish_h_i_d): Free insn reg pressure info.
5939         * ira-int.h (ira_hard_regno_cover_class, ira_reg_class_nregs,
5940         ira_memory_move_cost, ira_class_hard_regs,
5941         ira_class_hard_regs_num, ira_no_alloc_regs,
5942         ira_available_class_regs, ira_reg_class_cover_size,
5943         ira_reg_class_cover, ira_class_translate): Move to ira.h.
5945         * ira-lives.c (single_reg_class): Check mode to find how many
5946         registers are necessary for operand.
5947         (ira_implicitly_set_insn_hard_regs): New.
5949         * common.opt (fsched-pressure): New options.
5950         (fsched-reg-pressure-heuristic): Remove.
5952         * ira.c (setup_eliminable_regset): Rename to
5953         ira_setup_eliminable_regset.  Make it external.
5954         (expand_reg_info): Pass cover class to setup_reg_classes.
5955         (ira): Call resize_reg_info instead of allocate_reg_info.
5957         * sched-deps.c: Include ira.h.
5958         (implicit_reg_pending_clobbers, implicit_reg_pending_uses): New.
5959         (create_insn_reg_use, create_insn_reg_set, setup_insn_reg_uses,
5960         reg_pressure_info, insn_use_p, mark_insn_pseudo_birth,
5961         mark_insn_hard_regno_birth, mark_insn_reg_birth,
5962         mark_pseudo_death, mark_hard_regno_death, mark_reg_death,
5963         mark_insn_reg_store, mark_insn_reg_clobber,
5964         setup_insn_reg_pressure_info): New.
5965         (sched_analyze_1): Update implicit_reg_pending_uses.
5966         (sched_analyze_insn): Find implicit sets, uses, clobbers of regs.
5967         Use them to create dependencies.  Set insn reg uses and pressure
5968         info.  Process reg_pending_uses in one place.
5969         (free_deps): Free implicit sets.
5970         (remove_from_deps): Remove implicit sets if necessary.  Check
5971         implicit sets when clearing reg_last_in_use.
5972         (init_deps_global): Clear implicit_reg_pending_clobbers and
5973         implicit_reg_pending_uses.
5975         * ira.h (ira_hard_regno_cover_class, ira_reg_class_nregs,
5976         ira_memory_move_cost, ira_class_hard_regs,
5977         ira_class_hard_regs_num, ira_no_alloc_regs,
5978         ira_available_class_regs, ira_reg_class_cover_size,
5979         ira_reg_class_cover, ira_class_translate): Move from ira-int.h.
5980         (ira_setup_eliminable_regset, ira_set_pseudo_classes,
5981         ira_implicitly_set_insn_hard_regs): New prototypes.
5983         * ira-costs.c (pseudo_classes_defined_p, allocno_p,
5984         cost_elements_num): New variables.
5985         (allocno_costs, total_costs): Rename to costs and
5986         total_allocno_costs.
5987         (COSTS_OF_ALLOCNO): Rename to COSTS.
5988         (allocno_pref): Rename to pref.
5989         (allocno_pref_buffer): Rename to pref_buffer.
5990         (common_classes): Rename to regno_cover_class.
5991         (COST_INDEX): New.
5992         (record_reg_classes): Set allocno attributes only if allocno_p.
5993         (record_address_regs): Ditto.  Use COST_INDEX instead of ALLOCNO_NUM.
5994         (scan_one_insn): Use COST_INDEX and COSTS instead of ALLOCNO_NUM
5995         and COSTS_OF_ALLOCNO.
5996         (print_costs): Rename to print_allocno_costs.
5997         (print_pseudo_costs): New.
5998         (process_bb_node_for_costs): Split into 2 functions with new
5999         function process_bb_for_costs.  Pass BB to process_bb_for_costs.
6000         (find_allocno_class_costs): Rename to find_costs_and_classes.  Add
6001         new parameter dump_file.  Use cost_elements_num instead of
6002         ira_allocnos_num.  Make one iteration if preferred classes were
6003         already calculated for scheduler.  Make 2 versions of code
6004         depending on allocno_p.
6005         (setup_allocno_cover_class_and_costs): Check allocno_p.  Use
6006         regno_cover_class and COSTS instead of common_classes and
6007         COSTS_OF_ALLOCNO.
6008         (init_costs, finish_costs): New.
6009         (ira_costs): Set up allocno_p and cost_elements_num.  Call
6010         init_costs and finish_costs.
6011         (ira_set_pseudo_classes): New.
6013         * rtl.h (allocate_reg_info): Remove.
6014         (resize_reg_info): Change return type.
6015         (reg_cover_class): New.
6016         (setup_reg_classes): Add new parameter.
6018         * sched-int.h (struct deps_reg): New member implicit_sets.
6019         (sched_pressure_p, sched_regno_cover_class): New external definitions.
6020         (INCREASE_BITS): New macro.
6021         (struct reg_pressure_data, struct reg_use_data): New.
6022         (struct _haifa_insn_data): Remove reg_weight.  Add members
6023         reg_pressure, reg_use_list, reg_set_list, and
6024         reg_pressure_excess_cost_change.
6025         (struct deps): New member implicit_sets.
6026         (pressure_p): New variable.
6027         (COVER_CLASS_BITS, INCREASE_BITS): New macros.
6028         (struct reg_pressure_data, struct reg_use_data): New.
6029         (INSN_REG_WEIGHT): Remove.
6030         (INSN_REG_PRESSURE, INSN_MAX_REG_PRESSURE, INSN_REG_USE_LIST,
6031         INSN_REG_SET_LIST, INSN_REG_PRESSURE_EXCESS_COST_CHANGE): New macros.
6032         (sched_init_region_reg_pressure_info,
6033         sched_setup_bb_reg_pressure_info): New prototypes.
6035         * reginfo.c (struct reg_pref): New member coverclass.
6036         (reg_cover_class): New function.
6037         (reginfo_init, pass_reginfo_init): Move after free_reg_info.
6038         (reg_info_size): New variable.
6039         (allocate_reg_info): Make static.  Setup reg_info_size.
6040         (resize_reg_info): Use reg_info_size.  Return flag of resizing.
6041         (setup_reg_classes): Add a new parameter.  Setup cover class too.
6043         * Makefile.in (reload.o, haifa-sched.o, sched-deps.o): Add ira.h to
6044         the dependencies.
6046         * sched-rgn.c (deps_join): Set up implicit_sets.
6047         (schedule_region): Set up region and basic blocks pressure
6048         relative info.
6050         * passes.c (init_optimization_passes): Move
6051         pass_subregs_of_mode_init before pass_sched.
6053 2009-09-02  Martin Jambor  <mjambor@suse.cz>
6055         * tree-sra.c (struct access): New field grp_hint.
6056         (dump_access): Dump grp_hint.
6057         (sort_and_splice_var_accesses): Set grp_hint if a group is read
6058         multiple times.
6059         (analyze_access_subtree): Only scalarize accesses with grp_hint set or
6060         those which have been specifically read and somehow written to.
6061         (propagate_subacesses_accross_link): Set grp_hint of right child and
6062         also possibly of the left child.
6064 2009-09-02  Jakub Jelinek  <jakub@redhat.com>
6066         * tree-object-size.c (addr_object_size): Always use object_size_type
6067         0 or 2 when determining the pointer pointed object size.
6069 2009-09-02  Richard Guenther  <rguenther@suse.de>
6071         Revert
6072         2009-08-31  Richard Guenther  <rguenther@suse.de>
6074         * builtins.c (fold_builtin_memory_op): Use the alias oracle
6075         to query if the memory regions for memmove overlap.
6076         * tree-ssa-alias.c (ptr_deref_may_alias_decl_p): Relax the
6077         asserts on pointers, instead deal with odd trees.
6078         (ptr_derefs_may_alias_p): Likewise.
6079         (refs_may_alias_p_1): Constructor bases also never alias.
6081 2009-08-01  Christian Bruel  <christian.bruel@st.com>
6083         Revert:
6084         2009-07-31  Christian Bruel  <christian.bruel@st.com>
6085         * gcc/config.gcc (sh*-*-elf): test with_libgloss.
6087 2009-09-01  Alexandre Oliva  <aoliva@redhat.com>
6089         * doc/invoke.texi (-fvar-tracking-assignments): New.
6090         (-fvar-tracking-assignments-toggle): New.
6091         (-fdump-final-insns=file): Mark filename as optional.
6092         (--param min-nondebug-insn-uid): New.
6093         (-gdwarf-@{version}): Mention version 4.
6094         * opts.c (common_handle_option): Accept it.
6095         * tree-vrp.c (find_assert_locations_1): Skip debug stmts.
6096         * regrename.c (regrename_optimize): Drop last.  Don't count debug
6097         insns as uses.  Don't reject change because of debug insn.
6098         (do_replace): Reject DEBUG_INSN as chain starter.  Take base_regno
6099         from the chain starter, and check for inexact matches in DEBUG_INSNS.
6100         (scan_rtx_reg): Accept inexact matches in DEBUG_INSNs.
6101         (build_def_use): Simplify and fix the marking of DEBUG_INSNs.
6102         * sched-ebb.c (schedule_ebbs): Skip boundary debug insns.
6103         * fwprop.c (forward_propagate_and_simplify): ...into debug insns.
6104         * doc/gimple.texi (is_gimple_debug): New.
6105         (gimple_debug_bind_p): New.
6106         (is_gimple_call, gimple_assign_cast_p): End sentence with period.
6107         * doc/install.texi (bootstrap-debug): More details.
6108         (bootstrap-debug-big, bootstrap-debug-lean): Document.
6109         (bootstrap-debug-lib): More details.
6110         (bootstrap-debug-ckovw): Update.
6111         (bootstrap-time): New.
6112         * tree-into-ssa.c (mark_def_sites): Skip debug stmts.
6113         (insert_phi_nodes_for): Insert debug stmts.
6114         (rewrite_stmt): Take iterator.  Insert debug stmts.
6115         (rewrite_enter_block): Adjust.
6116         (maybe_replace_use_in_debug_stmt): New.
6117         (rewrite_update_stmt): Use it.
6118         (mark_use_interesting): Return early for debug stmts.
6119         * tree-ssa-loop-im.c (rewrite_bittest): Propagate DEFs into debug
6120         stmts before replacing stmt.
6121         (move_computations_stmt): Likewise.
6122         * ira-conflicts.c (add_copies): Skip debug insns.
6123         * regstat.c (regstat_init_n_sets_and_refs): Discount debug insns.
6124         (regstat_bb_compute_ri): Skip debug insns.
6125         * tree-ssa-threadupdate.c (redirection_block_p): Skip debug stmts.
6126         * tree-ssa-loop-manip.c (find_uses_to_rename_stmt,
6127         check_loop_closed_ssa_stmt): Skip debug stmts.
6128         * tree-tailcall.c (find_tail_calls): Likewise.
6129         * tree-ssa-loop-ch.c (should_duplicate_loop_header_p): Likewise.
6130         * tree.h (MAY_HAVE_DEBUG_STMTS): New.
6131         (build_var_debug_value_stat): Declare.
6132         (build_var_debug_value): Define.
6133         (target_for_debug_bind): Declare.
6134         * reload.c (find_equiv_reg): Skip debug insns.
6135         * rtlanal.c (reg_used_between_p): Skip debug insns.
6136         (side_effects_p): Likewise.
6137         (canonicalize_condition): Likewise.
6138         * ddg.c (create_ddg_dep_from_intra_loop_link): Check that non-debug
6139         insns never depend on debug insns.
6140         (create_ddg_dep_no_link): Likewise.
6141         (add_cross_iteration_register_deps): Use ANTI_DEP for debug insns.
6142         Don't add inter-loop dependencies for debug insns.
6143         (build_intra_loop_deps): Likewise.
6144         (create_ddg): Count debug insns.
6145         * ddg.h (struct ddg::num_debug): New.
6146         (num_backargs): Pair up with previous int field.
6147         * diagnostic.c (diagnostic_report_diagnostic): Skip notes on
6148         -fcompare-debug-second.
6149         * final.c (get_attr_length_1): Skip debug insns.
6150         (rest_of_clean-state): Don't dump CFA_RESTORE_STATE.
6151         * gcc.c (invoke_as): Call compare-debug-dump-opt.
6152         (driver_self_specs): Map -fdump-final-insns to
6153         -fdump-final-insns=..
6154         (get_local_tick): New.
6155         (compare_debug_dump_opt_spec_function): Test for . argument and
6156         compute output name.  Compute temp output spec without flag name.
6157         Compute -frandom-seed.
6158         (OPT): Undef after use.
6159         * cfgloopanal.c (num_loop_insns): Skip debug insns.
6160         (average_num_loop_insns): Likewise.
6161         * params.h (MIN_NONDEBUG_INSN_UID): New.
6162         * gimple.def (GIMPLE_DEBUG): New.
6163         * ipa-reference.c (scan_stmt_for_static_refs): Skip debug stmts.
6164         * auto-inc-dec.c (merge_in_block): Skip debug insns.
6165         (merge_in_block): Fix whitespace.
6166         * toplev.c (flag_var_tracking): Update comment.
6167         (flag_var_tracking_assignments): New.
6168         (flag_var_tracking_assignments_toggle): New.
6169         (process_options): Don't open final insns dump file if we're not
6170         going to write to it.  Compute defaults for var_tracking.
6171         * df-scan.c (df_insn_rescan_debug_internal): New.
6172         (df_uses_record): Handle debug insns.
6173         * haifa-sched.c (ready): Initialize n_debug.
6174         (contributes_to_priority): Skip debug insns.
6175         (dep_list_size): New.
6176         (priority): Use it.
6177         (rank_for_schedule): Likewise.  Schedule debug insns as soon as
6178         they're ready.  Disregard previous debug insns to make decisions.
6179         (queue_insn): Never queue debug insns.
6180         (ready_add, ready_remove_first, ready_remove): Count debug insns.
6181         (schedule_insn): Don't reject debug insns because of issue rate.
6182         (get_ebb_head_tail, no_real_insns_p): Skip boundary debug insns.
6183         (queue_to_ready): Skip and discount debug insns.
6184         (choose_ready): Let debug insns through.
6185         (schedule_block): Check boundary debug insns.  Discount debug
6186         insns, schedule them early.  Adjust whitespace.
6187         (set_priorities): Check for boundary debug insns.
6188         (add_jump_dependencies): Use dep_list_size.
6189         (prev_non_location_insn): New.
6190         (check_cfg): Use it.
6191         * tree-ssa-loop-ivopts.c (find-interesting_users): Skip debug
6192         stmts.
6193         (remove_unused_ivs): Reset debug stmts.
6194         * modulo-sched.c (const_iteration_count): Skip debug insns.
6195         (res_MII): Discount debug insns.
6196         (loop_single_full_bb_p): Skip debug insns.
6197         (sms_schedule): Likewise.
6198         (sms_schedule_by_order): Likewise.
6199         (ps_has_conflicts): Likewise.
6200         * caller-save.c (refmarker_fn): New.
6201         (save_call_clobbered_regs): Replace regs with saved mem in
6202         debug insns.
6203         (mark_referenced_regs): Take pointer, mark and arg.  Adjust.
6204         Call refmarker_fn mark for hardregnos.
6205         (mark_reg_as_referenced): New.
6206         (replace_reg_with_saved_mem): New.
6207         * ipa-pure-const.c (check_stmt): Skip debug stmts.
6208         * cse.c (cse_insn): Canonicalize debug insns.  Skip them when
6209         searching back.
6210         (cse_extended_basic_block): Skip debug insns.
6211         (count_reg_usage): Likewise.
6212         (is_dead_reg): New, split out of...
6213         (set_live_p): ... here.
6214         (insn_live_p): Use it for debug insns.
6215         * tree-stdarg.c (check_all_va_list_escapes): Skip debug stmts.
6216         (execute_optimize_stdarg): Likewise.
6217         * tree-ssa-dom.c (propagate_rhs_into_lhs): Likewise.
6218         * tree-ssa-propagate.c (substitute_and_fold): Don't regard
6219         changes in debug stmts as changes.
6220         * sel-sched.c (moving_insn_creates_bookkeeping_block_p): New.
6221         (moveup_expr): Don't move across debug insns.  Don't move
6222         debug insn if it would create a bookkeeping block.
6223         (moveup_expr_cached): Don't use cache for debug insns that
6224         are heads of blocks.
6225         (compute_av_set_inside_bb): Skip debug insns.
6226         (sel_rank_for_schedule): Schedule debug insns first.  Remove
6227         dead code.
6228         (block_valid_for_bookkeeping_p); Support lax searches.
6229         (create_block_for_bookkeeping): Adjust block numbers when
6230         encountering debug-only blocks.
6231         (find_place_for_bookkeeping): Deal with debug-only blocks.
6232         (generate_bookkeeping_insn): Accept no place to insert.
6233         (remove_temp_moveop_nops): New argument full_tidying.
6234         (prepare_place_to_insert): Deal with debug insns.
6235         (advance_state_on_fence): Debug insns don't start cycles.
6236         (update_boundaries): Take fence as argument.  Deal with
6237         debug insns.
6238         (schedule_expr_on_boundary): No full_tidying on debug insns.
6239         (fill_insns): Deal with debug insns.
6240         (track_scheduled_insns_and_blocks): Don't count debug insns.
6241         (need_nop_to_preserve_insn_bb): New, split out of...
6242         (remove_insn_from_stream): ... this.
6243         (fur_orig_expr_not_found): Skip debug insns.
6244         * rtl.def (VALUE): Move up.
6245         (DEBUG_INSN): New.
6246         * tree-ssa-sink.c (all_immediate_uses_same_place): Skip debug stmts.
6247         (nearest_common_dominator_of_uses): Take debug_stmts argument.
6248         Set it if debug stmts are found.
6249         (statement_sink_location): Skip debug stmts.  Propagate
6250         moving defs into debug stmts.
6251         * ifcvt.c (first_active_insn): Skip debug insns.
6252         (last_active_insns): Likewise.
6253         (cond_exec_process_insns): Likewise.
6254         (noce_process_if_block): Likewise.
6255         (check_cond_move_block): Likewise.
6256         (cond_move_convert_if_block): Likewise.
6257         (block_jumps_and_fallthru_p): Likewise.
6258         (dead_or_predicable): Likewise.
6259         * dwarf2out.c (debug_str_hash_forced): New.
6260         (find_AT_string): Add comment.
6261         (gen_label_for_indirect_string): New.
6262         (get_debug_string_label): New.
6263         (AT_string_form): Use it.
6264         (mem_loc_descriptor): Handle non-TLS symbols.  Handle MINUS , DIV,
6265         MOD, AND, IOR, XOR, NOT, ABS, NEG, and CONST_STRING.  Accept but
6266         discard COMPARE, IF_THEN_ELSE, ROTATE, ROTATERT, TRUNCATE and
6267         several operations that cannot be represented with DWARF opcodes.
6268         (loc_descriptor): Ignore SIGN_EXTEND and ZERO_EXTEND.  Require
6269         dwarf_version 4 for DW_OP_implicit_value and DW_OP_stack_value.
6270         (dwarf2out_var_location): Take during-call mark into account.
6271         (output_indirect_string): Update comment.  Output if there are
6272         label and references.
6273         (prune_indirect_string): New.
6274         (prune_unused_types): Call it if debug_str_hash_forced.
6275         More in dwarf2out.c, from Jakub Jelinek <jakub@redhat.com>:
6276         (dw_long_long_const): Remove.
6277         (struct dw_val_struct): Change val_long_long type to rtx.
6278         (print_die, attr_checksum, same_dw_val_p, loc_descriptor): Adjust for
6279         val_long_long change to CONST_DOUBLE rtx from a long hi/lo pair.
6280         (output_die): Likewise.  Use HOST_BITS_PER_WIDE_INT size of each
6281         component instead of HOST_BITS_PER_LONG.
6282         (output_loc_operands): Likewise.  For const8* assert
6283         HOST_BITS_PER_WIDE_INT rather than HOST_BITS_PER_LONG is >= 64.
6284         (output_loc_operands_raw): For const8* assert HOST_BITS_PER_WIDE_INT
6285         rather than HOST_BITS_PER_LONG is >= 64.
6286         (add_AT_long_long): Remove val_hi and val_lo arguments, add
6287         val_const_double.
6288         (size_of_die): Use HOST_BITS_PER_WIDE_INT size multiplier instead of
6289         HOST_BITS_PER_LONG for dw_val_class_long_long.
6290         (add_const_value_attribute): Adjust add_AT_long_long caller.  Don't
6291         handle TLS SYMBOL_REFs.  If CONST wraps a constant, tail recurse.
6292         (dwarf_stack_op_name): Handle DW_OP_implicit_value and
6293         DW_OP_stack_value.
6294         (size_of_loc_descr, output_loc_operands, output_loc_operands_raw):
6295         Handle DW_OP_implicit_value.
6296         (extract_int): Move prototype earlier.
6297         (mem_loc_descriptor): For SUBREG punt if inner
6298         mode size is wider than DWARF2_ADDR_SIZE.  Handle SIGN_EXTEND
6299         and ZERO_EXTEND by DW_OP_shl and DW_OP_shr{a,}.  Handle
6300         EQ, NE, GT, GE, LT, LE, GTU, GEU, LTU, LEU, SMIN, SMAX, UMIN,
6301         UMAX, SIGN_EXTRACT, ZERO_EXTRACT.
6302         (loc_descriptor): Compare mode size with DWARF2_ADDR_SIZE
6303         instead of Pmode size.
6304         (loc_descriptor): Add MODE argument.  Handle CONST_INT, CONST_DOUBLE,
6305         CONST_VECTOR, CONST, LABEL_REF and SYMBOL_REF if mode != VOIDmode,
6306         attempt to handle other expressions.  Don't handle TLS SYMBOL_REFs.
6307         (concat_loc_descriptor, concatn_loc_descriptor,
6308         loc_descriptor_from_tree_1): Adjust loc_descriptor callers.
6309         (add_location_or_const_value_attribute): Likewise.  For single
6310         location loc_lists attempt to use add_const_value_attribute
6311         for constant decls.  Add DW_AT_const_value even if
6312         NOTE_VAR_LOCATION is VAR_LOCATION with CONSTANT_P or CONST_STRING
6313         in its expression.
6314         * cfgbuild.c (inside_basic_block_p): Handle debug insns.
6315         (control_flow_insn_p): Likewise.
6316         * tree-parloops.c (eliminate_local_variables_stmt): Handle debug stmt.
6317         (separate_decls_in_region_debug_bind): New.
6318         (separate_decls_in_region): Process debug bind stmts afterwards.
6319         * recog.c (verify_changes): Handle debug insns.
6320         (extract_insn): Likewise.
6321         (peephole2_optimize): Skip debug insns.
6322         * dse.c (scan_insn): Skip debug insns.
6323         * sel-sched-ir.c (return_nop_to_pool): Take full_tidying argument.
6324         Pass it on.
6325         (setup_id_for_insn): Handle debug insns.
6326         (maybe_tidy_empty_bb): Adjust whitespace.
6327         (tidy_control_flow): Skip debug insns.
6328         (sel_remove_insn): Adjust for debug insns.
6329         (sel_estimate_number_of_insns): Skip debug insns.
6330         (create_insn_rtx_from_pattern): Handle debug insns.
6331         (create_copy_of_insn_rtx): Likewise.
6332         * sel-sched-.h (sel_bb_end): Declare.
6333         (sel_bb_empty_or_nop_p): New.
6334         (get_all_loop_exits): Use it.
6335         (_eligible_successor_edge_p): Likewise.
6336         (return_nop_to_pool): Adjust.
6337         * tree-eh.c (tre_empty_eh_handler_p): Skip debug stmts.
6338         * ira-lives.c (process_bb_node_lives): Skip debug insns.
6339         * gimple-pretty-print.c (dump_gimple_debug): New.
6340         (dump_gimple_stmt): Use it.
6341         (dump_bb_header): Skip gimple debug stmts.
6342         * regmove.c (optimize_reg_copy_1): Discount debug insns.
6343         (fixup_match_2): Likewise.
6344         (regmove_backward_pass): Likewise.  Simplify combined
6345         replacement.  Handle debug insns.
6346         * function.c (instantiate_virtual_regs): Handle debug insns.
6347         * function.h (struct emit_status): Add x_cur_debug_insn_uid.
6348         * print-rtl.h: Include cselib.h.
6349         (print_rtx): Print VALUEs.  Split out and recurse for VAR_LOCATIONs.
6350         * df.h (df_inns_rescan_debug_internal): Declare.
6351         * gcse.c (alloc_hash_table): Estimate n_insns.
6352         (cprop_insn): Don't regard debug insns as changes.
6353         (bypass_conditional_jumps): Skip debug insns.
6354         (one_pre_gcse_pass): Adjust.
6355         (one_code_hoisting_pass): Likewise.
6356         (compute_ld_motion_mems): Skip debug insns.
6357         (one_cprop_pass): Adjust.
6358         * tree-if-conv.c (tree_if_convert_stmt): Reset debug stmts.
6359         (if_convertible_stmt_p): Handle debug stmts.
6360         * init-regs.c (initialize_uninitialized_regs): Skip debug insns.
6361         * tree-vect-loop.c (vect_is_simple_reduction): Skip debug stmts.
6362         * ira-build.c (create_bb_allocnos): Skip debug insns.
6363         * tree-flow-inline.h (has_zero_uses): Discount debug stmts.
6364         (has_single_use): Likewise.
6365         (single_imm_use): Likewise.
6366         (num_imm_uses): Likewise.
6367         * tree-ssa-phiopt.c (empty_block_p): Skip debug stmts.
6368         * tree-ssa-coalesce.c (build_ssa_conflict_graph): Skip debug stmts.
6369         (create_outofssa_var_map): Likewise.
6370         * lower-subreg.c (adjust_decomposed_uses): New.
6371         (resolve_debug): New.
6372         (decompose_multiword_subregs): Use it.
6373         * tree-dfa.c (find_referenced_vars): Skip debug stmts.
6374         * emit-rtl.c: Include params.h.
6375         (cur_debug_insn_uid): Define.
6376         (set_new_first_and_last_insn): Set cur_debug_insn_uid too.
6377         (copy_rtx_if_shared_1): Handle debug insns.
6378         (reset_used_flags): Likewise.
6379         (set_used_flags): LIkewise.
6380         (get_max_insn_count): New.
6381         (next_nondebug_insn): New.
6382         (prev_nondebug_insn): New.
6383         (make_debug_insn_raw): New.
6384         (emit_insn_before_noloc): Handle debug insns.
6385         (emit_jump_insn_before_noloc): Likewise.
6386         (emit_call_insn_before_noloc): Likewise.
6387         (emit_debug_insn_before_noloc): New.
6388         (emit_insn_after_noloc): Handle debug insns.
6389         (emit_jump_insn_after_noloc): Likewise.
6390         (emit_call_insn_after_noloc): Likewise.
6391         (emit_debug_insn_after_noloc): Likewise.
6392         (emit_insn_after): Take loc from earlier non-debug insn.
6393         (emit_jump_insn_after): Likewise.
6394         (emit_call_insn_after): Likewise.
6395         (emit_debug_insn_after_setloc): New.
6396         (emit_debug_insn_after): New.
6397         (emit_insn_before): Take loc from later non-debug insn.
6398         (emit_jump_insn_before): Likewise.
6399         (emit_call_insn_before): Likewise.
6400         (emit_debug_insn_before_setloc): New.
6401         (emit_debug_insn_before): New.
6402         (emit_insn): Handle debug insns.
6403         (emit_debug_insn): New.
6404         (emit_jump_insn): Handle debug insns.
6405         (emit_call_insn): Likewise.
6406         (emit): Likewise.
6407         (init_emit): Take min-nondebug-insn-uid into account.
6408         Initialize cur_debug_insn_uid.
6409         (emit_copy_of_insn_after): Handle debug insns.
6410         * cfgexpand.c (gimple_assign_rhs_to_tree): Do not overwrite
6411         location of single rhs in place.
6412         (maybe_dump_rtl_for_gimple_stmt): Dump lineno.
6413         (floor_sdiv_adjust): New.
6414         (cell_sdiv_adjust): New.
6415         (cell_udiv_adjust): New.
6416         (round_sdiv_adjust): New.
6417         (round_udiv_adjust): New.
6418         (wrap_constant): Moved from cselib.
6419         (unwrap_constant): New.
6420         (expand_debug_expr): New.
6421         (expand_debug_locations): New.
6422         (expand_gimple_basic_block): Drop hiding redeclaration.  Expand
6423         debug bind stmts.
6424         (gimple_expand_cfg): Expand debug locations.
6425         * cselib.c: Include tree-pass.h.
6426         (struct expand_value_data): New.
6427         (cselib_record_sets_hook): New.
6428         (PRESERVED_VALUE_P, LONG_TERM_PRESERVED_VALUE_P): New.
6429         (cselib_clear_table): Move, and implemnet in terms of...
6430         (cselib_reset_table_with_next_value): ... this.
6431         (cselib_get_next_unknown_value): New.
6432         (discard_useless_locs): Don't discard preserved values.
6433         (cselib_preserve_value): New.
6434         (cselib_preserved_value_p): New.
6435         (cselib_preserve_definitely): New.
6436         (cselib_clear_preserve): New.
6437         (cselib_preserve_only_values): New.
6438         (new_cselib_val): Take rtx argument.  Dump it in details.
6439         (cselib_lookup_mem): Adjust.
6440         (expand_loc): Take regs_active in struct.  Adjust.  Silence
6441         dumps unless details are requested.
6442         (cselib_expand_value_rtx_cb): New.
6443         (cselib_expand_value_rtx): Rename and reimplment in terms of...
6444         (cselib_expand_value_rtx_1): ... this.  Adjust.  Silence dumps
6445         without details.  Copy more subregs.  Try to resolve values
6446         using a callback.  Wrap constants.
6447         (cselib_subst_to_values): Adjust.
6448         (cselib_log_lookup): New.
6449         (cselib_lookup): Call it.
6450         (cselib_invalidate_regno): Don't count preserved values as useless.
6451         (cselib_invalidate_mem): Likewise.
6452         (cselib_record_set): Likewise.
6453         (struct set): Renamed to cselib_set, moved to cselib.h.
6454         (cselib_record_sets): Adjust.  Call hook.
6455         (cselib_process_insn): Reset table when it would be cleared.
6456         (dump_cselib_val): New.
6457         (dump_cselib_table): New.
6458         * tree-cfgcleanup.c (tree_forwarded_block_p): Skip debug stmts.
6459         (remove_forwarder_block): Support moving debug stmts.
6460         * cselib.h (cselib_record_sets_hook): Declare.
6461         (cselib_expand_callback): New type.
6462         (cselib_expand_value_rtx_cb): Declare.
6463         (cselib_reset_table_with_next_value): Declare.
6464         (cselib_get_next_unknown_value): Declare.
6465         (cselib_preserve_value): Declare.
6466         (cselib_preserved_value_p): Declare.
6467         (cselib_preserve_only_values): Declare.
6468         (dump_cselib_table): Declare.
6469         * cfgcleanup.c (flow_find_cross_jump): Skip debug insns.
6470         (try_crossjump_to_edge): Likewise.
6471         (delete_unreachable_blocks): Remove dominant GIMPLE blocks after
6472         dominated blocks when debug stmts are present.
6473         * simplify-rtx.c (delegitimize_mem_from_attrs): New.
6474         * tree-ssa-live.c (remove_unused_locals): Skip debug stmts.
6475         (set_var_live_on_entry): Likewise.
6476         * loop-invariant.c (find_invariants_bb): Skip debug insns.
6477         * cfglayout.c (curr_location, last_location): Make static.
6478         (set_curr_insn_source_location): Don't avoid bouncing.
6479         (get_curr_insn_source_location): New.
6480         (get_curr_insn_block): New.
6481         (duplicate_insn_chain): Handle debug insns.
6482         * tree-ssa-forwprop.c (forward_propagate_addr_expr): Propagate
6483         into debug stmts.
6484         * common.opt (fcompare-debug): Move to sort order.
6485         (fdump-unnumbered-links): Likewise.
6486         (fvar-tracking-assignments): New.
6487         (fvar-tracking-assignments-toggle): New.
6488         * tree-ssa-dce.c (mark_stmt_necessary): Don't mark blocks
6489         because of debug stmts.
6490         (mark_stmt_if_obviously_necessary): Mark debug stmts.
6491         (eliminate_unnecessary_stmts): Walk dominated blocks before
6492         dominators.
6493         * tree-ssa-ter.c (find_replaceable_in_bb): Skip debug stmts.
6494         * ira.c (memref_used_between_p): Skip debug insns.
6495         (update_equiv_regs): Likewise.
6496         * sched-deps.c (sd_lists_size): Accept empty list.
6497         (sd_init_insn): Mark debug insns.
6498         (sd_finish_insn): Unmark them.
6499         (sd_add_dep): Reject non-debug deps on debug insns.
6500         (fixup_sched_groups): Give debug insns group treatment.
6501         Skip debug insns.
6502         (sched_analyze_reg): Don't mark debug insns for sched before call.
6503         (sched_analyze_2): Handle debug insns.
6504         (sched_analyze_insn): Compute next non-debug insn.  Handle debug
6505         insns.
6506         (deps_analyze_insn): Handle debug insns.
6507         (deps_start_bb): Skip debug insns.
6508         (init_deps): Initialize last_debug_insn.
6509         * tree-ssa.c (target_for_debug_bind): New.
6510         (find_released_ssa_name): New.
6511         (propagate_var_def_into_debug_stmts): New.
6512         (propagate_defs_into_debug_stmts): New.
6513         (verify_ssa): Skip debug bind stmts without values.
6514         (warn_uninialized_vars): Skip debug stmts.
6515         * target-def.h (TARGET_DELEGITIMIZE_ADDRESS): Set default.
6516         * rtl.c (rtx_equal_p_cb): Handle VALUEs.
6517         (rtx_equal_p): Likewise.
6518         * ira-costs.c (scan_one_insn): Skip debug insns.
6519         (process_bb_node_for_hard_reg_moves): Likewise.
6520         * rtl.h (DEBUG_INSN_P): New.
6521         (NONDEBUG_INSN_P): New.
6522         (MAY_HAVE_DEBUG_INSNS): New.
6523         (INSN_P): Accept debug insns.
6524         (RTX_FRAME_RELATED_P): Likewise.
6525         (INSN_DELETED_P): Likewise
6526         (PAT_VAR_LOCATION_DECL): New.
6527         (PAT_VAR_LOCATION_LOC): New.
6528         (PAT_VAR_OCATION_STATUS): New.
6529         (NOTE_VAR_LOCATION_DECL): Reimplement.
6530         (NOTE_VAR_LOCATION_LOC): Likewise.
6531         (NOTE_VAR_LOCATION_STATUS): Likewise.
6532         (INSN_VAR_LOCATION): New.
6533         (INSN_VAR_LOCATION_DECL): New.
6534         (INSN_VAR_LOCATION_LOC): New.
6535         (INSN_VAR_LOCATION_STATUS): New.
6536         (gen_rtx_UNKNOWN_VAR_LOC): New.
6537         (VAR_LOC_UNKNOWN_P): New.
6538         (NOTE_DURING_CALL_P): New.
6539         (SCHED_GROUP_P): Accept debug insns.
6540         (emit_debug_insn_before): Declare.
6541         (emit_debug_insn_before_noloc): Declare.
6542         (emit_debug_insn_beore_setloc): Declare.
6543         (emit_debug_insn_after): Declare.
6544         (emit_debug_insn_after_noloc): Declare.
6545         (emit_debug_insn_after_setloc): Declare.
6546         (emit_debug_insn): Declare.
6547         (make_debug_insn_raw): Declare.
6548         (prev_nondebug_insn): Declare.
6549         (next_nondebug_insn): Declare.
6550         (delegitimize_mem_from_attrs): Declare.
6551         (get_max_insn_count): Declare.
6552         (wrap_constant): Declare.
6553         (unwrap_constant): Declare.
6554         (get_curr_insn_source_location): Declare.
6555         (get_curr_insn_block): Declare.
6556         * tree-inline.c (insert_debug_decl_map): New.
6557         (processing_debug_stmt): New.
6558         (remap_decl): Don't create new mappings in debug stmts.
6559         (remap_gimple_op_r): Don't add references in debug stmts.
6560         (copy_tree_body_r): Likewise.
6561         (remap_gimple_stmt): Handle debug bind stmts.
6562         (copy_bb): Skip debug stmts.
6563         (copy_edges_for_bb): Likewise.
6564         (copy_debug_stmt): New.
6565         (copy_debug_stmts): New.
6566         (copy_body): Copy debug stmts at the end.
6567         (insert_init_debug_bind): New.
6568         (insert_init_stmt): Take id.  Skip and emit debug stmts.
6569         (setup_one_parameter): Remap variable earlier, register debug mapping.
6570         (estimate_num_insns): Skip debug stmts.
6571         (expand_call_inline): Preserve debug_map.
6572         (optimize_inline_calls): Check for no debug_stmts left-overs.
6573         (unsave_expr_now): Preserve debug_map.
6574         (copy_gimple_seq_and_replace_locals): Likewise.
6575         (tree_function_versioning): Check for no debug_stmts left-overs.
6576         Init and destroy debug_map as needed.  Split edges unconditionally.
6577         (build_duplicate_type): Init and destroy debug_map as needed.
6578         * tree-inline.h: Include gimple.h instead of pointer-set.h.
6579         (struct copy_body_data): Add debug_stmts and debug_map.
6580         * sched-int.h (struct ready_list): Add n_debug.
6581         (struct deps): Add last_debug_insn.
6582         (DEBUG_INSN_SCHED_P): New.
6583         (BOUNDARY_DEBUG_INSN_P): New.
6584         (SCHEDULE_DEBUG_INSN_P): New.
6585         (sd_iterator_cond): Accept empty list.
6586         * combine.c (create_log_links): Skip debug insns.
6587         (combine_instructions): Likewise.
6588         (cleanup_auto_inc_dec): New.  From Jakub Jelinek: Make sure the
6589         return value is always unshared.
6590         (struct rtx_subst_pair): New.
6591         (auto_adjust_pair): New.
6592         (propagate_for_debug_subst): New.
6593         (propagate_for_debug): New.
6594         (try_combine): Skip debug insns.  Propagate removed defs into
6595         debug insns.
6596         (next_nonnote_nondebug_insn): New.
6597         (distribute_notes): Use it.  Skip debug insns.
6598         (distribute_links): Skip debug insns.
6599         * tree-outof-ssa.c (set_location_for_edge): Likewise.
6600         * resource.c (mark_target_live_regs): Likewise.
6601         * var-tracking.c: Include cselib.h and target.h.
6602         (enum micro_operation_type): Add MO_VAL_USE, MO_VAL_LOC, and
6603         MO_VAL_SET.
6604         (micro_operation_type_name): New.
6605         (enum emit_note_where): Add EMIT_NOTE_AFTER_CALL_INSN.
6606         (struct micro_operation_def): Update comments.
6607         (decl_or_value): New type.  Use instead of decls.
6608         (struct emit_note_data_def): Add vars.
6609         (struct attrs_def): Use decl_or_value.
6610         (struct variable_tracking_info_def): Add permp, flooded.
6611         (struct location_chain_def): Update comment.
6612         (struct variable_part_def): Use decl_or_value.
6613         (struct variable_def): Make var_part a variable length array.
6614         (valvar_pool): New.
6615         (scratch_regs): New.
6616         (cselib_hook_called): New.
6617         (dv_is_decl_p): New.
6618         (dv_is_value_p): New.
6619         (dv_as_decl): New.
6620         (dv_as_value): New.
6621         (dv_as_opaque): New.
6622         (dv_onepart_p): New.
6623         (dv_pool): New.
6624         (IS_DECL_CODE): New.
6625         (check_value_is_not_decl): New.
6626         (dv_from_decl): New.
6627         (dv_from_value): New.
6628         (dv_htab_hash): New.
6629         (variable_htab_hash): Use it.
6630         (variable_htab_eq): Support values.
6631         (variable_htab_free): Free from the right pool.
6632         (attrs_list_member, attrs_list_insert): Use decl_or_value.
6633         (attrs_list_union): Adjust.
6634         (attrs_list_mpdv_union): New.
6635         (tie_break_pointers): New.
6636         (canon_value_cmp): New.
6637         (unshare_variable): Return possibly-modified slot.
6638         (vars_copy_1): Adjust.
6639         (var_reg_decl_set): Adjust.  Split out of...
6640         (var_reg_set): ... this.
6641         (get_init_value): Adjust.
6642         (var_reg_delete_and_set): Adjust.
6643         (var_reg_delete): Adjust.
6644         (var_regno_delete): Adjust.
6645         (var_mem_decl_set): Split out of...
6646         (var_mem_set): ... this.
6647         (var_mem_delete_and_set): Adjust.
6648         (var_mem_delete): Adjust.
6649         (val_store): New.
6650         (val_reset): New.
6651         (val_resolve): New.
6652         (variable_union): Adjust.  Speed up merge of 1-part vars.
6653         (variable_canonicalize): Use unshared slot.
6654         (VALUED_RECURSED_INTO): New.
6655         (find_loc_in_1pdv): New.
6656         (struct dfset_merge): New.
6657         (insert_into_intersection): New.
6658         (intersect_loc_chains): New.
6659         (loc_cmp): New.
6660         (canonicalize_loc_order_check): New.
6661         (canonicalize_values_mark): New.
6662         (canonicalize_values_star): New.
6663         (variable_merge_over_cur): New.
6664         (variable_merge_over_src): New.
6665         (dataflow_set_merge): New.
6666         (dataflow_set_equiv_regs): New.
6667         (remove_duplicate_values): New.
6668         (struct dfset_post_merge): New.
6669         (variable_post_merge_new_vals): New.
6670         (variable_post_merge_perm_vals): New.
6671         (dataflow_post_merge_adjust): New.
6672         (find_mem_expr_in_1pdv): New.
6673         (dataflow_set_preserve_mem_locs): New.
6674         (dataflow_set_remove_mem_locs): New.
6675         (dataflow_set_clear_at_call): New.
6676         (onepart_variable_different_p): New.
6677         (variable_different_p): Use it.
6678         (dataflow_set_different_1): Adjust.  Make detailed dump more verbose.
6679         (track_expr_p): Add need_rtl parameter.  Don't generate rtl
6680         if not needed.
6681         (track_loc_p): Pass it true.
6682         (struct count_use_info): New.
6683         (find_use_val): New.
6684         (replace_expr_with_values): New.
6685         (log_op_type): New.
6686         (use_type): New, partially split out of...
6687         (count_uses): ... this.  Count new micro-ops.
6688         (count_uses_1): Adjust.
6689         (count_stores): Adjust.
6690         (count_with_sets): New.
6691         (VAL_NEEDS_RESOLUTION): New.
6692         (VAL_HOLDS_TRACK_EXPR): New.
6693         (VAL_EXPR_IS_COPIED): New.
6694         (VAL_EXPR_IS_CLOBBERED): New.
6695         (add_uses): Adjust.  Generate new micro-ops.
6696         (add_uses_1): Adjust.
6697         (add_stores): Generate new micro-ops.
6698         (add_with_sets): New.
6699         (find_src_status): Adjust.
6700         (find_src_set_src): Adjust.
6701         (compute_bb_dataflow): Use dataflow_set_clear_at_call.
6702         Handle new micro-ops.  Canonicalize value equivalances.
6703         (vt_find_locations): Compute total size of hash tables for
6704         dumping.  Perform merge for var-tracking-assignments.  Don't
6705         disregard single-block loops.
6706         (dump_attrs_list): Handle decl_or_value.
6707         (dump_variable): Take variable.  Deal with decl_or_value.
6708         (dump_variable_slot): New.
6709         (dump_vars): Use it.
6710         (dump_dataflow_sets): Adjust.
6711         (set_slot_part): New, extended to support one-part variables
6712         after splitting out of...
6713         (set_variable_part): ... this.
6714         (clobber_slot_part): New, split out of...
6715         (clobber_variable_part): ... this.
6716         (delete_slot_part): New, split out of...
6717         (delete_variable_part): .... this.
6718         (check_wrap_constant): New.
6719         (vt_expand_loc_callback): New.
6720         (vt_expand_loc): New.
6721         (emit_note_insn_var_location): Adjust.  Handle values.  Handle
6722         EMIT_NOTE_AFTER_CALL_INSN.
6723         (emit_notes_for_differences_1): Adjust.  Handle values.
6724         (emit_notes_for_differences_2): Likewise.
6725         (emit_notes_for_differences): Adjust.
6726         (emit_notes_in_bb): Take pointer to set.  Emit AFTER_CALL_INSN notes.
6727         Adjust.  Handle new micro-ops.
6728         (vt_add_function_parameters): Adjust.  Create and bind values.
6729         (vt_initialize): Adjust.  Initialize scratch_regs and
6730         valvar_pool, flooded and perm..  Initialize and use cselib.  Log
6731         operations.  Move some code to count_with_sets and add_with_sets.
6732         (delete_debug_insns): New.
6733         (vt_debug_insns_local): New.
6734         (vt_finalize): Release permp, valvar_pool, scratch_regs.  Finish
6735         cselib.
6736         (var_tracking_main): If var-tracking-assignments is enabled
6737         but var-tracking isn't, delete debug insns and leave.  Likewise
6738         if we exceed limits or fail the stack adjustments tests, and
6739         after all var-tracking processing.
6740         More in var-tracking, from Jakub Jelinek <jakub@redhat.com>:
6741         (dataflow_set): Add traversed_vars.
6742         (value_chain, const_value_chain): New typedefs.
6743         (value_chain_pool, value_chains): New variables.
6744         (value_chain_htab_hash, value_chain_htab_eq, add_value_chain,
6745         add_value_chains, add_cselib_value_chains, remove_value_chain,
6746         remove_value_chains, remove_cselib_value_chains): New functions.
6747         (shared_hash_find_slot_unshare_1, shared_hash_find_slot_1,
6748         shared_hash_find_slot_noinsert_1, shared_hash_find_1): New
6749         static inlines.
6750         (shared_hash_find_slot_unshare, shared_hash_find_slot,
6751         shared_hash_find_slot_noinsert, shared_hash_find): Update.
6752         (dst_can_be_shared): New variable.
6753         (unshare_variable): Unshare set->vars if shared, use shared_hash_*.
6754         Clear dst_can_be_shared.  If set->traversed_vars is non-NULL and
6755         different from set->vars, look up slot again instead of using the
6756         passed in slot.
6757         (dataflow_set_init): Initialize traversed_vars.
6758         (variable_union): Use shared_hash_*.  Use initially NO_INSERT
6759         lookup if set->vars is shared.  Don't keep slot cleared before
6760         calling unshare_variable.  Unshare set->vars if needed.  Adjust
6761         unshare_variable callers.  Clear dst_can_be_shared if needed.
6762         Even ->refcount == 1 vars must be unshared if set->vars is shared
6763         and var needs to be modified.
6764         (dataflow_set_union): Set traversed_vars during canonicalization.
6765         (VALUE_CHANGED, DECL_CHANGED): Define.
6766         (set_dv_changed, dv_changed_p): New static inlines.
6767         (track_expr_p): Clear DECL_CHANGED.
6768         (dump_dataflow_sets): Set it.
6769         (variable_was_changed): Call set_dv_changed.
6770         (emit_note_insn_var_location): Likewise.
6771         (changed_variables_stack): New variable.
6772         (check_changed_vars_1, check_changed_vars_2): New functions.
6773         (emit_notes_for_changes): Do nothing if changed_variables is
6774         empty.  Traverse changed_variables with check_changed_vars_1,
6775         call check_changed_vars_2 on each changed_variables_stack entry.
6776         (emit_notes_in_bb): Add SET argument.  Just clear it at the
6777         beginning, use it instead of local &set, don't destroy it at the end.
6778         (vt_emit_notes): Call dataflow_set_clear early on all
6779         VTI(bb)->out sets, never use them, instead use emit_notes_in_bb
6780         computed set, dataflow_set_clear also VTI(bb)->in when we are
6781         done with the basic block.  Initialize changed_variables_stack,
6782         free it afterwards.  If ENABLE_CHECKING verify that after noting
6783         differences to an empty set value_chains hash table is empty.
6784         (vt_initialize): Initialize value_chains and value_chain_pool.
6785         (vt_finalize): Delete value_chains htab, free value_chain_pool.
6786         (variable_tracking_main): Call dump_dataflow_sets before calling
6787         vt_emit_notes, not after it.
6788         * tree-flow.h (propagate_defs_into_debug_stmts): Declare.
6789         (propagate_var_def_into_debug_stmts): Declare.
6790         * df-problems.c (df_lr_bb_local_compute): Skip debug insns.
6791         (df_set_note): Reject debug insns.
6792         (df_whole_mw_reg_dead_p): Take added_notes_p argument.  Don't
6793         add notes to debug insns.
6794         (df_note_bb_compute): Adjust.  Likewise.
6795         (df_simulate_uses): Skip debug insns.
6796         (df_simulate_initialize_backwards): Likewise.
6797         * reg-stack.c (subst_stack_regs_in_debug_insn): New.
6798         (subst_stack_regs_pat): Reject debug insns.
6799         (convert_regs_1): Handle debug insns.
6800         * Makefile.in (TREE_INLINE_H): Take pointer-set.h from GIMPLE_H.
6801         (print-rtl.o): Depend on cselib.h.
6802         (cselib.o): Depend on TREE_PASS_H.
6803         (var-tracking.o): Depend on cselib.h and TARGET_H.
6804         * sched-rgn.c (rgn_estimate_number_of_insns): Discount debug insns.
6805         (init_ready_list): Skip boundary debug insns.
6806         (add_branch_dependences): Skip debug insns.
6807         (free_block_dependencies): Check for blocks with only debug insns.
6808         (compute_priorities): Likewise.
6809         * gimple.c (gss_for_code): Handle GIMPLE_DEBUG.
6810         (gimple_build_with_ops_stat): Take subcode as unsigned.  Adjust
6811         all callers.
6812         (gimple_build_debug_bind_stat): New.
6813         (empty_body_p): Skip debug stmts.
6814         (gimple_has_side_effects): Likewise.
6815         (gimple_rhs_has_side_effects): Likewise.
6816         * gimple.h (enum gimple_debug_subcode, GIMPLE_DEBUG_BIND): New.
6817         (gimple_build_debug_bind_stat): Declare.
6818         (gimple_build_debug_bind): Define.
6819         (is_gimple_debug): New.
6820         (gimple_debug_bind_p): New.
6821         (gimple_debug_bind_get_var): New.
6822         (gimple_debug_bind_get_value): New.
6823         (gimple_debug_bind_get_value_ptr): New.
6824         (gimple_debug_bind_set_var): New.
6825         (gimple_debug_bind_set_value): New.
6826         (GIMPLE_DEBUG_BIND_NOVALUE): New internal temporary macro.
6827         (gimple_debug_bind_reset_value): New.
6828         (gimple_debug_bind_has_value_p): New.
6829         (gsi_next_nondebug): New.
6830         (gsi_prev_nondebug): New.
6831         (gsi_start_nondebug_bb): New.
6832         (gsi_last_nondebug_bb): New.
6833         * sched-vis.c (print_pattern): Handle VAR_LOCATION.
6834         (print_insn): Handle DEBUG_INSN.
6835         * tree-cfg.c (remove_bb): Walk stmts backwards.  Let loc
6836         of first insn prevail.
6837         (first_stmt): Skip debug stmts.
6838         (first_non_label_stmt): Likewise.
6839         (last_stmt): Likewise.
6840         (has_zero_uses_1): New.
6841         (single_imm_use_1): New.
6842         (verify_gimple_debug): New.
6843         (verify_types_in_gimple_stmt): Handle debug stmts.
6844         (verify_stmt): Likewise.
6845         (debug_loop_num): Skip debug stmts.
6846         (remove_edge_and_dominated_blocks): Remove dominators last.
6847         * tree-ssa-reasssoc.c (rewrite_expr_tree): Propagate into debug stmts.
6848         (linearize_expr): Likewise.
6849         * config/i386/i386.c (ix86_delegitimize_address): Call
6850         default implementation.
6851         * config/ia64/ia64.c (ia64_safe_itanium_class): Handle debug insns.
6852         (group_barrier_needed): Skip debug insns.
6853         (emit_insn_group_barriers): Likewise.
6854         (emit_all_insn_group_barriers): Likewise.
6855         (ia64_variable_issue): Handle debug insns.
6856         (ia64_dfa_new_cycle): Likewise.
6857         (final_emit_insn_group_barriers): Skip debug insns.
6858         (ia64_dwarf2out_def_steady_cfa): Take frame argument.  Don't
6859         def cfa without frame.
6860         (process_set): Likewise.
6861         (process_for_unwind_directive): Pass frame on.
6862         * config/rs6000/rs6000.c (TARGET_DELEGITIMIZE_ADDRESS): Define.
6863         (rs6000_delegitimize_address): New.
6864         (rs6000_debug_adjust_cost): Handle debug insns.
6865         (is_microcoded_insn): Likewise.
6866         (is_cracked_insn): Likewise.
6867         (is_nonpipeline_insn): Likewise.
6868         (insn_must_be_first_in_group): Likewise.
6869         (insn_must_be_last_in_group): Likewise.
6870         (force_new_group): Likewise.
6871         * cfgrtl.c (rtl_split_block): Emit INSN_DELETED note if block
6872         contains only debug insns.
6873         (rtl_merge_blocks): Skip debug insns.
6874         (purge_dead_edges): Likewise.
6875         (rtl_block_ends_with_call_p): Skip debug insns.
6876         * dce.c (deletable_insn_p): Handle VAR_LOCATION.
6877         (mark_reg_dependencies): Skip debug insns.
6878         * params.def (PARAM_MIN_NONDEBUG_INSN_UID): New.
6879         * tree-ssanames.c (release_ssa_name): Propagate def into debug stmts.
6880         * tree-ssa-threadedge.c
6881         (record_temporary_equivalences_from_stmts): Skip debug stmts.
6882         * regcprop.c (replace_oldest_value_addr): Skip debug insns.
6883         (replace_oldest_value_mem): Use ALL_REGS for debug insns.
6884         (copyprop_hardreg_forward_1): Handle debug insns.
6885         * reload1.c (reload): Skip debug insns.  Replace unassigned
6886         pseudos in debug insns with their equivalences.
6887         (eliminate_regs_in_insn): Skip debug insns.
6888         (emit_input_reload_insns): Skip debug insns at first, adjust
6889         them later.
6890         * tree-ssa-operands.c (add_virtual_operand): Reject debug stmts.
6891         (get_indirect_ref_operands): Pass opf_no_vops on.
6892         (get_expr_operands): Likewise.  Skip debug stmts.
6893         (parse_ssa_operands): Scan debug insns with opf_no_vops.
6895 2009-09-01  Richard Henderson  <rth@redhat.com>
6897         * tree-ssa-ccp.c (ccp_initialize): Make sure to simulate
6898         stmt_ends_pp_p statements at least once.
6899         * tree-vrp.c (vrp_initialize): Likewise.
6900         (vrp_visit_stmt): Be prepared for non-interesting stmts.
6902 2009-09-01  Dodji Seketeli  <dodji@redhat.com>
6904         PR bootstrap/41205
6905         Fix AIX bootstrap after PR debug/30161
6906         * dwarf2out.c (make_ith_pack_parameter_name): Don't used strnlen
6907         that is a GNU extension.
6908         (tmpl_value_parm_die_table): Move the definition of this global
6909         outside #ifdef DWARF2_DEBUGGING_INFO region.
6911 2009-09-01  Richard Guenther  <rguenther@suse.de>
6913         * tree.c (tree_expr_size): New function.
6914         * tree.h (tree_expr_size): Declare.
6915         * rtlanal.c (rtx_addr_can_trap_p_1): Adjust comment.
6916         * builtins.c (fold_builtin_memory_op): Use tree_expr_size.
6917         * langhooks.c (lhd_expr_size): Remove.
6918         * langhooks.h (struct lang_hooks): Remove expr_size.
6919         * explow.c (expr_size): Use tree_expr_size.
6920         (int_expr_size): Likewise.
6921         * langhooks-def.h (lhd_expr_size): Remove.
6922         (LANG_HOOKS_EXPR_SIZE): Likewise.
6923         (LANG_HOOKS_INITIALIZER): Adjust.
6925 2009-09-01  Richard Guenther  <rguenther@suse.de>
6927         * tree-flow.h (mark_addressable): Move declaration ...
6928         * tree.h (mark_addressable): ... here.
6929         * stmt.c (expand_asm_operands): Use mark_addressable, not
6930         lang_hooks.mark_addressable.
6931         * langhooks-def.h (LANG_HOOKS_INITIALIZER): Remove
6932         LANG_HOOKS_MARK_ADDRESSABLE.
6933         * langhooks.h (struct lang_hooks): Remove mark_addressable langhook.
6934         * c-objc-common.h (LANG_HOOKS_MARK_ADDRESSABLE): Remove.
6936 2009-08-31  Chris Demetriou  <cgd@google.com>
6938         * config/i386/i386.c (ix86_vectorize_builtin_conversion): Never
6939         vectorize if not TARGET_SSE2.
6941 2009-08-31  DJ Delorie  <dj@redhat.com>
6943         * config/mep/mep.h (FUNCTION_ARG_REGNO_P): Exclude coprocessor
6944         registers if no coprocessor is enabled.
6946 2009-08-31  Dodji Seketeli  <dodji@redhat.com>
6948         PR debug/30161
6949         * cgraph.h (cgraph_get_node): Declare ...
6950         * cgraph.c (cgraph_get_node): ... new function.
6951         * dwarf2out.c (gen_generic_params_dies,
6952         generic_parameter_die, tree_add_const_value_attribute_for_decl,
6953         make_ith_pack_parameter_name,
6954         append_entry_to_tmpl_value_parm_die_table,
6955         gen_remaining_tmpl_value_param_die_attribute): New functions.
6956         (gen_subprogram_die): Generate debug info for template parameters
6957         if debug info level is higher than DINFO_LEVEL_TERSE.
6958         Use tree_add_const_value_attribute_for_decl instead of
6959         tree_add_const_value_attribute.
6960         (gen_const_die): Use tree_add_const_value_attribute_for_decl
6961         instead of tree_add_const_value_attribute.
6962         (gen_struct_or_union_type_die): Generate debug
6963         info for template parameters if debug info level is higher than
6964         DINFO_LEVEL_TERSE.
6965         (tree_add_const_value_attribute): Handle integral and pointer
6966         constants. Update comment.
6967         (dwarf_tag_name): Support DW_TAG_GNU_template_template_param.
6968         (dwarf_attr_name): Support DW_AT_GNU_template_name.
6969         (reference_to_unused): Fix thinko. Remove redundant predicates from
6970         tests.
6971         (tree_add_const_value_attribute): Make this work for constant
6972         expressions only.
6973         tree_add_const_value_attribute_for_decl is to be used for variable
6974         DECLs now.
6975         (add_location_or_const_value_attribute): Use
6976         tree_add_const_value_attribute_for_decl now.
6977         (dwarf2out_finish): Emit the DW_AT_const_value attribute of
6978         DW_TAG_template_value_param DIEs after function DIEs have been
6979         emitted.
6980         * langhooks.h (lang_hooks_for_types): Add
6981         get_argument_pack_elems.
6982         (lang_hooks_for_decls): Add generic_generic_parameter_decl_p.
6983         (lang_hooks): Added get_innermost_generic_parms,
6984         get_innermost_generic_args.
6985         * langhooks-def.h (LANG_HOOKS_GET_INNERMOST_GENERIC_PARMS,
6986         LANG_HOOKS_GET_INNERMOST_GENERIC_ARGS,
6987         LANG_HOOKS_GET_ARGUMENT_PACK_ELEMS,
6988         LANG_HOOKS_GENERIC_GENERIC_PARAMETER_DECL_P): New language hooks.
6990 2009-08-31  DJ Delorie  <dj@redhat.com>
6992         * config/mep/mep.c (machine_function): Add frame_locked flag.  Set
6993         it once we start generating the prologue or epilogue.
6994         (mep_call_saves_register): If the frame is locked, re-use
6995         cached values.
6996         (mep_assign_save_slots): New, broken out from mep_expand_prologue.
6997         (mep_expand_prologue): Call it.
6998         (mep_expand_epilogue): Likewise.
6999         (mep_start_function): Use the same logic as mep_expand_prologue.
7000         (mep_pass_by_reference): Make logic more readable.
7001         (mep_return_in_memory): Zero-sized objects are passed in memory.
7002         (mep_reorg_noframe): Make sure we have accurate REG_DEAD notes.
7004 2009-08-31  Richard Guenther  <rguenther@suse.de>
7006         * builtins.c (fold_builtin_memory_op): Use the alias oracle
7007         to query if the memory regions for memmove overlap.
7008         * tree-ssa-alias.c (ptr_deref_may_alias_decl_p): Relax the
7009         asserts on pointers, instead deal with odd trees.
7010         (ptr_derefs_may_alias_p): Likewise.
7011         (refs_may_alias_p_1): Constructor bases also never alias.
7013 2009-08-31  Gerald Pfeifer  <gerald@pfeifer.com>
7015         * doc/install.texi (Final install): Adjust reference on where to
7016         order printed manuals.
7018 2009-08-30  Olivier Hainque  <hainque@adacore.com>
7020         * dwarf2out.c (switch_to_frame_table_section): Move
7021         definition prior to first use.
7023 2009-08-30  Richard Guenther  <rguenther@suse.de>
7025         PR tree-optimization/41186
7026         * tree-ssa-alias.c (ptr_deref_may_alias_ref_p): Remove.
7027         (ao_ref_init_from_ptr_and_size): New function.
7028         (ref_maybe_used_by_call_p_1): Be more precise tracking
7029         used ranges for builtin functions.
7030         (ref_maybe_used_by_call_p): Adjust.
7031         (call_may_clobber_ref_p_1): Be more precise tracking clobbered
7032         ranges for builtin functions.
7033         * tree-ssa-alias.h (ao_ref_init_from_ptr_and_size): Declare.
7035 2009-08-30  Alan Modra  <amodra@bigpond.net.au>
7037         PR target/41081
7038         * fwprop.c (get_reg_use_in): Delete.
7039         (free_load_extend): New function.
7040         (forward_propagate_subreg): Use it.
7042 2009-08-29  Kaz Kojima  <kkojima@gcc.gnu.org>
7044         * config.gcc (sh*-*-elf): Add superh stuff only for sh*-superh-elf.
7046 2009-08-29  Kai Tietz<kai.tietz@onevision.com>
7048         PR/41184
7049         * config/i386.c (ix86_expand_epilogue): Correct stack adjustment for
7050         padding.
7052 2009-08-29  Douglas B Rupp  <rupp@gnat.com>
7054         * crtstuff.c (__do_global_dtors_aux): Use atexit if no
7055         fini or fini_array section.
7057 2009-08-28  Sebastian Pop  <sebastian.pop@amd.com>
7059         * graphite-dependences.c (graphite_legal_transform_bb): Call
7060         pbb_remove_duplicate_pdrs.
7061         * graphite-poly.c (can_collapse_pdr): Removed.
7062         (pdr_find_duplicate): Removed.
7063         (can_collapse_pdrs): New.
7064         (pbb_remove_duplicate_pdrs): New.
7065         (new_poly_dr): Do not look for duplicates.
7066         * graphite-poly.h (struct poly_bb): New field pdr_duplicates_removed.
7067         (PBB_PDR_DUPLICATES_REMOVED): New.
7068         (pbb_remove_duplicate_pdrs): Declared.
7070 2009-08-28  Sebastian Pop  <sebastian.pop@amd.com>
7072         * graphite-interchange.c (pbb_interchange_profitable_p): Adjust
7073         the strides by multiplying by PDR_NB_REFS.
7074         * graphite-poly.c (can_collapse_pdr): New.
7075         (pdr_find_duplicate): New.
7076         (new_poly_dr): Call pdr_find_duplicate.  Collapse duplicate PDRs.
7077         Initialize PDR_NB_REFS.
7078         * graphite-poly.h (struct poly_dr): Add field nb_refs.
7079         (PDR_NB_REFS): New.
7080         (new_poly_dr): Number of subscripts is a graphite_dim_t.
7082 2009-08-28  Sebastian Pop  <sebastian.pop@amd.com>
7084         PR middle-end/40965
7085         * graphite-poly.c (apply_poly_transforms): Remove legality test before
7086         any transform.
7088 2009-08-28  Sebastian Pop  <sebastian.pop@amd.com>
7090         * graphite-dependences.c (pddr_original_scattering): Return NULL
7091         for read-read dependence relations.
7092         * graphite-poly.h (enum poly_dr_type): Fix comment.
7093         (pdr_read_p): New.
7094         (pdr_write_p): New.
7095         (pdr_may_write_p): New.
7097 2009-08-28  Sebastian Pop  <sebastian.pop@amd.com>
7099         * graphite-poly.h (enum POLY_DR_TYPE): Renamed poly_dr_type.
7100         (struct poly_dr): Same.
7101         (new_poly_dr): Same.
7102         * graphite-poly.c (new_poly_dr): Same.
7103         * graphite-dependences.c (dot_deps): Disable call to system.
7105 2009-08-28  Cary Coutant  <ccoutant@google.com>
7107         PR debug/41063
7108         * dwarf2out.c (gen_type_die_with_usage): Use proper context for
7109         struct/union/enum types local to a function.
7111 2009-08-28  Konrad Trifunovic  <konrad.trifunovic@gmail.com>
7112             Sebastian Pop  <sebastian.pop@amd.com>
7114         * graphite-blocking.c (pbb_strip_mine_loop_depth): Renamed
7115         pbb_strip_mine_time_depth.  Changed the implementation so that
7116         transformation is expressed as a transformation on
7117         time (scatttering) dimensions.  Also, ensures that the 2d+1
7118         scheduling format is preserved.
7119         (pbb_strip_mine_profitable_p): Profitability is based on the
7120         iteration number of a given time (scattering) dimension,
7121         and not on a original loop depth dimension.
7122         (pbb_strip_mine): Call pbb_number_of_iterations_at_time.
7123         (pbb_do_strip_mine): Call psct_dynamic_dim.
7124         * graphite-poly.c (pbb_number_of_iterations_at_time): New.
7125         * graphite-poly.h (pbb_number_of_iterations_at_time): Declared.
7126         (pbb_nb_dynamic_scattering_transform): New.
7127         (psct_dynamic_dim): New.
7129 2009-08-28  Konrad Trifunovic  <konrad.trifunovic@gmail.com>
7131         * graphite-ppl.c (ppl_max_for_le): Renamed ppl_max_for_le_pointset.
7132         * graphite-ppl.h (ppl_max_for_le): Renamed ppl_max_for_le_pointset.
7133         * graphite-poly.c (pbb_number_of_iterations): Rename ppl_max_for_le.
7134         * graphite-interchange.c (build_linearized_memory_access): Same.
7135         (memory_stride_in_loop): Same.
7137 2009-08-28  Sebastian Pop  <sebastian.pop@amd.com>
7139         * graphite-dependences.c (pddr_original_scattering): New.
7140         (graphite_legal_transform_dr): Call pddr_original_scattering.
7141         (dot_deps_1): New.
7142         (dot_deps): New.
7143         * graphite-dependences.h (dot_deps): Declared.
7144         * graphite-poly.c (new_poly_dr): Initialize PDR_ID.
7145         (print_pdr): Print PDR_ID.
7146         * graphite-poly.h (struct poly_dr): Add field id.
7147         (PDR_ID): New.
7148         (pbb_index): New.
7149         * graphite-scop-detection.c (dot_all_scops_1): Cleanup comment.
7151 2009-08-28  Sebastian Pop  <sebastian.pop@amd.com>
7153         * graphite-dependences.c (graphite_carried_dependence_level_k): Do
7154         not delete the original dependence relation.
7156 2009-08-28  Sebastian Pop  <sebastian.pop@amd.com>
7158         * graphite-dependences.c (new_poly_dr_pair): Renamed new_poly_ddr.
7159         (eq_poly_dr_pair_p): Renamed eq_poly_ddr_p.
7160         (hash_poly_dr_pair_p): Renamed hash_poly_ddr_p.
7161         (free_poly_ddr): New.
7162         (pddr_is_empty): New.
7163         (dependence_polyhedron_1): Now returns a poly_ddr_p.
7164         (dependence_polyhedron): Same.  Remove useless gcc_assert.
7165         Remove fprintfs.
7166         (graphite_legal_transform_dr): Call pddr_is_empty and free_poly_ddr.
7167         (graphite_carried_dependence_level_k): Call pddr_is_empty.
7168         * graphite-dependences.h (enum poly_dependence_kind): New.
7169         (poly_dr_pair): Renamed poly_ddr.  Added a field kind.
7170         (PDRP_SOURCE): Renamed PDDR_SOURCE.
7171         (PDRP_SINK): Renamed PDDR_SINK.
7172         (PDRP_DDP): Renamed PDDR_DDP.
7173         (PDDR_KIND): New.
7174         (free_poly_ddr): Declared.
7175         * graphite-poly.c (new_scop): Use the new hash function names.
7176         * graphite-poly.h (struct scop): Renamed field original_pdr_pairs
7177         into original_pddrs.
7178         (SCOP_ORIGINAL_PDR_PAIRS): Renamed SCOP_ORIGINAL_PDDRS.
7180 2009-08-28  Sebastian Pop  <sebastian.pop@amd.com>
7182         * cfgloopmanip.c (create_empty_loop_on_edge): Generate upper
7183         bounds with LT_EXPR to make niter analysis more precise on code
7184         generated by Graphite.
7186 2009-08-28  Sebastian Pop  <sebastian.pop@amd.com>
7188         * graphite-dependences.c (graphite_legal_transform_dr): Fix formatting.
7189         (graphite_legal_transform_bb): Same.
7190         (poly_drs_may_alias_p): Same.
7192 2009-08-28  Richard Guenther  <rguenther@suse.de>
7194         * tree.def: Remove note about obsolete TYPE_NONCOPIED_PARTS.
7196 2009-08-28  Jan Beulich  <jbeulich@novell.com>
7198         * config/i386/netware.c: Include langhooks.h.
7199         (i386_nlm_encode_section_info): Simplify.
7200         (netware_override_options): Delete.
7201         * config/i386/netware.h (netware_override_options): Delete
7202         declaration.
7203         (OVERRIDE_OPTIONS): Delete definition.
7204         (SUBTARGET_OVERRIDE_OPTIONS): Define.
7205         (ASM_COMMENT_START): Define.
7206         * config/i386/nwld.h (SUBSUBTARGET_OVERRIDE_OPTIONS): Define.
7208 2009-08-28  Jan Beulich  <jbeulich@novell.com>
7210         * configure.ac: For in-tree ld, do a plain version check to
7211         determine whether comdat groups are supported.
7212         * configure: Regenerate.
7214 2009-08-28  Olivier Hainque  <hainque@adacore.com>
7216         * collect2.c (DO_COLLECT_EXPORT_LIST): New internal macro,
7217         always defined.  Reflect definition or absence of such for
7218         COLLECT_EXPORT_LIST.  Readability helper.
7219         (scanfilter): New enum, to help control what symbols
7220         are to be considered or ignored by scan_prog_file.
7221         (enum pass): Rename as "scanpass", moved together with scanfilter
7222         prior to scan_prog_file's prototype.
7223         (scan_prog_file): Accept and honor scanpass and scanfilter arguments.
7224         Group prototype with the scanpass/scanfilter definitions, factorize
7225         head comments for the several implementations at the prototype.
7226         (main): Reorganize the first pass link control to let AIX
7227         drag only the needed frame tables in executables.  Prevent
7228         frame tables collection during the scan aimed at static ctors.
7229         Pre-link and scan for frame tables later to compensate.
7230         * doc/tm.texi (ASM_OUTPUT_DWARF_TABLE_REF): New macro.
7231         A C statement to issue assembly directives that create a reference
7232         to the given DWARF table identifier label from the current function
7233         section.
7234         * dwarf2out.c (switch_to_eh_frame_section): Add a BACK argument
7235         to differentiate first time section entry.  Only emit a .data
7236         tables start identifier label the first time around.
7237         (switch_to_frame_table_section): New function.  Helper for
7238         output_call_frame_info to switch possibly BACK into the eh_frame
7239         or the debug_frame section depending on FOR_EH.
7240         (output_call_frame_info): Use helper to first enter the proper
7241         frame section.
7242         (output_fde): Use ASM_OUTPUT_DWARF_TABLE_REF when defined to
7243         emit a link to the frame table start label from each function
7244         section.
7245         * config/rs6000/rs6000.c (rs6000_aix_asm_output_dwarf_table_ref):
7246         New function.  Implementation of ASM_OUTPUT_DWARF_TABLE_REF.
7247         * config/rs6000/rs6000-protos.h: Declare it.
7248         * config/rs6000/aix.h (ASM_OUTPUT_DWARF_TABLE_REF): Define.
7250 2009-08-27  Kaz Kojima  <kkojima@gcc.gnu.org>
7252         * config/sh/sh.c (split_branches): Check the result of
7253         next_active_insn.
7255 2009-08-27  Steve Ellcey  <sje@cup.hp.com>
7257         * config/ia64/hpux.h (LIB_SPEC): Add -lrt for when
7258         using -pthread -fopenmp
7260 2009-08-27  Gerald Pfeifer  <gerald@pfeifer.com>
7262         * doc/service.texi (service directory): Update URL.
7264 2009-08-27  Uros Bizjak  <ubizjak@gmail.com>
7266         PR rtl-optimization/40861
7267         * simplify-rtx.c (simplify_subreg): Do not call simplify_gen_subreg to
7268         extract word from a multi-word subreg for negative byte positions.
7270 2009-08-27  Tristan Gingold  <gingold@adacore.com>
7271             Douglas B Rupp  <rupp@gnat.com>
7273         * config/ia64/ia64.c (ia64_attribute_table): Add "common_object" entry.
7274         (SECTION_VMS_OVERLAY): Define.
7275         (ia64_vms_common_object_attribute): Added.  Handle the "common_object"
7276         attribute.
7277         (ia64_vms_elf_asm_named_section): Added.  Generate .section pseudo-op
7278         for common_object.
7279         (ia64_vms_output_aligned_decl_common): Added.  Generate pseudo-op for
7280         common_object declarations.
7281         (ia64_section_type_flags): Set section flag for common_object.
7282         * config/ia64/ia64-protos.h
7283         (ia64_vms_output_aligned_decl_common): Declare.
7284         (ia64_vms_elf_asm_named_section): Declare.
7286 2009-08-27  Michael Matz  <matz@suse.de>
7288         * expr.c (expand_expr_real_2): New function taking exploded
7289         unary or binary expression, split out from ...
7290         (expand_expr_real_1): ... here.  Move over all unary/binary
7291         switch parts to above function, in particular these codes:
7292         PAREN_EXPR, NOP_EXPR, CONVERT_EXPR, POINTER_PLUS_EXPR, PLUS_EXPR,
7293         MINUS_EXPR, MULT_EXPR, TRUNC_DIV_EXPR, FLOOR_DIV_EXPR, CEIL_DIV_EXPR,
7294         ROUND_DIV_EXPR, EXACT_DIV_EXPR, RDIV_EXPR, TRUNC_MOD_EXPR,
7295         FLOOR_MOD_EXPR, CEIL_MOD_EXPR, ROUND_MOD_EXPR, FIXED_CONVERT_EXPR,
7296         FIX_TRUNC_EXPR, FLOAT_EXPR, NEGATE_EXPR, ABS_EXPR, MAX_EXPR, MIN_EXPR,
7297         BIT_NOT_EXPR, TRUTH_AND_EXPR, BIT_AND_EXPR, TRUTH_OR_EXPR,
7298         BIT_IOR_EXPR, TRUTH_XOR_EXPR, BIT_XOR_EXPR, LROTATE_EXPR, RROTATE_EXPR,
7299         LSHIFT_EXPR, RSHIFT_EXPR, LT_EXPR, LE_EXPR, GT_EXPR, GE_EXPR, EQ_EXPR,
7300         NE_EXPR, UNORDERED_EXPR, ORDERED_EXPR, UNLT_EXPR, UNLE_EXPR, UNGT_EXPR,
7301         UNGE_EXPR, UNEQ_EXPR, LTGT_EXPR, TRUTH_NOT_EXPR, COMPLEX_EXPR,
7302         WIDEN_SUM_EXPR, REDUC_MAX_EXPR, REDUC_MIN_EXPR, REDUC_PLUS_EXPR,
7303         VEC_EXTRACT_EVEN_EXPR, VEC_EXTRACT_ODD_EXPR, VEC_INTERLEAVE_HIGH_EXPR,
7304         VEC_INTERLEAVE_LOW_EXPR, VEC_LSHIFT_EXPR, VEC_RSHIFT_EXPR,
7305         VEC_UNPACK_HI_EXPR, VEC_UNPACK_LO_EXPR, VEC_UNPACK_FLOAT_HI_EXPR,
7306         VEC_UNPACK_FLOAT_LO_EXPR, VEC_WIDEN_MULT_HI_EXPR,
7307         VEC_WIDEN_MULT_LO_EXPR, VEC_PACK_TRUNC_EXPR, VEC_PACK_SAT_EXPR,
7308         VEC_PACK_FIX_TRUNC_EXPR.
7309         (<case PAREN_EXPR>): Call set_mem_attributes() with type, not the
7310         full expression.
7312 2009-08-27  Richard Guenther  <rguenther@suse.de>
7314         * gengtype.c (main): Handle uint64_t.
7315         * ipa-utils.c (get_base_var): Indent properly.
7316         * tree-ssa-live.c (debug_scope_block): New function.
7317         * tree-flow.h (debug_scope_block): Declare.
7318         * tree-ssa-copy.c (replace_exp_1): Add vertical space.
7319         * basic-block.h (enum profile_status): Rename to
7320         enum profile_status_d.
7321         (x_profile_status): Adjust type.
7323 2009-08-27  Dodji Seketeli  <dodji@redhat.com>
7325         PR debug/41170
7326         * dwarf2out.c (get_context_die): Declare this static function.
7327         (gen_type_die_with_usage): Make sure a DIE is a generated for
7328         the context of a typedef.
7330 2009-08-26  Anatoly Sokolov  <aesok@post.ru>
7332         * doc/invoke.texi (AVR Options): Remove documentation of -minit-stack
7333         switch.
7335 2009-08-26  Richard Sandiford  <rdsandiford@googlemail.com>
7337         * config/mips/mips-protos.h (mips_output_sync): Declare.
7338         (mips_sync_loop_insns): Likewise.
7339         (mips_output_sync_loop): Replace first two parameters with an rtx.
7340         * config/mips/mips.c (mips_multi_member): New structure.
7341         (mips_multi_members): New variable.
7342         (mips_multi_start): New function.
7343         (mips_multi_add): Likewise.
7344         (mips_multi_add_insn): Likewise.
7345         (mips_multi_add_label): Likewise.
7346         (mips_multi_last_index): Likewise.
7347         (mips_multi_copy_insn): Likewise.
7348         (mips_multi_set_operand): Likewise.
7349         (mips_multi_write): Likewise.
7350         (mips_print_operand_punctuation): Remove '%|' and '%-'.
7351         (mips_init_print_operand_punct): Update accordingly.
7352         (mips_start_ll_sc_sync_block): New function.
7353         (mips_end_ll_sc_sync_block): Likewise.
7354         (mips_output_sync): Likewise.
7355         (mips_sync_insn1_template): Likewise.
7356         (mips_sync_insn2_template): Likewise.
7357         (mips_get_sync_operand): Likewise.
7358         (mips_process_sync_loop): Likewise.
7359         (mips_output_sync_loop): Use mips_process_sync_loop.
7360         (mips_sync_loop_insns): New function.
7361         * config/mips/mips.h (MIPS_COMPARE_AND_SWAP): Delete.
7362         (MIPS_COMPARE_AND_SWAP_12): Likewise.
7363         (MIPS_COMPARE_AND_SWAP_12_ZERO_OP): Likewise.
7364         (MIPS_COMPARE_AND_SWAP_12_NONZERO_OP): Likewise.
7365         (MIPS_SYNC_OP, MIPS_SYNC_OP_12): Likewise.
7366         (MIPS_SYNC_OP_12_AND, MIPS_SYNC_OP_12_XOR): Likewise.
7367         (MIPS_SYNC_OLD_OP_12): Likewise.
7368         (MIPS_SYNC_OLD_OP_12_AND, MIPS_SYNC_OLD_OP_12_XOR): Likewise.
7369         (MIPS_SYNC_NEW_OP_12): Likewise.
7370         (MIPS_SYNC_NEW_OP_12_AND, MIPS_SYNC_NEW_OP_12_XOR): Likewise.
7371         (MIPS_SYNC_OLD_OP, MIPS_SYNC_NEW_OP): Likewise.
7372         (MIPS_SYNC_NAND, MIPS_SYNC_OLD_NAND, MIPS_SYNC_NEW_NAND): Likewise.
7373         (MIPS_SYNC_EXCHANGE, MIPS_SYNC_EXCHANGE_12): Likewise.
7374         (MIPS_SYNC_EXCHANGE_12_ZERO_OP): Likewise.
7375         (MIPS_SYNC_EXCHANGE_12_NONZER_OP): Likewise.
7376         * config/mips/mips.md (sync_mem): New attribute.
7377         (sync_oldval, sync_newval, sync_inclusive_mask): Likewise.
7378         (sync_exclusive_mask, sync_required_oldval): Likewise.
7379         (sync_insn1_op2, sync_insn1, sync_insn2): Likewise.
7380         (sync_release_barrier): Likewise.
7381         (length): Handle sync loops.
7382         (sync): Use mips_output_sync.
7383         * config/mips/sync.md (*memory_barrier): Use mips_output_sync.
7384         (sync_compare_and_swap<mode>): Set the new sync_* attributes
7385         and use mips_output_sync_loop.
7386         (compare_and_swap_12, sync_add<mode>, sync_<optab>_12): Likewise.
7387         (sync_old_<optab>_12, sync_new_<optab>_12, sync_nand_12): Likewise.
7388         (sync_old_nand_12, sync_new_nand_12, sync_sub<mode>): Likewise.
7389         (sync_old_add<mode>, sync_old_sub<mode>): Likewise.
7390         (sync_new_add<mode>, sync_new_sub<mode>): Likewise.
7391         (sync_<optab><mode>, sync_old_<optab><mode>): Likewise.
7392         (sync_new_<optab><mode>, sync_nand<mode>): Likewise.
7393         (sync_old_nand<mode>, sync_new_nand<mode>): Likewise.
7394         (sync_lock_test_and_set<mode>, test_and_set_12): Likewise.
7396 2009-08-26  Richard Guenther  <rguenther@suse.de>
7398         PR middle-end/41163
7399         * gimplify.c (gimplify_addr_expr): Canonicalize ADDR_EXPRs if
7400         the types to not match.
7401         * tree-cfg.c (verify_gimple_assign_single): Adjust ADDR_EXPR
7402         verification.
7403         * tree-ssa.c (useless_type_conversion_p): Conversions to
7404         pointers to unprototyped functions are useless.
7406 2009-08-26  Richard Guenther  <rguenther@suse.de>
7408         * tree-ssa-structalias.c (create_variable_info_for): Remove strange
7409         whole-program condition, prepare to be called for non-globals.
7410         (intra_create_variable_infos): For restrict qualified DECL_BY_REFERENCE
7411         params build a representative with known type and track its fields.
7413 2009-08-26  Uros Bizjak  <ubizjak@gmail.com>
7415         * config/alpha/sync.md: Update comment about unpredictable LL/SC lock
7416         clearing by a taken branch.
7417         (sync_<fetchop_name><mode>): Split when epilogue_completed is set,
7418         effectively after bbro pass.
7419         (sync_nand<mode>): Ditto.
7420         (sync_old_<fetchop_name><mode>): Ditto.
7421         (sync_old_nand<mode>): Ditto.
7422         (sync_new_<fetchop_name><mode>): Dito.
7423         (sync_new_nand<mode>): Ditto.
7424         (sync_compare_and_swap<mode>_1): Ditto.
7425         (*sync_compare_and_swap<mode>): Ditto.
7426         (sync_lock_test_and_set<mode>_1): Ditto.
7427         ("sync_lock_test_and_set<mode>): Ditto.
7429 2009-08-25  Douglas B Rupp  <rupp@gnat.com>
7431         * hwint.h (HOST_LONG_FORMAT): New macro
7432         * bitmap.c, c-decl.c, mips-tfile.c, print-rtl.c, print-tree.c:
7433         Use HOST_PTR_PRINTF.
7434         * system.h (HOST_PTR_PRINTF): Resurrect old macro
7435         * doc/hostconfig.texi (HOST_LONG_FORMAT): Document.
7436         (HOST_PTR_PRINTF): Document.
7438 2009-08-25 Jan Hubicka  <jh@suse.cz>
7440         * config/i386/bmmintrin.h: Replace by #error.
7442         Revert:
7443         Michael Meissner  <michael.meissner@amd.com>
7444         Dwarakanath Rajagopal  <dwarak.rajagopal@amd.com>
7445         Tony Linthicum  <tony.linthicum@amd.com>
7447         * config/i386/i386.h (TARGET_SSE5): New macro for SSE5.
7448         (TARGET_ROUND): New macro for the round/ptest instructions which
7449         are shared between SSE4.1 and SSE5.
7450         (OPTION_MASK_ISA_ROUND): Ditto.
7451         (OPTION_ISA_ROUND): Ditto.
7452         (TARGET_FUSED_MADD): New macro for -mfused-madd swtich.
7453         (TARGET_CPU_CPP_BUILTINS): Add SSE5 support.
7455         * config/i386/i386.opt (-msse5): New switch for SSE5 support.
7456         (-mfused-madd): New switch to give users control over whether the
7457         compiler optimizes to use the multiply/add SSE5 instructions.
7459         * config/i386/i386.c (enum pta_flags): Add PTA_SSE5.
7460         (ix86_handle_option): Turn off 3dnow if -msse5.
7461         (override_options): Add SSE5 support.
7462         (print_operand): %Y prints comparison codes for SSE5 com/pcom
7463         instructions.
7464         (ix86_expand_sse_movcc): Add SSE5 support.
7465         (ix86_expand_sse5_unpack): New function to use pperm to unpack a
7466         vector type to the next largest size.
7467         (ix86_expand_sse5_pack): New function to use pperm to pack a
7468         vector type to the next smallest size.
7469         (IX86_BUILTIN_FMADDSS): New for SSE5 intrinsic.
7470         (IX86_BUILTIN_FMADDSD): Ditto.
7471         (IX86_BUILTIN_FMADDPS): Ditto.
7472         (IX86_BUILTIN_FMADDPD): Ditto.
7473         (IX86_BUILTIN_FMSUBSS): Ditto.
7474         (IX86_BUILTIN_FMSUBSD): Ditto.
7475         (IX86_BUILTIN_FMSUBPS): Ditto.
7476         (IX86_BUILTIN_FMSUBPD): Ditto.
7477         (IX86_BUILTIN_FNMADDSS): Ditto.
7478         (IX86_BUILTIN_FNMADDSD): Ditto.
7479         (IX86_BUILTIN_FNMADDPS): Ditto.
7480         (IX86_BUILTIN_FNMADDPD): Ditto.
7481         (IX86_BUILTIN_FNMSUBSS): Ditto.
7482         (IX86_BUILTIN_FNMSUBSD): Ditto.
7483         (IX86_BUILTIN_FNMSUBPS): Ditto.
7484         (IX86_BUILTIN_FNMSUBPD): Ditto.
7485         (IX86_BUILTIN_PCMOV_V2DI): Ditto.
7486         (IX86_BUILTIN_PCMOV_V4SI): Ditto.
7487         (IX86_BUILTIN_PCMOV_V8HI): Ditto.
7488         (IX86_BUILTIN_PCMOV_V16QI): Ditto.
7489         (IX86_BUILTIN_PCMOV_V4SF): Ditto.
7490         (IX86_BUILTIN_PCMOV_V2DF): Ditto.
7491         (IX86_BUILTIN_PPERM): Ditto.
7492         (IX86_BUILTIN_PERMPS): Ditto.
7493         (IX86_BUILTIN_PERMPD): Ditto.
7494         (IX86_BUILTIN_PMACSSWW): Ditto.
7495         (IX86_BUILTIN_PMACSWW): Ditto.
7496         (IX86_BUILTIN_PMACSSWD): Ditto.
7497         (IX86_BUILTIN_PMACSWD): Ditto.
7498         (IX86_BUILTIN_PMACSSDD): Ditto.
7499         (IX86_BUILTIN_PMACSDD): Ditto.
7500         (IX86_BUILTIN_PMACSSDQL): Ditto.
7501         (IX86_BUILTIN_PMACSSDQH): Ditto.
7502         (IX86_BUILTIN_PMACSDQL): Ditto.
7503         (IX86_BUILTIN_PMACSDQH): Ditto.
7504         (IX86_BUILTIN_PMADCSSWD): Ditto.
7505         (IX86_BUILTIN_PMADCSWD): Ditto.
7506         (IX86_BUILTIN_PHADDBW): Ditto.
7507         (IX86_BUILTIN_PHADDBD): Ditto.
7508         (IX86_BUILTIN_PHADDBQ): Ditto.
7509         (IX86_BUILTIN_PHADDWD): Ditto.
7510         (IX86_BUILTIN_PHADDWQ): Ditto.
7511         (IX86_BUILTIN_PHADDDQ): Ditto.
7512         (IX86_BUILTIN_PHADDUBW): Ditto.
7513         (IX86_BUILTIN_PHADDUBD): Ditto.
7514         (IX86_BUILTIN_PHADDUBQ): Ditto.
7515         (IX86_BUILTIN_PHADDUWD): Ditto.
7516         (IX86_BUILTIN_PHADDUWQ): Ditto.
7517         (IX86_BUILTIN_PHADDUDQ): Ditto.
7518         (IX86_BUILTIN_PHSUBBW): Ditto.
7519         (IX86_BUILTIN_PHSUBWD): Ditto.
7520         (IX86_BUILTIN_PHSUBDQ): Ditto.
7521         (IX86_BUILTIN_PROTB): Ditto.
7522         (IX86_BUILTIN_PROTW): Ditto.
7523         (IX86_BUILTIN_PROTD): Ditto.
7524         (IX86_BUILTIN_PROTQ): Ditto.
7525         (IX86_BUILTIN_PROTB_IMM): Ditto.
7526         (IX86_BUILTIN_PROTW_IMM): Ditto.
7527         (IX86_BUILTIN_PROTD_IMM): Ditto.
7528         (IX86_BUILTIN_PROTQ_IMM): Ditto.
7529         (IX86_BUILTIN_PSHLB): Ditto.
7530         (IX86_BUILTIN_PSHLW): Ditto.
7531         (IX86_BUILTIN_PSHLD): Ditto.
7532         (IX86_BUILTIN_PSHLQ): Ditto.
7533         (IX86_BUILTIN_PSHAB): Ditto.
7534         (IX86_BUILTIN_PSHAW): Ditto.
7535         (IX86_BUILTIN_PSHAD): Ditto.
7536         (IX86_BUILTIN_PSHAQ): Ditto.
7537         (IX86_BUILTIN_FRCZSS): Ditto.
7538         (IX86_BUILTIN_FRCZSD): Ditto.
7539         (IX86_BUILTIN_FRCZPS): Ditto.
7540         (IX86_BUILTIN_FRCZPD): Ditto.
7541         (IX86_BUILTIN_CVTPH2PS): Ditto.
7542         (IX86_BUILTIN_CVTPS2PH): Ditto.
7543         (IX86_BUILTIN_COMEQSS): Ditto.
7544         (IX86_BUILTIN_COMNESS): Ditto.
7545         (IX86_BUILTIN_COMLTSS): Ditto.
7546         (IX86_BUILTIN_COMLESS): Ditto.
7547         (IX86_BUILTIN_COMGTSS): Ditto.
7548         (IX86_BUILTIN_COMGESS): Ditto.
7549         (IX86_BUILTIN_COMUEQSS): Ditto.
7550         (IX86_BUILTIN_COMUNESS): Ditto.
7551         (IX86_BUILTIN_COMULTSS): Ditto.
7552         (IX86_BUILTIN_COMULESS): Ditto.
7553         (IX86_BUILTIN_COMUGTSS): Ditto.
7554         (IX86_BUILTIN_COMUGESS): Ditto.
7555         (IX86_BUILTIN_COMORDSS): Ditto.
7556         (IX86_BUILTIN_COMUNORDSS): Ditto.
7557         (IX86_BUILTIN_COMFALSESS): Ditto.
7558         (IX86_BUILTIN_COMTRUESS): Ditto.
7559         (IX86_BUILTIN_COMEQSD): Ditto.
7560         (IX86_BUILTIN_COMNESD): Ditto.
7561         (IX86_BUILTIN_COMLTSD): Ditto.
7562         (IX86_BUILTIN_COMLESD): Ditto.
7563         (IX86_BUILTIN_COMGTSD): Ditto.
7564         (IX86_BUILTIN_COMGESD): Ditto.
7565         (IX86_BUILTIN_COMUEQSD): Ditto.
7566         (IX86_BUILTIN_COMUNESD): Ditto.
7567         (IX86_BUILTIN_COMULTSD): Ditto.
7568         (IX86_BUILTIN_COMULESD): Ditto.
7569         (IX86_BUILTIN_COMUGTSD): Ditto.
7570         (IX86_BUILTIN_COMUGESD): Ditto.
7571         (IX86_BUILTIN_COMORDSD): Ditto.
7572         (IX86_BUILTIN_COMUNORDSD): Ditto.
7573         (IX86_BUILTIN_COMFALSESD): Ditto.
7574         (IX86_BUILTIN_COMTRUESD): Ditto.
7575         (IX86_BUILTIN_COMEQPS): Ditto.
7576         (IX86_BUILTIN_COMNEPS): Ditto.
7577         (IX86_BUILTIN_COMLTPS): Ditto.
7578         (IX86_BUILTIN_COMLEPS): Ditto.
7579         (IX86_BUILTIN_COMGTPS): Ditto.
7580         (IX86_BUILTIN_COMGEPS): Ditto.
7581         (IX86_BUILTIN_COMUEQPS): Ditto.
7582         (IX86_BUILTIN_COMUNEPS): Ditto.
7583         (IX86_BUILTIN_COMULTPS): Ditto.
7584         (IX86_BUILTIN_COMULEPS): Ditto.
7585         (IX86_BUILTIN_COMUGTPS): Ditto.
7586         (IX86_BUILTIN_COMUGEPS): Ditto.
7587         (IX86_BUILTIN_COMORDPS): Ditto.
7588         (IX86_BUILTIN_COMUNORDPS): Ditto.
7589         (IX86_BUILTIN_COMFALSEPS): Ditto.
7590         (IX86_BUILTIN_COMTRUEPS): Ditto.
7591         (IX86_BUILTIN_COMEQPD): Ditto.
7592         (IX86_BUILTIN_COMNEPD): Ditto.
7593         (IX86_BUILTIN_COMLTPD): Ditto.
7594         (IX86_BUILTIN_COMLEPD): Ditto.
7595         (IX86_BUILTIN_COMGTPD): Ditto.
7596         (IX86_BUILTIN_COMGEPD): Ditto.
7597         (IX86_BUILTIN_COMUEQPD): Ditto.
7598         (IX86_BUILTIN_COMUNEPD): Ditto.
7599         (IX86_BUILTIN_COMULTPD): Ditto.
7600         (IX86_BUILTIN_COMULEPD): Ditto.
7601         (IX86_BUILTIN_COMUGTPD): Ditto.
7602         (IX86_BUILTIN_COMUGEPD): Ditto.
7603         (IX86_BUILTIN_COMORDPD): Ditto.
7604         (IX86_BUILTIN_COMUNORDPD): Ditto.
7605         (IX86_BUILTIN_COMFALSEPD): Ditto.
7606         (IX86_BUILTIN_COMTRUEPD): Ditto.
7607         (IX86_BUILTIN_PCOMEQUB): Ditto.
7608         (IX86_BUILTIN_PCOMNEUB): Ditto.
7609         (IX86_BUILTIN_PCOMLTUB): Ditto.
7610         (IX86_BUILTIN_PCOMLEUB): Ditto.
7611         (IX86_BUILTIN_PCOMGTUB): Ditto.
7612         (IX86_BUILTIN_PCOMGEUB): Ditto.
7613         (IX86_BUILTIN_PCOMFALSEUB): Ditto.
7614         (IX86_BUILTIN_PCOMTRUEUB): Ditto.
7615         (IX86_BUILTIN_PCOMEQUW): Ditto.
7616         (IX86_BUILTIN_PCOMNEUW): Ditto.
7617         (IX86_BUILTIN_PCOMLTUW): Ditto.
7618         (IX86_BUILTIN_PCOMLEUW): Ditto.
7619         (IX86_BUILTIN_PCOMGTUW): Ditto.
7620         (IX86_BUILTIN_PCOMGEUW): Ditto.
7621         (IX86_BUILTIN_PCOMFALSEUW): Ditto.
7622         (IX86_BUILTIN_PCOMTRUEUW): Ditto.
7623         (IX86_BUILTIN_PCOMEQUD): Ditto.
7624         (IX86_BUILTIN_PCOMNEUD): Ditto.
7625         (IX86_BUILTIN_PCOMLTUD): Ditto.
7626         (IX86_BUILTIN_PCOMLEUD): Ditto.
7627         (IX86_BUILTIN_PCOMGTUD): Ditto.
7628         (IX86_BUILTIN_PCOMGEUD): Ditto.
7629         (IX86_BUILTIN_PCOMFALSEUD): Ditto.
7630         (IX86_BUILTIN_PCOMTRUEUD): Ditto.
7631         (IX86_BUILTIN_PCOMEQUQ): Ditto.
7632         (IX86_BUILTIN_PCOMNEUQ): Ditto.
7633         (IX86_BUILTIN_PCOMLTUQ): Ditto.
7634         (IX86_BUILTIN_PCOMLEUQ): Ditto.
7635         (IX86_BUILTIN_PCOMGTUQ): Ditto.
7636         (IX86_BUILTIN_PCOMGEUQ): Ditto.
7637         (IX86_BUILTIN_PCOMFALSEUQ): Ditto.
7638         (IX86_BUILTIN_PCOMTRUEUQ): Ditto.
7639         (IX86_BUILTIN_PCOMEQB): Ditto.
7640         (IX86_BUILTIN_PCOMNEB): Ditto.
7641         (IX86_BUILTIN_PCOMLTB): Ditto.
7642         (IX86_BUILTIN_PCOMLEB): Ditto.
7643         (IX86_BUILTIN_PCOMGTB): Ditto.
7644         (IX86_BUILTIN_PCOMGEB): Ditto.
7645         (IX86_BUILTIN_PCOMFALSEB): Ditto.
7646         (IX86_BUILTIN_PCOMTRUEB): Ditto.
7647         (IX86_BUILTIN_PCOMEQW): Ditto.
7648         (IX86_BUILTIN_PCOMNEW): Ditto.
7649         (IX86_BUILTIN_PCOMLTW): Ditto.
7650         (IX86_BUILTIN_PCOMLEW): Ditto.
7651         (IX86_BUILTIN_PCOMGTW): Ditto.
7652         (IX86_BUILTIN_PCOMGEW): Ditto.
7653         (IX86_BUILTIN_PCOMFALSEW): Ditto.
7654         (IX86_BUILTIN_PCOMTRUEW): Ditto.
7655         (IX86_BUILTIN_PCOMEQD): Ditto.
7656         (IX86_BUILTIN_PCOMNED): Ditto.
7657         (IX86_BUILTIN_PCOMLTD): Ditto.
7658         (IX86_BUILTIN_PCOMLED): Ditto.
7659         (IX86_BUILTIN_PCOMGTD): Ditto.
7660         (IX86_BUILTIN_PCOMGED): Ditto.
7661         (IX86_BUILTIN_PCOMFALSED): Ditto.
7662         (IX86_BUILTIN_PCOMTRUED): Ditto.
7663         (IX86_BUILTIN_PCOMEQQ): Ditto.
7664         (IX86_BUILTIN_PCOMNEQ): Ditto.
7665         (IX86_BUILTIN_PCOMLTQ): Ditto.
7666         (IX86_BUILTIN_PCOMLEQ): Ditto.
7667         (IX86_BUILTIN_PCOMGTQ): Ditto.
7668         (IX86_BUILTIN_PCOMGEQ): Ditto.
7669         (IX86_BUILTIN_PCOMFALSEQ): Ditto.
7670         (IX86_BUILTIN_PCOMTRUEQ): Ditto.
7671         (enum multi_arg_type): New enum for describing the various SSE5
7672         intrinsic argument types.
7673         (bdesc_multi_arg): New table for SSE5 intrinsics.
7674         (ix86_init_mmx_sse_builtins): Add SSE5 intrinsic support.
7675         (ix86_expand_multi_arg_builtin): New function for creating SSE5
7676         intrinsics.
7677         (ix86_expand_builtin): Add SSE5 intrinsic support.
7678         (ix86_sse5_valid_op_p): New function to validate SSE5 3 and 4
7679         operand instructions.
7680         (ix86_expand_sse5_multiple_memory): New function to split the
7681         second memory reference from SSE5 instructions.
7682         (type_has_variadic_args_p): Delete in favor of stdarg_p.
7683         (ix86_return_pops_args): Use stdarg_p to determine if the function
7684         has variable arguments.
7685         (ix86_setup_incoming_varargs): Ditto.
7686         (x86_this_parameter): Ditto.
7688         * config/i386/i386-protos.h (ix86_expand_sse5_unpack): Add
7689         declaration.
7690         (ix86_expand_sse5_pack): Ditto.
7691         (ix86_sse5_valid_op_p): Ditto.
7692         (ix86_expand_sse5_multiple_memory): Ditto.
7694         * config/i386/i386.md (UNSPEC_SSE5_INTRINSIC): Add new UNSPEC
7695         constant for SSE5 support.
7696         (UNSPEC_SSE5_UNSIGNED_CMP): Ditto.
7697         (UNSPEC_SSE5_TRUEFALSE): Ditto.
7698         (UNSPEC_SSE5_PERMUTE): Ditto.
7699         (UNSPEC_SSE5_ASHIFT): Ditto.
7700         (UNSPEC_SSE5_LSHIFT): Ditto.
7701         (UNSPEC_FRCZ): Ditto.
7702         (UNSPEC_CVTPH2PS): Ditto.
7703         (UNSPEC_CVTPS2PH): Ditto.
7704         (PCOM_FALSE): Add new constant for true/false SSE5 comparisons.
7705         (PCOM_TRUE): Ditto.
7706         (COM_FALSE_S): Ditto.
7707         (COM_FALSE_P): Ditto.
7708         (COM_TRUE_S): Ditto.
7709         (COM_TRUE_P): Ditto.
7710         (type attribute): Add ssemuladd, sseiadd1, ssecvt1, sse4arg types.
7711         (unit attribute): Add support for ssemuladd, ssecvt1, sseiadd1 sse4arg
7712         types.
7713         (memory attribute): Ditto.
7714         (sse4_1_round<mode>2): Use TARGET_ROUND instead of TARGET_SSE4_1.
7715         Use SSE4_1_ROUND_* constants instead of hard coded numbers.
7716         (rint<mode>2): Use TARGET_ROUND instead of TARGET_SSE4_1.
7717         (floor<mode>2): Ditto.
7718         (ceil<mode>2): Ditto.
7719         (btrunc<mode>2): Ditto.
7720         (nearbyintdf2): Ditto.
7721         (nearbyintsf2): Ditto.
7722         (sse_setccsf): Disable if SSE5.
7723         (sse_setccdf): Ditto.
7724         (sse5_setcc<mode>): New support for SSE5 conditional move.
7725         (sse5_pcmov_<mode>): Ditto.
7727         * config/i386/sse.md (SSEMODE1248): New mode iterator for SSE5.
7728         (SSEMODEF4): Ditto.
7729         (SSEMODEF2P): Ditto.
7730         (ssemodesuffixf4): New mode attribute for SSE5.
7731         (ssemodesuffixf2s): Ditto.
7732         (ssemodesuffixf2c): Ditto.
7733         (sserotatemax): Ditto.
7734         (ssescalarmode): Ditto.
7735         (sse_maskcmpv4sf3): Disable if SSE5.
7736         (sse_maskcmpv2df3): Ditto.
7737         (sse_vmmaskcmpv4sf3): Ditto.
7738         (sse5_fmadd<mode>4): Add SSE5 floating point multiply/add instructions.
7739         (sse5_vmfmadd<mode>4): Ditto.
7740         (sse5_fmsub<mode>4): Ditto.
7741         (sse5_vmfmsub<mode>4): Ditto.
7742         (sse5_fnmadd<mode>4): Ditto.
7743         (sse5_vmfnmadd<mode>4): Ditto.
7744         (sse5_fnmsub<mode>4): Ditto.
7745         (sse5_vmfnmsub<mode>4): Ditto.
7746         (sse5i_fmadd<mode>4): Ditto.
7747         (sse5i_fmsub<mode>4): Ditto.
7748         (sse5i_fnmadd<mode>4): Ditto.
7749         (sse5i_fnmsub<mode>4): Ditto.
7750         (sse5i_vmfmadd<mode>4): Ditto.
7751         (sse5i_vmfmsub<mode>4): Ditto.
7752         (sse5i_vmfnmadd<mode>4): Ditto.
7753         (sse5i_vmfnmsub<mode>4): Ditto.
7754         (mulv16qi3): Add SSE5 support.
7755         (mulv4si3): Ditto.
7756         (sse5_mulv4si3): New insn for 32-bit multiply support on SSE5.
7757         (sse2_mulv4si3): Disable if SSE5.
7758         (sse4_1_roundpd): Use TARGET_ROUND instead of TARGET_SSE4_1.
7759         (sse4_1_roundps): Ditto.
7760         (sse4_1_roundsd): Ditto.
7761         (sse4_1_roundss): Ditto.
7762         (sse_maskcmpv4sf3): Disable if SSE5 so the SSE5 instruction will
7763         be generated.
7764         (sse_maskcmpsf3): Ditto.
7765         (sse_vmmaskcmpv4sf3): Ditto.
7766         (sse2_maskcmpv2df3): Ditto.
7767         (sse2_maskcmpdf3): Ditto.
7768         (sse2_vmmaskcmpv2df3): Ditto.
7769         (sse2_eq<mode>3): Ditto.
7770         (sse2_gt<mode>3): Ditto.
7771         (sse5_pcmov_<mode>): Add SSE5 support.
7772         (vec_unpacku_hi_v16qi): Ditto.
7773         (vec_unpacks_hi_v16qi): Ditto.
7774         (vec_unpacku_lo_v16qi): Ditto.
7775         (vec_unpacks_lo_v16qi): Ditto.
7776         (vec_unpacku_hi_v8hi): Ditto.
7777         (vec_unpacks_hi_v8hi): Ditto.
7778         (vec_unpacku_lo_v8hi): Ditto.
7779         (vec_unpacks_lo_v8hi): Ditto.
7780         (vec_unpacku_hi_v4si): Ditto.
7781         (vec_unpacks_hi_v4si): Ditto.
7782         (vec_unpacku_lo_v4si): Ditto.
7783         (vec_unpacks_lo_v4si): Ditto.
7784         (sse5_pmacsww): New SSE5 intrinsic insn.
7785         (sse5_pmacssww): Ditto.
7786         (sse5_pmacsdd): Ditto.
7787         (sse5_pmacssdd): Ditto.
7788         (sse5_pmacssdql): Ditto.
7789         (sse5_pmacssdqh): Ditto.
7790         (sse5_pmacsdqh): Ditto.
7791         (sse5_pmacsswd): Ditto.
7792         (sse5_pmacswd): Ditto.
7793         (sse5_pmadcsswd): Ditto.
7794         (sse5_pmadcswd): Ditto.
7795         (sse5_pcmov_<move>): Conditional move support on SSE5.
7796         (sse5_phaddbw): New SSE5 intrinsic insn.
7797         (sse5_phaddbd): Ditto.
7798         (sse5_phaddbq): Ditto.
7799         (sse5_phaddwd): Ditto.
7800         (sse5_phaddwq): Ditto.
7801         (sse5_phadddq): Ditto.
7802         (sse5_phaddubw): Ditto.
7803         (sse5_phaddubd): Ditto.
7804         (sse5_phaddubq): Ditto.
7805         (sse5_phadduwd): Ditto.
7806         (sse5_phadduwq): Ditto.
7807         (sse5_phaddudq): Ditto.
7808         (sse5_phsubbw): Ditto.
7809         (sse5_phsubwd): Ditto.
7810         (sse5_phsubdq): Ditto.
7811         (sse5_pperm): Ditto.
7812         (sse5_pperm_sign_v16qi_v8hi): New insns for pack/unpack with SSE5.
7813         (sse5_pperm_zero_v16qi_v8hi): Ditto.
7814         (sse5_pperm_sign_v8hi_v4si): Ditto.
7815         (sse5_pperm_zero_v8hi_v4si): Ditto.
7816         (sse5_pperm_sign_v4si_v2di): Ditto.
7817         (sse5_pperm_sign_v4si_v2di): Ditto.
7818         (sse5_pperm_pack_v2di_v4si): Ditto.
7819         (sse5_pperm_pack_v4si_v8hi): Ditto.
7820         (sse5_pperm_pack_v8hi_v16qi): Ditto.
7821         (sse5_perm<mode>): New SSE5 intrinsic insn.
7822         (rotl<mode>3): Ditto.
7823         (sse5_rotl<mode>3): Ditto.
7824         (sse5_ashl<mode>3): Ditto.
7825         (sse5_lshl<mode>3): Ditto.
7826         (sse5_frcz<mode>2): Ditto.
7827         (sse5s_frcz<mode>2): Ditto.
7828         (sse5_cvtph2ps): Ditto.
7829         (sse5_cvtps2ph): Ditto.
7830         (sse5_vmmaskcmp<mode>3): Ditto.
7831         (sse5_com_tf<mode>3): Ditto.
7832         (sse5_maskcmp<mode>3): Ditto.
7833         (sse5_maskcmp_uns<mode>3): Ditto.
7834         (sse5_maskcmp_uns2<mode>3): Ditto.
7835         (sse5_pcom_tf<mode>3): Ditto.
7837         * config/i386/predicates.md (sse5_comparison_float_operator):
7838         New predicate to match the comparison operators supported by
7839         the SSE5 com instruction.
7840         (ix86_comparison_int_operator): New predicate to match just the
7841         signed int comparisons.
7842         (ix86_comparison_uns_operator): New predicate to match just the
7843         unsigned int comparisons.
7845         * doc/invoke.texi (-msse5): Add documentation.
7846         (-mfused-madd): Ditto.
7848         * doc/extend.texi (x86 intrinsics): Document new SSE5 intrinsics.
7850         * config.gcc (i[34567]86-*-*): Include bmmintrin.h and
7851         mmintrin-common.h.
7852         (x86_64-*-*): Ditto.
7854         * config/i386/cpuid.h (bit_SSE5): Define SSE5 bit.
7856         * config/i386/bmmintrin.h: New file, provide common x86 compiler
7857         intrinisics for SSE5.
7859         * config/i386/smmintrin.h: Move instructions shared with SSE5 to
7860         mmintrin-common.h.
7862         * config/i386/mmintrin-common.h: New file, to contain common
7863         instructions between SSE4.1 and SSE5.
7865         * config/i386/netware.c (gen_stdcall_or_fastcall_decoration): Use
7866         FOREACH_FUNCTION_ARGS to iterate over the argument list.
7867         (gen_regparm_prefix): Ditto.
7869         * config/i386/winnt.c (gen_stdcall_or_fastcall_suffix): Use
7870         FOREACH_FUNCTION_ARGS to iterate over the argument list.  Use
7871         prototype_p to determine if a function is prototyped.
7873 2009-08-25 Ville Voutilainen <ville.voutilainen@gmail.com>
7875         * c-common.c (c_common_reswords) add the alignof keyword,
7876         with same RID as __alignof and __alignof__
7878 2009-08-25  Anatoly Sokolov  <aesok@post.ru>
7880         * hooks.h (hook_bool_const_int_const_int_true): Declare.
7881         * hooks.c (hook_bool_const_int_const_int_true): New function.
7882         * target.h (struct gcc_target): Add can_eliminate field.
7883         * target-def.h (TARGET_CAN_ELIMINATE): Define.
7884         (TARGET_INITIALIZER): Use TARGET_CAN_ELIMINATE.
7885         * ira.c (setup_eliminable_regset): Use can_eliminate target hook.
7886         * reload1.c (update_eliminables, init_elim_table): (Ditto.).
7887         (elim_table): Revise comment.
7888         * system.h (CAN_ELIMINATE): Poison.
7889         * defaults.h (CAN_ELIMINATE): Remove.
7890         * doc/tm.texi (CAN_ELIMINATE): Revise documentation.
7892         * config/alpha/vms.h (CAN_ELIMINATE): Remove macro.
7893         * config/alpha/alpha.c (TARGET_CAN_ELIMINATE) [TARGET_ABI_OPEN_VMS]:
7894         Define macro.
7895         (alpha_vms_can_eliminate): Declare as static, change return type to
7896         bool.
7897         * config/alpha/alpha-protos.h (alpha_vms_can_eliminate): Remove.
7899         * config/arm/arm.h (CAN_ELIMINATE): Remove macro.
7900         * config/arm/arm.c (TARGET_CAN_ELIMINATE): Define macro.
7901         (arm_can_eliminate): New function.
7903         * config/avr/avr.h (CAN_ELIMINATE): Remove macro.
7904         * config/avr/avr.c (TARGET_CAN_ELIMINATE): Define macro.
7905         (avr_can_eliminate): Declare as static.
7906         * config/avr/avr-protos.h (avr_can_eliminate): Remove.
7908         * config/bfin/bfin.h (CAN_ELIMINATE): Remove macro.
7909         * config/bfin/bfin.c (TARGET_CAN_ELIMINATE): Define macro.
7910         (bfin_can_eliminate): New function.
7912         * config/crx/crx.h (CAN_ELIMINATE): Remove macro.
7913         * config/crx/crx.c (TARGET_CAN_ELIMINATE): Define macro.
7914         (crx_can_eliminate): New function.
7916         * config/fr30/fr30.h (CAN_ELIMINATE): Remove macro.
7917         * config/fr30/fr30.c (TARGET_CAN_ELIMINATE): Define macro.
7918         (fr30_can_eliminate): New function.
7920         * config/frv/frv.h (CAN_ELIMINATE): Remove macro.
7921         * config/frv/frv.c (TARGET_CAN_ELIMINATE): Define macro.
7922         (frv_can_eliminate): New function.
7924         * config/h8300/h8300.h (CAN_ELIMINATE): Remove macro.
7925         * config/h8300/h8300.c (TARGET_CAN_ELIMINATE): Define macro.
7926         (h8300_can_eliminate): New function.
7928         * config/i386/i386.h (CAN_ELIMINATE): Remove macro.
7929         * config/i386/i386.c (TARGET_CAN_ELIMINATE): Define macro.
7930         (i386_can_eliminate): Declare as static, change return type to bool.
7931         * config/i386/i386-protos.h (i386_can_eliminate): Remove.
7933         * config/ia64/ia64.h (CAN_ELIMINATE): Remove macro.
7934         * config/ia64/ia64.c (TARGET_CAN_ELIMINATE): Define macro.
7935         (ia64_can_eliminate): New function.
7937         * config/iq2000/iq2000.h (CAN_ELIMINATE): Remove macro.
7938         * config/iq2000/iq2000.c (TARGET_CAN_ELIMINATE): Define macro.
7939         (iq2000_can_eliminate): New function.
7941         * config/m32r/m32r.h (CAN_ELIMINATE): Remove macro.
7942         * config/m32r/m32r.c (TARGET_CAN_ELIMINATE): Define macro.
7943         (m32r_can_eliminate): New function.
7945         * config/m68hc11/m68hc11.h (CAN_ELIMINATE): Remove macro.
7946         * config/m68hc11/m68hc11.c (TARGET_CAN_ELIMINATE): Define macro.
7947         (m68hc11_can_eliminate): New function.
7949         * config/m68k/m68k.h (CAN_ELIMINATE): Remove macro.
7950         * config/m68k/m68k.c (TARGET_CAN_ELIMINATE): Define macro.
7951         (m68k_can_eliminate): New function.
7953         * config/mep/mep.h (CAN_ELIMINATE): Remove macro.
7954         * config/mep/mep.c (TARGET_CAN_ELIMINATE): Define macro.
7955         (mep_can_eliminate): New function.
7957         * config/mips/mips.h (CAN_ELIMINATE): Remove macro.
7958         * config/mips/mips.c (TARGET_CAN_ELIMINATE): Define macro.
7959         (mips_can_eliminate): New function.
7961         * config/rs6000/rs6000.h (CAN_ELIMINATE): Remove macro.
7962         * config/rs6000/rs6000.c (TARGET_CAN_ELIMINATE): Define macro.
7963         (rs6000_can_eliminate): New function.
7965         * config/s390/s390.h (CAN_ELIMINATE): Remove macro.
7966         * config/s390/s390.c (TARGET_CAN_ELIMINATE): Define macro.
7967         (s390_can_eliminate): Declare as static.
7968         * config/s390/s390-protos.h (sparc_can_eliminate): Remove.
7970         * config/score/score.h (CAN_ELIMINATE): Remove macro.
7971         * config/score/score.c (TARGET_CAN_ELIMINATE): Define macro.
7972         (score_can_eliminate): New function.
7974         * config/sparc/sparc.h (CAN_ELIMINATE): Remove macro.
7975         * config/sparc/sparc.c (TARGET_CAN_ELIMINATE): Define macro.
7976         (sparc_can_eliminate): Declare as static.
7977         * config/sparc/sparc-protos.h (sparc_can_eliminate): Remove.
7979         * config/stormy16/stormy16.h (CAN_ELIMINATE): Remove macro.
7980         * config/stormy16/stormy16.c (TARGET_CAN_ELIMINATE): Define macro.
7981         (xstormy16_can_eliminate): New function.
7983         * config/v850/v850.h (CAN_ELIMINATE): Remove macro.
7984         * config/v850/v850.c (TARGET_CAN_ELIMINATE): Define macro.
7985         (v850_can_eliminate): New function.
7987 2009-08-25  Uros Bizjak  <ubizjak@gmail.com>
7989         * config/alpha/alpha.md (*cmpdf_ieee_ext[123]): Remove.
7990         (*cmpdf_internal): Enable for all ALPHA_FPTM levels.
7991         (*movdfcc_ext[1234]): Disable for IEEE mode.
7993 2009-08-25  Eric Botcazou  <ebotcazou@adacore.com>
7995         * gimplify.c (prepare_gimple_addressable): New static function.
7996         (gimplify_modify_expr_to_memcpy): Invoke it on the RHS before marking
7997         it addressable.
7998         (gimplify_addr_expr): Invoke it similarly on the operand instead of
7999         manually fiddling with it.
8001 2009-08-25  Michael Matz  <matz@suse.de>
8003         * expr.h (jumpifnot_1, jumpif_1, do_jump_1): Declare.
8004         * dojump.c (do_jump_by_parts_greater): Take two operands instead of
8005         full expression.
8006         (do_jump_by_parts_equality, do_compare_and_jump): Ditto.
8007         (jumpifnot_1, jumpif_1): New wrappers for do_jump_1.
8008         (do_jump): Split out code for simple binary comparisons into ...
8009         (do_jump_1): ... this, taking the individual operands and code.
8010         Change callers to helper function above accordingly.
8011         * expr.c (expand_expr_real_1): Use jumpifnot_1 for simple binary
8012         comparisons.
8014 2009-08-25  Michael Matz  <matz@suse.de>
8016         * expr.h (struct separate_ops, sepops): New type for passing
8017         around an exploded simple expression.
8018         * optabs.c (expand_widen_pattern_expr, expand_vec_shift_expr):
8019         Use this structure instead of expression tree.
8020         (get_vcond_icode, expand_vec_cond_expr_p): Don't take whole
8021         expression, only its type.
8022         (expand_vec_cond_expr): Take type and individual operands instead
8023         of full expression.
8024         * optabs.h (expand_widen_pattern_expr, expand_vec_cond_expr,
8025         expand_vec_shift_expr): Change prototype accordingly.
8026         * tree-vect-stmts.c (vectorizable_condition): Change call of
8027         expand_vec_cond_expr_p to pass only type.
8028         * expr.c (do_store_flags): Change prototype and implementation
8029         to take an exploded expression.
8030         (expand_expr_real_1): New local ops initialized with details
8031         of the full expression.  Use it instead of full
8032         expression in calls to do_store_flags, expand_vec_cond_expr,
8033         expand_widen_pattern_expr and expand_vec_shift_expr.
8035 2009-08-25  Michael Matz  <matz@suse.de>
8037         * expr.c (expand_expr_real_1): New local treeop0, treeop1,
8038         treeop2 initialized with first three operands of the full expression.
8039         Substitute all TREE_OPERAND (exp, [012]) calls with them.
8041 2009-08-25  Kai Tietz  <kai.tietz@onevision.com>
8043         * gcc/gthr-win32.h (__UNUSED_PARAM): Define, if not already present.
8044         (__gthread_objc_condition_allocate): Mark arguments as unused.
8045         (__gthread_objc_condition_deallocate): Likewise.
8046         (__gthread_objc_condition_wait): Likewise.
8047         (__gthread_objc_condition_broadcast): Likewise.
8048         (__gthread_objc_condition_signal): Likewise.
8049         (__gthread_objc_thread_detach): Cast via INT_PTR to pointer.
8050         (__gthread_objc_thread_id): Likewise.
8052 2009-08-25  Janus Weil  <janus@gcc.gnu.org>
8054         PR middle-end/41149
8055         * tree-pretty-print.c (print_call_name): Print the correct call name
8056         for procedure pointer components.
8058 2009-08-24  Steve Ellcey  <sje@cup.hp.com>
8060         * config/ia64/ia64.c (ia64_promote_function_mode): Call
8061         default_promote_function_mode when not VMS.
8063 2009-08-24  Olivier Hainque  <hainque@adacore.com>
8065         * convert.c (convert_to_integer): Don't assume an input pointer is
8066         POINTER_SIZE wide.  Fetch from the type instead.
8068 2009-08-24  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
8070         * configure.ac (AC_PREREQ): Bump to 2.64.
8072 2009-08-24  Rafael Avila de Espindola  <espindola@google.com>
8074         * gcc.c (standard_exec_prefix_1,standard_exec_prefix_2): Remove.
8075         (process_command): Don't search standard_exec_prefix_1 and
8076         standard_exec_prefix_2.
8078 2009-08-24  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
8080         * config/arm/arm.c (output_return_instruction): Handle for
8081         unified syntax.
8083 2009-08-24  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
8085         * config/arm/arm.c (arm_select_cc_mode): Handle subreg.
8087 2009-08-24  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
8089         * config/arm/vfp.md (*arm_movdi_vfp): Mark as predicable.
8090         (*arm_movdf_vfp): Likewise.
8092 2009-08-24  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
8094         * config/arm/neon.md (vashl<mode>3): Rename from ashl<mode>3.
8095         (vashr<mode>3): Rename from ashr<mode>3.
8096         (vlshr<mode>3): Rename from lshr<mode>3.
8098 2009-08-24  Kai Tietz  <kai.tietz@onevision.com>
8100         PR/40786
8101         * c-format.c (format_wanted_type): Add new member scalar_identity_flag.
8102         (check_format_info_main): Use scalar_identify_flag.
8103         (check_format_types): Check for scalar size identity if
8104         scalar_identify_flag is set.
8105         (printf_length_specs): Extend by new field.
8106         (asm_fprintf_length_specs): Likewise.
8107         (gcc_diag_length_specs): Likewise.
8108         (scanf_length_specs): Likewise.
8109         (strfmon_length_specs): Likewise.
8110         (gcc_gfc_length_specs): Likewise.
8111         * config/i386/msformat-c.c (ms_printf_length_specs): Likewise.
8112         (ms_printf_flag_specs): Likewise.
8113         * c-format.h (format_length_info): Add new member scalar_identity_flag.
8115 2009-08-23  Uros Bizjak  <ubizjak@gmail.com>
8117         PR target/40718
8118         * config/i386/i386.c (*call_pop_1): Disable for sibling calls.
8119         (*call_value_pop_1): Ditto.
8120         (*sibcall_pop_1): New insn pattern.
8121         (*sibcall_value_pop_1): Ditto.
8123 2009-08-23  Alan Modra  <amodra@bigpond.net.au>
8125         PR target/41081
8126         * config/rs6000/rs6000.md (rotlsi3_64, ashlsi3_64, lshrsi3_64,
8127         ashrsi3_64): New.
8129 2009-08-23  Alan Modra  <amodra@bigpond.net.au>
8131         PR target/41081
8132         * fwprop.c (try_fwprop_subst): Allow multiple sets.
8133         (get_reg_use_in): New function.
8134         (forward_propagate_subreg): Propagate through subreg of zero_extend
8135         or sign_extend.
8137 2009-08-22  Kaz Kojima  <kkojima@gcc.gnu.org>
8139         * config/sh/t-sh (TARGET_LIBGCC2_CFLAGS): Define.
8140         * config/sh/t-netbsd (TARGET_LIBGCC2_CFLAGS): Add -mieee.
8142 2009-08-22  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
8144         * configure.ac: Remove --with-datarootdir, --with-docdir,
8145         --with-htmldir switches.  No need to call AC_SUBST for
8146         datarootdir, docdir, htmldir any more.
8147         * configure: Regenerate.
8148         * doc/install.texi (Configuration): Document --datarootdir,
8149         --docdir, --htmldir, --pdfdir; update documentation for
8150         --infodir, --mandir.
8151         (Prerequisites): Bump Autoconf version to 2.64, Automake to 1.11,
8152         M4 to 1.4.6.
8154         * aclocal.m4: Regenerate.
8155         * config.in: Regenerate.
8156         * configure: Regenerate.
8158 2009-08-21  Douglas B Rupp  <rupp@gnat.com>
8159             Olivier Hainque  <hainque@adacore.com>
8161         * config/ia64/ia64.c: Include libfuncs.h.
8162         (TARGET_PROMOTE_FUNCITON_MODE): Define target macro.
8163         (ia64_expand_call): Use reg 25 on VMS.
8164         (ia64_initialize_trampoline): Fix for VMS ABI.
8165         (ia64_function_arg_offset): Always returns 0 when TARGET_ABI_OPEN_VMS.
8166         (ia64_function_arg): Initialize reg 25 on VMS.
8167         Fix OpenVMS ABI issues for varargs.
8168         For OpenVMS, emit the Argument Information register set in the
8169         incoming/sibcall case as well.
8170         (ia64_arg_type): New function.
8171         (ia64_function_arg_advance): Keep track of cum->words.
8172         Fix OpenVMS ABI issues for varargs.
8173         (ia64_function_value): On VMS, promote mode of non-aggregate types.
8174         (ia64_override_options): Set flag_no_common on VMS.
8175         (ia64_init_builtins): Disable FWRITE builtin.
8176         (ia64_asm_output_external): Call DO_CRTL_NAMES.
8177         (ia64_vms_init_libfuncs): Add decc$ routines.
8178         (ia64_vms_valid_pointer_mode): New function.
8179         (ia64_struct_value_rtx): Allways NULL_RTX on VMS.
8180         (ia64_promote_function_mode): New function
8181         * config/ia64/ia64.h (TARGET_ABI_OPEN_VMS): Define as 0 for default.
8182         (LONG_DOUBLE_TYPE_SIZE): Force to 64 on VMS.
8183         (LIBCGC2_LONG_DOUBLE_TYPE_SIZE): Likewise.
8184         (INIT_CUMULATIVE_ARGS): Add atypes for VMS.
8185         (INIT_CUMULATIVE_INCOMING_ARGS): Likewise.
8186         (ASM_OUTPUT_DEF): Use ISDIGIT instead of isdigit.
8187         Suppress trailing '#' if VALUE is numeric.
8188         * config/ia64/vms.h (PROMOTE_FUNCTION_MODE): Remove, code moved to
8189         ia64_promote_function_mode.
8190         (TARGET_VALID_POINTER_MODE): Define.
8192 2009-08-21  Michael Meissner  <meissner@linux.vnet.ibm.com>
8194         PR target/40671
8195         * config/rs6000/rs6000.c (rs6000_override_options): Use
8196         TARGET_64BIT instead of TARGET_POWERPC64 to set the size of pointers.
8198         PR target/41145
8199         * config/rs6000/rs6000.c (rs6000_handle_altivec_attribute): Fix
8200         reporting of vector + decimal/boolean/complex error.
8202 2009-08-21  Jakub Jelinek  <jakub@redhat.com>
8204         * config/rs6000/rs6000.c (rs6000_init_builtins): Fix type of
8205         __vector double TYPE_DECL.
8207 2009-08-21  Richard Earnshaw  <rearnsha@arm.com>
8209         * arm.h (MACHMODE): New define.  Include insn-modes.h if available.
8210         (CUMULATIVE_ARGS): Use MACHMODE for declaration of aapcs_vfp_mode.
8211         * arm.c (aapcs_vfp_is_call_or_return_candidate): Change base_mode
8212         to pointer to enum machine_mode.  Update all callers as needed.
8214 2009-08-21 Uros Bizjak <ubizjak@gmail.com>
8216         * config/alpha/alpha.md (exception_receiver): Emit alternative
8217         GP load sequence if flag_reorder_blocks_and_partition is set.
8218         (*exception_receiver_2): Also enable when
8219         flag_reorder_blocks_and_partition is set.
8221 2009-08-20  Matt Rice  <ratmice@gmail.com>
8222             Diego Novillo  <dnovillo@google.com>
8224         * Makefile.in (PLUGIN_HEADERS): Include incpath.h and
8225         tree-ssa-sccvn.h.
8227 2009-08-20  Richard Guenther  <rguenther@suse.de>
8229         * c-objc-common.h (LANG_HOOKS_DUP_LANG_SPECIFIC_DECL): Do not define.
8230         * c-tree.h (c_dup_lang_specific_decl): Remove.
8231         (struct lang_decl, struct lang_type): Move definitions ...
8232         * c-lang.h: ... here.  New file.
8233         * c-decl.c: Include c-lang.h.
8234         (c_dup_lang_specific_decl): Remove.
8235         * c-typeck.c: Include c-lang.h.
8236         * Makefile.in (c-decl.o): Add c-lang.h dependency.
8237         (c-typeck.o): Likewise.
8238         * c-config-lang.in (gtfiles): Add c-lang.h.
8239         * gengtype.c (get_output_file_with_visibility): Handle c-lang.h
8240         like c-tree.h.
8242 2009-08-20  Uros Bizjak  <ubizjak@gmail.com>
8244         * config/alpha/alpha.c (alpha_end_function): Do not clear
8245         crtl->emit structure and free insn locators if cfun->is_thunk is true,
8246         this is now handled in generic code.
8248 2009-08-20  Andreas Krebbel  <krebbel1@de.ibm.com>
8250         * config/s390/s390.c (Z10_PREDICT_DISTANCE): New macro.
8251         (s390_z10_fix_long_loop_prediction): New function.
8252         (s390_z10_optimize_cmp): INSN walk moved to callee - s390_reorg.
8253         (s390_reorg): Walk over the INSNs and invoke
8254         s390_z10_fix_long_loop_prediction and s390_z10_optimize_cmp.
8256 2009-08-20  Andreas Krebbel  <krebbel1@de.ibm.com>
8258         * config/s390/s390.md ("*brx_stage1_<GPR:mode>", "*brxg_64bit",
8259         "*brx_64bit", "*brx_31bit"): New patterns.
8260         * config/s390/s390.c ('E'): New output modifier.
8262 2009-08-20  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
8263             Richard Earnshaw  <richard.earnshaw@arm.com>
8265         * config/arm/arm.c (arm_emit_movpair): Handle CONST_INT.
8266         * config/arm/arm.md (*arm_movtas_ze): New pattern for movt.
8268 2009-08-19  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
8270         * pa.md (reload_inhi, reload_outhi, reload_inqi, reload_outqi): New
8271         patterns.
8272         * pa.c (emit_move_sequence): Check if address of operand1 is valid
8273         for mode mode of operand0 when doing secondary reload for SAR.
8275 2009-08-19  Jakub Jelinek  <jakub@redhat.com>
8277         PR middle-end/41123
8278         * expr.c (expand_expr_real_1) <normal_inner_ref>: Handle all kinds
8279         of CONCAT, not just bitpos 0 bitsize size of the whole CONCAT.
8281 2009-08-19  Jason Merrill  <jason@redhat.com>
8283         * doc/invoke.texi (C++ Dialect Options): Note change of minimum
8284         supported template depth in C++0x.
8286 2009-08-19  Jakub Jelinek  <jakub@redhat.com>
8288         * config/rs6000/rs6000.c (rs6000_output_mi_thunk): Don't call
8289         free_after_compilation.
8290         * config/score/score7.c (score7_output_mi_thunk): Likewise.
8291         * config/score/score3.c (score3_output_mi_thunk): Likewise.
8292         * config/ia64/ia64.c (ia64_output_mi_thunk): Likewise.
8293         * config/mips/mips.c (mips_output_mi_thunk): Likewise.
8294         * config/sh/sh.c (sh_output_mi_thunk): Likewise.
8295         * config/m68k/m68k.c (m68k_output_mi_thunk): Likewise.
8296         * config/sparc/sparc.c (sparc_output_mi_thunk): Likewise.
8298 2009-08-19  Ian Lance Taylor  <iant@google.com>
8300         * doc/md.texi (Insn Canonicalizations): Correct canonicalization
8301         of (plus (mult (neg B) C) A).
8303 2009-08-18  Michael Matz  <matz@suse.de>
8305         * omp-low.c (optimize_omp_library_calls): Use types_compatible_p
8306         instead of comparing TYPE_MAIN_VARIANT for equality.
8307         * tree-vect-patterns.c (vect_recog_dot_prod_pattern,
8308         vect_recog_widen_mult_pattern, vect_recog_widen_sum_pattern): Ditto.
8309         * tree-vect-loop.c (vect_is_simple_reduction): Ditto.
8310         * gimplify.c (goa_lhs_expr_p): Ditto and use
8311         STRIP_USELESS_TYPE_CONVERSION.
8313 2009-08-18  Michael Matz  <matz@suse.de>
8315         * tree-ssa-structalias.c (create_variable_info_for): Also mark
8316         first field in a struct.
8317         (intra_create_variable_infos): Don't deal with flag_argument_noalias.
8319 2009-08-18  Uros Bizjak  <ubizjak@gmail.com>
8321         * config/alpha/alpha.c (alpha_output_mi_thunk_osf): Allocate insn
8322         locators before emit_insn is called.  Remove assert that
8323         cfun->is_thunk.
8324         (alpha_end_function): Clear crtl->emit structure and free insn
8325         locators if cfun->is_thunk is true.
8327 2009-08-18  Jason Merrill  <jason@redhat.com>
8329         * config/elfos.h (ASM_DECLARE_OBJECT_NAME): Use gnu_unique_object
8330         type if available.
8331         * configure.ac: Test for it.
8332         * configure, config.in: Regenerate.
8333         * doc/install.texi: Document --enable-gnu-unique-object.
8335 2009-08-18  Richard Guenther  <rguenther@suse.de>
8337         PR middle-end/41094
8338         * builtins.c (fold_builtin_pow): Fold pow(pow(x,y),z) to
8339         pow(x,y*z) only if x is nonnegative.
8341 2009-08-18  Jakub Jelinek  <jakub@redhat.com>
8343         * bb-reorder.c (fix_up_fall_thru_edges): Only call invert_jump
8344         on jumps.
8346         PR target/40971
8347         * config/rs6000/rs6000.c (rs6000_legitimize_address): For
8348         [DT][FDI]mode ensure the offset isn't 4/8/12 bytes below 0x8000.
8350 2009-08-17  DJ Delorie  <dj@redhat.com>
8352         * config/m32c/m32c.md (UNS_FSETB, UNS_FREIT): New.
8353         * config/m32c/prologue.md (epilogue_freit): New.
8354         (fset_b): New.
8355         * config/m32c/m32c.c (m32c_function_needs_enter): Add prototype.
8356         (bank_switch_p): Likewise.
8357         (fast_interrupt_p): Likewise.
8358         (interrupt_p): Likewise.
8359         (m32c_conditional_register_usage): Round memregs size up.
8360         (need_to_save): We only need to save $a0 when we use ENTER.
8361         (interrupt_p): Check for fast_interrupt too.
8362         (bank_switch_p): New.
8363         (fast_interrupt_p): New.
8364         (m32c_attribute_table): Add bank_switch and fast_interrupt.
8365         (m32c_emit_prolog): Support bank switching and fast interrupts.
8366         * doc/extend.texi (Function Attributes): Add bank_switch and
8367         fast_interrupt.
8369 2009-08-17  Douglas B Rupp  <rupp@gnat.com>
8371         * config/alpha/alpha.c (vms_valid_pointer_mode): New function.
8372         * config/alpha/vms.h (TARGET_VALID_POINTER_MODE): Define.
8374 2009-08-16  Douglas B Rupp  <rupp@gnat.com>
8376         * doc/invoke.texi (Target options): Add new option list for IA-64/VMS.
8377         (menu): Add IA-64/VMS Options.
8378         (IA-64/VMS Options): Likewise.
8380 2009-08-16  Richard Sandiford  <rdsandiford@googlemail.com>
8382         PR target/38599
8383         * config/mips/mips.md (*lwxs): Use :P for pointer values.
8385 2009-08-16  Richard Sandiford  <rdsandiford@googlemail.com>
8387         * config/mips/mips-protos.h (mips_push_asm_switch): New function.
8388         (mips_pop_asm_switch): Likewise.
8389         * config/mips/mips.c (set_noreorder, set_nomacro, set_noat): Replace
8390         with...
8391         (mips_noreorder, mips_nomacro, mips_noat): ...these new variables.
8392         (mips_push_asm_switch_1, mips_pop_asm_switch_1): New functions.
8393         (mips_push_asm_switch, mips_pop_asm_switch): Likewise.
8394         (mips_print_operand_punctuation): Use them.  Check mips_noreorder
8395         instead of set_noreorder.
8396         (mips_output_function_prologue): Use the new functions.
8397         (mips_output_function_epilogue): Likewise.
8398         (mips_need_noat_wrapper_p): New function, split out from...
8399         (mips_final_prescan_insn, mips_final_postscan_insn): ...here.
8400         Use mips_push_asm_switch and mips_pop_asm_switch.
8401         * config/mips/mips.h (FUNCTION_PROFILER): Use mips_push_asm_switch
8402         and mips_pop_asm_switch.
8403         (ASM_OUTPUT_REG_POP): Likewise.
8404         (DBR_OUTPUT_SEQEND): Remove boilerplate comment.
8405         Use mips_pop_asm_switch.
8406         (mips_asm_switch): New structure.
8407         (set_noreorder, set_nomacro): Replace with...
8408         (mips_noreorder, mips_nomacro, mips_noat): ...these new variables.
8409         * config/mips/mips.md (fix_truncdfsi2_macro): Use mips_nomacro
8410         instead of set_nomacro.
8411         (fix_truncsfsi2_macro): Likewise.
8412         (cprestore): Likewise.
8413         (hazard): Use mips_noreorder instead of set_noreorder.
8414         * config/mips/sdemtk.h (FUNCTION_PROFILER): As for mips.h.
8416 2009-08-16  Uros Bizjak  <ubizjak@gmail.com>
8418         * config/alpha/alpha.c (alpha_end_function): Handle NULL_RTX returned
8419         from prev_active_insn.
8421 2009-08-16  Anatoly Sokolov  <aesok@post.ru>
8423         * config/avr/avr.h (AVR_HAVE_8BIT_SP): New macros.
8424         * config/avr/avr.c (avr_override_options): Initialize
8425         avr_current_arch variable.
8426         (avr_cpu_cpp_builtins): Define __AVR_HAVE_8BIT_SP__ or
8427         __AVR_HAVE_16BIT_SP__ according to the device type.
8428         (expand_prologue, output_movhi): Use AVR_HAVE_8BIT_SP instead of
8429         TARGET_TINY_STACK.
8430         (expand_epilogue): Use correct QI mode frame pointer for tiny stack.
8431         Use AVR_HAVE_8BIT_SP instead of TARGET_TINY_STACK.
8433 2009-08-16  Dodji Seketeli  <dodji@redhat.com>
8435         PR debug/37801
8436         * gcc/dwarf2out.c (gen_inlined_subroutine_die): Concentrate on
8437         generating inlined subroutine die only. We shouldn't be
8438         called for anything else.
8439         (gen_block_die): Don't generate inline subroutine debug info for
8440         abstract blocks.
8442 2009-08-15  Sebastian Pop  <sebastian.pop@amd.com>
8444         * graphite-poly.c (print_pbb): Print PBB index.
8446 2009-08-15  Sebastian Pop  <sebastian.pop@amd.com>
8448         PR middle-end/40981
8449         * graphite-interchange.c (ppl_max_for_le): Moved...
8450         * graphite-poly.c (pbb_number_of_iterations): Call ppl_max_for_le.
8451         * graphite-ppl.c (ppl_max_for_le): ... here.  Correct the use of
8452         ppl_Pointset_Powerset_C_Polyhedron_maximize.
8453         * graphite-ppl.h (ppl_max_for_le): Declared.
8455 2009-08-14  Olatunji Ruwase <tjruwase@google.com>
8457         * doc/extend.texi (Symbol-Renaming Pragmas): redefine_extname is
8458         supported on all platforms.
8459         * target.h (struct gcc_target): Remove handle_pragma_redefine_extname.
8460         * c-cppbuiltin.c: Remove use of targetm.handle_pragma_redefine_extname.
8461         * c-pragma.c: Likewise.
8462         * target-def.h (TARGET_INITIALIZER): Remove
8463         TARGET_HANDLE_PRAGMA_REDEFINE_EXTNAME.
8464         * config/sol2.h: Remove use of TARGET_HANDLE_PRAGMA_REDEFINE_EXTNAME.
8466 2009-08-14  Douglas B Rupp  <rupp@gnat.com>
8468         * config/ia64/fde-vms.c: New file.
8469         * config/ia64/fde-glibc.c (_Unwind_FindTableEntry): Add dummy arg.
8470         * config/ia64/unwind-ia64.c (UNW_ accessors): Move to unwind-ia64.h
8471         (MD_UNW_COMPATIBLE_PERSONALITY_P): Provide default.
8472         (uw_frame_state_for): Only register a personality routine if it is
8473         known to be compatible with our expectations.
8474         (_Unwind_FindEnclosingFunction, uw_frame_state_for):
8475         Declare unw_table_entry stack variable and
8476         mod all calls to _Unwind_FindTableEntry to add arg.
8477         * config/ia64/unwind-ia64.h (UNW_ accessors): Move here.
8478         (_Unwind_FindTableEntry): Add arg to prototype.
8480 2009-08-14  Eric Botcazou  <ebotcazou@adacore.com>
8482         * config/ia64/unwind-ia64.c (struct _Unwind_Context): Add new
8483         field 'signal_pfs_loc'.
8484         (uw_frame_state_for): Remove duplicate code dealing with leaf
8485         procedures without unwind info.
8486         If in the frame after unwinding through a signal handler, restore
8487         the AR.PFS register instead of the CFM if AR.PFS has not been saved.
8488         * config/ia64/linux-unwind.h (ia64_fallback_frame_state): Do not set
8489         'pfs_loc' to the AR.PFS location in the signal context; instead
8490         set 'signal_pfs_loc'.
8491         Manually generate the unwind info for the AR.PFS register.
8492         (ABI_MARKER_OLD_LINUX_SIGTRAMP, ABI_MARKER_OLD_LINUX_INTERRUPT,
8493         ABI_MARKER_LINUX_SIGTRAMP, ABI_MARKER_LINUX_INTERRUPT): Define.
8494         (ia64_handle_unwabi): Test 'fs->unwabi' against them.
8495         Do not set 'pfs_loc' to the AR.PFS location in the signal context;
8496         instead set 'signal_pfs_loc'.
8497         Remove code preventing the AR.PFS register from being restored
8498         from the signal context.
8500 2009-08-14  Douglas B Rupp  <rupp@gnat.com>
8501             Tristan Gingold  <gingold@adacore.com>
8503         * config.gcc (ia64-hp-*vms*): Insert ia64/t-ia64 in tmake_file.
8504         * config/ia64/t-vms: New file.
8505         * config/ia64/vms64.h: New file.
8506         * config/ia64/vms.h: New file.
8507         * config/ia64/vms-crtinit.asm: New file.
8508         * config/ia64/vms_symvec_libgcc_s.opt: New file.
8509         * config/ia64/vms-unwind.h: New file.
8511 2009-08-14  Uros Bizjak  <ubizjak@gmail.com>
8513         * config/alpha/alpha.c (alpha_emit_conditional_move): Handle
8514         TFmode compares.
8516 2009-08-14  Kaveh R. Ghazi  <ghazi@caip.rutgers.edu>
8518         PR middle-end/30789
8519         * builtins.c (do_mpc_arg2): Make extern, define for any MPC version.
8520         Move declaration...
8521         * real.h (do_mpc_arg2): ... here.
8522         * fold-const.c (const_binop): Use MPC for complex MULT_EXPR
8523         and RDIV_EXPR.
8525 2009-08-14  Rafael Avila de Espindola  <espindola@google.com>
8527         * final.c (add_debug_prefix_map): Don't use GC memory for
8528         old_prefix and new_prefix.
8530 2009-08-14  Richard Guenther  <rguenther@suse.de>
8532         * ipa-prop.c (compute_complex_pass_through): If we cannot
8533         compute a non-varying offset for IPA_JF_ANCESTOR punt.
8535 2009-08-14  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
8537         * c-lex.c (c_lex_with_flags): Increase size of local variable
8538         to avoid memory clobber.
8540 2009-08-14  Paolo Bonzini  <bonzini@gnu.org>
8542         PR target/40934
8543         * config/i386/i386.c (ix86_fp_comparison_strategy):
8544         Only enable/disable sahf at function granularity.
8546 2009-08-14  Hans-Peter Nilsson  <hp@axis.com>
8548         PR rtl-optimization/41064
8549         * reload1.c (reload_as_needed): Don't call extract_insn
8550         for known invalid replacements after calling
8551         validate_replace_rtx_group and verify_changes.
8553 2009-08-14  Uros Bizjak  <ubizjak@gmail.com>
8555         PR target/41019
8556         * config/i386/sse.md (SSEMODE124C8): New mode iterator.
8557         (vcond<SSEMODEF2P:mode>): Assert that operation is supported by
8558         ix86_expand_fp_vcond.
8559         (vcond<SSEMODE124C8:mode>): Use SSEMODE124C8 instead of SSEMODE124.
8560         Assert that operation is supported by ix86_expand_int_vcond.
8561         (vcondu<SSEMODE124C8:mode>): Ditto.
8563 2009-08-13  DJ Delorie  <dj@redhat.com>
8565         * config/i386/djgpp-stdint.h: New.
8566         * config.gcc (djgpp): Use it.
8568 2009-08-13  Kaz Kojima  <kkojima@gcc.gnu.org>
8570         * config/sh/sh.c (sh_override_options): When flag_exceptions or
8571         flag_unwind_tables is on, turn flag_reorder_blocks_and_partition off.
8573 2009-08-13  Ghassan Shobaki  <ghassan.shobaki@amd.com>
8575         * tree-ssa-loop-prefetch.c
8576         (prune_ref_by_group_reuse): Enhance probabilistic analysis
8577         for long-stride pruning.
8578         (compute_miss_rate): New function to compute the probability
8579         that two memory references access different cache lines.
8581 2009-08-13  Dave Korn  <dave.korn.cygwin@gmail.com>
8583         * gcc/config/i386/cygwin.h (LINK_SPEC): Add --enable-auto-image-base.
8585 2009-08-13  Richard Guenther  <rguenther@suse.de>
8587         PR middle-end/41047
8588         * tree-ssa-ccp.c (ccp_fold): When folding pointer additions
8589         use the constant pointer type.
8590         * gimplify.c (canonicalize_addr_expr): Canonicalize independent
8591         of CV qualifiers on the target pointer type.
8592         * tree-ssa.c (useless_type_conversion_p): Move incomplete pointer
8593         conversion check before restrict check.
8595 2009-08-12  Kaz Kojima  <kkojima@gcc.gnu.org>
8597         PR target/41029
8598         * config/sh/sh.md (reload_outdf__RnFRm+4): Fix thinko.
8600 2009-08-12  Kaz Kojima  <kkojima@gcc.gnu.org>
8602         * config/sh/sh.c (sh_promote_function_mode): Add ATTRIBUTE_UNUSED.
8604 2009-08-12  Richard Guenther  <rguenther@suse.de>
8606         PR tree-optimization/41011
8607         * ipa-cp.c (ipcp_lattice_from_jfunc): Deal with failing fold
8608         and reference constructing.
8610 2009-08-12  Xinliang David Li  <davidxl@google.com>
8612         PR tree-optimization/41012
8613         * tree-flow.h : New external interface.
8614         * gimple-low.c (check_call_arg): Change to public function.
8615         Remove argument mismatch check in lowering.
8616         * tree-inline.h (tree_can_inline_p): Interface change.
8617         * tree-inline.c (tree_can_inline_p): Fold argument mismatch check
8618         into this function.
8619         * ipa-inline.c (cgraph_decide_inlining_of_small_functions):
8620         Call change to tree_can_inline_p function.
8621         (cgraph_decide_inlining_incrementally): Ditto.
8623 2009-08-12  Richard Sandiford  <rdsandiford@googlemail.com>
8625         PR tree-optimization/41031
8626         * tree-outof-ssa.c (insert_value_copy_on_edge): Use promote_decl_mode
8627         on the partition variable rather than promote_mode on the source
8628         type.  Assert that the partition variable's type has the same
8629         mode as the source value's.
8631 2009-08-12  Paolo Bonzini  <bonzini@gnu.org>
8633         * doc/tm.texi (TARGET_PROMOTE_FUNCTION_MODE): Add documentation
8634         for for_return == 2.
8635         * function.c (assign_parm_setup_reg): Use for_return == 2, improve
8636         comments.
8637         * calls.c (expand_call): Fix typo.
8638         * explow.c (promote_decl_mode): Use for_return == 2 for RESULT_DECL
8639         and PARM_DECL.
8640         * stmt.c (expand_value_return): Use promote_function_mode to copy out
8641         of pseudo.
8642         * targhooks.c (default_promote_function_mode): Handle for_return == 2.
8643         * config/cris/cris.c (cris_promote_function_mode): Likewise.
8644         * config/mmix/mmix.c (mmix_promote_function_mode): Likewise.
8645         * config/pa/pa.c (pa_promote_function_mode): Likewise.
8647 2009-08-12  Andrew Haley  <aph@redhat.com>
8649         * config/arm/arm.c (arm_init_libfuncs): Add __sync_synchronize.
8651 2009-08-12  Sebastian Pop  <sebastian.pop@amd.com>
8653         PR bootstrap/40103
8654         * graphite.c: Remove pragma GCC diagnostic warning "-Wc++-compat".
8656 2009-08-12  Richard Guenther  <rguenther@suse.de>
8658         * alias.c (get_alias_set): Honor TYPE_STRUCTURAL_EQUALITY_P.
8659         * gimplify.c (gimplify_modify_expr): Do not use
8660         lang_hooks.types_compatible_p.
8661         * tree-ssa.c (useless_type_conversion_p): For aggregates
8662         just return false if the canonical types differ.
8664 2009-08-12  Sebastian Pop  <sebastian.pop@amd.com>
8666         PR middle-end/40980
8667         * sese.c (convert_for_phi_arg): New.
8668         (add_guard_exit_phis): Use convert_for_phi_arg.
8670 2009-08-12  Sebastian Pop  <sebastian.pop@amd.com>
8672         * graphite-sese-to-poly.c (pdr_add_data_dimensions): Dont add
8673         unknown subscript upper bounds.
8675 2009-08-12  Sebastian Pop  <sebastian.pop@amd.com>
8676             Pranav Garg  <pranav.garg2107@gmail.com>
8678         * graphite-interchange.c (gather_access_strides): Removed.
8679         (ppl_max_for_le): New.
8680         (build_linearized_memory_access): New.
8681         (memory_stride_in_loop): New.
8682         (pbb_interchange_profitable_p): Reimplemented.
8683         * graphite-ppl.h (ppl_new_id_map): New.
8684         (ppl_interchange): New.
8686 2009-08-12  Sebastian Pop  <sebastian.pop@amd.com>
8688         * graphite-interchange.c (compute_subscript): Removed.
8689         (compute_array_size_cstr): Removed.
8690         (compute_array_size_poly): Removed.
8691         (compute_array_size): Removed.
8692         (gather_access_strides_poly): Removed.
8693         (gather_access_strides): Empty.
8695 2009-08-12  Sebastian Pop  <sebastian.pop@amd.com>
8697         * graphite-dependences.c (dependence_polyhedron_1): Replace
8698         pdr_nb_subscripts with PDR_NB_SUBSCRIPTS.
8699         (graphite_legal_transform_dr): Same.
8700         (graphite_carried_dependence_level_k): Same.
8701         * graphite-poly.c (new_poly_dr): Add a parameter nb_subscripts.
8702         Initialize PDR_NB_SUBSCRIPTS.
8703         (print_pdr_access_layout): Replace pdr_nb_subscripts with
8704         PDR_NB_SUBSCRIPTS.
8705         * graphite-poly.h (struct poly_dr): Add nb_subscripts field.
8706         (PDR_NB_SUBSCRIPTS): New.
8707         (pdr_nb_subscripts): Removed.
8708         (pdr_dim): Simplified.
8709         * graphite-sese-to-poly.c (build_poly_dr): Replace pdr_nb_subscripts
8710         with PDR_NB_SUBSCRIPTS.
8712 2009-08-12  Sebastian Pop  <sebastian.pop@amd.com>
8714         * graphite-interchange.c (compute_array_size): Remove use of
8715         PDR_DATA_CONTAINER.
8716         * graphite-poly.c (new_poly_dr): Remove argument data_container.
8717         Do not initialize PDR_DATA_CONTAINER.
8718         (print_pdr): Do not print PDR_DATA_CONTAINER.
8719         * graphite-poly.h (struct poly_dr): Remove data_container field.
8720         (PDR_DATA_CONTAINER): Removed.
8721         * graphite-sese-to-poly.c (pdr_add_data_dimensions): Remove use of
8722         PDR_DATA_CONTAINER.
8723         (build_poly_dr): Same.
8725 2009-08-12  Konrad Trifunovic  <konrad.trifunovic@gmail.com>
8726             Sebastian Pop  <sebastian.pop@amd.com>
8728         * graphite-dependences.c (graphite_legal_transform_dr): Work on a
8729         copy of the dependence polyhedron.  Free the temporary objects.
8730         (graphite_carried_dependence_level_k): Free unused objects before
8731         returning.
8733 2009-08-12  Sebastian Pop  <sebastian.pop@amd.com>
8735         * graphite-blocking.c (scop_do_strip_mine): Call store_scattering.
8736         Early return without analyzing the data dependences if no
8737         transform has been done.  Call restore_scattering if the transform
8738         is not legal.
8739         (graphite-interchange.c): Same.
8740         * graphite-poly.c (print_scattering_function): Test for
8741         PBB_TRANSFORMED.
8742         (graphite_read_transforms): Initialize PBB_TRANSFORMED.
8743         (apply_poly_transforms): Do not gcc_assert that
8744         the transform is legal.
8745         (new_poly_bb): Initialize PBB_TRANSFORMED, PBB_SAVED and PBB_ORIGINAL.
8746         Do not initialize PBB_NB_SCATTERING_TRANSFORM, PBB_NB_LOCAL_VARIABLES,
8747         PBB_TRANSFORMED_SCATTERING, and PBB_ORIGINAL_SCATTERING.
8748         (free_poly_dr): Free PBB_TRANSFORMED, PBB_SAVED, and PBB_ORIGINAL.
8749         * graphite-poly.h (struct poly_scattering): New.
8750         (struct poly_bb): Add original, transformed, and saved fields.
8751         Remove transformed_scattering, original_scattering,
8752         nb_local_variables and nb_scattering_transform fields.
8753         (PBB_ORIGINAL, PBB_TRANSFORMED, PBB_SAVED): New.
8754         (poly_scattering_new): New.
8755         (poly_scattering_free): New.
8756         (poly_scattering_copy): New.
8757         (store_scattering_pbb): New.
8758         (store_scattering): New.
8759         (restore_scattering_pbb): New.
8760         (restore_scattering): New.
8761         * graphite-sese-to-poly.c (build_pbb_scattering_polyhedrons):
8762         Initialize PBB_TRANSFORMED and PBB_ORIGINAL.
8764 2009-08-12  Sebastian Pop  <sebastian.pop@amd.com>
8766         * graphite-poly.c (print_pbb): Add parentheses in the pretty print.
8767         (print_scop): Same.
8769 2009-08-12  Sebastian Pop  <sebastian.pop@amd.com>
8771         * Makefile.in (graphite.o): Depends on PREDICT_H.
8772         * graphite.c: Include predict.h.
8773         (graphite_finalize): Call tree_estimate_probability.
8774         * predict.c (predict_loops): Do not call scev_initialize and
8775         scev_finalize.
8776         (tree_estimate_probability_bb): New.
8777         (tree_estimate_probability): Do not initialize loops: move that
8778         code to the driver.  Call tree_estimate_probability_bb.
8779         (tree_estimate_probability_driver): New.
8780         (pass_profile): Use tree_estimate_probability_driver.
8781         * predict.h (tree_estimate_probability): Declared.
8783 2009-08-12  Sebastian Pop  <sebastian.pop@amd.com>
8785         * graphite-clast-to-gimple.c (gloog): Add time to TV_GRAPHITE_CODE_GEN.
8786         * graphite-dependences.c (graphite_legal_transform): Add time to
8787         TV_GRAPHITE_DATA_DEPS.
8788         (dependency_between_pbbs_p): Same.
8789         * timevar.def (TV_GRAPHITE_DATA_DEPS, TV_GRAPHITE_CODE_GEN): New.
8791 2009-08-12  Andrey Belevantsev  <abel@ispras.ru>
8793         PR rtl-optimization/41033
8794         * alias.c (nonoverlapping_component_refs_p): Punt when strict
8795         aliasing is disabled.
8797 2009-08-11  Adam Nemet  <anemet@caviumnetworks.com>
8799         * config/mips/predicates.md (qi_mask_operand, hi_mask_operand,
8800         si_mask_operand, and_load_operand, low_bitmask_operand,
8801         and_reg_operand, and_operand): New predicates.
8802         * config/mips/constraints.md (Yb, Yh, Yw, Yz): New constraints.
8803         * config/mips/mips.c (and_operands_ok): New function.
8804         * config/mips/mips-protos.h (and_operands_ok): Declare it.
8805         * config/mips/mips.md (move_type): Add ext_ins and logical.
8806         (type): Handle them.
8807         (and<mode>3): Use and_reg_operand as the second operand's predicate.
8808         (*and<mode>3): Add alternatives for lbu, lhu, lwu, <d>ext and
8809         shift_shift.  Remove commutative constraint modifier.
8810         (*and<mode>3_mips16): Add alternatives for lbu, lhu, lwu and
8811         shift_shift.
8812         (*clear_upper32_dext): Remove define_insn_and_split.
8813         (*clear_upper32): Turn this define_insn_and_split ...
8814         (splitter for ANDing register with 0xffff_ffff): .. into this.
8816 2009-08-11  Adam Nemet  <anemet@caviumnetworks.com>
8818         * combine.c (try_widen_shift_mode): Factor out code to check if an
8819         integer constant is a low-order bitmask from here ...
8820         * rtlanal.c (low_bitmask_len): ... to here.
8821         * rtl.h (low_bitmask_len): Declare.
8823 2009-08-11  Uros Bizjak  <ubizjak@gmail.com>
8825         PR target/8603
8826         * config/alpha/alpha.md (addsi3): Remove expander.
8827         (addsi3): Rename from *addsi3_internal insn pattern.
8828         (subsi3): Remove expander.
8829         (subsi3): Rename from *subsi3_internal insn pattern.
8831 2009-08-11  Douglas B Rupp  <rupp@gnat.com>
8833         * config/alpha/alpha.c (alpha_init_builtins): Nullify FWRITE and
8834         FWRITE_UNLOCKED.
8836 2009-08-11  Vasiliy Fofanov  <fofanov@adacore.com>
8837             Eric Botcazou  <botcazou@adacore.com>
8838             Douglas B Rupp  <rupp@gnat.com>
8840         * config/alpha/alpha.c (alpha_return_in_memory): On VMS, ensure
8841         that records that fit in 64 bits are returned by immediate value,
8842         as required by OpenVMS Calling Standard.
8843         (function_value): Adjust for above modification.
8844         (alpha_va_start) <TARGET_ABI_OPEN_VMS>: Use
8845         virtual_incoming_args_rtx as base object, not next_arg.
8846         * config/alpha/vms.h (DEFAULT_PCC_STRUCT_RETURN): Define as 0.
8848 2009-08-11  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
8850         * reload.c (find_reloads_subreg_address): Check the original
8851         req_equiv_mem address to detect the case where an address is
8852         not valid in the outer mode.
8854 2009-08-11  Richard Guenther  <rguenther@suse.de>
8856         PR bootstrap/40788
8857         * builtins.c (gimplify_va_arg_expr): Do not call SET_EXPR_LOCATION.
8859 2009-08-10  Douglas B Rupp  <rupp@gnat.com>
8861         * config/alpha/vms.h (OPTIMIZATION_OPTIONS): Remove
8862         (OVERRIDE_OPTIONS): Incorporate removed OPTIMIZATION_OPTIONS.
8864 2009-08-10  Olivier Hainque  <hainqueu@adacore.com>
8865             Douglas B Rupp  <rupp@gnat.com>
8867         * config/alpha/alpha.c (alpha_sa_size): Force procedure type to
8868         PT_STACK when frame_pointer_needed on OpenVMS.
8869         (alpha_pv_save_size, alpha_using_fp): Remove.
8870         (alpha_vms_can_eliminate): New function. Support for CAN_ELIMINATE
8871         with proper processing for PT_NULL.
8872         (alpha_vms_initial_elimination_offset): New function. Support for
8873         INITIAL_ELIMINATION_OFFSET with proper processing for PT_NULL.
8874         (alpha_sa_size): Force procedure type to PT_STACK when
8875         frame_pointer_needed on OpenVMS.
8876         * config/alpha/alpha-protos.h (alpha_pv_save_size): Remove prototype.
8877         (alpha_using_fp): Likewise.
8878         (alpha_vms_can_eliminate): Add prototype.
8879         (alpha_vms_initial_elimination_offset): Likewise.
8880         * config/alpha/vms.h (CAN_ELIMINATE, INITIAL_ELIMINATION_OFFSET):
8881         Call alpha_vms_can_eliminate and alpha_vms_initial_elimination_offset.
8883 2009-08-10  Eric Botcazou  <botcazou@adacore.com>
8884             Douglas B Rupp  <rupp@gnat.com>
8886         * config/alpha/alpha.c (common_object_handler): New function.
8887         (vms_attribute_table): Declare a single attribute "common_object".
8888         (vms_output_aligned_decl_common): New global function.
8889         (SECTION_VMS_OVERLAY): Delete.
8890         (SECTION_VMS_GLOBAL): Likewise.
8891         (SECTION_VMS_INITIALIZE): Likewise.
8892         (vms_asm_named_section): Remove support for above flags.
8893         (vms_section_type_flags): Delete.
8894         (TARGET_SECTION_TYPE_FLAGS): Likewise.
8895         * config/alpha/alpha-protos.h (vms_output_aligned_decl_common): New.
8896         * config/alpha/vms.h (ASM_OUTPUT_ALIGNED_COMMON): Delete.
8897         (ASM_OUTPUT_ALIGNED_DECL_COMMON): New macro.
8899 2009-08-10  SUGIOKA Toshinobu  <sugioka@itonet.co.jp>
8901         PR target/41015
8902         * longlong.h [__sh__] (udiv_qrnnd): Add T register to clobber list.
8903         (sub_ddmmss): Likewise.
8905 2009-08-10  Andreas Tobler  <a.tobler@schweiz.org>
8907         PR bootstrap/41018
8908         * config/rs6000/freebsd.h: Define SVR4_ASM_SPEC. Adjust copyright
8909         year.
8911 2009-08-10  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
8913         PR target/37053
8914         * reload1.c (reload_as_needed): Use cancel_changes to completely
8915         undo a failed replacement attempt.
8917 2009-08-10  Richard Guenther  <rguenther@suse.de>
8919         PR middle-end/41006
8920         * tree-ssa.c (useless_type_conversion_p_1): Fold into ...
8921         (useless_type_conversion_p): ... here.  Require pointer targets
8922         to be compatible.
8924 2009-08-10  Dodji Seketeli  <dodji@redhat.com>
8926         PR c++/40866
8927         * tree-inline.c (copy_statement_list): The resulting copy shouldn't
8928         loose the original type of the statement list.
8930 2009-08-09  Douglas B Rupp  <rupp@gnat.com>
8932         * config/alpha/alpha.c: Include libfuncs.h
8933         (avms_asm_output_extern): New function.
8934         (alpha_init_libfuncs): Init some decc libfuncs.
8935         * config/alpha/alpha-protos.h (avms_asm_output_external): Declare.
8936         * config/alpha/vms.h (ASM_OUTPUT_EXTERNAL): Define.
8937         (DO_CRTL_NAMES): Define.
8938         (LIB_SPEC): Remove.
8939         * config/alpha/vms64.h (POINTERS_EXTEND_UNSIGNED): Remove undef.
8940         (LONG_TYPE_SIZE): Define.
8941         (TARGET_OS_CPP_BUILTINS): Define with __LONG_POINTERS=1
8942         (SUBTARGET_SWITCHES): Define malloc64 switch.
8943         (TARGET_DEFAULT): Default MASK_MALLOC64 set.
8944         (MASK_RETURN_ADDR): Define.
8945         doc/invoke.texi (mmalloc64): Document switch.
8947 2009-08-09  Olivier Hainque  <hainque@adacore.com>
8948             Douglas B Rupp  <rupp@gnat.com>
8950         * config/alpha/alpha.c (struct machine_function): New flag for VMS,
8951         uses_condition_handler.
8952         (alpha_expand_builtin_establish_vms_condition_handler): New expander.
8953         (alpha_expand_builtin_revert_vms_condition_handler): New expander.
8954         (enum alpha_builtin): New ALPHA_BUILTIN_REVERT_VMS_CONDITION_HANDLER
8955         and ALPHA_BUILTIN_ESTABLISH_VMS_CONDITION_HANDLER values.
8956         (code_for_builtin): New insn codes for the new alpha_builtins.
8957         (alpha_init_builtins): Register the new functions as BUILT_IN_MD.
8958         (alpha_sa_size): Account for uses_condition_handler.
8959         (alpha_expand_prologue): Likewise.
8960         (alpha_start_function): Likewise.
8961         (alpha_expand_epilogue): Likewise.
8962         * config/alpha/alpha-protos.h: Prototype the new alpha.c builtin
8963         establish/revert expanders.
8964         * config/alpha/alpha.h (DWARF_FRAME_REGNUM): Define.
8965         * config/alpha/alpha.md (builtin_establish_vms_condition_handler):
8966         New expander, resorting to the alpha.c associated function.
8967         (builtin_revert_vms_condition_handler): Likewise.
8968         * config/alpha/vms-gcc_shell_handler.c: New file. Implements
8969         __gcc_shell_handler, the static VMS condition handler used as
8970         an indirection wrapper to the current dynamically established
8971         handler.
8972         * config/alpha/vms-unwind.h: Complete rewrite.
8973         * config/alpha/t-vms (LIB2FUNCS_EXTRA): Add vms-gcc_shell_handler.c
8974         * config/alpha/vms.h (MD_UNWIND_SUPPORT):
8976 2009-08-09  Eric Botcazou  <botcazou@adacore.com>
8977             Douglas B Rupp  <rupp@gnat.com>
8979         * config/alpha/alpha.c (alpha_links): Add 'target' field.
8980         (alpha_need_linkage): Handle aliases.  Return function symbol.
8981         (alpha_use_linkage): Rename 'linkage' argument to 'func'.
8982         Use ultimate alias target for the linkage name.
8983         * config/alpha/alpha.md (movmemdi): Use the symbol returned
8984         by alpha_need_linkage for the function symbol.
8985         (setmemdi): Likewise.
8987 2009-08-09  Douglas B Rupp  <rupp@gnat.com>
8989         * config/alpha/alpha.c (TARGET_ASM_UNALIGNED_*_OP): Define if on VMS.
8990         * config/alpha/vms.h (OBJECT_FORMAT_ELF): Define.
8991         (ASM_WEAKEN_LABEL): Define.
8992         (CRT_CALL_STATIC_FUNCTION): Define.
8993         (STARTFILE_SPEC): Add crtbegin.o crtbeginS.o.
8994         (ENDFILE_SPEC): Define.
8995         (INIT_SECTION_ASM_OP): Define.
8996         * config/alpha/vms-dwarf2eh.asm (__EH_FRAME_BEGIN__): Remove.
8997         * config/alpha/t-vms (EXTRA_PARTS): Add crtbegin.o crtbeginS.o
8998         crtend.o crtendS.o.
8999         (MULTILIB_OSDIRNAMES): Define.
9000         (shlib_version): Define.
9001         (SHLIB_EXT): Define.
9002         (SHLIB_OBJS): Define.
9003         (SHLIB_NAME): Define.
9004         (SHLIB_MULTILIB): Define.
9005         (SHLIB_INSTALL): Define.
9006         (SHLIB_SYMVEC): Define.
9007         (SHLIB_SYMVECX2): Define.
9008         (SHLIB_LINK): Define.
9010 2009-08-09  Douglas B Rupp  <rupp@gnat.com>
9012         * config/alpha/alpha.c (alpha_initialize_trampoline):
9013         Initialize VMS trampoline IAW ABI for bounded procedure calls.
9014         (alpha_start_function): Emit transfer address on nested functions
9015         for VMS trampoline call.
9016         * config/alpha/t-vms (LIB2FUNCS_EXTRA): Remove vms_tramp.asm
9017         since no longer used.
9018         * config/alpha/vms-tramp.asm: Remove.
9019         * config/alpha/vms.h (TRAMPOLINE_TEMPLATE): Leave undefined
9020         since now only data initialized at runtime.
9022 2009-08-09  Douglas B Rupp  <rupp@gnat.com>
9024         * config/alpha/vms.h (HANDLE_SYSV_PRAGMA): Define.
9025         (LINK_GCC_C_SEQUENCE_SPEC): Define.
9026         (MD_EXEC_PREFIX): Remove, no longer used.
9027         (MD_STARTFILE_PREFIX): Likewise.
9028         (INCLUDE_DEFAULTS): Likewise.
9029         * config/alpha/t-vms:
9030         (vms-dwarf2.o, vms-dwarf2eh.o): Use GCC_FOR_TARGET to compile.
9032 2009-08-09  Richard Guenther  <rguenther@suse.de>
9034         PR tree-optimization/41016
9035         * tree-ssa-ifcombine.c (get_name_for_bit_test): Fix tuplification bug.
9036         (operand_precision): Remove.
9037         (integral_operand_p): Likewise.
9038         (recognize_single_bit_test): Adjust.
9040 2009-08-09  Richard Sandiford  <rdsandiford@googlemail.com>
9042         * c-common.c (c_fully_fold_internal): Issue a warning if a binary
9043         operation overflows.  Likewise non-cast unary arithmetic.
9044         If one arm of a conditional expression is always taken,
9045         inhibit evaluation warnings for the other arm.  Likewise inhibit
9046         evaluation warnings for the second && or || operand if the first
9047         operand is enough to determine the result.
9048         * c-typeck.c (build_conditional_expr): Apply the same inhibition
9049         rules here.
9050         (build_binary_op): Prevent duplicate evaluation warnings.
9052 2009-08-09  Richard Sandiford  <rdsandiford@googlemail.com>
9054         * tree-out-of-ssa.c (insert_value_copy_on_edge): If the source
9055         and destination have different modes, Use promote_mode to
9056         determine the signedness of the conversion.  Assert that the
9057         promoted source mode matches the destination mode.  Don't pass
9058         the destination and destination mode to expand_expr if the source
9059         mode is different.  Simplify conversion logic.
9061 2009-08-09  Ira Rosen  <irar@il.ibm.com>
9063         PR tree-optimization/41008
9064         * tree-vect-loop.c (vect_is_simple_reduction): Get operands
9065         from condition only in case it's a comparison. Adjust checks.
9067 2009-08-09  Bernd Schmidt  <bernd.schmidt@analog.com>
9069         * tree-dfa.c (renumber_gimple_stmt_uids_in_blocks): New function.
9070         * tree-flow.h (renumber_gimple_stmt_uids_in_blocks): Declare it.
9071         * tree-ssa-loop-ivopts.c (comp_cost): Make COST an integer.
9072         (enum iv_position): Add IP_AFTER_USE and IP_BEFORE_USE.
9073         (dump_cand): Handle them.
9074         (struct iv_cand): New members COST_STEP and AINC_USE.
9075         (stmt_after_increment): Likewise.
9076         (stmt_after_inc_pos): Renamed from stmt_after_ip_original_pos.  All
9077         callers changed.  Use gimple_uid comparison instead of scanning.
9078         (add_candidate_1): When looking for identical candidates, take
9079         AINC_USE into account.  Set it for new candidates.
9080         (force_expr_to_var_cost): Cast target_spill_cost to int.
9081         (get_address_cost): New arguments STMT_AFTER_INC and MAY_AUTOINC.
9082         All callers changed.  Check for availability of autoinc addressing
9083         modes, both in general for a given mode, and in the specific use case.
9084         (get_computation_cost_at): New argument CAN_AUTOINC.  All callers
9085         changed.
9086         (get_computation_cost): Likewise.
9087         (autoinc_possible_for_pair, set_autoinc_for_original_candidates,
9088         add_autoinc_candidates): New static functions.
9089         (add_candidate): Call add_autoinc_candidates for candidates based on
9090         a USE_ADDRESS use.
9091         (find_iv_candidates): Call set_autoinc_for_original_candidates.
9092         (determine_use_iv_cost_address): If we have an autoinc candidate at
9093         the matching use, verify autoinc is possible and subtract the cost
9094         of the candidate's step from the cost.
9095         (determine_iv_cost): Record the cost of the increment in the COST_STEP
9096         member of the candidate.
9097         (tree_ssa_iv_optimize_loop): Swap the calls to determine_iv_costs and
9098         determine_use_iv_costs.  Call renumber_gimple_stmt_uids_in_blocks.
9100 2009-08-09  Douglas B Rupp  <rupp@gnat.com>
9102         * config.build (ia64-hp-*vms*): New target.
9103         (alpha64-dec-*vms*,alpha*-dec-*vms*): Fix for config/vms and unify
9104         with ia64-hp-*vms*.
9105         * config.gcc (ia64-hp-*vms*): New target.
9106         (alpha64-dec-*vms*,alpha*-dec-*vms*): Fix for config/vms and unify
9107         with ia64-hp-*vms*.
9108         * config.host (ia64-hp-*vms*): New target.
9109         (alpha64-dec-*vms*,alpha*-dec-*vms*): Fix for config/vms and unify
9110         with ia64-hp-*vms*.
9112 2009-08-08  Richard Guenther  <rguenther@suse.de>
9114         PR tree-optimization/40991
9115         * tree-ssa-pre.c (eliminate): Delay purging EH edges.
9117 2009-08-08  Richard Sandiford  <rdsandiford@googlemail.com>
9119         * combine.c (gen_lowpart_or_truncate): Exclude CONST_INTs from
9120         mode check.  Do truncations in an integer mode.
9121         (force_to_mode): Handle subregs for all mode types.  Only do
9122         arithmetic simplifications on integer modes.
9124 2009-08-07  Richard Guenther  <rguenther@suse.de>
9126         PR tree-optimization/40999
9127         * tree-ssa-ccp.c (get_symbol_constant_value): Handle CONST_DECLs.
9128         (maybe_fold_reference): Lookup constant initializers.
9129         (fold_gimple_assign): Likewise.
9131 2009-08-07  Richard Guenther  <rguenther@suse.de>
9133         * tree-ssa.c (useless_type_conversion_p_1): Only for types
9134         that require structural equality defer to the langhook.
9136 2009-08-07  Martin Jambor  <mjambor@suse.cz>
9138         * ipa-prop.h (enum jump_func_type): New value IPA_JF_ANCESTOR, changed
9139         comments.
9140         (struct ipa_pass_through_data): New type.
9141         (struct ipa_ancestor_jf_data): New type.
9142         (union jump_func_value): Removed field formal_id, added fields
9143         pass_through and ancestor.
9144         (struct ipa_param_call_note): Changed type of formal_id to int from
9145         unsigned.
9146         * ipa-prop.c (ipa_print_node_jump_functions): Print pass through with
9147         operations jump functions and ancestor jump functions.
9148         (compute_complex_pass_through): New function.
9149         (compute_scalar_jump_functions): Call compute_complex_pass_through,
9150         reflect changes in the jump function strucutre.
9151         (update_jump_functions_after_inlining): Ignore complex pass-through
9152         and ancestor jump functions.
9153         * ipa-cp.c (ipcp_lattice_from_jfunc): Added support for ancestor and
9154         polynomial pass-through with operation jump functions.
9156 2009-08-07  Jakub Jelinek  <jakub@redhat.com>
9158         * dwarf2out.c (output_fde): When doing hot/cold partitioning, use
9159         fde->dw_fde_begin as begin label instead of hot/cold label.
9160         Use LLSDAC label instead of LLSDA for second section lsda.
9161         (dwarf2out_do_cfi_startproc): Add SECOND argument.  Use LLSDAC
9162         label instead of LLSDA if it is true.
9163         (dwarf2out_begin_prologue, dwarf2out_switch_text_section): Adjust
9164         callers.
9165         * except.c (add_call_site, dw2_size_of_call_site_table): Add
9166         SECTION argument.  Use it as index into crtl->eh.call_site_record
9167         array.
9168         (dw2_output_call_site_table): Likewise.  Add CS_FORMAT argument,
9169         use it to determine how to print table entries instead of using
9170         #ifdef HAVE_AS_LEB128.  For SECTION > 0 use hot resp. cold
9171         label instead of normal begin label as base.
9172         (sjlj_assign_call_site_values): Adjust add_call_site caller.
9173         (convert_to_eh_region_ranges): When doing hot/cold partitioning,
9174         ensure no EH range spans between sections and that landing pads
9175         are always in the corresponding section.
9176         (sjlj_size_of_call_site_table, sjlj_output_call_site_table): Adjust
9177         for crtl->eh.call_site_record being an array rather than scalar.
9178         (output_one_function_exception_table): New function, copied
9179         from output_function_exception_table.  Adjust
9180         dw2_size_of_call_site_table, dw2_output_call_site_table
9181         callers.  For SECOND section use *C suffixed labels.
9182         (output_function_exception_table): Call
9183         output_one_function_exception_table and, when doing hot/cold
9184         partitioning, also another time for the second section.
9185         * opts.c: Include except.h.
9186         (decode_options): Allow -freorder-blocks-and-partition with
9187         exceptions, unless SJLJ or TARGET_UNWIND_INFO.
9188         * Makefile.in (opts.o): Depend on $(EXCEPT_H).
9189         * function.h (struct rtl_eh): Change call_site_record from
9190         scalar into array of 2 elements.
9192 2009-08-07  Martin Jambor  <mjambor@suse.cz>
9194         * ipa-prop.c (count_formal_params_1): New function.
9195         (ipa_get_vector_of_formal_parms): New function.
9196         (get_vector_of_formal_parm_types): New function.
9197         (ipa_modify_formal_parameters): New function.
9198         (ipa_modify_call_arguments): New function.
9199         (index_in_adjustments_multiple_times_p): New function.
9200         (ipa_combine_adjustments): New function.
9201         (ipa_dump_param_adjustments): New function.
9202         * ipa-prop.h (struct ipa_parm_adjustment): New type.
9203         (ipa_get_vector_of_formal_parms): Declare.
9204         (ipa_modify_formal_parameters): Declare.
9205         (ipa_modify_call_arguments): Declare.
9206         (ipa_combine_adjustments): Declare.
9207         (ipa_dump_param_adjustments): Declare.
9208         (build_ref_for_offset): Declare.
9209         * Makefile.in (tree-sra.o): Add ipa-prop.h to dependencies.
9210         * tree-sra.c: Include ipa-prop.c.
9211         (build_ref_for_offset): Make public.
9213 2009-08-06  Neil Vachharajani  <nvachhar@gmail.com>
9215         * value-prof.c (init_pid_map): Replace xmalloc with XCNEWVEC.
9217 2009-08-06  Thomas Schwinge  <tschwinge@gnu.org>
9219         * gcc/doc/extend.texi (__builtin_extract_return_address)
9220         (__builtin_frob_return_address): Document.
9222 2009-08-06  Paul Brook  <paul@codesourcery.com>
9224         * config/arm/lib1funcs.asm (ARM_DIV_BODY): Add Thumb-2 implementation.
9225         (udivsi3, aeabi_uidivmod, divsi3, aeabi_idivmod): Only use Thumb-1
9226         implementation on ARMv6-M.
9228 2009-08-06  Richard Earnshaw  <rearnsha@arm.com>
9230         * doc/extend.texi (pcs): Document new attribute for ARM.
9232 2009-08-06  Richard Earnshaw  <rearnsha@arm.com>
9234         * arm.c (pcs_attribute_args): Comment out unsupported attribute
9235         variants.
9237 2009-08-06  Richard Earnshaw  <rearnsha@arm.com>
9239         * arm.c (arm_handle_pcs_attribute): Pass the entire name object to
9240         warning ().
9242 2009-08-06  Richard Earnshaw  <rearnsha@arm.com>
9244         * arm.c (arm_handle_pcs_attribute): Use %qE in warning.
9246 2009-08-06  Richard Earnshaw  <rearnsha@arm.com>
9248         Merge ARM/hard_vfp_branch to trunk.
9250         2009-08-04  Richard Earnshaw  <rearnsha@arm.com>
9252         * arm.c (libcall_eq): New function.
9253         (libcall_hash): New function.
9254         (add_libcall): New function.
9255         (arm_libcall_uses_aapcs_base): New function.
9256         (arm_libcall_value): Use arm_libcall_uses_aapcs_base to check for
9257         libcalls using the base PCS.
9258         (arm_init_cumulative_args): Likewise.
9260         2009-07-20  Joseph Myers  <joseph@codesourcery.com>
9262         * config/arm/arm.c (arm_libcall_value, arm_init_cumulative_args):
9263         Use base ABI for conversion libfuncs between HFmode and SFmode.
9265         2009-05-12  Joseph Myers  <joseph@codesourcery.com>
9267         * config/arm/arm.c (aapcs_vfp_sub_candidate): Use V2SImode and
9268         V4SImode as representatives of all 64-bit and 128-bit vector
9269         types.  Allow vector types without vector modes.
9270         (aapcs_vfp_is_call_or_return_candidate): Handle vector types
9271         without vector modes like BLKmode.
9272         (aapcs_vfp_allocate): Handle TImode for non-TARGET_NEON like
9273         BLKmode.  Avoid unsupported vector modes or TImode moves for
9274         non-TARGET_NEON.
9275         (aapcs_vfp_allocate_return_reg): Likewise.
9276         (arm_vector_mode_supported_p): Only support V2SImode, V4HImode and
9277         V8QImode if TARGET_NEON || TARGET_IWMMXT.
9279         2009-05-12  Joseph Myers  <joseph@codesourcery.com>
9281         * config/arm/arm.c (arm_handle_pcs_attribute): New.
9282         (arm_get_pcs_model): Pass attribute arguments to
9283         arm_pcs_from_attribute.
9284         (arm_init_cumulative_args): Use base AAPCS for conversions from
9285         floating-point types to DImode.
9286         (arm_attribute_table): Add pcs attribute.
9287         (arm_handle_pcs_attribute): New.
9288         * config/arm/bpabi.h (DECLARE_LIBRARY_RENAMES): When renaming
9289         conversions from floating-point types to DImode, also declare them
9290         to use base AAPCS and declare functions they call to use base
9291         AAPCS and their RTABI names.
9293         2009-05-12  Joseph Myers  <joseph@codesourcery.com>
9295         * doc/invoke.texi (-mfloat-abi=@var{name}): Remove statement about
9296         -mfloat-abi=hard not being supported for VFP.
9298         2009-05-11  Kazu Hirata  <kazu@codesourcery.com>
9300         * config/sparc/sparc.c (sparc_emit_float_lib_cmp): Pass a libcall
9301         SYMBOL_REF to hard_libcall_value.
9303         2009-03-05  Joseph Myers  <joseph@codesourcery.com>
9304             Richard Earnshaw  <rearnsha@arm.com>
9306         * config/arm/arm.c (aapcs_layout_arg): Once a co-processor argument
9307         has been put on the stack, all remaining co-processory arguments for
9308         that co-processor also go on the stack.
9310         2009-03-05  Joseph Myers  <joseph@codesourcery.com>
9312         * config/arm/arm.c (arm_return_in_memory): Handle returning
9313         vectors of suitable size in registers also for AAPCS case.
9315         2009-01-13  Richard Earnshaw <rearnsha@arm.com>
9317         * doc/tm.texi (TARGET_LIBCALL_VALUE): Add missing end statement.
9319         2008-12-09  Richard Earnshaw <rearnsha@arm.com>
9321         ARM Hard-VFP calling convention
9322         * target-def.h (TARGET_LIBCALL_VALUE): New hook.
9323         * target.h (gcc_target): Add libcall_value to table of call hooks.
9324         * targhooks.h (default_libcall_value): Default implementation.
9325         * targhooks.c (default_libcall_value): Likewise.
9326         * doc/tm.texi (TARGET_LIBCALL_VALUE): Document it.
9327         * optabs.c (expand_unop): Use it.
9328         * expr.h (hard_libcall_value): Pass the function RTX through.
9329         * calls.c (emit_library_call_value_1): Update call to
9330         hard_libcall_value.
9331         * explow.c (hard_libcall_value): Use new target hook.
9332         * testsuite/lib/target-supports.exp
9333         (check_effective_target_arm_hard_vfp_ok): New hook.
9334         (check_effective_target_arm_neon_ok): Improve test for neon
9335         availability.
9336         * testsuite/gcc.target/arm/eabi1.c: Only run test in base variant.
9337         * config/arm/arm.c: Include cgraph.h
9338         (TARGET_FUNCTION_VALUE): Override default hook.
9339         (arm_pcs_default): New variable.
9340         (arm_override_options): Don't fault hard calling convention with VFP.
9341         Add support for AAPCS variants.
9342         (arm_function_value): Make static.  Handle AAPCS variants.
9343         (arm_libcall_value): New function.
9344         (arm_apply_result_size): Handle VFP registers in results.
9345         (arm_return_in_memory): Rework all AAPCS variants; handle hard-vfp
9346         conventions.
9347         (pcs_attribute_args): New variable.
9348         (arm_pcs_from_attribute): New function.
9349         (arm_get_pcs_model): New function.
9350         (aapcs_vfp_cum_init): New function.
9351         (aapcs_vfp_sub_candidate): New function.
9352         (aapcs_vfp_is_return_candidate): New function.
9353         (aapcs_vfp_is_call_candidate): New function.
9354         (aapcs_vfp_allocate): New function.
9355         (aapcs_vfp_allocate_return_reg): New function.
9356         (aapcs_vfp_advance): New function.
9357         (aapcs_cp_arg_layout): New variable.
9358         (aapcs_select_call_coproc): New function.
9359         (aapcs_select_return_coproc): New function.
9360         (aapcs_allocate_return_reg): New function.
9361         (aapcs_libcall_value): New function.
9362         (aapcs_layout_arg): New function.
9363         (arm_init_cumulative_args): Initialize AAPCS args data.
9364         (arm_function_arg): Handle AAPCS variants using new interface.
9365         (arm_arg_parital_bytes): Likewise.
9366         (arm_function_arg_advance): New function.
9367         (arm_function_ok_for_sibcall): Ensure that sibling calls agree on
9368         calling conventions.
9369         (arm_setup_incoming_varargs): Handle new AAPCS args data.
9370         * arm.h (NUM_VFP_ARG_REGS): Define.
9371         (LIBCALL_VALUE): Update.
9372         (FUNCTION_VALUE): Delete.
9373         (FUNCTION_VALUE_REGNO_P): Add VFP regs.
9374         (arm_pcs): New enum.
9375         (CUMULATIVE_ARGS): New data to support AAPCS argument marshalling.
9376         (FUNCTION_ARG_ADVANCE): Call arm_function_arg_advance.
9377         (FUNCTION_ARG_REGNO_P): Add VFP regs.
9378         * arm-protos.h (arm_function_arg_advance): Add.
9379         (aapcs_libcall_value): Add.
9380         (arm_function_value): Delete.
9382 2009-08-06  Uros Bizjak  <ubizjak@gmail.com>
9383             H.J. Lu  <hongjiu.lu@intel.com>
9385         PR target/40957
9386         * config/i386/i386.c (standard_sse_mode_p): Remove.
9387         (standard_sse_constant_p): Return 2 for integer mode
9388         vector_all_ones_operand when SSE2 is enabled.
9389         (standard_sse_constant_opcode)<case 2>: Always return [v]pcmpeqd.
9390         (ix86_expand_vector_move): Do not check for negative values from
9391         standard_sse_constant_p.
9393 2009-08-06  Richard Guenther  <rguenther@suse.de>
9395         * tree-ssa.c (useless_type_conversion_p_1): Make function and
9396         array type comparisons frontend independent.
9397         * Makefile.in (tree-ssa.o): Add $(TARGET_H) dependency.
9398         * tree-ssa-sccvn.c (copy_reference_ops_from_ref): Always fill
9399         out array reference lower bound and element size operands.
9400         (ao_ref_init_from_vn_reference): Properly compute the offset
9401         for ARRAY_RANGE_REF.
9402         (vn_reference_fold_indirect): Fill out array reference lower
9403         bound and element size operands.
9404         * tree-ssa-pre.c (phi_translate_1): Fail if we have to translate
9405         a non gimple valued reference operand which can happen for
9406         array reference lower bound or element size.
9407         (create_component_ref_by_pieces_1): Properly generate the
9408         element size operand for array references.
9410 2009-08-06  Richard Guenther  <rguenther@suse.de>
9412         PR tree-optimization/40964
9413         * tree.c (iterative_hash_host_wide_int): Export.
9414         * tree.h (iterative_hash_host_wide_int): Declare.
9415         * tree-ssa-structalias.c (heapvar_map): New struct.
9416         (heapvar_map_eq): New function.
9417         (heapvar_map_hash): Likewise.
9418         (heapvar_lookup): Adjust.
9419         (heapvar_insert): Likewise.
9420         (make_constraint_from_heapvar): Allow multiple heap variables
9421         per decl at different offsets.
9422         (init_alias_heapvars): Adjust.
9424 2009-08-04  David Daney  <ddaney@caviumnetworks.com>
9426         * config/mips/mips.h (TARGET_SYNC_AFTER_SC): New macro.
9427         * mips_output_sync_loop (mips_output_sync_loop): Only emit
9428         trailing sync if TARGET_SYNC_AFTER_SC.
9430 2009-08-05  David Daney  <ddaney@caviumnetworks.com>
9432         * gcc/config/mips/sync.md (sync_compare_and_swap<mode>,
9433         compare_and_swap_12, sync_add<mode>, sync_<optab>_12,
9434         sync_old_<optab>_12, sync_new_<optab>_12, sync_nand_12,
9435         sync_old_nand_12, sync_new_nand_12, sync_sub<mode>,
9436         sync_old_add<mode>, sync_old_sub<mode>, sync_new_add<mode>,
9437         sync_new_sub<mode>, sync_<optab><mode>, sync_old_<optab><mode>,
9438         sync_new_<optab><mode>, sync_nand<mode>, sync_old_nand<mode>,
9439         sync_new_nand<mode>, sync_lock_test_and_set<mode>,
9440         test_and_set_12): Rewrite calls to mips_output_sync_loop.
9441         * gcc/config/mips/mips-protos.h (mips_output_sync_loop): Make
9442         the prototype declaration match the definition.
9443         * gcc/config/mips/mips.c (mips_output_sync_loop):  Emit sync
9444         instructions explicitly.  Add barrier_before and operands
9445         parameters.
9446         * gcc/config/mips/mips.h (MIPS_COMPARE_AND_SWAP,
9447         MIPS_COMPARE_AND_SWAP_12, MIPS_SYNC_OP, MIPS_SYNC_OP_12,
9448         MIPS_SYNC_OLD_OP_12, MIPS_SYNC_NEW_OP_12, MIPS_SYNC_OLD_OP,
9449         MIPS_SYNC_NEW_OP, MIPS_SYNC_NAND, MIPS_SYNC_OLD_NAND,
9450         MIPS_SYNC_NEW_NAND, MIPS_SYNC_EXCHANGE,
9451         MIPS_SYNC_EXCHANGE_12): Remove sync instructions.
9453 2009-08-05  Andrew Pinski  <pinskia@gmail.com>
9455         * tree-ssa-alias.c: Fix intervals to use [) syntax.
9457 2009-08-05  Uros Bizjak  <ubizjak@gmail.com>
9458             Mikulas Patocka  <mikulas@artax.karlin.mff.cuni.cz>
9460         PR target/40906
9461         * config/i386/i386.c (ix86_split_long_move): Fix push of multi-part
9462         source operand.
9464 2009-08-05  Jakub Jelinek  <jakub@redhat.com>
9466         PR rtl-optimization/40924
9467         * dse.c (canon_address): Before calling cselib_expand_value_rtx
9468         make sure canon_rtx (mem_address) isn't simpler than
9469         canon_rtx (expanded_mem_address).
9471 2009-08-05  Li Feng  <nemokingdom@gmail.com>
9473         * graphite-sese-to-poly.c (build_pbb_drs): Remove build alias set
9474         for each poly_bb_p.
9475         (build_scop_drs): Build alias set for each SCoP.
9477 2009-08-04  Sandra Loosemore  <sandra@codesourcery.com>
9479         * doc/invoke.texi (MIPS Options): Document new 1004K -march options.
9480         * config/mips/mips.c (mips_cpu_info_table): Add 1004K cores.
9481         * config/mips/mips.h (MIPS_ISA_LEVEL_SPEC): Add pattern for 1004K.
9482         (MIPS_ARCH_FLOAT_SPEC): Likewise.
9483         (BASE_DRIVER_SELF_SPECS): Likewise.
9485 2009-08-04  Andrew Pinski  <pinskia@gmail.com>
9487         * tree-ssa-alias.c: Fix some comment typos.
9489 2009-08-04  Kaz Kojima  <kkojima@gcc.gnu.org>
9491         * config/sh/linux-atomic.asm (ATOMIC_BOOL_COMPARE_AND_SWAP,
9492         ATOMIC_OP_AND_FETCH, ATOMIC_COMBOP_AND_FETCH): Define.
9494 2009-08-03  Janis Johnson  <janis187@us.ibm.com>
9496         PR c/39902
9497         * simplify-rtx.c (simplify_binary_operation_1): Disable
9498         simplifications for decimal float operations.
9500 2009-08-03  Jakub Jelinek  <jakub@redhat.com>
9502         PR middle-end/40943
9503         * tree-ssa.c (warn_uninitialized_var): Even on LHS warn for
9504         operand of INDIRECT_REF.
9506 2009-08-03  Uros Bizjak  <ubizjak@gmail.com>
9508         * config/alpha/alpha.c (alpha_legitimate_constant_p): Reject CONST
9509         constants referencing TLS symbols.
9511 2009-08-03  SUGIOKA Toshinobu  <sugioka@itonet.co.jp>
9513         * config/sh/linux-atomic.asm (ATOMIC_COMPARE_AND_SWAP): Rename
9514         __sync_compare_and_swap_* to __sync_val_compare_and_swap_*.
9516 2009-08-03  Richard Guenther  <rguenther@suse.de>
9518         * tree.c (make_vector_type): Build a main variant first,
9519         get the canonical one and then build the variant.
9520         * tree-ssa.c (useless_type_conversion_p_1): Handle
9521         fixed-point types.
9522         (useless_type_conversion_p): Conversions to pointers to
9523         incomplete record types are useless.
9525 2009-08-03  Richard Guenther  <rguenther@suse.de>
9527         * tree-cfg.c (pass_warn_unused_result): Mark name that no dump
9528         file will be created.
9529         * omp-low.c (pass_diagnose_omp_blocks): Likewise.
9530         * toplev.c (compile_file): Adjust comment.
9532 2009-08-03  Kaz Kojima  <kkojima@gcc.gnu.org>
9534         * config/sh/sh-protos.h (sh_promote_function_mode): Remove.
9535         * config/sh/sh.c (sh_promote_function_mode): Wrap long lines.
9536         (TARGET_PROMOTE_FUNCTION_MODE): Define.
9537         (TARGET_PROMOTE_FUNCTION_ARGS): Remove.
9538         (sh_promote_function_mode): Fix typo.
9540 2009-08-03  Andreas Krebbel  <krebbel1@de.ibm.com>
9542         * explow.c (promote_mode): Mark TYPE and PUNSIGNEDP as possibly unused.
9544 2009-08-02  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
9546         * pa.c (pa_promote_function_mode): Remove ATTRIBUTE_UNUSED from
9547         declaration arguments.
9549 2009-08-02  Uros Bizjak  <ubizjak@gmail.com>
9551         * config/i386/i386.c (ix86_expand_fp_compare): Use const0_rtx instead
9552         of GEN_INT (0x00) and const1_rtx instead of GEN_INT (0x01).
9553         (ix86_split_ashl): Ditto.
9554         (ix86_expand_vector_init_one_nonzero): Ditto.
9555         (ix86_expand_vector_set): Ditto.
9556         (ix86_expand_reduc_v4sf): Ditto.
9558 2009-08-02  Paolo Bonzini  <bonzini@gnu.org>
9560         * explow.c (promote_function_mode): Remove assert.
9561         * config/sh/sh.c (sh_promote_function_mode): Declare.
9563 2009-08-01  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
9565         * config/pa/pa.c (pa_promote_function_mode): Declare.
9566         Change to static.  Fix promote_mode call.
9568         * gthr-dce.h (CONST_CAST2): Define if not defined.
9569         (__gthread_setspecific): Use CONST_CAST2 to fix warning.
9571         * config.gcc (hppa[12]*-*-hpux10*): Add stdint support.
9573 2009-08-01  Paolo Bonzini  <bonzini@gnu.org>
9575         * expr.c (store_constructor): Use promote_decl_mode.  Remove
9576         now write-only variable unsignedp.
9577         (expand_expr_real_1): Use promote_decl_mode.
9578         * expr.h (promote_function_mode, promote_decl_mode): New.
9579         (promote_mode): Remove last argument.
9580         * function.c (assign_temp): Drop last argument of promote_mode.
9581         (assign_parm_find_data_types): Use promote_function_mode.
9582         (assign_parm_setup_reg): Likewise.
9583         (expand_function_end): Use promote_function_mode.
9584         * calls.c (initialize_argument_information): Use promote_function_mode.
9585         (precompute_arguments): Use promote_mode instead of checking if
9586         only PROMOTE_FUNCTION_MODE is defined.
9587         (expand_call): When making sibcall decisions, use promote_function_mode.
9588         Below, remove an if for targetm.calls.promote_function_return and
9589         and use promote_function_mode.
9590         (emit_library_call_value_1): Use promote_function_mode, fix bug
9591         where promote_mode was passed FOR_CALL == 0 for a return value in an
9592         assertion.
9593         * cfgexpand.c (expand_one_register_var): Use promote_decl_mode.
9594         * explow.c (promote_function_mode, promote_decl_mode): New.
9595         (promote_mode): Keep only the FOR_CALL == 0 case.
9596         * combine.c (setup_incoming_promotion): Remove test of
9597         promote_function_args.  Use promote_function_mode.
9598         * stmt.c (expand_value_return): Use promote_decl_mode.
9599         (expand_decl): Use promote_decl_mode.
9601         * expr.c (store_constructor): Use promote_decl_mode.  Remove
9602         now write-only variable unsignedp.
9603         (expand_expr_real_1): Use promote_decl_mode.
9604         * expr.h (promote_function_mode, promote_decl_mode): New.
9605         (promote_mode): Remove last argument.
9606         * function.c (assign_temp): Drop last argument of promote_mode.
9607         (assign_parm_find_data_types): Use promote_function_mode.
9608         (assign_parm_setup_reg): Likewise.
9609         (expand_function_end): Use promote_function_mode.
9610         * calls.c (initialize_argument_information): Use promote_function_mode.
9611         (precompute_arguments): Use promote_mode instead of checking if
9612         only PROMOTE_FUNCTION_MODE is defined.
9613         (expand_call): When making sibcall decisions, use promote_function_mode.
9614         Below, remove an if for targetm.calls.promote_function_return and
9615         and use promote_function_mode.
9616         (emit_library_call_value_1): Use promote_function_mode, fix bug
9617         where promote_mode was passed FOR_CALL == 0 for a return value in an
9618         assertion.
9619         * cfgexpand.c (expand_one_register_var): Use promote_decl_mode.
9620         * explow.c (promote_function_mode, promote_decl_mode): New.
9621         (promote_mode): Keep only the FOR_CALL == 0 case.
9622         * combine.c (setup_incoming_promotion): Remove test of
9623         promote_function_args.  Use promote_function_mode.
9624         * stmt.c (expand_value_return): Use promote_decl_mode.
9625         (expand_decl): Use promote_decl_mode.
9627         * explow.c (promote_function_mode): Just call the target hook.
9628         * targhooks.c (default_promote_function_mode,
9629         default_promote_function_mode_always_promote): New.
9630         * targhooks.h (default_promote_function_mode,
9631         default_promote_function_mode_always_promote): Declare.
9632         * target.h (promote_function_args, promote_function_return): Remove.
9633         (promote_function_mode): New.
9634         * target-def.h (TARGET_PROMOTE_FUNCTION_ARGS,
9635         TARGET_PROMOTE_FUNCTION_RETURN): Remove.
9636         (TARGET_PROMOTE_FUNCTION_MODE): New.
9637         (TARGET_CALLS): Adjust.
9638         * system.h (TARGET_PROMOTE_FUNCTION_ARGS,
9639         TARGET_PROMOTE_FUNCTION_RETURN, PROMOTE_FUNCTION_MODE): Poison.
9641         * config/s390/s390.h (PROMOTE_FUNCTION_MODE): Move...
9642         * config/s390/s390.c (s390_promote_function_mode): ... here,
9643         with pointer handling.
9644         (TARGET_PROMOTE_FUNCTION_MODE): Define.
9645         (TARGET_PROMOTE_FUNCTION_ARGS, TARGET_PROMOTE_FUNCTION_RETURN): Remove.
9647         * config/sparc/sparc.h (PROMOTE_FUNCTION_MODE): Move...
9648         * config/sparc/sparc.c (sparc_promote_function_mode): ... here,
9649         with pointer handling.
9650         (TARGET_PROMOTE_FUNCTION_MODE): Define.
9651         (TARGET_PROMOTE_FUNCTION_ARGS, TARGET_PROMOTE_FUNCTION_RETURN): Remove.
9653         * config/sh/sh-protos.h (sh_promote_function_mode): New.
9654         * config/sh/sh.c (sh_promote_function_mode): New.
9655         (TARGET_PROMOTE_FUNCTION_MODE): Define.
9656         (TARGET_PROMOTE_FUNCTION_ARGS, TARGET_PROMOTE_FUNCTION_RETURN): Remove.
9658         * config/cris/cris.h (PROMOTE_FUNCTION_MODE): Move...
9659         * config/cris/cris.c (cris_promote_function_mode): ... here.
9660         (TARGET_PROMOTE_FUNCTION_MODE): Define.
9661         (TARGET_PROMOTE_FUNCTION_ARGS): Remove.
9663         * config/mmix/mmix.h (PROMOTE_FUNCTION_MODE): Move...
9664         * config/mmix/mmix.c (mmix_promote_function_mode): ... here.
9665         (TARGET_PROMOTE_FUNCTION_MODE): Define.
9666         (TARGET_PROMOTE_FUNCTION_ARGS): Remove.
9668         * config/arm/arm.h (PROMOTE_FUNCTION_MODE): Move...
9669         * config/arm/arm.c (arm_promote_function_mode): ... here, without
9670         complex type handling.
9671         (TARGET_PROMOTE_FUNCTION_MODE): Define.
9672         (TARGET_PROMOTE_FUNCTION_ARGS, TARGET_PROMOTE_FUNCTION_RETURN): Remove.
9674         * config/pa/pa.c (pa_promote_function_mode): New.
9675         (TARGET_PROMOTE_FUNCTION_MODE): Define.
9676         (TARGET_PROMOTE_FUNCTION_RETURN): Remove.
9678         * config/alpha/alpha.c (TARGET_PROMOTE_FUNCTION_ARGS,
9679         TARGET_PROMOTE_FUNCTION_RETURN): Remove.
9680         (TARGET_PROMOTE_FUNCTION_MODE): Define equivalently.
9681         * config/xtensa/xtensa.c: Likewise.
9682         * config/stormy16/stormy16.c: Likewise.
9683         * config/iq2000/iq2000.c: Likewise.
9684         * config/rs6000/rs6000.c: Likewise.
9685         * config/picochip/picochip.c: Likewise.
9686         * config/arc/arc.c: Likewise.
9687         * config/mcore/mcore.c: Likewise.
9688         * config/score/score.c: Likewise.
9689         * config/mips/mips.c: Likewise.
9690         * config/bfin/bfin.c: Likewise.
9691         * config/ia64/ia64.c: Likewise (disabled though).
9693         * config/frv/frv.h: Remove pointless remark.
9695         * doc/tm.texi (PROMOTE_FUNCTION_MODE,
9696         TARGET_PROMOTE_FUNCTION_ARGS,
9697         TARGET_PROMOTE_FUNCTION_RETURN): Consolidate into...
9698         (TARGET_PROMOTE_FUNCTION_MODE): ... this.
9700 2009-08-01  Sebastian Pop  <sebastian.pop@amd.com>
9702         * doc/invoke.texi (-fgraphite-force-parallel): Renamed
9703         -floop-parallelize-all.
9704         * toplev.c (process_options): Rename flag_graphite_force_parallel to
9705         flag_loop_parallelize_all.
9706         * tree-ssa-loop.c (gate_graphite_transforms): Same.
9707         * graphite.c (graphite_transform_loops): Same.
9708         * common.opt: Same.
9709         * graphite-poly.c (apply_poly_transforms): Same.
9711 2009-07-31  Richard Earnshaw  <rearnsha@arm.com>
9713         PR tree-optimization/40914
9714         * ipa-prop.c (ipa_get_ptr_load_param): New argument use_delta,
9715         if set, then check the delta field of the PMF record.
9716         (ipa_get_stmt_member_ptr_load_param): Propagate new param use_delta.
9717         (ipa_analyze_call_uses): Handle machines where the vbit for a PMF
9718         call is stored in the delta.
9720 2009-07-31  Adam Nemet  <anemet@caviumnetworks.com>
9722         * config/mips/mips.md (*clear_upper32_dext): New pattern.
9724 2009-07-31  Uros Bizjak  <ubizjak@gmail.com>
9726         * config/i386/bsd.h (ASM_BYTE): New define.
9727         * config/i386/darwin.h (ASM_BYTE): Rename from ASM_BYTE_OP.
9728         * config/i386/att.h (ASM_BYTE): New define. Use ASM_BYTE instead of
9729         .byte.  Use fputs or putc instead of fprintf where appropriate.
9730         * config/i386/i386-interix.h: Use ASM_BYTE instead of .byte.  Use
9731         fputs or putc instead of fprintf where appropriate.
9732         * config/i386/i386elf.h: Ditto.
9733         * config/i386/sysv4.h: Ditto.
9735         * config/i386/i386.c (TARGET_ASM_BYTE_OP): New define.
9736         * config/i386/i386.md (x86_sahf_1): Use ASM_BYTE instead of .byte.
9737         (*tls_global_dynamic_64): Ditto.
9739 2009-07-31  Christian Bruel  <christian.bruel@st.com>
9741         * gcc/config.gcc (sh*-*-elf): test with_libgloss.
9743 2009-07-31  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
9745         * config/arm/arm.c (arm_arm_address_cost): Fix typo.
9746         Remove dead code for MINUS.
9748 2009-07-31  Anthony Green  <green@moxielogic.com>
9750         * config/moxie/moxie.c (moxie_expand_prologue): Use $r5 instead of
9751         $r12 in prologue.
9752         (moxie_expand_epilogue): Ditto for epilogue.
9753         (moxie_setup_incoming_varargs): ABI change.  Use 5 registers for
9754         incoming arguments.
9755         (moxie_function_arg): Ditto.
9756         (moxie_pass_by_reference): Ditto.
9757         (moxie_arg_partial_bytes): Ditto.
9758         * config/moxie/moxie.h (CALL_USED_REGISTERS): Ditto.
9759         (FUNCTION_ARG_ADVANCE) Ditto.
9760         (REG_PARM_STACK_SPACE) Ditto.
9761         (FUNCTION_ARG_REGNO_P) Dito.
9763         * config.gcc: Add moxie linux config support.
9764         * gcc/config/moxie/uclinux.h: New file.
9766 2009-07-31  DJ Delorie  <dj@redhat.com>
9768         * config/sh/sh.md (UNSPECV_SP_SWITCH_B): New.
9769         (UNSPECV_SP_SWITCH_E): New.
9770         (sp_switch_1): Change to an unspec.
9771         (sp_switch_2): Change to an unspec.  Don't use post-inc when we
9772         replace $r15.
9773         * config/sh/sh.c (sh_expand_prologue): Use the constant pool to
9774         reference the new stack's address
9776 2009-07-30  Sebastian Pop  <sebastian.pop@amd.com>
9778         * Makefile.in (OBJS-common): Added dependence on graphite-blocking.o,
9779         graphite-clast-to-gimple.o, graphite-dependences.o,
9780         graphite-interchange.o, graphite-poly.o, graphite-ppl.o,
9781         graphite-scop-detection.o, graphite-sese-to-poly.o, and sese.o.
9782         (graphite-blocking.o,
9783         graphite-clast-to-gimple.o, graphite-dependences.o,
9784         graphite-interchange.o, graphite-poly.o, graphite-ppl.o,
9785         graphite-scop-detection.o, graphite-sese-to-poly.o, and sese.o): New.
9786         * cfgloop.c (alloc_loop): Set loop->can_be_parallel to false.
9787         * cfgloop.h (struct loop): Add can_be_parallel field.
9788         * common.opt (fgraphite-identity): Moved up.
9789         (fgraphite-force-parallel): New flag.
9790         * graphite.c: Rewrite.
9791         * graphite.h: Rewrite.
9792         * passes.c (init_optimization_passes): Schedule a pass of DCE and LIM
9793         after Graphite.
9794         * toplev.c (graphite_out_file): New file descriptor.
9795         (graphite_in_file): New.
9796         (process_options): flag_graphite_force_parallel cannot be used without
9797         Graphite.
9798         * tree-ssa-loop.c: Include toplev.h.
9799         (gate_graphite_transforms): Enable flag_graphite for
9800         flag_graphite_force_parallel.
9802 2009-07-30  Sebastian Pop  <sebastian.pop@amd.com>
9804         * ChangeLog.graphite: New.
9805         * graphite-blocking.c: New.
9806         * graphite-clast-to-gimple.c: New.
9807         * graphite-clast-to-gimple.h: New.
9808         * graphite-dependences.c: New.
9809         * graphite-dependences.h: New.
9810         * graphite-interchange.c: New.
9811         * graphite-poly.c: New.
9812         * graphite-poly.h: New.
9813         * graphite-ppl.c: New.
9814         * graphite-ppl.h: New.
9815         * graphite-scop-detection.c: New.
9816         * graphite-scop-detection.h: New.
9817         * graphite-sese-to-poly.c: New.
9818         * graphite-sese-to-poly.h: New.
9819         * sese.c: New.
9820         * sese.h: New.
9822 2009-07-30  Sebastian Pop  <sebastian.pop@amd.com>
9824         * tree-chrec.c (evolution_function_right_is_integer_cst): New.
9825         * tree-chrec.h (evolution_function_right_is_integer_cst): Declared.
9827 2009-07-30  Sebastian Pop  <sebastian.pop@amd.com>
9829         * tree-chrec.c (operator_is_linear): Handle BIT_NOT_EXPR.
9830         (scev_is_linear_expression): Return false if the evolution is not
9831         affine multivariate.
9833 2009-07-30  Sebastian Pop  <sebastian.pop@amd.com>
9835         * tree-data-ref.c (graphite_find_data_references_in_stmt): New.
9836         * tree-data-ref.h (graphite_find_data_references_in_stmt): Declared.
9838 2009-07-30  Sebastian Pop  <sebastian.pop@amd.com>
9840         * tree-data-ref.c (debug_data_references): New.
9841         (debug_data_reference): New.
9842         * tree-data-ref.h (debug_data_references): Declared.
9843         (debug_data_reference): Declared.
9845 2009-07-30  Sebastian Pop  <sebastian.pop@amd.com>
9847         * tree-data-ref.c (stmt_simple_memref_p: Removed.
9848         * tree-data-ref.h (scop_p): Removed.
9849         (struct data_reference): Remove field scop.
9850         (DR_SCOP): Removed.
9851         (stmt_simple_memref_p): Removed.
9853 2009-07-30  Sebastian Pop  <sebastian.pop@amd.com>
9855         * cfgloop.h (create_empty_loop_on_edge): Pass an extra argument.
9856         * cfgloopmanip.c (create_empty_loop_on_edge): Leave the loop_latch
9857         basic block empty.
9859 2009-07-30  Sebastian Pop  <sebastian.pop@amd.com>
9861         * doc/invoke.texi (-fgraphite-force-parallel): Documented.
9863 2009-07-30  Sebastian Pop  <sebastian.pop@amd.com>
9865         * doc/invoke.texi (-fgraphite-identity): Documented.
9867 2009-07-30  Sebastian Pop  <sebastian.pop@amd.com>
9869         * tree-scalar-evolution.c: Fix comment.
9870         (instantiate_scev_1): Return unknow from scev instantiation if the
9871         result is not above instantiate_below.
9873 2009-07-30  Sebastian Pop  <sebastian.pop@amd.com>
9875         * tree-scalar-evolution.c (compute_overall_effect_of_inner_loop): Not
9876         static anymore.  Instantiate the symbols that may have been introduced
9877         by chrec_apply.
9878         * tree-scalar-evolution.h (compute_overall_effect_of_inner_loop):
9879         Declared.
9881 2009-07-30  DJ Delorie  <dj@redhat.com>
9883         * config/mep/mep.c (mep_asm_init_sections): Add section flags and
9884         .vliw directive to VLIW sections.
9886 2009-07-30  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
9888         * Makefile.in (AUTOCONF, ACLOCAL, ACLOCAL_AMFLAGS, aclocal_deps):
9889         New variables.
9890         ($(srcdir)/configure, $(srcdir)/aclocal.m4): New rules.
9891         (AUTOHEADER): New variable.
9892         ($(srcdir)/cstamp-h.in): Use it.
9894 2009-07-30  Michael Meissner  <meissner@linux.vnet.ibm.com>
9895             Pat Haugen  <pthaugen@us.ibm.com>
9896             Revital Eres <ERES@il.ibm.com>
9898         * config/rs6000/vector.md (VEC_F): Add VSX support.
9899         (VEC_A): Ditto.
9900         (VEC_N): Ditto.
9901         (mov<mode>): Ditto.
9902         (vector_load_<mode>): Ditto.
9903         (vector_store_<mode>): Ditto.
9904         (vector GPR move split): Ditto.
9905         (vec_reload_and_plus_<mptrsize>): Ditto.
9906         (vec_reload_and_reg_<mptrsize>): Ditto.
9907         (add<mode>3): Ditto.
9908         (sub<mode>3): Ditto.
9909         (mul<mode>3): Ditto.
9910         (neg<mode>2): Ditto.
9911         (abs<mode>2): Ditto.
9912         (smin<mode>3): Ditto.
9913         (smax<mode>3): Ditto.
9914         (vector_eq<mode>): Ditto.
9915         (vector_gt<mode>): Ditto.
9916         (vector_ge<mode>): Ditto.
9917         (vector_gtu<mode>): Ditto.
9918         (vector_select_<mode>_uns): Ditto.
9919         (vector_eq_<mode>_p): Ditto.
9920         (vector_gt_<mode>_p): Ditto.
9921         (vector_ge_<mode>_p): Ditto.
9922         (vector_gtu_<mode>_p): Ditto.
9923         (cr6_test_for_zero): Ditto.
9924         (cr6_test_for_zero_reverse): Ditto.
9925         (cr6_test_for_lt): Ditto.
9926         (cr6_test_for_lt_reverse): Ditto.
9927         (xor<mode>3): Ditto.
9928         (ior<mode>3): Ditto.
9929         (and<mode>3): Ditto.
9930         (one_cmpl<mode>2): Ditto.
9931         (nor<mode>2): Ditto.
9932         (andc<mode>2): Ditto.
9933         (float<VEC_int<mode>2): Ditto.
9934         (unsigned_float<VEC_int><mode>2): Ditto.
9935         (fix_trunc<mode><VEC_int>2): Ditto.
9936         (fixuns_trunc<mode><VEC_int>2): Ditto.
9937         (vec_init<mode>):
9938         (vec_set<mode>): Ditto.
9939         (vec_extract<mode>): Ditto.
9940         (vec_interleave_highv4sf): Ditto.
9941         (vec_interleave_lowv4sf): Ditto.
9942         (vec_realign_load_<mode>): Ditto.
9943         (vec_shl_<mode>): Ditto.
9944         (vec_shr_<mode>): Ditto.
9945         (div<mode>3): New patterns for VSX.
9946         (vec_interleave_highv2df): Ditto.
9947         (vec_interleave_lowv2df): Ditto.
9948         (vec_pack_trunc_v2df): Ditto.
9949         (vec_pack_sfix_trunc_v2df): Ditto.
9950         (vec_pack_ufix_trunc_v2df): Ditto.
9951         (vec_unpacks_hi_v4sf): Ditto.
9952         (vec_unpacks_lo_v4sf): Ditto.
9953         (vec_unpacks_float_hi_v4si): Ditto.
9954         (vec_unpacks_float_lo_v4si): Ditto.
9955         (vec_unpacku_float_hi_v4si): Ditto.
9956         (vec_unpacku_float_lo_v4si): Ditto.
9957         (movmisalign<mode>): Ditto.
9958         (vector_ceil<mode>2): New patterns for vectorizing math library.
9959         (vector_floor<mode>2): Ditto.
9960         (vector_btrunc<mode>2): Ditto.
9961         (vector_copysign<mode>3): Ditto.
9963         * config/rs6000/predicates.md (easy_vector_constant_msb): New
9964         predicate for setting the high bit in each word, used for copysign.
9966         * config/rs6000/ppc-asm.h (f19): Whitespace.
9967         (f32-f63): Define if VSX.
9968         (v0-v31): Define if Altivec.
9969         (vs0-vs63): Define if VSX.
9971         * config/rs6000/t-rs6000 (MD_INCLUDES): Add power7.md and vsx.md.
9973         * config/rs6000/power7.md: New file, provide tuning parameters for
9974         -mcpu=power7.
9976         * config/rs6000/rs6000-c.c (rs6000_macro_to_expand): Add VSX support.
9977         (rs6000_cpu_cpp_builtins): Ditto.
9978         (altivec_overloaded_builtins): Ditto.
9979         (altivec_resolve_overloaded_builtin): Ditto.
9981         * config/rs6000/rs6000.opt (-mno-vectorize-builtins): Add new
9982         debug switch to disable vectorizing simple math builtin
9983         functions.
9985         * config/rs6000/rs6000.c (rs6000_builtin_vectorized_function):
9986         Vectorize simple math builtin functions.
9987         (TARGET_VECTORIZE_BUILTIN_VECTORIZED_FUNCTION): Define target
9988         hook to vectorize math builtins.
9989         (rs6000_override_options): Enable -mvsx on -mcpu=power7.
9990         (rs6000_builtin_conversion): Add VSX/power7 support.
9991         (rs6000_builtin_vec_perm): Ditto.
9992         (vsplits_constant): Add support for loading up a vector constant
9993         with just the high bit set in each part.
9994         (rs6000_expand_vector_init): Add VSX/power7 support.
9995         (rs6000_expand_vector_set): Ditto.
9996         (rs6000_expand_vector_extract): Ditto.
9997         (rs6000_emit_move): Ditto.
9998         (bdesc_3arg): Ditto.
9999         (bdesc_2arg): Ditto.
10000         (bdesc_1arg): Ditto.
10001         (rs6000_expand_ternop_builtin): Ditto.
10002         (altivec_expand_builtin): Ditto.
10003         (rs6000_expand_unop_builtin): Ditto.
10004         (rs6000_init_builtins): Ditto.
10005         (altivec_init_builtins): Ditto.
10006         (builtin_function_type): Ditto.
10007         (rs6000_common_init_builtins): Ditto.
10008         (rs6000_handle_altivec_attribute); Ditto.
10009         (rs6000_mangle_type): Ditto.
10010         (rs6000_vector_mode_supported_p): Ditto.
10011         (rs6000_mode_dependent_address): Altivec addresses with AND -16
10012         are mode dependent.
10014         * config/rs6000/vsx.md: New file for VSX support.
10016         * config/rs6000/rs6000.h (EASY_VECTOR_MSB): New macro for
10017         identifing values with just the most significant bit set.
10018         (enum rs6000_builtins): Add builtins for VSX.  Add simple math
10019         vectorized builtins.
10021         * config/rs6000/altivec.md (UNSPEC_VRFIP): Delete.
10022         (UNSPEC_VRFIM): Delete.
10023         (splitter for loading up vector with most significant bit): New
10024         splitter for vectorizing copysign.
10025         (altivec_vrfiz): Rename from altivec_fturncv4sf2.  Add support for
10026         vectorizing simple math functions.
10027         (altivec_vrfip): Add support for vectorizing simple math functions.
10028         (altivec_vrfim): Ditto.
10029         (altivec_copysign_v4sf3): New insn for Altivec copysign support.
10031         * config/rs6000/rs6000.md (UNSPEC_BPERM): New constant.
10032         (power7.md, vsx.md): Include for power7 support.
10033         (copysigndf3): Use VSX instructions if -mvsx.
10034         (negdf2_fpr): Ditto.
10035         (absdf2_fpr): Ditto.
10036         (nabsdf2_fpr): Ditto.
10037         (adddf3_fpr): Ditto.
10038         (subdf3_fpr): Ditto.
10039         (muldf3_fpr): Ditto.
10040         (divdf3_fpr): Ditto.
10041         (fix_truncdfdi2_fpr): Ditto.
10042         (cmpdf_internal1): Ditto.
10043         (fred, fred_fpr): Convert into expander/insn to add VSX support.
10044         (btruncdf2, btruncdf2_fpr): Ditto.
10045         (ceildf2, ceildf2_fpr): Ditto.
10046         (floordf2, floordf2_fpr): Ditto.
10047         (floatdidf2, floatdidf2_fpr): Ditto.
10048         (fmadddf4_fpr): Name insn.  Use VSX instructions if -mvsx.
10049         (fmsubdf4_fpr): Ditto.
10050         (fnmadddf4_fpr_1): Ditto.
10051         (fnmadddf4_fpr_2): Ditto.
10052         (fnmsubdf4_fpr_1): Ditto.
10053         (fnmsubdf4_fpr_2): Ditto.
10054         (fixuns_truncdfdi2): Add expander for VSX support.
10055         (fix_truncdfdi2): Ditto.
10056         (fix_truncdfsi2): Ditto.
10057         (ftruncdf2): Ditto.
10058         (btruncsf2): Whitespace.
10059         (movdf_hardfloat32): Add support for VSX registers.
10060         (movdf_softfloat32): Ditto.
10061         (movdf_hardfloat64): Ditto.
10062         (movdf_hardfloat64_mfpgpr): Ditto.
10063         (movdf_softfloat64): Ditto.
10064         (movti splitters): Add check for vector registers supporting
10065         TImode in the future.
10066         (bpermd): Add power7 bpermd instruction.
10068         * config/rs6000/altivec.h (vec_div): Define if VSX.
10069         (vec_mul): Ditto.
10070         (vec_msub): Ditto.
10071         (vec_nmadd): Ditto.
10072         (vec_nearbyint): Ditto.
10073         (vec_rint): Ditto.
10074         (vec_sqrt): Ditto.
10075         (all predicates): Use the generic builtin function, and not the V4SF
10076         specific function so that the predicates will work with VSX's V2DF.
10077         (vec_all_*): Ditto.
10078         (vec_any_*): Ditto.
10080         * doc/extend.texi (PowerPC Altivec/VSX Built-in Functions):
10081         Document new VSX functions and types.
10083         * doc/invoke.texi (PowerPc options): Document -mpopcntd, -mvsx
10084         switches.
10086         * doc/md.texi (PowerPC constraints): Document "wd", "wf", "ws",
10087         "wa", and "j" constraints.  Modify "v" to talk about Altivec
10088         instead of just vector.
10090 2009-07-30  Andrew MacLeod  <amacleod@redhat.com>
10092         PR debug/26475
10093         * tree-into-ssa.c (insert_phi_nodes_for, rewrite_add_phi_arguments): Set
10094         location for phi arguments.
10095         (rewrite_update_phi_arguments): Find locations for reaching defs.
10096         * tree-ssa-threadupdate.c (create_edge_and_update_destination_phis):
10097         Add location to add_phi_arg calls.
10098         * tree-loop-districbution.c (update_phis_for_loop_copy): Add locations.
10099         * tree-ssa-loop-manip.c (create_iv, add_exit_phis_edge,
10100         split_loop_exit_edge, tree_transform_and_unroll_loop): Add locations.
10101         * tree-tailcall.c (add_successor_phi_arg, eliminate_tail_call,
10102         create_tailcall_accumulator, tree_optimize_tail_calls_1): Add locations.
10103         * tree.h (struct phi_arg_d): Add location_t to PHI arguments.
10104         * tree-phinodes.c (make_phi_node): Initialize location.
10105         (resize_phi_node): Initialize location to UNKNOWN_LOCATION.
10106         (add_phi_arg): Add location parameter.
10107         (remove_phi_arg_num): Move location when moving phi argument.
10108         * omp-low.c (expand_parallel_call, expand_omp_for_static_chunk): Set
10109         location.
10110         * tree-vect-loop-manip.c (slpeel_update_phis_for_duplicate_loop,
10111         slpeel_update_phi_nodes_for_guard1,
10112         slpeel_update_phi_nodes_for_guard2,
10113         slpeel_tree_duplicate_loop_to_edge_cfg, set_prologue_iterations,
10114         vect_loop_versioning): Set locations.
10115         * tree-parloops.c (create_phi_for_local_result,
10116         transform_to_exit_first_loop, create_parallel_loop): Add locations.
10117         * gimple-pretty-print.c (dump_gimple_phi): Dump lineno's if present.
10118         * tree-vect-loop.c (get_initial_def_for_induction,
10119         vect_create_epilog_for_reduction, vect_finalize_reduction): Add
10120         locations.
10121         * tree-flow-inline.h (gimple_phi_arg_location): New.  Return locus.
10122         (gimple_phi_arg_location_from_edge): New.  Return locus from an edge.
10123         (gimple_phi_arg_set_location): New.  Set locus.
10124         (gimple_phi_arg_has_location): New.  Check for locus.
10125         (redirect_edge_var_map_location): New.  Return locus from var_map.
10126         * tree-vect-data-refs.c (vect_setup_realignment): Set location.
10127         * tree-ssa-phiopt.c (conditional_replacement): Set locus when
10128         combining PHI arguments.
10129         (cond_store_replacement): Set location.
10130         * cfgexpand.c (gimple_assign_rhs_to_tree): Transfer locus if possible.
10131         * grpahite.c (add_loop_exit_phis, add_guard_exit_phis,
10132         scop_add_exit_phis_edge): Add locations.
10133         * tree-cfgcleanup.c (remove_forwarder_block,
10134         remove_forwarder_block_with_phi): Add locations.
10135         * tree-ssa-pre.c (insert_into_preds_of_block): Add locations.
10136         * tree-predcom.c (initialize_root_vars, initialize_root_vars_lm): Add
10137         locations.
10138         * tree-ssa-dce.c (forward_edge_to_pdom): Add locations.
10139         * tree-ssa.c (redirect_edge_var_map_add, ssa_redirect_edge,
10140         flush_pending_stmts): Add source location.
10141         * lambda-code.c (perfect_nestify): Maintain location stack with argument
10142         stack to preserve locations.
10143         * tree-vect-stmts.c (vectorizable_load): Add location.
10144         * tree-inline.c (copy_phis_for_bb): Copy locus.
10145         (setup_one_parameter): Add call locus to inlined parameter stmts.
10146         (initialize_inlined_parameters): Pass in call location as parameter
10147         assignment locus.
10148         (tree_function_versioning): Pass location to setup_one_parameter.
10149         * tree-ssa-phiprop.c (phiprop_insert_phi): Set locations.
10150         * tree-outof-ssa.c (struct _elim_graph): Add source_location vecs for
10151         copy and edge lists.
10152         (insert_partition_copy_on_edge, insert_value_copy_on_edge,
10153         insert_rtx_to_part_on_edge, insert_part_to_rtx_on_edge): Provide a
10154         locus parameter and override the stmt default if provided.
10155         (new_elim_graph, clear_elim_graph, delete_elim_graph,
10156         elim_graph_add_edge, elim_graph_remove_succ_edge,
10157         FOR_EACH_ELIM_GRAPH_SUCC, FOR_EACH_ELIM_GRAPH_PRED, eliminate_build,
10158         elim_forward, elim_unvisited_predecessor, elim_backward, elim_create,
10159         eliminate_phi):  Add locus info in elimination graph for each edge and
10160         value copy.
10161         (insert_backedge_copies): Copy locus if present.
10162         * tree-flow.h (struct _edge_var_map): Add locus field.
10163         * tree-switch_conversions.c (fix_phi_nodes): Add locations.
10164         * tree-cfg.c (reinstall_phi_args, gimple_make_forwarder_block,
10165         add_phi_args_after_copy_edge, gimple_lv_adjust_loop_header_phi): Add
10166         locations.
10167         * ipa-struct-reorg.c (make_edge_and_fix_phis_of_dest): Add locations.
10169 2009-07-30  Martin Jambor  <mjambor@suse.cz>
10171         PR tree-optimization/40570
10172         * ipa-inline.c (cgraph_decide_inlining): Watch out for dead single
10173         use inlining loops.
10175 2009-07-30  Razya Ladelsky <razya@il.ibm.com>
10177         * ssa-loop-manip.c: Include langhooks.h.
10178         (rewrite_phi_with_iv): New.
10179         (rewrite_all_phi_nodes_with_iv): New.
10180         (canonicalize_loop_ivs): Move here from tree-parloops.c.
10181         Remove reduction_list argument. Use rewrite_all_phi_nodes_with_iv.
10182         * tree-parloops.c (loop_parallel_p): Move out all conditions
10183         except dependency check.
10184         (canonicalize_loop_ivs): Move to tree-ssa-loop-manip.c.
10185         (gen_parallel_loop): Call canonicalize_loop_ivs without
10186         reduction_list argument.
10187         (build_new_reduction): New.
10188         (gather_scalar_reductions): New.
10189         (try_get_loop_niter): New.
10190         (try_create_reduction_list): New.
10191         (parallleize_loops): Change the parallel conditions check.
10192         * tree-flow.h (canonicalize_loop_ivs): Remove one argument.
10193         * Makefile.in (tree-ssa-loop-manip.o): Add langhooks.h dependency.
10195 2009-07-30  Dave Korn  <dave.korn.cygwin@gmail.com>
10197         * opt-functions.awk (opt_args): Allow argument to be enclosed in
10198         curly braces.
10199         * doc/options.texi (Option properties):  Mention new quoting syntax.
10201 2009-07-29  Douglas B Rupp  <rupp@gnat.com>
10203         * config/alpha/alpha.c (alpha_start_function):
10204         Handle VMS_DEBUG_MAIN_POINTER
10205         * config/alpha/vms.h (VMS_DEBUG_MAIN_POINTER): Define new macro.
10206         * doc/invoke.texi: Document -mdebug-main switch.
10208 2009-07-29  Richard Henderson  <rth@redhat.com>
10210         * cgraph.c (cgraph_set_call_stmt_including_clones): Tidy.
10211         (cgraph_create_edge_including_clones): Likewise.
10212         * tree-inline.c (copy_bb): Operate on the correct edges
10213         when updating the callgraph.
10215 2009-07-29  Douglas B Rupp  <rupp@gnat.com>
10217         * config/alpha/vms-cc.c: Deleted.
10218         * config/alpha/vms-ld.c: Deleted.
10219         * config/alpha/t-vms64: Moved to config/vms
10220         * config/alpha/vms-crt0-64.c: Moved to config/vms
10221         * config/alpha/vms-crt0.c: Moved to config/vms
10222         * config/alpha/vms-psxcrt0-64.c: Moved to config/vms
10223         * config/alpha/vms-psxcrt0.c: Moved to config/vms
10224         * config/alpha/xm-vms.h: Moved to config/vms
10225         * config/alpha/x-vms: Moved to config/vms
10226         * config/alpha/t-vms (vcrt0.o, pcrt0.o): Move rules to new file
10227         config/vms/t-vms.
10228         * config/vms/t-vms: Moved here from config/alpha. Alpha specific
10229         parts removed. (STMP_FIXPROTO, STMP_FIXINC, LIMITS_H_TEST): Set.
10230         (version): Set.
10231         * config/vms/t-vms64: Moved here from config/alpha
10232         * config/vms/vms-crt0-64.c: Moved here from config/alpha.
10233         (argc,argv,envp): Enforce 32bit malloc'ing.
10234         * config/vms/vms-psxcrt0-64.c: Likewise.
10235         * config/vms/vms-crt0.c: Moved here from config/alpha.
10236         * config/vms/vms-psxcrt0.c: Likewise.
10237         * config/vms/vms-crtl-64.h: New file.
10238         * config/vms/vms-crtl.h: New file.
10239         * config/vms/vms.opt: New file.
10240         * config/vms/xm-vms64.h: New file.
10241         * config/vms/xm-vms.h: Moved here from config/alpha.
10242         (STANARD_EXEC_PREFIX, STANDARD_STARTFILE_PREFIX, STANDARD_INCLUDE_DIR):
10243         Set.
10244         * config/vms/x-vms: Moved here from config/alpha.
10245         (version, VMS_EXTRA_PARTS): Moved to t-vms.
10246         (vms-ld.o, vms-cc.o): Removed.
10247         (LN, LN_S, USE_COLLECT2, POD2MAN): Set.
10249 2009-07-29  Douglas B Rupp  <rupp@gnat.com>
10251         * dwarf2out.c (add_name_and_src_coords_attributes): Push on the
10252         correct stack (obvious VMS fix).
10254 2009-07-29  Douglas B Rupp  <rupp@gnat.com>
10256         * dwarf2out.c (output_file_names): Output VMS style file name, size,
10257         date, version info if VMS_DEBUGGING_INFO defined.
10258         * vmsdgbout.c (vms_file_stats_name): New functon. VMS style file name,
10259         size, date calculating code moved here.
10261 2009-07-29  Paul Brook  <paul@codesourcery.com>
10263         * config/arm/lib1funcs.asm (clear_cache): Use ARM_FUNC_START and
10264         do_push/do_pop.
10266 2009-07-29  Uros Bizjak  <ubizjak@gmail.com>
10268         PR target/40577
10269         * config/alpha/alpha.c (alpha_expand_unaligned_store): Convert src
10270         to DImode when generating insq_le insn.
10272 2009-07-28  Douglas B Rupp  <rupp@gnat.com>
10274         * dwarf2out.c (DWARF2_INDIRECT_STRING_SUPPORT_MISSING_ON_TARGET):
10275         New macro set for VMS_DEBUGGGING_INFO.
10276         (AT_string_form): Use it.
10278 2009-07-28  DJ Delorie  <dj@redhat.com>
10280         * config/mep/mep.c (vtext_section): New.
10281         (vftext_section): New.
10282         (ftext_section): New.
10283         (mep_select_section): Add support for functions.
10284         (mep_unique_section): Likewise.
10285         (mep_asm_init_sections): Likewise.
10286         (mep_encode_section_info): Remove it from here.
10288         * config/mep/mep.h (USE_SELECT_SECTION_FOR_FUNCTIONS): Define.
10290 2009-07-28  Paolo Bonzini  <bonzinI@gnu.org>
10292         * tree.h (TREE_DEPRECATED): Document it is used for types too.
10293         (TYPE_VECTOR_OPAQUE): Use default_def_flag
10295 2009-07-28  Douglas B Rupp  <rupp@gnat.com>
10297         * dwarf2out.c (output_file_names): Test new macro
10298         DWARF2_DIR_SHOULD_END_WITH_SEPARATOR.
10299         (add_comp_dir_attribute): Likewise.
10301 2009-07-28  Kai Tietz  <kai.tietz@onevision.com>
10303         * config/i386/mingw-w64.h (LINK_SPEC): Add
10304         separating space between commands.
10306 2009-07-28  Jan Hubicka  <jh@suse.cz>
10308         PR tree-optimization/40759
10309         * tree-ssa-dce.c (mark_virtual_phi_result_for_renaming): Mark all uses
10310         for renaming.
10312 2009-07-27  DJ Delorie  <dj@redhat.com>
10314         * config/mep/mep.c (mep_expand_builtin_saveregs): Make sure 64-bit
10315         types are dword-aligned.
10316         (mep_expand_va_start): Likewise.
10318 2009-07-27  Olivier Hainque  <hainque@adacore.com>
10319             Douglas B Rupp  <rupp@gnat.com>
10321         * convert.c (convert_to_pointer): Don't assume the target
10322         pointer type is POINTER_SIZE long. Fetch its precision instead.
10324 2009-07-27  Douglas B Rupp  <rupp@gnat.com>
10326         * system.h (fopen): Undefine if macro.
10328 2009-07-27  Jakub Jelinek  <jakub@redhat.com>
10330         * dwarf2out.c (output_cfi_p): Removed.
10331         (output_cfis): New function.
10332         (output_fde): New function, split from output_call_frame_info.
10333         (output_call_frame_info): Use it.
10334         (dwarf2out_switch_text_section): Use output_cfis.
10336 2009-07-24  Kai Tietz  <kai.tietz@onevision.com>
10338         * config/i386/cygming.h (DWARF2_UNWIND_INFO): Error build when
10339         TARGET_BI_ARCH is specified without enabling SJLJ.
10340         * config/i386/mingw32.h (MD_UNWIND_SUPPORT): Define MD_UNWIND_SUPPORT,
10341         if TARGET_64BIT and TARGET_BI_ARCH aren't defined.
10343 2009-07-26  Mikael Pettersson <mikpe@it.uu.se>
10345         * arm.md (negdi2): Use DImode if forcing a value into a register.
10347 2009-07-26  Ira Rosen  <irar@il.ibm.com>
10349         PR tree-optimization/40801
10350         * tree-vect-stmts.c (vectorizable_call): Get previous copy
10351         of vector operand from the previous copy of vector statement.
10352         Pass the correct definition type value to
10353         vect_get_vec_def_for_stmt_copy().
10355 2009-07-25  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
10357         * collect2.c (scan_libraries): Use CONST_CAST2 to perform char ** to
10358         const char ** conversion.
10360 2009-07-25 David Daney <ddaney@caviumnetworks.com>
10362         * system.h (gcc_assert): Invoke __builtin_unreachable() instead of
10363         fancy_abort() if !ENABLE_ASSERT_CHECKING.
10364         (gcc_unreachable): Invoke __builtin_unreachable() if
10365         !ENABLE_ASSERT_CHECKING.
10367 2009-07-25  David Daney  <ddaney@caviumnetworks.com>
10369         PR rtl-optimization/40445
10370         * emit-rtl.c (next_nonnote_insn_bb): New function.
10371         * rtl.h (next_nonnote_insn_bb): Declare new function.
10372         * cfgcleanup.c (try_optimize_cfg): Don't remove an empty block
10373         with no successors that is the successor of the ENTRY_BLOCK.
10374         Continue from the top after removing an empty fallthrough block.
10375         * cfgrtl.c (get_last_bb_insn): Call next_nonnote_insn_bb instead
10376         of next_nonnote_insn.
10378 2009-07-25  David Daney  <ddaney@caviumnetworks.com>
10380         * cfgcleanup.c (old_insns_match_p): Handle the case of empty blocks.
10382 2009-07-25  Martin Jambor  <mjambor@suse.cz>
10384         * c-common.c (c_common_attribute_table): New element for noclone.
10385         (handle_noclone_attribute): New function. Forward-declare.
10386         * tree-inline.c (tree_versionable_function_p): Check for noclone
10387         attribute.
10388         * doc/extend.texi (Labels as Values): Document need for noclone.
10389         (Function Attributes): Document noclone attribute.
10391 2009-07-25  Jakub Jelinek  <jakub@redhat.com>
10393         PR rtl-optimization/34999
10394         * dwarf2out.c (struct dw_fde_struct): Add dw_fde_switch_cfi
10395         and dw_fde_switched_cold_to_hot fields.
10396         (output_cfi_p): New function.
10397         (output_call_frame_info): If fde->dw_fde_switched_sections,
10398         output 2 FDEs instead of one with corrupted header.
10399         (dwarf2out_do_cfi_startproc): New function.
10400         (dwarf2out_begin_prologue): Use it.  Initialize fde->dw_fde_switch_cfi
10401         and fde->dw_fde_switched_cold_to_hot.
10402         (dwarf2out_switch_text_section): Compute
10403         fde->dw_fde_switched_cold_to_hot.  Switch to new text section here.
10404         If dwarf2out_do_cfi_asm, emit .cfi_endproc before it and call
10405         dwarf2out_do_cfi_startproc plus emit again currently active CFI insns.
10406         Otherwise, compute fde->dw_fde_switch_cfi.
10408 2009-07-24  Cary Coutant  <ccoutant@google.com>
10410         * tree-cfg.c (assign_discriminator): Add explicit parentheses.
10412 2009-07-24  Cary Coutant  <ccoutant@google.com>
10414         * cfghooks.c (split_block): Copy discriminator to new block.
10415         * tree-cfg.c (assign_discriminator): Check location of last
10416         instruction in block as well as first.
10418 2009-07-24  Uros Bizjak  <ubizjak@gmail.com>
10420         * config/i386/linux.c: Use fputs or putc instead of fprintf
10421         where appropriate.
10422         * config/i386/gas.h: Ditto.
10423         * config/i386/x86-64.h: Ditto.
10424         * config/i386/att.h: Ditto.
10426 2009-07-24  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
10428         * expmed.c (emit_store_flag): Use a recursive call to optimize the
10429         xor case.
10431 2009-07-24  Martin Jambor  <mjambor@suse.cz>
10433         * ipa-prop.h (struct ipa_node_params): New flag node_enqued.
10434         (ipa_push_func_to_list_1): Declare.
10435         (ipa_push_func_to_list): New function.
10437         * ipa-prop.c (ipa_push_func_to_list_1): New function.
10438         (ipa_init_func_list): Call ipa_push_func_to_list_1.
10439         (ipa_push_func_to_list): Removed.
10440         (ipa_pop_func_from_list): Clear node_enqueued flag.
10442 2009-07-24  Andreas Krebbel  <krebbel1@de.ibm.com>
10444         * config/s390/s390.c (override_options): Default
10445         max-unrolled-insns to 100 for z10 tuning.
10447 2009-07-24  Tobias Grosser  <grosser@fim.uni-passau.de>
10449         * Makefile.in (TREE_DATA_REF_H, tree-vrp.o, tree-cfg.o, tree-if-conv.o
10450         tree-ssa-loop.o, tree-ssa-loop-niter.o, tree-ssa-loop-ivcanon.o,
10451         tree-ssa-loop-prefetch.o, tree-predcom.o, tree-affine.o,
10452         tree-scalar-evolution.o, tree-data-ref.o, tree-vect-loop.o,
10453         tree-vect-data-refs.o, tree-loop-linear.o, tree-loop-distribution.o
10454         tree-parloops.o, tree-pretty-printer.o, fold-const.o, tree-ssa-dce.o,
10455         lambda-code.o, params.o): Cleanup use of SCEV_H and TREE_DATA_REF_H.
10457 2009-07-24  Kai Tietz  <kai.tietz@onevision.com>
10459         * config/i386/mingw-w64.h (STANDARD_INCLUDE_DIR): Remove and
10460         use default set in mingw32.h header.
10461         * config/i386/mingw32.h (STANDARD_INCLUDE_DIR): Use for 32-bit and
10462         64-bit /mingw/include path.
10463         (STANDARD_STARTFILE_PREFIX_1): Use for 32-bit and 64-bit /mingw/lib
10464         path.
10466 2009-07-23  Neil Vachharajani  <nvachhar@google.com>
10468         PR rtl-optimization/40209
10469         * loop-iv.c (iv_analysis_loop_init): Call df_note_add_problem.
10471 2009-07-23  Uros Bizjak  <ubizjak@gmail.com>
10473         * config/i386/i386.c: Use ASM_LONG instead of .long.  Concatenate
10474         ASM_LONG, LPREFIX, MCOUNT_NAME and PROFILE_COUNT_REGISTER strings
10475         with the rest of string where appropriate.  Use fputs or putc
10476         instead of fprintf where appropriate.
10478 2009-07-22  Michael Meissner  <meissner@linux.vnet.ibm.com>
10479             Pat Haugen  <pthaugen@us.ibm.com>
10480             Revital Eres <ERES@il.ibm.com>
10482         * config/rs6000/vector.md: New file.  Move most of the vector
10483         expander support here from altivec.md to allow for the VSX vector
10484         unit in the future.  Add support for secondary_reload patterns.
10485         Rewrite the patterns for vector comparison, and vector comparison
10486         predicate instructions so that the RTL expresses the desired
10487         behavior, instead of using unspec.
10489         * config/rs6000/constraints.md ("f" constraint): Use
10490         rs6000_constraints to hold the precalculated register class.
10491         ("d" constraint): Ditto.
10492         ("wd" constraint): New constraint for VSX.
10493         ("wf" constraint): Ditto.
10494         ("ws" constraint): Ditto.
10495         ("wa" constraint): Ditto.
10496         ("wZ" constraint): Ditto.
10497         ("j" constraint): Ditto.
10499         * config/rs6000/predicates.md (vsx_register_operand): New
10500         predicate for VSX.
10501         (vfloat_operand): New predicate for vector.md.
10502         (vint_operand): Ditto.
10503         (vlogical_operand): Ditto.
10504         (easy_fp_constant): If VSX, 0.0 is an easy constant.
10505         (easy_vector_constant): Add VSX support.
10506         (altivec_indexed_or_indirect_operand): New predicate for
10507         recognizing Altivec style memory references with AND -16.
10509         * config/rs6000/rs6000.c (rs6000_vector_reload): New static global
10510         for vector secondary reload support.
10511         (rs6000_vector_reg_class): Delete, replacing it with
10512         rs6000_constraints.
10513         (rs6000_vsx_reg_class): Ditto.
10514         (rs6000_constraints): New array to hold the register classes of
10515         each of the register constraints that can vary at runtime.
10516         (builtin_mode_to_type): New static array for builtin function type
10517         creation.
10518         (builtin_hash_table): New static hash table for builtin function
10519         type creation.
10520         (TARGET_SECONDARY_RELOAD): Define target hook.
10521         (TARGET_IRA_COVER_CLASSES): Ditto.
10522         (rs6000_hard_regno_nregs_internal): If -mvsx, floating point
10523         registers are 128 bits if VSX memory reference instructions are used.
10524         (rs6000_hard_regno_mode_ok): For VSX, only check if the VSX memory
10525         unit is being used.
10526         (rs6000_debug_vector_unit): Move into rs6000_debug_reg_global.
10527         (rs6000_debug_reg_global): Move -mdebug=reg statements here.
10528         Print several of the scheduling related parameters.
10529         (rs6000_init_hard_regno_mode_ok): Switch to putting constraints in
10530         rs6000_constraints instead of rs6000_vector_reg_class.  Move
10531         -mdebug=reg code to rs6000_debug_reg_global.  Add support for
10532         -mvsx-align-128 debug switch.  Drop testing float_p if VSX or
10533         Altivec.  Add VSX support.  Setup for secondary reload support on
10534         Altivec/VSX registers.
10535         (rs6000_override_options): Make power7 set the scheduling groups
10536         like the power5.  Add support for new debug switches to override
10537         the scheduling defaults.  Temporarily disable -mcpu=power7 from
10538         setting -mvsx.  Add support for debug switches -malways-hint,
10539         -msched-groups, and -malign-branch-targets.
10540         (rs6000_buitlin_conversion): Add support for returning unsigned
10541         vector conversion functions to fix regressions due to stricter
10542         type checking.
10543         (rs6000_builtin_mul_widen_even): Ditto.
10544         (rs6000_builtin_mul_widen_odd): Ditto.
10545         (rs6000_builtin_vec_perm): Ditto.
10546         (rs6000_vec_const_move): On VSX, use xxlxor to clear register.
10547         (rs6000_expand_vector_init): Initial VSX support for using xxlxor
10548         to zero a register.
10549         (rs6000_emit_move): Fixup invalid const symbol_ref+reg that is
10550         generated upstream.
10551         (bdesc_3arg): Add builtins for unsigned types.  Add builtins for
10552         VSX types for bit operations.  Changes to accomidate vector.md.
10553         (bdesc_2arg): Ditto.
10554         (bdesc_1arg): Ditto.
10555         (struct builtin_description_predicates): Rewrite predicate
10556         handling so that RTL describes the operation, instead of passing
10557         the instruction to be used as a string argument.
10558         (bdesc_altivec_preds): Ditto.
10559         (altivec_expand_predicate_builtin): Ditto.
10560         (altivec_expand_builtin): Ditto.
10561         (rs6000_expand_ternop_builtin): Use a switch instead of an if
10562         statement for vsldoi support.
10563         (altivec_expand_ld_builtin): Change to use new names from vector.md.
10564         (altivec_expand_st_builtin): Ditto.
10565         (paired_expand_builtin): Whitespace changes.
10566         (rs6000_init_builtins): Add V2DF/V2DI types.  Initialize the
10567         builtin_mode_to_type table for secondary reload.  Call
10568         builtin_function_type to build random builtin functions.
10569         (altivec_init_builtins): Change to use builtin_function_type to
10570         create builtin function types dynamically as we need them.
10571         (builtin_hash_function): New support for hashing the tree types
10572         for builtin function as we need it, rather than trying to build
10573         all of the trees that we need.  Add initial preliminary VSX support.
10574         (builtin_function_type): Ditto.
10575         (builtin_function_eq): Ditto.
10576         (builtin_hash_struct): Ditto.
10577         (rs6000_init_builtins): Ditto.
10578         (rs6000_common_init_builtins): Ditto.
10579         (altivec_init_builtins): Ditto.
10580         (rs6000_common_init_builtins): Ditto.
10581         (enum reload_reg_type): New enum for simplifing reg classes.
10582         (rs6000_reload_register_type): Simplify register classes into GPR,
10583         Vector, and other registers.  Altivec and VSX addresses in reload.
10584         (rs6000_secondary_reload_inner): Ditto.
10585         (rs6000_ira_cover_classes): New target hook, that returns the
10586         appropriate cover classes, based on -mvsx being used or not.
10587         (rs6000_secondary_reload_class): Add VSX support.
10588         (get_vec_cmp_insn): Delete, rewrite vector conditionals.
10589         (get_vsel_insn): Ditto.
10590         (rs6000_emit_vector_compare): Rewrite vector conditional support
10591         so that where we can, we use RTL operators, instead of blindly use
10592         UNSPEC.
10593         (rs6000_emit_vector_select): Ditto.
10594         (rs6000_emit_vector_cond_expr): Ditto.
10595         (rs6000_emit_minmax): Directly generate min/max under altivec, vsx.
10596         (create_TOC_reference): Add -mdebug=addr support.
10597         (emit_frame_save): VSX loads/stores need register indexed addressing.
10599         * config/rs6000/rs6000.md: Include vector.md.
10601         * config/rs6000/t-rs6000 (MD_INCLUDES): Add vector.md.
10603         * config/rs6000/rs6000-c.c (altivec_overloaded_builtins): Add
10604         support for V2DI, V2DF in logical, permute, select operations.
10606         * config/rs6000/rs6000.opt (-mvsx-scalar-double): Add new debug
10607         switch for vsx/power7.
10608         (-mvsx-scalar-memory): Ditto.
10609         (-mvsx-align-128): Ditto.
10610         (-mallow-movmisalign): Ditto.
10611         (-mallow-df-permute): Ditto.
10612         (-msched-groups): Ditto.
10613         (-malways-hint): Ditto.
10614         (-malign-branch-targets): Ditto.
10616         * config/rs6000/rs6000.h (IRA_COVER_CLASSES): Delete, use target
10617         hook instead.
10618         (IRA_COVER_CLASSES_PRE_VSX): Cover classes if not -mvsx.
10619         (IRA_COVER_CLASSES_VSX): Cover classes if -mvsx.
10620         (rs6000_vector_reg_class): Delete.
10621         (rs6000_vsx_reg_class): Ditto.
10622         (enum rs6000_reg_class_enum): New enum for the constraints that
10623         vary based on target switches.
10624         (rs6000_constraints): New array to hold the register class for all
10625         of the register constraints that vary based on the switches used.
10626         (ALTIVEC_BUILTIN_*_UNS): Add unsigned builtin functions.
10627         (enum rs6000_builtins): Add unsigned varients for the builtin
10628         declarations returned by target hooks for expanding multiplies,
10629         select, and permute operations.  Add VSX builtins.
10630         (enum rs6000_builtin_type_index): Add entries for VSX.
10631         (V2DI_type_node): Ditto.
10632         (V2DF_type_node): Ditto.
10633         (unsigned_V2DI_type_node): Ditto.
10634         (bool_long_type_node): Ditto.
10635         (intDI_type_internal_node): Ditto.
10636         (uintDI_type_internal_node): Ditto.
10637         (double_type_internal_node): Ditto.
10639         * config/rs6000/altivec.md (whole file): Move all expanders to
10640         vector.md from altivec.md.  Rename insn matching functions to be
10641         altivec_foo.
10642         (UNSPEC_VCMP*): Delete, rewrite vector comparisons.
10643         (altivec_vcmp*): Ditto.
10644         (UNSPEC_VPERM_UNS): New, add for unsigned types using vperm.
10645         (VM): New iterator for moves that includes the VSX types.
10646         (altivec_vperm_<mode>): Add VSX types.  Add unsigned types.
10647         (altivec_vperm_<mode>_uns): New, for unsigned types.
10648         (altivec_vsel_*): Rewrite vector comparisons and predicate builtins.
10649         (altivec_eq<mode>): Ditto.
10650         (altivec_gt<mode>): Ditto.
10651         (altivec_gtu<mode>): Ditto.
10652         (altivec_eqv4sf): Ditto.
10653         (altivec_gev4sf): Ditto.
10654         (altivec_gtv4sf): Ditto.
10655         (altivec_vcmpbfp_p): Ditto.
10657 2009-07-23  Richard Earnshaw  <rearnsha@arm.com>
10659         * arm.md (split for ior/xor with shift and zero-extend): Cast op3 to
10660         unsigned HWI.
10662 2009-07-23  Uros Bizjak  <ubizjak@gmail.com>
10664         PR target/40832
10665         * config/i386/i386.c (output_387_ffreep): Rewrite to use
10666         ASM_SHORT instead of .word.
10667         * config/i386/i386.md (*tls_global_dynamic_64): Use ASM_SHORT
10668         instead of .word in asm template.
10670 2009-07-22  Vladimir Makarov  <vmakarov@redhat.com>
10672         PR target/37488
10673         * ira-lives.c (bb_has_abnormal_call_pred): New function.
10674         (process_bb_node_lives): Use it.
10676         * ira.c (setup_cover_and_important_classes): Don't setup
10677         ira_important_class_nums.  Add cover classes to the end of
10678         important classes.
10679         (cover_class_order, comp_reg_classes_func, reorder_important_classes):
10680         New.
10681         (find_reg_class_closure): Use reorder_important_classes.
10683         * config/i386/i386.h (IRA_COVER_CLASSES): Remove.
10685         * config/i386/i386.c (i386_ira_cover_classes): New function.
10686         (TARGET_IRA_COVER_CLASSES): Redefine.
10688         * doc/tm.texi (TARGET_IRA_COVER_CLASSES): Add a comment about
10689         importance of order of cover classes in the array.
10691 2009-07-22  Diego Novillo  <dnovillo@google.com>
10693         * tree-pass.h (TDF_EH): Define.
10694         * gimple-pretty-print.c (dump_gimple_stmt): If FLAGS
10695         contains TDF_EH, print the EH region number holding GS.
10696         * tree-dump.c (dump_options): Add "eh".
10697         * doc/invoke.texi: Document it.
10699 2009-07-22  Doug Kwan  <dougkwan@google.com>
10701         * config/arm/arm.md (subdi3) Copy non-reg values to DImode registers.
10703 2009-07-22  Michael Matz  <matz@suse.de>
10705         PR tree-optimization/35229
10706         PR tree-optimization/39300
10708         * tree-ssa-pre.c (includes): Include tree-scalar-evolution.h.
10709         (inhibit_phi_insertion): New function.
10710         (insert_into_preds_of_block): Call it for REFERENCEs.
10711         (init_pre): Initialize and finalize scalar evolutions.
10712         * Makefile.in (tree-ssa-pre.o): Depend on tree-scalar-evolution.h .
10714 2009-07-22  Uros Bizjak  <ubizjak@gmail.com>
10716         * config/i386/predicates.md (zero_extended_scalar_load_operand):
10717         Use CONST_VECTOR_NUNITS to determine number of elements.
10719 2009-07-22  Andreas Krebbel  <krebbel1@de.ibm.com>
10721         * config/s390/constraints.md (ZQ, ZR, ZS, ZT): New constraints.
10722         (U, W): Constraints are now deprecated and will be removed if we
10723         run out of letters.
10724         * config/s390/s390.md (U, W): Replaced with ZQZR, ZSZT throughout
10725         the file.
10726         ("prefetch"): Add the stcmh instruction for prefetching.
10727         * config/s390/s390.c (s390_symref_operand_p): Function moved. No
10728         changes.
10729         (s390_short_displacement): Return always true if compiling for
10730         machines not providing the long displacement facility.
10731         (s390_mem_constraint): Support the new constraint letter Z.
10732         (s390_check_qrst_address): New function.
10734 2009-07-21  DJ Delorie  <dj@redhat.com>
10736         * config/mep/mep.c (mep_legitimize_arg): Leave control registers
10737         alone too.
10739 2009-07-21  Jason Merrill  <jason@redhat.com>
10741         * c-common.c (max_tinst_depth): Increase default to 1024.
10743 2009-07-21  Uros Bizjak  <ubizjak@gmail.com>
10745         * config/i386/sse.md (vec_unpacku_float_hi_v4si): New expander.
10746         (vec_unpacku_float_lo_v4si): Ditto.
10748 2009-07-21  Uros Bizjak  <ubizjak@gmail.com>
10750         PR target/40811
10751         * config/i386/sse.md (sse2_cvtudq2ps): New expander.
10752         (enum ix86_builtins): Add IX86_BUILTIN_CVTUDQ2PS.
10753         (builtin_description): Add __builtin_ia32_cvtudq2ps.
10754         (ix86_vectorize_builtin_conversion): Handle IX86_BUILTIN_CVTUDQ2PS.
10756 2009-07-21  Jakub Jelinek  <jakub@redhat.com>
10758         PR tree-optimization/40813
10759         * tree-inline.c (copy_bb): Regimplify RHS after last stmt, not before
10760         it.
10762 2009-07-21  Kaz Kojima  <kkojima@gcc.gnu.org>
10764         * config/sh/sh.c (sh_gimplify_va_arg_expr): Wrap the result
10765         with a NOP_EXPR if needed.
10767 2009-07-21  Paul Brook <paul@codesourcery.com>
10769         * tree-vectorizer.c (increase_alignment): Handle nested arrays.
10770         Terminate debug dump with newline.
10772 2009-07-20  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
10774         * pa.c (compute_zdepwi_operands): Limit deposit length to 32 - lsb.
10775         Cast "1" to unsigned HOST_WIDE_INT.
10776         (compute_zdepdi_operands): Limit maximum length to 64 bits.  Limit
10777         deposit length to the maximum length - lsb.  Extend length if
10778         HOST_BITS_PER_WIDE_INT is 32.
10780 2009-07-20  Olatunji Ruwase <tjruwase@google.com>
10782         * cgraph.h (constant_pool_htab): New function.
10783         (constant_descriptor_tree): Move from varasm.c.
10784         * varasm.c (constant_pool_htab): New function.
10785         (constant_descriptor_tree): Move to cgraph.h.
10787 2009-07-20  Olatunji Ruwase  <tjruwase@google.com>
10789         * toplev.c: Invoke FINISH_UNIT callbacks before call to finalize().
10791 2009-07-20  Shujing Zhao  <pearly.zhao@oracle.com>
10793         * Makefile.in (TREE_INLINE_H, tree-inline.o, cgraph.o): Remove
10794         $(VARRAY_H).
10796 2009-07-20  Xinliang David Li  <davidxl@google.com>
10798         * dbgcnt.c (dbg_cnt_set_limit_by_name): Add length check.
10800 2009-07-20  Adam Nemet  <anemet@caviumnetworks.com>
10802         * config/mips/mips.md (move_type): Add arith.
10803         (type): Handle arith.
10804         (zero_extendsidi2): Rename this into ...
10805         (*zero_extendsidi2): ... this.  Don't match if ISA_HAS_EXT_INS.
10806         (zero_extendsidi2): New expander.
10807         (*zero_extendsidi2_dext): New pattern.
10809 2009-07-20  Nick Clifton  <nickc@redhat.com>
10811         * config.gcc (mips64-*-*): Add definition of tm_defines in order
10812         to set MIPS_ABI_DEFAULT.
10813         * config/mips/vr.h (MIPS_ABI_DEFAULT): Remove definition.
10815 2009-07-20  Jakub Jelinek  <jakub@redhat.com>
10817         * tree-object-size.c (addr_object_size): Handle unions with
10818         array in it as last field of structs in __bos (, 1) as __bos (, 0).
10820         PR tree-optimization/40792
10821         * tree.c (build_function_type_skip_args): Remove bogus assert.
10823 2009-07-20  Jan Hubicka  <jh@suse.cz>
10824             Martin Jambor  <mjambor@suse.cz>
10826         * cgraph.h (combined_args_to_skip): New field.
10827         * cgraph.c (cgraph_create_virtual_clone): Properly handle
10828         combined_args_to_skip and args_to_skip.
10829         * tree-inline.c (update_clone_info): New function.
10830         (tree_function_versioning): Call update_clone_info.
10831         * cgraphunit.c (cgraph_materialize_clone): Dump materialized
10832         functions.
10833         (cgraph_materialize_all_clones): More extensive dumping, working
10834         with combined_args_to_skip rather than args_to_skip.
10836 2009-07-20  Ira Rosen  <irar@il.ibm.com>
10838         * tree-vectorizer.h (vectorizable_condition): Add parameters.
10839         * tree-vect-loop.c (vect_is_simple_reduction): Support COND_EXPR.
10840         (get_initial_def_for_reduction): Likewise.
10841         (vectorizable_reduction): Skip the check of first operand in case
10842         of COND_EXPR. Add check that it is outer loop vectorization if
10843         nested cycle was detected. Call vectorizable_condition() for
10844         COND_EXPR. If reduction epilogue cannot be created do not fail for
10845         nested cycles (if it is not double reduction). Assert that there
10846         is only one type in the loop in case of COND_EXPR. Call
10847         vectorizable_condition() to vectorize COND_EXPR.
10848         * tree-vect-stmts.c (vectorizable_condition): Update comment.
10849         Add parameters. Allow nested cycles if called from
10850         vectorizable_reduction(). Use reduction vector variable if provided.
10851         (vect_analyze_stmt): Call vectorizable_reduction() before
10852         vectorizable_condition().
10853         (vect_transform_stmt): Update call to vectorizable_condition().
10855 2009-07-20  Christian Bruel  <christian.bruel@st.com>
10857         * config/sh/sh.opt (-mfmovd): Resurrect and document.
10858         * doc/invoke.texi (-mfmovd): Likewise.
10859         * config/sh/sh.h (TARGET_FMOVD, MASK_FMOVD): Remove default setting.
10861 2009-07-20  Jan Hubicka  <jh@suse.cz>
10863         * tree-ssa-dce.c (remove_dead_phis): Only look for abnormal PHIs
10864         when handling SSA name.
10866 2009-07-19  Jan Hubicka  <jh@suse.cz>
10868         PR tree-optimization/40676
10869         * tree-ssa-dce.c (eliminate_unnecessary_stmts): Do renaming on all
10870         virtual PHIs in empty BBs.
10872 2009-07-18  Adam Nemet  <anemet@caviumnetworks.com>
10874         * combine.c (make_compound_operation) <SUBREG>: If force_to_mode
10875         re-expanded the compound use gen_lowpart instead to convert to the
10876         desired mode.
10878 2009-07-18  Adam Nemet  <anemet@caviumnetworks.com>
10880         * combine.c (try_widen_shift_mode): Add COUNT, OUTER_CODE and
10881         OUTER_CONST arguments.
10882         <LSHIFTRT>: Use them to allow widening if the bits shifted in from
10883         the new wider mode will be masked off.
10884         (simplify_shift_const_1): Adjust calls to try_widen_shift_mode.
10886 2009-07-18  Adam Nemet  <anemet@caviumnetworks.com>
10888         * combine.c (try_widen_shift_mode) <LSHIFTRT>: Allow widening if the
10889         high-order bits are zero.
10891 2009-07-18  Adam Nemet  <anemet@caviumnetworks.com>
10893         * combine.c (simplify_shift_const_1): Split code to determine
10894         shift_mode into ...
10895         (try_widen_shift_mode): ... here.  Allow widening for ASHIFTRT if the
10896         new bits shifted in are identical to the old sign bit.
10898 2009-07-18  Richard Guenther  <rguenther@suse.de>
10900         PR c/40787
10901         * gimplify.c (gimplify_call_expr): Reject code using results from
10902         functions returning void.
10904 2009-07-18  Richard Sandiford  <r.sandiford@uk.ibm.com>
10906         * doc/md.texi: Document the new PowerPC "es" constraint.
10907         Document that "m" can include automodified addresses on this target,
10908         and explain how %U must be used.  Extend the "Q" and "Z" documentation
10909         to suggest "es" as well as "m".
10910         * config/rs6000/constraints.md (es): New memory constraint.
10911         (Q, Z): Update strings to match new documentation.
10913 2009-07-18  Richard Sandiford  <r.sandiford@uk.ibm.com>
10915         * config/rs6000/rs6000.c (rs6000_mode_dependent_address): Allow any
10916         offset from virtual_stack_vars_rtx and arg_pointer_rtx.
10917         * config/rs6000/predicates.md (volatile_mem_operand): Use
10918         offsettable_nonstrict_memref_p.
10919         * config/rs6000/rs6000.md (*floatsidf2_internal): Remove split check.
10920         (*floatunssidf2_internal): Likewise.
10921         (*fix_truncdfsi2_internal): Likewise.
10922         (*fix_trunctfsi2_internal): Likewise.
10924 2009-07-17  Anatoly Sokolov  <aesok@post.ru>
10926         * config/avr/avr-devices.c (avr_mcu_t): Add atmega8u2, atmega16u2 and
10927         atmega32u2 devices.
10928         * config/avr/t-avr (MULTILIB_MATCHES): (Ditto.).
10930 2009-07-17  Richard Guenther  <rguenther@suse.de>
10932         PR c/40401
10933         * tree-pass.h (pass_diagnose_omp_blocks): Declare.
10934         (pass_warn_unused_result): Likewise.
10935         (TODO_set_props): Remove.
10936         * omp-low.c (diagnose_omp_structured_block_errors): Change to
10937         run as a pass.
10938         (pass_diagnose_omp_blocks): Define.
10939         * c-decl.c (pop_file_scope): Do not finalize the CU here.
10940         (c_gimple_diagnostics_recursively): Remove.
10941         (finish_function): Do not call it.
10942         (c_write_global_declarations): Continue after errors.
10943         Finalize the CU here.
10944         * c-gimplify.c (c_genericize): Do not gimplify here.
10945         * c-common.c (c_warn_unused_result): Move ...
10946         * tree-cfg.c (do_warn_unused_result): ... here.
10947         (run_warn_unused_result): New function.
10948         (gate_warn_unused_result): New function.
10949         (pass_warn_unused_result): New pass.
10950         * c-common.h (c_warn_unused_result): Remove.
10951         * flags.h (flag_warn_unused_result): Declare.
10952         * c-opts.c (c_common_init_options): Enable flag_warn_unused_result.
10953         * opts.c (flag_warn_unused_result): Initialize to false.
10954         * toplev.c (compile_file): Add comment.
10955         * omp-low.c (create_omp_child_function): Do not register
10956         the function with the frontend.
10957         (diagnose_omp_structured_block_errors): Prepare to be
10958         called as optimization pass.
10959         (gate_diagnose_omp_blocks): New function.
10960         (pass_diagnose_omp_blocks): New pass.
10961         * cgraph.h (cgraph_optimize): Remove.
10962         (cgraph_analyze_function): Likewise.
10963         * cgraph.c (cgraph_add_new_function): Gimplify C++ thunks.
10964         * cgraphunit.c (cgraph_lower_function): Lower nested functions
10965         before their parents here.
10966         (cgraph_finalize_function): Not here.
10967         (cgraph_analyze_function): Gimplify functions here.
10968         (cgraph_finalize_compilation_unit): Continue after errors.
10969         Optimize the callgraph from here.
10970         (cgraph_optimize): Make static.
10971         * langhooks.c (write_global_declarations): Finalize the CU.
10972         * gimplify.c (gimplify_asm_expr): Do not emit ASMs with errors.
10973         (gimplify_function_tree): Assert we gimplify only once.
10974         Set PROP_gimple_any property.
10975         * tree-nested.c (gimplify_all_functions): New function.
10976         (lower_nested_functions): Gimplify all nested functions.
10977         * gimple.h (diagnose_omp_structured_block_errors): Remove.
10978         * passes.c (init_optimization_passes): Add pass_warn_unused_result
10979         and pass_diagnose_omp_blocks after gimplification.  Do not
10980         set TODO_set_props on all_lowering_passes.
10981         (execute_one_pass): Do not handle TODO_set_props.
10982         * Makefile.in (cgraphunit.o): Add $(TREE_DUMP_H) dependency.
10983         (gimplify.o): Add tree-pass.h dependency.
10984         * tree-inline.c (copy_statement_list): Properly copy STATEMENT_LIST.
10985         (copy_tree_body_r): Properly handle TARGET_EXPR like SAVE_EXPR.
10986         (unsave_r): Likewise.
10987         * c-omp.c (c_finish_omp_atomic): Set DECL_CONTEXT on the
10988         temporary variable.
10990 2009-07-17  Sandra Loosemore  <sandra@codesourcery.com>
10992         * doc/service.texi (Service): Restore previously removed link,
10993         which isn't broken after all.
10995 2009-07-17  Richard Guenther  <rguenther@suse.de>
10997         PR tree-optimization/40321
10998         * tree-ssa-pre.c (add_to_exp_gen): Also add names defined by
10999         PHI nodes to the maximal set.
11000         (make_values_for_phi): Add PHI arguments to the maximal set.
11001         (execute_pre): Dump PHI_GEN and the maximal set.
11003 2009-07-17  Jakub Jelinek  <jakub@redhat.com>
11005         PR c++/40780
11006         * gimplify.c (gimplify_conversion): Don't change non-conversions into
11007         VIEW_CONVERT_EXPR.
11009 2009-07-16  Sandra Loosemore  <sandra@codesourcery.com>
11011         * doc/extend.texi (Nested Functions): Replace broken link with
11012         textual reference.
11013         * doc/service.texi (Service): Remove broken link.
11015 2009-07-16  H.J. Lu  <hongjiu.lu@intel.com>
11017         PR bootstrap/40781
11018         * builtins.c (expand_builtin_memcmp): Use loc instead of
11019         EXPR_LOCATION (exp).
11020         (expand_builtin_strncmp): Likewise.
11022 2009-07-17  Aldy Hernandez  <aldyh@redhat.com>
11023             Manuel López-Ibáñez  <manu@gcc.gnu.org>
11025         PR 40435
11026         * tree-complex.c, tree-loop-distribution.c, tree.c, tree.h,
11027         builtins.c, fold-const.c, omp-low.c, cgraphunit.c, tree-ssa-ccp.c,
11028         tree-ssa-dom.c, gimple-low.c, expr.c, tree-ssa-ifcombine.c,
11029         c-decl.c, stor-layout.c, tree-if-conv.c, c-typeck.c, gimplify.c,
11030         calls.c, tree-sra.c, tree-mudflap.c, tree-ssa-copy.c,
11031         tree-ssa-forwprop.c, c-convert.c, c-omp.c, varasm.c,
11032         tree-inline.c, c-common.c, c-common.h, gimple.c,
11033         tree-switch-conversion.c, gimple.h, tree-cfg.c, c-parser.c,
11034         convert.c: Add location argument to fold_{unary,binary,ternary},
11035         fold_build[123], build_call_expr, build_size_arg,
11036         build_fold_addr_expr, build_call_array, non_lvalue, size_diffop,
11037         fold_build1_initializer, fold_build2_initializer,
11038         fold_build3_initializer, fold_build_call_array,
11039         fold_build_call_array_initializer, fold_single_bit_test,
11040         omit_one_operand, omit_two_operands, invert_truthvalue,
11041         fold_truth_not_expr, build_fold_indirect_ref, fold_indirect_ref,
11042         combine_comparisons, fold_builtin_*, fold_call_expr,
11043         build_range_check, maybe_fold_offset_to_address, round_up,
11044         round_down.
11046 2009-07-16  Jason Merrill  <jason@redhat.com>
11048         PR libstdc++/37907
11049         * c-common.c (c_common_reswords): Add __is_standard_layout
11050         and __is_trivial.
11051         * c-common.h (enum rid): Add RID_IS_STD_LAYOUT and RID_IS_TRIVIAL.
11052         * doc/implement-cxx.texi: New.
11053         * doc/gcc.texi: Include it.
11055 2009-07-16  DJ Delorie  <dj@redhat.com>
11057         * config/m32c/m32c.c (m32c_compare_redundant): Avoid removing
11058         compares that may be indirectly affected by previous instructions.
11060 2009-07-16  Kaveh R. Ghazi  <ghazi@caip.rutgers.edu>
11062         * builtins.c (do_mpc_arg2): New.
11063         (fold_builtin_2): Fold builtin cpow.
11064         * real.h (HAVE_mpc_pow): New.
11066 2009-07-16  Bingfeng Mei  <bmei@broadcom.com>
11068         * modulo-sched.c (sms_schedule): stage_count <= 1 as correct
11069         comparison to skip unprofitable schedule
11071 2009-07-16  Simon Baldwin  <simonb@google.com>
11073         * gcc.c (option_map): New flag -no-canonical-prefixes.
11074         * (display_help): Print help text for new flag.
11075         * (process_command): Move options translation and language specifics
11076         and handle new flag early.  Use it to set a function pointer to a
11077         prefix builder.  Replace make_relative_prefix calls with calls to
11078         the function pointed to.  Ignore new flag in regular options handling.
11079         * doc/invoke.texi (Overall Options): Documented -no-canonical-prefixes.
11081 2009-07-15  DJ Delorie  <dj@redhat.com>
11083         * config/mep/mep.md (sibcall_internal): Change register to avoid
11084         argument registers.
11085         (sibcall_value_internal): Likewise.
11087 2009-07-15  Eric Botcazou  <ebotcazou@adacore.com>
11089         PR rtl-optimization/40710
11090         * resource.c (mark_target_live_regs): Reset DF problem to LR.
11092 2009-07-15  Adam Nemet  <anemet@caviumnetworks.com>
11094         * config/mips/mips.md (*extenddi_truncate<mode>,
11095         *extendsi_truncate<mode>): Change type attribute to move_type
11096         with shift_shift.  Split out code handling exts from here ...
11097         (*extend<GPR:mode>_truncate<SHORT:mode>_exts): ... to this new
11098         pattern.
11099         (*extendhi_truncateqi): Change type attribute to move_type with
11100         shift_shift.  Split out code handling exts from here ...
11101         (*extendhi_truncateqi_exts): ... to this new pattern.
11103 2009-07-15  Uros Bizjak  <ubizjak@gmail.com>
11105         * config/i386/sse.md (copysign<mode>3): Use "and-not" SSE instruction
11106         instead of "and" with inverted sign bit mask value.  Use
11107         "nonimmediate_operand" for operand 1 and operand 2 predicate.
11108         Allocate registers only for operand 4 and operand 5.
11110 2009-07-15  Jakub Jelinek  <jakub@redhat.com>
11112         PR middle-end/40747
11113         * fold-const.c (fold_cond_expr_with_comparison): When folding
11114         < and <= to MIN, make sure the MIN uses the same type as the
11115         comparison's operands.
11117 2009-07-15  Richard Earnshaw  <rearnsha@arm.com>
11119         * arm.md (ior_xor): New code iterator.
11120         (split for ior/xor with shift and zero-extend): New split pattern.
11121         * arm/predicates.md (subreg_lowpart_operator): New special predicate.
11123 2009-07-15  Richard Guenther  <rguenther@suse.de>
11125         * tree-ssa-structalias.c (make_constraint_from_heapvar): Initialize
11126         offset member.
11128 2009-07-15  Richard Guenther  <rguenther@suse.de>
11130         PR middle-end/40753
11131         * alias.c (ao_ref_from_mem): Reject FUNCTION_DECL and LABEL_DECL bases.
11133 2009-07-15  Maxim Kuvyrkov  <maxim@codesourcery.com>
11135         * config/m68k/linux-unwind.h (m68k_fallback_frame_state): Update to
11136         handle 2.6.30 kernel.
11138 2009-07-15  DJ Delorie  <dj@redhat.com>
11140         * config/mep/mep.md (sibcall_internal): Change register to allow
11141         for 24-bit addresses.
11142         (sibcall_value_internal): Likewise.
11144 2009-07-14  Ghassan Shobaki  <ghassan.shobaki@amd.com>
11146         * doc/invoke.texi: Added descriptions of the  scheduling heuristics
11147         that are enabled/disabled by the flags introduced by a previous patch.
11149 2009-07-14  DJ Delorie  <dj@redhat.com>
11151         * config/mep/mep.md (sibcall_internal): Include non-toggling
11152         non-jmp case.
11153         (sibcall_value_internal): Likewise.
11155 2009-07-14  Taras Glek  <tglek@mozilla.com>
11156             Rafael Espindola  <espindola@google.com>
11158         * doc/sourcebuild.texi: Document install-plugin target.
11159         * configure.ac: Added install-plugin target to language makefiles.
11160         * configure: Regenerate.
11161         * Makefile.in (install-plugin): Install more headers,
11162         depend on lang.install-plugin.
11164 2009-07-15  Manuel López-Ibáñez  <manu@gcc.gnu.org>
11166         * tree-vrp.c (vrp_evaluate_conditional): Mark strings for
11167         translation.
11169 2009-07-14  DJ Delorie  <dj@redhat.com>
11171         * config/mep/mep.c (mep_vliw_jmp_match): New function.
11172         * config/mep/mep-protos.h (mep_vliw_jmp_match): Prototype it.
11173         * config/mep/mep.md (sibcall_internal): Change test from
11174         mep_vliw_mode_match to mep_vliw_jmp_match.
11175         (sibcall_value_internal): Likewise.
11177 2009-07-14  Uros Bizjak  <ubizjak@gmail.com>
11179         * config/i386/sse.md (copysign<mode>3): New expander.
11180         * config/i386/i386-protos.h (ix86_build_signbit_mask): New prototype.
11181         * config/i386/i386.c (ix86_build_signbit_mask): Make public.
11182         Use ix86_build_const_vector.
11183         (enum ix86_builtins): Add IX86_BUILTIN_CPYSGNPS and
11184         IX86_BUILTIN_CPYSGNPD.
11185         (builtin_description): Add __builtin_ia32_copysignps and
11186         __builtin_ia32_copysignpd.
11187         (ix86_builtin_vectorized_function): Handle BUILT_IN_COPYSIGN
11188         and BUILT_IN_COPYSIGNF.
11190 2009-07-13  Jason Merrill  <jason@redhat.com>
11192         * builtins.c (can_trust_pointer_alignment): New fn.
11193         (get_pointer_alignment): Factor it out from here.
11194         * tree.h: Declare it.
11196 2009-07-14  David Edelsohn  <edelsohn@gnu.org>
11198         * config/rs6000/predicates.md (offsettable_mem_operand): Test
11199         RTX_AUTOINC class.
11201 2009-07-14  Dodji Seketeli  <dodji@redhat.com>
11203         PR debug/40705
11204         PR c++/403057
11205         * dwarf2.out.c (gen_type_die_with_usage): Added comment.
11207 2009-07-14  Richard Guenther  <rguenther@suse.de>
11208             Andrey Belevantsev <abel@ispras.ru>
11210         PR middle-end/40745
11211         * cfgexpand.c (partition_stack_vars): Do not bother to update
11212         alias information when not optimizing.
11214 2009-07-14  Richard Guenther  <rguenther@suse.de>
11215             Andrey Belevantsev <abel@ispras.ru>
11217         * tree-ssa-alias.h (refs_may_alias_p_1): Declare.
11218         (pt_solution_set): Likewise.
11219         * tree-ssa-alias.c (refs_may_alias_p_1): Export.
11220         * tree-ssa-structalias.c (pt_solution_set): New function.
11221         * final.c (rest_of_clean_state): Free SSA data structures.
11222         * print-rtl.c (print_decl_name): Remove.
11223         (print_mem_expr): Implement in terms of print_generic_expr.
11224         * alias.c (ao_ref_from_mem): New function.
11225         (rtx_refs_may_alias_p): Likewise.
11226         (true_dependence): Query alias-export info.
11227         (canon_true_dependence): Likewise.
11228         (write_dependence_p): Likewise.
11229         * tree-dfa.c (get_ref_base_and_extent): For void types leave
11230         size unknown.
11231         * emit-rtl.c (component_ref_for_mem_expr): Remove.
11232         (mem_expr_equal_p): Use operand_equal_p.
11233         (set_mem_attributes_minus_bitpos): Do not use
11234         component_ref_for_mem_expr.
11235         * cfgexpand.c (add_partitioned_vars_to_ptset): New function.
11236         (update_alias_info_with_stack_vars): Likewise.
11237         (partition_stack_vars): Call update_alias_info_with_stack_vars.
11238         * tree-ssa.c (delete_tree_ssa): Do not release SSA names
11239         explicitly nor clear stmt operands.
11240         Free the decl-to-pointer map.
11241         * tree-optimize.c (execute_free_datastructures): Do not free
11242         SSA data structures here.
11243         * tree-flow.h (struct gimple_df): Add decls_to_pointers member.
11244         * Makefile.in (emit-rtl.o): Add pointer-set.h dependency.
11245         (alias.o): Add tree-ssa-alias.h, pointer-set.h and $(TREE_FLOW_H)
11246         dependencies.
11247         (print-rtl.o): Add $(DIAGNOSTIC_H) dependency.
11249 2009-07-13  DJ Delorie  <dj@redhat.com>
11251         * config/mep/mep.h (CC1_SPEC): Tweak parameters to trigger
11252         unrolling at the right iteration count.
11254         * config/mep/mep.c (mep_expand_prologue): Fix frame pointer
11255         calculations.
11257 2009-07-13  Ghassan Shobaki  <ghassan.shobaki@amd.com>
11259         * haifa-sched.c (rank_for_schedule): Introduced flags to
11260         enable/disable individual scheduling heuristics.
11261         * common.opt: Introduced flags to enable/disable individual
11262         heuristics in the scheduler.
11263         * doc/invoke.texi: Introduced flags to enable/disable individual
11264         heuristics in the scheduler.
11266 2009-07-13  Kai Tietz  <kai.tietz@onevision.com>
11268         * config/i386/t-gthr-win32 (LIB2FUNCS_EXTRA): Remove file
11269         config/i386/mingw-tls.c.
11270         * config/i386/mingw-tls.c: Removed.
11272 2009-07-13  Ira Rosen  <irar@il.ibm.com>
11274         * tree-vect-loop.c (get_initial_def_for_reduction): Ensure that the
11275         checks access only relevant statements.
11276         (vectorizable_reduction): Likewise.
11278 2009-07-12  Kai Tietz  <kai.tietz@onevision.com>
11280         * config/i386/cygming.h (TARGET_OS_CPP_BUILTINS): Define _X86_
11281         just for 32-bit case.
11283 2009-07-12  Jan Hubicka  <jh@suse.cz>
11285         PR tree-optimization/40585
11286         * except.c (expand_resx_expr): When there already is resume
11287         instruction, produce linked list.
11288         (build_post_landing_pads): Assert that resume is empty.
11289         (connect_post_landing_pads): Handle resume lists.
11290         (dump_eh_tree): Dump resume list.
11292 2009-07-12  Ira Rosen  <irar@il.ibm.com>
11294         * tree-parloops.c (loop_parallel_p): Call vect_is_simple_reduction
11295         with additional argument.
11296         * tree-vectorizer.h (enum vect_def_type): Add
11297         vect_double_reduction_def.
11298         (vect_is_simple_reduction): Add argument.
11299         * tree-vect-loop.c (vect_determine_vectorization_factor): Fix
11300         indentation.
11301         (vect_analyze_scalar_cycles_1): Detect double reduction. Call
11302         vect_is_simple_reduction with additional argument.
11303         (vect_analyze_loop_operations): Handle exit phi nodes in case of
11304         double reduction.
11305         (reduction_code_for_scalar_code): Handle additional codes by
11306         returning ERROR_MARK for them. Fix comment and indentation.
11307         (vect_is_simple_reduction): Fix comment, add argument to specify
11308         double reduction. Detect double reduction.
11309         (get_initial_def_for_induction): Fix indentation.
11310         (get_initial_def_for_reduction): Fix comment and indentation.
11311         Handle double reduction. Create initial definitions that do not
11312         require adjustment if ADJUSTMENT_DEF is NULL. Handle additional cases.
11313         (vect_create_epilog_for_reduction): Fix comment, add argument to
11314         handle double reduction. Use PLUS_EXPR in case of MINUS_EXPR in
11315         epilogue result extraction. Create double reduction phi node and
11316         replace relevant uses.
11317         (vectorizable_reduction): Call vect_is_simple_reduction with
11318         additional argument. Fix indentation. Update epilogue code treatment
11319         according to the changes in reduction_code_for_scalar_code. Check
11320         for double reduction. Call vect_create_epilog_for_reduction with
11321         additional argument.
11322         * tree-vect-stmts.c (process_use): Handle double reduction, update
11323         documentation.
11324         (vect_mark_stmts_to_be_vectorized): Handle double reduction.
11325         (vect_get_vec_def_for_operand): Likewise.
11327 2009-07-12  Danny Smith  <dansmister@gmail.com>
11329         * config/i386/winnt.c (i386_pe_determine_dllexport_p): Don't
11330         dllexport if !TREE_PUBLIC.
11331         (i386_pe_maybe_record_exported_symbol): Assert TREE_PUBLIC.
11333 2009-07-11  Anatoly Sokolov  <aesok@post.ru>
11335         * config/avr/avr.h (TARGET_CPU_CPP_BUILTINS): Redefine.
11336         (avr_extra_arch_macro) Remove declatation.
11337         * config/avr/avr.c (avr_cpu_cpp_builtins): New function.
11338         (avr_extra_arch_macro) Declare as static.
11339         * config/avr/avr-protos.h (avr_cpu_cpp_builtins): Dclare.
11341 2009-07-11  Jan Hubicka  <jh@suse.cz>
11343         PR middle-end/48388
11344         * except.c (can_be_reached_by_runtime): Test for NULL aka bitmap.
11346 2009-07-11  Jakub Jelinek  <jakub@redhat.com>
11348         PR debug/40713
11349         * dwarf2out.c (dw_fde_struct): Add in_std_section and
11350         cold_in_std_section bits.
11351         (dwarf2out_begin_prologue): Initialize them.
11352         (dwarf2out_finish): Don't emit FDE range into .debug_ranges
11353         if already covered by text_section or cold_text_section range.
11355         PR rtl-optimization/40667
11356         * defaults.h (MINIMUM_ALIGNMENT): Define if not defined.
11357         * doc/tm.texi (MINIMUM_ALIGNMENT): Document it.
11358         * config/i386/i386.h (MINIMUM_ALIGNMENT): Define.
11359         * config/i386/i386.c (ix86_minimum_alignment): New function.
11360         * config/i386/i386-protos.h (ix86_minimum_alignment): New prototype.
11361         * cfgexpand.c (expand_one_var): Use MINIMIM_ALIGNMENT.
11362         * emit-rtl.c (gen_reg_rtx): Likewise.
11363         * function.c (assign_parms): Likewise.  If nominal_type needs
11364         bigger alignment than FUNCTION_ARG_BOUNDARY, use its alignment
11365         rather than passed_type's alignment.
11367         PR target/40668
11368         * function.c (assign_parm_setup_stack): Adjust
11369         MEM_OFFSET (data->stack_parm) if promoted_mode is different
11370         from nominal_mode on big endian.
11372 2009-07-11  Paolo Bonzini  <bonzini@gnu.org>
11374         * expmed.c (emit_store_flag_1): Fix choice of zero vs. sign extension.
11376 2009-07-10  DJ Delorie  <dj@redhat.com>
11378         * config/mep/mep.c (mep_can_inline_p): Correct logic, and simplify.
11380 2009-07-10  Mark Mitchell  <mark@codesourcery.com>
11382         * config/arm/thumb2.md (thumb2_cbz): Correct computation of length
11383         attribute.
11384         (thumb2_cbnz): Likewise.
11386 2009-07-10  David Daney  <ddaney@caviumnetworks.com>
11388         PR target/39079
11389         * config.gcc (supported_defaults): Add synci.
11390         (with_synci): Add validation.
11391         (all_defaults): Add synci.
11392         * config/mips/mips.md (clear_cache): Use TARGET_SYNCI instead of
11393         ISA_HAS_SYNCI.
11394         (synci): Same.
11395         * config/mips/mips.opt (msynci): New option.
11396         * config/mips/mips.c (mips_override_options): Warn on use of
11397         -msynci for targets that do now support it.
11398         * gcc/config/mips/mips.h (OPTION_DEFAULT_SPECS): Add a default for
11399         msynci.
11400         * gcc/doc/invoke.texi (-msynci): Document the new option.
11401         * doc/install.texi (--with-synci): Document the new option.
11403 2009-07-10  Richard Guenther  <rguenther@suse.de>
11405         PR tree-optimization/40496
11406         * tree-ssa-loop-manip.c (tree_transform_and_unroll_loop): Create
11407         the PHI result with a compatible type.
11409 2009-07-10  Manuel López-Ibáñez  <manu@gcc.gnu.org>
11411         PR 25509
11412         PR 40614
11413         * c.opt (Wunused-result): New.
11414         * doc/invoke.texi: Document it.
11415         * c-common.c (c_warn_unused_result): Use it.
11417 2009-07-09  DJ Delorie  <dj@redhat.com>
11419         * targhooks.c (default_target_can_inline_p): Rename from
11420         default_target_option_can_inline_p.
11421         * targhooks.h (default_target_can_inline_p): Likewise.
11422         * target-def.h (TARGET_CAN_INLINE_P): Rename from
11423         TARGET_OPTION_CAN_INLINE_P.
11424         * config/i386/i386.c (TARGET_CAN_INLINE_P): Likewise.
11425         * config/mep/mep.c (TARGET_CAN_INLINE_P): Likewise.
11426         (mep_target_can_inline_p): Rename from
11427         mep_target_option_can_inline_p.
11429         PR target/40626
11430         * config/mep/mep.h (FUNCTION_ARG_REGNO_P): Add coprocessor
11431         registers used to pass vectors.
11433         * config/mep/mep.c (mep_option_can_inline_p): Remove error call.
11435 2009-07-09  Tom Tromey  <tromey@redhat.com>
11437         * unwind-dw2-fde-darwin.c: Include dwarf2.h.
11438         * config/mmix/mmix.c: Include dwarf2.h.
11439         * config/rs6000/darwin-fallback.c: Include dwarf2.h.
11440         * config/xtensa/unwind-dw2-xtensa.c: Include dwarf2.h.
11441         * config/sh/sh.c: Include dwarf2.h.
11442         * config/i386/i386.c: Include dwarf2.h.
11443         * Makefile.in (DWARF2_H): Remove 'elf'.
11444         * except.c: Include dwarf2.h.
11445         * unwind-dw2.c: Include dwarf2.h.
11446         * dwarf2out.c: Include dwarf2.h.
11447         * unwind-dw2-fde-glibc.c: Include dwarf2.h.
11448         * unwind-dw2-fde.c: Include dwarf2.h.
11449         * dwarf2asm.c: Include dwarf2.h.
11451 2009-07-09  Maxim Kuvyrkov  <maxim@codesourcery.com>
11453         * haifa-sched.c (insn_finishes_cycle_p): New static function.
11454         (max_issue): Use it.
11455         * sched-int.h (struct sched_info: insn_finishes_block_p): New
11456         scheduler hook.
11457         * sched-rgn.c (rgn_insn_finishes_block_p): Implement it.
11458         (region_sched_info): Update.
11459         * sched-ebb.c (ebb_sched_info): Update.
11460         * modulo-sched.c (sms_sched_info): Update.
11461         * sel-sched-ir.c (sched_sel_haifa_sched_info): Update.
11463 2009-07-09  Maxim Kuvyrkov  <maxim@codesourcery.com>
11465         * varasm.c (build_constant_desc): Don't share RTL in pool entries.
11467 2009-07-09  Basile Starynkevitch  <basile@starynkevitch.net>
11469         * plugin.c (try_init_one_plugin): passes RTLD_GLOBAL to dlopen.
11471 2009-07-09  Jakub Jelinek  <jakub@redhat.com>
11473         PR middle-end/40692
11474         * fold-const.c (fold_cond_expr_with_comparison): Don't replace
11475         arg1 with arg01 if arg1 is already INTEGER_CST.
11477 2009-07-08  Adam Nemet  <anemet@caviumnetworks.com>
11479         * simplify-rtx.c (simplify_binary_operation_1) <AND>:
11480         Transform (and (truncate)) into (truncate (and)).
11482 2009-07-08  Adam Nemet  <anemet@caviumnetworks.com>
11484         * combine.c (make_extraction): Check TRULY_NOOP_TRUNCATION before
11485         creating LHS paradoxical subregs.  Fix surrounding returns to
11486         use NULL_RTX rather than 0.
11488 2009-07-08  DJ Delorie  <dj@redhat.com>
11490         * config/mep/mep.c (mep_option_can_inline_p): New.
11491         (TARGET_OPTION_CAN_INLINE_P): Define.
11493 2009-07-08  Mark Wielaard  <mjw@redhat.com>
11495         PR debug/40659
11496         * dwarf2out.c (add_data_member_location_attribute): When we have
11497         only a constant offset don't emit a new location description using
11498         DW_OP_plus_uconst, but just add the constant with add_AT_int, when
11499         dwarf_version > 2.
11501 2009-07-08  Richard Henderson  <rth@redhat.com>
11503         PR target/38900
11504         * config/i386/i386.h (CONDITIONAL_REGISTER_USAGE): Move to i386.c.
11505         (enum reg_class): Add CLOBBERED_REGS.
11506         (REG_CLASS_NAMES, REG_CLASS_CONTENTS): Likewise.
11507         * config/i386/i386.c (ix86_conditional_register_usage): Moved
11508         from CONDITIONAL_REGISTER_USAGE; build CLOBBERED_REGS for 64-bit.
11509         (ix86_function_ok_for_sibcall): Tidy.  Disallow MS->SYSV sibcalls.
11510         (ix86_expand_call): Use sibcall_insn_operand when needed.  Don't
11511         force 64-bit sibcalls into R11.
11512         * config/i386/constraints.md (U): New constraint.
11513         * config/i386/i386.md (sibcall_1, sibcall_value_1): Use it.
11514         (sibcall_1_rex64, sibcall_value_1_rex64): Likewise.
11515         (sibcall_1_rex64_v, sibcall_value_1_rex64_v): Remove.
11517 2009-07-08  Shujing Zhao  <pearly.zhao@oracle.com>
11519         * basic-block.h (dump_regset, debug_regset): Remove duplicate
11520         prototypes.
11521         * c-objc-common.h (c_initialize_diagnostics): Ditto.
11522         * ebitmap.h (dump_ebitmap): Ditto.
11523         * optabs.h (optab_libfunc): Ditto.
11524         * tree.h (tree_expr_nonzero_warnv_p): Ditto.
11525         * tree-flow.h (vect_can_force_dr_alignment_p,
11526         get_vectype_for_scalar_type): Ditto.
11527         (vectorize_loops): Move prototype to ...
11528         * tree-vectorizer.h: ... here. Also, adjust comment.
11529         (vect_set_verbosity_level): Remove duplicate prototype.
11530         * tree-ssa-loop.c: Include tree-vectorizer.h.
11531         * Makefile.in (tree-ssa-loop.o): Depend on tree-vectorizer.h.
11533 2009-07-08  Nick Clifton  <nickc@redhat.com>
11535         * config/i386/unix.h (ASM_COMMENT_START): Add a space after the
11536         forward slash.
11538 2009-07-08  DJ Delorie  <dj@redhat.com>
11540         * config/mep/mep-ivc2.cpu (cpmovtocsar0_C3, cpmovtocsar1_C3,
11541         cpmovtocc_C3, cpmovtocsar0_P0S_P1, cpmovtocsar1_P0S_P1,
11542         cpmovtocc_P0S_P1): Mark volatile.  Note which registers are
11543         written to.
11544         * config/mep/intrinsics.md: Regenerated.
11545         * config/mep/mep.c (mep_interrupt_saved_reg): Save IVC2 control
11546         registers when asm() or calls are detected.
11548 2009-07-08  Manuel López-Ibáñez  <manu@gcc.gnu.org>
11550         PR c++/31246
11551         * gimplify.c (gimplify_expr): Propagate no_warning flag when
11552         gimplifying.
11553         * gimple (gimple_build_call_from_tree): Likewise.
11554         * tree-cfg.c (remove_useless_stmts_warn_notreached): Check
11555         no_warning flag before warning.
11557 2009-07-07  Manuel López-Ibáñez  <manu@gcc.gnu.org>
11559         * tree.c (set_expr_locus): Remove.
11560         * tree.h (EXPR_LOCUS,SET_EXPR_LOCUS,set_expr_locus): Remove.
11561         * c-typeck.c (c_finish_stmt_expr):  Replace EXPR_LOCUS by
11562         EXPR_LOCATION.
11563         * gimplify.c (internal_get_tmp_var): Likewise.
11564         (gimplify_call_expr): Likewise.
11565         (gimplify_one_sizepos): Likewise.
11567 2009-07-07  Eric Botcazou  <ebotcazou@adacore.com>
11569         PR debug/40666
11570         * dbxout.c (dbxout_symbol) <PARM_DECL>: Deal with parameters pointing
11571         to variables for debugging purposes.
11573 2009-06-23  Mark Loeser  <mark@halcy0n.com>
11575         PR build/40010
11576         * Makefile.in (gcc.pod): Depend on gcc-vers.texi.
11578 2009-07-07  Manuel López-Ibáñez  <manu@gcc.gnu.org>
11580         * pretty-print.c (pp_base_format): Remove %J.
11581         * c-format.c (gcc_diag_char_table, gcc_tdiag_char_table,
11582         gcc_cxxdiag_char_table): Likewise.
11583         (init_dynamic_diag_info): Likewise.
11585 2009-07-07  Manuel López-Ibáñez  <manu@gcc.gnu.org>
11587         * pretty-print.c (pp_base_format): Remove %H.
11588         * c-format.c (gcc_diag_char_table, gcc_tdiag_char_table,
11589         gcc_cxxdiag_char_table): Likewise.
11590         (init_dynamic_diag_info): Likewise.
11591         * config/mep/mep.c (mep_select_section): Likewise.
11593 2009-07-07  Duncan Sands  <baldrick@free.fr>
11595         * final.c (pass_clean_state): Give the pass a name.
11596         * passes.c (pass_rest_of_compilation): Likewise.
11597         * tree-optimize.c (pass_all_optimizations): Likewise.
11599 2009-07-07  H.J. Lu  <hongjiu.lu@intel.com>
11601         * config/ia64/ia64.c (ia64_handle_model_attribute): Remove
11602         an extra 'decl' for error_at.
11604 2009-07-07  Jakub Jelinek  <jakub@redhat.com>
11606         PR middle-end/40669
11607         * tree-tailcall.c (adjust_return_value_with_ops,
11608         create_tailcall_accumulator): Set DECL_GIMPLE_REG_P on the temporary
11609         if it has complex or vector type.
11611 2009-07-07  Olivier Hainque  <hainque@adacore.com>
11613         * config/alpha/t-osf4 (SHLIB_LINK): Do not hide the dummy weak
11614         pthread symbols.
11616 2009-07-07  Basile Starynkevitch  <basile@starynkevitch.net>
11618         * Makefile.in: added more lists of includes to PLUGIN_HEADERS.
11620 2009-07-07  Manuel López-Ibáñez  <manu@gcc.gnu.org>
11622         * cgraphunit.c: Replace %J by an explicit location.  Update all calls.
11623         * c-decl.c: Likewise.
11624         * function.c: Likewise.
11625         * varasm.c: Likewise.
11626         * tree-ssa.c: Likewise.
11627         * c-common.c: Likewise.
11628         * tree-cfg.c: Likewise.
11629         * config/spu/spu.c: Likewise.
11630         * config/ia64/ia64.c: Likewise.
11631         * config/v850/v850.c: Likewise.
11633 2009-07-06  DJ Delorie  <dj@redhat.com>
11635         * config/mep/mep-core.cpu (fsft, ssarb): Mark as VOLATILE.
11636         * config/mep/mep-ivc2.cpu (many): Add VOLATILE to more insns that make
11637         unspecified accesses to control registers.
11638         * config/mep/intrinsics.md: Regenerate.
11639         * config/mep/intrinsics.h: Regenerate.
11640         * config/mep/mep-intrin.h: Regenerate.
11642 2009-07-07  Manuel López-Ibáñez  <manu@gcc.gnu.org>
11644         * c-lex.c: Replace %H by an explicit location. Update all calls.
11645         * c-common.c: Likewise.
11646         * c-decl.c: Likewise.
11647         * c-typeck.c: Likewise.
11648         * fold-const.c: Likewise.
11649         * gimplify.c: Likewise.
11650         * stmt.c: Likewise.
11651         * tree-cfg.c: Likewise.
11652         * tree-ssa-loop-niter.c: Likewise.
11653         * tree-vrp.c: Likewise.
11654         * value-prof.c: Likewise.
11656 2009-07-06  Diego Novillo  <dnovillo@google.com>
11658         * tree-dfa.c (dump_variable): Write DECL_INITIAL for VAR
11659         if it has one.  Handle cases where VAR does not have an
11660         annotation or cfun is NULL.
11662 2009-07-06  Diego Novillo  <dnovillo@google.com>
11664         * tree.c: Include debug.h.
11665         (initialize_tree_contains_struct): New.
11666         (init_ttree): Call it.
11667         (tree_node_structure_for_code): Factor out of ...
11668         (tree_node_structure): ... here.
11669         * treestruct.def (TS_PHI_NODE): Remove.
11670         (TS_GIMPLE_STATEMENT): Remove.
11672 2009-07-06  Diego Novillo  <dnovillo@google.com>
11674         * tree-pretty-print.c (dump_generic_node): Protect against NULL op0.
11675         (debug_tree_chain): Handle cycles.
11677 2009-07-06  Nick Clifton  <nickc@redhat.com>
11678             DJ Delorie  <dj@redhat.com>
11680         * config.sh/lib1funcs.h (FMOVD_WORKS): Only define if
11681         __FMOVD_ENABLED__ is defined.
11682         * config/sh/sh.h
11683         (TARGET_FMOVD): Provide a default definition.
11684         (MASK_FMOVD): Likewise.
11685         (TARGET_CPU_CPP_BUILTINS): Define
11686         __FMOVD_ENABLED__ if TARGET_FMOVD is true.
11687         * config/sh/sh.md (movdf_i4): For alternative 0 use either one or
11688         two fmov instructions depending upon whether TARGET_FMOVD is enabled.
11689         (split for DF load from memory into register): Also handle
11690         MEMs which consist of REG+DISP addressing.
11691         (split for DF store from register to memory): Likewise.
11692         (movsf_ie): Always use single fp_mode.
11693         * config/sh/sh.c (sh_override_options): Do not automatically
11694         enable TARGET_MOVD for the SH2A when supporting doubles - leave
11695         that to the -mfmovd command line switch.
11696         (broken_move): Do not restrict fldi test to only the SH4 and SH4A.
11697         (fldi_ok): Always allow.
11698         * config/sh/sh.opt (mfmovd): Remove this switch.
11699         * doc/invoke.texi (-mfmovd): Remove documentation of this switch.
11701 2009-07-06  J"orn Rennecke  <joern.rennecke@arc.com>
11702             Kaz Kojima  <kkojima@gcc.gnu.org>
11704         PR rtl-optimization/30807
11705         * postreload.c (reload_combine): For every new use of REG_SUM,
11706         record the use of BASE.
11708 2009-07-06  Jan Hubicka  <jh@suse.cz>
11710         * params.def: Revert my accidental commit at 2009-06-30.
11712 2009-07-04  Ian Lance Taylor  <iant@google.com>
11714         PR target/40636
11715         * config/i386/msformat-c.c (mingw_format_attributes): Declare as
11716         EXPORTED_CONST.
11717         (mingw_format_attribute_overrides): Likewise.
11719 2009-07-04  Jakub Jelinek  <jakub@redhat.com>
11721         PR debug/40596
11722         * dwarf2out.c (based_loc_descr): For crtl->stack_realign_tried
11723         don't check cfa.reg.  Instead of cfa.indirect use
11724         fde && fde->drap_reg != INVALID_REGNUM test.
11726 2009-07-04  Eric Botcazou  <ebotcazou@adacore.com>
11728         * postreload.c (reload_combine): Replace CONST_REG with INDEX_REG.
11730 2009-07-03  Vladimir Makarov  <vmakarov@redhat.com>
11732         PR target/40587
11733         * ira.c (build_insn_chain): Use DF_LR_OUT instead of df_get_live_out.
11735 2009-07-03  Richard Guenther  <rguenther@suse.de>
11737         PR tree-optimization/40640
11738         * tree-switch-conversion.c (build_arrays): Perform arithmetic
11739         in original type.
11741 2009-07-03  Jan Hubicka  <jh@suse.cz>
11743         * ipa-inline.c (cgraph_decide_inlining_incrementally): When optimizing
11744         for size, reduce amount of inlining.
11746 2009-07-03  Richard Guenther  <rguenther@suse.de>
11748         PR middle-end/34163
11749         * tree-chrec.c (chrec_convert_1): Fold (T2)(t +- x) to (T2)t +- (T2)x
11750         if t +- x is known to not overflow and the conversion widens the
11751         operation.
11752         * Makefile.in (tree-chrec.o): Add $(FLAGS_H) dependency.
11754 2009-07-03  Jan Hubicka  <jh@suse.cz>
11756         * ipa-pure-const.c (analyze): Update loop optimizer init.
11757         * tree-ssa-loop-iv-canon.c (empty_loop_p, remove_empty_loop,
11758         try_remove_empty_loop, remove_empty_loops): Remove.
11759         * tree-ssa-loop.c (tree_ssa_empty_loop, pass_empty_loop): Remove.
11760         * tree-ssa-dce.c (find_obviously_necessary_stmts): Use finiteness info
11761         to mark regular loops as neccesary.
11762         (degenerate_phi_p): New function.
11763         (propagate_necessity, remove_dead_phis): Use it.
11764         (forward_edge_to_pdom): Likewise.
11765         (eliminate_unnecessary_stmts): Take care to remove uses of results of
11766         virtual PHI nodes that became unreachable.
11767         (perform_tree_ssa_dce): Initialize/deinitialize loop optimizer.
11768         * tree-flow.h (remove_empty_loops): Remove.
11769         * passes.c (init_optimization_passes): Remove.
11771 2009-07-03  Uros Bizjak  <ubizjak@gmail.com>
11773         * config/i386/i386.md (fix_trunc<mode>_fisttp_i387_1): Use
11774         can_create_pseudo_p.
11775         (*fix_trunc<mode>_i387_1): Ditto.
11776         (*floathi<mode>2_1): Ditto.
11777         (*float<SSEMODEI24:mode><X87MODEF:mode>2_1): Ditto.
11778         (*fistdi2_1): Ditto.
11779         (*fist<mode>2_1): Ditto.
11780         (frndintxf2_floor): Ditto.
11781         (*fist<mode>2_floor_1): Ditto.
11782         (frndintxf2_ceil): Ditto.
11783         (*fist<mode>2_ceil_1): Ditto.
11784         (frndintxf2_trunc): Ditto.
11785         (frndintxf2_mask_pm): Ditto.
11786         (fxam<mode>2_i387_with_temp): Ditto.
11787         * config/i386/sse.md (mulv16qi3): Ditto.
11788         (*sse2_mulv4si3): Ditto.
11789         (mulv2di3): Ditto.
11790         (sse4_2_pcmpestr): Ditto.
11791         (sse4_2_pcmpistr): Ditto.
11793 2009-07-03  Jan Hubicka  <jh@suse.cz>
11795         * tree-ssa-dce.c (bb_contains_live_stmts): New bitmap.
11796         (mark_stmt_necessary): Set it.
11797         (mark_operand_necessary): Set it.
11798         (mark_control_dependent_edges_necessary): Set it.
11799         (mark_virtual_phi_result_for_renaming): New function.
11800         (get_live_post_dom): New function.
11801         (forward_edge_to_pdom): New function.
11802         (remove_dead_stmt): Fix handling of control dependences.
11803         (tree_dce_init): Init new bitmap.
11804         (tree_dce_done): Free it.
11806 2009-07-02  Richard Guenther  <rguenther@suse.de>
11808         PR bootstrap/40617
11809         * tree-ssa-structalias.c (new_var_info): Initialize
11810         is_restrict_var.
11812 2009-07-02  Jan Hubicka  <jh@suse.cz>
11814         * ipa-pure-const.c (check_op): Use PTA info to see if indirect_ref is
11815         local.
11817 2009-07-02  Paolo Bonzini  <bonzini@gnu.org>
11819         * expmed.c (emit_cstore, emit_store_flag_1): Accept target_mode
11820         instead of recomputing it.  Adjust calls.
11821         (emit_store_flag): Adjust recursive calls.
11823 2009-07-02  Richard Guenther  <rguenther@suse.de>
11825         * tree-ssa-live.c (remove_unused_locals): Do not remove
11826         heap variables.
11827         * tree-ssa-structalias.c (handle_lhs_call): Delay setting
11828         of DECL_EXTERNAL for HEAP variables.
11829         (compute_points_to_sets): Set DECL_EXTERNAL for escaped
11830         HEAP variables.  Do not adjust RESTRICT vars.
11831         (find_what_var_points_to): Nobody cares if something
11832         points to READONLY.
11834 2009-07-02  Ben Elliston  <bje@au.ibm.com>
11836         * unwind-dw2-fde-glibc.c (_Unwind_IteratePhdrCallback): Move
11837         pc_low and pc_high declarations to the top of the function.
11839 2009-07-01  DJ Delorie  <dj@redhat.com>
11841         * config/mep/mep.c (mep_handle_option): Leave IVC2 control
11842         registers as fixed.
11843         (mep_interrupt_saved_reg): Save appropriate IVC2 control registers.
11844         * config/mep/mep-ivc2.cpu: Add VOLATILE to insns that make
11845         unspecified accesses to control registers.
11846         * config/mep/intrinsics.md: Regenerate.
11847         * config/mep/intrinsics.h: Regenerate.
11848         * config/mep/mep-intrin.h: Regenerate.
11850 2009-07-01  Anthony Green  <green@moxielogic.com>
11852         * config/moxie/moxie.c (moxie_expand_prologue): Use dec
11853         instruction when possible.
11854         (moxie_expand_prologue): Ditto.  Also, save an instruction and
11855         some complexity by popping off of $r12 instead of $sp.
11856         * config/moxie/moxie.md (movsi_pop): Don't assume $sp.  Take two
11857         operands.
11859 2009-07-01  Richard Henderson  <rth@redhat.com>
11861         PR bootstrap/40347
11862         * function.c (reposition_prologue_and_epilogue_notes): If epilogue
11863         contained no insns, reposition note before last insn.
11865 2009-07-01  Richard Henderson  <rth@redhat.com>
11867         PR debug/40431
11868         * dwarf2out.c (def_cfa_1): Revert 2009-06-11 change for
11869         DW_CFA_def_cfa_offset and DW_CFA_def_cfa.
11871 2009-07-01  Michael Meissner  <meissner@linux.vnet.ibm.com>
11873         PR bootstrap/40558
11874         * config/rs6000/rs6000.c (print_operand): Undo change that breaks
11875         darwin9 for printing reg addresses with %y.
11877 2009-07-01  Adam Nemet  <anemet@caviumnetworks.com>
11879         * combine.c (force_to_mode): Handle TRUNCATE.  Factor out
11880         truncation from operands in binary operations.
11882 2009-07-01  Adam Nemet  <anemet@caviumnetworks.com>
11884         Revert:
11885         2009-01-11  Adam Nemet  <anemet@caviumnetworks.com>
11886         * expmed.c (store_bit_field_1): Properly truncate the paradoxical
11887         subreg of op0 to the original op0.
11889         * expmed.c (store_bit_field_1): Use a temporary as the destination
11890         instead of a paradoxical subreg when we need to truncate the result.
11892 2009-07-01  DJ Delorie  <dj@redhat.com>
11894         * config/mep/mep-ivc2.cpu (cmov, cmovc, cmovh): Add intrinsic
11895         names to VLIW variants.
11896         (ivc2rm, ivc2crn): Make data type consistent with non-VLIW variants.
11897         * config/mep/intrinsics.md: Regenerate.
11898         * config/mep/intrinsics.h: Regenerate.
11899         * config/mep/mep-intrin.h: Regenerate.
11901 2009-07-01  Jakub Jelinek  <jakub@redhat.com>
11903         PR debug/40462
11904         * jump.c (returnjump_p): Revert last patch.
11905         * dwarf2out.c (dwarf2out_begin_epilogue): Handle SEQUENCEs.
11907 2009-07-01  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
11909         PR target/40575
11910         * pa.md (casesi32p): Use jump table label to determine the offset
11911         of the jump table.
11912         (casesi64p): Likewise.
11914         * pa.c (forward_branch_p): Return bool type.  Use instruction
11915         addresses when available.  Assert that INSN has a jump label.
11916         (pa_adjust_insn_length): Don't call forward_branch_p if INSN doesn't
11917         have a jump label.
11919 2009-07-01  Richard Guenther  <rguenther@suse.de>
11921         PR tree-optimization/19831
11922         * tree-ssa-dce.c (propagate_necessity): Calls to functions
11923         that only act as barriers do not make any previous stores necessary.
11924         * tree-ssa-structalias.c (handle_lhs_call): Delay making
11925         HEAP variables global, do not add a constraint from nonlocal.
11926         (find_func_aliases): Handle escapes through return statements.
11927         (compute_points_to_sets): Make escaped HEAP variables global.
11929 2009-07-01  Paolo Bonzini  <bonzini@gnu.org>
11931         PR bootstrap/40597
11932         * expmed.c (emit_store_flag): Perform a conversion if necessary,
11933         after reducing a DImode cstore to SImode.
11935 2009-07-01  Paolo Bonzini  <bonzini@gnu.org>
11937         * expr.c (expand_expr_real_1): Reinstate fallthrough to
11938         TRUTH_ANDIF_EXPR if do_store_flag returns NULL.
11940 2009-07-01  Maciej W. Rozycki  <macro@linux-mips.org>
11942         * config/vax/vax.h (TARGET_BSD_DIVMOD): New macro.  Set to 1.
11943         * config/vax/linux.h (TARGET_BSD_DIVMOD): New macro.  Redefine the
11944         to 0.
11945         * config/vax/vax.c (vax_init_libfuncs): Only redefine udiv_optab
11946         and umod_optab if TARGET_BSD_DIVMOD.
11947         * config/vax/lib1funcs.asm: New file.
11948         * config/vax/t-linux: New file.
11949         * config.gcc (vax-*-linux*): Set tmake_file to vax/t-linux.
11951 2009-06-30  Jakub Jelinek  <jakub@redhat.com>
11953         PR c++/40566
11954         * convert.c (convert_to_integer) <case COND_EXPR>: Don't convert
11955         to type arguments that have void type.
11957         PR debug/40573
11958         * dwarf2out.c (gen_formal_parameter_die): Call
11959         equate_decl_number_to_die if node is different from origin.
11961 2009-06-30  Anthony Green  <green@moxielogic.com>
11963         Clean up moxie port for --enable-build-with-cxx.
11964         * config/moxie/moxie.c (moxie_function_value): First two
11965         parameters are const_tree, not tree.
11966         * config/moxie/moxie.h (enum reg_class): Rename CC_REG to CC_REGS.
11967         (REG_CLASS_NAMES): Ditto.
11968         (REGNO_REG_CLASS): Ditto.
11969         * config/moxie/moxie-protos.h (moxie_override_options): Declare.
11970         (moxie_function_value): Fix constyness of arguments.
11972 2009-06-30  Eric Botcazou  <ebotcazou@adacore.com>
11974         * cgraphunit.c (cgraph_finalize_compilation_unit): Call
11975         finalize_size_functions before further processing.
11976         * stor-layout.c: Include cgraph.h, tree-inline.h and tree-dump.h.
11977         (variable_size): Call self_referential_size on size expressions
11978         that contain a PLACEHOLDER_EXPR.
11979         (size_functions): New static variable.
11980         (copy_self_referential_tree_r): New static function.
11981         (self_referential_size): Likewise.
11982         (finalize_size_functions): New global function.
11983         * tree.c: Include tree-inline.h.
11984         (push_without_duplicates): New static function.
11985         (find_placeholder_in_expr): New global function.
11986         (substitute_in_expr) <tcc_declaration>: Return the replacement object
11987         on equality.
11988         <tcc_expression>: Likewise.
11989         <tcc_vl_exp>: If the replacement object is a constant, try to inline
11990         the call in the expression.
11991         * tree.h (finalize_size_functions): Declare.
11992         (find_placeholder_in_expr): Likewise.
11993         (FIND_PLACEHOLDER_IN_EXPR): New macro.
11994         (substitute_placeholder_in_expr): Update comment.
11995         * tree-inline.c (remap_decl): Do not unshare trees if do_not_unshare
11996         is true.
11997         (copy_tree_body_r): Likewise.
11998         (copy_tree_body): New static function.
11999         (maybe_inline_call_in_expr): New global function.
12000         * tree-inline.h (struct copy_body_data): Add do_not_unshare field.
12001         (maybe_inline_call_in_expr): Declare.
12002         * Makefile.in (tree.o): Depend on TREE_INLINE_H.
12003         (stor-layout.o): Depend on CGRAPH_H, TREE_INLINE_H, TREE_DUMP_H and
12004         GIMPLE_H.
12006 2009-06-30  Richard Guenther  <rguenther@suse.de>
12008         * tree-ssa-dce.c (mark_all_reaching_defs_necessary_1): Always
12009         continue walking.
12010         (propagate_necessity): Do not mark reaching defs of stores
12011         as necessary.
12013 2009-06-30  Jan Hubicka  <jh@suse.cz>
12015         * cfgloopanal.c (check_irred): Move into ...
12016         (mark_irreducible_loops): ... here; return true if ireducible
12017         loops was found.
12018         * ipa-pure-const.c: Include cfgloop.h and tree-scalar-evolution.h
12019         (analyze_function): Try to prove loop finiteness.
12020         * cfgloop.h (mark_irreducible_loops): Update prototype.
12021         * Makefile.in (ipa-pure-const.o): Add dependency on SCEV and CFGLOOP.
12023 2009-06-30  Basile Starynkevitch  <basile@starynkevitch.net>
12025         * Makefile.in (PLUGIN_HEADERS): added ggc, tree-dump, pretty-print.
12027 2009-06-30  Ira Rosen  <irar@il.ibm.com>
12029         PR tree-optimization/40542
12030         * tree-vect-stmts.c (vect_analyze_stmt): Don't vectorize volatile
12031         types.
12033 2009-06-30  Martin Jambor  <mjambor@suse.cz>
12035         PR tree-optimization/40582
12036         * tree-sra.c (build_ref_for_offset_1): Use types_compatible_p rather
12037         than useless_type_conversion_p.
12038         (generate_subtree_copies): Increment sra_stats.subtree_copies at a
12039         proper place.
12041 2009-06-30  Martin Jambor  <mjambor@suse.cz>
12043         PR middle-end/40554
12044         * tree-sra.c (sra_modify_expr): Add access->offset to start_offset.
12046 2009-06-30  Richard Guenther  <rguenther@suse.de>
12048         * tree-ssa-alias.c (walk_aliased_vdefs_1): Change interface to
12049         use ao_ref references.
12050         (walk_aliased_vdefs): Likewise.
12051         * tree-ssa-alias.h (walk_aliased_vdefs): Adjust prototype.
12052         * tree-ssa-dce.c (struct ref_data): Remove.
12053         (mark_aliased_reaching_defs_necessary_1): Use the ao_ref argument.
12054         (mark_aliased_reaching_defs_necessary): Adjust.
12055         (mark_all_reaching_defs_necessary_1): Likewise.
12057 2009-06-30  Paolo Bonzini  <bonzini@gnu.org>
12059         PR boostrap/40597
12060         * expmed.c (emit_cstore): New name of emit_store_flag_1.
12061         (emit_store_flag_1): Extract from emit_store_flag, adjust
12062         calls to (what now is) emit_cstore.
12063         (emit_store_flag): Call emit_store_flag_1 and also use it
12064         for what used to be recursive calls.
12066 2009-06-30  Wei Guozhi  <carrot@google.com>
12068         PR/40416
12069         * tree-ssa-sink.c (statement_sink_location): Stop sinking expression
12070         if the target bb post dominates from bb.
12071         * config/i386/i386.c (memory_address_length): Check existence of base
12072         register before using it.
12074 2009-06-30  Nick Clifton  <nickc@redhat.com>
12075             DJ Delorie  <dj@redhat.com>
12077         * config.sh/lib1funcs.h (FMOVD_WORKS): Only define if
12078         __FMOVD_ENABLED__ is defined.
12079         * config/sh/sh.h
12080         (TARGET_FMOVD): Provide a default definition.
12081         (MASK_FMOVD): Likewise.
12082         (TARGET_CPU_CPP_BUILTINS): Define
12083         __FMOVD_ENABLED__ if TARGET_FMOVD is true.
12084         * config/sh/sh.md (movdf_i4): For alternative 0 use either one or
12085         two fmov instructions depending upon whether TARGET_FMOVD is
12086         enabled.
12087         (split for DF load from memory into register): Also handle
12088         MEMs which consist of REG+DISP addressing.
12089         (split for DF store from register to memory): Likewise.
12090         * config/sh/sh.opt (mfmovd): Remove this switch.
12091         * doc/invoke.texi (-mfmovd): Remove documentation of this switch.
12092         * config/sh/sh.c (sh_override_options): Do not automatically
12093         enable TARGET_MOVD for the SH2A when supporting doubles - leave
12094         that to the -mfmovd command line switch.
12096         * config/sh/sh.c (broken_move): Do not restrict fldi test to only
12097         the SH4 and SH4A.
12098         (fldi_ok): Always allow.
12099         * config/sh/sh.md (movsf_ie): Always use single fp_mode.
12101 2009-06-29  DJ Delorie  <dj@redhat.com>
12103         * doc/install.texi (mep-x-elf): Correct chip's full name.
12105 2009-06-29  H.J. Lu  <hongjiu.lu@intel.com>
12107         * doc/extend.texi: Fix typo.
12109 2009-06-29  Tom Tromey  <tromey@redhat.com>
12111         * dwarf2.h: Remove.
12112         * Makefile.in (DWARF2_H): New variable.
12113         (except.o): Use it.
12114         (dwarf2out.o): Likewise.
12115         (dwarf2asm.o): Likewise.
12116         * config/i386/t-i386: Use DWARF2_H.
12117         * except.c: Include elf/dwarf2.h.
12118         * unwind-dw2.c: Include elf/dwarf2.h.
12119         * dwarf2out.c: Include elf/dwarf2.h.
12120         (dw_loc_descr_struct) <dw_loc_opc>: Now a bitfield.
12121         <dtprel>: New field.
12122         (dwarf_stack_op_name): Don't handle INTERNAL_DW_OP_tls_addr.
12123         (size_of_loc_descr): Likewise.
12124         (output_loc_operands_raw): Likewise.
12125         (output_loc_operands): Handle new dtprel field.
12126         (loc_checksum): Update.
12127         (loc_descriptor_from_tree_1) <VAR_DDECL>: Set dtprel field.
12128         * unwind-dw2-fde-glibc.c: Include elf/dwarf2.h.
12129         * unwind-dw2-fde.c: Include elf/dwarf2.h.
12130         * dwarf2asm.c: Include elf/dwarf2.h.
12131         * unwind-dw2-fde-darwin.c: Include elf/dwarf2.h.
12132         * config/mmix/mmix.c: Include elf/dwarf2.h.
12133         * config/rs6000/darwin-fallback.c: Include elf/dwarf2.h.
12134         * config/xtensa/unwind-dw2-xtensa.c: Include elf/dwarf2.h.
12135         * config/sh/sh.c: Include elf/dwarf2.h.
12136         * config/i386/i386.c: Include elf/dwarf2.h.
12138 2009-06-29  DJ Delorie  <dj@redhat.com>
12140         * config/mep/mep.h (CPP_SPEC): Remove __cop macro.
12142         * doc/extend.texi: Add MeP attributes and pragmas.
12143         * doc/invoke.text: Add MeP Options.
12144         * doc/contrib.texi: Add MeP contribution.
12145         * doc/md.texi: Add MeP constraints.
12146         * doc/install.texi: Add MeP target.
12148 2009-06-30  Anatoly Sokolov  <aesok@post.ru>
12150         * target.h (struct gcc_target): Add frame_pointer_required field.
12151         * target-def.h (TARGET_FRAME_POINTER_REQUIRED): New.
12152         (TARGET_INITIALIZER): Use TARGET_FRAME_POINTER_REQUIRED.
12153         * ira.c (setup_eliminable_regset): Use frame_pointer_required target
12154         hook.
12155         * reload1.c (update_eliminables): (Ditto.).
12156         * gcc/system.h (FRAME_POINTER_REQUIRED): Poison.
12157         * doc/tm.texi (FRAME_POINTER_REQUIRED): Revise documentation.
12158         (INITIAL_FRAME_POINTER_OFFSET): (Ditto.).
12160         * config/arc/arc.h (FRAME_POINTER_REQUIRED): Remove macro.
12162         * config/arm/arm.h (FRAME_POINTER_REQUIRED): Remove macro.
12163         * config/arm/arm.c (TARGET_FRAME_POINTER_REQUIRED): Define.
12164         (arm_frame_pointer_required): New function.
12166         * config/avr/avr.h (FRAME_POINTER_REQUIRED): Remove macro.
12167         * config/avr/avr.c (TARGET_FRAME_POINTER_REQUIRED): Define macro.
12168         (avr_frame_pointer_required_p): Declare as static.
12169         * config/avr/avr-protos.h (avr_frame_pointer_required_p): Remove.
12171         * config/bfin/bfin.h (FRAME_POINTER_REQUIRED): Remove macro.
12172         * config/bfin/bfin.c (TARGET_FRAME_POINTER_REQUIRED): Define.
12173         (bfin_frame_pointer_required): Make as static, change return type
12174         to bool.
12175         * config/bfin/bfin-protos.h (bfin_frame_pointer_required): Remove.
12177         * config/cris/cris.h (FRAME_POINTER_REQUIRED): Remove macro.
12178         * config/cris/cris.c (TARGET_FRAME_POINTER_REQUIRED): Define macro.
12179         (cris_frame_pointer_required): New function.
12181         * config/crx/crx.h (FRAME_POINTER_REQUIRED): Remove macro.
12183         * config/fr30/fr30.h (FRAME_POINTER_REQUIRED): Remove macro.
12184         * config/fr30/fr30.c (TARGET_FRAME_POINTER_REQUIRED): Define macro.
12185         (fr30_frame_pointer_required): New function.
12187         * config/frv/frv.h (FRAME_POINTER_REQUIRED): Remove macro.
12188         * config/frv/frv.c (TARGET_FRAME_POINTER_REQUIRED): Define.
12189         (frv_frame_pointer_required): Make as static, change return type
12190         to bool.
12191         * config/bfin/bfin-protos.h (frv_frame_pointer_required): Remove.
12193         * config/i386/i386.h (FRAME_POINTER_REQUIRED): Remove macro.
12194         * config/i386/i386.c (TARGET_FRAME_POINTER_REQUIRED): Define macro.
12195         (ix86_frame_pointer_required): Make as static, change return type to
12196         bool.
12197         * config/i386/i386-protos.h (ix86_frame_pointer_required): Remove.
12199         * config/m32c/m32c.h (FRAME_POINTER_REQUIRED): Remove macro.
12200         * config/m32c/m32c.c (TARGET_FRAME_POINTER_REQUIRED): Define macro.
12202         * config/m32r/m32r.h (FRAME_POINTER_REQUIRED): Remove macro.
12204         * config/mcore/mcore.h (CAN_ELIMINATE): Remove macro.
12206         * config/mep/mep.h (FRAME_POINTER_REQUIRED): Remove macro.
12208         * config/mips/mips.h (FRAME_POINTER_REQUIRED): Remove macro.
12209         * config/mips/mips.c (TARGET_FRAME_POINTER_REQUIRED): Define macro.
12210         (mips_frame_pointer_required): Make as static.
12211         * config/mips/mips-protos.h (mips_frame_pointer_required): Remove.
12213         * config/mmix/mmix.h (FRAME_POINTER_REQUIRED): Remove macro.
12214         * config/mmix/mmix.c (TARGET_FRAME_POINTER_REQUIRED): Define macro.
12215         (mmix_frame_pointer_required): Mew function.
12217         * config/moxie/moxie.h (FRAME_POINTER_REQUIRED): Remove macro.
12218         * config/moxie/moxie.c (TARGET_FRAME_POINTER_REQUIRED): Define macro.
12220         * config/pa/pa.h (FRAME_POINTER_REQUIRED): Remove macro.
12222         * config/score/score.h (FRAME_POINTER_REQUIRED): Remove macro.
12224         * config/sh/sh.h (CAN_ELIMINATE): Remove macro.
12226         * config/sparc/sparc.h (FRAME_POINTER_REQUIRED): Remove macro.
12227         (CAN_ELIMINATE): Redefine.
12228         * config/sparc/sparc.c (TARGET_FRAME_POINTER_REQUIRED): Define macro.
12229         (sparc_frame_pointer_required): New function.
12230         (sparc_can_eliminate): New function.
12231         * config/sparc/sparc-protos.h (sparc_can_eliminate): Declare.
12233         * config/vax/vax.h (FRAME_POINTER_REQUIRED): Remove macro.
12234         * config/vax/vax.c (TARGET_FRAME_POINTER_REQUIRED): Define.
12236         * config/xtensa/xtensa.h (FRAME_POINTER_REQUIRED): Remove macro.
12237         * config/xtensa/xtensa.c (TARGET_FRAME_POINTER_REQUIRED): Define.
12238         (xtensa_frame_pointer_required): Make as static, change return type
12239         to bool.
12240         * config/xtensa/xtensa-protos.h (xtensa_frame_pointer_required):
12241         Remove.
12243 2009-06-29  Olatunji Ruwase  <tjruwase@google.com>
12245         * doc/plugins.texi: Document PLUGIN_START_UNIT.
12246         * toplev.c (compile_file): Call PLUGIN_START_UNIT.
12247         * gcc-plugin.h (PLUGIN_START_UNIT): Added new event.
12248         * plugin.c (plugin_event_name): Added PLUGIN_START_UNIT.
12249         (register_callback): Handle PLUGIN_START_UNIT.
12250         (invoke_plugin_callbacks): Handle PLUGIN_START_UNIT.
12252 2009-06-29  Eric Botcazou  <ebotcazou@adacore.com>
12254         * tree.c (process_call_operands): Propagate TREE_READONLY from the
12255         operands.
12256         (PROCESS_ARG): Do not clear TREE_READONLY if CONSTANT_CLASS_P.
12257         (build3_stat): Propagate TREE_READONLY for COND_EXPR.
12259 2009-06-29  Daniel Jacobowitz  <dan@codesourcery.com>
12261         * config/arm/arm.h (REGISTER_MOVE_COST): Increase VFP register
12262         move cost.
12264 2009-06-29  Uros Bizjak  <ubizjak@gmail.com>
12266         * doc/extend.texi (Additional Floating Types): __float128 is also
12267         supported on i386 targets.
12269 2009-06-29  Richard Guenther  <rguenther@suse.de>
12271         PR middle-end/14187
12272         * tree-ssa-alias.h (struct pt_solution): Add vars_contains_restrict
12273         flag.
12274         (pt_solutions_same_restrict_base): Declare.
12275         * tree-ssa-structalias.c (struct variable_info): Add is_restrict_var
12276         flag.
12277         (new_var_info): Initialize is_global_var properly for SSA_NAMEs.
12278         (make_constraint_from, make_copy_constraint): Move earlier.
12279         (make_constraint_from_heapvar): New function.
12280         (make_constraint_from_restrict): Likewise.
12281         (handle_lhs_call): Use it.
12282         (find_func_aliases): Use it to track conversions to restrict
12283         qualified pointers.
12284         (struct fieldoff): Add only_restrict_pointers flag.
12285         (push_fields_onto_fieldstack): Initialize it.
12286         (create_variable_info_for): Track global restrict qualified pointers.
12287         (intra_create_variable_infos): Use make_constraint_from_heapvar.
12288         Track restrict qualified pointer arguments.
12289         (set_uids_in_ptset): Use varinfo is_global_var flag.
12290         (find_what_var_points_to): Set the vars_contains_restrict flag.
12291         Always create the points-to solution for sets including restrict tags.
12292         (pt_solutions_same_restrict_base): New function.
12293         * tree-ssa-alias.c (ptr_derefs_may_alias_p): For two restrict
12294         qualified pointers use pt_solutions_same_restrict_base as
12295         additional source for disambiguation.
12297 2009-06-29  Richard Guenther  <rguenther@suse.de>
12299         PR middle-end/38212
12300         * alias.c (find_base_decl): Remove.
12301         (get_deref_alias_set_1): Remove restrict handling.
12302         * c-common.c (c_apply_type_quals_to_decl): Do not set
12303         DECL_POINTER_ALIAS_SET.
12304         * gimplify.c (find_single_pointer_decl_1): Remove.
12305         (find_single_pointer_decl): Likewise.
12306         (internal_get_tmp_var): Remove restrict handling.
12307         (gimple_regimplify_operands): Likewise.
12308         * omp-low.c (expand_omp_atomic_pipeline): Do not set
12309         DECL_POINTER_ALIAS_SET. Use ref-all pointers.
12310         * print-tree.c (print_node): Do not print DECL_POINTER_ALIAS_SET.
12311         * tree.c (restrict_base_for_decl): Remove.
12312         (init_ttree): Do not allocate it.
12313         (make_node_stat): Do not set DECL_POINTER_ALIAS_SET.  Set
12314         LABEL_DECL_UID for label decls.
12315         (copy_node_stat): Do not copy restrict information.
12316         (decl_restrict_base_lookup): Remove.
12317         (decl_restrict_base_insert): Likewise.
12318         (print_restrict_base_statistics): Likewise.
12319         (dump_tree_statistics): Do not call print_restrict_base_statistics.
12320         * tree.h (DECL_POINTER_ALIAS_SET): Remove.
12321         (DECL_POINTER_ALIAS_SET_KNOWN_P): Likewise.
12322         (struct tree_decl_common): Rename pointer_alias_set to label_decl_uid.
12323         (LABEL_DECL_UID): Adjust.
12324         (DECL_BASED_ON_RESTRICT_P): Remove.
12325         (DECL_GET_RESTRICT_BASE): Likewise.
12326         (SET_DECL_RESTRICT_BASE): Likewise.
12327         (struct tree_decl_with_vis): Remove based_on_restrict_p flag.
12329         * config/i386/i386.c (ix86_gimplify_va_arg): Use ref-all pointers
12330         instead of DECL_POINTER_ALIAS_SET.
12331         * config/rs6000/rs6000.c (rs6000_gimplify_va_arg): Likewise.
12332         * config/s390/s390.c (s390_gimplify_va_arg): Likewise.
12333         * config/spu/spu.c (spu_gimplify_va_arg_expr): Likewise.
12335 2009-06-29  Richard Guenther  <rguenther@suse.de>
12337         PR tree-optimization/40579
12338         * tree-vrp.c (vrp_evaluate_conditional): Bail out early if
12339         the IL to simplify has constants that overflowed.
12341 2009-06-28  Uros Bizjak  <ubizjak@gmail.com>
12343         PR tree-optimization/40550
12344         * tree-vect-generic.c (expand_vector_operations_1): Compute in
12345         vector_compute_type only when the size of vector_compute_type is
12346         less than the size of type.
12348 2009-06-28  Eric Botcazou  <ebotcazou@adacore.com>
12350         * fold-const.c (contains_label_1): Fix comments.
12351         (contains_label_p): Do not walk trees multiple time.
12353 2009-06-28  Paolo Bonzini  <bonzini@gnu.org>
12355         * config/i386/i386.h (enum ix86_fpcmp_strategy): New.
12356         * config/i386/i386.md (cbranchxf4, cstorexf4, cbranch<MODEF>4,
12357         cstore<MODEF>4, mov<X87MODEF>cc): Change predicate to
12358         ix86_fp_comparison_operator.
12359         (*fp_jcc_1_mixed, *fp_jcc_1_sse, *fp_jcc_1_387, *fp_jcc_2_mixed,
12360         *fp_jcc_2_sse, *fp_jcc_2_387): Delete
12361         (*fp_jcc_3_387, *fp_jcc_4_387, *fp_jcc_5_387, *fp_jcc_6_387,
12362         *fp_jcc_7_387, *fp_jcc_8<MODEF>_387): Eliminate call to
12363         !ix86_use_fcomi_compare, change ix86_fp_jump_nontrivial_p call
12364         to !TARGET_CMOVE, change predicate to ix86_fp_comparison_operator.
12365         (related splits): Change predicate to ix86_fp_comparison_operator.
12366         * config/i386/predicates.md: Use ix86_trivial_fp_comparison_operator
12367         instead of ix86_fp_comparison_codes.
12368         (ix86_trivial_fp_comparison_operator,
12369         ix86_fp_comparison_operator): New.
12370         * config/i386/i386-protos.h (ix86_fp_comparison_strategy): New.
12371         (ix86_expand_compare): Eliminate last two parameters.
12372         (ix86_fp_jump_nontrivial_p): Kill.
12373         * config/i386/i386.c (put_condition_code): Eliminate call to
12374         ix86_fp_comparison_codes and subsequent assertion.
12375         (ix86_fp_comparison_codes): Eliminate.
12376         (ix86_fp_swap_condition): New.
12377         (ix86_fp_comparison_arithmetics_cost, ix86_fp_comparison_fcomi_cost,
12378         ix86_fp_comparison_sahf_cost, ix86_use_fcomi_compare): Consolidate
12379         into ix86_fp_comparison_cost and ix86_fp_comparison_strategy.
12380         (ix86_prepare_fp_compare_args): Use ix86_fp_comparison_strategy
12381         and ix86_fp_swap_condition.
12382         (ix86_expand_fp_compare): Eliminate code for second jump/bypass jump.
12383         Use ix86_fp_comparison_strategy.
12384         (ix86_expand_compare): Likewise.  Eliminate last two arguments.
12385         (ix86_fp_jump_nontrivial_p): Eliminate.
12386         (ix86_expand_branch): Treat SFmode/DFmode/XFmode as simple.  Adjust
12387         call to ix86_expand_compare.
12388         (ix86_split_fp_branch, ix86_expand_setcc,
12389         ix86_expand_carry_flag_compare, ix86_expand_int_movcc,
12390         ix86_expand_fp_movcc): Eliminate code for second jump/bypass jump.
12392 2009-06-28  Paolo Bonzini  <bonzini@gnu.org>
12394         * config/arm/arm.c (arm_final_prescan_ins): Eliminate code
12395         related to jump_clobbers.
12396         * config/arm/arm.md (conds): Remove jump_clob case.
12397         (addsi3_cbranch, addsi3_cbranch_scratch, subsi3_cbranch, two
12398         splits): Change comparison_operator to arm_comparison_operator.
12399         (*arm_buneq, *arm_bltgt, *arm_buneq_reversed, *arm_bltgt_reversed):
12400         Eliminate.
12402 2009-06-28  Paolo Bonzini  <bonzini@gnu.org>
12404         * dojump.c (do_compare_rtx_and_jump): Try swapping the
12405         condition for floating point modes.
12406         * expmed.c (emit_store_flag_1): Move here a bigger part
12407         of emit_store_flag.
12408         (emit_store_flag): Try swapping the condition for floating point
12409         modes.
12410         * optabs.c (emit_cmp_and_jump_insns): Cope with constant op0 better.
12412 2009-06-28  Paolo Bonzini  <bonzini@gnu.org>
12414         * expr.c (expand_expr_real_1): Just use do_store_flag.
12415         (do_store_flag): Drop support for TRUTH_NOT_EXPR.  Use
12416         emit_store_flag_force.
12417         * expmed.c (emit_store_flag_force): Copy here trick
12418         previously in expand_expr_real_1.  Try reversing the comparison.
12419         (emit_store_flag_1): Work if target is NULL.
12420         (emit_store_flag): Work if target is NULL, using the result mode
12421         from the comparison.  Use split_comparison, restructure final part
12422         to simplify conditionals.
12424 2009-06-28  Paolo Bonzini  <bonzini@gnu.org>
12426         * builtins.c (expand_errno_check): Use do_compare_rtx_and_jump.
12427         * dojump.c (do_jump): Change handling of floating-point
12428         ops to use just do_compare_and_jump.
12429         (split_comparison): New.
12430         (do_compare_rtx_and_jump): Add here logic coming previously
12431         in do_jump, using split_comparison.
12433 2009-06-27  H.J. Lu  <hongjiu.lu@intel.com>
12435         PR target/40489
12436         * config/ia64/ia64.c (ia64_reorg): Check NULL insn.
12438 2009-06-27  Paolo Bonzini  <bonzini@gnu.org>
12440         * tree-ssa-alias.c: Fix unintentional commit.
12442 2009-06-27  Paolo Bonzini  <bonzini@gnu.org>
12444         * passes.c (execute_one_pass): Fix unintentional commit.
12446 2009-06-27  Paolo Bonzini  <bonzini@gnu.org>
12448         * df-problems.c (df_set_seen, df_unset_seen): Delete.
12449         (df_rd_local_compute, df_md_local_compute): Inline them.
12451         (df_md_scratch): New.
12452         (df_md_alloc, df_md_free): Allocate/free it.
12453         (df_md_local_compute): Only include live registers in init.
12454         (df_md_transfer_function): Prune the in-set computed by
12455         the confluence function, and the gen-set too.
12457 2009-06-27  Paolo Bonzini  <bonzini@gnu.org>
12459         PR rtl-optimization/26854
12460         * timevar.def: Remove TV_DF_RU, add TV_DF_MD.
12461         * df-problems.c (df_rd_add_problem): Fix comment.
12462         (df_md_set_bb_info, df_md_free_bb_info, df_md_alloc,
12463         df_md_simulate_artificial_defs_at_top,
12464         df_md_simulate_one_insn, df_md_bb_local_compute_process_def,
12465         df_md_bb_local_compute, df_md_local_compute, df_md_reset,
12466         df_md_transfer_function, df_md_init, df_md_confluence_0,
12467         df_md_confluence_n, df_md_free, df_md_top_dump, df_md_bottom_dump,
12468         problem_MD, df_md_add_problem): New.
12469         * df.h (DF_MD, DF_MD_BB_INFO, struct df_md_bb_info, df_md,
12470         df_md_get_bb_info): New.
12471         (DF_LAST_PROBLEM_PLUS1): Adjust.
12473         * Makefile.in (fwprop.o): Include domwalk.h.
12474         * fwprop.c: Include domwalk.h.
12475         (reg_defs, reg_defs_stack): New.
12476         (bitmap_only_bit_between): Remove.
12477         (process_defs): New.
12478         (process_uses): Use reg_defs and local_md instead of
12479         bitmap_only_bit_between and local_rd.
12480         (single_def_use_enter_block): New, from build_single_def_use_links.
12481         (single_def_use_leave_block): New.
12482         (build_single_def_use_links): Remove code moved to
12483         single_def_use_enter_block, invoke domwalk.
12484         (use_killed_between): Adjust comment.
12486 2009-06-27  Paolo Bonzini  <bonzini@gnu.org>
12488         * bitmap.h (bitmap_ior_and_into): New.
12489         * bitmap.c (bitmap_ior_and_into): New.
12491 2009-06-27  Paolo Bonzini  <bonzini@gnu.org>
12493         * domwalk.h (struct dom_walk_data): Remove all callbacks except
12494         before_dom_children_before_stmts and after_dom_children_after_stmts.
12495         Rename the two remaining callbacks to just before_dom_children and
12496         after_dom_children. Remove other GIMPLE statement walking bits.
12497         * domwalk.c (walk_dominator_tree): Remove now unsupported features.
12498         * graphite.c: Do not include domwalk.h.
12499         * tree-into-ssa.c (interesting_blocks): New global.
12500         (struct mark_def_sites_global_data): Remove it and names_to_rename.
12501         (mark_def_sites, rewrite_stmt, rewrite_add_phi_arguments,
12502         rewrite_update_stmt, rewrite_update_phi_arguments): Simplify
12503         now that they're not domwalk callbacks.
12504         (rewrite_initialize_block): Rename to...
12505         (rewrite_enter_block): ... this, place after called functions.  Test
12506         interesting_blocks, call rewrite_stmt and rewrite_add_phi_arguments.
12507         (rewrite_finalize_block): Rename to...
12508         (rewrite_leave_block): ... this, place after called functions.
12509         (rewrite_update_init_block): Rename to...
12510         (rewrite_update_enter_block): ... this, place after called functions.
12511         Test interesting_blocks, call rewrite_update_stmt and
12512         rewrite_update_phi_arguments.
12513         (rewrite_update_fini_block): Rename to...
12514         (rewrite_leave_block): ... this, place after called functions.
12515         (rewrite_blocks): Remove last argument, simplify initialization of
12516         walk_data.
12517         (mark_def_sites_initialize_block): Rename to...
12518         (mark_def_sites_block): ... this, call mark_def_sites.
12519         (mark_def_sites_blocks): Remove argument, simplify initialization of
12520         walk_data.
12521         (rewrite_into_ssa): Adjust for interesting_blocks_being a global.
12522         (update_ssa): Likewise.
12523         * tree-ssa-dom.c (optimize_stmt): Simplify now that it's not a domwalk
12524         callback.
12525         (tree_ssa_dominator_optimize): Simplify initialization of walk_data.
12526         (dom_opt_initialize_block): Rename to...
12527         (dom_opt_enter_block): ... this, place after called functions.  Walk
12528         statements here, inline propagate_to_outgoing_edges.
12529         (dom_opt_finalize_block): Rename to...
12530         (dom_opt_leave_block): ... this, place after called functions.
12531         * tree-ssa-dse.c (dse_optimize_stmt): Simplify now that it's not a
12532         domwalk callback.
12533         (dse_enter_block, dse_record_phi): New.
12534         (dse_record_phis): Delete.
12535         (dse_finalize_block): Rename to...
12536         (dse_leave_block): ... this.
12537         (tree_ssa_dse): Simplify initialization of walk_data.
12538         * tree-ssa-loop-im.c (determine_invariantness, move_computations):
12539         Adjust initialization of walk_data.
12540         * tree-ssa-loop-unswitch.c: Do not include domwalk.h.
12541         * tree-ssa-loop-phiopt.c (get_non_trapping):
12542         Adjust initialization of walk_data.
12543         * tree-ssa-loop-threadedge.c: Do not include domwalk.h.
12544         * tree-ssa-uncprop.c (uncprop_into_successor_phis): Simplify now that
12545         it's not a domwalk callback.
12546         (uncprop_initialize_block): Rename to...
12547         (dse_enter_block): ... this, call uncprop_into_successor_phis.
12548         (dse_finalize_block): Rename to...
12549         (dse_leave_block): ... this.
12550         (tree_ssa_uncprop): Simplify initialization of walk_data.
12551         * Makefile.in: Adjust dependencies.
12553 2009-06-27  Richard Earnshaw  <rearnsha@arm.com>
12555         * arm.md (casesi): Fix test for Thumb1.
12556         (thumb1_casesi_internal_pic): Likewise.
12557         (thumb1_casesi_dispatch): Likewise.
12559 2009-06-26  Daniel Gutson  <dgutson@codesourcery.com>
12561         * config/arm/arm-cores.def: Added core cortex-m0.
12562         * config/arm/arm-tune.md: Regenerated.
12563         * doc/invoke.texi: Added entry for cpu ARM Cortex-M0.
12565 2009-06-26  DJ Delorie  <dj@redhat.com>
12567         * config/mep/mep.opt (mfar): Remove -mfar as it doesn't do anything.
12569         * config/mep/mep.c (mep_bundle_insns): Account for the fact that
12570         the scheduler doesn't tag jump insns.
12572 2009-06-26  H.J. Lu  <hongjiu.lu@intel.com>
12574         * c-decl.c (merge_decls): Re-indent.
12576 2009-06-26  Janis Johnson  <janis187@us.ibm.com>
12578         PR c/39902
12579         * tree.c (real_zerop, real_onep, real_twop, real_minus_onep):
12580         Special-case decimal float constants.
12582 2009-06-26  Richard Henderson  <rth@redhat.com>
12584         * function.h (struct function): Add cannot_be_copied_reason,
12585         and cannot_be_copied_set.
12586         * tree-inline.c (has_label_address_in_static_1): Rename from
12587         inline_forbidden_p_2; don't set inline_forbidden_reason here.
12588         (cannot_copy_type_1): Rename from inline_forbidden_p_op; likewise
12589         don't set inline_forbidden_reason.
12590         (copy_forbidden): New function, split out of inline_forbidden_p.
12591         (inline_forbidden_p_stmt): Don't check for nonlocal labels here.
12592         (inline_forbidden_p): Use copy_forbidden.
12593         (tree_versionable_function_p): Likewise.
12594         (inlinable_function_p): Merge into tree_inlinable_function_p.
12595         (tree_function_versioning): Remap cfun->nonlocal_goto_save_area.
12596         * ipa-cp.c (ipcp_versionable_function_p): New function.
12597         (ipcp_cloning_candidate_p): Use it.
12598         (ipcp_node_modifiable_p): Likewise.
12600 2009-06-26  Olatunji Ruwase  <tjruwase@google.com>
12602         * builtins.c (expand_builtin_alloca): Handle builtin alloca
12603         that is marked not to be inlined. Remove flag_mudflap use.
12604         * tree-mudflap.c: Rename mf_xform_derefs to mf_xfrom_statements.
12605         (mf_xform_statements): Mark builtin alloca calls as un-inlineable.
12607 2009-06-26  Steve Ellcey  <sje@cup.hp.com>
12609         PR bootstrap/40338
12610         * config/pa/t-pa-hpux10 (TARGET_LIBGCC2_CFLAGS): Add -frandom-seed.
12611         * config/pa/t-pa-hpux11 (TARGET_LIBGCC2_CFLAGS): Ditto.
12613 2009-06-26  Kai Tietz  <kai.tietz@onevision.com>
12615         * config/i386/mingw-tls.c (__mingwthr_key_dtor): Remove for none
12616         shared libgcc.
12617         (__mingwthr_remove_key_dtor): Likewise.
12619 2009-06-26  Richard Guenther  <rguenther@suse.de>
12621         * tree-ssa-structalias.c (do_ds_constraint): Simplify escape handling.
12623 2009-06-26  Steven Bosscher  <steven@gcc.gnu.org>
12625         PR middle-end/40525
12626         * ifcvt.c (dead_or_predicable): If predicating MERGE_BB fails,
12627         try the non-cond_exec path also.
12629 2009-06-25  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
12631         PR target/40468
12632         * pa.c (branch_to_delay_slot_p, branch_needs_nop_p): New functions.
12633         (output_cbranch): Use new functions.
12634         (output_lbranch, output_bb, output_bvb, output_dbra, output_movb):
12635         Likewise.
12637 2009-06-25  Michael Meissner  <meissner@linux.vnet.ibm.com>
12638             Pat Haugen  <pthaugen@us.ibm.com>
12639             Revital Eres <ERES@il.ibm.com>
12641         * config/rs6000/rs6000.c (print_operand): Correct lossage message
12642         for %c error.  Add %x support to print VSX registers as a unified
12643         register set, instead of separate float and altivec registers.
12644         Switch to use VECTOR_MEM_ALTIVEC_P instead of TARGET_ALTIVEC for
12645         %y case, and add support for VSX pre-modify addresses.
12646         (output_toc): Add assert for CONST containing an integer constant
12647         in the PLUS case.
12648         (rs6000_adjust_cost): Add POWER7 support.
12649         (insn_must_be_first_in_group): Ditto.
12650         (insn_must_be_last_in_group): Ditto.
12651         (rs6000_emit_popcount): Ditto.
12652         (rs6000_vector_mode_supported_p): Ditto.
12654         * config/rs6000/rs6000-protos.h (rs6000_secondary_reload_class):
12655         Change some of the functions called by macros to being called
12656         through a pointer, so debug functions can be inserted if
12657         -mdebug=addr or -mdebug=cost.
12658         (rs6000_preferred_reload_class_ptr): Ditto.
12659         (rs6000_secondary_reload_class_ptr): Ditto.
12660         (rs6000_secondary_memory_needed_ptr): Ditto.
12661         (rs6000_cannot_change_mode_class_ptr): Ditto.
12662         (rs6000_secondary_reload_inner): Ditto.
12663         (rs6000_legitimize_reload_address): Ditto.
12664         (rs6000_legitimize_reload_address_ptr): Ditto.
12665         (rs6000_mode_dependent_address): Ditto.
12666         (rs6000_mode_dependent_address_ptr): Ditto.
12668         * config/rs6000/rs6000.c (reg_offset_addressing_ok_p): New
12669         function to return true if the mode allows reg + integer
12670         addresses.
12671         (virtual_stack_registers_memory_p): New function to return true if
12672         the address refers to a virtual stack register.
12673         (rs6000_legitimate_offset_address_p): Move code to say whether a
12674         mode supports reg+int addressing to reg_offset_addressing_ok_p and
12675         call it.
12676         (rs6000_legitimate_address_p): Add checks for modes that only can
12677         do reg+reg addressing.  Start adding VSX support.
12678         (rs6000_legitimize_reload_address): Ditto.
12679         (rs6000_legitimize_address): Ditto.
12680         (rs6000_debug_legitimate_address_p): New debug functions for
12681         -mdebug=addr and -mdebug=cost.
12682         (rs6000_debug_rtx_costs): Ditto.
12683         (rs6000_debug_address_costs): Ditto.
12684         (rs6000_debug_adjust_cost): Ditto.
12685         (rs6000_debug_legitimize_address): Ditto.
12686         (rs6000_legitimize_reload_address_ptr): Point to call normal
12687         function or debug function.  Make functions called via pointer
12688         static.
12689         (rs6000_mode_dependent_address_ptr): Ditto.
12690         (rs6000_secondary_reload_class_ptr): Ditto.
12691         (rs6000_hard_regno_mode_ok): Add preliminary VSX support.
12692         (rs6000_emit_move): Add -mdebug=addr support.  Change an abort
12693         into a friendlier error.
12694         (rs6000_init_builtins): Add initial VSX support.
12695         (rs6000_adjust_cost): Fix some spacing issues.
12697         * config/rs6000/rs6000.h (enum reg_class): Add VSX_REGS.
12698         (REG_CLASS_NAMES): Ditto.
12699         (REG_CLASS_CONTENTS): Ditto.
12700         (PREFERRED_RELOAD_CLASS): Move from a macro to calling through a
12701         pointer, to add -mdebug=addr support.
12702         (CANNOT_CHANGE_MODE_CLASS): Ditto.
12703         (SECONDARY_RELOAD_CLASS): Call through a pointer to add
12704         -mdebug=addr support.
12705         (LEGITIMIZE_RELOAD_ADDRESS): Ditto.
12706         (GO_IF_MODE_DEPENDENT_ADDRESS): Ditto.
12707         (enum rs6000_builtins): Add RS6000_BUILTIN_BSWAP_HI.
12709         * config/rs6000/rs6000.md (bswaphi*): Add support for swapping
12710         16-bit values.
12711         (bswapsi*): Set attribute types for load/store.  Add combiner
12712         patterns to eliminate zero extend on 64-bit.
12713         (bswapdi*): Add support for swapping 64-bit values.  Use ldbrx and
12714         stdbrx if the hardware supports those instructions.
12716 2009-06-25  Ian Lance Taylor  <iant@google.com>
12718         * doc/invoke.texi (Option Summary): Mention -static-libstdc++.
12719         (Link Options): Document -static-libstdc++.
12721 2009-06-25  Andrew Pinski  <andrew_pinski@playstation.sony.com>
12723         PR target/38731
12724         * config/rs6000/rs6000.c (LOCAL_ALIGNMENT): Redefine to just use
12725         DATA_ALIGNMENT instead.
12727 2009-06-25  Richard Guenther  <rguenther@suse.de>
12729         * tree-ssa-alias.c (ref_maybe_used_by_call_p_1): Disambiguate
12730         indirect references against the callused/escaped solutions.
12731         (call_may_clobber_ref_p_1): Likewise.
12733 2009-06-25  Martin Jambor  <mjambor@suse.cz>
12735         PR tree-optimization/40493
12736         * tree-sra.c (sra_modify_expr): Correct BIT_FIELD_REF argument numbers.
12737         (enum unscalarized_data_handling): New type.
12738         (handle_unscalarized_data_in_subtree): Return what has been done.
12739         (load_assign_lhs_subreplacements): Handle left flushes differently.
12740         (sra_modify_assign): Use unscalarized_data_handling, simplified
12741         condition determining whether to remove the statement.
12743 2009-06-25  Basile Starynkevitch  <basile@starynkevitch.net>
12745         * doc/plugins.texi (Building GCC plugins): Correct typo in Makefile
12746         excerpt - @ should be doubled for texinfo.
12748 2009-06-24  Ian Lance Taylor  <iant@google.com>
12750         * config/arc/arc.c: Include "df.h".
12751         (arc_attribute_table): Make static.  Move higher in file.
12752         (arc_address_cost): Call SMALL_INT on INTVAL, not rtx.
12753         (output_shift): Initialize n later to avoid warning.
12754         * config/arm/arm.c (arm_attribute_table): Make static.  Move
12755         higher in file.
12756         * config/avr/avr.c (avr_attribute_table): Make static.  Move
12757         higher in file.
12758         (reg_class_tab): Change array type from int to enum reg_class.
12759         (avr_jump_mode): Change GET_MODE to GET_CODE when checking for
12760         LABEL_REF.
12761         (out_tsthi, ashlhi3_out): Don't use AS2 with "or" or "and".
12762         (lshrhi3_out): Likewise.
12763         (class_likely_spilled_p): Change return type to bool.
12764         (avr_rtx_costs): Use local code variable with enum type.
12765         * config/avr/avr.md (movmemhi): Use add_reg_note.
12766         (andhi3, andsi3): Don't use AS2 with "and".
12767         (iorhi3, iorsi3): Don't use AS2 with "or".
12768         * config/avr/avr-protos.h (class_likely_spilled_p): Update declaration.
12769         * config/crx/crx.c: Include "df.h".
12770         (crx_attribute_table): Make static.
12771         * config/m32r/m32r.c: Include "df.h".
12772         (m32r_attribute_table): Make static.  Move higher in file.
12773         (pop): Use add_reg_note.
12774         (block_move_call): Change 0 to LCT_NORMAL in function call.
12775         * config/m32r/m32r.md (movsi_insn): Remove unused local value.
12776         * config/m32r/m32r.h (INITIALIZE_TRAMPOLINE): Likewise.
12777         * config/m32r/m32r-protos.h (m32r_compute_function_type): Always
12778         declare, not just when TREE_CODE is defined.
12779         * config/m68hc11/m68hc11.c: Include "expr.h".
12780         (m68hc11_attribute_table): Make static.  Move higher in file.
12781         (m68hc11_small_indexed_indirect_p): Change 0 to VOIDmode in
12782         function call.
12783         (m68hc11_register_indirect_p): Likewise.
12784         (m68hc11_function_arg_padding): Change return type to enum
12785         direction.
12786         (emit_move_after_reload): Use add_reg_note.
12787         (m68hc11_emit_logical): Change code parameter to enum rtx_code.
12788         (m68hc11_split_logical): Likewise.
12789         (m68hc11_rtx_costs): Add local code_and outer_code variables with
12790         enum type.
12791         * config/m68hc11/predicates.md (reg_or_some_mem_operand): Change 0
12792         to VOIDmode in function call.
12793         * config/m68hc11/m68hc11-protos.h: Don't check TREE_CODE to see if
12794         tree is defined.
12795         (m68hc11_split_logical): Update declaration.
12796         (m68hc11_function_arg_padding): Update declaration.
12797         * config/mcore/mcore.c (regno_reg_class): Change form array of int
12798         to array of enum reg_class.
12799         (mcore_attribute_table): Make static.  Move higher in file.
12800         (mcore_rtx_costs): Add cast to enum type.
12801         * config/mcore/mcore.h (regno_reg_class): Update declaration.
12802         (GO_IF_LEGITIMATE_INDEX): Add cast to avoid warning.
12803         * config/sh/sh.c (sh_attribute_table): Make static.  Move higher
12804         in file.
12805         * config/sh/predicates.md (trapping_target_operand): Rename and to
12806         and_expr.
12807         * config/sparc/sparc.c (sparc_attribute_table): Make static.  Move
12808         higher in file.
12809         * config/spu/spu.c (spu_attribute_table): Make static.  Move
12810         higher in file.
12811         * config/v850/v850.c (v850_attribute_table): Make static.  Move
12812         higher in file.
12813         (v850_rtx_costs): Use local code with enum type.
12814         (expand_epilogue): Add cast.
12815         * config/v850/v850-c.c (ghs_pragma_section): Initialize repeat.
12817 2009-06-23  Takashi YOSHII  <yoshii.takashi@renesas.com>
12819         PR target/40515
12820         * doc/invoke.texi (SH Options): Document -m2a, -m2a-single,
12821         -m2a-single-only and -m2a-nofpu.
12822         * config/sh/sh.opt: Document m2a generates FPU code.
12824 2009-06-24  Anatoly Sokolov  <aesok@post.ru>
12826         * defaults.h (CAN_ELIMINATE): Provide default.
12827         * doc/tm.texi (CAN_ELIMINATE): Revise documentation.
12828         * config/alpha/alpha.h (CAN_ELIMINATE): Delete.
12829         * config/m32c/m32c.h (CAN_ELIMINATE): Delete.
12830         * config/spu/spu.h (CAN_ELIMINATE): Delete.
12831         * config/xtensa/xtensa.h (CAN_ELIMINATE): Delete.
12832         * config/moxie/moxie.h (CAN_ELIMINATE): Delete.
12833         * config/cris/cris.h (CAN_ELIMINATE): Delete.
12834         * config/mn10300/mn10300.h (CAN_ELIMINATE): Delete.
12835         * config/pa/pa64-linux.h (CAN_ELIMINATE): Delete.
12836         * config/mmix/mmix.h (CAN_ELIMINATE): Delete.
12838 2009-06-24  DJ Delorie  <dj@redhat.com>
12840         * mep-ext-cop.cpu: Fix copyright notice.
12841         * mep-default: Fix copyright notice.
12842         * mep-core: Fix copyright notice.
12843         * mep: Fix copyright notice.
12844         * mep-ivc2: Fix copyright notice.
12845         * mep-c5: Fix copyright notice.
12847 2009-06-24  Denis Chertykov  <chertykov@gmail.com>
12849         * doc/contrib.texi (Contributors):
12851 2009-06-24  Andreas Krebbel  <krebbel1@de.ibm.com>
12853         PR middle-end/40501
12854         * tree-ssa-math-opts.c (execute_optimize_bswap): Convert the bswap
12855         src and dst operands if necessary.
12857 2009-06-23  DJ Delorie  <dj@redhat.com>
12859         Add MeP port.
12860         * config.gcc: Add mep support.
12861         * recog.c: Resurrect validate_replace_rtx_subexp().
12862         * recog.h: Likewise.
12863         * config/mep/: Add new port:
12864         * config/mep/constraints.md: New file.
12865         * config/mep/default.h: New file.
12866         * config/mep/intrinsics.h: New file.
12867         * config/mep/intrinsics.md: New file.
12868         * config/mep/ivc2-template.h: New file.
12869         * config/mep/mep-c5.cpu: New file.
12870         * config/mep/mep-core.cpu: New file.
12871         * config/mep/mep-default.cpu: New file.
12872         * config/mep/mep-ext-cop.cpu: New file.
12873         * config/mep/mep-intrin.h: New file.
12874         * config/mep/mep-ivc2.cpu: New file.
12875         * config/mep/mep-lib1.asm: New file.
12876         * config/mep/mep-lib2.c: New file.
12877         * config/mep/mep-pragma.c: New file.
12878         * config/mep/mep-protos.h: New file.
12879         * config/mep/mep-tramp.c: New file.
12880         * config/mep/mep.c: New file.
12881         * config/mep/mep.cpu: New file.
12882         * config/mep/mep.h: New file.
12883         * config/mep/mep.md: New file.
12884         * config/mep/mep.opt: New file.
12885         * config/mep/predicates.md: New file.
12886         * config/mep/t-mep: New file.
12888 2009-06-23  Ian Lance Taylor  <iant@google.com>
12890         * configure.ac: Invoke AC_PROG_CXX.  Separate C specific warnings
12891         from loose_warn into c_loose_warn and from strict_warn into
12892         c_strict_warn.  Set and substitute warn_cxxflags.  Check for
12893         --enable-build-with-cxx.  Set and substitute
12894         ENABLE_BUILD_WITH_CXX.  Set and substitute HOST_LIBS.
12895         * Makefile.in (CXXFLAGS): New variable.
12896         (C_LOOSE_WARN, C_STRICT_WARN): New variables.
12897         (GCC_WARN_CFLAGS): Add $(C_LOOSE_WARN).  Add $(C_STRICT_WARN) if
12898         the default is the same as $(STRICT_WARN).
12899         (GCC_WARN_CXXFLAGS, WARN_CXXFLAGS): New variables.
12900         (CXX): New variable.
12901         (COMPILER): New value if ENABLE_BUILD_WITH_CXX.
12902         (COMPILER_FLAGS, LINKER, LINKER_FLAGS): Likewise.
12903         (ALL_COMPILERFLAGS, ALL_LINKERFLAGS): Likewise.
12904         (HOST_LIBS): New variable.
12905         (GCC_CFLAGS): Add $(C_LOOSE_WARN).
12906         (ALL_CXXFLAGS): New variable.
12907         (LIBS, BACKENDLIBS): Add $(HOST_LIBS).
12908         * doc/install.texi (Configuration): Document
12909         --enable-build-with-cxx, --with-stage1-ldflags,
12910         --with-stage1-libs, --with-boot-ldflags, --with-boot-libs.
12911         * configure: Rebuild.
12913 2009-06-24  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
12915         * config/arm/arm.c (arm_override_options): Fix braces and formatting
12916         from previous commit.
12918 2009-06-23  Ian Lance Taylor  <iant@google.com>
12920         * Makefile.in ($(out_object_file)): Depend upon $(DF_H).
12922 2009-06-23  Ian Lance Taylor  <iant@google.com>
12924         * reload.c (alternative_allows_const_pool_ref): Mark mem parameter
12925         with ATTRIBUTE_UNUSED.
12927 2009-06-23  Michael Meissner  <meissner@linux.vnet.ibm.com>
12928             Pat Haugen  <pthaugen@us.ibm.com>
12929             Revital Eres  <eres@il.ibm.com>
12931         * config.in (HAVE_AS_POPCNTD): Add default definition.
12932         (HAVE_AS_LWSYNC): Ditto.
12934         * configure.ac (gcc_cv_as_powerpc_mfpgpr): Provide real binutils
12935         release number.
12936         (gcc_cv_as_powerpc_cmpb): Ditto.
12937         (gcc_cv_as_powerpc_dfp): Ditto.
12938         (gcc_cv_as_powerpc_vsx): Ditto.
12939         (gcc_cv_as_powerpc_popcntd): Add feature test for assembler
12940         supporting the popcntd/lwsync instructions.
12941         (gcc_cv_as_powerpc_lwsync): Ditto.
12942         * configure: Regenerate.
12944         * config/rs6000/aix53.h (ASM_CPU_SPEC): Add support for
12945         -mcpu=native and -mcpu=power7.
12946         * config/rs6000/aix61.h (ASM_CPU_SPEC): Ditto.
12948         * config/rs6000/linux64.opt (-mprofile-kernel): Move switch to be
12949         a variable instead of a mask to reduce the number of mask bits.
12950         * config/rs6000/sysv4.opt (-mbit-align): Ditto.
12951         (-mbit-word): Ditto.
12952         (-mregnames): Ditto.
12953         * config/rs6000/rs6000.opt (-mupdate): Ditto.
12954         (-mfused-madd): Ditto.
12956         * config/rs6000/rs6000.opt (-mpopcntd): New switch for non-VSX ISA
12957         2.06 instructions.
12958         (-mvsx): New switch for VSX instructions.
12959         (-misel): Move from a variable to a mask to allow it to be set by
12960         -mcpu=.
12962         * config/rs6000/rs6000-protos.h (rs6000_hard_regno_nregs): Change
12963         function declaration to an array declaration.
12964         (rs6000_hard_regno_nregs): New external array declaration.
12966         * config/rs6000/t-rs6000 (MD_INCLUDES): Define, add all of the .md
12967         files included by rs6000.md.
12969         * config/rs6000/linux64.h (SUBSUBTARGET_OVERRIDE_OPTIONS): Use
12970         SET_PROFILE_KERNEL macro to reset the -mprofile-kernel switch.
12972         * config/rs6000/rs6000.c (rs6000_isel): Delete, -misel moved to be
12973         a target mask.
12974         (rs6000_debug_reg): New -mdebug= variables.
12975         (rs6000_debug_addr): Ditto.
12976         (rs6000_debug_cost): Ditto.
12977         (rs6000_pmode): New variable to hold Pmode.
12978         (rs6000_pointer_size): New variable to hold POINTER_SIZE.
12979         (rs6000_class_max_nregs): New array to hold CLASS_MAX_NREGS
12980         calculated at compiler start.
12981         (rs6000_hard_regno_nregs): Change function to an array which holds
12982         HARD_REGNO_NREGS calculated at compiler start.
12983         (rs6000_explicit_options): Delete isel field.
12984         (rs6000_vector_unit): New array to hold which vector unit
12985         supports arithmetic options for a given type.
12986         (rs6000_vector_mem): New array to hold which vector unit supports
12987         memory reference operations for a given type.
12988         (rs6000_vector_align): New array to given the alignment of each
12989         vector type.
12990         (power7_cost): New basic costs for power7.
12991         (SET_PROFILE_KERNEL): New macro for resetting -mprofile-kernel.
12992         (rs6000_hard_regno_nregs_internal): New function, moved from
12993         HARD_REGNO_NREGS, to calculate the number of registers each hard
12994         register takes for each type.
12995         (rs6000_debug_reg_print): New function for -mdebug=reg support.
12996         (rs6000_debug_vector_unit): New array, map rs6000_vector to string.
12997         (+rs6000_init_hard_regno_mode_ok): New function, move calculation
12998         of HARD_REGNO_NREGS, CLASS_MAX_NREGS, REGNO_REG_CLASS, and vector
12999         unit information here so it is calculated once at compiler startup
13000         time.
13001         (rs6000_override_options): Make -misel a target mask.  Add more
13002         power7 target masks.  Setup Pmode and POINTER_SIZE.  Add initial
13003         VSX support.  Add support for -mdebug=reg, -mdebug=addr, and
13004         -mdebug=cost.
13005         (POWERPC_MASKS): Add MASK_POPCNTD, MASK_VSX, and MASK_ISEL.
13006         (rs6000_handle_option): Move -misel from variable to target mask.
13007         (rs6000_builtin_mask_for_load): Add VSX support.
13008         (rs6000_conditional_register_usage): Ditto.
13009         (USE_ALTIVEC_FOR_ARG_P): Ditto.
13010         (function_arg_boundary): Ditto.
13011         (rs6000_expand_builtin): Ditto.
13012         (def_builtin): Make abort message a little friendlier.
13013         (rs6000_emit_int_cmove): Add support for 64-bit isel.
13015         * config/rs6000/rs6000.h (ASM_CPU_POWER7_SPEC): Depend on the
13016         assembler support the popcntd instruction instead of a vsx
13017         instruction to enable power7 support.
13018         (ASM_CPU_SPEC): Add support for -mcpu=native and -mcpu=power7.
13019         (EXTRA_SPECS): Add ASM_CPU_NATIVE_SPEC to allow passing the right
13020         option to the assembler if -mcpu=native.
13021         (ASM_CPU_NATIVE_SPEC): Ditto.
13022         (TARGET_POPCNTD): If assembler doesn't support popcntd, turn off
13023         ISA 2.06 features.
13024         (TARGET_LWSYNC_INSTRUCTION): Define whether it is safe to issue
13025         the lwsync instruction.
13026         (enum processor_type): Add PROCESSOR_POWER7.
13027         (rs6000_debug_reg): New -mdebug= options.
13028         (rs6000_debug_addr): Ditto.
13029         (rs6000_debug_cost): Ditto.
13030         (rs6000_isel): Delete.
13031         (enum rs6000_vector): New enum to say what vector unit we have.
13032         (VECTOR_UNIT_*): New macros to say which vector unit has
13033         arithmetic operations for a given type.
13034         (VECTOR_MEM_*): New macros to say which vector unit has memory
13035         operations for a given type.
13036         (TARGET_LDBRX): Whether the machine supports the ldbrx
13037         instruction.
13038         (TARGET_ISEL): Delete, -misel moved to be a mask.
13039         (TARGET_ISEL64): New macro for 64-bit isel support.
13040         (UNITS_PER_VSX_WORD): New macro.
13041         (POINTER_SIZE): Move to be an external variable, rather than
13042         calculating whether we are generating 32 ot 64-bit code.
13043         (Pmode): Ditto.
13044         (STACK_BOUNDARY): Add VSX support.
13045         (LOCAL_ALIGNMENT): Ditto.
13046         (SLOW_UNALIGNED_ACCESS): Ditto.
13047         (VSX_REGNO_P): New macro for VSX support.
13048         (VFLOAT_REGNO_P): Ditto.
13049         (VINT_REGNO_P): Ditto.
13050         (VLOGICAL_REGNO_P): Ditto.
13051         (VSX_VECTOR_MODE): Ditto.
13052         (VSX_SCALAR_MODE): Ditto.
13053         (VSX_MODE): Ditto.
13054         (VSX_MOVE_MODE): Ditto.
13055         (VSX_REG_CLASS_P): Ditto.
13056         (HARD_REGNO_NREGS): Instead of calling a function, use an array
13057         lookup.
13058         (UNITS_PER_SIMD_WORD): Add VSX support.
13059         (MODES_TIEABLE_P): Ditto.
13060         (STARTING_FRAME_OFFSET): Ditto.
13061         (STACK_DYNAMIC_OFFSET): Ditto.
13062         (EPILOGUE_USES): Ditto.
13063         (REGNO_REG_CLASS): Move to array lookup.
13064         (CLASS_MAX_NREGS): Ditto.
13065         (rs6000_vector_reg_class): Add declaration.
13066         (ADDITIONAL_REGISTER_NAMES): Add VSX names for the registers that
13067         overlap with the floating point and Altivec registers.
13069         * config/rs6000/e500.h (CHECK_E500_OPTIONS): Disallow -mvsx.
13071         * config/rs6000/driver-rs6000.c (asm_names): New static array to
13072         give the appropriate asm switches if -mcpu=native.
13073         (host_detect_local_cpu): Add support for "asm".
13074         (host_detect_local_cpu): Follow GNU code guidelines for name.
13076         * config/rs6000/sysv4.h (SUBTARGET_OVERRIDE_OPTIONS): Move
13077         -mbit-word to a variable instead of being a target mask.
13079         * config/rs6000/sync.md (lwsync): If the assembler supports it,
13080         emit the lwsync instruction instead of emitting the instruction as
13081         an integer constant.
13083         * config/rs6000/spe.md (spe_fixuns_truncdfsi2): Rename from
13084         fixuns_trundfsi2, move expander into rs6000.md.
13086         * config/rs6000/rs6000.md (cpu): Add power7.
13087         (sel, *ptrsize): New mode attributes for 32/64-bit isel.
13088         (logical predicate patterns): Change the single instruction
13089         primitives that set CR0 to be fast_compare instead of compare.
13090         (norsi*): Ditto.
13091         (popcntwsi2): Add support for ISA 2.06 popcount instructions.
13092         (popcntddi2): Ditto.
13093         (popcount<mode>): Ditto.
13094         (floating multiply/add insns): Name the floating point
13095         multiply/add insns.
13096         (isel_signed_<mode>): Add support for -misel on 64-bit systems.
13097         (isel_unsigned_<mode>): Ditto.
13098         (fixuns_trundfsi2): Move expander here from spe.md.
13099         (smindi3): Define if we have -misel on 64-bit systems.
13100         (smaxdi3): Ditto.
13101         (umindi3): Ditto.
13102         (umaxdi3): Ditto.
13104 2009-06-23  Anatoly Sokolov  <aesok@post.ru>
13106         * config.gcc (avr-*-rtems*, avr-*-*): Set extra_gcc_objs and
13107         extra_objs.
13108         * config/avr/avr.c (avr_current_device): New variable.
13109         (avr_arch_types, avr_mcu_types): Move to avr-deveces.c.
13110         (avr_arch, mcu_type_s): Move to avr.h.
13111         * config/avr/avr.h (base_arch_s). Add reserved2, arch_name and
13112         default_data_section_start fields.
13113         (avr_arch): Moved from avr.c.
13114         (mcu_type_s): Moved from avr.c. Add short_sp, data_section_start and
13115         library_name fields.
13116         (avr_current_device, avr_mcu_types, avr_arch_types,
13117         avr_device_to_arch, avr_device_to_data_start,
13118         avr_device_to_startfiles, avr_device_to_devicelib): Declare.
13119         (EXTRA_SPEC_FUNCTIONS): Define.
13120         (LINK_SPEC): Remove device name to '-m ...' and '-Tdata ...' linker
13121         options mapping. Use device_to_arch and device_to_data_start insted.
13122         (STARTFILE_SPEC): Use device_to_startfile instead of crt_binutils.
13123         (CRT_BINUTILS_SPECS, EXTRA_SPECS): Remove.
13124         * config/avr/t-avr (driver-avr.o, avr-devices.o): New rules.
13125         * config/avr/driver-avr.c: New file.
13126         * config/avr/avr-devices.c: New file.
13128 2009-06-23  Jakub Jelinek  <jakub@redhat.com>
13130         * var-tracking.c (unshare_variable): Force initialized to
13131         be VAR_INIT_STATUS_INITIALIZED unless flag_var_tracking_uninit.
13132         (set_variable_part): Likewise.
13133         (struct variable_union_info): Remove pos_src field.
13134         (vui_vec, vui_allocated): New variables.
13135         (variable_union): Pass VAR_INIT_STATUS_UNKNOWN to unshare_variable
13136         unconditionally.  Avoid XCVECNEW/free for every sorting, for dst_l
13137         == 1 use a simpler sorting algorithm.  Compute pos field right
13138         away, don't fill in pos_src.  For dst_l == 2 avoid qsort.
13139         Avoid quadratic comparison if !flag_var_tracking_uninit.
13140         (variable_canonicalize): Pass VAR_INIT_STATUS_UNKNOWN to
13141         unshare_variable unconditionally.
13142         (dataflow_set_different_2): Removed.
13143         (dataflow_set_different): Don't traverse second hash table.
13144         (compute_bb_dataflow): Pass VAR_INIT_STATUS_UNINITIALIZED
13145         unconditionally to var_reg_set or var_mem_set.
13146         (emit_notes_in_bb): Likewise.
13147         (delete_variable_part): Pass VAR_INIT_STATUS_UNKNOWN to
13148         unshare_variable.
13149         (emit_note_insn_var_location): Don't set initialized to
13150         VAR_INIT_STATUS_INITIALIZED early.
13151         (vt_finalize): Free vui_vec if needed, clear vui_vec and
13152         vui_allocated.
13153         * rtl.c (rtx_equal_p): Don't implement on top of rtx_equal_p_cb.
13155         * tree-object-size.c (addr_object_size): Instead of checking
13156         for non-NULL TREE_CHAIN of the FIELD_DECL check that there
13157         are no FIELD_DECLs following it.
13159 2009-06-23  Andreas Krebbel  <krebbel1@de.ibm.com>
13161         * tree-ssa-math-opts.c (find_bswap): Increase the search depth in
13162         order to match bswaps with signed source operands.
13164 2009-06-23  Rainer Orth  <ro@TechFak.Uni-Bielefeld.DE>
13166         * sdbout.c (sdbout_one_type): Fix braces in switch.
13168 2009-06-23  Richard Guenther  <rguenther@suse.de>
13170         * tree-ssa-structalias.c (struct variable_info): Add is_global_var
13171         member.
13172         (var_anything, anything_tree, var_nothing, nothing_tree, var_readonly,
13173         readonly_tree, var_escaped, escaped_tree, var_nonlocal, nonlocal_tree,
13174         var_callused, callused_tree, var_storedanything, storedanything_tree,
13175         var_integer, integer_tree): Remove global variables.
13176         (new_var_info): Do not pass new id, append the new var to the
13177         global variable vector.
13178         (do_ds_constraint): Use is_global_var member of the variable-info.
13179         (new_scalar_tmp_constraint_exp): Adjust.
13180         (create_function_info_for): Likewise.
13181         (create_variable_info_for): Likewise.
13182         (find_what_var_points_to): Remove dead code.
13183         (init_base_vars): Simplify.
13184         (compute_points_to_sets): Adjust.
13186 2009-06-22  Adam Nemet  <anemet@caviumnetworks.com>
13188         * combine.c (try_combine): Dump information about the insns we're
13189         combining.
13191 2009-06-22  Adam Nemet  <anemet@caviumnetworks.com>
13193         * combine.c (combine_simplify_rtx): Remove TRULY_NOOP_TRUNCATION
13194         check when calling force_to_mode on TRUNCATE's operand.
13196 2009-06-22  Ian Lance Taylor  <iant@google.com>
13198         * config/rs6000/rs6000.opt: Move msched-epilog before msched-prolog.
13200 2009-06-22  Steven Bosscher  <steven@gcc.gnu.org>
13202         * config/arm/arm.md (prologue_use): Set length of fake insn to 0.
13204 2009-06-22  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
13206         * doc/invoke.texi (Link Options): -nodefaultlibs and -nostdlib
13207         override library linkage flags such as -static-libgcc or
13208         -shared-libgcc.
13210 2009-06-22  Maxim Kuvyrkov  <maxim@codesourcery.com>
13212         * config/m68k/m68k-devices.def: Add line for MCF5221x.
13214 2009-06-22  Ian Lance Taylor  <iant@google.com>
13216         * config/linux.opt: Put mglibc ahead of muclibc.
13218         * c-decl.c (diagnose_mismatched_decls): Add -Wc++-compat warning
13219         for duplicate decls.
13221 2009-06-22  Matthias Klose  <doko@ubuntu.com>
13223         * Makefile.in (install-plugin): Remove extra `/' after $(DESTDIR).
13225 2009-06-22  Steven Bosscher  <steven@gcc.gnu.org>
13227         PR objc/28050
13228         * c-parser.c (c_parser_objc_message_args): Return error_mark_node
13229         instead of NULL if a parser error occurs.
13231 2009-06-22  Rainer Orth  <ro@TechFak.Uni-Bielefeld.DE>
13233         * dwarf2out.c (dwarf2_debug_hooks): Initialize
13234         non-DWARF2_DEBUGGING_INFO version.
13236 2009-06-22  Kai Tietz  <kai.tietz@onevision.com>
13238         * config.gcc (i[34567]86-*-mingw*, x86_64-*-mingw*): Add
13239         i386/t-fprules-softfp and soft-fp/t-softfp to tmake_file.
13241         * config/i386/mingw32.h (LIBGCC2_HAS_TF_MODE): Define.
13242         (LIBGCC2_TF_CEXT): Define.
13243         (TF_SIZE): Define.
13245 2009-06-22  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
13247         PR target/40463
13248         * config/arm/linux-eabi.h (CLEAR_INSN_CACHE): Fix definition.
13250 2009-06-22  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
13252         * config/arm/arm.c (arm_override_options): Disable
13253         -mcaller-super-interworking and -mcallee-super-interworking.
13254         * doc/invoke.texi (ARM Options): Document this.
13256 2009-06-22  Nathan Sidwell  <nathan@codesourcery.com>
13258         * config/arm/arm.c (arm_print_operand): Deal with HIGH.
13259         * config/arm/constraints.md (j): New constraint for movw operands.
13260         (N): Remove thumb2 meaning.
13261         * config/arm/arm.md (*arm_movw): Delete.
13262         (*arm_movsi_insn): Use j constraint for movw instead of N constraint.
13263         * config/arm/vfp.md (*arm_movsi_vfp, *thumb2_movsi_vfp): Likewise.
13264         * config/arm/thumb2.md (*thumb2_movsi_insn): Likewise.
13266 2009-06-22  Martin Jambor  <mjambor@suse.cz>
13268         PR tree-optimization/40492
13269         * tree-sra.c (sra_modify_assign): Pass zero offsets to
13270         build_ref_for_offset.
13272 2009-06-22  Shujing Zhao  <pearly.zhao@oracle.com>
13274         * alias.c: Use REG_P, MEM_P, CONST_INT_P, LABEL_P, CALL_P, NOTE_P and
13275         JUMP_TABLE_DATA_P predicates where applicable.
13276         * auto-inc-dec.c: Ditto.
13277         * builtins.c: Ditto.
13278         * caller-save.c: Ditto.
13279         * calls.c: Ditto.
13280         * cfgcleanup.c: Ditto.
13281         * cfglayout.c: Ditto.
13282         * cfgrtl.c: Ditto.
13283         * combine.c: Ditto.
13284         * combine-stack-adj.c: Ditto.
13285         * cse.c: Ditto.
13286         * cselib.c: Ditto.
13287         * dbxout.c: Ditto.
13288         * df-scan.c: Ditto.
13289         * dse.c: Ditto.
13290         * dwarf2asm.c: Ditto.
13291         * dwarf2out.c: Ditto.
13292         * emit-rtl.c: Ditto.
13293         * except.c: Ditto.
13294         * explow.c: Ditto.
13295         * expmed.c: Ditto.
13296         * expr.c: Ditto.
13297         * final.c: Ditto.
13298         * function.c: Ditto.
13299         * fwprop.c: Ditto.
13300         * gcse.c: Ditto.
13301         * genpreds.c: Ditto.
13302         * genrecog.c: Ditto.
13303         * ifcvt.c: Ditto.
13304         * ira-costs.c: Ditto.
13305         * ira-lives.c: Ditto.
13306         * jump.c: Ditto.
13307         * loop-iv.c: Ditto.
13308         * lower-subreg.c: Ditto.
13309         * modulo-sched.c: Ditto.
13310         * optabs.c: Ditto.
13311         * postreload.c: Ditto.
13312         * print-rtl.c: Ditto.
13313         * recog.c: Ditto.
13314         * reginfo.c: Ditto.
13315         * regmove.c: Ditto.
13316         * reload1.c: Ditto.
13317         * reload.c: Ditto.
13318         * reorg.c: Ditto.
13319         * rtlanal.c: Ditto.
13320         * rtl.c: Ditto.
13321         * sched-vis.c: Ditto.
13322         * sdbout.c: Ditto.
13323         * sel-sched-ir.c: Ditto.
13324         * simplify-rtx.c: Ditto.
13325         * targhooks.c: Ditto.
13326         * var-tracking.c: Ditto.
13327         * vmsdbgout.c: Ditto.
13329 2009-06-22  Matthias Klose  <doko@ubuntu.com>
13331         * Makefile.in (install-plugin): Always use DESTDIR.
13333 2009-06-22  Olivier Hainque  <hainque@adacore.com>
13335         * config/pa/pa.c (output_call): Don't optimize post call jumps
13336         into return address adjustments if the call may throw.
13338 2009-06-21  Richard Earnshaw  <rearnsha@arm.com>
13340         * arm.c (thumb1_output_casesi): New function.
13341         * arm.h (CASE_VECTOR_PC_RELATIVE): Thumb-1 code is also relative if
13342         optimizing for size or PIC.
13343         (CASE_VECTOR_SHORTEN_MODE): Handle thumb-1.
13344         * arm.md (UNSPEC_THUMB1_CASESI): New constant.
13345         (casesi): Handle Thumb-1 when optimizing for size or PIC.
13346         (thumb1_casesi_internal_pic): New expand rule.
13347         (thumb1_casesi_dispatch): New pattern.
13348         * aout.h (ASM_OUTPUT_ADDR_DIFF_ELT): Use shortened vectors for
13349         thumb-1 mode.
13350         * coff.h (JUMP_TABLES_IN_TEXT_SECTION): Thumb-1 jump tables are now
13351         in the text seciton when PIC or optimizing for size.
13352         * elf.h (JUMP_TABLES_IN_TEXT_SECTION): Likewise.
13353         * lib1funcs.asm ([__ARM_EABI__]): Add an attribute describing stack
13354         preservation properties of code.
13355         (__gnu_thumb1_case_sqi, __gnu_thumb1_case_uqi): New functions.
13356         (__gnu_thumb1_case_shi, __gnu_thumb1_case_uhi): New functions.
13357         (__gnu_thumb1_case_si): New function.
13358         * t-arm (LIB1ASMSRC): Define here.
13359         (LIB1ASMFUNCS): Add some common functions.
13360         * t-arm-elf (LIB1ASMSRC): Delete.
13361         (LIB1ASMFUNCS): Append to existing set.
13362         * t-pe (LIB1ASMSRC, LIB1ASMFUNCS): Likewise.
13363         * t-strongarm-elf (LIB1ASMSRC, LIB1ASMFUNCS): Likewise.
13364         * t-symbian (LIB1ASMFUNCS): Likewise.
13365         * t-vxworks (LIB1ASMSRC, LIB1ASMFUNCS): Likewise.
13366         * t-wince-pe (LIB1ASMSRC, LIB1ASMFUNCS): Likewise.
13368 2009-06-21  Richard Guenther  <rguenther@suse.de>
13370         PR tree-optimization/38729
13371         * tree-ssa-loop-niter.c (find_loop_niter_by_eval): Restrict
13372         to loops with a single exit if -fno-expensive-optimizations.
13374 2009-06-21  Jakub Jelinek  <jakub@redhat.com>
13376         * var-tracking.c (struct shared_hash_def, shared_hash): New types.
13377         (dataflow_set): Change vars type from htab_t to shared_hash.
13378         (shared_hash_pool, empty_shared_hash): New variables.
13379         (vars_clear): Removed.
13380         (shared_hash_shared, shared_hash_htab, shared_hash_copy,
13381         shared_hash_find_slot_unshare, shared_hash_find_slot,
13382         shared_hash_find_slot_noinsert, shared_hash_find): New
13383         static inlines.
13384         (shared_hash_unshare, shared_hash_destroy): New functions.
13385         (unshare_variable): Unshare set->vars if shared, use
13386         shared_hash_htab.
13387         (vars_copy): Use htab_traverse_noresize instead of htab_traverse.
13388         (get_init_value, find_src_set_src, dump_dataflow_set,
13389         clobber_variable_part, emit_notes_for_differences): Use
13390         shared_hash_htab.
13391         (dataflow_set_init): Remove second argument, set vars to
13392         empty_shared_hash instead of creating a new htab.
13393         (dataflow_set_clear): Call shared_hash_destroy and set vars
13394         to empty_shared_hash instead of calling vars_clear.
13395         (dataflow_set_copy): Don't call vars_copy, instead just share
13396         the src htab with dst.
13397         (variable_union): Use shared_hash_*, use initially NO_INSERT
13398         lookup if set->vars is shared.  Don't keep slot cleared before
13399         calling unshare_variable.  Unshare set->vars if needed.
13400         Even ->refcount == 1 vars must be unshared if set->vars is shared
13401         and var needs to be modified.
13402         (variable_canonicalize): New function.
13403         (dataflow_set_union): If dst->vars is empty, just share src->vars
13404         with dst->vars and traverse with variable_canonicalize to canonicalize
13405         and unshare what is needed.
13406         (dataflow_set_different): If old_set and new_set use the same shared
13407         htab, they aren't different.  If number of htab elements is different,
13408         htabs are different.  Use shared_hash_*.
13409         (dataflow_set_destroy): Call shared_hash_destroy instead of
13410         htab_delete.
13411         (compute_bb_dataflow, emit_notes_in_bb, vt_emit_notes): Don't pass
13412         second argument to dataflow_set_init.
13413         (vt_initialize): Likewise.  Initialize shared_hash_pool and
13414         empty_shared_hash, move bb in/out initialization afterwards.
13415         Use variable_htab_free instead of NULL as changed_variables del hook.
13416         (variable_was_changed): Change type of second argument to pointer to
13417         dataflow_set.  When inserting var into changed_variables, bump
13418         refcount.  Unshare set->vars if set is shared htab and slot needs to
13419         be cleared.
13420         (set_variable_part): Use shared_hash_*, use initially NO_INSERT
13421         lookup if set->vars is shared.  Unshare set->vars if needed.
13422         Even ->refcount == 1 vars must be unshared if set->vars is shared
13423         and var needs to be modified.  Adjust variable_was_changed caller.
13424         (delete_variable_part): Use shared_hash_*.  Even ->refcount == 1
13425         vars must be unshared if set->vars is shared and var needs to be
13426         modified.  Adjust variable_was_changed caller.
13427         (emit_note_insn_var_location): Don't pool_free var.
13428         (emit_notes_for_differences_1): Initialize empty_var->refcount to 0
13429         instead of 1.
13430         (vt_finalize): Call htab_delete on empty_shared_hash->htab and
13431         free_alloc_pool on shared_hash_pool.
13433 2009-06-20  Anthony Green  <green@moxielogic.com>
13435         * config/moxie/sfp-machine.h (__gcc_CMPtype, CMPtype): Define.
13436         * config/moxie/moxie.h (LOAD_EXTEND_OP): Define.
13438 2009-06-20  Richard Guenther  <rguenther@suse.de>
13440         * tree-ssa-structalias.c (find_func_aliases): For memset use
13441         a constraint from NULL if we memset to zero.
13442         * tree-ssa-alias.c (ref_maybe_used_by_call_p_1): Add builtins
13443         we explicitly handle that do not read from memory.
13444         (call_may_clobber_ref_p_1): Properly handle builtins that may
13445         set errno.
13447 2009-06-20  Richard Guenther  <rguenther@suse.de>
13449         PR tree-optimization/40495
13450         * tree-ssa-structalias.c (get_constraint_exp_for_temp): Remove.
13451         (new_scalar_tmp_constraint_exp): New function.
13452         (process_constraint): Do not create temporary decls.
13453         (process_all_all_constraints): Likewise.
13454         (handle_const_call): Likewise.
13455         (create_function_info_for): Do not set decl.
13457 2009-06-19  Ian Lance Taylor  <iant@google.com>
13459         * config/rs6000/rs6000.c (rs6000_explicit_options): Make static.
13460         (rs6000_attribute_table): Make static; move before use.
13462 2009-06-19  Eric Botcazou  <ebotcazou@adacore.com>
13464         * tree.c (substitute_in_expr) <COMPONENT_REF>: Tweak and reformat.
13465         <tcc_vl_exp>: Call process_call_operands on the new CALL_EXPR.
13466         Propagate the TREE_READONLY flag without overwriting it.
13467         (substitute_placeholder_in_expr) <tcc_vl_exp>: Likewise.
13468         Propagate the TREE_READONLY flag onto the result.
13469         (process_call_operands): Move around.  Use correct constant value.
13471 2009-06-19  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
13473         PR target/40482
13474         * config/arm/arm.c (thumb_shiftable_const): Truncate val to 32 bits.
13475         * config/arm/arm.md: Likewise.
13477 2009-06-19  Ian Lance Taylor  <iant@google.com>
13479         * tree-cfg.c (gimple_redirect_edge_and_branch): Change ERROR_MARK
13480         to GIMPLE_ERROR_MARK.
13482         * c-typeck.c (build_conditional_expr): Add op1_original_type and
13483         op2_original_type parameters.  Warn about using different enum types.
13484         * c-parser.c (c_parser_conditional_expression): Pass original
13485         types to build_conditional_expr.
13486         * c-tree.h (build_conditional_expr): Update declaration.
13488 2009-06-19  Ian Lance Taylor  <iant@google.com>
13490         * config/i386/i386.c (ix86_function_specific_save): Test that
13491         fields match values, rather than testing the values are in a
13492         certain range.
13494 2009-06-19  Richard Guenther  <rguenther@suse.de>
13496         * tree-ssa-alias.c (ptr_deref_may_alias_decl_p): Handle
13497         ADDR_EXPR pointers.
13498         (ptr_derefs_may_alias_p): Likewise.
13499         (ptr_deref_may_alias_ref_p_1): New function.
13500         (ptr_deref_may_alias_ref_p): Likewise.
13501         (ref_maybe_used_by_call_p_1): Handle builtins that are not
13502         covered by looking at the ESCAPED solution.
13503         (call_may_clobber_ref_p_1): Likewise.
13504         * tree-ssa-structalias.c (get_constraint_for_ptr_offset):
13505         Handle NULL_TREE offset.  Do not produce redundant constraints.
13506         (process_all_all_constraints): New helper function.
13507         (do_structure_copy): Use it.
13508         (handle_lhs_call): Likewise.
13509         (find_func_aliases): Handle some builtins with pointer arguments
13510         and/or return values explicitly.
13512 2009-06-19  Ian Lance Taylor  <iant@google.com>
13514         * varasm.c (const_rtx_hash_1): Remove const qualifier from shift.
13516 2009-06-19  Ian Lance Taylor  <iant@google.com>
13518         * rtl.h (SUBREG_PROMOTED_UNSIGNED_P): Add cast to int.
13520 2009-06-19  Ian Lance Taylor  <iant@google.com>
13522         * ggc-page.c (ggc_pch_write_object): Initialize emptyBytes.
13523         * sdbout.c (sdb_debug_hooks): Initialize non-SDB_DEBUGGING_INFO
13524         version.
13526         * c-decl.c (finish_decl): If -Wc++-compat, warn about
13527         uninitialized const.
13529 2009-06-19  Ian Lance Taylor  <iant@google.com>
13531         * dse.c (struct store_info): Rename bitmap field to bmap.  Change
13532         all uses.
13534         * c-decl.c (in_struct, struct_types): Remove.
13535         (struct c_binding): Add in_struct field.
13536         (c_binding_ptr): Define type, along with VEC.
13537         (struct c_struct_parse_info): Define.
13538         (struct_parse_info): New static variable.
13539         (bind): Initialize in_struct field.
13540         (start_struct): Remove enclosing_in_struct and
13541         enclosing_struct_types parameters.  Add
13542         enclosing_struct_parse_info parameter.  Change all callers.  Set
13543         struct_parse_info rather than in_struct and struct_types.
13544         (grokfield): If -Wc++-compat and there is a symbol binding for the
13545         field name, set the in_struct flag and push it on the
13546         struct_parse_info->fields vector.
13547         (warn_cxx_compat_finish_struct): New static function.
13548         (finish_struct): Remove enclosing_in_struct and
13549         enclosing_struct_types parameters.  Add
13550         enclosing_struct_parse_info parameter.  Change all callers.  Don't
13551         set C_TYPE_DEFINED_IN_STRUCT here.  Call
13552         warn_cxx_compat_finish_struct.  Free struct_parse_info and set to
13553         parameter.  Only push on struct_types if warn_cxx_compat.
13554         (finish_enum): Only push on struct_types if warn_cxx_compat.
13555         (declspecs_add_type): Add loc parameter.  Change all callers.
13556         Change all error calls to error_at.  Pass loc, not input_location,
13557         to pedwarn calls.  Warn if -Wc++-compat and a typedef name is
13558         defined in a struct.  If -Wc++-compat and parsing a struct, record
13559         that a typedef name was used.
13560         * c-parser.c (c_parser_declspecs): Get location to pass to
13561         declspecs_add_type.
13562         (c_parser_struct_or_union_specifier): Update calls to start_struct
13563         and finish_struct.
13564         * c-tree.h (struct c_struct_parse_info): Declare.
13565         (finish_struct, start_struct): Update declarations.
13566         (declspecs_add_type): Update declaration.
13568 2009-06-19  Ian Lance Taylor  <iant@google.com>
13570         * c-decl.c (grokdeclarator): If -Wc++-compat, warn about a global
13571         variable with an anonymous type.
13573 2009-06-19  Uros Bizjak  <ubizjak@gmail.com>
13575         * see.c: Remove for real.
13577 2009-06-19  Uros Bizjak  <ubizjak@gmail.com>
13579         * optabs.h (enum optab_index): Add new OTI_significand.
13580         (significand_optab): Define corresponding macro.
13581         * optabs.c (init_optabs): Initialize significand_optab.
13582         * genopinit.c (optabs): Implement significand_optab using
13583         significand?f2 patterns.
13584         * builtins.c (expand_builtin_mathfn): Handle
13585         BUILT_IN_SIGNIFICAND{,F,L}.
13586         (expand_builtin): Expand BUILT_IN_SIGNIFICAND{,F,L} using
13587         expand_builtin_mathfn if flag_unsafe_math_optimizations is set.
13589         * config/i386/i386.md (significandxf2, significand<mode>2): New
13590         expanders to implement significandf, significand and significandl
13591         built-ins as inline x87 intrinsics.
13593 2009-06-18  Anatoly Sokolov  <aesok@post.ru>
13595         * config/avr/avr.c (avr_override_options): Remove setting value of
13596         PARAM_INLINE_CALL_COST.
13598 2009-06-18  Richard Henderson  <rth@redhat.com>
13600         PR 40488
13601         * tree-pass.h (TDF_ASMNAME): New.
13602         * tree-dump.c (dump_options): Add asmname.
13603         * doc/invoke.texi: Document it.
13605         * tree-pretty-print.c (maybe_dump_asm_name): Merge into...
13606         (dump_decl_name): ...here.
13607         (dump_function_name): New flags arg; mind TDF_ASMNAME.
13608         (dump_generic_node): Update dump_function_name calls.
13609         (print_call_name): New flags arg; update all dump calls.
13610         * diagnostic.h (print_call_name): Update.
13611         * gimple-pretty-print.c (dump_gimple_call): Update.
13613 2009-06-18  H.J. Lu  <hongjiu.lu@intel.com>
13615         PR target/40470
13616         * config/i386/i386.h (CLASS_LIKELY_SPILLED_P): Add SSE_FIRST_REG.
13618 2009-06-18  Diego Novillo  <dnovillo@google.com>
13620         * doc/plugins.texi: Document plugin_is_GPL_compatible.
13621         * plugin.c (str_license): Declare.
13622         (try_init_one_plugin): Assert that the symbol
13623         'plugin_is_GPL_compatible' exists.
13625 2009-06-18  Sergei Dyshel  <sergeid@il.ibm.com>
13627         * see.c: Remove.
13628         * Makefile.in (OBJS-common): Remove see.o.
13629         (see.o): Remove.
13630         * common.opt (fsee): Mark as preserved for backward compatibility.
13631         * opts.c (common_handle_option): Add OPT_fsee to the backward
13632         compatibility section.
13633         * passes.c (init_optimization_passes, pass_see): Remove pass.
13634         * timevar.def (TV_SEE): Remove.
13635         * tree-pass.h (pass_see): Remove declaration.
13636         * doc/invoke.texi (-fsee): Remove documentation.
13638 2009-06-18  Martin Jambor  <mjambor@suse.cz>
13640         * tree-sra.c: Include statistics.h
13641         (sra_stats): New variable.
13642         (sra_initialize): Clear sra_stats.
13643         (create_access_replacement): Increment sra_stats.replacements.
13644         (get_access_replacement): Do not return twice.
13645         (analyze_all_variable_accesses): Increment statistics counter by the
13646         number of scalarized aggregates.
13647         (generate_subtree_copies): Increment sra_stats.subtree_copies.
13648         (sra_modify_expr): Increment sra_stats.exprs.
13649         (load_assign_lhs_subreplacements): Increment sra_stats.subreplacements.
13650         (sra_modify_assign): Increment sra_stats.exprs,
13651         sra_stats.separate_lhs_rhs_handling and sra_stats.deleted.
13652         (perform_intra_sra): Update statistics counters.
13653         * Makefile.in (tree-sra.o): Add statistics.h to dependencies.
13655 2009-06-18  Sandra Loosemore  <sandra@codesourcery.com>
13657         * config/arm/arm.c (TARGET_SCALAR_MODE_SUPPORTED_P): Redefine.
13658         (arm_scalar_mode_supported_p): New function.
13660 2009-06-18  Paul Brook  <paul@codesourcery.com>
13661             Sandra Loosemore  <sandra@codesourcery.com>
13663         * config/arm/sfp-machine.h (_FP_NANFRAC_H, _FP_NANSIGN_H): Define.
13664         (__extendhfsf2, __truncsfhf2): Define.
13665         * config/arm/fp16.c: New file.
13666         * config/arm/t-bpabi (LIB2FUNCS_STATIC_EXTRA): Add fp16.c.
13667         * config/arm/t-symbian (LIB2FUNCS_STATIC_EXTRA):  Add fp16.c.
13669 2009-06-18  Sandra Loosemore  <sandra@codesourcery.com>
13671         * doc/extend.texi (Half-Precision): New section.
13672         * doc/invoke.texi (Option Summary): List -mfp16-format.
13673         (ARM Options): List neon-fp16 as -mfpu value.  Document -mfp16-format.
13674         * config/arm/arm.opt (mfp16-format=): New.
13675         * config/arm/arm.c: Include intl.h.
13676         (TARGET_INVALID_PARAMETER_TYPE): Redefine.
13677         (TARGET_INVALID_RETURN_TYPE): Redefine.
13678         (TARGET_PROMOTED_TYPE): Redefine.
13679         (TARGET_CONVERT_TO_TYPE): Redefine.
13680         (arm_fp16_format): Define.
13681         (all_fpus): Add entry for neon-fp16.
13682         (fp_model_for_fpu): Likewise.
13683         (struct fp16_format): Declare.
13684         (all_fp16_formats): Define.
13685         (arm_init_libfuncs): Add entries for HFmode conversions and arithmetic
13686         functions.
13687         (arm_override_options): Set arm_fp16_format. Call sorry for fp16
13688         and no ldrh.
13689         (arm_legitimate_index_p): Treat HFmode like HImode.
13690         (thumb1_legitimate_address_p): Make it recognize HFmode constants.
13691         (coproc_secondary_reload_class): Special-case HFmode.
13692         (arm_print_operand): Add 'z' specifier for vld1.16/vst1.16.
13693         (arm_hard_regno_mode_ok): Allow HFmode values in VFP registers.
13694         (arm_init_fp16_builtins): New.
13695         (arm_init_builtins): Call it.
13696         (arm_invalid_parameter_type): New.
13697         (arm_invalid_return_type): New.
13698         (arm_promoted_type): New.
13699         (arm_convert_to_type).
13700         (arm_file_start): Deal with neon-fp16 as fpu_name.  Emit tag for fp16
13701         format.
13702         (arm_emit_fp16_const): New function.
13703         (arm_mangle_type): Mangle __fp16 as "Dh".
13704         * config/arm/arm.h (TARGET_VFPD32): Make it know about
13705         FPUTYPE_NEON_FP16.
13706         (TARGET_NEON_FP16): New.
13707         (TARGET_NEON): Make it know about FPUTYPE_NEON_FP16.
13708         (enum fputype): Add FPUTYPE_NEON_FP16.
13709         (enum arm_fp16_format_type): Declare.
13710         (arm_fp16_format): Declare.
13711         (LARGEST_EXPONENT_IS_NORMAL): Define.
13712         * config/arm/arm-protos.h (arm_emit_fp16_const): Declare.
13713         * config/arm/arm-modes.def (HFmode): Define.
13714         * config/arm/vfp.md (*movhf_vfp): New.
13715         (extendhfsf2): New.
13716         (truncsfhf2): New.
13717         * config/arm/arm.md (fpu): Add neon_fp16.
13718         (floatsihf2, floatdihf2): New.
13719         (fix_trunchfsi2, fix_trunchfdi2): New.
13720         (truncdfhf2): New.
13721         (extendhfdf2): New.
13722         (movhf): New.
13723         (*arm32_movhf): New.
13724         (*thumb1_movhf): New.
13725         (consttable_2): Add check for HFmode constants.
13726         (consttable_4): Handle HFmode constants.
13728 2009-06-18  Uros Bizjak  <ubizjak@gmail.com>
13730         * convert.c (convert_to_integer): Convert (int)logb() into ilogb().
13732 2009-06-17  Olivier Hainque  <hainque@adacore.com>
13734         * collect2.c (main): Use CONST_CAST2 to perform char ** to
13735         const char ** conversion in AIX specific section.
13737 2009-06-17  H.J. Lu  <hongjiu.lu@intel.com>
13739         * config/i386/i386.c (ix86_special_builtin_type): Remove
13740         UINT64_FTYPE_PINT.  Add UINT64_FTYPE_PUNSIGNED.
13741         (bdesc_special_args): Updated.
13742         (ix86_init_mmx_sse_builtins): Likewise.
13743         (ix86_expand_special_args_builtin): Likewise.
13745 2009-06-17  Richard Henderson  <rth@redhat.com>
13747         * tree-pretty-print.c (maybe_dump_asm_name): New.
13748         (dump_decl_name): Use it.
13749         (PRINT_FUNCTION_NAME): Merge into...
13750         (dump_function_name): ... here.  Use maybe_dump_asm_name.
13752 2009-06-17  Cary Coutant  <ccoutant@google.com>
13754         * dbxout.c (dbxout_source_line): Add is_stmt parameter.
13755         Change caller.
13756         * debug.c (struct gcc_debug_hooks): Change placeholder for
13757         source_line hook.
13758         (debug_nothing_int_charstar_int): Replaced by...
13759         (debug_nothing_int_charstar_int_bool): ...this.
13760         * debug.h (struct gcc_debug_hooks): Add is_stmt parameter to
13761         source_line prototype.
13762         (debug_nothing_int_charstar_int): Replaced by...
13763         (debug_nothing_int_charstar_int_bool): ...this.
13764         * defaults.h (SUPPORTS_DISCRIMINATOR): New constant.
13765         * dwarf2out.c (dwarf2out_source_line): Add is_stmt parameter.
13766         Output is_stmt operand when necessary.
13767         * final.c (final_scan_insn): Pass is_stmt to source_line debug hook.
13768         (notice_source_line): Add is_stmt parameter.
13769         * sdbout.c (sdbout_source_line): Add is_stmt parameter.
13770         * vmsdbgout.c (vmsdbgout_source_line): Add is_stmt parameter.
13771         Change callers.
13772         * xcoffout.c (xcoffout_source_line): Add is_stmt parameter.
13773         * xcoffout.h (xcoffout_source_line): Add is_stmt parameter.
13775 2009-06-17  Ian Lance Taylor  <iant@google.com>
13777         * expr.c (struct move_by_pieces_d): Rename from move_by_pieces.
13778         Change all uses.
13779         (struct store_by_pieces_d): Rename from store_by_pieces.  Change
13780         call uses.
13782 2009-06-17  Adam Nemet  <anemet@caviumnetworks.com>
13784         * tree.h (STRIP_NOPS, STRIP_SIGN_NOPS,
13785         STRIP_USELESS_TYPE_CONVERSION): Use tree_strip_nop_conversions,
13786         tree_strip_sign_nop_conversions and
13787         tree_ssa_strip_useless_type_conversions rather than stripping
13788         the operations here.
13789         (tree_strip_nop_conversions, tree_strip_sign_nop_conversions):
13790         Declare them.
13791         * gimple.h (tree_ssa_strip_useless_type_conversions): Declare it.
13792         * tree-ssa.c (tree_ssa_strip_useless_type_conversions): New function.
13793         * tree.c (tree_nop_conversion, tree_sign_nop_conversion,
13794         tree_strip_nop_conversions, tree_strip_sign_nop_conversions): New
13795         functions.
13797 2009-06-17  Michael Eager  <eager@eagercon.com>
13799         * config/rs6000/constraints.md (register_constraint "d"): New.
13800         * config/rs6000/dfp.md (movsd_store, extendsddd2, extendsdtd2,
13801         truncddsd2, *negdd2_fpr, *absdd2_fpr, *nabsdd2_fpr,
13802         *movdd_hardfloat32, *movdd_hardfloat64_mfpgpr, *movdd_hardfloat64,
13803         *negtd2_fp, *abstd2_fpr, *nabstd2_fpr, *movtd_internal, extendddtd2,
13804         trunctddd2, adddd3, addtd3, subdd3, subtd3, muldd3, multd3, divdd3,
13805         divtd3, *cmpdd_internal1, *cmptd_internal1, floatditd2, ftruncdd2,
13806         fixdddi2, ftrunctd2, fixtddi2): replace 'f' constraint with 'd'
13807         * config/rs6000/ppu_intrinsics.h (__mffs, __mtfsf, __mtfsfi, __fabs,
13808         __fnabs, __fmadd, __fmsub, __fnmadd, __fnmsub, __fsel, __frsqrte,
13809         __fsqrt, __fmul, __fmuls, __frsp, __fcfid, __fctid, __fctidz, __fctiw,
13810         __fctiwz): Same.
13811         * config/rs6000/rs6000.md (*extendsfdf2_fpr, *truncdfsf2_fpr,
13812         *fseldfsf4, *negdf2_fpr, *absdf2_fpr, *nabsdf2_fpr, *adddf3_fpr,
13813         *subdf3_fpr, *muldf3_fpr, *divdf3_fpr, recipdf3, fred, sqrtdf2,
13814         *fseldfdf4, *fselsfdf4, *floatsidf2_internal, *floatunssidf2_internal,
13815         *fix_truncdfsi2_internal, fix_truncdfsi2_internal_gfxopt,
13816         fix_truncdfsi2_mfpgpr, fctiwz, btruncdf2, ceildf2, floordf2, rounddf2,
13817         stfiwx, floatdidf2, fix_truncdfdi2, floatdisf2_internal1,
13818         *movdf_hardfloat32, *movdf_hardfloat64_mfpgpr, *movdf_hardfloat64,
13819         *movtf_internal, *extenddftf2_internal, trunctfdf2_internal1,
13820         trunctfdf2_internal2, trunctfsf2_fprs, fix_trunc_helper,
13821         *fix_trunctfsi2_internal, negtf2_internal, *movdi_internal32,
13822         *movdi_mfpgpr, *movdi_internal64, *movdf_update1, *movdf_update2,
13823         *cmpdf_internal1, *cmptf_internal1, *cmptf_internal2): Same.
13824         * doc/md.texi: Describe PowerPC 'd' constraint, update 'f' constraint.
13826 2009-06-16  Ian Lance Taylor  <iant@google.com>
13828         * profile.c (total_num_never_executed): Don't define.
13829         (compute_branch_probabilities): Don't count or print
13830         num_never_executed.
13831         (init_branch_prob): Don't set total_num_never_executed.
13832         (end_branch_prob): Don't print total_num_never_executed.
13834 2009-06-17  David Daney  <ddaney@caviumnetworks.com>
13836         * jump.c (cleanup_barriers): Handle case of no insns before a barrier.
13838 2009-06-17  David Edelsohn  <edelsohn@gnu.org>
13840         * config/rs6000/dfp.md (nabsdd2_fpr): Correct mode.
13841         (nabstd2_fpr): Same.
13843 2009-06-17  Steve Ellcey  <sje@cup.hp.com>
13845         * expr.c (expand_assignment): Change complex type check.
13847 2009-06-17  Basile Starynkevitch  <basile@starynkevitch.net>
13849         * doc/plugins.texi (Building GCC plugins): Added new section.
13851 2009-06-17  Ian Lance Taylor  <iant@google.com>
13853         * c-pch.c (get_ident): Don't set size of templ array.
13854         (pch_init): Don't set size of partial_pch array.
13856         * c-typeck.c (digest_init): If -Wc++-compat, warn about using a
13857         string constant to intialize an array whose size is the length of
13858         the string.
13860 2009-06-17  Richard Guenther  <rguenther@suse.de>
13862         PR tree-optimization/40389
13863         * tree-ssa-structalias.c (handle_rhs_call): Restrict NRV case
13864         to addressable types.
13865         * gimple.c (walk_stmt_load_store_addr_ops): Likewise.
13867 2009-06-17  Richard Guenther  <rguenther@suse.de>
13869         PR middle-end/40460
13870         * tree-chrec.h (build_polynomial_chrec): If we cannot determine
13871         if there is no evolution of left in the loop bail out.
13872         * tree-chrec.c (chrec_fold_multiply_poly_poly): CSE one
13873         chrec_fold_multiply.
13875 2009-06-16  J"orn Rennecke  <joern.rennecke@arc.com>
13876             Janis Johnson  <janis187@us.ibm.com>
13878         PR target/39254
13879         * config/rs6000/rs6000.c (rs6000_emit_move): Don't emit a USE
13880         for the symbol ref of a constant that is the source of a move
13881         - nor for any other not-obvious-label-ref constants.
13883 2009-06-16  Olatunji Ruwase  <tjruwase@google.com>
13885         * plugin.c (position_pass): Skip newly inserted pass during list
13886         traversal to avoid repeated insertion.
13888 2009-06-16  Ian Lance Taylor  <iant@google.com>
13890         * vec.h (VEC_stack_alloc): Define different version if
13891         GATHER_STATISTICS is defined, to accept and ignore MEM_STAT.
13892         (DEF_VEC_ALLOC_FUNC_P_STACK): Remove MEM_STAT_DECL.
13893         (DEF_VEC_ALLOC_FUNC_O_STACK): Likewise.
13894         (DEF_VEC_ALLOC_FUNC_I_STACK): Likewise.
13896 2009-06-16  H.J. Lu  <hongjiu.lu@intel.com>
13898         * config.gcc (extra_headers): Add ia32intrin.h for x86.
13900         * config/i386/i386.c (ix86_builtins): Add IX86_BUILTIN_BSRSI,
13901         IX86_BUILTIN_BSRDI.  IX86_BUILTIN_RDPMC, IX86_BUILTIN_RDTSC.
13902         IX86_BUILTIN_RDTSCP.  IX86_BUILTIN_ROLQI, IX86_BUILTIN_ROLHI,
13903         IX86_BUILTIN_RORQI and IX86_BUILTIN_RORHI.
13904         (ix86_special_builtin_type): Add UINT64_FTYPE_VOID,
13905         UINT64_FTYPE_PINT, INT_FTYPE_INT, UINT64_FTYPE_INT,
13906         INT64_FTYPE_INT64, UINT16_FTYPE_UINT16_INT and UINT8_FTYPE_UINT8_INT.
13907         (bdesc_special_args): Add __builtin_ia32_rdtsc and
13908         __builtin_ia32_rdtscp.
13909         (bdesc_args): Add __builtin_ia32_bsrsi, __builtin_ia32_bsrdi,
13910         __builtin_ia32_rolqi, __builtin_ia32_rolhi, __builtin_ia32_rorqi
13911         and __builtin_ia32_rorhi.
13912         (ix86_init_mmx_sse_builtins): Handle UINT64_FTYPE_VOID,
13913         UINT64_FTYPE_PINT, INT_FTYPE_INT, UINT64_FTYPE_INT,
13914         INT64_FTYPE_INT64, UINT16_FTYPE_UINT16_INT and UINT8_FTYPE_UINT8_INT.
13915         (ix86_expand_args_builtin): Likewise.
13916         (ix86_expand_special_args_builtin): Likewise.
13918         * config/i386/i386.md (UNSPECV_RDTSCP): New.
13919         (UNSPECV_RDTSC): Likewise.
13920         (UNSPECV_RDPMC): Likewise.
13921         (*bsr): Renamed to ...
13922         (bsr): This
13923         (*bsr_rex64): Renamed to ...
13924         (bsr_rex64): This.
13925         (rdpmc): New.
13926         (*rdpmc): Likewise.
13927         (*rdpmc_rex64): Likewise.
13928         (rdtsc): Likewise.
13929         (*rdtsc): Likewise.
13930         (*rdtsc_rex64): Likewise.
13931         (rdtscp): Likewise.
13932         (*rdtscp): Likewise.
13933         (*rdtscp_rex64): Likewise.
13935         * config/i386/ia32intrin.h: New.
13937         * config/i386/x86intrin.h: Include <ia32intrin.h>.
13939 2009-06-16  Ian Lance Taylor  <iant@google.com>
13941         * ira-build.c (copy_info_to_removed_store_destinations):
13942         Initialize parent_a.
13944 2009-06-16  Ian Lance Taylor  <iant@google.com>
13946         * c-decl.c (grokdeclarator): Change size_varies to bool.
13948 2009-06-16  Ian Lance Taylor  <iant@google.com>
13950         * sel-sched.c: Make forward declarations of move_op_hooks and
13951         fur_hooks explicitly extern.
13953 2009-06-16  Ian Lance Taylor  <iant@google.com>
13955         * df-problems.c (df_byte_lr_alloc): Don't set problem_data to itself.
13956         * vec.c (vec_gc_o_reserve_1): Don't set alloc to itself.
13958 2009-06-16  Ian Lance Taylor  <iant@google.com>
13960         * resource.c (mark_referenced_resources): Change
13961         include_delayed_effects parameter to bool.  Change all callers.
13962         (mark_end_of_function_resources): Likewise.
13963         * reorg.c (insn_references_resource_p): Likewise.
13964         (insn_sets_resource_p): Likewise.
13965         * resource.h (mark_referenced_resources): Update declaration.
13966         (mark_end_of_function_resources): Update declaration.
13968 2009-06-16  David Edelsohn  <edelsohn@gnu.org>
13970         * config/rs6000/aix.h (LIBSTDCXX_STATIC): Remove -lstdc++.
13972 2009-06-16  David Edelsohn  <edelsohn@gnu.org>
13974         * doc/install.texi (*-*-aix): Update explanation of XLC bootstrap.
13975         GCC can bootstrap on AIX with GNU Binutils 2.20.
13977 2009-06-16  Ian Lance Taylor  <iant@google.com>
13979         * Makefile.in (tree-vect-stmts.o): Depend upon $(TOPLEV_H).
13981 2009-06-16  Ian Lance Taylor  <iant@google.com>
13983         * toplev.h (floor_log2): If GCC_VERSION >= 3004, declare as static
13984         inline, not extern inline.
13985         (exact_log2): Likewise.
13986         * toplev.c (floor_log2): Only define if GCC_VERSION < 3004. Don't
13987         test CLZ_HWI.
13988         (exact_log2): Likewise, but don't test CTZ_HWI.
13990 2009-06-16  Ian Lance Taylor  <iant@google.com>
13992         * bitmap.c (bitmap_clear): Don't declare as inline.
13993         * gimple.c (gimplify_assign): Likewise.
13994         * tree-ssa-sccvn.c (vn_nary_op_compute_hash): Likewise.
13995         * haifa-sched.c (insn_cost): Don't declare with HAIFA_INLINE.
13996         (sched_scan_info): Remove duplicate definition.
13998 2009-06-16  Ian Lance Taylor  <iant@google.com>
14000         * c-common.c (skip_evaluation): Don't define.
14001         (c_inhibit_evaluation_warnings): Define global variable.
14002         (overflow_warning): Check c_inhibit_evaluation_warnings rather
14003         than skip_evaluation.
14004         (convert_and_check, warn_for_div_by_zero): Likewise.
14005         * c-common.h (skip_evaluation): Don't declare.
14006         (c_inhibit_evaluation_warnings): Declare.
14007         * c-parser.c (c_parser_typeof_specifier): Set
14008         c_inhibit_evaluation_warnings rather than skip_evaluation.
14009         (c_parser_conditional_expression): Likewise.
14010         (c_parser_binary_expression): Likewise.
14011         (c_parser_sizeof_expression): Likewise.
14012         (c_parser_alignof_expression): Likewise.
14013         * c-typeck.c (build_indirect_ref): Check
14014         c_inhibit_evaluation_warnings rather than skip_evaluation.
14015         (build_conditional_expr, build_binary_op): Likewise.
14017 2009-06-16  Richard Guenther  <rguenther@suse.de>
14019         * tree-ssa-alias.c (is_escape_site): Remove.
14020         * tree-ssa-alias.h (enum escape_type): Remove.
14021         (is_escape_site): Likewise.
14022         * tree-ssa-structalias.c (find_func_aliases): Handle escapes
14023         via casts and asms without deferring to is_escape_site.
14025 2009-06-16  Jakub Jelinek  <jakub@redhat.com>
14027         PR middle-end/40446
14028         * expr.c (expand_expr_real_1) <case VIEW_CONVERT_EXPR>: Don't
14029         use gen_lowpart if op0 has complex mode.
14031 2009-06-16  Richard Guenther  <rguenther@suse.de>
14033         * tree-ssa-structalias.c (do_ds_constraint): Stores in global
14034         variables add them to ESCAPED.
14035         (find_func_aliases): Do not make all indirectly stored values escaped.
14037 2009-06-16  Rafael Avila de Espindola  <espindola@google.com>
14039         * config/i386/winnt.c (i386_pe_encode_section_info): Update call to
14040         make_decl_one_only.
14042 2009-06-16  Martin Jambor  <mjambor@suse.cz>
14044         PR tree-optimization/40432
14045         * tree-sra.c (sra_modify_assign): When creating VIEW_CONVERT_EXPR,
14046         check whether we need to force gimple register operand.
14048 2009-06-16  Martin Jambor  <mjambor@suse.cz>
14050         PR tree-optimization/40413
14051         * tree-sra.c (load_assign_lhs_subreplacements): Pass offset to
14052         build_ref_for_offset.
14053         (propagate_subacesses_accross_link): Fix a typo in a comment.
14055 2009-06-16  Ira Rosen  <irar@il.ibm.com>
14057         * tree-parloops.c (loop_parallel_p): Call vect_is_simple_reduction
14058         with additional parameter.
14059         * tree-vectorizer.h (enum vect_def_type): Add new value
14060         vect_nested_cycle.
14061         (enum vect_relevant): Add comments.
14062         (vect_is_simple_reduction): Add new argument.
14063         * tree-vect-loop.c (vect_analyze_scalar_cycles_1): Add comments.
14064         Detect nested cycles.
14065         (vect_is_simple_reduction): Update documentation, add an argument to
14066         distinguish inner-loop reduction from nested cycle, detect nested
14067         cycles, fix printings and indentation, don't swap operands in case
14068         of nested cycle.
14069         (get_initial_def_for_reduction): Handle subtraction.
14070         (vect_create_epilog_for_reduction): Add new argument to specify
14071         reduction variable.
14072         (vect_finalize_reduction): Handle subtraction, fix comments.
14073         (vectorizable_reduction): Handle nested cycles. In case of nested
14074         cycle keep track of the reduction variable position. Call
14075         vect_is_simple_reduction with additional parameter. Use original
14076         statement code in reduction epilogue for nested cycle. Call
14077         vect_create_epilog_for_reduction with additional parameter.
14078         * tree-vect-patterns.c (vect_recog_dot_prod_pattern): Assert
14079         inner-loop vectorization.
14080         (vect_recog_widen_sum_pattern): Likewise.
14081         * tree-vect-stmts.c (process_use): Distinguish between nested cycles
14082         and reductions.
14083         (vect_mark_stmts_to_be_vectorized): Likewise.
14084         (vect_get_vec_def_for_operand): Handle nested cycles.
14086 2009-06-16  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
14088         * doc/invoke.texi (Debugging Options): Fix option index entries
14089         for -fdump-statistics, -frandom-seed add entries for
14090         -fdump-tree-original, -fdump-tree-optimized, -frandom-seed.
14091         (FRV Options): Fix entries for -mTLS, -mtls.
14092         (HPPA Options): Fix entries for -mgnu-ld, -mhp-ld.
14093         (i386 and x86-64 Options): Fix entry for -mno-red-zone.
14094         (M68hc1x Options): Fix @itemx for -mnominmax.
14095         (MCore Options): Fix entry for -mno-lsim.
14096         (MMIX Options): Fix entry for -mabi=mmixware.
14097         (PDP-11 Options): Fix entry for -mbcopy-builtin.
14099 2009-06-16  Basile Starynkevitch  <basile@starynkevitch.net>
14101         * doc/plugins.texi (Interacting with the GCC Garbage Collector):
14102         Mention the plugin mode of gengtype.
14103         * doc/gty.texi (Source Files Containing Type Information): Likewise.
14104         * gengtype.c: Updated copyright.
14105         (plugin_files, nb_plugin_files) Added new static variables.
14106         (measure_input_list) Care about plugin_files.
14107         (write_rtx_next): Added early return in plugin mode.
14108         (create_file): Updated copyright year in generated file. Added
14109         asserts.
14110         (oprintf): Added early return if NULL outf.
14111         (get_output_file_with_visibility): Care of plugin_files.
14112         (get_output_file_name): May return null.
14113         (write_local): Added early return.
14114         (put_mangled_filename): Ditto.
14115         (finish_root_table): Added check for base_files.
14116         (write_roots): Care about null when plugins.
14117         (main): Added plugin mode.
14119 2009-06-15  Ian Lance Taylor  <iant@google.com>
14121         * df-problems.c (df_simulate_one_insn_forwards): Fix braces in switch.
14122         * gcov.c (read_count_file): Add braces around variables declared
14123         before label.
14125         * c.opt (Wjump-misses-init): New warning.
14126         * c-opts.c (c_common_handle_option): Set warn_jump_misses_init for
14127         -Wall and -Wc++-compat if not already set.
14128         (c_common_post_options): Clear warn_jump_misses_init if it was not
14129         set.
14130         * c-decl.c (struct c_binding): Change type field to a union with
14131         new label field.  Make it the first field in the struct.  Update
14132         references to type to use u.type instead.
14133         (struct c_spot_bindings): Define.
14134         (struct c_goto_bindings): Define.
14135         (c_goto_bindings_p): Define, along with VECs.
14136         (struct c_label_vars): Define.
14137         (struct c_scope): Add has_label_bindings field.
14138         (bind_label, set_spot_bindings): New static functions.
14139         (decl_jump_unsafe, update_spot_bindings): New static functions.
14140         (update_label_decls): New static function.
14141         (pop_scope): Call update_label_decls.  Don't call c_end_vm_scope.
14142         Update binding u.label field to shadowed field.
14143         (c_binding_start_stmt_expr): New function.
14144         (c_binding_end_stmt_expr): New function.
14145         (pushdecl): Don't call c_begin_vm_scope.
14146         (make_label): Add defining and p_label_vars parameters.  Change
14147         all callers.
14148         (lookup_label): Correct test for whether a label has not yet been
14149         defined.  Call bind_label rather than bind.
14150         (warn_about_goto): New static function.
14151         (lookup_label_for_goto): New function.
14152         (declare_label): Call bind_label rather than bind.
14153         (check_earlier_gotos): New static function.
14154         (define_label): Don't give errors about jumping into statement
14155         expressions or scopes of variably modified types.  Call
14156         set_spot_bindings and check_earlier_gotos.  Call bind_label
14157         instead of bind.  Don't set label_context_stack_se or
14158         label_context_stack_vm.
14159         (c_get_switch_bindings): New function.
14160         (c_release_switch_bindings): New function.
14161         (c_check_switch_jump_warnings): New function.
14162         (start_function): Don't set label_context_stack_se or
14163         label_context_stack_vm.
14164         (finish_function): Likewise.
14165         * c-typeck.c (label_context_stack_se): Don't define.
14166         (label_context_stack_vm): Don't define.
14167         (c_finish_goto_label): Call lookup_label_for_goto rather than
14168         lookup_label.  Don't give errors about jumping into a statement
14169         expression or the scope of a variably modified type.  Don't set
14170         label_context_stack_se or label_context_stack_vm.
14171         (struct c_switch): Remove blocked_stmt_expr and blocked_vm
14172         fields.  Add bindings field.
14173         (c_start_case): Don't set deleted fields.  Set bindings field.
14174         (do_case): Rework order of tests.  Don't check blocked_stmt_expr
14175         or blocked_vm.  Call c_check_switch_jump_warnings.
14176         (c_finish_case): Don't test blocked_stmt_expr field.  Call
14177         c_release_switch_bindings.
14178         (c_begin_stmt_expr): Don't increment blocked_stmt_expr in
14179         c_switch_stack.  Don't walk label_context_stack_se labels.  Don't
14180         set label_context_stack_se.  Call c_bindings_start_stmt_expr.
14181         (c_finish_stmt_expr): Don't decrement blocked_stmt_expr in
14182         c_switch_stack.  Don't walk label_context_stack_se labels.  Don't
14183         set label_context_stack_se.  Call c_bindings_end_stmt_expr.
14184         (c_begin_vm_scope, c_end_vm_scope): Don't define.
14185         * c-tree.h (C_DECL_UNJUMPABLE_STMT_EXPR): Don't define.
14186         (C_DECL_UNDEFINABLE_STMT_EXPR): Don't define.
14187         (C_DECL_UNJUMPABLE_VM): Don't define.
14188         (C_DECL_UNDEFINABLE_VM): Don't define.
14189         (struct c_label_list): Don't define.
14190         (struct c_label_context_se): Don't define.
14191         (struct c_label_context_vm): Don't define.
14192         (struct c_spot_bindings): Declare.
14193         (c_bindings_start_stmt_expr): Declare.
14194         (c_bindings_end_stmt_expr): Declare.
14195         (lookup_label_for_goto): Declare.
14196         (c_get_switch_bindings, c_release_switch_bindings): Declare.
14197         (c_check_switch_jump_warnings): Declare.
14198         (label_context_stack_se, label_context_stack_vm): Don't declare.
14199         (c_finish_goto_label): Update declaration.
14200         (c_begin_vm_scope, c_end_vm_scope): Don't declare.
14201         * doc/invoke.texi (Option Summary): Mention -Wjump-misses-init.
14202         (Warning Options): Document -Wjump-misses-init.
14204 2009-06-15  Jakub Jelinek  <jakub@redhat.com>
14206         * tree-object-size.c (addr_object_size): Fix a pasto in the last
14207         change.
14209 2009-06-15  Rafael Avila de Espindola  <espindola@google.com>
14211         * cgraph.c (cgraph_make_node_local): Use DECL_COMDAT_GROUP.
14213 2009-06-15  Aldy Hernandez  <aldyh@redhat.com>
14215         * except.c (init_eh): Use BUILTINS_LOCATION when calling build_decl.
14217 2009-06-15  Aldy Hernandez  <aldyh@redhat.com>
14219         * tree-eh.c (lower_try_finally_switch): Initialize tf_loc.
14221 2009-06-15  Rafael Avila de Espindola  <espindola@google.com>
14223         * cgraphunit.c (cgraph_function_versioning,save_inline_function_body):
14224         Use DECL_COMDAT_GROUP instead of DECL_ONE_ONLY.
14225         * cgraph.c (cgraph_create_virtual_clone): Use DECL_COMDAT_GROUP.
14226         * config/i386/i386.c (ix86_file_end): Compute DECL_COMDAT_GROUP.
14227         * dwarf2asm.c (dw2_force_const_mem): Update call to
14228         make_decl_one_only.
14229         * langhooks-def.h (lhd_comdat_group, LANG_HOOKS_COMDAT_GROUP): Remove.
14230         (LANG_HOOKS_DECLS): Remove LANG_HOOKS_COMDAT_GROUP.
14231         * langhooks.c (lhd_comdat_group): Remove.
14232         * langhooks.h (lang_hooks_for_decls): Remove comdat_group.
14233         * tree.h (DECL_COMDAT_GROUP): New.
14234         (DECL_ONE_ONLY): Use DECL_COMDAT_GROUP.
14235         (tree_decl_with_vis): Add comdat_group. Remove one_only.
14236         (make_decl_one_only): Change signature.
14237         * varasm.c (get_emutls_init_templ_addr, emutls_decl): Update call to
14238         make_decl_one_only.
14239         (make_decl_one_only): Change signature.
14240         (default_elf_asm_named_section): Use DECL_COMDAT_GROUP.
14242 2009-06-15  Richard Guenther  <rguenther@suse.de>
14244         PR middle-end/40439
14245         * tree.c (widest_int_cst_value): Fix bootstrap on 32bit HWI hosts.
14247 2009-06-14  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
14249         * tree-ssa-math-opts.c: Remove extra divide.
14251 2009-06-14  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
14253         * config/s390/s390.md ("bswap<mode>2"): Only available on z900.
14255 2009-06-14  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
14257         * passes.c: Add bswap pass.
14258         * tree-pass.h: Add pass_optimize_bswap declaration.
14259         * tree-ssa-math-opts.c: Include diagnostics.h for print_gimple_stmt.
14260         Include rtl.h, expr.h and optabs.h for optab_handler check.
14261         (struct symbolic_number, pass_optimize_bswap): New definition.
14262         (do_shift_rotate, verify_symbolic_number_p): New functions.
14263         (find_bswap_1, find_bswap, execute_optimize_bswap): New functions.
14264         (gate_optimize_bswap): New function.
14265         * tree.c (widest_int_cst_value): New function.
14266         * tree.h (widest_int_cst_value): Prototype added.
14268 2009-06-14  Steven Bosscher  <steven@gcc.gnu.org>
14270         * cfgcleanup.c (old_insns_match_p): Remove code to substitute
14271         REG_EQUAL/REG_EQUIV notes.
14273 2009-06-14  Richard Guenther  <rguenther@suse.de>
14275         PR middle-end/40389
14276         * gimple.c (walk_stmt_load_store_addr_ops): The LHS of a call
14277         has its address taken if NRV was applied and it is addressable.
14278         * tree-ssa-structalias.c (get_constraint_for_address_of): New
14279         function split out from ...
14280         (get_constraint_for_1): ... here.
14281         (handle_rhs_call): Use it to mark the return slot escaped if
14282         it is addressable and NRV was applied.
14284 2009-06-13  Aldy Hernandez  <aldyh@redhat.com>
14286         * config/rs6000/rs6000-protos.h (altivec_resolve_overloaded_builtin):
14287         Change first argument type to location_t.
14288         * config/rs6000/rs6000-c.c (altivec_resolve_overloaded_builtin): Same.
14289         Do not set input_location.
14290         Use loc instead of input_location throughout.
14292 2009-06-13  Richard Guenther  <rguenther@suse.de>
14294         PR tree-optimization/40421
14295         * tree-predcom.c (should_unroll_loop_p): Remove.
14296         (tree_predictive_commoning_loop): Use can_unroll_loop_p.
14298 2009-06-13  Michael Meissner  <meissner@linux.vnet.ibm.com>
14300         * config/rs6000/rs6000-c.c (altivec_resolve_overloaded_builtin):
14301         Add location argument.
14303 2009-06-13  Aldy Hernandez  <aldyh@redhat.com>
14305         * config/alpha/alpha.c (alpha_build_builtin_va_list): Pass location to
14306         build_decl.
14307         * config/s390/s390.c (s390_build_builtin_va_list): Same.
14308         (s390_gimplify_va_arg): Pass location to create_artificial_label.
14309         * config/spu/spu-protos.h: Add location to
14310         spu_resolve_overloaded_builtin.
14311         * config/spu/spu.c (spu_build_builtin_va_list): Pass location to
14312         spu_build_builtin_va_list.
14313         * config/spu/spu-c.c (spu_resolve_overloaded_builtin): Add location
14314         argument.  Pass location to build_function_call_vec.
14315         * config/sh/sh.c (sh_build_builtin_va_list): Pass location to
14316         build_decl.
14317         (emit_fpu_switch): Same.
14318         (sh_gimplify_va_arg_expr): Pass location to create_artificial_label.
14319         * config/xtensa/xtensa.c (xtensa_build_builtin_va_list): Pass location
14320         to build_decl and create_artificial_label.
14321         (xtensa_gimplify_va_arg_expr): Same.
14322         * config/stormy16/stormy16.c (xstormy16_build_builtin_va_list): Same.
14323         (xstormy16_gimplify_va_arg_expr): Same.
14324         * config/iq2000/iq2000.c (iq2000_expand_prologue): Same.
14325         * config/arm/arm.c (arm_build_builtin_va_list): Same.
14326         * config/mips/mips.c (mips_build_builtin_va_list): Same.
14327         (mips16_build_function_stub): Same.
14328         (mips16_build_call_stub): Same.
14330 2009-06-13  Richard Earnshaw  <rearnsha@arm.com>
14332         PR target/40327
14333         * arm/constraints.md (Pa, Pb): New constraints.
14334         * arm/arm.md (thumb1_addsi3): Support more complex additions.  Add a
14335         split pattern to deal with them.
14337 2009-06-13  Joerg Sonnenberger  <joerg@britannica.bec.de>
14339         * doc/invoke.texi: Add missing option -Wp,OPTION in list,
14340         fix index entry for -Xpreprocessor.
14342 2009-06-12  Aldy Hernandez  <aldyh@redhat.com>
14344         * config/rs6000/rs6000-c.c (altivec_resolve_overloaded_builtin):
14345         Add location argument to build_decl call.
14346         * config/rs6000/rs6000.c (rs6000_build_builtin_va_list): Same.
14347         (rs6000_init_builtins): Same.
14348         (spe_init_builtins): Same.
14349         (rs6000_gimplify_va_arg): Add location argument to
14350         create_artificial_label call.
14352 2009-06-12  Steven Bosscher  <steven@gcc.gnu.org>
14354         * timevar.def (TV_COMBINE_STACK_ADJUST): New timevar.
14355         * combine-stack-adj.c (pass_stack_adjustments): Use it.
14356         * Makefile.in: Fix GGC dependency for gcse.o.
14358 2009-06-12  Aldy Hernandez  <aldyh@redhat.com>
14360         * tree-pretty-print.c (dump_generic_node): Dump column numbers.
14361         * gimple-pretty-print.c (dump_gimple_stmt): Same.
14362         * gimplify.c (gimplify_modify_expr): Set location for GIMPLE_ASSIGNs
14363         created.
14364         * c-parser.c (c_parser_binary_expression): Use current column while
14365         building binary operations.
14366         * common.opt (fshow-column): Enable by default.
14367         * tree-vrp.c (check_array_ref): Use warning_at.
14368         (check_array_bounds): Use location from call back if expr has no
14369         location.
14370         * tree.h: Add location argument to maybe_fold_*.
14371         * tree-ssa-ccp.c (ccp_fold): Pass location to maybe_fold_*.
14372         (maybe_fold_offset_to_array_ref): Add location argument and use it.
14373         (maybe_fold_offset_to_component_ref): Same.
14374         (maybe_fold_offset_to_reference): Same.
14375         (maybe_fold_offset_to_address): Same.
14376         (maybe_fold_stmt_indirect): Same.
14377         (maybe_fold_stmt_addition): Same.
14378         (fold_stmt_r): Pass location to maybe_fold_*.
14379         (fold_gimple_assign): Same.
14380         * c-tree.h: Add location argument to finish_decl,
14381         default_function_array_conversion, store_init_value.
14382         * c-decl.c (define_label): Use error_at.
14383         (c_make_fname_decl): Pass location to finish_decl.
14384         (finish_decl): New location argument.
14385         (build_compound_literal): Pass location to store_init_value.
14386         (grokdeclarator): Pass location to finish_decl.
14387         (grokfield): Same.
14388         * c-typeck.c (array_to_pointer_conversion): New location argument.
14389         (function_to_pointer_conversion): Same.
14390         (default_function_array_conversion): Same.
14391         (parser_build_unary_op): Pass location to overflow_warning.
14392         (parser_build_binary_op): Same.  Use warning_at.
14393         (build_unary_op): Pass location to array_to_pointer_conversion.
14394         (build_c_cast): Pass location to digest_init.
14395         (build_modify_expr): New location argument.
14396         (convert_for_assignment): Same.
14397         (store_init_value): Same.
14398         (digest_init): Same.
14399         (output_init_element): Pass location to digest_init and
14400         array_to_pointer_conversion.
14401         (c_finish_return): Pass location to convert_for_assignment.
14402         * gimplify.c (gimplify_conversion): Pass location to
14403         maybe_fold_offset_to_address.
14404         * tree-ssa-forwprop.c (forward_propagate_addr_expr_1): Pass location
14405         to maybe_fold_stmt_addition.
14406         * c-omp.c (c_finish_omp_atomic): Pass new location to
14407         build_modify_expr.
14408         (c_finish_omp_for): Same.
14409         * c-common.c (overflow_warning): New argument.
14410         * c-common.h: New argument to build_modify_expr, overflow_warning.
14411         * c-parser.c (c_parser_declaration_or_fndef): Pass location to
14412         finish_decl.
14413         (c_parser_initializer): Pass location to
14414         default_function_array_conversion.
14415         (c_parser_initelt): Same.
14416         (c_parser_initval): Same.
14417         (c_parser_asm_operands): Same.
14418         (c_parser_expr_no_commas): Same.  Pass location to build_modify_expr.
14419         (c_parser_conditional_expression): Same.
14420         (c_parser_binary_expression): Add location info to stack.  Use it.
14421         (c_parser_unary_expression): Pass location to
14422         default_function_array_conversion, parser_build_unary_op,
14423         build_indirect_ref, c_parser_postfix_expression_after_primary.
14424         (c_parser_postfix_expression_after_primary): New location argument.
14425         Use it.
14426         (c_parser_expression_conv): Pass location to
14427         default_function_array_conversion.
14428         (c_parser_expr_list): Same.
14429         (c_parser_omp_atomic): Same.
14430         (c_parser_omp_for_loop): Same.
14431         * c-tree.h (struct c_declarator): Add comment to id_loc.
14432         (build_array_declarator): New argument.
14433         * c-decl.c (build_array_declarator): Add location argument.
14434         (grokdeclarator): Set id_loc for cdk_array.
14435         * c-parser.c (c_parser_direct_declarator_inner): Pass location to
14436         build_array_declarator.
14437         * tree.c (build_omp_clause): Add location argument.
14438         * tree.h (OMP_CLAUSE_HAS_LOCATION): New macro.
14439         (OMP_CLAUSE_LOCATION): New macro.
14440         (struct tree_omp_clause): Add location field.
14441         (build_omp_clause): Add argument.
14442         * testsuite/gcc.dg/gomp/for-1.c: Fix column.
14443         * cp/pt.c (tsubst_omp_for_iterator): Pass location to
14444         build_omp_clause.
14445         * cp/parser.c (cp_parser_omp_var_list_no_open): Same.
14446         (cp_parser_omp_clause_collapse): Same.
14447         (cp_parser_omp_clause_default): Same.
14448         (cp_parser_omp_clause_if): Same.
14449         (cp_parser_omp_clause_nowait): Same.
14450         (cp_parser_omp_clause_num_threads): Same.
14451         (cp_parser_omp_clause_ordered): Same.
14452         (cp_parser_omp_clause_schedule): Same.
14453         (cp_parser_omp_clause_untied): Same.
14454         (cp_parser_omp_for_loop): Same.
14455         (cp_parser_omp_parallel): Pass location to c_split_parallel_clauses.
14456         * c-tree.h (c_start_case): Add location argument.
14457         (c_process_expr_stmt): Same.
14458         (c_finish_goto_*): Same.
14459         * tree-parloops.c (initialize_reductions): Pass location to
14460         build_omp_clause.
14461         (create_parallel_loop): Same.
14462         * fortran/trans-openmp.c (gfc_trans_omp_variable_list): Same.
14463         (gfc_trans_omp_reduction_list): Same.
14464         (gfc_trans_omp_clauses): Same.
14465         (gfc_trans_omp_do): Same.
14466         * c-typeck.c (c_finish_goto_label): Same.
14467         (c_finish_goto_ptr): New location argument.
14468         (c_start_case): Same.
14469         (emit_side_effect_warnings): Same.
14470         (c_process_expr_stmt): Same.
14471         (c_finish_stmt_expr): Same.
14472         (c_finish_omp_clauses): Use error_at instead of error.
14473         * gimplify.c (gimplify_adjust_omp_clauses_1): Pass location to
14474         build_omp_clause.
14475         * c-omp.c (c_split_parallel_clauses): New location argument.
14476         * tree-nested.c (convert_nonlocal_reference_stmt): Pass location
14477         to build_omp_clause.
14478         (convert_local_reference_stmt): Same.
14479         (convert_gimple_call): Same.
14480         * c-common.h (c_split_parallel_clauses): New argument.
14481         * c-parser.c (c_parser_statement_after_labels): Pass location to
14482         c_finish_goto_label.
14483         (c_parser_switch_statement): Pass location to c_start_case.
14484         (c_parser_for_statement): Pass location to c_finish_expr_stmt,
14485         and c_process_expr_stmt.
14486         (c_parser_omp_variable_list): Add location argument.
14487         (c_parser_omp_clause_collapse): Pass location to build_omp_clause.
14488         (c_parser_omp_clause_default): Same.
14489         (c_parser_omp_clause_if): Same.
14490         (c_parser_omp_clause_num_threads): Same.
14491         (-c_parser_omp_clause_ordered): Same.
14492         (c_parser_omp_clause_reduction): Pass location to
14493         c_parser_omp_variable_list.
14494         (c_parser_omp_clause_schedule): Pass location to build_omp_clause.
14495         (c_parser_omp_clause_untied): Same.
14496         (c_parser_omp_for_loop): Pass location to c_process_expr_stmt.
14497         (c_parser_omp_parallel): Pass location to c_split_parallel_clauses.
14499         * c-tree.h (check_for_loop_decls, undeclared_variable,
14500         build_component_ref, build_array_ref, build_external_ref,
14501         c_expr_sizeof_expr, c_expr_sizeof_type, parser_build_unary_op,
14502         build_conditional_expr, build_compound_expr, c_cast_expr,
14503         build_c_cast, build_asm_expr, c_end_compound_stmt, c_finish_stmt_expr,
14504         c_finish_return, c_finish_omp_parallel, c_finish_omp_task): New
14505         argument.
14506         * c-semantics.c (build_stmt): Same.
14507         (build_case_label): Same.
14508         * c-decl.c (c_finish_incomplete_decl): Pass location on down.
14509         (undeclared_variable): New argument.
14510         (make_label): Same.
14511         (lookup_label): Pass location on down.
14512         (define_label): Same.
14513         (finish_decl): Same.
14514         (build_compound_literal): Same.
14515         (finish_struct): Same.
14516         (finish_function): Do not set location here.
14517         (check_for_loop_decls): New argument.
14518         * tree.c (save_expr): Set location.
14519         (build_empty_stmt): New argument.
14520         * tree.h (build_empty_stmt): New argument to build_empty_stmt.
14521         (CAN_HAVE_LOCATION_P): Make sure we have a non empty node.
14522         * builtins.c (gimplify_va_arg_expr): Use locations.
14523         (expand_builtin_sync_operation): Same.
14524         * c-typeck.c (build_component_ref): New argument.
14525         (build_array_ref): Same.
14526         (build_external_ref): Same.
14527         (c_expr_sizeof_expr): Same.
14528         (c_expr_sizeof_type): Same.
14529         (parser_build_unary_op): Same.
14530         (build_conditional_expr): Same.
14531         (build_compound_expr): Pass location on down.
14532         (build_compound_expr): New argument.
14533         (build_c_cast): Same.
14534         (c_cast_expr): Same.
14535         (build_asm_expr): Same.
14536         (c_finish_return): Same.
14537         (c_process_expr_stmt): Pass location on down.
14538         (c_finish_stmt_expr): New argument.
14539         (push_clenaup): Same.
14540         (c_finish_omp_parallel): Same.
14541         (c_finish_omp_task): Same.
14542         * gimplify.c (gimplify_call_expr): Pass location on down.
14543         * c-omp.c (c_finish_omp_master): New argument.
14544         (c_finish_omp_critical): Same.
14545         (c_finish_omp_ordered): Same.
14546         (c_finish_omp_barrier): Same.
14547         (-c_finish_omp_taskwait): Same.
14548         (c_finish_omp_atomic): Same.
14549         (c_finish_omp_flush): Same.
14550         * tree-inline.c (copy_tree_body_r): Pass location on down.
14551         (inline_forbidden_p): Remove use of input_location.
14552         * c-gimplify.c (c_build_bind_expr): New argument.
14553         * c-common.c (c_common_truthvalue_conversion): Pass location on down.
14554         (c_sizeof_or_alignof_type): New argument.
14555         (c_alignof_expr): Same.
14556         (build_va_arg): Same.
14557         (c_add_case_label): Same.
14558         * c-common.h (c_sizeof_or_alignof_type, c_alignof_expr,
14559         c_sizeof, c_alignof, build_va_arg, build_stmt, build_case_label,
14560         c_build_bind_expr, objc_build_selector_expr, objc_build_throw_stmt,
14561         c_finish_omp_master, c_finish_omp_critical, c_finish_omp_ordered,
14562         c_finish_omp_barrier, c_finish_omp_atomic, c_finish_omp_flush,
14563         c_finish_omp_taskwait, c_finish_omp_for, c_split_parallel_clauses):
14564         New argument.
14565         * stub-objc.c (objc_build_selector_expr): Same.
14566         (objc_build_throw_stmt): Same.
14567         * c-parser.c (c_parser_declaration_or_fndef): Pass location on down.
14568         (c_parser_initelt): Same.
14569         (c_parser_compound_statement): Same.
14570         (c_parser_compound_statement_nostart): Same.
14571         (c_parser_label): Same.
14572         (c_parser_statement_after_labels): Same.
14573         (c_parser_if_body): Same.
14574         (c_parser_else_body): Same.
14575         (c_parser_if_statement): Same.
14576         (c_parser_switch_statement): Same.
14577         (c_parser_while_statement): Same.
14578         (c_parser_do_statement): Same.
14579         (c_parser_for_statement): Same.
14580         (c_parser_asm_statement): Same.
14581         (c_parser_conditional_expression): Same.
14582         (c_parser_binary_expression): Same.
14583         (c_parser_cast_expression): Same.
14584         (c_parser_unary_expression): Same.
14585         (c_parser_sizeof_expression): Same.
14586         (c_parser_alignof_expression): Same.
14587         (c_parser_postfix_expression): Same.
14588         (c_parser_expression): Same.
14589         (c_parser_objc_receiver): Same.
14590         (c_parser_omp_variable_list): Same.
14591         (c_parser_omp_structured_block): Same.
14592         (c_parser_omp_atomic): New argument.
14593         (c_parser_omp_barrier): Same.
14594         (c_parser_omp_critical): Same.
14595         (c_parser_omp_flush): Pass location on down.
14596         (c_parser_omp_for_loop): New argument.
14597         (c_parser_omp_for): Same.
14598         (c_parser_omp_master): Same.
14599         (c_parser_omp_ordered): Same.
14600         (c_parser_omp_sections_scope): Same.
14601         (c_parser_omp_sections): Same.
14602         (c_parser_omp_parallel): Same.
14603         (c_parser_omp_single): Same.
14604         (c_parser_omp_task): Same.
14605         (c_parser_omp_taskwait): Pass location on down.
14606         (c_parser_omp_construct): Same.
14607         (c_parser_omp_threadprivate): Same.
14608         * dwarf2asm.c, targhooks.c, optabs.c, tree.c, tree.h, target.h,
14609         builtins.c, omp-low.c, cgraphunit.c, tree-call-cdce.c,
14610         tree-ssa-alias.c, gimple-low.c, c-tree.h, expr.c, tree-parloops.c,
14611         c-decl.c, tree-eh.c, langhooks.c, function.c, stor-layout.c,
14612         c-typeck.c, gimplify.c, c-pragma.c, expmed.c, except.c, coverage.c,
14613         emit-rtl.c, cfgexpand.c, tree-mudflap.c, varasm.c, tree-nested.c,
14614         rtl.h, tree-inline.c, tree-profile.c, c-common.c, c-common.h,
14615         tree-switch-conversion.c, tree-cfg.c, ipa-struct-reorg.c, c-parser.c,
14616         config/i386/i386.c, stmt.c:
14617         Add location argument to the following function definitions and/or
14618         function calls: build_decl, objcp_start_struct, objcp_finish_struct,
14619         start_struct, finish_struct, PUSH_FIELD, create_artificial_label,
14620         cp_make_fname_decl, pushtag, implicitly_declare, c_make_fname_decl,
14621         build_compound_literal, parser_xref_tag, resolve_overloaded_builtin,
14622         do_case, c_finish_bc_stmt, build_compound_literal,
14623         build_function_call.
14624         * c-decl.c (build_compound_literal): Add location argument.
14625         Make all diagnostic calls use location.
14626         (start_struct): Same.
14627         (finish_struct): Same.
14628         (start_enum): Same.
14629         (build_enumerator): Same.
14630         (start_function): Same.
14631         (grokdeclarator): Make all diagnostic calls use location.
14632         (store_parm_decls_oldstyle): Same.
14633         * c-typeck.c (build_function_call): Add location argument.
14634         Make all diagnostic calls use location.
14635         (do_case): Same.
14636         (c_finish_bc_stmt): Same.
14637         * tree-nested.c (get_trampoline_type): Add argument.
14638         Pass location to build_decl.
14639         (lookup_tramp_for_decl): Pass location to get_trampoline_type.
14640         * rtl.h (RTL_LOCATION): New.
14641         * c-common.c (c_add_case_label): Add location argument.
14642         Make all diagnostic calls use location.
14643         * c-common.h: Add location argument to make_fname_decl, do_case,
14644         c_add_case_label, build_function_call, resolve_overloaded_builtin.
14645         * c-parser.c (c_parser_enum_specifier): Rename ident_loc to enum_loc.
14646         Set it appropriately for every case.  Pass enum_loc to start_enum
14647         call.  Pass value_loc first to build_enumerator.  Pass enum_loc to
14648         parser_xref_tag.
14649         (c_parser_struct_or_union_specifier): Save location.  Use it for
14650         start_struct, finish_struct, and parser_xref_tag.
14652 2009-06-12  Ian Lance Taylor  <iant@google.com>
14654         * fold-const.c (fold_unary): Rename local variable and to and_expr.
14656         * c-opts.c (c_common_handle_option): For -Wc++-compat set
14657         cpp_opts->warn_cxx_operator_names.
14659 2009-06-12  Andrew Pinski  <andrew_pinski@playstation.sony.com>
14661         PR tree-opt/38865
14662         * tree-ssa-sccvn.c (visit_reference_op_load): If vn_reference_lookup
14663         is returns NULL and OP is a VCE, look through the VCE.
14665 2009-06-12  Ian Lance Taylor  <iant@google.com>
14667         PR bootstrap/40430
14668         * collect2.c (main): Use CONST_CAST2 in code inside #if
14669         LINK_ELIMINATE_DUPLICATE_LDIRECTORIES.
14671 2009-06-12  Joey Ye  <joey.ye@intel.com>
14673         PR middle-end/39146
14674         * cfgexpand.c (get_decl_align_unit): Update
14675         max_used_stack_slot_alignment with align instead of
14676         stack_alignment_needed.
14678         * function.c (assign_stack_local_1): Update
14679         max_used_stack_slot_alignment with alignment_in_bits instead
14680         of stack_alignment_needed.
14681         (locate_and_pad_parm): Don't update max_used_stack_slot_alignment
14682         here.
14684 2009-06-12  Jakub Jelinek  <jakub@redhat.com>
14686         * dwarf2out.c (last_var_location_insn): New variable.
14687         (dwarf2out_end_epilogue): Clear last_var_location_insn.
14688         (dwarf2out_var_location): Don't record anything after last real
14689         insn.  Only change labels if there were any real instructions
14690         in between last note and this one, or if changed sections.
14692 2009-06-11  Richard Henderson  <rth@redhat.com>
14694         * alpha.c (alpha_expand_prologue): Add a REF_CFA_REGISTER
14695         note when storing the frame pointer in a register.
14696         (FRP): Don't redefine to nothing for epilogue.
14697         (alpha_expand_epilogue): Mark register and sp restores.
14698         (unicosmk_gen_dsib): Don't mark weird frame pointer adjust.
14700         * config/alpha/alpha.c (alpha_emit_setcc): Fix test for
14701         when gen_lowpart is needed.
14703 2009-06-11  Richard Henderson  <rth@redhat.com>
14705         * dwarf2out.c (def_cfa_1): Likewise for DW_CFA_cfa_offset.
14707         * dwarf2out.c (need_data_align_sf_opcode): New.
14708         (div_data_align): Move earlier.
14709         (def_cfa_1, reg_save): Use it.
14711 2009-06-11  H.J. Lu  <hongjiu.lu@intel.com>
14713         * config/i386/i386.c (OPTION_MASK_ISA_CRC32_SET): New.
14714         (OPTION_MASK_ISA_CRC32_UNSET): Likewise.
14715         (ix86_handle_option): Handle OPT_mcrc32.
14716         (ix86_target_string): Add -mcrc32.
14717         (bdesc_args): Enable crc32 builtins with OPTION_MASK_ISA_CRC32.
14719         * config/i386/i386.h (TARGET_CRC32): New.
14721         * config/i386/i386.md (sse4_2_crc32<mode>): Also check TARGET_CRC32.
14722         (sse4_2_crc32di): Likewise.
14724         * config/i386/i386.opt (mcrc32): New.
14726         * doc/invoke.texi: Document -mcrc32.
14728 2009-06-11  Richard Henderson  <rth@redhat.com>
14730         * common.opt (gdwarf-): Accept a version number.
14731         * doc/invoke.texi (gdwarf-): Update docs.
14732         * opth-gen.awk: Special case -gdwarf+ to OPT_gdwarfplus.
14733         * opts.c (common_handle_option) [OPT_gdwarf_]: Verify dwarf
14734         version level, and record it.
14736         * dwarf2.h (DW_CIE_VERSION): Remove.
14737         * dwarf2out.c (DWARF_VERSION): Remove.
14738         (add_fde_cfi): Skip DW_CFA_set_loc addition for dwarf3.
14739         (output_call_frame_info): Use CIE version 3 for dwarf3,
14740         or if the return register column is out of range for version 1.
14741         (dwarf_stack_op_name): Add all dwarf3 values.
14742         (DEBUG_PUBTYPES_SECTION): New.
14743         (size_of_die) [dw_val_class_die_ref]: Handle DW_FORM_ref_addr
14744         encoding change for dwarf3.
14745         (output_die) [dw_val_class_die_ref]: Likewise.
14746         (output_compilation_unit_header): Emit correct version for dwarf3.
14747         (output_line_info): Likewise.
14748         (output_pubnames): Update for DWARF_VERSION removal.
14749         (output_aranges): Likewise.
14750         (gen_subprogram_die): Emit DW_OP_call_frame_cfa if emitting dwarf3.
14751         (dwarf2out_init): Don't ifdef DEBUG_PUBTYPES_SECTION.
14752         (dwarf2out_finish): Likewise.
14754 2009-06-11  David Daney  <ddaney@caviumnetworks.com>
14756         * system.h (gcc_assert, gcc_unreachable): Revert accidental commit
14757         in r148403.
14759 2009-06-11  David Daney  <ddaney@caviumnetworks.com>
14761         PR c/39252
14762         * doc/extend.texi ( __builtin_unreachable): Document new builtin.
14763         * builtins.c (expand_builtin_unreachable): New function.
14764         (expand_builtin): Handle BUILT_IN_UNREACHABLE case.
14765         * builtins.def (BUILT_IN_UNREACHABLE): Add new builtin.
14766         * cfgcleanup.c (try_optimize_cfg): Delete empty blocks with no
14767         successors.
14768         * cfgrtl.c (rtl_verify_flow_info): Handle empty blocks when
14769         searching for missing barriers.
14771 2009-06-11  Francois-Xavier Coudert  <fxcoudert@gcc.gnu.org>
14773         * config/darwin.h (LINK_COMMAND_SPEC): Adjust spec to link libcov
14774         when -fprofile-generate* was passed.
14775         * config/darwin9.h (LINK_COMMAND_SPEC): Likewise.
14777 2009-06-11  Anthony Green  <green@moxielogic.com>
14779         * config/moxie/moxie.md: Define length attribute for all instructions.
14780         (rCC): Define.
14781         (*b<cond:code>): Support limited branch ranges for new PC-relative
14782         branch instructions.
14783         * config/moxie/moxie.h (HAS_LONG_UNCOND_BRANCH): Define.
14785 2009-06-11  Jakub Jelinek  <jakub@redhat.com>
14787         * config/i386/i386.c (min_insn_size): Use get_attr_length
14788         for normal insns other than TYPE_MULTI, TYPE_OTHER and TYPE_FCMP.
14789         For __asm return 0.
14791         * config/i386/i386.c (ix86_pad_returns): Use emit_jump_insn_before
14792         instead of emit_insn_before.
14794 2009-06-10  Ian Lance Taylor  <iant@google.com>
14796         PR bootstrap/40408
14797         * graphite.c (add_conditions_to_domain): Change SWITCH_EXPR to
14798         GIMPLE_SWITCH.
14800 2009-06-10  Revital Eres  <eres@il.ibm.com>
14802         * passes.c (init_optimization_passes): Reschedule
14803         predictive-commoning pass before complete unroll pass.
14805 2009-06-10  Martin Jambor  <mjambor@suse.cz>
14807         * cgraph.c (cgraph_node_can_be_local_p): New function.
14808         (cgraph_make_node_local): New function.
14809         * cgraph.h (cgraph_node_can_be_local_p): Declare.
14810         (cgraph_make_node_local): Declare.
14812 2009-06-10  Nathan Froyd  <froydnj@codesourcery.com>
14814         * tree.h (tree_base): Add packed_flag and user_align fields.
14815         Decrease size of spare field.
14816         (TYPE_USER_ALIGN): Use user_align from tree_base.
14817         (DECL_USER_ALIGN): Likewise.
14818         (TYPE_PACKED): Use packed_flag from tree_base.
14819         (DECL_PACKED): Likewise.
14820         (tree_type): Delete packed_flag and user_align fields.  Widen
14821         precision field.  Widen mode field and shuffle fields to align
14822         mode on an 8-bit boundary.
14823         (tree_decl_common): Delete decl_flag_1 and user_align fields.
14824         Renumber decl_flag_* fields.  Fix comments.  Widen
14825         decl_common_unused field.
14826         (DECL_HAS_VALUE_EXPR_P): Adjust for renumbering of decl_flag_* fields.
14827         (DECL_EXTERNAL): Likewise.
14828         (DECL_BIT_FIELD): Likewise.
14829         (DECL_NONADDRESSABLE_P): Likewise.
14830         (TYPE_DECL_SUPRESS_DEBUG): Likewise.
14831         * config/arm/arm-modes.def (XImode): Make it an INT_MODE.
14833 2009-06-10  Ian Lance Taylor  <iant@google.com>
14835         * vec.h (DEF_VEC_ALLOC_I): Use DEF_VEC_NONALLOC_FUNCS_I.
14836         (DEF_VEC_ALLOC_P): Use DEF_VEC_NONALLOC_FUNCS_P.
14837         (DEF_VEC_ALLOC_O): Use DEF_VEC_NONALLOC_FUNCS_O.
14838         (DEF_VEC_ALLOC_FUNC_P): Only define VEC_OP (T,A,alloc).
14839         (DEF_VEC_NONALLOC_FUNCS_P): New macro, broken out of old
14840         DEF_VEC_ALLOC_FUNC_P.
14841         (DEF_VEC_ALLOC_FUNC_O): Only define VEC_OP (T,A,alloc).
14842         (DEF_VEC_NONALLOC_FUNCS_O): New macro, broken out of old
14843         DEF_VEC_ALLOC_FUNC_O.
14844         (DEF_VEC_ALLOC_FUNC_I): Only define VEC_OP (T,A,alloc).
14845         (DEF_VEC_NONALLOC_FUNCS_I): New macro, broken out of old
14846         DEF_VEC_ALLOC_FUNC_I.
14847         (vec_stack_p_reserve, vec_stack_p_reserve_exact): Declare.
14848         (vec_stack_p_reserve_exact_1): Declare.
14849         (vec_stack_o_reserve, vec_stack_o_reserve_exact): Declare.
14850         (vec_stack_free): Declare.
14851         (VEC_stack_alloc): Define.
14852         (DEF_VEC_ALLOC_P_STACK, DEF_VEC_ALLOC_FUNC_P_STACK): Define.
14853         (DEF_VEC_ALLOC_O_STACK, DEF_VEC_ALLOC_FUNC_O_STACK): Define.
14854         (DEF_VEC_ALLOC_I_STACK, DEF_VEC_ALLOC_FUNC_I_STACK): Define.
14855         * vec.c (void_p): New type.  Call DEF_VEC_P and DEF_VEC_ALLOC_P
14856         for void_p.
14857         (stack_vecs): New static variable.
14858         (vec_stack_p_reserve_exact_1): New function.
14859         (vec_stack_o_reserve_1): New static function.
14860         (vec_stack_p_reserve, vec_stack_p_reserve_exact): New functions.
14861         (vec_stack_o_reserve, vec_stack_o_reserve_exact): New functions.
14862         (vec_stack_free): New function.
14863         * df-scan.c (df_ref): Use DEF_VEC_P and DEF_VEC_ALLOC_P_STACK.
14864         (VEC_df_ref_stack_alloc): Define.
14865         (df_mw_hardreg_ptr): New type.  Use DEF_VEC_P and
14866         DEF_VEC_ALLOC_P_STACK.
14867         (VEC_df_mw_hardreg_ptr_stack_alloc): Define.
14868         (struct df_collection_rec): Change _vec fields to VEC.  Remove
14869         _use fields.
14870         (df_free_collection_rec): Adjust for new fields.
14871         (df_insn_rescan): Use new df_collection_rec fields.
14872         (df_notes_rescan, df_canonize_collection_rec): Likewise.
14873         (df_ref_create_structure, df_ref_record): Likewise.
14874         (df_get_conditional_uses, df_get_call_refs): Likewise.
14875         (df_insn_refs_collect, df_bb_refs_collect): Likewise.
14876         (df_bb_refs_record, df_record_entry_block_defs): Likewise.
14877         (df_record_exit_block_uses, df_bb_verify): Likewise.
14878         (df_swap_refs): Change ref_vec parameter to VEC.  Change all callers.
14879         (df_sort_and_compress_refs): Change ref_vec parameter to VEC.
14880         Remove count parameter.  Change return type to void.  Change all
14881         callers.
14882         (df_sort_and_compress_mws): Change mw_vec parameter to VEC.
14883         Remove count parameter.  Change return type to void.  Change all
14884         callers.
14885         (df_install_refs): Change old_vec parameter to VEC.  Remove count
14886         parameter.  Change all callers.
14887         (df_install_mws): Change old_vec parameter to VEC.  Remove count
14888         parameter.  Change all callers.
14889         (df_refs_verify): Change new_rec parameter to VEC.  Change call
14890         callers.
14891         (df_mws_verify): Likewise.
14893 2009-06-10  Alexandre Oliva  <aoliva@redhat.com>
14895         * gcc.c (compare_files): Cast munmap argumento to caddr_t.
14897 2009-06-10  H.J. Lu  <hongjiu.lu@intel.com>
14899         * doc/extend.texi: Add description for __builtin_ia32_crc32di.
14901 2009-06-10  Anthony Green  <green@moxielogic.com>
14903         * config/moxie/crti.asm: New file.
14904         * config/moxie/crtn.asm: New file.
14905         * config/moxie/moxie.c: New file.
14906         * config/moxie/moxie.h: New file.
14907         * config/moxie/sfp-machine.h: New file.
14908         * config/moxie/moxie-protos.h: New file.
14909         * config/moxie/t-moxie: Created.
14910         * config/moxie/t-moxie-softfp: Created.
14911         * config/moxie/moxie.md: Created.
14912         * config/moxie/constraints.md: Created.
14913         * config.gcc: Add moxie support.
14914         * doc/md.texi (Machine Constraints): Add moxie constraints.
14915         * doc/contrib.texi (Contributors): Mention moxie port.
14916         * doc/install.texi (Specific): Mention the moxie port.
14918 2009-06-09  Ian Lance Taylor  <iant@google.com>
14920         * system.h (HAVE_DESIGNATED_INITIALIZERS): Don't define if
14921         compiling with C++.
14922         * optabs.c (optab_table): Only use designated initializers if
14923         HAVE_DESIGNATED_INITIALIZERS is defined.
14924         (convert_optab_table): Likewise.
14925         (init_optabs): Always call init_insn_codes if
14926         HAVE_DESIGNATED_INITIALIZERS is not defined.
14928 2009-06-09  Ian Lance Taylor  <iant@google.com>
14930         * targhooks.c (default_builtin_vectorized_function): Change fn
14931         parameter to unsigned int.
14932         (default_builtin_vectorized_conversion): Change code parameter to
14933         unsigned int.
14934         (default_builtin_reciprocal): Change fn parameter to unsigned int.
14935         * targhooks.h: Update declarations.
14936         * config/rs6000/rs6000.c (rs6000_builtin_conversion): Change code
14937         parameter to unsigned int.
14939         * c-typeck.c (comptypes_check_enum_int): New static function.
14940         (comptypes_internal): Add enum_and_int_p parameter.  Change all
14941         callers.
14942         (comp_target_types): Add location parameter.  Change all callers.
14943         (tagged_types_tu_compatible_p): Add enum_and_int_p parameter.
14944         Change all callers.
14945         (function_types_compatible_p, type_lists_compatible_p): Likewise.
14946         (build_conditional_expr): Add colon_loc parameter.  Change all
14947         callers.
14948         (convert_for_assignment): Add location parameter.  Change all callers.
14949         * c-parser.c (c_parser_conditional_expression): Pass location of
14950         colon to build_conditional_expr.
14951         * c-tree.h (build_conditional_expr): Update declaration.
14953 2009-06-09  Sebastian Pop  <sebastian.pop@amd.com>
14955         * graphite.c: Revert previous patch.
14957 2009-06-09  Sebastian Pop  <sebastian.pop@amd.com>
14959         PR bootstrap/40103
14960         * graphite.c: Remove pragma GCC diagnostic warning "-Wc++-compat".
14962 2009-06-09  Ghassan Shobaki  <ghassan.shobaki@amd.com>
14964         * tree-ssa-loop-prefetch.c
14965         (loop_prefetch_arrays): Fixed a portability problem in printf format
14966         string.
14968 2009-06-09  Martin Jambor  <mjambor@suse.cz>
14970         PR tree-optimization/40351
14971         * tree-sra.c (propagate_subacesses_accross_link): Check that a
14972         refrence to a potential artifical subaccess can be constructed.
14974 2009-06-08  Kaz Kojima  <kkojima@gcc.gnu.org>
14976         * config/sh/sh-protos.h (sh_optimization_options): Declare.
14977         (sh_override_options): Likewise.
14978         * config/sh/sh.c: Include params.h.
14979         (sh_optimization_options): New.
14980         (sh_override_options): Likewise.
14981         * config/sh/sh.c (OPTIMIZATION_OPTIONS): Use sh_optimization_options.
14982         (OVERRIDE_OPTIONS): Use sh_override_options.
14984 2009-06-08  Jakub Jelinek  <jakub@redhat.com>
14986         * dwarf2out.c (emit_cfa_remember): New variable.
14987         (add_fde_cfi): If emit_cfa_remember, recurse to add
14988         DW_CFA_remember_state first.
14989         (dwarf2out_begin_epilogue): Don't add_fde_cfi DW_CFA_remember_state,
14990         instead just set emit_cfa_remember.
14992 2009-06-08  Jan Hubicka  <jh@suse.cz>
14994         PR debug/40126
14995         * dwarf2out.c (dwarf2out_abstract_function): Free decl_loc_table.
14997 2009-06-08  Jan Hubicka  <jh@suse.cz>
14999         PR middle-end/39834
15000         * cgraphunit.c (save_inline_function_body): Do not copy transform
15001         hooks for saved inline bodies.
15002         * ipa-passes.c (do_per_function): Do not add the hoks multiple times
15003         for given function.
15005 2009-06-08  Adam Nemet  <anemet@caviumnetworks.com>
15007         * jump.c (returnjump_p): Handle delayed branches.  Add missing
15008         function comment.
15010 2009-06-08  Jan Hubicka  <jh@suse.cz>
15012         PR middle-end/40102
15013         * cgraph.c (cgraph_create_edge_including_clones): Also asume that the
15014         original node might've been modified.
15015         * tree-inline.c (copy_bb): Do not assume that all clones are the same.
15017 2009-06-08  Jakub Jelinek  <jakub@redhat.com>
15019         * tree-object-size.c (addr_object_size): Add OSI argument.
15020         Handle also INDIRECT_REF with SSA_NAME inside of it as base address.
15021         (compute_builtin_object_size, expr_object_size): Adjust callers.
15022         (plus_stmt_object_size): Call addr_object_size instead of
15023         compute_builtin_object_size.
15025 2009-06-08  Ghassan Shobaki  <ghassan.shobaki@amd.com>
15026             Dwarakanath Rajagopal  <dwarak.rajagopal@amd.com>
15028         * tree-ssa-loop-prefetch.c
15029         (gather_memory_references): Introduced a counter for the number of
15030         memory references.
15031         (anything_to_prefetch_p): Introduced a counter for the number of
15032         prefetches.
15033         (is_loop_prefetching_profitable): New function with a cost model
15034         for prefetching.
15035         (loop_prefetch_arrays): Use the new cost model to determine if
15036         prefetching is profitable.
15037         * params.def (MIN_INSN_TO_PREFETCH_RATIO,
15038         PREFETCH_MIN_INSN_TO_MEM_RATIO): New parameters.
15039         * params.h (MIN_INSN_TO_PREFETCH_RATIO,
15040         PREFETCH_MIN_INSN_TO_MEM_RATIO): New parameters.
15041         * doc/invoke.texi (MIN_INSN_TO_PREFETCT_RATIO,
15042         PREFETCH_MIN_INSN_TO_MEM_RATIO): New parameters.
15044 2009-06-08  Michael Matz  <matz@suse.de>
15046         PR debug/40012
15047         * cfgexpand.c (set_rtl): Store place also in DECL_RTL, if all
15048         partitions use the same.
15049         (expand_one_var): Deal with DECL_RTL sometimes begin set also
15050         for basevars of SSA_NAMEs.
15051         (expand_used_vars): Reset TREE_USED for basevars of SSA_NAMEs,
15052         to not expand them twice.
15053         (gimple_expand_cfg): Clear DECL_RTL for those decls that have
15054         multiple places.
15056 2009-06-08  Alexandre Oliva  <aoliva@redhat.com>
15058         * common.opt (fcompare-debug=, fcompare-debug-second): New.
15059         (fdump-final-insns=, gtoggle): New.
15060         * doc/invoke.texi: Document them.
15061         * final.c (rest_of_clean_state): Dump final insn stream.
15062         * gcc.c (invoke_as): Hook in -fcompare-debug.
15063         (static_spec_functions): Add compare-debug-dump-opt,
15064         compare-debug-self-opt and compare-debug-auxbase-opt.
15065         (compare_debug, compare_debug_second, compare_debug_opt): New.
15066         (switches_debug_check, n_switches_debug_check): New.
15067         (debug_auxbase_opt, debug_check_temp_file): New.
15068         (process_command): Handle -fno-compare-debug, -fcompare-debug and
15069         -fcompare-debug=*.
15070         (do_self_spec): Handle arguments after switches.
15071         (do_spec_1): Add .gk extension to temp file basenames for compare.
15072         (check_live_switch): Take SWITCH_IGNORE into account, and earlier.
15073         (cc1_options): Use it instead of normal auxbase computation for
15074         the second compare-debug compilation.
15075         (compare_files): New.
15076         (main): Set up and implement compare debug mode.
15077         (compare_debug_dump_opt_spec_function): New.
15078         (compare_debug_self_opt_spec_function): New.
15079         (compare_debug_auxbase_opt_spec_function): New.
15080         * toplev.c (process_options): Handle flag_gtoggle,
15081         flag_dump_final_insns.
15082         * coverage.c (coverage_begin_output): Don't overwrite .gcno file
15083         during -fcompare-debug-second compilation.
15085 2009-06-07  Ian Lance Taylor  <iant@google.com>
15087         * dwarf2.h (enum dwarf_location_atom): Add INTERNAL_DW_OP_tls_addr.
15088         * dwarf2out.c (INTERNAL_DW_OP_tls_addr): Don't #define.
15090         * c-common.c (c_do_switch_warnings): Don't exit early for -Wswitch
15091         with no default node.  Change warning with %H to warning_at.
15092         Don't clear warn_switch around case checking.
15093         * doc/invoke.texi (Warning Options): Clarify distinction between
15094         -Wswitch and -Wswitch-enum.
15096 2009-06-07  Bernhard Reutner-Fischer  <aldot@gcc.gnu.org>
15098         * tree-pass.h (TODO_update_ssa_any): Document internal use only.
15100 2009-06-07  Bernhard Reutner-Fischer  <aldot@gcc.gnu.org>
15102         * gbl-ctors.h: Add header guard.
15104 2009-06-07  Bernhard Reutner-Fischer  <aldot@gcc.gnu.org>
15106         * tree-flow.h (make_value_handle, set_value_handle, sort_vuses,
15107         sort_vuses_heap, vn_lookup_or_add, vn_lookup_or_add_with_stmt,
15108         vn_lookup_or_add_with_vuses, vn_add, vn_add_with_vuses,
15109         vn_lookup_with_stmt, vn_lookup, vn_lookup_with_vuses): Remove
15110         prototypes for removed functions.
15111         (expressions_equal_p): Move to ...
15112         * tree-ssa-sccvn.h: ... here and ...
15113         * matrix-reorg.c: ... adjust includes.
15115 2009-06-07  Bernhard Reutner-Fischer  <aldot@gcc.gnu.org>
15117         * ipa-struct-reorg.c (do_reorg_1): Fix whitespace in dump output.
15119 2009-06-07  Bernhard Reutner-Fischer  <aldot@gcc.gnu.org>
15121         * c-decl.c (finish_decl): Use bool for variable was_incomplete.
15122         (finish_function): Remove erroneous whitespace.
15124 2009-06-07  Bernhard Reutner-Fischer  <aldot@gcc.gnu.org>
15126         * tree-cfg.c (gimple_merge_blocks): Commentary typo fix.
15127         (verify_stmts): Print statement who's gimple_bb is set to a wrong BB
15129 2009-06-07  Bernhard Reutner-Fischer  <aldot@gcc.gnu.org>
15131         * errors.c (internal_error): Commentary typo fix.
15132         * gimple-iterator.c (gsi_insert_seq_on_edge): Ditto.
15133         * tree-ssa-pre.c: Ditto.
15135 2009-06-07  Bernhard Reutner-Fischer  <aldot@gcc.gnu.org>
15137         * basic-block.h (ENTRY_BLOCK, EXIT_BLOCK): Document that neither of
15138         them is supposed to hold actual statements.
15140 2009-06-06  Ian Lance Taylor  <iant@google.com>
15142         * doc/extend.texi (Attribute Syntax): Document that C++ labels on
15143         empty statements can now have attributes.
15145 2009-06-05  Shujing Zhao  <pearly.zhao@oracle.com>
15147         * config/mips/mips.c: Use REG_P and CONST_INT_P where applicable.
15148         * config/mips/mips.md: Ditto.
15150 2009-06-05  Nathan Froyd  <froydnj@codesourcery.com>
15152         * config/rs6000/eabi.asm (__eabi_convert): Don't define if
15153         _RELOCATABLE.
15154         (__eabi_uconvert): Likewise.
15156 2009-06-05  Nathan Froyd  <froydnj@codesourcery.com>
15158         * config/rs6000/ppc-asm.h: Protect auto-host.h inclusion and
15159         CFI_* definitions with IN_GCC.
15161 2009-06-05  David Edelsohn  <edelsohn@gnu.org>
15163         * xcoffout.h (xcoffout_source_line): Update prototype.
15165 2009-06-05  Kaveh R. Ghazi  <ghazi@caip.rutgers.edu>
15167         * builtins.c (do_mpc_ckconv, do_mpc_arg1): Use
15168         mpc_realref/mpc_imagref instead of MPC_RE/MPC_IM.
15170 2009-06-05  Jakub Jelinek  <jakub@redhat.com>
15172         PR middle-end/40340
15173         * tree-ssa-live.c (remove_unused_scope_block_p): Don't prune
15174         inlined_function_outer_scope_p blocks for artificial inlines
15175         even at -g0/-g1.
15176         * tree.c (tree_nonartificial_location): Rewrite using
15177         block_nonartificial_location.
15179 2009-06-05  Revital Eres  <eres@il.ibm.com>
15180             Leehod Baruch  <leehod@il.ibm.com>
15182         * expr.c (expand_assignment): Expand MISALIGNED_INDIRECT_REF.
15183         (expand_expr_real_1): Remove comment.
15184         * tree-vect-data-refs.c (vect_enhance_data_refs_alignment):
15185         Vectorize misaligned access when the target supports it.
15186         (vect_supportable_dr_alignment): Check for unaligned access support.
15187         * tree-vect-stmts.c (vectorizable_store): Generate misaligned store
15188         and remove asset.
15190 2009-06-05  Julian Brown  <julian@codesourcery.com>
15192         * config/arm/ieee754-df.S (cmpdf2): Avoid writing below SP.
15193         * config/arm/ieee754-sf.S (cmpsf2): Likewise.
15195 2009-06-05  Richard Guenther  <rguenther@suse.de>
15197         PR bootstrap/40350
15198         * dwarf2out.c (dwarf2out_begin_function): Mark discriminator
15199         as possibly unused.
15201 2009-06-05  Jakub Jelinek  <jakub@redhat.com>
15203         * config/s390/s390.c (global_not_special_regno_p): New static inline.
15204         (save_gprs): Don't tell unwinder when a global register is saved.
15205         (s390_emit_epilogue): Emit needed epilogue unwind info.
15207 2009-06-05  Alexandre Oliva  <aoliva@redhat.com>
15209         * dwarf2out.c (deferred_asm_name): New.
15210         (add_name_and_src_coords_attributes): Defer creation of
15211         DW_AT_MIPS_linkage_name attribute if DECL_ASSEMBLER_NAME was not
15212         computed yet.
15213         (move_linkage_attr): New.
15214         (dwarf2out_finish): Revisit deferrals and emit attributes at the
15215         right place.
15217 2009-06-05  Alexandre Oliva  <aoliva@redhat.com>
15219         * tree-nested.c (finalize_nesting_tree_1): Declare the
15220         frame_decl in the binding tree.
15222 2009-06-04  Cary Coutant  <ccoutant@google.com>
15224         * basic-block.h (struct basic_block_def): Add discriminator field.
15225         * dbxout.c (dbxout_source_line): Add new parameter.  Change all
15226         callers.
15227         * debug.c (do_nothing_debug_hooks): Add additional entry.
15228         (debug_nothing_int_charstar_int): New function.
15229         * debug.h (struct gcc_debug_hooks): Add parameter to source_line hook.
15230         (debug_nothing_int_charstar_int): New declaration.
15231         * dwarf2out.c (dwarf2out_source_line): Add new parameter.  Write
15232         discriminator value in .loc directive.
15233         * final.c (last_discriminator): New variable.
15234         (discriminator): New variable.
15235         (final_start_function): Initialize above variables, pass current
15236         discriminator to debug hook.
15237         (notice_source_line): Check for discriminator change.
15238         * gimple-pretty-print.c (dump_bb_header): Print discriminator value.
15239         * sdbout.c (sdbout_source_line): New parameter.
15240         * tree-cfg.c (struct locus_discrim_map): New structure type.
15241         (discriminator_per_locus): New hash table.
15242         (build_gimple_cfg): Allocate and free discriminator hash table.
15243         (make_edges): Call assign_discriminator.
15244         (locus_map_hash): New function.
15245         (locus_map_eq): New function.
15246         (next_discriminator_for_locus): New function.
15247         (same_line_p): New function.
15248         (assign_discriminator): New function.
15249         (make_cond_expr_edges): Call assign_discriminator.
15250         (make_gimple_switch_edges): Likewise.
15251         (first_non_label_stmt): New function.
15252         * vmsdbgout.c (vmsdbgout_source_line): Add new parameter.  Change
15253         all callers.
15254         * xcoffout.c (xcoffout_source_line): Add new parameter.
15256         * configure.ac (gcc_cv_as_discriminator): New configury check for
15257         gas support for discriminator.
15258         * configure: Regenerate.
15259         * config.in: Regenerate.
15261 2009-06-04  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
15263         * config/arm/arm.c (thumb2_legitimate_index_p): Initialize
15264         val after checking for integers.
15266 2009-06-04  Uros Bizjak  <ubizjak@gmail.com>
15268         * config/i386/i386.h (X86_64_MS_REGPARM_MAX): Rename from
15269         X64_REGPARM_MAX.
15270         (REGPARM_MAX): Use X86_64_MS_REGPARM_MAX.
15271         (X86_64_MS_SSE_REGPARM_MAX): Rename from X64_SSE_REGPARM_MAX.
15272         (SSE_REGPARM_MAX): Use X86_64_MS_SSE_REGPARM_MAX.
15273         * config/i386/i386.c: Use X86_64_MS_REGPARM_MAX instead of
15274         X64_REGPARM_MAX.  Use X86_64_MS_SSE_REGPARM_MAX instead of
15275         X64_SSE_REGPARM_MAX.
15276         * config/i386/i386.md: Use X86_64_MS_SSE_REGPARM_MAX instead of
15277         X64_SSE_REGPARM_MAX.
15279 2009-06-04  Alexandre Oliva  <aoliva@redhat.com>
15281         * gcc.c (report_times_to_file): New.
15282         (execute): Implement it.
15283         (process_command): Support -time=.
15284         * doc/invoke.texi: Document it.
15286 2009-06-04  Alexandre Oliva  <aoliva@redhat.com>
15288         * tree-ssa-live.c (remove_unused_scope_block_p): Keep variables
15289         that have value exprs.
15291 2009-06-04  Alexandre Oliva  <aoliva@redhat.com>
15293         * dwarf2asm.c (dw2_force_const_mem): Defer creation of
15294         declarations for constants until...
15295         (dw2_output_indirect_constant_1): ... this point.
15297 2009-06-04  Richard Earnshaw  <rearnsha@arm.com>
15299         PR target/10242
15300         * arm.md (arm_addsi3): Don't try to split an add with an
15301         eliminable register until after reload has completed.
15303 2009-06-03  Ian Lance Taylor  <iant@google.com>
15305         * dummy-checksum.c (executable_checksum): Use EXPORTED_CONST.
15306         * genattrtab.c (write_length_unit_log): Likewise.
15307         * genchecksum.c (dosum): Likewise.
15308         * gengtype.c (write_rtx_next): Likewise.
15309         (finish_root_table, write_roots): Likewise.
15310         * gimple.c (gimple_ops_offset_): Likewise.
15311         * tree-nomudflap.c (gt_ggc_r_gt_tree_mudflap_h): Likewise.
15312         * config/arc/arc.c (arc_attribute_table): Likewise.
15313         * config/arm/arm.c (arm_attribute_table): Likewise.
15314         * config/avr/avr.c (avr_attribute_table): Likewise.
15315         * config/crx/crx.c (crx_attribute_table): Likewise.
15316         * config/m32r/m32r.c (m32r_attribute_table): Likewise.
15317         * config/m68hc11/m68hc11.c (m68hc11_attribute_table): Likewise.
15318         * config/mcore/mcore.c (mcore_attribute_table): Likewise.
15319         * config/rs6000/rs6000.c (rs6000_attribute_table): Likewise.
15320         * config/sh/sh.c (sh_attribute_table): Likewise.
15321         * config/sparc/sparc.c (sparc_attribute_table): Likewise.
15322         * config/spu/spu.c (spu_attribute_table): Likewise.
15323         * config/v850/v850.c (v850_attribute_table): Likewise.
15325         * config/alpha/alpha.c (vms_attribute_table): Make static.
15326         * config/bfin/bfin.c (bfin_attribute_table): Likewise.
15327         * config/h8300/h8300.c (h8300_attribute_table): Likewise.
15328         * config/mips/mips.c (mips_attribute_table): Likewise.
15330         * Makefile.in (dummy-checksum.o): Depend upon $(CONFIG_H) and
15331         $(SYSTEM_H).
15332         (cc1-checksum.o): Likewise.
15334 2009-06-03  Steve Ellcey  <sje@cup.hp.com>
15336         * config/ia64/vect.md (*movv2sf_internal): Handle big endian case.
15338 2009-06-03  Jakub Jelinek  <jakub@redhat.com>
15340         * config/rs6000/rs6000.c (rs6000_emit_stack_reset): Return generated
15341         insn if it is changing sp.  Use gen_add3_insn instead of
15342         conditionally gen_addsi3 and gen_adddi3.
15343         (offset_below_red_zone_p): New static inline function.
15344         (rs6000_emit_epilogue): Emit needed epilogue unwind info.
15345         Use gen_add3_insn instead of conditionally gen_addsi3 and gen_adddi3.
15346         * config/rs6000/ppc-asm.h: Include auto-host.h.
15347         (CFI_STARTPROC, CFI_ENDPROC, CFI_DEF_CFA_REGISTER, CFI_OFFSET,
15348         CFI_RESTORE): Define.
15349         * config/rs6000/crtresxgpr.asm: Add unwind info.
15350         * config/rs6000/crtresxfpr.asm: Likewise.
15351         * config/rs6000/crtresgpr.asm: Likewise.
15352         * config/rs6000/crtresfpr.asm: Likewise.
15353         * config/rs6000/crtsavgpr.asm: Likewise.
15354         * config/rs6000/crtsavfpr.asm: Likewise.
15356         * dwarf2out.c (output_cfi_directive): Pass 1 instead of 0 to second
15357         argument of DWARF2_FRAME_REG_OUT macros.
15359 2009-06-03  Julian Brown  <julian@codesourcery.com>
15361         * config/arm/arm.c (arm_hard_regno_mode_ok): Permit values of four
15362         words or less (including TImode) in core registers.
15364 2009-06-03  Richard Guenther  <rguenther@suse.de>
15366         PR middle-end/40328
15367         * fold-const.c (fold_convert): Fold the build COMPLEX_EXPR.
15369 2009-06-03  Andrey Belevantsev  <abel@ispras.ru>
15371         * statistics.c (statistics_counter_event): Do not record event
15372         in pass dump if its number == -1.
15373         (curr_statistics_hash): Add assert that we never get passes
15374         with static number == -1.
15376 2009-06-03  Richard Guenther  <rguenther@suse.de>
15377             Andrey Belevantsev  <abel@ispras.ru>
15379         * cfgexpand.c (discover_nonconstant_array_refs_r): Make only
15380         non-BLKmode arrays addressable.
15382 2009-06-03  Maxim Kuvyrkov  <maxim@codesourcery.com>
15384         * config/m68k/linux.h (HAVE_GAS_BALIGN_AND_P2ALIGN): Move to ...
15385         * config/m68k/m68k.h: ... here.
15387 2009-06-03  Martin Jambor  <mjambor@suse.cz>
15389         PR tree-optimization/40323
15390         * ipa-prop.c (get_ssa_def_if_simple_copy): Break if not single
15391         assignment.
15393 2009-06-03  Richard Guenther  <rguenther@suse.de>
15395         * tree-ssa-sccvn.c (copy_reference_ops_from_ref): Use DECL_SIZE
15396         consistently.
15398 2009-06-03  Shujing Zhao  <pearly.zhao@oracle.com>
15400         * config/sh/predicates.md: Use REG_P, MEM_P, CONST_INT_P, LABEL_P,
15401         JUMP_P, CALL_P, NONJUMP_INSN_P, NOTE_P, BARRIER_P and
15402         JUMP_TABLE_DATA_P where applicable.
15403         * config/sh/sh.c: Ditto.
15404         * config/sh/sh.h: Ditto.
15405         * config/sh/sh.md: Ditto.
15406         * config/sh/symbian.c: Ditto.
15408 2009-06-03  Uros Bizjak  <ubizjak@gmail.com>
15410         * config/i386/driver-i386.c (describe_cache): Optimize
15411         concatenation of strings.  Use snprintf instead of sprintf.
15412         (host_detect_local_cpu): Ditto.  Ignore -march and -mtune for native
15413         target when not compiling with GCC.
15415 2009-06-02  Kaz Kojima  <kkojima@gcc.gnu.org>
15417         * config/sh/sh.c: Revert last change.
15418         (sh_expand_epilogue): Emit a blockage insn before the frame
15419         pointer adjustment unconditionally.
15421 2009-06-02  Richard Sandiford  <r.sandiford@uk.ibm.com>
15423         * config/pa/pa-hpux.h (LINK_SPEC): Remove "%<fwhole-program".
15424         * config/pa/pa-hpux10.h (LINK_SPEC): Likewise.
15425         * config/pa/pa-hpux11.h (LINK_SPEC): Likewise.
15426         * gcc.c (set_collect_gcc_options): Don't add -fwhole-program
15427         to COLLECT_GCC_OPTIONS.
15429 2009-06-02  Richard Sandiford  <r.sandiford@uk.ibm.com>
15431         * collect2.c (target_system_root): New variable.
15432         (main): Handle --sysroot=.
15433         (ignore_library): Strip the sysroot from the library path.
15435 2009-06-02  Richard Sandiford  <r.sandiford@uk.ibm.com>
15437         * Makefile.in (COLLECT2_OBJS): Add collect2-aix.o.
15438         (collect2.o): Depend on collect2-aix.h.
15439         (collect2-aix.o): New rule.
15440         * collect2-aix.h: New file.
15441         * collect2-aix.c: Likewise.
15442         * collect2.c: Include collect2-aix.h.  Don't undefine
15443         OBJECT_FORMAT_COFF if CROSS_AIX_SUPPORT is defined.
15444         Guard native includes with #ifndef CROSS_DIRECTORY_STRUCTURE.
15445         Use TARGET_AIX_VERSION instead of _AIX51.
15446         * config/rs6000/aix43.h (TARGET_AIX_VERSION): Define.
15447         * config/rs6000/aix51.h (TARGET_AIX_VERSION): Likewise.
15448         * config/rs6000/aix52.h (TARGET_AIX_VERSION): Likewise.
15449         * config/rs6000/aix53.h (TARGET_AIX_VERSION): Likewise.
15450         * config/rs6000/aix61.h (TARGET_AIX_VERSION): Likewise.
15452 2009-06-02  Richard Sandiford  <r.sandiford@uk.ibm.com>
15454         * collect2.c (ignore_library): Avoid premature post-increment
15455         and null deference.
15457 2009-06-02  Richard Sandiford  <r.sandiford@uk.ibm.com>
15459         * Makefile.in (libgcc.mvars): Add TARGET_SYSTEM_ROOT.
15460         * config/rs6000/aix.h (LINK_SYSCALLS_SPEC): Add %R to the
15461         !CROSS_DIRECTORY_STRUCTURE alternative and use it for
15462         CROSS_DIRECTORY_STRUCTURE too.
15463         (LINK_LIBG_SPEC): Likewise.
15464         (LIB_SPEC): Add %R to sysroot paths.
15465         * config/rs6000/aix43.h (CPP_SPEC): Add %R to sysroot paths.
15466         (CPLUSPLUS_CPP_SPEC, LIB_SPEC): Likewise.
15467         * config/rs6000/aix51.h: As for aix43.h.
15468         * config/rs6000/aix52.h: Likewise.
15469         * config/rs6000/aix53.h: Likewise.
15470         * config/rs6000/aix61.h: Likewise.
15471         * config/rs6000/t-aix52 (SHLIB_LINK): Add $(TARGET_SYSTEM_ROOT)
15472         to the beginning of sysroot paths.
15474 2009-06-02  Alexandre Oliva  <aoliva@redhat.com>
15476         * print_rtl (print_rtx): Don't print modes in EXPR_LISTs and
15477         INSN_LISTs that are out of the REG_NOTE range.
15479 2009-06-02  Alexandre Oliva  <aoliva@redhat.com>
15481         * loop-unroll.c (struct iv_to_split): Add pointer to next.
15482         (struct var_to_expand): Likewise.
15483         (struct opt_info): Add head and tail for linked lists of the above.
15484         (analyze_insn_to_expand_var): Initialize next.
15485         (analyze_iv_to_split_insn): Likewise.
15486         (analyze_insns_in_loop): Create linked lists.
15487         (allocate_basic_variable): Simplify for use without hash table.
15488         (insert_var_expansion_initialization): Likewise, make it type-safer.
15489         (combine_var_copies_in_loop_exit): Likewise.
15490         (apply_opt_in_copies): Walk lists rather than hash tables.
15491         (release_var_copies): Simplified and inlined by hand into...
15492         (free_opt_info): ... this function.
15494 2009-06-02  Richard Guenther  <rguenther@suse.de>
15496         * tree-ssa-sccvn.c (copy_reference_ops_from_ref): Use DECL_SIZE
15497         for field decls.
15499 2009-06-02  Alexandre Oliva  <aoliva@redhat.com>
15501         * cfgexpand.c (gimple_expand_cfg): Discard the source location
15502         only for builtins that are not overridden.
15504 2009-06-02  Alexandre Oliva  <aoliva@redhat.com>
15506         * gengtype.c (adjust_field_rtx_def): Add NOTE_INSN_DELETED_LABEL's
15507         label string.
15509 2009-06-02  Alexandre Oliva  <aoliva@redhat.com>
15511         * df-core.c (df_ref_debug): Honor -fdump-noaddr.
15513 2009-06-02  Alexandre Oliva  <aoliva@redhat.com>
15515         * combine.c (move_deaths): Compare LUIDs within the same BB only.
15517 2009-06-02  Alexandre Oliva  <aoliva@redhat.com>
15519         * common.opt (fdump-unnumbered-links): New.
15520         * doc/invoke.texi (-fdump-unnumbered-links): Document it.
15521         * print-rtl.c (flag_dump_unnumbered_links): New.
15522         (print_rtx): Test it.
15524 2009-06-02  Richard Earnshaw  <rearnsha@arm.com>
15526         * arm.c (arm_get_frame_offsets): Prefer using r3 for padding a
15527         push/pop multiple to 8-byte alignment.
15529 2009-06-01  Jakub Jelinek  <jakub@redhat.com>
15531         * config/i386/i386.c (queued_cfa_restores): New static variable.
15532         (ix86_add_cfa_restore_note, ix86_add_queued_cfa_restore_notes): New
15533         functions.
15534         (pro_epilogue_adjust_stack): Call ix86_add_queued_cfa_restore_notes.
15535         (ix86_emit_restore_reg_using_pop): Add RED_OFFSET argument.
15536         Set RTX_FRAME_RELATED_P immediately after adding a REG_CFA_* note.
15537         Call ix86_add_cfa_restore_note instead of adding REG_CFA_OFFSET
15538         note unconditionally.
15539         (ix86_emit_restore_regs_using_mov): Likewise.
15540         (ix86_emit_restore_sse_regs_using_mov): Likewise.
15541         (ix86_emit_restore_regs_using_pop): Add RED_OFFSET argument, pass
15542         it through to ix86_emit_restore_reg_using_pop.
15543         (ix86_emit_leave): Add RED_OFFSET argument.  Call
15544         ix86_add_queued_cfa_restore_notes.  Call ix86_add_cfa_restore_note
15545         instead of adding REG_CFA_OFFSET note unconditionally.
15546         (ix86_expand_epilogue): Compute RED_OFFSET, pass it down to
15547         the above functions.  Call ix86_add_queued_cfa_restore_notes when
15548         needed.
15550         * dwarf2out.c (dwarf2out_cfi_label): Add FORCE argument, if true,
15551         force output of the label even for dwarf2out_do_cfi_asm.
15552         (add_fde_cfi): If -g2 and above and cfi might change CFA,
15553         force creation of CFI label and chain DW_CFA_set_loc jumping to it
15554         for convert_cfa_to_fb_loc_list.  Adjust other dwarf2out_cfi_label
15555         caller.
15556         (dwarf2out_stack_adjust, dwarf2out_frame_debug,
15557         dwarf2out_begin_epilogue, dwarf2out_frame_debug_restore_state): Adjust
15558         dwarf2out_cfi_label callers.
15559         * tree.h (dwarf2out_cfi_label): Adjust prototype.
15560         * config/arm/arm.c (thumb_pushpop, thumb1_output_function_prologue):
15561         Adjust dwarf2out_cfi_label callers.
15562         * config/vax/vax.c (vax_output_function_prologue): Likewise.
15564         * config/i386/i386.h (struct machine_cfa_state,
15565         struct machine_function): Guard with ifndef USED_FOR_TARGET
15566         instead of not IN_LIBGCC2 and not in IN_TARGET_LIBS.
15568         PR other/40024
15569         * emutls.c (__emutls_get_address): Change arr->size to mean number
15570         of allocated arr->data entries instead of # of slots + 1.
15572         PR middle-end/40316
15573         * recog.c (peep2_reinit_state): New function.
15574         (peephole2_init_state): Use it at the end of a basic block and also
15575         when seeing a RTX_FRAME_RELATED_P insn.
15577 2009-06-01  Steve Ellcey  <sje@cup.hp.com>
15579         * ia64.md (floatdirf2, fix_truncrfdi, floatunsdirf,
15580         fixuns_truncrfdi2): New.
15581         (fix_truncxfdi2_alts, fixuns_truncxfdi2_alts,
15582         *nmaddsf4_alts, *nmadddf4_alts, *nmadddf4_truncsf_alts,
15583         *mulxf3_alts, *mulxf3_truncsf_alts, *mulxf3_truncdf_alts,
15584         *maddxf4_alts, *maddxf4_alts_truncsf, *maddxf4_alts_truncdf,
15585         *nmaddxf4_alts, *nmaddxf4_truncsf_alts, *nmaddxf4_truncdf_alts,
15586         *recip_approx): Remove.
15587         (divsi3 modsi3, udivsi3, umodsi3, divsi3_internal, divdi3,
15588         moddi3, udivdi3, umoddi3, divdi3_internal_lat, divdi3_internal_thr,
15589         divsf3, sqrtsf2, divdf3, sqrtdf2, divxf3, sqrtxf2): Modify and
15590         move to div.md.
15591         * div.md (fix_truncrfdi2_alts, fixuns_truncrfdi2_alt,
15592         setf_exp_rf): New.
15594 2009-06-01  Ian Lance Taylor  <iant@google.com>
15596         * attribs.c (register_attribute): Use CONST_CAST.
15597         * collect2.c (main): Use CONST_CAST2.
15598         (scan_prog_file): Likewise.
15599         * gcc.c (process_command, main): Likewise.
15600         * toplev.c (toplev_main): Likewise.
15602         * c-typeck.c (handle_warn_cast_qual): New static function,
15603         partially broken out of build_c_cast.
15604         (build_c_cast): Call handle_warn_cast_qual.
15605         * doc/invoke.texi (Warning Options): Document new effect of
15606         -Wcast-qual.
15608 2009-06-01  Aldy Hernandez  <aldyh@redhat.com>
15610         * diagnostic.c (diagnostic_build_prefix): Always print columns.
15611         (diagnostic_report_current_module): Print columns.
15612         * common.opt (flag_show_column): Enable by default.
15614 2009-06-01  Luis Machado  <luisgpm@br.ibm.com>
15616         * alias.c (find_base_term): Check for NULL term before returning.
15618 2009-06-01  Maxim Kuvyrkov  <maxim@codesourcery.com>
15620         Revert due to PR40320:
15621         2009-06-01  Maxim Kuvyrkov  <maxim@codesourcery.com>
15622         * calls.c (emit_library_call_value_1): Don't force_operand for move
15623         and push insns.
15625 2009-06-01  Olivier Hainque  <hainque@adacore.com>
15626             Eric Botcazou  <ebotcazou@adacore.com>
15628         * tree.h (CONSTRUCTOR_BITFIELD_P): True if NODE, a FIELD_DECL, is
15629         to be processed as a bitfield for constructor output purposes.
15630         * output.h (initializer_constant_valid_for_bitfield_p): Declare
15631         new function.
15632         * varasm.c (oc_local_state): New type, output_constructor
15633         local state to support communication with helpers.
15634         (oc_outer_state): New type, output_constructor outer state of
15635         relevance in recursive calls.
15636         (output_constructor_array_range): New output_constructor helper,
15637         extracted code for an array range element.
15638         (output_constructor_regular_field): New output_constructor helper,
15639         extracted code for an element that is not a bitfield.
15640         (output_constructor_bitfield): New output_constructor helper,
15641         extracted code for a bitfield element.  Accept an OUTER state
15642         argument for recursive processing.  Recurse on record or array
15643         CONSTRUCTOR values, possibly past noop conversions.
15644         (initializer_constant_valid_for_bitfield_p): New predicate.  Whether
15645         VALUE is a valid constant-valued expression for use in a static
15646         bit-field initializer.
15647         (output_constructor): Rework to use helpers.  Accept and honor an
15648         OUTER state argument for recursive calls.  Return total size.  Be
15649         prepared for nested constructors initializing bitfields.
15650         (output_constant): Feed OUTER in calls to output_constructor.
15652 2009-06-01  Maxim Kuvyrkov  <maxim@codesourcery.com>
15654         * calls.c (emit_library_call_value_1): Don't force_operand for move
15655         and push insns.
15657 2009-06-01  Nick Clifton  <nickc@redhat.com>
15659         * doc/invoke.texi (IA-64 Options): Fix typo.
15661 2009-06-01  Ira Rosen  <irar@il.ibm.com>
15663         PR tree-optimization/39129
15664         * tree-vect-loop-manip.c (conservative_cost_threshold): Change the
15665         printed message.
15666         (vect_do_peeling_for_loop_bound): Use
15667         LOOP_REQUIRES_VERSIONING_FOR_ALIGNMENT and
15668         LOOP_REQUIRES_VERSIONING_FOR_ALIAS macros.
15669         (vect_loop_versioning): Likewise.
15670         (vect_create_cond_for_alias_checks): Fix indentation.
15671         * tree-vectorizer.h (struct _loop_vec_info): Fix indentation of the
15672         macros.
15673         (LOOP_REQUIRES_VERSIONING_FOR_ALIGNMENT): Define.
15674         (LOOP_REQUIRES_VERSIONING_FOR_ALIAS): Likewise.
15675         * tree-vect-loop.c (vect_analyze_loop_form): Change "too many BBs" to
15676         "control flow in loop".
15677         (vect_estimate_min_profitable_iters): Use
15678         LOOP_REQUIRES_VERSIONING_FOR_ALIGNMENT and
15679         LOOP_REQUIRES_VERSIONING_FOR_ALIAS macros.
15680         * tree-vect-data-refs.c (vect_enhance_data_refs_alignment): Likewise.
15681         (vect_create_data_ref_ptr): Don't mention array dimension in printing.
15682         * tree-vect-stmts.c (vectorizable_store): Replace the check that the
15683         statement belongs to a group of strided accesses with the exact code
15684         check.
15685         (vectorizable_load): Likewise.
15686         * tree-vect-slp.c (vect_analyze_slp_instance): Spell out "basic block".
15687         (vect_slp_analyze_bb, vect_slp_transform_bb): Likewise.
15689 2009-06-01  Gerald Pfeifer  <gerald@pfeifer.com>
15691         * config/freebsd-stdint.h: New file.
15692         * config.gcc (*-*-freebsd): Set use_gcc_stdint=wrap.
15693         Add freebsd-stdint.h to tm_file.
15695 2009-06-01  Richard Earnshaw  <rearnsha@arm.com>
15697         * arm/thumb2.md (thumb2_zero_extendhidi2): New insn and split.
15698         (thumb2_extendhidi2): Likewise.
15700 2009-05-31  Ian Lance Taylor  <iant@google.com>
15702         * regstat.c (regstat_n_sets_and_refs): Remove duplicate definition.
15704 2009-05-31  Ian Lance Taylor  <iant@google.com>
15706         * Makefile.in (except.o): Depend upon gt-except.h, not gt-$(EXCEPT_H).
15707         (ipa-cp.o): Depend upon $(FIBHEAP_H) and $(PARAMS_H).
15708         (ipa-reference.o): Depend upon gt-ipa-reference.h.
15710 2009-05-31  Jason Merrill  <jason@redhat.com>
15712         * tree-pretty-print.c (print_call_name): Take the callee, not the
15713         call itself.  Make non-static.  Use dump_function_name for functions.
15714         (dump_generic_node): Adjust.
15715         * diagnostic.h: Declare print_call_name.
15716         * gimple-pretty-print.c (dump_gimple_call): Use it.
15718 2009-05-31  Kaz Kojima  <kkojima@gcc.gnu.org>
15720         * config/sh/sh.md (ashldi3_std): New define_expand.
15721         (ashldi3): Use it.
15723 2009-05-31  Kaz Kojima  <kkojima@gcc.gnu.org>
15725         PR target/40313
15726         * config/sh/sh.c: Include debug.h.
15727         (sh_expand_epilogue): Emit a blockage insn before the frame
15728         pointer adjustment also when dwarf2out_do_frame returns true.
15730 2009-05-31  Richard Earnshaw  <rearnsha@arm.com>
15732         * arm/thumb2.md (thumb2_extendsidi2): Add a split sub-pattern.
15733         (thumb2_extendqidi2): New pattern.
15735 2009-05-31  Ira Rosen  <irar@il.ibm.com>
15737         * tree-vect-loop-manip.c (slpeel_update_phi_nodes_for_guard1): Don't
15738         mark phis for renaming.
15739         * tree-vectorizer.c (vect_memsyms_to_rename): Remove.
15740         (vectorize_loops): Don't allocate and free vect_memsyms_to_rename.
15741         Call mark_sym_for_renaming.
15742         * tree-vectorizer.h (vect_memsyms_to_rename): Remove.
15743         * tree-vect-loop.c (vect_transform_loop): Remove
15744         vect_memsyms_to_rename initialization and a call to
15745         mark_set_for_renaming.
15747 2009-05-31  Jakub Jelinek  <jakub@redhat.com>
15749         PR middle-end/40304
15750         * config/i386/i386.c (pro_epilogue_adjust_stack): Mark insns
15751         frame related even if !set_cfa && style < 0.
15753 2009-05-30  Kai Tietz  <kai.tietz@onevision.com>
15755         * config/i386/mingw-tls.c: New file.
15756         * config/i386/t-gthr-win32 (LIB2FUNCS_EXTRA): Add mingw-tls.c file.
15757         * gthr-win32.h (MINGW32_SUPPORTS_MT_EH): Define it for targets
15758         defining _WIN32 but not __CYGWIN__.
15760 2009-05-29  Kaveh R. Ghazi  <ghazi@caip.rutgers.edu>
15762         * configure.ac: Add MPC support.
15764         * config.in, configure: Regenerate.
15766 2009-05-29  Richard Henderson  <rth@redhat.com>
15768         * cfgcleanup.c (try_crossjump_to_edge): Only skip past
15769         NOTE_INSN_BASIC_BLOCK.
15770         * cfglayout.c (duplicate_insn_chain): Copy epilogue insn marks.
15771         Duplicate NOTE_INSN_EPILOGUE_BEG notes.
15772         * cfgrtl.c (can_delete_note_p): Allow NOTE_INSN_EPILOGUE_BEG
15773         to be deleted.
15774         * dwarf2out.c (struct cfa_loc): Change indirect field to bitfield,
15775         add in_use field.
15776         (add_cfi): Disable check redefining cfa away from drap.
15777         (lookup_cfa_1): Add remember argument; handle remember/restore.
15778         (lookup_cfa): Pass remember argument.
15779         (cfa_remember): New.
15780         (compute_barrier_args_size_1): Remove sibcall check.
15781         (dwarf2out_frame_debug_def_cfa): New.
15782         (dwarf2out_frame_debug_adjust_cfa): New.
15783         (dwarf2out_frame_debug_cfa_offset): New.
15784         (dwarf2out_frame_debug_cfa_register): New.
15785         (dwarf2out_frame_debug_cfa_restore): New.
15786         (dwarf2out_frame_debug): Handle REG_CFA_* notes.
15787         (dwarf2out_begin_epilogue): New.
15788         (dwarf2out_frame_debug_restore_state): New.
15789         (dw_cfi_oprnd1_desc): Handle DW_CFA_remember_state,
15790         DW_CFA_restore_state.
15791         (output_cfi_directive): Likewise.
15792         (convert_cfa_to_fb_loc_list): Likewise.
15793         (dw_cfi_oprnd1_desc): Handle DW_CFA_restore.
15794         * dwarf2out.h: Update.
15795         * emit-rtl.c (try_split): Don't split RTX_FRAME_RELATED_P.
15796         (copy_insn_1): Early out for null.
15797         * final.c (final_scan_insn): Call dwarf2out_begin_epilogue
15798         and dwarf2out_frame_debug_restore_state.
15799         * function.c (prologue, epilogue, sibcall_epilogue): Remove.
15800         (prologue_insn_hash, epilogue_insn_hash): New.
15801         (free_after_compilation): Adjust freeing accordingly.
15802         (record_insns): Create hash table if needed; push insns into
15803         hash instead of array.
15804         (maybe_copy_epilogue_insn): New.
15805         (contains): Search hash table instead of array.
15806         (sibcall_epilogue_contains): Remove.
15807         (thread_prologue_and_epilogue_insns): Split eh_return insns
15808         and mark them as epilogues.
15809         (reposition_prologue_and_epilogue_notes): Rewrite epilogue
15810         scanning in terms of basic blocks.
15811         * insn-notes.def (CFA_RESTORE_STATE): New.
15812         * jump.c (returnjump_p_1): Accept EH_RETURN.
15813         (eh_returnjump_p_1, eh_returnjump_p): New.
15814         * reg-notes.def (CFA_DEF_CFA, CFA_ADJUST_CFA, CFA_OFFSET,
15815         CFA_REGISTER, CFA_RESTORE): New.
15816         * rtl.def (EH_RETURN): New.
15817         * rtl.h (eh_returnjump_p, maybe_copy_epilogue_insn): Declare.
15819         * config/bfin/bfin.md (UNSPEC_VOLATILE_EH_RETURN): Remove.
15820         (eh_return_internal): Use eh_return rtx; split w/ epilogue.
15822         * config/i386/i386.c (gen_push): Update cfa state.
15823         (pro_epilogue_adjust_stack): Add set_cfa argument.  When true,
15824         add a CFA_ADJUST_CFA note.
15825         (ix86_dwarf_handle_frame_unspec): Remove.
15826         (ix86_expand_prologue): Update cfa state.
15827         (ix86_emit_restore_reg_using_pop): New.
15828         (ix86_emit_restore_regs_using_pop): New.
15829         (ix86_emit_leave): New.
15830         (ix86_emit_restore_regs_using_mov): Add CFA_RESTORE notes.
15831         (ix86_expand_epilogue): Add notes for unwinding the epilogue.
15832         * config/i386/i386.h (struct machine_cfa_state): New.
15833         (ix86_cfa_state): New.
15834         * config/i386/i386.md (UNSPEC_EH_RETURN): Remove.
15835         (eh_return_internal): Merge from eh_return_<mode>,
15836         use eh_return rtx, split w/ epilogue.
15838 2009-05-29  Ian Lance Taylor  <iant@google.com>
15840         * builtins.c (validate_gimple_arglist): Don't use va_arg with
15841         enum type.
15842         * calls.c (emit_library_call_value_1): Likewise.
15844         * c-typeck.c (c_build_va_arg): New function.
15845         * c-tree.h (c_build_va_arg): Declare.
15846         * c-parser.c (c_parser_postfix_expression): Call c_build_va_arg
15847         instead of build_va_arg.
15849 2009-05-29  Eric Botcazou  <ebotcazou@adacore.com>
15851         * tree-ssa-loop-ivopts.c (strip_offset_1) <MULT_EXPR>: New case.
15852         (force_expr_to_var_cost) <NEGATE_EXPR>: Likewise.
15853         (ptr_difference_cost): Use affine combinations to compute it.
15854         (difference_cost): Likewise.
15855         (get_computation_cost_at): Compute more accurate cost for addresses
15856         if the ratio is a multiplier allowed in addresses.
15857         For non-addresses, consider that an additional offset or symbol is
15858         added only once.
15860 2009-05-29  Jakub Jelinek  <jakub@redhat.com>
15862         * config/i386/i386.c (ix86_decompose_address): Avoid useless
15863         0 displacement.  Add 0 displacement if base is %[er]bp or %r13.
15865         * config/i386/i386.md (prefix_data16, prefix_rep): Set to 0 for
15866         TYPE_SSE{MULADD,4ARG,IADD1,CVT1} by default.
15867         (prefix_rex): For UNIT_MMX don't imply the prefix by default
15868         if MODE_DI.
15869         (prefix_extra): Default to 2 for TYPE_SSE{MULADD,4ARG} and
15870         to 1 for TYPE_SSE{IADD1,CVT1}.
15871         (prefix_vex_imm8): Removed.
15872         (length_vex): Only pass 1 as second argument to
15873         ix86_attr_length_vex_default if prefix_extra is 0.
15874         (modrm): For TYPE_INCDEC only set to 0 if not TARGET_64BIT.
15875         (length): For prefix vex computation use length_immediate
15876         attribute instead of prefix_vex_imm8.
15877         (cmpqi_ext_3_insn, cmpqi_ext_3_insn_rex64,
15878         addqi_ext_1, addqi_ext_1_rex64, *testqi_ext_0, andqi_ext_0,
15879         *andqi_ext_0_cc, *iorqi_ext_0, *xorqi_ext_0, *xorqi_cc_ext_1,
15880         *xorqi_cc_ext_1_rex64): Override modrm attribute to 1.
15881         (extendsidi2_rex64, extendhidi2, extendqidi2, extendhisi2,
15882         *extendhisi2_zext, extendqihi2, extendqisi2, *extendqisi2_zext): Emit
15883         a space in between the operands.
15884         (*anddi_1_rex64, *andsi_1): Likewise.  Override prefix_rex to 1
15885         if one operand is 0xff and the other one si, di, bp or sp.
15886         (*andhi_1): Override prefix_rex to 1 if one operand is 0xff and the
15887         other one si, di, bp or sp.
15888         (*btsq, *btrq, *btcq, *btdi_rex64, *btsi): Add mode attribute.
15889         (*ffssi_1, *ffsdi_1, ctzsi2, ctzdi2): Add
15890         type and mode attributes.
15891         (*bsr, *bsr_rex64, *bsrhi): Add type attribute.
15892         (*cmpfp_i_mixed, *cmpfp_iu_mixed): For TYPE_SSECOMI, clear
15893         prefix_rep attribute and set prefix_data16 attribute iff MODE_DF.
15894         (*cmpfp_i_sse, *cmpfp_iu_sse): Clear prefix_rep attribute and set
15895         prefix_data16 attribute iff MODE_DF.
15896         (*movsi_1): For TYPE_SSEMOV MODE_SI set prefix_data16 attribute.
15897         (fix_trunc<mode>di_sse): Set prefix_rex attribute.
15898         (*adddi_4_rex64, *addsi_4): Use const128_operand instead of
15899         constm128_operand in length_immediate computation.
15900         (*addhi_4): Likewise.  Fix mode attribute to MODE_HI.
15901         (anddi_1_rex64): Use movzbl/movzwl instead of movzbq/movzwq.
15902         (*avx_ashlti3, sse2_ashlti3, *avx_lshrti3, sse2_lshrti3): Set
15903         length_immediate attribute to 1.
15904         (x86_fnstsw_1, x86_fnstcw_1, x86_fldcw_1): Fix length attribute.
15905         (*movdi_1_rex64): Override prefix_rex or prefix_data16 attributes
15906         for certain alternatives.
15907         (*movdf_nointeger, *movdf_integer_rex64, *movdf_integer): Override
15908         prefix_data16 attribute if MODE_V1DF.
15909         (*avx_setcc<mode>, *sse_setcc<mode>, *sse5_setcc<mode>): Set
15910         length_immediate to 1.
15911         (set_got_rex64, set_rip_rex64): Remove length attribute, set
15912         length_address to 4, set mode attribute to MODE_DI.
15913         (set_got_offset_rex64): Likewise.  Set length_immediate to 0.
15914         (fxam<mode>2_i387): Set length attribute to 4.
15915         (*prefetch_sse, *prefetch_sse_rex, *prefetch_3dnow,
15916         *prefetch_3dnow_rex): Override length_address attribute.
15917         (sse4_2_crc32<mode>): Override prefix_data16 and prefix_rex
15918         attributes.
15919         * config/i386/predicates.md (ext_QIreg_nomode_operand): New predicate.
15920         (constm128_operand): Removed.
15921         * config/i386/i386.c (memory_address_length): For
15922         disp && !index && !base in 64-bit mode account for SIB byte if
15923         print_operand_address can't optimize disp32 into disp32(%rip)
15924         and UNSPEC doesn't imply (%rip) addressing.  Add 1 to length
15925         for fs: or gs: segment.
15926         (ix86_attr_length_immediate_default): When checking if shortform
15927         is possible, truncate immediate to the length of the non-shortened
15928         immediate.
15929         (ix86_attr_length_address_default): Ignore MEM_P operands
15930         with X constraint.
15931         (ix86_attr_length_vex_default): Only check for DImode on
15932         GENERAL_REG_P operands.
15933         * config/i386/sse.md (<sse>_comi, <sse>_ucomi): Clear
15934         prefix_rep attribute, set prefix_data16 attribute iff MODE_DF.
15935         (sse_cvttps2pi): Clear prefix_rep attribute.
15936         (sse2_cvttps2dq, *sse2_cvtpd2dq, sse2_cvtps2pd): Clear prefix_data16
15937         attribute.
15938         (*sse2_cvttpd2dq): Don't clear prefix_rep attribute.
15939         (*avx_ashr<mode>3, ashr<mode>3, *avx_lshr<mode>3, lshr<mode>3,
15940         *avx_ashl<mode>3, ashl<mode>3): Set length_immediate attribute to 1
15941         iff operand 2 is const_int_operand.
15942         (*vec_dupv4si, avx_shufpd256_1, *avx_shufpd_<mode>,
15943         sse2_shufpd_<mode>): Set length_immediate attribute to 1.
15944         (sse2_pshufd_1): Likewise.  Set prefix attribute to maybe_vex
15945         instead of vex.
15946         (sse2_pshuflw_1, sse2_pshufhw_1): Set length_immediate to 1 and clear
15947         prefix_data16.
15948         (sse2_unpckhpd, sse2_unpcklpd, sse2_storehpd, *vec_concatv2df): Set
15949         prefix_data16 attribute for movlpd and movhpd instructions.
15950         (sse2_loadhpd, sse2_loadlpd, sse2_movsd): Likewise.  Override
15951         length_immediate for shufpd instruction.
15952         (sse2_movntsi, sse3_lddqu): Clear prefix_data16 attribute.
15953         (avx_cmpp<avxmodesuffixf2c><mode>3,
15954         avx_cmps<ssemodesuffixf2c><mode>3, *avx_maskcmp<mode>3,
15955         <sse>_maskcmp<mode>3, <sse>_vmmaskcmp<mode>3,
15956         avx_shufps256_1, *avx_shufps_<mode>, sse_shufps_<mode>,
15957         *vec_dupv4sf_avx, *vec_dupv4sf): Set length_immediate attribute to 1.
15958         (*avx_cvtsi2ssq, *avx_cvtsi2sdq): Set length_vex attribute to 4.
15959         (sse_cvtsi2ssq, sse2_cvtsi2sdq): Set prefix_rex attribute to 1.
15960         (sse2_cvtpi2pd, sse_loadlps, sse2_storelpd): Override
15961         prefix_data16 attribute for the first alternative to 1.
15962         (*avx_loadlps): Override length_immediate for the first alternative.
15963         (*vec_concatv2sf_avx): Override length_immediate and prefix_extra
15964         attributes for second alternative.
15965         (*vec_concatv2sf_sse4_1): Override length_immediate and
15966         prefix_data16 attributes for second alternative.
15967         (*vec_setv4sf_avx, *avx_insertps, vec_extract_lo_<mode>,
15968         vec_extract_hi_<mode>, vec_extract_lo_v16hi,
15969         vec_extract_hi_v16hi, vec_extract_lo_v32qi,
15970         vec_extract_hi_v32qi): Set prefix_extra and length_immediate to 1.
15971         (*vec_setv4sf_sse4_1, sse4_1_insertps, *sse4_1_extractps): Set
15972         prefix_data16 and length_immediate to 1.
15973         (*avx_mulv2siv2di3, *avx_mulv4si3, sse4_2_gtv2di3): Set prefix_extra
15974         to 1.
15975         (*avx_<code><mode>3, *avx_eq<mode>3, *avx_gt<mode>3): Set
15976         prefix_extra attribute for variants that don't have 0f prefix alone.
15977         (*avx_pinsr<ssevecsize>): Likewise.  Set length_immediate to 1.
15978         (*sse4_1_pinsrb, *sse2_pinsrw, *sse4_1_pinsrd, *sse4_1_pextrb,
15979         *sse4_1_pextrb_memory, *sse2_pextrw, *sse4_1_pextrw_memory,
15980         *sse4_1_pextrd): Set length_immediate to 1.
15981         (*sse4_1_pinsrd): Likewise.  Set prefix_extra to 1.
15982         (*sse4_1_pinsrq, *sse4_1_pextrq): Set prefix_rex and length_immediate
15983         to 1.
15984         (*vec_extractv2di_1_rex64_avx, *vec_extractv2di_1_rex64,
15985         *vec_extractv2di_1_avx, *vec_extractv2di_1_sse2): Override
15986         length_immediate to 1 for second alternative.
15987         (*vec_concatv2si_avx, *vec_concatv2di_rex64_avx): Override
15988         prefix_extra and length_immediate attributes for the first
15989         alternative.
15990         (vec_concatv2si_sse4_1): Override length_immediate to 1 for the
15991         first alternative.
15992         (*vec_concatv2di_rex64_sse4_1): Likewise.  Override prefix_rex
15993         to 1 for the first and third alternative.
15994         (*vec_concatv2di_rex64_sse): Override prefix_rex to 1 for the second
15995         alternative.
15996         (*sse2_maskmovdqu, *sse2_maskmovdqu_rex64): Override length_vex
15997         attribute.
15998         (*sse_sfence, sse2_mfence, sse2_lfence): Override length_address
15999         attribute to 0.
16000         (*avx_phaddwv8hi3, *avx_phadddv4si3, *avx_phaddswv8hi3,
16001         *avx_phsubwv8hi3, *avx_phsubdv4si3, *avx_phsubswv8hi,
16002         *avx_pmaddubsw128, *avx_pmulhrswv8hi3, *avx_pshufbv16qi3,
16003         *avx_psign<mode>3): Set prefix_extra attribute to 1.
16004         (ssse3_phaddwv4hi3, ssse3_phadddv2si3, ssse3_phaddswv4hi3,
16005         ssse3_phsubwv4hi3, ssse3_phsubdv2si3, ssse3_phsubswv4hi3,
16006         ssse3_pmaddubsw, *ssse3_pmulhrswv4hi, ssse3_pshufbv8qi3,
16007         ssse3_psign<mode>3): Override prefix_rex attribute.
16008         (*avx_palignrti): Override prefix_extra and length_immediate to 1.
16009         (ssse3_palignrti): Override length_immediate to 1.
16010         (ssse3_palignrdi): Override length_immediate to 1, override
16011         prefix_rex attribute.
16012         (abs<mode>2): Override prefix_rep to 0, override prefix_rex attribute.
16013         (sse4a_extrqi): Override length_immediate to 2.
16014         (sse4a_insertqi): Likewise.  Override prefix_data16 to 0.
16015         (sse4a_insertq): Override prefix_data16 to 0.
16016         (avx_blendp<avxmodesuffixf2c><avxmodesuffix>,
16017         avx_blendvp<avxmodesuffixf2c><avxmodesuffix>,
16018         avx_dpp<avxmodesuffixf2c><avxmodesuffix>, *avx_mpsadbw,
16019         *avx_pblendvb, *avx_pblendw, avx_roundp<avxmodesuffixf2c>256,
16020         avx_rounds<avxmodesuffixf2c>256): Override prefix_extra
16021         and length_immediate to 1.
16022         (sse4_1_blendp<ssemodesuffixf2c>, sse4_1_dpp<ssemodesuffixf2c>,
16023         sse4_2_pcmpestr, sse4_2_pcmpestri, sse4_2_pcmpestrm,
16024         sse4_2_pcmpestr_cconly, sse4_2_pcmpistr, sse4_2_pcmpistri,
16025         sse4_2_pcmpistrm, sse4_2_pcmpistr_cconly): Override prefix_data16
16026         and length_immediate to 1.
16027         (sse4_1_blendvp<ssemodesuffixf2c>): Override prefix_data16 to 1.
16028         (sse4_1_mpsadbw, sse4_1_pblendw): Override length_immediate to 1.
16029         (*avx_packusdw, avx_vtestp<avxmodesuffixf2c><avxmodesuffix>,
16030         avx_ptest256): Override prefix_extra to 1.
16031         (sse4_1_roundp<ssemodesuffixf2c>, sse4_1_rounds<ssemodesuffixf2c>):
16032         Override prefix_data16 and length_immediate to 1.
16033         (sse5_pperm_zero_v16qi_v8hi, sse5_pperm_sign_v16qi_v8hi,
16034         sse5_pperm_zero_v8hi_v4si, sse5_pperm_sign_v8hi_v4si,
16035         sse5_pperm_zero_v4si_v2di, sse5_pperm_sign_v4si_v2di,
16036         sse5_vrotl<mode>3, sse5_ashl<mode>3, sse5_lshl<mode>3): Override
16037         prefix_data16 to 0 and prefix_extra to 2.
16038         (sse5_rotl<mode>3, sse5_rotr<mode>3): Override length_immediate to 1.
16039         (sse5_frcz<mode>2, sse5_vmfrcz<mode>2): Don't override prefix_extra
16040         attribute.
16041         (*sse5_vmmaskcmp<mode>3, sse5_com_tf<mode>3,
16042         sse5_maskcmp<mode>3, sse5_maskcmp<mode>3, sse5_maskcmp_uns<mode>3):
16043         Override prefix_data16 and prefix_rep to 0, length_immediate to 1
16044         and prefix_extra to 2.
16045         (sse5_maskcmp_uns2<mode>3, sse5_pcom_tf<mode>3): Override
16046         prefix_data16 to 0, length_immediate to 1 and prefix_extra to 2.
16047         (*avx_aesenc, *avx_aesenclast, *avx_aesdec, *avx_aesdeclast,
16048         avx_vpermilvar<mode>3,
16049         avx_vbroadcasts<avxmodesuffixf2c><avxmodesuffix>,
16050         avx_vbroadcastss256, avx_vbroadcastf128_p<avxmodesuffixf2c>256,
16051         avx_maskloadp<avxmodesuffixf2c><avxmodesuffix>,
16052         avx_maskstorep<avxmodesuffixf2c><avxmodesuffix>):
16053         Override prefix_extra to 1.
16054         (aeskeygenassist, pclmulqdq): Override length_immediate to 1.
16055         (*vpclmulqdq, avx_vpermil<mode>, avx_vperm2f128<mode>3,
16056         vec_set_lo_<mode>, vec_set_hi_<mode>, vec_set_lo_v16hi,
16057         vec_set_hi_v16hi, vec_set_lo_v32qi, vec_set_hi_v32qi): Override
16058         prefix_extra and length_immediate to 1.
16059         (*avx_vzeroall, avx_vzeroupper, avx_vzeroupper_rex64): Override
16060         modrm to 0.
16061         (*vec_concat<mode>_avx): Override prefix_extra and length_immediate
16062         to 1 for the first alternative.
16063         * config/i386/mmx.md (*mov<mode>_internal_rex64): Override
16064         prefix_rep, prefix_data16 and/or prefix_rex attributes in certain
16065         cases.
16066         (*mov<mode>_internal_avx, *movv2sf_internal_rex64,
16067         *movv2sf_internal_avx, *movv2sf_internal): Override
16068         prefix_rep attribute for certain alternatives.
16069         (*mov<mode>_internal): Override prefix_rep or prefix_data16
16070         attributes for certain alternatives.
16071         (*movv2sf_internal_rex64_avx): Override prefix_rep and length_vex
16072         attributes for certain alternatives.
16073         (*mmx_addv2sf3, *mmx_subv2sf3, *mmx_mulv2sf3,
16074         *mmx_<code>v2sf3_finite, *mmx_<code>v2sf3, mmx_rcpv2sf2,
16075         mmx_rcpit1v2sf3, mmx_rcpit2v2sf3, mmx_rsqrtv2sf2, mmx_rsqit1v2sf3,
16076         mmx_haddv2sf3, mmx_hsubv2sf3, mmx_addsubv2sf3,
16077         *mmx_eqv2sf3, mmx_gtv2sf3, mmx_gev2sf3, mmx_pf2id, mmx_pf2iw,
16078         mmx_pi2fw, mmx_floatv2si2, mmx_pswapdv2sf2, *mmx_pmulhrwv4hi3,
16079         mmx_pswapdv2si2): Set prefix_extra attribute to 1.
16080         (mmx_ashr<mode>3, mmx_lshr<mode>3, mmx_ashl<mode>3): Set
16081         length_immediate to 1 if operand 2 is const_int_operand.
16082         (*mmx_pinsrw, mmx_pextrw, mmx_pshufw_1, *vec_dupv4hi,
16083         *vec_extractv2si_1): Set length_immediate attribute to 1.
16084         (*mmx_uavgv8qi3): Override prefix_extra attribute to 1 if
16085         using old 3DNOW insn rather than SSE/3DNOW_A.
16086         (mmx_emms, mmx_femms): Clear modrm attribute.
16088 2009-05-29  Martin Jambor  <mjambor@suse.cz>
16090         * tree-sra.c:  New implementation of SRA.
16092         * params.def (PARAM_SRA_MAX_STRUCTURE_SIZE): Removed.
16093         (PARAM_SRA_MAX_STRUCTURE_COUNT): Removed.
16094         (PARAM_SRA_FIELD_STRUCTURE_RATIO): Removed.
16095         * params.h (SRA_MAX_STRUCTURE_SIZE): Removed.
16096         (SRA_MAX_STRUCTURE_COUNT): Removed.
16097         (SRA_FIELD_STRUCTURE_RATIO): Removed.
16098         * doc/invoke.texi (sra-max-structure-size): Removed.
16099         (sra-field-structure-ratio): Removed.
16101 2009-05-29  Jakub Jelinek  <jakub@redhat.com>
16103         PR middle-end/40291
16104         * builtins.c (expand_builtin_memcmp): Convert len to sizetype
16105         before expansion.
16107 2009-05-29  Andrey Belevantsev  <abel@ispras.ru>
16109         PR rtl-optimization/40101
16110         * sel-sched-ir.c (get_seqno_by_preds): Allow returning negative
16111         seqno.  Adjust comment.
16112         * sel-sched.c (find_seqno_for_bookkeeping): Assert that when
16113         inserting bookkeeping before a jump, the jump is not scheduled.
16114         When no positive seqno found, provide a value.  Add comment.
16116 2009-05-29  Richard Guenther  <rguenther@suse.de>
16118         * tree-ssa-alias.c (nonaliasing_component_refs_p): Remove
16119         short-cutting on the first component.
16121 2009-05-29  Jakub Jelinek  <jakub@redhat.com>
16123         PR middle-end/39958
16124         * omp-low.c (scan_omp_1_op): Call remap_type on TREE_TYPE
16125         for trees other than decls/types.
16127 2009-05-29  Richard Guenther  <rguenther@suse.de>
16129         * tree-ssa-operands.c (get_expr_operands): Do not handle
16130         INDIRECT_REFs in the handled-component case.  Remove
16131         unused get_ref_base_and_extent case.
16132         * tree-dfa.c (get_ref_base_and_extent): Avoid calling
16133         tree_low_cst and host_integerp where possible.
16134         * tree-ssa-structalias.c (equiv_class_label_eq): Check hash
16135         codes for equivalence.
16136         * dce.c (find_call_stack_args): Avoid redundant bitmap queries.
16138 2009-05-29  David Billinghurst <billingd@gcc.gnu.org>
16140         * config.gcc: Add i386/t-fprules-softfp and soft-fp/t-softfp
16141         to tmake_file for i[34567]86-*-cygwin*.
16143 2009-05-29  Jakub Jelinek  <jakub@redhat.com>
16145         PR target/40017
16146         * config/rs6000/rs6000-c.c (_Bool_keyword): New variable.
16147         (altivec_categorize_keyword, init_vector_keywords,
16148         rs6000_cpu_cpp_builtins): Define _Bool as conditional macro
16149         similar to bool.
16151 2009-05-29  Kai Tietz  <kai.tietz@onevision.com>
16153         * tree.c (handle_dll_attribute): Check if node is
16154         of kind FUNCTION_DECL for DECL_DECLARED_INLINE_P check.
16156 2009-05-29  Richard Earnshaw  <rearnsha@arm.com>
16158         * config/arm/thumb2.md (thumb2_zero_extendsidi2): Add a split
16159         component.
16160         (thumb2_zero_extendqidi2): Likewise.
16162 2009-05-28  Kaz Kojima  <kkojima@gcc.gnu.org>
16164         * config/sh/sh.c (sh_expand_t_scc): Use gen_xorsi3_movrt
16165         instead of gen_movrt.
16166         * config/sh/sh.md (movrt): Remove.
16168 2009-05-28  Steve Ellcey  <sje@cup.hp.com>
16170         * doc/invoke.texi (IA-64 Options):
16171         Add -msdata, -mfused-madd, -mno-inline-float-divide,
16172         -mno-inline-int-divide, -mno-inline-sqrt, -msched-spec-ldc,
16173         -msched-spec-control-ldc, -msched-prefer-non-data-spec-insns,
16174         -msched-prefer-non-control-spec-insns,
16175         -msched-stop-bits-after-every-cycle,
16176         -msched-count-spec-in-critical-path,
16177         -msel-sched-dont-check-control-spec, -msched-fp-mem-deps-zero-cost
16178         -msched-max-memory-insns-hard-limit, -msched-max-memory-insns.
16179         Remove -mt, -pthread, -msched-ldc, -mno-sched-control-ldc,
16180         and -msched-spec-verbose.
16182 2009-05-28  Joseph Myers  <joseph@codesourcery.com>
16184         * config/arm/lib1funcs.asm (__clear_cache): Define if L_clear_cache.
16185         * config/arm/linux-eabi.h (CLEAR_INSN_CACHE): Define to give an
16186         error if used.
16187         * config/arm/t-linux-eabi (LIB1ASMFUNCS): Add _clear_cache.
16189 2009-05-28  Richard Guenther  <rguenther@suse.de>
16191         * tree-ssa-alias.c (ao_ref_init): New function.
16192         (ao_ref_base): Likewise.
16193         (ao_ref_base_alias_set): Likewise.
16194         (ao_ref_alias_set): Likewise.
16195         (refs_may_alias_p_1): Change signature.
16196         (refs_may_alias_p): Adjust.
16197         (refs_anti_dependent_p): Likewise.
16198         (refs_output_dependent_p): Likewise.
16199         (call_may_clobber_ref_p_1): Change signature.
16200         (call_may_clobber_ref_p): Adjust.
16201         (stmt_may_clobber_ref_p_1): New function split out from ...
16202         (stmt_may_clobber_ref_p): ... here.
16203         (maybe_skip_until): Adjust signature.
16204         (get_continuation_for_phi): Likewise.
16205         (walk_non_aliased_vuses): Likewise.
16206         * tree-ssa-alias.h (struct ao_ref_s): New structure type.
16207         (ao_ref_init): Declare.
16208         (ao_ref_base): Likewise.
16209         (ao_ref_alias_set): Likewise.
16210         (stmt_may_clobber_ref_p_1): Likewise.
16211         (walk_non_aliased_vuses): Adjust.
16212         * tree-ssa-sccvn.c (ao_ref_init_from_vn_reference): New function.
16213         (get_ref_from_reference_ops): remove.
16214         (vn_reference_lookup_2): Adjust signature.
16215         (vn_reference_lookup_3): Do not re-build trees.  Handle unions.
16216         (vn_reference_lookup_pieces): Adjust signature, do not re-build trees.
16217         (vn_reference_lookup): Adjust.
16218         (vn_reference_insert): Likewise.
16219         (vn_reference_insert_pieces): Adjust signature.
16220         (visit_reference_op_call): Adjust.
16221         * tree-ssa-pre.c (get_expr_type): Simplify.
16222         (phi_translate_1): Adjust.
16223         (compute_avail): Likewise.
16224         (translate_vuse_through_block): Do not re-build trees.
16225         (value_dies_in_block_x): Likewise.
16226         * tree-ssa-sccvn.h (struct vn_reference_s): Add type and alias-set
16227         fields.
16228         (vn_reference_lookup_pieces): Adjust declaration.
16229         (vn_reference_insert_pieces): Likewise.
16231 2009-05-28  Benjamin Kosnik  <bkoz@redhat.com>
16233         * tree-ssa-copy.c (replace_exp_1): Move op for warning-free use
16234         with checking disabled.
16236 2009-05-28  Dave Korn  <dave.korn.cygwin@gmail.com>
16238         PR target/37216
16240         * configure.ac (HAVE_GAS_ALIGNED_COMM):  Add autoconf test and
16241         macro definition for support of three-operand format aligned
16242         .comm directive in assembler on cygwin/pe/mingw target OS.
16243         * configure:  Regenerate.
16244         * config.h:  Regenerate.
16246         * config/i386/winnt.c (i386_pe_asm_output_aligned_decl_common):  Use
16247         aligned form of .comm directive if -mpe-aligned-commons is in effect.
16248         * config/i386/cygming.opt (-mpe-aligned-commons):  Add new option.
16250         * doc/invoke.texi (-mpe-aligned-commons):  Document new target option.
16251         * doc/tm.texi (ASM_OUTPUT_COMMON):  Document zero size commons.
16253 2009-05-28  Ira Rosen  <irar@il.ibm.com>
16255         PR tree-optimization/40254
16256         * tree-data-ref.c (dr_analyze_innermost): Take POFFSET into account
16257         in analysis of basic blocks.
16259 2009-05-28  Adam Nemet  <anemet@caviumnetworks.com>
16261         PR middle-end/33699
16262         * target.h (struct gcc_target): Fix indentation.  Add const_anchor.
16263         * target-def.h (TARGET_CONST_ANCHOR): New macro.
16264         (TARGET_INITIALIZER): Use it.
16265         * cse.c (CHEAPER): Move it up to the other macros.
16266         (insert): Rename this ...
16267         (insert_with_costs): ... to this.  Add cost parameters.  Update
16268         function comment.
16269         (insert): New function.  Call insert_with_costs.
16270         (compute_const_anchors, insert_const_anchor, insert_const_anchors,
16271         find_reg_offset_for_const, try_const_anchors): New functions.
16272         (cse_insn): Call try_const_anchors.  Adjust cost of src_related
16273         when using a const-anchor.  Call insert_const_anchors.
16274         * config/mips/mips.c (mips_set_mips16_mode): Set targetm.const_anchor.
16275         * doc/tm.texi (Misc): Document TARGET_CONST_ANCHOR.
16277 2009-05-28  Alexandre Oliva  <aoliva@redhat.com>
16279         * tree-inline.c (remap_decls): Enable nonlocalized variables
16280         when not optimizing.
16282 2009-05-28  Alexandre Oliva  <aoliva@redhat.com>
16284         * tree-ssa-live.c (remove_unused_locals): Skip when not optimizing.
16285         Simplify other tests involving optimize.
16287 2009-05-27  Tom Tromey  <tromey@redhat.com>
16289         * unwind-dw2.c (_Unwind_DebugHook): New function.
16290         (uw_install_context): Call _Unwind_DebugHook.
16292 2009-05-27  Tom Tromey  <tromey@redhat.com>
16294         * system.h (CONST_CAST2): Use C++ const_cast when compiled as C++
16296 2009-05-27  Ian Lance Taylor  <iant@google.com>
16298         * Makefile.in (LINKER, LINKER_FLAGS): Define.
16299         (LINKER_FOR_BUILD, BUILD_LINKERFLAGS): Define.
16300         (ALL_LINKERFLAGS): Define.
16301         (xgcc$(exeext)): Change $(COMPILER) to $(LINKER).
16302         (cpp$(exeext), cc1-dummy$(exeext), cc1$(exeext)): Likewise.
16303         (collect2$(exeext), mips-tfile, mips-tdump): Likewise.
16304         (gcov$(exeext), gcov-dump$(exeext)): Likewise.
16305         (build/gen%$(build_exeext)): Change $(COMPILER_FOR_BUILD) to
16306         $(LINKER_FOR_BUILD).
16307         (build/gcov-iov$(build_exeext)): Likewise.
16309 2009-05-27  Julian Brown  <julian@codesourcery.com>
16311         * gcse.c (target.h): Include.
16312         (can_assign_to_reg_without_clobbers_p): Check that the target allows
16313         copy of argument to a pseudo register.
16315 2009-05-27  Diego Novillo  <dnovillo@google.com>
16317         * tree-ssa-live.c (dump_scope_block): Document arguments.
16318         (dump_scope_blocks): Document.
16319         (debug_scope_blocks): New.
16320         * tree-flow.h (debug_scope_blocks): Declare.
16322 2009-05-21  Denis Chertykov  <denisc@overta.ru>
16324         * doc/contrib.texi (Contributors): Add myself to the list.
16326 2009-05-27  Olivier Hainque  <hainque@adacore.com>
16328         * expr.c (target_align): New function.  Alignment the TARGET of an
16329         assignment may be assume to have.
16330         (highest_pow2_factor_for_target): Use it instead of relying on
16331         immediate tree attributes of TARGET, not necessarily honored when
16332         intermediate bitfields are involved.
16334 2009-05-27  H.J. Lu  <hongjiu.lu@intel.com>
16336         PR target/40266
16337         * config/i386/driver-i386.c (host_detect_local_cpu): Support
16338         AVX, SSE4, AES, PCLMUL and POPCNT.
16340 2009-05-27  Diego Novillo  <dnovillo@google.com>
16342         * tree-pretty-print.c (dump_location): New.
16343         (dump_generic_node): Call it.
16344         Factor code to handle BLOCK nodes ...
16345         (dump_block_node): ... here.
16347 2009-05-27  Rafael Avila de Espindola  <espindola@google.com>
16349         * Makefile.in (GCC_PLUGIN_H): New. Replace all uses of gcc-plugin.h
16350         with it.
16351         * doc/plugins.texi: Document that gcc-plugin.h must be the first to be
16352         included.
16353         * gcc-plugin.h: Include config.h and system.h.
16354         (IN_GCC): Define if not defined.
16356 2009-05-27  Hans-Peter Nilsson  <hp@axis.com>
16358         PR middle-end/40249
16359         * Makefile.in (CRTSTUFF_CFLAGS): Replace -fno-inline-functions
16360         with -fno-inline.
16362 2009-05-27  Shujing Zhao  <pearly.zhao@oracle.com>
16364         * config/m32r/m32r.c: Use REG_P, MEM_P and CONST_INT_P where
16365         applicable.
16366         * config/m32r/m32r.h: Ditto.
16367         * config/m32r/m32r.md: Ditto.
16368         * config/m32r/predicates.md: Ditto.
16370 2009-05-27  Alexandre Oliva  <aoliva@redhat.com>
16372         * cgraph.c (dump_cgraph_node): Honor -fdump-noaddr.
16374 2009-05-26  Basile Starynkevitch  <basile@starynkevitch.net>
16376         * doc/plugins.texi
16377         (Loading plugins): typo.
16378         (Plugin callbacks): Documented PLUGIN_INFO, PLUGIN_GGC_START,
16379         PLUGIN_GGC_MARKING, PLUGIN_GGC_END, PLUGIN_REGISTER_GGC_ROOTS.
16380         (Interacting with the GCC Garbage Collector): Added new section.
16381         (Giving information about a plugin): Added new section for
16382         PLUGIN_INFO.
16383         * ggc.h (ggc_register_root_tab): Added declaration.
16384         * gcc-plugin.h (PLUGIN_GGC_START, PLUGIN_GGC_MARKING)
16385         (PLUGIN_GGC_END, PLUGIN_REGISTER_GGC_ROOTS): Added new events.
16386         (register_callback): Improved comment in declaration.
16387         * ggc-common.c (const_ggc_root_tab_t) Added new typedef for vectors.
16388         (extra_root_vec) Added static variable for dynamic roots registration.
16389         (ggc_register_root_tab) Added new routine.
16390         (ggc_mark_roots) Added iteration inside extra_root_vec, and invoke
16391         PLUGIN_GGC_MARKING event.
16392         * ggc-zone.c: Include plugin.h.
16393         (ggc_collect): Invoke PLUGIN_GGC_START & PLUGIN_GGC_END events.
16394         * ggc-page.c: Include plugin.h.
16395         (ggc_collect): Invoke PLUGIN_GGC_START & PLUGIN_GGC_END events.
16396         * plugin.c (plugin_event_name): added names of PLUGIN_GGC_START,
16397         PLUGIN_GGC_MARKING, PLUGIN_GGC_END, PLUGIN_REGISTER_GGC_ROOTS
16398         (register_callback): check lack of callbacks for
16399         pseudo-events. Added handling of PLUGIN_REGISTER_GGC_ROOTS,
16400         PLUGIN_GGC_START, PLUGIN_GGC_MARKING, PLUGIN_GGC_END.
16401         (invoke_plugin_callbacks): Handle PLUGIN_GGC_START,
16402         PLUGIN_GGC_MARKING, PLUGIN_GGC_END, PLUGIN_REGISTER_GGC_ROOTS.
16403         * Makefile.in (ggc-common.o, ggc-zone.o, ggc-page.o): Added
16404         dependency on plugin.h.
16405         (plugin.o): Added dependency on ggc.h...
16407 2009-05-26  Richard Guenther  <rguenther@suse.de>
16409         PR middle-end/40248
16410         Revert
16411         * expr.c (expand_expr_real_1): Avoid calling do_store_flag
16412         with mismatched comparison modes.
16414         * expr.c (expand_expr_real_1): Expand the operand of a
16415         VIEW_CONVERT_EXPR in its natural mode.
16417 2009-05-26  Ian Lance Taylor  <iant@google.com>
16419         * Makefile.in (COMPILER, COMPILER_FLAGS): Define.
16420         (COMPILER_FOR_BUILD, BUILD_COMPILERFLAGS): Define.
16421         (ALL_COMPILERFLAGS): Define.
16422         (.c.o, xgcc$(exeext), cpp$(exeext)): Use $(COMPILER).
16423         (cc1-dummy$(exeext), cc1$(exeext)): Likewise.
16424         (collect2$(exeext), collect2.o): Likewise.
16425         (c-opts.o, c-cppbuiltin.o, c-pch.o, gcc.o, gccspec.o): Likewise.
16426         (gcc-options.o, version.o, prefix.o, toplev.o): Likewise.
16427         ($(out_object_file), mips-tfile, mips-tdump): Likewise.
16428         (libbackend.o, intl.o, cppdefault.o): Likewise.
16429         (gcov$(exeext), gcov-dump$(exeext)): Likewise.
16430         (build/%.o): Use $(COMPILER_FOR_BUILD).
16431         (build/gen%$(build_exeext)): Likewise.
16432         (build/gcov-iov$(build_exeext)): LIkewise.
16433         * config/t-darwin (darwin.o): Use $(COMPILER).
16434         (darwin-c.o, darwin-f.o, darwin-driver.o): Likewise.
16435         * config/t-sol2 (sol2-c.o): Likewise.
16436         (sol2.o): Likewise.
16437         * config/t-vxworks (vxworks.o): Likewise.
16438         * config/x-darwin (host-darwin.o): Likewise.
16439         * config/x-hpux (host-hpux.o): Likewise.
16440         * config/x-linux (host-linux.o): Likewise.
16441         * config/x-solaris (host-solaris.o): Likewise.
16442         * config/alpha/x-alpha (driver-alpha.o): Likewise.
16443         * config/arm/t-arm (arm-c.o): Likewise.
16444         * config/arm/t-pe (pe.o): Likewise.
16445         * config/arm/t-wince-pe (pe.o): Likewise.
16446         * config/i386/t-cygming (winnt.o): Likewise.
16447         (winnt-cxx.o, winnt-stubs.o, msformat-c.o): Likewise.
16448         * config/i386/t-cygwin (cygwin1.o): Likewise.
16449         (cygwin2.o): Likewise.
16450         * config/i386/t-i386 (i386-c.o): Likewise.
16451         * config/i386/t-interix (winnt.o): Likewise.
16452         * config/i386/t-netware (netware.o): Likewise.
16453         * config/i386/t-nwld (nwld.o): Likewise.
16454         * config/i386/x-darwin (host-i386-darwin.o): Likewise.
16455         * config/i386/x-i386 (driver-i386.o): Likewise.
16456         * config/i386/x-cygwin (host-cygwin.o): Likewise.
16457         * config/i386/x-mingw32 (host-mingw32.o): Likewise.
16458         * config/ia64/t-ia64 (ia64-c.o): Likewise.
16459         * config/m32c/t-m32c (m32c-pragma.o): Likewise.
16460         * config/mips/x-native (driver-native.o): Likewise.
16461         * config/rs6000/t-rs6000 (rs6000-c.o): Likewise.
16462         * config/rs6000/x-darwin (host-ppc-darwin.o): Likewise.
16463         * config/rs6000/x-darwin64 (host-ppc64-darwin.o): Likewise.
16464         * config/rs6000/x-rs6000 (driver-rs6000.o): Likewise.
16465         * config/score/t-score-elf (score7.o): Likewise.
16466         (score3.o): Likewise.
16467         * config/sh/t-sh (sh-c.o): Likewise.
16468         * config/sh/t-symbian (sh-c.o): Likewise.
16469         (symbian.o): Likewise.
16470         * config/spu/t-spu-elf (spu-c.o): Likewise.
16471         * config/v850/t-v850 (v850-c.o): Likewise.
16472         * config/v850/t-v850e (v850-c.o): Likewise.
16474 2009-05-26  Richard Guenther  <rguenther@suse.de>
16476         PR tree-optimization/40122
16477         * tree-ssa-ccp.c (ccp_fold): Fold vector CONSTRUCTORs to
16478         VECTOR_CSTs if possible.
16479         (fold_gimple_assign): Likewise.
16481 2009-05-26  Richard Guenther  <rguenther@suse.de>
16483         PR middle-end/40252
16484         * fold-const.c (fold_binary): Use the correct types for building
16485         rotates.
16487 2009-05-26  Richard Guenther  <rguenther@suse.de>
16489         * tree-vect-data-refs.c (vect_create_data_ref_ptr): Remove
16490         redundant calls to merge_alias_info.
16491         (bump_vector_ptr): Likewise.
16492         * tree-ssa-copy.c (merge_alias_info): Remove.
16493         (replace_exp_1): Remove call to merge_alias_info.
16494         (propagate_tree_value): Likewise.
16495         (fini_copy_prop): Propagate points-to info.
16496         * tree-flow.h (merge_alias_info): Remove.
16498 2009-05-07  Hariharan Sandanagobalane <hariharan@picochip.com>
16500         * config/picochip/picochip.C (PARAM_INLINE_CALL_COST): Remove.
16502 2009-05-25  Jan Hubicka  <jh@suse.cz>
16504         * cgraph.c (dump_cgraph_node): Dump size/time/benefit.
16505         * cgraph.h (struct inline_summary): New filed self_wize,
16506         size_inlining_benefit, self_time and time_inlining_benefit.
16507         (struct cgraph_global_info): Replace insns by time ans size fields.
16508         * ipa-cp (ipcp_cloning_candidate_p): Base estimate on size
16509         (ipcp_estimate_growth, ipcp_insert_stage): Likewise.
16510         (ipcp_update_callgraph): Do not touch function bodies.
16511         * ipa-inline.c: Include except.h
16512         (MAX_TIME): New constant.
16513         (overall_insns): Remove.
16514         (leaf_node_p): New.
16515         (overall_size, max_benefit): New static variables.
16516         (cgraph_estimate_time_after_inlining): New function.
16517         (cgraph_estimate_size_after_inlining): Rewrite using benefits.
16518         (cgraph_clone_inlined_nodes): Update size.
16519         (cgraph_mark_inline_edge): Update size.
16520         (cgraph_estimate_growth): Use size info.
16521         (cgraph_check_inline_limits): Check size.
16522         (cgraph_default_inline_p): Likewise.
16523         (cgraph_edge_badness): Compute badness based on benefit and size cost.
16524         (cgraph_decide_recursive_inlining): Check size.
16525         (cgraph_decide_inlining_of_small_function): Update size; dump sizes
16526         and times.
16527         (cgraph_decide_inlining): Likewise.
16528         (cgraph_decide_inlining_incrementally): Likewise; honor
16529         PARAM_EARLY_INLINING_INSNS.
16530         (likely_eliminated_by_inlining_p): New predicate.
16531         (estimate_function_body_sizes): New function.
16532         (compute_inline_parameters): Use it.
16533         * except.c (must_not_throw_labels): New function.
16534         * except.h (must_not_throw_labels): Declare.
16535         * tree-inline.c (init_inline_once): Kill inlining_weigths
16536         * tree-ssa-structalias.c: Avoid uninitialized warning.
16537         * params.def (PARAM_MAX_INLINE_INSNS_SINGLE): Reduce to 300.
16538         (PARAM_MAX_INLINE_INSNS_AUTO): Reduce to 60.
16539         (PARAM_INLINE_CALL_COST): Remove.
16540         (PARAM_EARLY_INLINING_INSNS): New.
16542 2009-05-25  Richard Guenther  <rguenther@suse.de>
16544         PR tree-optimization/36327
16545         * tree-ssa-alias.c (walk_non_aliased_vuses): Add second walker
16546         callback for reference translation or lookup at the point of may-defs.
16547         * tree-ssa-alias.h (walk_non_aliased_vuses): Adjust prototype.
16548         * tree-ssa-sccvn.c (get_ref_from_reference_ops): Bail out
16549         for union COMPONENT_REFs.
16550         (vn_reference_lookup_3): New callback.  Lookup from memset
16551         and CONSTRUCTOR assignment, translate through struct copies.
16552         (vn_reference_lookup_pieces): Make sure to not free the
16553         passed operands array.  Adjust walk_non_aliased_vuses call.
16554         (vn_reference_lookup): Adjust walk_non_aliased_vuses call,
16555         make sure we do not leak memory.
16557 2009-05-25  Richard Guenther  <rguenther@suse.de>
16559         * tree-ssa-alias.h (dump_points_to_solution): Declare.
16560         * tree-inline.c (expand_call_inline): Reset the escaped and
16561         callused solutions.
16562         * tree-ssa-structalias.c (pass_build_ealias): New.
16563         * tree-pass.h (pass_build_ealias): Declare.
16564         * passes.c (init_optimization_passes): Add PTA during
16565         early optimizations.
16566         * tree-ssa-alias.c (dump_alias_info): Dump the ESCAPED
16567         and CALLUSED solutions.
16568         (dump_points_to_solution): New function, split out from ...
16569         (dump_points_to_info_for): ... here.
16570         * tree-parloops.c (parallelize_loops): Reset the escaped and
16571         callused solutions.
16573 2009-05-25  Rainer Orth  <ro@TechFak.Uni-Bielefeld.DE>
16575         PR bootstrap/40027
16576         * config/i386/i386.c (USE_HIDDEN_LINKONCE): Only define if missing.
16577         * config/i386/sol2.h [!TARGET_GNU_LD] (USE_HIDDEN_LINKONCE): Define.
16579 2009-05-25  Ira Rosen  <irar@il.ibm.com>
16581         PR tree-optimization/40238
16582         * tree-vect-stmts.c (vect_init_vector): Insert initialization
16583         statements after basic block's labels.
16584         * tree-vect-slp.c (vect_slp_transform_bb): Call destroy_bb_vec_info()
16585         to free the allocated memory.
16587 2009-05-24  Kaz Kojima  <kkojima@gcc.gnu.org>
16589         * gcc/config/sh/sh.c (sh_set_return_address): Mark store of
16590         return address with a USE.
16592 2009-05-24  Richard Guenther  <rguenther@suse.de>
16594         PR middle-end/40233
16595         * tree.c (make_vector_type): Build the TYPE_DEBUG_REPRESENTATION_TYPEs
16596         array type from the main variant of the inner type.
16598 2009-05-24  Jan-Benedict Glaw  <jbglaw@lug-owl.de>
16600         * config/vax/vax-protos.h (legitimate_constant_address_p): Change
16601         definition to bool (from int) to un-break build.
16602         (legitimate_constant_p, vax_mode_dependent_address_p): Likewise.
16604 2009-05-24  Paolo Bonzini  <bonzini@gnu.org>
16606         * tree-ssa-operands.h (push_stmt_changes, pop_stmt_changes,
16607         discard_stmt_changes): Delete.
16608         * tree-ssa-operands.c (scb_stack): Delete.
16609         (init_ssa_operands): Do not initialize it.
16610         (fini_ssa_operands): Do not free it.
16611         (push_stmt_changes, pop_stmt_changes, discard_stmt_changes): Delete.
16613         * tree-cfg.c (replace_uses_by): Replace pop_stmt_changes with
16614         update_stmt, remove the others.  Fix comments.
16615         * tree-dfa.c (optimize_stack_restore): Likewise.
16616         * tree-ssa-forwprop.c (forward_propagate_addr_expr): Likewise.
16617         * tree-ssa-loop-ivopts.c (rewrite_use): Likewise.
16618         * tree-ssa-dce.c (eliminate_unnecessary_stmts): Likewise.
16619         * tree-ssa-ccp.c (optimize_stack_restore, execute_fold_all_builtins):
16620         Likewise.
16621         * tree-ssa-propagate.c (substitute_and_fold): Likewise.
16622         * tree-ssa-dom.c (propagate_rhs_into_lhs): Likewise.
16623         (dom_opt_finalize_block): Likewise, adjusting access to
16624         stmts_to_rescan.
16625         (optimize_stmt): Likewise, adjusting access to stmts_to_rescan.
16626         (stmts_to_rescan): Change item type to gimple.
16627         (tree_ssa_dominator_optimize): Change type of stmts_to_rescan.
16629 2009-05-24  Ira Rosen  <irar@il.ibm.com>
16631         * doc/passes.texi (Tree-SSA passes): Document SLP pass.
16632         * tree-pass.h (pass_slp_vectorize): New pass.
16633         * params.h (SLP_MAX_INSNS_IN_BB): Define.
16634         * timevar.def (TV_TREE_SLP_VECTORIZATION): Define.
16635         * tree-vectorizer.c (timevar.h): Include.
16636         (user_vect_verbosity_level): Declare.
16637         (vect_location): Fix comment.
16638         (vect_set_verbosity_level): Update user_vect_verbosity_level
16639         instead of vect_verbosity_level.
16640         (vect_set_dump_settings): Add an argument. Ignore user defined
16641         verbosity if dump flags require higher level of verbosity. Print to
16642         stderr only for loop vectorization.
16643         (vectorize_loops): Update call to vect_set_dump_settings.
16644         (execute_vect_slp): New function.
16645         (gate_vect_slp): Likewise.
16646         (struct gimple_opt_pass pass_slp_vectorize): New.
16647         * tree-vectorizer.h (struct _bb_vec_info): Define along macros to
16648         access its members.
16649         (vec_info_for_bb): New function.
16650         (struct _stmt_vec_info): Add bb_vinfo and a macro for its access.
16651         (VECTORIZATION_ENABLED): New macro.
16652         (SLP_ENABLED, SLP_DISABLED): Likewise.
16653         (vect_is_simple_use): Add bb_vec_info argument.
16654         (new_stmt_vec_info, vect_analyze_data_ref_dependences,
16655         vect_analyze_data_refs_alignment, vect_verify_datarefs_alignment,
16656         vect_analyze_data_ref_accesses, vect_analyze_data_refs,
16657         vect_schedule_slp, vect_analyze_slp): Likewise.
16658         (vect_analyze_stmt): Add slp_tree argument.
16659         (find_bb_location): Declare.
16660         (vect_slp_analyze_bb, vect_slp_transform_bb): Likewise.
16661         * tree-vect-loop.c (new_loop_vec_info): Adjust function calls.
16662         (vect_analyze_loop_operations, vect_analyze_loop,
16663         get_initial_def_for_induction, vect_create_epilog_for_reduction,
16664         vect_finalize_reduction, vectorizable_reduction,
16665         vectorizable_live_operation, vect_transform_loop): Likewise.
16666         * tree-data-ref.c (dr_analyze_innermost): Update comment,
16667         skip evolution analysis if analyzing a basic block.
16668         (dr_analyze_indices): Likewise.
16669         (initialize_data_dependence_relation): Skip the test whether the
16670         object is invariant for basic blocks.
16671         (compute_all_dependences): Skip dependence analysis for data
16672         references in basic blocks.
16673         (find_data_references_in_stmt): Don't fail in case of invariant
16674         access in basic block.
16675         (find_data_references_in_bb): New function.
16676         (find_data_references_in_loop): Move code to
16677         find_data_references_in_bb and add a call to it.
16678         (compute_data_dependences_for_bb): New function.
16679         * tree-data-ref.h (compute_data_dependences_for_bb): Declare.
16680         * tree-vect-data-refs.c (vect_check_interleaving): Adjust to the case
16681         that STEP is 0.
16682         (vect_analyze_data_ref_dependence): Check for interleaving in case of
16683         unknown dependence in basic block and fail in case of dependence in
16684         basic block.
16685         (vect_analyze_data_ref_dependences): Add bb_vinfo argument, get data
16686         dependence instances from either loop or basic block vectorization
16687         info.
16688         (vect_compute_data_ref_alignment): Check if it is loop vectorization
16689         before calling nested_in_vect_loop_p.
16690         (vect_compute_data_refs_alignment): Add bb_vinfo argument, get data
16691         dependence instances from either loop or basic block vectorization
16692         info.
16693         (vect_verify_datarefs_alignment): Likewise.
16694         (vect_enhance_data_refs_alignment): Adjust function calls.
16695         (vect_analyze_data_refs_alignment): Likewise.
16696         (vect_analyze_group_access): Fix printing. Skip different checks if
16697         DR_STEP is 0. Keep strided stores either in loop or basic block
16698         vectorization data structure. Fix indentation.
16699         (vect_analyze_data_ref_access): Fix comments, allow zero step in
16700         basic blocks.
16701         (vect_analyze_data_ref_accesses): Add bb_vinfo argument, get data
16702         dependence instances from either loop or basic block vectorization
16703         info.
16704         (vect_analyze_data_refs): Update comment. Call
16705         compute_data_dependences_for_bb to analyze basic blocks.
16706         (vect_create_addr_base_for_vector_ref): Check for outer loop only in
16707         case of loop vectorization. In case of basic block vectorization use
16708         data-ref itself as a base.
16709         (vect_create_data_ref_ptr): In case of basic block vectorization:
16710         don't advance the pointer, add new statements before the current
16711         statement.  Adjust function calls.
16712         (vect_supportable_dr_alignment): Support only aligned accesses in
16713         basic block vectorization.
16714         * common.opt (ftree-slp-vectorize): New flag.
16715         * tree-vect-patterns.c (widened_name_p): Adjust function calls.
16716         (vect_pattern_recog_1): Likewise.
16717         * tree-vect-stmts.c (process_use): Likewise.
16718         (vect_init_vector): Add new statements in the beginning of the basic
16719         block in case of basic block SLP.
16720         (vect_get_vec_def_for_operand): Adjust function calls.
16721         (vect_finish_stmt_generation): Likewise.
16722         (vectorizable_call): Add assert that it is loop vectorization, adjust
16723         function calls.
16724         (vectorizable_conversion, vectorizable_assignment): Likewise.
16725         (vectorizable_operation): In case of basic block SLP, take
16726         vectorization factor from statement's type and skip the relevance
16727         check. Adjust function calls.
16728         (vectorizable_type_demotion): Add assert that it is loop
16729         vectorization, adjust function calls.
16730         (vectorizable_type_promotion): Likewise.
16731         (vectorizable_store): Check for outer loop only in case of loop
16732         vectorization. Adjust function calls. For basic blocks, skip the
16733         relevance check and don't advance pointers.
16734         (vectorizable_load): Likewise.
16735         (vectorizable_condition): Add assert that it is loop vectorization,
16736         adjust function calls.
16737         (vect_analyze_stmt): Add argument. In case of basic block SLP, check
16738         that it is not reduction, get vector type, call only supported
16739         functions, skip loop specific parts.
16740         (vect_transform_stmt): Check for outer loop only in case of loop
16741         vectorization.
16742         (new_stmt_vec_info): Add new argument and initialize bb_vinfo.
16743         (vect_is_simple_use): Fix comment, add new argument, fix conditions
16744         for external definition.
16745         * passes.c (pass_slp_vectorize): New pass.
16746         * tree-vect-slp.c (find_bb_location): New function.
16747         (vect_get_and_check_slp_defs): Add argument, adjust function calls,
16748         check for patterns only in loops.
16749         (vect_build_slp_tree): Add argument, adjust function calls, fail in
16750         case of multiple types in basic block SLP.
16751         (vect_mark_slp_stmts_relevant): New function.
16752         (vect_supported_load_permutation_p): Fix comment.
16753         (vect_analyze_slp_instance): Add argument. In case of basic block
16754         SLP, take vectorization factor from statement's type, check that
16755         unrolling factor is 1. Adjust function call. Save SLP instance in
16756         either loop or basic block vectorization structure. Return FALSE,
16757         if SLP failed.
16758         (vect_analyze_slp): Add argument. Get strided stores groups from
16759         either loop or basic block vectorization structure. Return FALSE
16760         if basic block SLP failed.
16761         (new_bb_vec_info): New function.
16762         (destroy_bb_vec_info, vect_slp_analyze_node_operations,
16763         vect_slp_analyze_operations, vect_slp_analyze_bb): Likewise.
16764         (vect_schedule_slp): Add argument. Get SLP instances from either
16765         loop or basic block vectorization structure. Set vectorization factor
16766         to be 1 for basic block SLP.
16767         (vect_slp_transform_bb): New function.
16768         * params.def (PARAM_SLP_MAX_INSNS_IN_BB): Define.
16770 2009-05-23  Mark Mitchell  <mark@codesourcery.com>
16772         * final.c (shorten_branches): Do not align labels for jump tables.
16773         (final_scan_insn): Use JUMP_TABLE_DATA_P.
16775 2009-05-23  Eric Botcazou  <ebotcazou@adacore.com>
16777         * doc/passes.texi: Standardize spelling of RTL, Tree and Tree SSA.
16778         Remove outdated reference to flow.c and fix nits.
16779         * doc/gccint.texi: Tweak RTL description.
16780         * doc/rtl.texi: Likewise.
16782 2009-05-23  Denis Chertykov  <chertykov@gmail.com>
16784         * config/avr/avr.c: Change my email address.
16785         * config/avr/avr.h: Likewise.
16786         * config/avr/avr.md: Likewise.
16787         * config/avr/avr-protos.h: Likewise.
16788         * config/avr/libgcc.S: Likewise.
16790 2009-05-22  Trevor Smigiel <Trevor_Smigiel@playstation.sony.com>
16792         * config/spu/spu-protos.h (aligned_mem_p, spu_valid_mov): Remove.
16793         (spu_split_load, spu_split_store): Change return type to int.
16794         (spu_split_convert): Declare.
16795         * config/spu/predicates.md (spu_mem_operand): Remove.
16796         (spu_mov_operand): Update.
16797         (spu_dest_operand, shiftrt_operator, extend_operator): Define.
16798         * config/spu/spu.c (regno_aligned_for_load): Remove.
16799         (reg_aligned_for_addr, spu_expand_load): Define.
16800         (spu_expand_extv): Reimplement and handle MEM.
16801         (spu_expand_insv): Handle MEM.
16802         (spu_sched_reorder): Handle insn's with length 0.
16803         (spu_legitimate_address_p): Reimplement.
16804         (store_with_one_insn_p): Return TRUE for any mode with size
16805         larger than 16 bytes.
16806         (address_needs_split): Define.
16807         (spu_expand_mov): Call spu_split_load and spu_split_store for MEM
16808         operands.
16809         (spu_convert_move): Define.
16810         (spu_split_load): Use spu_expand_load and change all MEM's to TImode.
16811         (spu_split_store): Change all MEM's to TImode.
16812         (spu_init_expanders): Preallocate registers that correspond to
16813         LAST_VIRTUAL_REG+1 and LAST_VIRTUAL_REG+2 and set them with
16814         mark_reg_pointer.
16815         (spu_split_convert): Define.
16816         * config/spu/spu.md (QHSI, QHSDI): New mode iterators.
16817         (_move<mode>, _movdi, _movti): Update predicate and condition.
16818         (load, store): Change to define_split.
16819         (extendqiti2, extendhiti2, extendsiti2, extendditi2): Simplify to
16820         extend<mode>ti2.
16821         (zero_extendqiti2, zero_extendhiti2, <v>lshr<mode>3_imm): Define.
16822         (lshr<mode>3, lshr<mode>3_imm, lshr<mode>3_re): Simplify to one
16823         define_insn_and_split of lshr<mode>3.
16824         (shrqbybi_<mode>, shrqby_<mode>): Simplify to define_expand.
16825         (<v>ashr<mode>3_imm): Define.
16826         (extv, extzv, insv): Allow MEM operands.
16827         (trunc_shr_ti<mode>, trunc_shr_tidi, shl_ext_<mode>ti,
16828         shl_ext_diti, sext_trunc_lshr_tiqisi, zext_trunc_lshr_tiqisi,
16829         sext_trunc_lshr_tihisi, zext_trunc_lshr_tihisi): Define for combine.
16830         (_spu_convert2): Change to define_insn_and_split and remove the
16831         corresponding define_peephole2.
16832         (stack_protect_set, stack_protect_test, stack_protect_test_si):
16833         Change predicates to memory_operand.
16835 2009-05-22  Mark Mitchell  <mark@codesourcery.com>
16837         * config/arm/thumb2.md: Add 16-bit multiply instructions.
16839 2009-05-21  Michael Meissner  <meissner@linux.vnet.ibm.com>
16841         PR tree-optimization/40219
16842         * tree.c (iterative_hash_expr): Make sure the builtin function is
16843         a normal builtin function and not a front end or back end builtin
16844         before indexing into the built_in_decls array.
16846 2009-05-22  Richard Guenther  <rguenther@suse.de>
16848         PR middle-end/38964
16849         * alias.c (write_dependence_p): Do not use TBAA for answering
16850         anti-dependence or output-dependence.
16851         * tree-ssa-structalias.c (set_uids_in_ptset): Remove TBAA pruning code.
16852         (emit_pointer_definition): Remove.
16853         (emit_alias_warning): Likewise.
16854         (find_what_var_points_to): Remove TBAA pruning code.
16855         (find_what_p_points_to): Likewise.  Do not warn about strict-aliasing
16856         violations.
16857         (compute_points_to_sets): Remove code computing the set of
16858         dereferenced pointers.
16859         * tree-data-ref.c (dr_may_alias_p): Properly use the split
16860         oracle for querying anti and output dependencies.
16861         * tree-ssa-alias.c (refs_may_alias_p_1): Add argument specifying
16862         if TBAA may be applied.
16863         (refs_anti_dependent_p): New function.
16864         (refs_output_dependent_p): Likewise.
16865         * tree-ssa-alias.h (refs_anti_dependent_p): Declare.
16866         (refs_output_dependent_p): Likewise.
16867         * doc/tree-ssa.texi (Memory model): New section.
16868         * doc/c-tree.texi (CHANGE_DYNAMIC_TYPE_EXPR): Remove.
16869         * doc/gimple.texi (GIMPLE_CHANGE_DYNAMIC_TYPE): Remove.
16870         * cfgexpand.c (expand_gimple_basic_block): Do not handle
16871         GIMPLE_CHANGE_DYNAMIC_TYPE or CHANGE_DYNAMIC_TYPE_EXPR.
16872         * expr.c (expand_expr_real_1): Likewise.
16873         * gimple-low.c (lower_stmt): Likewise.
16874         * gimple-pretty-print.c (dump_gimple_stmt): Likewise.
16875         (dump_gimple_cdt): Remove.
16876         * gimple.c (gss_for_code): Do not handle GIMPLE_CHANGE_DYNAMIC_TYPE.
16877         (gimple_size): Likewise.
16878         (walk_gimple_op): Likewise.
16879         (is_gimple_stmt): Likewise.
16880         (walk_stmt_load_store_addr_ops): Likewise.
16881         (gimple_build_cdt): Remove.
16882         * gimple.def (GIMPLE_CHANGE_DYNAMIC_TYPE): Remove.
16883         * gimple.h (gimple_cdt_new_type): Remove.
16884         (gimple_cdt_new_type_ptr): Likewise.
16885         (gimple_cdt_set_new_type): Likewise.
16886         (gimple_cdt_location): Likewise.
16887         (gimple_cdt_location_ptr): Likewise.
16888         (gimple_cdt_set_location): Likewise.
16889         * gimplify.c (gimplify_expr): Do not handle CHANGE_DYNAMIC_TYPE_EXPR.
16890         * tree-cfg.c (remove_useless_stmts_1): Do not handle
16891         GIMPLE_CHANGE_DYNAMIC_TYPE.
16892         (verify_types_in_gimple_stmt): Likewise.
16893         * tree-inline.c (estimate_num_insns): Likewise.
16894         (expand_call_inline): Do not copy DECL_NO_TBAA_P.
16895         (copy_decl_to_var): Likewise.
16896         (copy_result_decl_to_var): Likewise.
16897         * tree-pretty-print.c (dump_generic_node): Do not handle
16898         CHANGE_DYNAMIC_TYPE_EXPR.
16899         * tree-ssa-dce.c (mark_stmt_if_obviously_necessary): Likewise.
16900         * tree-ssa-operands.c (get_expr_operands): Likewise.
16901         * tree-ssa-structalias.c (struct variable_info): Remove
16902         no_tbaa_pruning member.
16903         (new_var_info): Do not set it based on DECL_NO_TBAA_P.
16904         (unify_nodes): Do not copy it.
16905         (find_func_aliases): Do not handle GIMPLE_CHANGE_DYNAMIC_TYPE.
16906         (dump_solution_for_var): Do not dump no_tbaa_pruning state.
16907         (set_uids_in_ptset): Do not check it.
16908         (find_what_var_points_to): Likewise.
16909         (compute_tbaa_pruning): Remove.
16910         (compute_points_to_sets): Do not call it.
16911         * tree.c (walk_tree_1): Do not handle CHANGE_DYNAMIC_TYPE_EXPR.
16912         * tree.def (CHANGE_DYNAMIC_TYPE_EXPR): Remove.
16913         * tree.h (CHANGE_DYNAMIC_TYPE_NEW_TYPE): Remove.
16914         (CHANGE_DYNAMIC_TYPE_LOCATION): Likewise.
16915         (DECL_NO_TBAA_P): Likewise.
16916         (struct tree_decl_common): Move no_tbaa_flag to unused flags section.
16917         * omp-low.c (copy_var_decl): Do not copy DECL_NO_TBAA_P.
16918         (expand_omp_atomic_pipeline): Do not set it.
16919         * print-tree.c (print_node): Do not dump it.
16920         * tree-ssa-copyrename.c (copy_rename_partition_coalesce): Remove
16921         redundant check.
16923 2009-05-22 Vladimir Makarov <vmakarov@redhat.com>
16925         PR target/39856
16926         * reg-stack.c (subst_stack_regs_pat): Remove gcc_assert for note
16927         for clobber.
16929 2009-05-22  Mark Mitchell  <mark@codesourcery.com>
16931         * tree.c (handle_dll_attribute): Mark dllexport'd inlines as
16932         non-external.
16934 2009-05-22  Ben Elliston  <bje@au.ibm.com>
16936         * Makefile.in (bversion.h, s-bversion): New targets.
16937         (TOPLEV_H): Add bversion.h.
16938         * toplev.h: Include "bversion.h".
16939         (ATTRIBUTE_GCC_DIAG): When building with checking disabled, use
16940         the __format__ attribute only if compiling with the same version
16941         of GCC as the sources (the "build version").
16943 2009-05-22  Ben Elliston  <bje@au.ibm.com>
16945         * c-format.c (handle_format_attribute): Fix comment typo.
16947 2009-05-21  Steve Ellcey  <sje@cup.hp.com>
16949         PR target/37846
16950         * config/ia64/ia64.opt (mfused-madd): New.
16951         * config/ia64/ia64.h (TARGET_DEFAULT): Set MASK_FUSED_MADD.
16952         * config/ia64/hpux.h (TARGET_DEFAULT): Ditto.
16953         * config/ia64/ia64.md (maddsf4, msubsf4, nmaddsf4,
16954         madddf4, madddf4_trunc, msubdf4, msubdf4_trunc, nmadddf4,
16955         nmadddf4_truncsf, maddxf4, maddxf4_truncsf, maddxf4_truncdf,
16956         msubxf4, msubxf4_truncsf msubxf4_truncdf, nmaddxf4,
16957         nmaddxf4_truncsf, nmaddxf4_truncdf): Check TARGET_FUSED_MADD.
16958         * config/ia64/vect.md (addv2sf3, subv2sf3): Force fpma/fpms
16959         instruction if !TARGET_FUSED_MADD.
16960         (fpma, fpms): Remove colon from name.
16962 2009-05-22  Richard Guenther  <rguenther@suse.de>
16964         * tree-ssa-sccvn.c (copy_reference_ops_from_ref): Record
16965         TMR_ORIGINAL.  Always either record TMR_SYMBOL or TMR_BASE.
16966         * tree-ssa-pre.c (create_component_ref_by_pieces_1): Handle
16967         TARGET_MEM_REF.
16968         (create_expression_by_pieces): Only convert if necessary.
16969         * gimplify.c (gimplify_expr): Handle TARGET_MEM_REF.
16970         * tree-ssa-loop-im.c (gen_lsm_tmp_name): Handle INTEGER_CST.
16972 2009-05-21  Adam Nemet  <anemet@caviumnetworks.com>
16974         * config/mips/mips.md (*extzv_trunc<mode>_exts): Turn into a
16975         regular pattern from a template and rename it ...
16976         (*extzv_truncsi_exts): ... to this.
16978 2009-05-21  Richard Guenther  <rguenther@suse.de>
16980         * cgraph.h (struct cgraph_node): Remove inline_decl member.
16981         * ipa-inline.c (cgraph_mark_inline_edge): Do not check it.
16982         (cgraph_default_inline_p): Likewise.
16983         (cgraph_decide_inlining_incrementally): Likewise.
16985 2009-05-21  H.J. Lu  <hongjiu.lu@intel.com>
16986             Uros Bizjak  <ubizjak@gmail.com>
16988         * config/i386/cpuid.h (bit_MOVBE): New.
16990         * config/i386/driver-i386.c (host_detect_local_cpu): Check movbe.
16992         * config/i386/i386.c (OPTION_MASK_ISA_MOVBE_SET): New.
16993         (OPTION_MASK_ISA_MOVBE_UNSET): Likewise.
16994         (ix86_handle_option): Handle OPT_mmovbe.
16995         (ix86_target_string): Add -mmovbe.
16996         (pta_flags): Add PTA_MOVBE.
16997         (processor_alias_table): Add PTA_MOVBE to "atom".
16998         (override_options): Handle PTA_MOVBE.
17000         * config/i386/i386.h (TARGET_MOVBE): New.
17002         * config/i386/i386.md (bswapsi2): Check TARGET_MOVBE.
17003         (*bswapsi_movbe): New.
17004         (*bswapdi_movbe): Likewise.
17005         (bswapdi2): Renamed to ...
17006         (*bswapdi_1): This.
17007         (bswapdi2): New expander.
17009         * config/i386/i386.opt (mmovbe): New.
17011         * doc/invoke.texi: Document -mmovbe.
17013 2009-05-21  Taras Glek  <tglek@mozilla.com>
17015         * plugin.c (try_init_one_plugin): Updated to new plugin_init API.
17016         * gcc-plugin.h (plugin_init): Updated signature.
17017         * gcc-plugin.h (plugin_name_args): Moved to this header.
17018         * doc/plugins.texi (plugin_init): Updated documention to reflect
17019         API change.
17020         * doc/plugins.texi (plugin_name_args): Added to documention.
17022 2009-05-21  Mark Mitchell  <mark@codesourcery.com>
17024         * config/arm/neon.md (*mul<mode>3add<mode>_neon): New pattern.
17025         (*mul<mode>3neg<mode>add<mode>_neon): Likewise.
17027 2009-05-21  Shujing Zhao  <pearly.zhao@oracle.com>
17029         * config/i386/i386.c: Use REG_P, MEM_P, CONST_INT_P, LABEL_P and
17030         JUMP_TABLE_DATA_P predicates where applicable.
17031         * config/i386/predicates.md: Ditto.
17032         * config/i386/sse.md: Ditto.
17034 2009-05-21  Jakub Jelinek  <jakub@redhat.com>
17036         * config/i386/i386.md (adddi_4_rex64, addsi_4, addhi_4): For
17037         operand2 -128 override length_immediate attribute to 1.
17038         * config/i386/predicates.md (constm128_operand): New predicate.
17040         * config/i386/i386.c (memory_address_length): Handle %r12
17041         the same as %rsp and %r13 the same as %rbp.  For %rsp and %rbp
17042         also check REGNO.
17043         (ix86_attr_length_address_default): For MODE_SI lea in 64-bit
17044         mode look through optional ZERO_EXTEND and SUBREG.
17045         * config/i386/i386.md (R12_REG): New define_constant.
17046         (prefix_data16): For sse unit set also for MODE_TI insns.
17047         (prefix_rex): For -m32 always return 0.  For TYPE_IMOVX
17048         insns set if operand 1 is ext_QIreg_operand.
17049         (modrm): For TYPE_IMOV clear only if not MODE_DI.  For
17050         TYPE_{ALU{,1},ICMP,TEST} insn clear if there is non-shortened
17051         immediate.
17052         (*movdi_extzv_1, zero_extendhidi2, zero_extendqidi2): Change
17053         mode from MODE_DI to MODE_SI.
17054         (movdi_1_rex64): Override modrm and length_immediate attributes
17055         only for movabs (TYPE_IMOV, alternative 2).
17056         (zero_extendsidi2_rex64): Clear prefix_0f attribute if TYPE_IMOVX.
17057         (*float<SSEMODEI24:mode><MODEF:mode>2_mixed_interunit,
17058         *float<SSEMODEI24:mode><MODEF:mode>2_mixed_nointerunit,
17059         *float<SSEMODEI24:mode><MODEF:mode>2_sse_interunit,
17060         *float<SSEMODEI24:mode><MODEF:mode>2_sse_nointerunit): Set
17061         prefix_rex attribute if DImode.
17062         (*adddi_1_rex64, *adddi_2_rex64, *adddi_3_rex64, *adddi_5_rex64,
17063         *addsi_1, *addsi_1_zext, *addsi_2, *addsi_2_zext, *addsi_3,
17064         *addsi_3_zext, *addsi_5, *addhi_1_lea, *addhi_1, *addhi_2, *addhi_3,
17065         *addhi_5, *addqi_1_lea, *addqi_1): Override length_immediate
17066         attribute to 1 if TYPE_ALU and operand 2 is const128_operand.
17067         (pro_epilogue_adjust_stack_1, pro_epilogue_adjust_stack_rex64):
17068         Likewise.  For TYPE_IMOV clear length_immediate attribute.
17069         (*ashldi3_1_rex64, *ashldi3_cmp_rex64, *ashldi3_cconly_rex64,
17070         *ashlsi3_1, *ashlsi3_1_zext, *ashlsi3_cmp, **ashlsi3_cconly,
17071         *ashlsi3_cmp_zext, *ashlhi3_1_lea, *ashlhi3_1, *ashlhi3_cmp,
17072         *ashlhi3_cconly, *ashlqi3_1_lea, *ashlqi3_1, *ashlqi3_cmp,
17073         *ashlqi3_cconly): Override length_immediate attribute to 0 if TYPE_ALU
17074         or one operand TYPE_ISHIFT.
17075         (*ashrdi3_1_one_bit_rex64, *ashrdi3_one_bit_cmp_rex64,
17076         *ashrdi3_one_bit_cconly_rex64, *ashrsi3_1_one_bit,
17077         *ashrsi3_1_one_bit_zext, *ashrsi3_one_bit_cmp,
17078         *ashrsi3_one_bit_cconly, *ashrsi3_one_bit_cmp_zext,
17079         *ashrhi3_1_one_bit, *ashrhi3_one_bit_cmp, *ashrhi3_one_bit_cconly,
17080         *ashrqi3_1_one_bit, *ashrqi3_1_one_bit_slp, *ashrqi3_one_bit_cmp,
17081         *ashrqi3_one_bit_cconly, *lshrdi3_1_one_bit_rex64,
17082         *lshrdi3_cmp_one_bit_rex64, *lshrdi3_cconly_one_bit_rex64,
17083         *lshrsi3_1_one_bit, *lshrsi3_1_one_bit_zext, *lshrsi3_one_bit_cmp,
17084         *lshrsi3_one_bit_cconly, *lshrsi3_cmp_one_bit_zext,
17085         *lshrhi3_1_one_bit, *lshrhi3_one_bit_cmp, *lshrhi3_one_bit_cconly,
17086         *lshrqi3_1_one_bit, *lshrqi3_1_one_bit_slp, *lshrqi2_one_bit_cmp,
17087         *lshrqi2_one_bit_cconly, *rotlsi3_1_one_bit_rex64, *rotlsi3_1_one_bit,
17088         *rotlsi3_1_one_bit_zext, *rotlhi3_1_one_bit, *rotlqi3_1_one_bit_slp,
17089         *rotlqi3_1_one_bit, *rotrdi3_1_one_bit_rex64, *rotrsi3_1_one_bit,
17090         *rotrsi3_1_one_bit_zext, *rotrhi3_one_bit, *rotrqi3_1_one_bit,
17091         *rotrqi3_1_one_bit_slp): Override length_immediate attribute to 0,
17092         set mode attribute, don't override length attribute.
17093         (*btsq, *btrq, *btcq, *btdi_rex64, *btsi): Set prefix_0f attribute
17094         to 1.
17095         (return_internal_long): Set length attribute to 2 instead of 1.
17096         (*strmovqi_rex_1, *strsetqi_rex_1, *rep_stosqi_rex64,
17097         *cmpstrnqi_nz_rex_1, *cmpstrnqi_rex_1, *strlenqi_rex_1): Clear
17098         prefix_rex attribute.
17099         * config/i386/predicates.md (ext_QIreg_operand, const128_operand):
17100         New predicates.
17101         (memory_displacement_only_operand): Always return 0 for TARGET_64BIT.
17103 2009-05-21  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
17105         * config/arm/thumb2.md (orsi_notsi_si): Fix typo in pattern.
17107 2009-05-20  Ian Lance Taylor  <iant@google.com>
17109         * tree.c (build_tree_list_vec_stat): New function.
17110         (ctor_to_vec): New function.
17111         (build_nt_call_vec): New function.
17112         (build_call_array): Change args to be a const pointer.
17113         (build_call_vec): New function.
17114         * tree.h (build_nt_call_vec): Declare.
17115         (build_tree_list_vec_stat): Declare.
17116         (build_tree_list_vec): Define.
17117         (build_call_array): Update declaration.
17118         (build_call_vec): Declare.
17119         (ctor_to_vec): Declare.
17120         * c-common.c (tree_vector_cache): New static variable.
17121         (make_tree_vector): New function.
17122         (release_tree_vector): New function.
17123         (make_tree_vector_single): New function.
17124         (make_tree_vector_copy): New function.
17125         * c-common.h (tree_vector_cache, make_tree_vector): Declare.
17126         (make_tree_vector_single, make_tree_vector_copy): Declare.
17127         * c-parser.c (cached_expr_list_1, cached_expr_list_2): Remove.
17128         (c_parser_expr_list): Don't manage cache here, instead call
17129         make_tree_vector.
17130         (c_parser_release_expr_list): Remove static function.
17131         (c_parser_vec_to_tree_list): Remove static function.
17132         (c_parser_attributes): Call build_tree_list_vec instead of
17133         c_parser_vec_to_tree_list.  Call release_tree_vector instead of
17134         c_parser_release_expr_list.
17135         (c_parser_postfix_expression_after_primary): Likewise.
17136         (c_parser_objc_keywordexpr): Likewise.
17138 2009-05-20  Sandra Loosemore  <sandra@codesourcery.com>
17140         * doc/tm.texi (Misc): Document TARGET_INVALID_PARAMETER_TYPE,
17141         TARGET_INVALID_RETURN_TYPE, TARGET_PROMOTED_TYPE, and
17142         TARGET_CONVERT_TO_TYPE.
17143         * hooks.c (hook_tree_const_tree_null): Define.
17144         * hooks.h (hook_tree_const_tree_null): Declare.
17145         * target.h (struct gcc_target):  Add invalid_parameter_type,
17146         invalid_return_type, promoted_type, and convert_to_type fields.
17147         * target-def.h (TARGET_INVALID_PARAMETER_TYPE): Define.
17148         (TARGET_INVALID_RETURN_TYPE): Define.
17149         (TARGET_PROMOTED_TYPE): Define.
17150         (TARGET_CONVERT_TO_TYPE): Define.
17151         (TARGET_INITIALIZER): Update for new fields.
17152         * c-decl.c (grokdeclarator): Check targetm.invalid_return_type.
17153         (grokparms): Check targetm.invalid_parameter_type.
17154         * c-typeck.c (default_conversion): Check targetm.promoted_type.
17155         * c-convert.c (convert): Check targetm.convert_to_type.
17157 2009-05-20  Adam Nemet  <anemet@caviumnetworks.com>
17159         * config/mips/mips.md (*extenddi_truncate<mode>,
17160         *extendsi_truncate<mode>): Emit exts if supported.  Add attribute
17161         defintions.
17162         (*extendhi_truncateqi): New define_insn_and_sptit.
17164 2009-05-20  Jakub Jelinek  <jakub@redhat.com>
17166         PR middle-end/40204
17167         * fold-const.c (fold_binary) <case BIT_AND_EXPR>: Avoid infinite
17168         recursion if build_int_cst_type returns the same INTEGER_CST as arg1.
17170 2009-05-20  Eric Botcazou  <ebotcazou@adacore.com>
17172         * fold-const.c (build_fold_addr_expr_with_type): Take the address of
17173         the operand of VIEW_CONVERT_EXPR.
17175 2009-05-20  H.J. Lu  <hongjiu.lu@intel.com>
17177         * config/i386/driver-i386.c (host_detect_local_cpu): Check
17178         extended family and model for Intel processors.  Support Intel Atom.
17180 2009-05-20  Olivier Hainque  <hainque@adacore.com>
17182         * gstab.h (stab_code_type): Define, to be used instead of the
17183         __stab_debug_code enum, made anonymous.  Add 2009 to the copyright
17184         notice.
17185         * dbxout.c (STAB_CODE_TYPE): Remove #define and replace use
17186         occurrences by stab_code_type.
17187         * mips-tfile.c (STAB_CODE_TYPE): Remove #define, unused.
17189 2009-05-20  Martin Jambor  <mjambor@suse.cz>
17191         * tree-flow.h (insert_edge_copies_seq): Undeclare.
17192         (sra_insert_before): Likewise.
17193         (sra_insert_after): Likewise.
17194         (sra_init_cache): Likewise.
17195         (sra_type_can_be_decomposed_p): Likewise.
17196         * tree-mudflap.c (insert_edge_copies_seq): Copied here from tree-sra.c
17197         * tree-sra.c (sra_type_can_be_decomposed_p): Made static.
17198         (sra_insert_before): Likewise.
17199         (sra_insert_after): Likewise.
17200         (sra_init_cache): Likewise.
17201         (insert_edge_copies_seq): Made static and moved upwards.
17203         * tree-complex.c (extract_component): Added VIEW_CONVERT_EXPR switch
17204         case.
17206         * tree-flow-inline.h (contains_view_convert_expr_p): New function.
17208         * ipa-prop.c (get_ssa_def_if_simple_copy): New function.
17209         (determine_cst_member_ptr): Call get_ssa_def_if_simple_copy to skip
17210         simple copies.
17212 2009-05-20  Richard Guenther  <rguenther@suse.de>
17214         * expr.c (expand_expr_real_1): Avoid calling do_store_flag
17215         with mismatched comparison modes.
17217 2009-05-20  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
17219         * config/arm/arm.md (*arm_iorsi3): Refactored for only ARM.
17220         (peephole ior (reg, int) -> mov, ior): Refactored for only ARM.
17221         * config/arm/thumb2.md (*thumb_andsi_not_shiftsi_si): Allow bic
17222         with shifts for Thumb2.
17223         (orsi_notsi): New for orn.
17224         (*thumb_orsi_notshiftsi_si): Allow orn with shifts.
17225         (*thumb2_iorsi3): Rewrite support for iorsi for Thumb2.
17226         * config/arm/arm.c (const_ok_for_op): Split case for IOR for Thumb2.
17227         (arm_gen_constant): Set can_invert for IOR and Thumb2, Add comments.
17228         Don't invert remainder for IOR.
17230 2009-05-19  Zdenek Dvorak  <ook@ucw.cz>
17232         PR tree-optimization/40087
17233         * tree-ssa-loop-niter.c (number_of_iterations_ne_max,
17234         number_of_iterations_ne): Rename never_infinite argument.
17235         (number_of_iterations_lt_to_ne, number_of_iterations_lt,
17236         number_of_iterations_le): Handle pointer-type ivs when
17237         exit_must_be_taken is false.
17238         (number_of_iterations_cond):  Do not always assume that
17239         exit_must_be_taken if the control variable is a pointer.
17241 2009-05-19  Andrew Pinski  <andrew_pinski@playstation.sony.com>
17243         * c-typeck.c (build_binary_op): Allow % on integal vectors.
17244         * doc/extend.texi (Vector Extension): Document that % is allowed too.
17246 2009-05-19  H.J. Lu  <hongjiu.lu@intel.com>
17248         * config/i386/i386.c (ix86_avoid_jump_mispredicts): Check
17249         ASM_OUTPUT_MAX_SKIP_PAD instead of ASM_OUTPUT_MAX_SKIP_ALIGN.
17251 2009-05-19  Manuel López-Ibáñez  <manu@gcc.gnu.org>
17253         PR c/40172
17254         * c.opt (Wlogical-op): Disabled by default.
17255         * c-opt (c_common_post_options): Do not enable Wlogical-op with
17256         Wextra.
17257         * doc/invoke.texi (Wlogical-op): Likewise.
17259 2009-05-19  Eric Botcazou  <ebotcazou@adacore.com>
17261         * tree-scalar-evolution.c (follow_ssa_edge_expr) <NOP_EXPR>: Turn
17262         into CASE_CONVERT.
17263         <PLUS_EXPR>: Strip useless type conversions instead of type nops.
17264         Propagate the type of the first operand.
17265         <ASSERT_EXPR>: Simplify.
17266         (follow_ssa_edge_in_rhs): Use gimple_expr_type to get the type.
17267         Rewrite using the RHS code as discriminant.
17268         <NOP_EXPR>: Turn into CASE_CONVERT.
17269         <PLUS_EXPR>: Propagate the type of the first operand.
17271 2009-05-19  Steve Ellcey  <sje@cup.hp.com>
17273         * config/ia64/ia64-protos.h (ia64_dconst_0_5): New.
17274         (ia64_dconst_0_375): New.
17275         * config/ia64/ia64.c (ia64_override_options): Remove
17276         -minline-sqrt-min-latency warning.
17277         (ia64_dconst_0_5_rtx, ia64_dconst_0_5): New.
17278         (ia64_dconst_0_375_rtx, ia64_dconst_0_375): New
17279         * config/ia64/ia64.md (*sqrt_approx): Remove.
17280         (sqrtsf2): Remove #if 0.
17281         (sqrtsf2_internal_thr): Rewrite and move to div.md.
17282         (sqrtdf): Remove assert.
17283         (sqrtdf2_internal_thr): Rewrite and move to div.md.
17284         (sqrtxf2): Remove #if 0.
17285         (sqrtxf2_internal_thr): Rewrite and move to div.md.
17286         * div.md (sqrt_approx_rf): New.
17287         (sqrtsf2_internal_thr): New implementation.
17288         (sqrtsf2_internal_lat): New.
17289         (sqrtdf2_internal_thr: New implementation.
17290         (sqrtxf2_internal): New implementation.
17292 2009-05-19  Francois-Xavier Coudert  <fxcoudert@gmail.com>
17293             Hans-Peter Nilsson  <hp@axis.com>
17295         * defaults.h (UINT_FAST64_TYPE, INTPTR_TYPE, UINTPTR_TYPE)
17296         (WCHAR_TYPE, MODIFIED_WCHAR_TYPE, PTRDIFF_TYPE, WINT_TYPE)
17297         (INTMAX_TYPE, UINTMAX_TYPE, SIG_ATOMIC_TYPE, INT8_TYPE, INT16_TYPE)
17298         (INT32_TYPE, INT64_TYPE, UINT8_TYPE, UINT16_TYPE, UINT32_TYPE)
17299         (UINT64_TYPE, INT_LEAST8_TYPE, INT_LEAST16_TYPE, INT_LEAST32_TYPE)
17300         (INT_LEAST64_TYPE, UINT_LEAST8_TYPE, UINT_LEAST16_TYPE)
17301         (UINT_LEAST32_TYPE, UINT_LEAST64_TYPE, INT_FAST8_TYPE)
17302         (INT_FAST16_TYPE, INT_FAST32_TYPE, INT_FAST64_TYPE)
17303         (UINT_FAST8_TYPE, UINT_FAST16_TYPE, UINT_FAST32_TYPE)
17304         (SIZE_TYPE, PID_TYPE, CHAR16_TYPE, CHAR32_TYPE): Move defaults here...
17305         * c-common.c: ...from here.
17307 2009-05-19  Manuel López-Ibáñez  <manu@gcc.gnu.org>
17309         * c-common.c (warn_logical_operator): Remove unnecessary conditionals.
17311 2009-05-19  Kaveh R. Ghazi  <ghazi@caip.rutgers.edu>
17313         * builtins.c (do_mpc_arg1): Separate MPFR/MPC C rounding types.
17315 2009-05-19  Ben Elliston  <bje@au.ibm.com>
17317         * unwind-dw2-fde.c (fde_unencoded_compare): Replace type punning
17318         assignments with memcpy calls.
17319         (add_fdes): Likewise.
17320         (binary_search_unencoded_fdes): Likewise.
17321         (linear_search_fdes): Eliminate type puns.
17323 2009-05-19  Richard Guenther  <rguenther@suse.de>
17325         * tree-ssa-forwprop.c (forward_propagate_addr_expr_1): Do
17326         not falsely claim to have propagated into all uses.
17328 2009-05-19  Ben Elliston  <bje@au.ibm.com>
17330         * doc/invoke.texi (C Dialect Options): Update OpenMP specification
17331         version to v3.0.
17333 2009-05-18  Kaz Kojima  <kkojima@gcc.gnu.org>
17335         * config/sh/sh-protos.h (sh_legitimate_address_p): Remove.
17336         * config/sh/sh.c (sh_legitimate_address_p): Make static.
17337         (TARGET_LEGITIMATE_ADDRESS_P): New.
17338         * config/sh/sh.h (GO_IF_LEGITIMATE_ADDRESS): Delete.
17339         * config/sh/sh.md: Clean up references to GO_IF_LEGITIMATE_ADDRESS.
17341 2009-05-18  Dodji Seketeli  <dodji@redhat.com>
17343         PR debug/40109
17344         * dwarf2out.c (gen_type_die_with_usage): Generate the DIE as a
17345         child of the containing namespace's DIE.
17347 2009-05-18  Adam Nemet  <anemet@caviumnetworks.com>
17349         * config/mips/mips.md (*zero_extend<GPR:mode>_trunc<SHORT:mode>,
17350         *zero_extendhi_truncqi):  Move after the zero_extend patterns.
17351         (*extenddi_truncate<mode>, *extendsi_truncate<mode>): Move after the
17352         extend patterns.
17354 2009-05-18  H.J. Lu  <hongjiu.lu@intel.com>
17356         PR target/39942
17357         * config/i386/i386.c (ix86_avoid_jump_misspredicts): Replace
17358         gen_align with gen_pad.
17359         (ix86_reorg): Check ASM_OUTPUT_MAX_SKIP_PAD instead of
17360         #ifdef ASM_OUTPUT_MAX_SKIP_ALIGN.
17362         * config/i386/i386.h (ASM_OUTPUT_MAX_SKIP_PAD): New.
17363         * config/i386/x86-64.h (ASM_OUTPUT_MAX_SKIP_PAD): Likewise.
17365         * config/i386/i386.md (align): Renamed to ...
17366         (pad): This.  Replace ASM_OUTPUT_MAX_SKIP_ALIGN with
17367         ASM_OUTPUT_MAX_SKIP_PAD.
17369 2009-05-18  Andreas Schwab  <schwab@linux-m68k.org>
17371         * config.gcc: Fix variable syntax.
17373         PR target/39531
17374         * config/m68k/m68k.c (output_andsi3): Mask off sign bit copies
17375         before calling exact_log2.
17376         (output_iorsi3): Likewise.
17377         (output_xorsi3): Likewise.
17379 2009-05-18  Kaz Kojima  <kkojima@gcc.gnu.org>
17381         * config/sh/sh.c (expand_cbranchdi4): Use a scratch register
17382         for the none zero constant operand except for EQ and NE
17383         comprisons even when the first operand is R0.
17385 2009-05-18  Andreas Krebbel  <krebbel1@de.ibm.com>
17387         * config/s390/2064.md: Remove trailing whitespaces.
17388         * config/s390/2084.md: Likewise.
17389         * config/s390/constraints.md: Likewise.
17390         * config/s390/fixdfdi.h: Likewise.
17391         * config/s390/libgcc-glibc.ver: Likewise.
17392         * config/s390/s390-modes.def: Likewise.
17393         * config/s390/s390-protos.h: Likewise.
17394         * config/s390/s390.c: Likewise.
17395         * config/s390/s390.h: Likewise.
17396         * config/s390/s390.md: Likewise.
17397         * config/s390/tpf-unwind.h: Likewise.
17399 2009-05-18  Maxim Kuvyrkov  <maxim@codesourcery.com>
17401         * config/m68k/m68k.c (m68k_legitimize_address): Fix typo in signature.
17403 2009-05-18  Maxim Kuvyrkov  <maxim@codesourcery.com>
17405         M68K TLS support.
17406         * configure.ac (m68k-*-*): Check if binutils support TLS.
17407         * configure: Regenerate.
17408         * config/m68k/predicates.md (symbolic_operand): Extend comment.
17409         * config/m68k/constraints.md (Cu): New constraint.
17410         * config/m68k/m68k.md (UNSPEC_GOTOFF): Remove.
17411         (UNSPEC_RELOC16, UNSPEC_RELOC32): New constants.
17412         (movsi): Handle TLS symbols.
17413         (addsi3_5200): Handle XTLS symbols, indent.
17414         * config/m68k/m68k-protos.h (m68k_legitimize_tls_address): Declare.
17415         (m68k_tls_reference_p): Declare.
17416         (m68k_legitimize_address): Declare.
17417         (m68k_unwrap_symbol): Declare.
17418         * config/m68k/m68k.opt (mxtls): New option.
17419         * config/m68k/m68k.c (ggc.h): Include.
17420         (m68k_output_dwarf_dtprel): Implement hook.
17421         (TARGET_HAVE_TLS, TARGET_ASM_OUTPUT_DWARF_DTPREL): Define.
17422         (m68k_expand_prologue): Load GOT pointer when function needs it.
17423         (m68k_illegitimate_symbolic_constant_p): Handle TLS symbols.
17424         (m68k_legitimate_constant_address_p): Same.
17425         (m68k_decompose_address): Handle TLS references.
17426         (m68k_get_gp): New static function.
17427         (enum m68k_reloc): New contants.
17428         (TLS_RELOC_P): New macro.
17429         (m68k_wrap_symbol): New static function.
17430         (m68k_unwrap_symbol): New function.
17431         (m68k_final_prescan_insn_1): New static function.
17432         (m68k_final_prescan_insn): New function.
17433         (m68k_move_to_reg, m68k_wrap_symbol_into_got_ref): New static
17434         functions.
17435         (legitimize_pic_address): Handle TLS references..
17436         (m68k_tls_get_addr, m68k_get_tls_get_addr)
17437         (m68k_libcall_value_in_a0_p)
17438         (m68k_call_tls_get_addr, m68k_read_tp, m68k_get_m68k_read_tp)
17439         (m68k_call_m68k_read_tp): Helper variables and functions for ...
17440         (m68k_legitimize_tls_address): Handle TLS references.
17441         (m68k_tls_symbol_p, m68k_tls_reference_p_1, m68k_tls_reference_p):
17442         New functions.
17443         (m68k_legitimize_address): Handle TLS symbols.
17444         (m68k_get_reloc_decoration): New static function.
17445         (m68k_output_addr_const_extra): Handle UNSPEC_RELOC16 and
17446         UNSPEC_RELOC32.
17447         (m68k_output_dwarf_dtprel): Implement hook.
17448         (print_operand_address): Handle UNSPEC_RELOC16 adn UNSPEC_RELOC32.
17449         (m68k_libcall_value): Return result in A0 instead of D0 when asked by
17450         m68k_call_* routines.
17451         (sched_attr_op_type): Handle TLS symbols.
17452         (gt-m68k.h): Include.
17453         * config/m68k/m68k.h (FINAL_PRESCAN_INSN): Define.
17454         (LEGITIMATE_PIC_OPERAND_P): Support TLS.
17456 2009-05-18  Martin Jambor  <mjambor@suse.cz>
17458         * ipa-prop.c (ipa_check_stmt_modifications): Removed.
17459         (visit_store_addr_for_mod_analysis): New function.
17460         (ipa_detect_param_modifications): Use walk_stmt_load_store_addr_ops.
17461         (determine_cst_member_ptr): Use gimple_assign_single_p.
17462         (ipa_get_stmt_member_ptr_load_param): Use gimple_assign_single_p.
17463         (ipa_analyze_call_uses): Use !gimple_assign_rhs2 rather than number of
17464         operands.  Don't check number of operands of a NOP_EXPR.
17466 2009-05-18  Eric Fisher  <joefoxreal@gmail.com>
17468         * doc/tree-ssa.texi (SSA Operands): Fix a mistake.
17470 2009-05-17  Manuel López-Ibáñez  <manu@gcc.gnu.org>
17472         PR c/40172
17473         * c-common.c (warn_logical_operator): Don't warn if one of
17474         expression isn't always true or false.
17476 2009-05-17  Kai Tietz  <kai.tietz@onevision.com>
17478         * config/i386/biarch32.h: New file.
17479         * config.gcc: Add for target i386-w64-* the biarch32.h to tm_file.
17481 2009-05-17  Adam Nemet  <anemet@caviumnetworks.com>
17483         * config/mips/mips.md (*zero_extend<mode>_trunchi,
17484         *zero_extend<mode>_truncqi): Merge these into ...
17485         (*zero_extend<GPR:mode>_trunc<SHORT:mode>): ... this new pattern.
17486         Name the pattern following this as *zero_extendhi_truncqi.
17488 2009-05-16  Brad Lucier  <lucier@math.purdue.edu>
17490         PR middle-end/39301
17491         * hwint.h: Add macro HOST_WIDEST_INT_PRINT.
17492         * bitmap.c (bitmap_descriptor): Make fields HOST_WIDEST_INT.
17493         (output_info): Make field HOST_WIDEST_INT.
17494         (print_statistics): Use HOST_WIDEST_INT_PRINT.
17495         (dump_bitmat_statistics): Same.
17497 2009-05-16  Francois-Xavier Coudert  <fxcoudert@gmail.com>
17499         * config.gcc (use_gcc_stdint):  Set to wrap.
17500         * config/darwin.h (SIG_ATOMIC_TYPE, INT8_TYPE, INT16_TYPE,
17501         INT32_TYPE, INT64_TYPE, UINT8_TYPE, UINT16_TYPE, UINT32_TYPE,
17502         UINT64_TYPE, INT_LEAST8_TYPE, INT_LEAST16_TYPE, INT_LEAST32_TYPE,
17503         INT_LEAST64_TYPE, UINT_LEAST8_TYPE, UINT_LEAST16_TYPE,
17504         UINT_LEAST32_TYPE, UINT_LEAST64_TYPE, INT_FAST8_TYPE,
17505         INT_FAST16_TYPE, INT_FAST32_TYPE, INT_FAST64_TYPE,
17506         UINT_FAST8_TYPE, UINT_FAST16_TYPE, UINT_FAST32_TYPE,
17507         UINT_FAST64_TYPE, INTPTR_TYPE, UINTPTR_TYPE): Define.
17509 2009-05-16  Joseph Myers  <joseph@codesourcery.com>
17511         * config.gcc (mips*-*-*): Support arch_32, arch_64, tune_32 and
17512         tune_64.
17513         * config/mips/mips.h (MIPS_ABI_DEFAULT, MULTILIB_ABI_DEFAULT):
17514         Move definitions earlier.
17515         (OPT_ARCH64, OPT_ARCH32): Define.
17516         (OPTION_DEFAULT_SPECS): Add entries for arch_32, arch_64, tune_32
17517         and tune_64.
17519 2009-05-16  Richard Earnshaw  <rearnsha@arm.com>
17521         PR target/40153
17522         * arm.md (cstoresi_nltu_thumb1): Use a neg of ltu as the pattern name
17523         implies.
17525 2009-05-16  Richard Earnshaw  <rearnsha@arm.com>
17527         * arm.md (movdi2): Copy non-reg values to DImode registers.
17529 2009-05-16  Jakub Jelinek  <jakub@redhat.com>
17531         PR target/39942
17532         * final.c (label_to_max_skip): New function.
17533         (label_to_alignment): Only use LABEL_TO_ALIGNMENT if
17534         CODE_LABEL_NUMBER <= max_labelno.
17535         * output.h (label_to_max_skip): New prototype.
17536         * config/i386/i386.c (ix86_avoid_jump_misspredicts): Renamed to...
17537         (ix86_avoid_jump_mispredicts): ... this.  Don't define if
17538         ASM_OUTPUT_MAX_SKIP_ALIGN isn't defined.  Update comment.
17539         Handle CODE_LABELs with >= 16 byte alignment or with
17540         max_skip == (1 << align) - 1.
17541         (ix86_reorg): Don't call ix86_avoid_jump_mispredicts if
17542         ASM_OUTPUT_MAX_SKIP_ALIGN isn't defined.
17544         PR target/39942
17545         * config/i386/x86-64.h (ASM_OUTPUT_MAX_SKIP_ALIGN): Don't emit second
17546         .p2align 3 if MAX_SKIP is smaller than 7.
17547         * config/i386/linux.h (ASM_OUTPUT_MAX_SKIP_ALIGN): Likewise.
17549 2009-05-15  Ian Lance Taylor  <iant@google.com>
17551         * alias.c (struct alias_set_entry_d): Rename from struct
17552         alias_set_entry.  Change all uses.
17553         * except.c (struct call_site_record_d): Rename from struct
17554         call_site_record.  Change all uses.
17555         * except.h (struct eh_region_d): Rename from struct eh_region.
17556         Change all uses.
17557         * gcse.c (struct hash_table_d): Rename from struct hash_table.
17558         Change all uses.
17559         * graphite.c (struct ivtype_map_elt_d): Rename fromstruct
17560         ivtype_map_elt.  Change all uses.
17561         (struct rename_map_elt_d): Rename fromstruct rename_map_elt.
17562         Change all uses.
17563         (struct ifsese_d): Rename fromstruct ifsese.  Change all uses.
17564         * graphite.h (struct name_tree_d): Rename from struct name_tree.
17565         Change all uses.
17566         (struct sese_d): Rename from struct sese.  Change all uses.
17567         * omega.h (struct eqn_d): Rename from struct eqn.  Change all uses.
17568         (struct omega_pb_d): Rename from struct omega_pb.  Change all uses.
17569         * optabs.h (struct optab_d): Rename from struct optab.  Change all
17570         uses.
17571         (struct convert_optab_d): Rename from struct convert_optab.
17572         Change all uses.
17573         * tree-pass.h (struct ipa_opt_pass_d): Rename fromstruct
17574         ipa_opt_pass.  Change all uses.
17575         * tree-predcom.c (struct dref_d): Rename from struct dref.  Change
17576         all uses.
17578         * c-decl.c (pushtag): If -Wc++-compat, warn if the tag is already
17579         defined as a typedef.
17580         (grokdeclarator): If -Wc++-compat, warn if a typedef is already
17581         defined as a tag.
17583 2009-05-15  Manuel López-Ibáñez  <manu@gcc.gnu.org>
17585         PR 16302
17586         * fold-const.c (make_range,build_range_check,merge_ranges): Move
17587         declaration to...
17588         (merge_ranges): Returns bool.
17589         * tree.h (make_range): .. to here.
17590         (build_range_check): Likewise.
17591         (merge_ranges): Likewise. Renamed from merge_ranges.
17592         * c-typeck.c (parser_build_binary_op): Update calls to
17593         warn_logical_operator.
17594         * c-common.c (warn_logical_operator): Add new warning.
17595         * c-common.h (warn_logical_operator): Update declaration.
17597 2009-05-15  Manuel López-Ibáñez  <manu@gcc.gnu.org>
17599         * ira-conflicts.c (add_insn_allocno_copies): Fix wrong conditional.
17601 2009-05-15  Kaveh R. Ghazi  <ghazi@caip.rutgers.edu>
17603         * doc/install.texi: Document MPC requirements, flags etc.
17605         * builtins.c (do_mpc_arg1, fold_builtin_ccos): New.
17606         (fold_builtin_cexp): Ensure we get a complex REAL_TYPE.
17607         Evaluate constant arguments.
17608         (fold_builtin_carg): Ensure we get a complex REAL_TYPE.
17609         (fold_builtin_1): Likewise, also evaluate constant arguments.
17610         Remove superfluous break.
17611         (do_mpc_ckconv): New.
17612         * real.h: Include mpc.h.
17613         * toplev.c (print_version): Output MPC version info if available.
17615 2009-05-15  Sandra Loosemore  <sandra@codesourcery.com>
17617         * fold-const.c (fold_convert_const_real_from_real): Check for overflow.
17619 2009-05-15  H.J. Lu  <hongjiu.lu@intel.com>
17621         * config/i386/i386.c (ix86_reorg): Call optimize_function_for_speed_p
17622         only once.
17624 2009-05-15  Jan Hubicka  <jh@suse.cz>
17626         * doc/invoke.texi (max-early-inliner-iterations): New flag.
17627         * ipa-inline.c (enum inlining_mode): New INLINE_SIZE_NORECURSIVE.
17628         (try_inline): Fix return value.
17629         (cgraph_decide_inlining_incrementally): Honor new value.
17630         (cgraph_early_inlining): Handle indirect inlining.
17631         * params.def (PARAM_EARLY_INLINER_MAX_ITERATIONS): New.
17633 2009-05-15  Jan Hubicka  <jh@suse.cz>
17635         * cgraph.h (struct cgraph_node): Add finalized_by_frotnend flag.
17636         * cgraphunit.c (cgraph_finalize_function): Set it.
17637         (cgraph_expand_function): Use it.
17639 2009-05-15  Sandra Loosemore  <sandra@codesourcery.com>
17641         * real.c (encode_ieee_half): Define.
17642         (decode_ieee_half): Define.
17643         (ieee_half_format): Define.
17644         (arm_half_format): Define.
17645         * real.h (ieee_half_format): Declare.
17646         (arm_half_format): Declare.
17648 2009-05-15  Sandra Loosemore  <sandra@codesourcery.com>
17650         * optabs.c (prepare_float_lib_cmp):  Test that the comparison,
17651         swapped, and reversed optabs exist before trying to use them.
17653 2009-05-15  Paul Brook  <paul@codesourcery.com>
17654             Sandra Loosemore  <sandra@codesourcery.com>
17656         * config/arm/arm.c (neon_vector_mem_operand): Handle element/structure
17657         loads.  Allow PRE_DEC.
17658         (output_move_neon): Handle PRE_DEC.
17659         (arm_print_operand): Add 'A' for neon structure loads.
17660         * config/arm/arm-protos.h (neon_vector_mem_operand): Update prototype.
17661         * config/arm/neon.md (neon_mov): Update comment.
17662         * config/arm/constraints.md (Un, Us): Update neon_vector_mem_operand
17663         calls.
17664         (Um): New constraint.
17666 2009-05-15  Jan Hubicka  <jh@suse.cz>
17668         Revert the following patch until testsuite fallout is fixed:
17669         * cgraph.c (dump_cgraph_node): Dump size/time/benefit.
17670         * cgraph.h (struct inline_summary): New filed self_wize,
17671         size_inlining_benefit, self_time and time_inlining_benefit.
17672         (struct cgraph_global_info): Replace insns by time ans size fields.
17673         * ipa-cp (ipcp_cloning_candidate_p): Base estimate on size
17674         (ipcp_estimate_growth, ipcp_insert_stage): Likewise.
17675         (ipcp_update_callgraph): Do not touch function bodies.
17676         * ipa-inline.c: Include except.h
17677         (MAX_TIME): New constant.
17678         (overall_insns): Remove
17679         (overall_size, max_benefit): New static variables.
17680         (cgraph_estimate_time_after_inlining): New function.
17681         (cgraph_estimate_size_after_inlining): Rewrite using benefits.
17682         (cgraph_clone_inlined_nodes): Update size.
17683         (cgraph_mark_inline_edge): Update size.
17684         (cgraph_estimate_growth): Use size info.
17685         (cgraph_check_inline_limits): Check size.
17686         (cgraph_default_inline_p): Likewise.
17687         (cgraph_edge_badness): Compute badness based on benefit and size cost.
17688         (cgraph_decide_recursive_inlining): Check size.
17689         (cgraph_decide_inlining_of_small_function): Update size; dump sizes
17690         and times.
17691         (cgraph_decide_inlining): Likewise.
17692         (cgraph_decide_inlining_incrementally): Likewise; honor
17693         PARAM_EARLY_INLINING_INSNS.
17694         (likely_eliminated_by_inlining_p): New predicate.
17695         (estimate_function_body_sizes): New function.
17696         (compute_inline_parameters): Use it.
17697         * except.c (must_not_throw_labels): New function.
17698         * except.h (must_not_throw_labels): Declare.
17699         * tree-inline.c (init_inline_once): Kill inlining_weigths
17700         * tree-ssa-structalias.c: Avoid uninitialized warning.
17701         * params.def (PARAM_MAX_INLINE_INSNS_SINGLE): Reduce to 300.
17702         (PARAM_MAX_INLINE_INSNS_AUTO): Reduce to 60.
17703         (PARAM_INLINE_CALL_COST): Remove.
17704         (PARAM_EARLY_INLINING_INSNS): New.
17706 2009-05-15  Richard Guenther  <rguenther@suse.de>
17708         * tree-ssa-pre.c (eliminate): Use TODO_update_ssa_only_virtuals,
17709         not TODO_update_ssa.
17711 2009-05-15  Richard Guenther  <rguenther@suse.de>
17713         PR tree-optimization/39999
17714         * gimple.h (gimple_expr_type): Use the expression type looking
17715         through useless conversions.
17716         * tree-ssa-sccvn.c (vn_nary_op_lookup_stmt): Use gimple_expr_type.
17717         (vn_nary_op_insert_stmt): Likewise.
17718         (simplify_binary_expression): Likewise.
17720 2009-05-15  Richard Guenther  <rguenther@suse.de>
17722         * common.opt (-ftree-forwprop, -ftree-phiprop, -ftree-pta):
17723         New options, enabled by default.
17724         * doc/invoke.texi (-ftree-forwprop, -ftree-phiprop, -ftree-pta):
17725         Document.
17726         * tree-ssa-forwprop.c (gate_forwprop): Use flag_tree_forwprop.
17727         * tree-ssa-phiprop.c (gate_phiprop): Use flag_tree_phiprop.
17728         * tree-ssa-structalias.c (gate_tree_pta): New function.
17729         (pass_build_alias): Use it.
17731 2009-05-15  Joseph Myers  <joseph@codesourcery.com>
17733         * tree-ssa-forwprop.c (forward_propagate_addr_expr_1): Also
17734         recurse on an invariant address if a conversion from a pointer
17735         type to a wider integer type is involved.
17737 2009-05-15  Jan Hubicka  <jh@suse.cz>
17739         * cgraph.c (dump_cgraph_node): Dump size/time/benefit.
17740         * cgraph.h (struct inline_summary): New filed self_wize,
17741         size_inlining_benefit, self_time and time_inlining_benefit.
17742         (struct cgraph_global_info): Replace insns by time ans size fields.
17743         * ipa-cp (ipcp_cloning_candidate_p): Base estimate on size
17744         (ipcp_estimate_growth, ipcp_insert_stage): Likewise.
17745         (ipcp_update_callgraph): Do not touch function bodies.
17746         * ipa-inline.c: Include except.h
17747         (MAX_TIME): New constant.
17748         (overall_insns): Remove
17749         (overall_size, max_benefit): New static variables.
17750         (cgraph_estimate_time_after_inlining): New function.
17751         (cgraph_estimate_size_after_inlining): Rewrite using benefits.
17752         (cgraph_clone_inlined_nodes): Update size.
17753         (cgraph_mark_inline_edge): Update size.
17754         (cgraph_estimate_growth): Use size info.
17755         (cgraph_check_inline_limits): Check size.
17756         (cgraph_default_inline_p): Likewise.
17757         (cgraph_edge_badness): Compute badness based on benefit and size cost.
17758         (cgraph_decide_recursive_inlining): Check size.
17759         (cgraph_decide_inlining_of_small_function): Update size; dump sizes
17760         and times.
17761         (cgraph_decide_inlining): Likewise.
17762         (cgraph_decide_inlining_incrementally): Likewise; honor
17763         PARAM_EARLY_INLINING_INSNS.
17764         (likely_eliminated_by_inlining_p): New predicate.
17765         (estimate_function_body_sizes): New function.
17766         (compute_inline_parameters): Use it.
17767         * except.c (must_not_throw_labels): New function.
17768         * except.h (must_not_throw_labels): Declare.
17769         * tree-inline.c (init_inline_once): Kill inlining_weigths
17770         * tree-ssa-structalias.c: Avoid uninitialized warning.
17771         * params.def (PARAM_MAX_INLINE_INSNS_SINGLE): Reduce to 300.
17772         (PARAM_MAX_INLINE_INSNS_AUTO): Reduce to 60.
17773         (PARAM_INLINE_CALL_COST): Remove.
17774         (PARAM_EARLY_INLINING_INSNS): New.
17775         doc/invoke.texi (max-inline-insns-auto, early-inlining-insns): Update.
17776         (inline-call-cost): Remove.
17777         (early-inlining-insns): New.
17779 2009-05-15  Eric Botcazou  <ebotcazou@adacore.com>
17781         * dbxout.c (dbxout_range_type): Add LOW and HIGH parameters.  Use them
17782         for bounds.
17783         (print_int_cst_bounds_in_octal_p): Likewise.
17784         (dbxout_type): Adjust calls to above functions.  Be prepared to deal
17785         with subtypes.
17786         * dwarf2out.c (base_type_die): Likewise.
17787         (is_subrange_type): Delete.
17788         (subrange_type_die): Add LOW and HIGH parameters.  Use them for bounds.
17789         (modified_type_die): Call subrange_type_for_debug_p on subtypes.
17790         * fold-const.c (fold_truth_not_expr) <CONVERT_EXPR>: Do not strip it
17791         if the destination type is boolean.
17792         (build_range_check): Do not special-case subtypes.
17793         (fold_sign_changed_comparison): Likewise.
17794         (fold_unary): Likewise.
17795         * langhooks-def.h (LANG_HOOKS_GET_SUBRANGE_BOUNDS): Define.
17796         (LANG_HOOKS_FOR_TYPES_INITIALIZER): Add LANG_HOOKS_GET_SUBRANGE_BOUNDS.
17797         * langhooks.h (lang_hooks_for_types): Add get_subrange_bounds.
17798         * tree.c (subrange_type_for_debug_p): New predicate based on the
17799         former is_subrange_type.
17800         * tree.h (subrange_type_for_debug_p): Declare.
17801         * tree-chrec.c (avoid_arithmetics_in_type_p): Delete.
17802         (convert_affine_scev): Remove call to above function.
17803         (chrec_convert_aggressive): Likewise.
17804         * tree-ssa.c (useless_type_conversion_p_1): Do not specifically return
17805         false for conversions involving subtypes.
17806         * tree-vrp.c (vrp_val_max): Do not special-case subtypes.
17807         (vrp_val_min): Likewise.
17808         (needs_overflow_infinity): Likewise.
17809         (extract_range_from_unary_expr): Likewise.
17811 2009-05-15  Paolo Bonzini  <bonzini@gnu.org>
17813         * config/frv/frv.h: Clean up references to GO_IF_LEGITIMATE_ADDRESS.
17814         * config/frv/frv.c: Likewise.
17815         * config/s390/s390.c: Likewise.
17816         * config/sparc/sparc.h: Likewise.
17817         * config/i386/i386.h: Likewise.
17818         * config/i386/i386.c: Likewise.
17819         * config/crx/crx.c: Likewise.
17820         * config/m68hc11/m68hc11.h: Likewise.
17821         * config/iq2000/iq2000.c: Likewise.
17822         * config/mn10300/mn10300.h: Likewise.
17823         * config/mn10300/mn10300.c: Likewise.
17824         * config/m68k/m68k.c: Likewise.
17825         * config/rs6000/rs6000.c: Likewise.
17826         * config/rs6000/xcoff.h: Likewise.
17827         * config/rs6000/linux64.h: Likewise.
17828         * config/rs6000/sysv4.h: Likewise.
17829         * config/score/score3.c: Likewise.
17830         * config/score/score7.c: Likewise.
17831         * config/score/score.c: Likewise.
17832         * config/arm/arm.md: Likewise.
17833         * config/mips/mips.c: Likewise.
17834         * config/mips/mips.md: Likewise.
17835         * config/bfin/bfin.h: Likewise.
17836         * config/pa/pa.c: Likewise.
17837         * config/pa/constraints.md: Likewise.
17839         * config/pdp11/pdp11-protos.h (legitimate_address_p): Delete.
17840         * config/pdp11/pdp11.c (legitimate_address_p): Delete.
17841         * config/pdp11/pdp11.h: Use memory_address_p instead.
17843 2009-05-14  Ian Lance Taylor  <iant@google.com>
17845         * passes.c (finish_optimization_passes): Change i to int.
17846         * plugin.c (plugins_active_p): Change event to int.
17847         (dump_active_plugins): Likewise.
17848         * reginfo.c (invalid_mode_change_p): Change to to unsigned int.
17849         Add cast.
17850         * tree.c (tree_range_check_failed): Change c to unsigned int.
17851         (omp_clause_range_check_failed): Likewise.
17852         (build_common_builtin_nodes): Change mode to int.  Add cast.
17853         * config/ia64/ia64.c (is_emitted): Change r to unsigned int.
17854         (ia64_hard_regno_rename_ok, ia64_eh_uses): Likewise.
17856         * c-typeck.c (build_unary_op): If -Wc++-compat, warn about using
17857         ++ or -- with a variable of enum type.
17859 2009-05-14  Steven Bosscher  <steven@gcc.gnu.org>
17861         PR driver/40144
17862         * opts.c (common_handle_option): Add OPT_fcse_skip_blocks as a no-op.
17864 2009-05-14  Steven Bosscher  <steven@gcc.gnu.org>
17866         * store-motion.c: Do not include params.h
17867         * Makefile.in: Fix dependencies for various files.
17869 2009-05-14  Steven Bosscher  <steven@gcc.gnu.org>
17871         * auto-inc-dec.c: Fix pass description, remove apparent
17872         accidental duplication.
17874 2009-05-14  H.J. Lu  <hongjiu.lu@intel.com>
17876         PR middle-end/40147
17877         * ipa-utils.h (memory_identifier_string): Moved to ...
17878         * tree.h (memory_identifier_string): Here.  Add GTY(()).
17880 2009-05-14  Paolo Bonzini  <bonzini@gnu.org>
17882         * doc/tm.texi (TARGET_LEGITIMATE_ADDRESS_P): Refer mainly to this
17883         in the former documentation of...
17884         (GO_IF_LEGITIMATE_ADDRESS): ... this.
17885         * ira-conflicts.c (get_dup_num): Use address_operand.
17886         * targhooks.c (default_legitimate_address_p): New.
17887         * targhooks.h (default_legitimate_address_p): New.
17888         * reload.c (strict_memory_address_p) [!GO_IF_LEGITIMATE_ADDRESS]:
17889         Call hook.
17890         * recog.c (memory_address_p) [!GO_IF_LEGITIMATE_ADDRESS]: Call hook.
17891         * target.h (struct target): Add legitimate_address_p.
17892         * target-def.h (TARGET_LEGITIMATE_ADDRESS_P): New.
17893         (TARGET_INITIALIZER): Include it.
17895         * config/alpha/alpha.h (GO_IF_LEGITIMATE_ADDRESS): Delete.
17896         * config/alpha/alpha-protos.h (alpha_legitimate_address_p): Remove.
17897         * config/alpha/alpha.c (alpha_legitimate_address_p): Make static.
17898         (TARGET_LEGITIMATE_ADDRESS_P): New.
17900         * config/frv/frv.h (GO_IF_LEGITIMATE_ADDRESS): Delete.
17901         (REG_OK_STRICT_P): Delete.
17902         * config/frv/frv-protos.h (frv_legitimate_address_p): Rename to...
17903         (frv_legitimate_address_p_1): ... this.
17904         * config/frv/frv.c (frv_legitimate_address_p): Forward to...
17905         (frv_legitimate_address_p_1): ... the renamed old
17906         frv_legitimate_address_p.
17907         * config/frv/predicates.md: Adjust calls to frv_legitimate_address_p.
17908         (TARGET_LEGITIMATE_ADDRESS_P): New.
17910         * config/s390/s390.h (GO_IF_LEGITIMATE_ADDRESS): Delete.
17911         * config/s390/s390-protos.h (legitimate_address_p): Remove.
17912         * config/s390/s390.c (legitimate_address_p): Rename to...
17913         (s390_legitimate_address_p): ... this, make static.
17914         (legitimize_address): Adjust call.
17915         (TARGET_LEGITIMATE_ADDRESS_P): New.
17916         * config/s390/constraints.md ("e"): Call strict_memory_address_p.
17918         * config/m32c/m32c.h (GO_IF_LEGITIMATE_ADDRESS): Delete.
17919         * config/m32c/m32c-protos.h (m32c_legitimate_address_p): Remove.
17920         * config/m32c/m32c.c (m32c_legitimate_address_p): Make static.
17921         (TARGET_LEGITIMATE_ADDRESS_P): New.
17923         * config/spu/spu.h (GO_IF_LEGITIMATE_ADDRESS): Delete.
17924         * config/spu/spu-protos.h (spu_legitimate_address): Remove.
17925         * config/spu/spu.c (spu_legitimate_address): Rename to...
17926         (spu_legitimate_address_p): ... this, make static.
17927         (TARGET_LEGITIMATE_ADDRESS_P): New.
17929         * config/sparc/sparc.h (GO_IF_LEGITIMATE_ADDRESS): Delete.
17930         * config/sparc/sparc-protos.h (legitimate_address_p): Remove.
17931         * config/sparc/sparc.c (legitimate_address_p): Rename to...
17932         (sparc_legitimate_address_p): ... this, make static and return bool.
17933         (legitimize_address): Adjust call.
17934         (TARGET_LEGITIMATE_ADDRESS_P): New.
17936         * config/i386/i386.h (GO_IF_LEGITIMATE_ADDRESS): Delete.
17937         * config/i386/i386-protos.h (legitimate_address_p): Remove.
17938         * config/i386/i386.c (legitimate_address_p): Rename to...
17939         (ix86_legitimate_address_p): ... this, make static.
17940         (constant_address_p): Move after it, adjust call.
17941         (TARGET_LEGITIMATE_ADDRESS_P): New.
17943         * config/avr/avr.h (GO_IF_LEGITIMATE_ADDRESS): Delete.
17944         * config/avr/avr-protos.h (legitimate_address_p): Remove.
17945         * config/avr/avr.c (legitimate_address_p): Rename to...
17946         (avr_legitimate_address_p): ... this, make static.
17947         (legitimize_address): Adjust call.
17948         (TARGET_LEGITIMATE_ADDRESS_P): New.
17950         * config/crx/crx.h (GO_IF_LEGITIMATE_ADDRESS): Delete.
17951         * config/crx/crx-protos.h (crx_legitimate_address_p): Remove.
17952         * config/crx/crx.c (crx_legitimate_address_p): Make static.
17953         (TARGET_LEGITIMATE_ADDRESS_P): New.
17955         * config/xtensa/xtensa.h (GO_IF_LEGITIMATE_ADDRESS): Delete.
17956         * config/xtensa/xtensa-protos.h (xtensa_legitimate_address_p): Remove.
17957         * config/xtensa/xtensa.c (xtensa_legitimate_address_p): Make static.
17958         (TARGET_LEGITIMATE_ADDRESS_P): New.
17960         * config/stormy16/stormy16.h (GO_IF_LEGITIMATE_ADDRESS): Delete.
17961         * config/stormy16/stormy16-protos.h (xstormy16_legitimate_address_p):
17962         Remove.
17963         * config/stormy16/stormy16.c (xstormy16_legitimate_address_p):
17964         Make static.
17965         (TARGET_LEGITIMATE_ADDRESS_P): New.
17967         * config/m68hc11/m68hc11.h (GO_IF_LEGITIMATE_ADDRESS): Delete.
17968         * config/m68hc11/m68hc11-protos.h (m68hc11_go_if_legitimate_address):
17969         Remove.
17970         * config/m68hc11/m68hc11.c (m68hc11_go_if_legitimate_address):
17971         Rename to...
17972         (m68hc11_legitimate_address_p): ... this, make static.
17973         (go_if_legitimate_address_internal): Rename to...
17974         (m68hc11_legitimate_address_p_1): ... this.
17975         (legitimize_address): Adjust call.
17976         (TARGET_LEGITIMATE_ADDRESS_P): New.
17978         * config/iq2000/iq2000.h (GO_IF_LEGITIMATE_ADDRESS): Delete.
17979         * config/iq2000/iq2000-protos.h (iq2000_legitimate_address_p): Remove.
17980         * config/iq2000/iq2000.c (iq2000_legitimate_address_p): Make static.
17981         (TARGET_LEGITIMATE_ADDRESS_P): New.
17983         * config/mn10300/mn10300.h (GO_IF_LEGITIMATE_ADDRESS): Delete.
17984         * config/mn10300/mn10300-protos.h (legitimate_address_p): Remove.
17985         * config/mn10300/mn10300.c (legitimate_address_p): Rename to...
17986         (mn10300_legitimate_address_p): ... this, make static.
17987         (TARGET_LEGITIMATE_ADDRESS_P): New.
17989         * config/m68k/m68k.h (GO_IF_LEGITIMATE_ADDRESS): Delete.
17990         * config/m68k/m68k-protos.h (m68k_legitimate_address_p): Remove.
17991         * config/m68k/m68k.c (m68k_legitimate_address_p): Make static.
17992         (TARGET_LEGITIMATE_ADDRESS_P): New.
17994         * config/rs6000/rs6000.h (GO_IF_LEGITIMATE_ADDRESS): Delete.
17995         (REG_OK_STRICT_FLAG, REG_OK_FOR_BASE_P, REG_OK_FOR_INDEX_P): Delete.
17996         (INT_REG_OK_FOR_BASE_P, INT_REG_OK_FOR_INDEX_P): Move above.
17997         * config/rs6000/rs6000.h (GO_IF_LEGITIMATE_ADDRESS): Delete.
17998         * config/rs6000/rs6000-protos.h (rs6000_legitimate_address): Remove.
17999         * config/rs6000/rs6000.c (rs6000_legitimate_address): Rename to...
18000         (rs6000_legitimate_address_p): ... this, make static.
18001         (TARGET_LEGITIMATE_ADDRESS_P): New.
18002         (REG_MODE_OK_FOR_BASE_P): Delete.
18003         (rs6000_legitimize_reload_address): Use INT_REG_OK_FOR_BASE_P.
18005         * config/picochip/picochip.h (GO_IF_LEGITIMATE_ADDRESS): Delete.
18006         * config/picochip/picochip-protos.h (picochip_legitimate_address_p):
18007         Delete.
18008         * config/picochip/picochip.c (picochip_legitimate_address_p): Make
18009         static, adjust types.
18010         (TARGET_LEGITIMATE_ADDRESS_P): New.
18012         * config/score/score.h (GO_IF_LEGITIMATE_ADDRESS): Delete.
18013         * config/score/score.c (score_address_p): Rename to...
18014         (score_legitimate_address_p): ... this.
18015         (TARGET_LEGITIMATE_ADDRESS_P): New.
18016         * config/score/score3.c (score3_address_p): Rename to...
18017         (score3_legitimate_address_p): ... this.
18018         * config/score/score7.c (score7_address_p): Rename to...
18019         (score7_legitimate_address_p): ... this.
18021         * config/arm/arm.h (ARM_GO_IF_LEGITIMATE_ADDRESS,
18022         THUMB2_GO_IF_LEGITIMATE_ADDRESS, THUMB1_GO_IF_LEGITIMATE_ADDRESS,
18023         GO_IF_LEGITIMATE_ADDRESS): Delete.
18024         * config/arm/arm-protos.h (thumb1_legitimate_address_p,
18025         thumb2_legitimate_address_p): Delete.
18026         (arm_legitimate_address_p): Rename to...
18027         (arm_legitimate_address_outer_p): ... this.
18028         * config/arm/constraints.md ("Uq"): Adjust call.
18029         * config/arm/predicates.md (arm_extendqisi_mem_op): Likewise.
18030         * config/arm/arm.c (arm_legitimate_address_p): New, rename old one
18031         to...
18032         (arm_legitimate_address_outer_p): ... this.
18033         (thumb1_legitimate_address_p, thumb2_legitimate_address_p): Make
18034         static.
18035         (TARGET_LEGITIMATE_ADDRESS_P): New.
18037         * config/mips/mips.h (GO_IF_LEGITIMATE_ADDRESS): Delete.
18038         * config/mips/mips-protos.h (mips_legitimate_address_p): Remove.
18039         * config/mips/mips.c (mips_legitimate_address_p): ... Make static.
18040         (TARGET_LEGITIMATE_ADDRESS_P): New.
18042         * config/vax/vax.h (GO_IF_LEGITIMATE_ADDRESS): Delete.
18043         * config/vax/vax-protos.h (legitimate_address_p): Remove.
18044         * config/vax/vax.c (legitimate_address_p): Rename to...
18045         (vax_legitimate_address_p): ... this, make static.
18046         (TARGET_LEGITIMATE_ADDRESS_P): New.
18048         * config/h8300/h8300.h (GO_IF_LEGITIMATE_ADDRESS): Delete.
18049         * config/h8300/h8300-protos.h (h8300_legitimate_address_p): Remove.
18050         * config/h8300/h8300.c (h8300_legitimate_address_p): ... Make static.
18051         (TARGET_LEGITIMATE_ADDRESS_P): New.
18053         * config/mmix/mmix.h (GO_IF_LEGITIMATE_ADDRESS): Delete.
18054         * config/mmix/mmix-protos.h (mmix_legitimize_address): Remove.
18055         * config/mmix/mmix.c (mmix_legitimate_address): Rename to...
18056         (mmix_legitimate_address_p): ... this, make static.
18057         (TARGET_LEGITIMATE_ADDRESS_P): New.
18059         * config/bfin/bfin.h (GO_IF_LEGITIMATE_ADDRESS): Delete.
18060         * config/bfin/bfin-protos.h (bfin_legitimate_address_p): Remove.
18061         * config/bfin/bfin.c (bfin_legitimate_address_p): ... Make static.
18062         (TARGET_LEGITIMATE_ADDRESS_P): New.
18064 2009-05-14  Paolo Bonzini  <bonzini@gnu.org>
18066         * config/arm/arm.h (PROMOTE_FUNCTION_MODE): Remove handling
18067         of MODE_COMPLEX_INT.
18069 2009-05-14  Rainer Orth  <ro@TechFak.Uni-Bielefeld.DE>
18071         * config/alpha/alpha.c (alpha_initialize_trampoline): Change 0 to
18072         LCT_NORMAL in function call.
18073         * mips-tdump.c (print_file_desc): Add cast to enum type.
18074         * mips-tfile.c (add_ext_symbol): Add casts to enum types.
18075         (mark_stabs): Add casts to enum types.
18076         (parse_stabs_common): Add casts to enum types.
18078 2009-05-13  Adam Nemet  <anemet@caviumnetworks.com>
18080         * config/mips/mips.c (mips_print_operand) <REG, MEM, default>:
18081         Check for invalid values of LETTER.
18083 2009-05-13  Taras Glek  <tglek@mozilla.com>
18085         * attribs.c (register_attribute): moved out attribute registration
18086         into register_attribute.
18087         * doc/plugins.texi: Documented register_attribute and
18088         PLUGIN_ATTRIBUTES.
18089         * gcc-plugin.h: Added forward decl for register_attribute.
18090         * gcc-plugin.h (plugins_event): Added PLUGIN_ATTRIBUTES.
18091         * plugin.c (register_callback, invoke_plugin_callbacks): Added
18092         PLUGIN_ATTRIBUTES boilerplate.
18094 2009-05-14  Dave Korn  <dave.korn.cygwin@gmail.com>
18096         * config/i386/msformat-c.c (ms_printf_length_specs):  Use enumeration
18097         values even in sentinel and empty entries.
18098         (ms_printf_flag_specs):  Likewise.
18099         (ms_scanf_flag_specs):  Likewise.
18100         (ms_strftime_flag_specs):  Likewise.
18101         (ms_print_char_table):  Likewise.
18102         (ms_scan_char_table):  Likewise.
18103         (ms_time_char_table):  Likewise.
18105 2009-05-13  Doug Kwan  <dougkwan@google.com>
18107         * tree-ssa-sccvn.c (compare_ops): Stabilize qsort.
18109 2009-05-13  Adam Nemet  <anemet@caviumnetworks.com>
18111         * config/mips/mips.md (store): Add attributes for QI and HI.
18112         Update comment.
18113         (truncdisi2, truncdihi2, truncdiqi2): Merge these into ...
18114         (truncdi<mode>2): ... this new pattern.
18116 2009-05-13  Brad Hards  <bradh@kde.org>
18118         * Makefile.in (TEXI_GCCINT_FILES): Add plugins.texi.
18120 2009-05-14  Jakub Jelinek  <jakub@redhat.com>
18121             Ben Elliston <bje@au.ibm.com>
18123         PR middle-end/40035
18124         * dse.c (check_mem_read_rtx): Guard against width == -1.
18126 2009-05-13  Michael Matz  <matz@suse.de>
18128         PR middle-end/39976
18129         * tree-outof-ssa.c (maybe_renumber_stmts_bb): New function.
18130         (trivially_conflicts_p): New function.
18131         (insert_backedge_copies): Use it.
18133 2009-05-13  Janis Johnson  <janis187@us.ibm.com>
18135         * c-pragma.c (enum pragma_switch_t): Prefix constants with PRAGMA_.
18136         (handle_stdc_pragma): Use new enum constant names.
18137         (handle_pragma_float_const_decimal64): Ditto.
18139 2009-05-13  Ian Lance Taylor  <iant@google.com>
18141         * Makefile.in (build/gencheck.o): Depend upon all-tree.def, not
18142         tree.def.
18144 2009-05-13  Nathan Sidwell  <nathan@codesourcery.com>
18146         * config/m68k/t-uclinux (M68K_MLIB_CPU): Check for FL_UCLINUX.
18147         * config/m68k/m68k-devices.def: Add FL_UCLINUX to 68020 and 54455
18148         multilibs.
18149         * config/m68k/m68k.h (FL_UCLINUX): Define.
18151 2009-05-13  Jan Hubicka  <jh@suse.cz>
18153         * options.c (gfc_post_options): -fwhole-program imply -fwhole-file.
18155 2009-05-12  Kaz Kojima  <kkojima@gcc.gnu.org>
18157         * config/sh/sh.h (OVERRIDE_OPTIONS): Clear flag_schedule_insns
18158         unless -fschedule-insns is specified.
18160 2009-05-12  Kaz Kojima  <kkojima@gcc.gnu.org>
18162         PR target/39561
18163         * config/sh/sh.h (OPTIMIZATION_OPTIONS): Don't set
18164         TARGET_EXPAND_CBRANCHDI4.
18165         * config/sh/sh.md (cbranchdi4): Don't check TARGET_EXPAND_CBRANCHDI4.
18166         * config/sh/sh.opt (mexpand-cbranchdi): Remove.
18167         (cmpeqdi): Fix comment.
18169 2009-05-12  Kaz Kojima  <kkojima@gcc.gnu.org>
18171         * config/sh/sh-protos.h (sh_legitimate_index_p): Declare.
18172         (sh_legitimate_address_p): Likewise.
18173         * config/sh/sh.c (sh_legitimate_index_p): New.
18174         (sh_legitimate_address_p): Likewise.
18175         * config/sh/sh.h (REG_OK_FOR_BASE_P): Add STRICT parameter.
18176         (REG_OK_FOR_INDEX_P, SUBREG_OK_FOR_INDEX_P): Likewise.
18177         (MODE_DISP_OK_4, MODE_DISP_OK_8): Remove.
18178         (MAYBE_BASE_REGISTER_RTX_P): New macro.
18179         (MAYBE_INDEX_REGISTER_RTX_P): Likewise.
18180         (BASE_REGISTER_RTX_P): Use MAYBE_BASE_REGISTER_RTX_P.
18181         (INDEX_REGISTER_RTX_P): Use MAYBE_INDEX_REGISTER_RTX_P.
18182         (GO_IF_LEGITIMATE_INDEX): Use sh_legitimate_index_p.
18183         (GO_IF_LEGITIMATE_ADDRESS): Use sh_legitimate_address_p.
18185 2009-05-12  Jan Hubicka  <jh@suse.cz>
18187         * tree-inline.c (estimate_operator_cost): Add operands;
18188         when division happens by constant, it is cheap.
18189         (estimate_num_insns): Loads and stores are not having cost of 0;
18190         EH magic stuff is cheap; when computing runtime cost of switch,
18191         use log2 base of amount of its cases; builtin_expect has cost of 0;
18192         compute cost for moving return value of call.
18193         (init_inline_once): Initialize time_based flags.
18194         * tree-inline.h (eni_weights_d): Add time_based flag.
18196 2009-05-12  Paolo Bonzini  <bonzini@gnu.org>
18198         * df-core.c: Update head documentation.
18200 2009-05-12  Michael Meissner  <meissner@linux.vnet.ibm.com>
18202         PR bootstrap/40118
18203         * rs6000.c (rs6000_generate_compare): Use op1b instead of
18204         shadowing exisiting variable op1.
18206 2009-05-12  Uros Bizjak  <ubizjak@gmail.com>
18208         PR target/37179
18209         * config/i386/driver-i386.c (processor_signatures): New enum.
18210         (SIG_GEODE): Move from vendor_signatures to processor_signatures.
18211         (host_detect_local_cpu): For SIG_AMD vendor, check for SIG_GEODE
18212         processor signature to detect geode processor.
18214 2009-05-12  Paolo Bonzini  <bonzini@gnu.org>
18216         Revert:
18218         2009-05-12  Paolo Bonzini  <bonzini@gnu.org>
18220         * optabs.c (prepare_cmp_insn): Temporarily disable test that
18221         causes spurious differences between trunk and cond-optab branch.
18223 2009-05-12  Paolo Bonzini  <bonzini@gnu.org>
18225         * dojump.c (compare_from_rtx): Delete.
18226         * expmed.c (emit_store_flag): Only try cstore_optab.  Canonicalize
18227         any MODE_CC mode to the cstorecc4 pattern.  Use prepare_operand, fail
18228         if the comparison does not satisfy the predicate; test predicates for
18229         operands 2 and 3 of a cstore pattern.  Don't try cstore optab
18230         further if one existing pattern fails.
18231         * expr.h (compare_from_rtx): Delete.
18232         (prepare_operand): Declare it.
18233         * optabs.c: Change "lib call" to "libcall" throughout.
18234         (bcc_gen_fctn, setcc_gen_code, trap_rtx,
18235         HAVE_conditional_trap, emit_cmp_insn): Delete.
18236         (can_compare_p): Delete cmp_optab case.
18237         (prepare_float_lib_cmp): Return an rtx and a machine mode.
18238         Accept other parameters by value.
18239         (prepare_operand): Make non-static.
18240         (prepare_cmp_insn): Return an rtx and a machine mode.  Accept
18241         other parameters by value.  Try to widen operands here based on
18242         an optab_methods argument and looking at cbranch_optab.
18243         (emit_cmp_and_jump_insn_1): Accept test and mode, remove widening
18244         loop.  Use cbranch_optab directly.
18245         (emit_cmp_and_jump_insns): Fix comment.  Adjust call to
18246         prepare_cmp_insn and emit_cmp_and_jump_insn_1, remove obsolete
18247         assertion.
18248         (emit_conditional_move, emit_conditional_add): Inline what's needed
18249         of compare_from_rtx, using new prepare_cmp_insn for the rest.
18250         (init_optabs): Init cmp_optab with UNKNOWN, cbranch_optab
18251         with COMPARE.  Move cmov_optab and cstore_optab above
18252         with cbranch_optab, move cmp_optab down with ucmp_optab,
18253         remove tst_otpab.  Do not initialize trap_rtx.
18254         (gen_cond_trap): Do it here.  Use ctrap_optab.  Test predicate
18255         for trap code.  Do not check HAVE_conditional_trap.  Use
18256         prepare_cmp_insn.  Accept no predicate for operand 3.
18257         * optabs.h (OTI_cmp): Mark as used only for libcalls.
18258         (OTI_ctrap, ctrap_optab): New.
18259         (tst_optab): Delete.
18260         (bcc_gen_fctn, setcc_gen_code, emit_cmp_insn): Delete.
18261         * ifcvt.c (find_if_header): Replace HAVE_conditional_trap
18262         with lookup of ctrap_optab.
18263         * genopinit.c (cmp_optab, tst_optab, bcc_gen_fctn, setcc_gen_code):
18264         Delete.
18265         (ctrap_optab): New.
18267         * combine.c (combine_simplify_rtx, simplify_set): Do not
18268         special case comparing against zero for cc0 machines.
18269         * simplify-rtx.c (simplify_binary_operation_1): Never remove
18270         COMPARE on cc0 machines.
18271         (simplify_relational_operation): Return a new expression when
18272         a COMPARE could be removed.
18273         * final.c (final_scan_insn): Compare cc_status values
18274         against LHS of a (compare FOO (const_int 0)) cc0 source.
18275         Also check if cc_status.value is the full compare.
18277         * doc/md.texi (bCC, sCC, tstMM, cmpMM): Delete.
18278         (cstoreMM4): Document.
18279         (conditional_trap): Document ctrapMM4 instead.
18280         (sync_compare_and_swapMM): Refer to cbranchcc4.
18281         (Dependent Patterns): Eliminate obsolete information referring to
18282         the old jump optimization phase.
18283         (Canonicalization): Include cbranchcc4 case, omit canonicalization
18284         of compares with 0 on cc0 machines.
18285         (Jump Patterns): Refer to MODE_CC jump patterns preferably,
18286         avoiding references to cc0.  Remove text about storing operands
18287         in cmpMM.
18288         * doc/tm.texi (Condition Codes): Include blurb on different
18289         condition code representations, separate into subsections for
18290         CC0, MODE_CC and conditional execution.
18292         * config/alpha/alpha-protos.h (alpha_emit_conditional_branch,
18293         alpha_emit_setcc): Accept operands and a machine mode.
18294         * config/alpha/alpha.c (alpha_emit_conditional_branch):
18295         Get code/op0/op1 from operands, use machine mode argument
18296         instead of alpha_compare.fp_p.  Emit the branch here.
18297         (alpha_emit_setcc): Likewise, and return boolean.
18298         (alpha_emit_conditional_move): Likewise.  Assert that
18299         cmp_op_mode == cmp_mode, and simplify accordingly.
18300         * config/alpha/alpha.h (struct alpha_compare, alpha_compare): Delete.
18301         * config/alpha/alpha.md (cmpdf, cmptf, cmpdi, bCC, sCC): Delete.
18302         (cbranchdf4, cbranchtf4, cbranchdi4, cstoredf4, cstoretf4,cstoredi4):
18303         Delete.
18304         (stack probe test): Use cbranchdi4.
18305         * config/alpha/predicates.md (alpha_cbranch_operator): New.
18307         * config/arc/arc.c (gen_compare_reg): Do not emit cmp.
18308         * config/arc/arc.h (movsicc, movsfcc): Use it.
18309         (movdicc, *movdicc_insn, movdfcc, *movdfcc_insn): Remove.
18310         (cbranchsi4, cstoresi4): New.
18311         (cmpsi, bCC and sCC expanders): Remove.
18313         * config/arm/arm.c (arm_compare_op0, arm_compare_op1): Delete.
18314         * config/arm/arm.h (arm_compare_op0, arm_compare_op1): Delete.
18315         * config/arm/predicates.md (arm_comparison_operator): Only include
18316         floating-point operators if there is a hardware floating-point unit.
18317         * config/arm/arm.md (cbranchsi4, cstoresi4): Enable for TARGET_32BIT,
18318         deferring to cbranch_cc and cstore_cc respectively.
18319         (cbranchsf4, cbranchdf4, cbranchdi4, cstoresf4, cstoredf4, cstoredi4,
18320         cbranch_cc, cstore_cc): New.
18321         (movsicc, movsfcc, movdfcc): Do not use arm_compare_op0 and
18322         arm_compare_op1.
18323         (bCC, sCC, cmpsi, cmpsf, cmpdf, cmpdi): Delete.
18325         * config/avr/avr-protos.h (out_tstsi, out_tsthi): Adjust prototype.
18326         * config/avr/avr.c (out_tstsi, out_tsthi): Get the tested operand
18327         as an argument.
18328         (adjust_insn_length): Adjust calls.
18329         (avr_reorg): Handle (compare (foo) (const_int 0)).
18330         * config/avr/avr.md (tstqi, tsthi, tstsi): Remove.
18331         (*negated_tstqi, *negated_tsthi, *negated_tstsi): Unmacroize.
18332         (*reversed_tsthi, *reversed_tstsi): Add a scratch for simplicity.
18333         (cmpqi, cmphi, cmpsi): Prepend asterisk, fuse tst[qhs]i here.
18334         (bCC): Remove.
18335         (cbranchqi4, cbranchhi4, cbranchsi4): New.
18336         (tst -> sbrc/sbrs peephole2, cpse peephole): Wrap RHS with COMPARE.
18338         * config/bfin/bfin.md (cmpbi, cmpsi, bCC, sCC): Delete.
18339         (cbranchsi4, cstorebi4, cstoresi4): New.
18340         (movbisi): This insn is duplicate, split it to zero_extend.
18341         * config/bfin/bfin.c (bfin_compare_op0, bfin_compare_op1): Delete
18342         (bfin_gen_compare): Do not use them.  Emit VOIDmode SET, not BImode.
18343         (bfin_optimize_loop): Use cbranch expander.
18344         * config/bfin/bfin.h (bfin_compare_op0, bfin_compare_op1): Delete.
18345         * config/bfin/predicates.md (bfin_cbranch_operator): Rename to...
18346         (bfin_bimode_comparison_operator): ... this.
18347         (bfin_direct_comparison_operator): New.
18349         * config/cris/cris.c (cris_normal_notice_update_cc): Look
18350         inside (compare FOO (const_int 0)).
18351         (cris_rtx_costs): Handle ZERO_EXTRACT.
18352         * config/cris/cris.md (tstdi, tst<mode>, cmpdi): Delete.
18353         (*tstdi_non_v32): Fold in *cmpdi_non_v32.
18354         (*tstdi_v32): Delete.
18355         (*cmpdi_non_v32): Add M alternative for operand 1.
18356         (cmpsi, cmp<mode>): Make private.
18357         (*tstsi, *tst<mode>_cmp, *tst<mode>_non_cmp, *btst): Wrap LHS
18358         with COMPARE.
18359         (cbranch<mode>4, cbranchdi4, cstore<mode>4): New.
18361         * config/crx/crx.md (cstore<mode>4, cbranchcc4): New.
18362         (cmp<mode>, bCOND_internal, b<code>, s<code>): Delete.
18363         (cbranch<mode>4, sCOND_internal): Use ordered_comparison_operator.
18364         (cc_reg_operand): New.
18365         (any_cond): Delete.
18366         * config/crx/crx.c (crx_compare_op0, crx_compare_op1,
18367         crx_expand_compare, crx_expand_branch, crx_expand_scond): Delete.
18368         * config/crx/crx.h (crx_compare_op0, crx_compare_op1): Delete.
18369         * config/crx/crx-protos.h (crx_expand_compare, crx_expand_branch,
18370         crx_expand_scond): Delete.
18372         * config/fr30/fr30.md (cmp<mode>, bCC): Delete.
18373         (cbranchsi4): New.
18374         * config/fr30/fr30.c (fr30_compare_op0, fr30_compare_op1): Delete
18375         * config/fr30/fr30.h (fr30_compare_op0, fr30_compare_op1): Delete.
18377         * config/frv/frv.md (cbranchsi4, cbranchsf4, cbranchdf4,
18378         cstoresi4, cstoresf4, cstoredf4): New.
18379         (cmpdi, cmpsi, cmpsf, cmpdf, bCC, sCC): Remove.
18380         * config/frv/frv-protos.h (frv_emit_cbranch, frv_emit_scc):
18381         Receive the entire operands array.
18382         * config/frv/frv.h (frv_compare_op0, frv_compare_op1): Delete.
18383         * config/frv/frv.c (frv_compare_op0, frv_compare_op1): Delete.
18384         * config/frv/frv-protos.h (frv_emit_cbranch, frv_emit_scc):
18385         Get test/op0/op1 from the operands array.
18386         (frv_emit_cond_move): Get test/op0/op1 from the test_rtx.
18388         * config/h8300/h8300-protos.h (h8300_expand_branch): Accept operands.
18389         (h8300_expand_store): New.
18390         * config/h8300/h8300.c (h8300_rtx_costs): Handle (compare FOO
18391         (const_int 0)).
18392         (h8300_expand_branch): Emit compare here.  Adjust for new arguments.
18393         (h8300_expand_store): New.
18394         * config/h8300/h8300.md (btst combine patterns): Wrap with COMPARE
18395         or do not try to produce (set (cc0) REG).
18396         (peepholes): Wrap arguments with COMPARE.  Add a peephole to
18397         change a compare into a move to a scratch register.  Disable some
18398         peepholes when comparing with zero.
18399         (tstsi, tsthi, tstsi, cmpqi): Make private.
18400         (cmphi): Delete.
18401         (bCC, sCC): Delete.
18402         (cbranchqi4, cbranchhi4, cbranchsi4, cstoreqi4, cstorehi4,
18403         cstoresi4): New.
18405         * config/i386/i386.c (ix86_expand_int_movcc, ix86_expand_int_addcc,
18406         ix86_expand_fp_movcc): Set ix86_compare_op0 and ix86_compare_op1.
18407         (ix86_emit_i387_log1p): Use gen_cbranchxf4.
18408         (ix86_emit_i387_log1p): Use cbranchxf2.
18409         (ix86_expand_setcc): Return void.
18410         * config/i386/i386-protos.h (ix86_expand_setcc): Return void.
18411         * config/i386/i386.md (cmpti, cmpdi, cmpsi, cmphi, cmpqi, cmpxf,
18412         cmp<MODEF>, cmpcc): Remove.
18413         (cbranchti4, cbranchdi4, cbranchsi4, cbranchhi4, cbranchqi4,
18414         cbranchxf4, cbranch<MODEF>4, cbranchcc4, cstoredi4, cstoresi4,
18415         cstorehi4, cstoreqi4, cstorexf4, cstore<MODEF>4, cstorecc): New.
18416         (sCC and bCC expanders): Remove.
18417         (stack_protect_test): Use cbranchcc4.
18419         * config/ia64/ia64-protos.h (ia64_compare_op0, ia64_compare_op1):
18420         Delete.
18421         (ia64_expand_compare): Accept three rtx by reference and return void.
18422         * config/ia64/ia64.c (ia64_compare_op0, ia64_compare_op1): Delete.
18423         (ia64_expand_compare): Replace op0/op1 with *op0/*op1.  Get code
18424         from *expr.  Update *expr with the BImode comparison to do.
18425         * config/ia64/ia64.md (cmpbi, cmpsi, cmpdi, cmpsf, cmpdf, cmpxf,
18426         cmptf, bCC, sCC, conditional_trap): Delete.
18427         (cbranchbi4, cbranchsi4, cbranchdi4, cbranchsf4, cbranchdf4,
18428         cbranchxf4, cbranchtf4, cstorebi4, cstoresi4, cstoredi4, cstoresf4,
18429         cstoredf4, cstorexf4, cstoretf4, ctrapbi4, ctrapsi4, ctrapdi4,
18430         ctrapsf4, ctrapdf4, ctrapxf4, ctraptf4): New.
18431         * config/ia64/predicates.md (ia64_cbranch_operator): New.
18433         * config/iq2000/iq2000-protos.h (gen_conditional_branch): Change
18434         type of last argument.
18435         * config/iq2000/iq2000.c (branch_cmp, branch_type): Remove.
18436         (gen_conditional_branch): Get code/cmp0/cmp1 from operands,
18437         use machine mode argument instead of branch_type.  Remove dead
18438         code for floating-point comparisons.
18439         * config/iq2000/iq2000.h (branch_cmp, branch_type): Remove.
18440         * config/iq2000/iq2000.md (cmpsi, cmpdi, cmpsf, cmpdf, tstsi, bCC):
18441         Remove.
18442         (cbranchsi4, cstoresi4): New.
18443         * config/iq2000/predicates.md (reg_or_const_operand): New.
18445         * config/m32c/m32c.md (cbranch splitter): Use match_op_dup.
18446         * config/m32c/m32c.md (any_cond, gl_cond): Delete.
18447         (b<code>_op): Rewrite to...
18448         (bcc_op): ... this, using match_operator.
18449         (s<code>_op): Rewrite to...
18450         (scc_op): ... this, using match_operator.
18451         (s<code>_24_op): Rewrite to...
18452         (scc_op_24): ... this, using match_operator.
18453         (s<code>_<mode>): Rewrite to...
18454         (cstore<mode>4): ... this, using match_operator.
18455         (s<code>_<mode>_24): Rewrite to...
18456         (cstore<mode>4_24): ... this, using match_operator.
18457         * config/m32c/m32c-protos.h (m32c_cmp_flg_0, m32c_pend_compare,
18458         m32c_unpend_compare, m32c_expand_scc): Delete.
18459         * config/m32c/m32c.c (compare_op0, compare_op1, m32c_cmp_flg_0,
18460         m32c_pend_compare, m32c_unpend_compare, m32c_expand_scc): Delete.
18461         (m32c_expand_movcc): Change NE to EQ if necessary.
18462         (m32c_init_libfuncs): Modify cstore optab instead of setcc_gen_code.
18464         * config/m32r/m32r-protos.h (gen_cond_store): New.
18465         * config/m32r/m32r.c (m32r_compare_op0, m32r_compare_op1): Delete.
18466         (gen_cond_store): New, from sCC patterns.
18467         (m32r_expand_block_move): Use cbranchsi4.
18468         * config/m32r/m32r.h (m32r_compare_op0, m32r_compare_op1): Delete.
18469         * config/m32r/m32r.md (cmpsi, bCC, sCC): Delete.
18470         (cbranchsi4, cstoresi4): New.
18472         * config/m68hc11/m68hc11.c (m68hc11_compare_op0, m68hc11_compare_op1):
18473         Delete.
18474         (m68hc11_rtx_costs_1, m68hc11_rtx_costs): Handle ZERO_EXTRACT.
18475         (m68hc11_notice_update_cc): Look into a compare with 0.
18476         * config/m68hc11/m68hc11.h (m68hc11_compare_op0, m68hc11_compare_op1):
18477         Delete.
18478         * config/m68hc11/m68hc11.md (tstsi, tsthi, tstqi, cmpsi,
18479         cmphi, cmpqi, bCC): Delete.
18480         (cbranchsi4, cbranchhi4, cbranchqi4): New.
18481         (tstqi_1, tstqi_z_used, tstqi_1, bitcmpqi, bitcmpqi_z_used,
18482         bitcmpqi_12, bitcmphi, various splits and peephole2s): Wrap cc0<-reg
18483         sets with COMPARE.
18485         * config/m68k/predicates.md (m68k_cstore_comparison_operator,
18486         const0_operand, const1_operand, m68k_subword_comparison_operand): New.
18487         * config/m68k/constraints.md (H): New.
18488         * config/m68k/m68k.md (tstdi): Remove define_expand, use name for
18489         the define_insn below.
18490         (tstsi, tsthi, tst<FP:mode>, cmphi, cmpqi, cmp<FP:mode>): Delete.
18491         (*tstsi_internal_68020_cf, *tstsi_internal, *tsthi_internal,
18492         *tstqi_internal, tst<mode>_6881, tst<mode>_cf, many unnamed
18493         patterns): Wrap RHS with COMPARE.
18494         (tst<FP>_68881, tst<FP>_cf): Use const0_operand.
18495         (*cmpdi_internal): Name this pattern.
18496         (cmpdi): Change to define_insn.
18497         (cbranchdi4, cstoredi4, cbranchsi4, cstoresi4, cbranchhi4, cstorehi4,
18498         cbranchqi4, cstoreqi4, cbranch<FP:mode>4, cstore<FP:mode>4): New.
18499         (scc0_di, scc0_di_5200, scc_di): Use the ordered_comparison_operator
18500         predicate.
18501         (seq, sne, sgt, sgtu, slt, sltu, sge, sgeu, sle, sleu, sordered,
18502         sunordered, suneq, sunge, sungt, sunle, sunlt, sltgt): Delete
18503         (conditional_trap): Change to...
18504         (ctrapdi4, ctrapsi4, ctraphi4, ctrapqi4): ... these.
18505         (*conditional_trap): Use the ordered_comparison_operator and
18506         const1_operand predicates.
18507         * config/m68k/m68k.c (m68k_last_compare_had_fp_operands): Delete.
18508         (m68k_expand_prologue): Use ctrapsi4 instead of cmpsi+conditional_trap.
18509         (m68k_rtx_costs): Look for ZERO_EXTRACT in a COMPARE.
18510         * config/m68k/m68k.h (m68k_last_compare_had_fp_operands): Delete.
18512         * config/mcore/mcore-protos.h (arch_compare_op0, arch_compare_op1,
18513         mcore_modify_comparison, mcore_gen_compare_reg): Remove.
18514         (mcore_gen_compare): New.
18515         * config/mcore/mcore.c (arch_compare_op0, arch_compare_op1): Delete.
18516         (mcore_modify_comparison, mcore_gen_compare_reg): Fold into...
18517         (mcore_gen_compare): ... this.
18518         * config/mcore/mcore.md (cmpsi, bCC, sCC): Remove.
18519         (cbranchsi4, cstoresi4): New, using mcore_gen_compare.
18520         (stack probe pattern): Use cbranchsi4.
18522         * config/mips/predicates.md (mips_cstore_operator): New.
18523         * config/mips/mips-ps-3d.md (movv2sfcc): Do not use cmp_operands.
18524         * config/mips/mips.md (any_cond): Delete.
18525         (conditional_trap): Rename to ctrap<GPR:mode>4.  Adjust predicates,
18526         always succeed.
18527         (fixuns_truncdfsi2, fixuns_truncdfdi2, fixuns_truncsfsi2,
18528         fixuns_truncsfdi2): Use cbranch patterns.
18529         (cmp<GPR:mode>, cmp<SCALARF:mode>): Delete.
18530         (b<code>): Change to cbranch<GPR:mode>4 and cbranch<SCALARF:mode>4.
18531         Adjust call to mips_expand_conditional_branch.
18532         (seq, sne, slt<u>, sle<u>, sgt<u>, sge<u>): Change to
18533         cstore<GPR:mode>4.
18534         * config/mips/mips-protos.h (mips_expand_conditional_branch,
18535         mips_expand_scc, mips_expand_conditional_trap): Adjust prototypes.
18536         * config/mips/mips.c (cmp_operands): Delete.
18537         (mips_emit_compare): Get comparison operands from *op0/*op1.
18538         (mips_expand_scc): Get code/op0/op1/target from operands.  Assert
18539         that it succeeds.  Use op0/op1 instead of cmp_operands.
18540         (mips_expand_conditional_branch, mips_expand_conditional_move,
18541         mips_expand_conditional_trap): Likewise.
18542         (mips_block_move_loop): Use cbranch patterns.
18543         * config/mips/mips.h (cmp_operands): Delete.
18545         * config/mmix/mmix.c (mmix_valid_comparison): Delete.
18546         (mmix_gen_compare_reg): Just return a register in the right CC mode.
18547         * config/mmix/mmix.h (mmix_compare_op0, mmix_compare_op1): New.
18548         * config/mmix/mmix.md (cmpdi, cmpdf): Remove.
18549         (*cmpcc_folded): Rename to...
18550         (*cmpdi_folded): this.
18551         (*cmpcc): Rename to...
18552         (*cmps): ... this.
18553         (movdfcc, movdicc): Adjust for new semantics of mmix_gen_compare_reg.
18554         (bCC): Remove.
18555         (cbranchdi4): New.
18556         (cbranchdf4): New.  Handle invalid comparisons here.
18557         * config/mmix/predicates.md (float_comparison_operator): New.
18559         * config/mn10300/mn10300.c (mn10300_rtx_costs): Consider 0 and
18560         zero_extract to be cheap in (compare (zero_extract) (const_int 0).
18561         * config/mn10300/mn10300.md (tst): Delete.
18562         (*tst_extqisi_am33, *tst_extqisi, *tst_exthisi_am33, *tst_exthisi):
18563         Name these patterns and wrap RHS in a compare.
18564         (*cmpsi): Make this pattern private.  Include tst.
18565         (*cmpsf): Make this pattern private.
18566         (and and zero_extract cc0 set): Wrap RHS in a COMPARE.
18567         (compare with zero peepholes): Likewise.
18568         (bCC): Remove.
18569         (cbranchsi4, cbranchsf4): New.
18570         (casesi): Use cbranchsi4.
18572         * config/pa/pa.c (hppa_compare_op0, hppa_compare_op1,
18573         hppa_branch_type): Delete.
18574         (return_addr_rtx): Use cbranchsi4.
18575         (emit_bcond_fp): Accept all operands.  Replace CODE with NE.
18576         Emit CCFPmode comparison here.
18577         (gen_cmp_fp): Delete, now part of emit_bcond_fp.
18578         * config/pa/pa.h (enum cmp_type, hppa_compare_op0, hppa_compare_op1,
18579         hppa_branch_type): Delete.
18580         * config/pa/pa.md (cmpdi, cmpsi, cmpsf, cmpdf, sCC, bCC): Delete.
18581         (movsicc, movdicc): Remove references to hppa_compare_op0,
18582         hppa_compare_op1 and compare_from_rtx.
18583         (cbranchdi4, cbranchsi4, cbranchsf4, cbranchdf4, cstoresi4): New.
18584         (casesi): Use cbranchsi4.
18586         * config/pdp11/pdp11-protos.h (output_jump): Change prototype.
18587         * config/pdp11/pdp11.c (output_jump): Embed opcodes here.
18588         * config/pdp11/pdp11.md (register_or_const0_operand): New.
18589         (cmpdf, cmphi, cmpqi): Make private.  Add tst alternatives.
18590         (cmpsi, tstsi, tstdf, tsthi, tstqi): Delete.
18591         (bCC): Delete.
18592         (cbranchdf4, cbranchhi4, cbranchqi4): New.
18593         (*branch, *branch_inverted): New.
18595         * config/picochip/picochip.md (cbranchhi4): Use
18596         ordered_comparison_operator.
18597         (cmphi, bCC): Remove.
18599         * config/rs6000/predicates.md (rs6000_cbranch_operator): New.
18600         (trap_comparison_operator): Delete.
18601         * config/rs6000/rs6000-protos.h (rs6000_emit_sCOND,
18602         rs6000_emit_cbranch): Accept mode and operands.
18603         * config/rs6000/rs6000.c (rs6000_compare_op0, rs6000_compare_op1,
18604         rs6000_compare_fp_p): Delete.
18605         (rs6000_generate_compare): Accept mode and comparison.  Extract code
18606         and op0/op1 from there.  Replace references to rs6000_compare_op0
18607         and rs6000_compare_op1.
18608         (rs6000_emit_sCOND): Adjust call to rs6000_generate_compare and
18609         extract result from passed operands.
18610         (rs6000_emit_cbranch): Adjust call to rs6000_generate_compare and
18611         extract loc from passed operands.
18612         (rs6000_emit_cmove): Likewise.
18613         * config/rs6000/rs6000.h (rs6000_compare_op0, rs6000_compare_op1,
18614         rs6000_compare_fp_p): Delete.
18615         * config/rs6000/rs6000.md (cmp<GPR>, cmp<FP>, bCC, sCC): Delete.
18616         (cbranch<GPR>4, cbranch<FP>4): New.
18617         (cstore<mode>4): New.  Consolidate here all choices about when to use
18618         portable or specialized sCC sequences.
18619         (stack_protect_test): Use cbranchsi4.
18620         (conditional_trap): Replace with ctrap<GPR>4.
18621         (conditional trap insn): Replace trap_comparison_operator with
18622         ordered_comparison_operator.
18624         * config/s390/s390.c (s390_compare_op0, s390_compare_op1): Delete.
18625         (s390_emit_prologue): Use ctrap.
18626         * config/s390/s390.h (s390_compare_op0, s390_compare_op1): Delete.
18627         * config/s390/predicates.md (s390_eqne_operator, s390_scond_operator):
18628         New predicates replacing...
18629         * config/s390/s390.md (COMPARE, SCOND): ... these iterators.
18630         (cmp<GPR>, cmp<FP>, cmpcc): Delete.
18631         (trunc patterns): Use emit_cmp_and_jump_insns instead of cmp/branch.
18632         (add<mode>cc): Do not use s390_compare_op0/op1.
18633         (s<code>): Change to...
18634         (cstore<mode>4): ... this. Do not use s390_compare_op0/op1.
18635         (seq): Change to...
18636         (cstorecc4): ... this.  Handle EQ or NE equally.
18637         (*sne): Un-privatize for use in cstorecc4.
18638         (b<code>): Change to...
18639         (cbranch<GPR>4, cbranch<FP>4, cbranchcc4): ... these.
18640         (conditional_trap): Replace with...
18641         (ctrap<GPR>4, ctrap<FP>4): ... these.
18642         (stack_protect): Use cbranchcc4.
18644         * config/score/score-conv.h (cmp_op0, cmp_op1): Delete.
18645         * config/score/score-protos.h (score_gen_cmp): Delete.
18646         * config/score/score.c (cmp_op0, cmp_op1, score_gen_cmp): Delete.
18647         (score_block_move-loop): Use cbranchsi4.
18648         * config/score/score.md (cbranchsi4): New.
18649         (cmpsi, bCC): Delete.
18650         * config/score/score3.c (cmp_op0, cmp_op1, score3_gen_cmp): Delete.
18651         (score3_movsicc): Use ops[1] operands instead of cmp_op0/cmp_op1.
18652         * config/score/score7.c (cmp_op0, cmp_op1, score7_gen_cmp): Delete.
18653         (score7_movsicc): Use ops[1] operands instead of cmp_op0/cmp_op1.
18654         * config/score/score3.h (score3_gen_cmp): Delete.
18655         * config/score/score7.h (score7_gen_cmp): Delete.
18657         * config/sh/sh-protos.h (prepare_scc_operands): Rename to...
18658         (sh_emit_scc_to_t): ... this.  Return void.
18659         (from_compare): Rename to...
18660         (sh_emit_compare_and_branch): ... this.
18661         (sh_emit_compare_and_set): New.
18662         (sh_expand_t_scc): Accept operands.
18663         * config/sh/predicates.md (sh_float_comparison_operator): New.
18664         * config/sh/sh.c (sh_compare_op0, sh_compare_op1): Delete.
18665         (prepare_scc_operands): Rename to...
18666         (sh_emit_scc_to_t): ... this.  Return void.  Get op0/op1 from
18667         arguments.
18668         (sh_emit_cheap_store_flag): New.
18669         (sh_emit_set_t_insn): New.
18670         (from_compare): Rename to...
18671         (sh_emit_compare_and_branch): ... this.  Accept mode.  Rewrite
18672         handling of TARGET_SH2E floating point to avoid recursive call.
18673         Generate branch here.
18674         (sh_emit_compare_and_set): New.
18675         (sh_expand_t_scc): Get op0/op1 from arguments.
18676         (sh_emit_cheap_store_flag): New.
18677         * config/sh/sh.md (cbranchdi4, cbranchsi4): Include -mno-cbranchdi
18678         cases.
18679         (cbranchdi4_i): Use an "I08" constraint instead of an "i" constraint.
18680         (cmpsi, cmpdi, cmpsf, cmpdf): Delete.
18681         (movsicc, movdicc): Do nothing when it recreated operands from
18682         sh_compare_*. Use sh_emit_cheap_store_flag.  Adjust call to
18683         prepare_scc_operands (now sh_emit_scc_to_t).
18684         (udivdi3): Use cstoresi4.
18685         (beq_media, bne_media, bge_media, bgtu_media, bgeu_media, beq,
18686         bne, bgt, blt, ble, bge, bgtu, bltu, bgeu, bleu, bunordered): Delete.
18687         (cbranchint4_media, cbranchfp4_media): New.
18688         (casesi): Use cbranchdi4.
18689         (seq, slt, sle, sgt, sge, sgtu, sltu, sgeu, sne, sleu, sunordered):
18690         Delete.
18691         (cstore4_media, cstoresi4, cstoredi4, cstoresf4, cstoredf4): New.
18692         (movnegt): Remove second operand.
18693         (cbranchsf4, cbranchdf4): New.
18694         (stack_protect): Use cbranchdi4/cbranchsi4.
18696         * config/sparc/sparc.c (sparc_compare_op0, sparc_compare_op1): Delete.
18697         (gen_compare_reg): Accept comparison, extract part of it to...
18698         (gen_compare_reg_1): ... this.
18699         (gen_compare_operator): Delete.
18700         (gen_v9_scc): Accept separate destination, comparison code and arms.
18701         Do not use sparc_compare_op0/sparc_compare_op1.
18702         (emit_scc_insn, emit_conditional_branch_insn): New.
18703         (emit_v9_brxx): Make static.  Remove useless assertion.
18704         (sparc_emit_float_lib_cmp): Return RTL instead of calling
18705         emit_cmp_insn.
18706         (sparc_expand_compare_and_swap_12): Use gen_compare_reg_1+cbranchcc4.
18707         * config/sparc/sparc-protos.h (gen_compare_reg,
18708         sparc_emit_float_lib_cmp): Adjust prototype.
18709         (emit_scc_insn, emit_conditional_branch_insn): New.
18710         (gen_v9_scc, emit_v9_brxx_insn, gen_compare_operator): Delete.
18711         * config/sparc/sparc.h (sparc_compare_op0, sparc_compare_op1): Delete.
18712         * config/sparc/sparc.md (P, I, F, V32, V32I, V64, V64I): Move all
18713         iterators to the top.
18714         (cmpsi, cmpdi, cmpsf, cmpdf, cmptf, seqsi_special_extend,
18715         snesi_special_extend, sCC, bCC, seqdi_special_trunc,
18716         snedi_special_trunc): Delete.
18717         (seqdi_special, snedi_special): Use expansion of seqdi_special_trunc
18718         and snedi_special_trunc.
18719         (cstoresi4, cstoredi4, cstore<F:mode>4, cbranchcc4, cbranchsi4,
18720         cbranchdi4, cbranch<F:mode>4): New.
18721         (mov<I:mode>cc, mov<F:mode>cc): Handle sparc_emit_float_lib_cmp
18722         here.  Use gen_compare_reg instead of gen_compare_operator.
18723         (conditional_trap): Replace with...
18724         (ctrapsi4, ctrapdi4): ... this.
18725         (stack_protect_test): Use cbranchcc4.
18727         * config/spu/spu-protos.h (spu_emit_branch_or_set): Change second
18728         argument to rtx.
18729         * config/spu/spu.c (spu_compare_op0, spu_compare_op1): Remove.
18730         (spu_emit_branch_or_set): Get code/op0/op1 from second argument.
18731         Change spu_compare_op0/op1 to op0/op1 throughout.  Get target
18732         from operands[0] or operands[3] depending on is_set.
18733         * config/spu/spu.h (spu_compare_op0, spu_compare_op1): Remove.
18734         * config/spu/spu.md (cmp<mode:VQHSI>, cmp<mode:DTI>, cmp<mode:VSF>,
18735         cmpdf, bCC), sCC: Remove.
18736         (cbranch<mode:VQHSI>4, cbranch<mode:DTI>, cbranch<mode:VSF>4,
18737         cbranchdf4, cstore<mode:VQHSI>4, cstore<mode:DTI>, cstore<mode:VSF>4,
18738         cstoredf4): New.
18739         (mov<mode>cc): Accept ordered_comparison_operator, adjust call to
18740         spu_emit_branch_or_set.
18742         * config/stormy16/stormy16-protos.h (xstormy16_emit_cbranch):
18743         Add two arguments.
18744         * config/stormy16/stormy16.h (xstormy16_compare_op0,
18745         xstormy16_compare_op1): Delete.
18746         * config/stormy16/stormy16.c (xstormy16_compare_op0,
18747         xstormy16_compare_op1): Delete.
18748         (xstormy16_emit_cbranch): Get op0/op1 from the new arguments.
18749         Adjust calls.
18750         * config/stormy16/stormy16.md (cbranchsi4, cbranchhi4): New.
18751         (cmphi, cmpsi, bCC): Remove.
18753         * config/v850/v850.md (tstsi, cmpsi): Fold into...
18754         (*cmpsi): ... this one.
18755         (cbranchsi4, cstoresi4): New.
18756         (bCC expanders): Delete.
18757         (sCC insns): Fold into...
18758         (*setcc): ... this one.
18759         (casesi): Do not use gen_cmpsi and gen_bgtu.
18760         (various splits): Wrap "naked" RHS of a cc0 set with COMPARE.
18761         (movsicc): Simplify.
18762         * config/v850/v850.c (v850_rtx_costs): Handle ZERO_EXTRACT in COMPARE.
18764         * config/vax/vax-protos.h (cond_name): New.
18765         (vax_output_conditional_branch): Remove.
18766         * config/vax/vax.c (cond_name): New.
18767         (vax_output_conditional_branch): Remove.
18768         * config/vax/vax.h (PRINT_OPERAND): Dispatch %c to cond_name.
18769         * config/vax/vax.md (tst<VAXint>, tst<VAXfp>): Remove.
18770         (cmp<VAXint>, cmp<VAXfp>): Privatize.  Add constraints for tst.
18771         (bit<VAXint>): Wrap source with (compare).
18772         (b<code> and following unnamed pattern): Rename to *branch and
18773         *branch_reversed.  Change macroization to match_operator.
18774         (cbranch<VAXint>4, cbranch<VAXfp>4): New.
18776         * config/xtensa/predicates.md (xtensa_cstoresi_operator): New.
18777         * config/xtensa/xtensa-protos.h (xtensa_expand_conditional_branch):
18778         Change last argument to machine_mode.
18779         (xtensa_expand_scc): Add machine_mode argument.
18780         * config/xtensa/xtensa.c (branch_cmp, branch_type): Remove.
18781         (gen_conditional_move, xtensa_expand_conditional_branch,
18782         xtensa_expand_scc, xtensa_expand_conditional_move): Use mode
18783         instead of branch_type, fetch cmp0/cmp1/test_code from operands[].
18784         Adjust operand numbers.
18785         * config/xtensa/xtensa.h (enum cmp_type, branch_cmp, branch_type):
18786         Delete.
18787         * config/xtensa/xtensa.md (any_cond, any_scc): Delete.
18788         (cmpsi, cmpsf, b<code>, s<code>): Delete.
18789         (cbranchsi4, cbranchsf4, cstoresi4, cstoresf4): New.
18791 2009-05-12  Paolo Bonzini  <bonzini@gnu.org>
18793         * optabs.c (prepare_cmp_insn): Temporarily disable test that
18794         causes spurious differences between trunk and cond-optab branch.
18796 2009-05-12  Alexandre Oliva  <aoliva@redhat.com>
18798         PR target/37137
18799         * doc/install.texi (STAGE1_TFLAGS, BUILD_CONFIG): Document.
18801 2009-05-12  Alexandre Oliva  <aoliva@redhat.com>
18803         * tree.c (iterative_hash_pointer): Delete.
18804         (iterative_hash_expr): Short-circuit handling of NULL pointer.
18805         Hash UIDs and versions of SSA names.  Don't special-case built-in
18806         function declarations.
18808 2009-05-11  Ian Lance Taylor  <iant@google.com>
18810         PR bootstrap/40103
18811         * graphite.c: Force -Wc++-compat to only be a warning before
18812         #including "cloog/cloog.h".
18814 2009-05-11  Martin Jambor  <mjambor@suse.cz>
18816         * ipa-cp.c (ipcp_cloning_candidate_p): Add missing return false.
18818 2009-05-11  Jan Hubicka  <jh@suse.cz>
18820         * tree-ssa-loop-ivcanon.c: Include target.h
18821         (struct loop_size): new structure.
18822         (constant_after_peeling): New predicate.
18823         (tree_estimate_loop_size): New function.
18824         (estimated_unrolled_size): Rewrite for new estimates.
18825         (try_unroll_loop_completely): Use new estimates.
18826         * Makefile.in (tree-ssa-loop-ivcanon.o): Add dependenc on target.h
18828 2009-05-11  Andrew Pinski  <andrew_pinski@playstation.sony.com>
18830         * config/spu/spu-c.c (spu_categorize_keyword): Update for recent
18831         libcpp interface change.
18832         (spu_macro_to_expand): Likewise.
18834 2009-05-11  Paolo Bonzini  <bonzini@gnu.org>
18836         PR tree-optimization/40026
18837         * gimplify.c (gimplify_init_constructor): Change initial conditional
18838         to assertion.  Rewrite TREE_OPERAND (*expr_p, 1) after
18839         optimize_compound_literals_in_ctor.
18841 2009-05-11  Nathan Sidwell  <nathan@codesourcery.com>
18843         * config/m68k/m68k-devices.def (52274, 52277, 5301x, 5225x, 51xx):
18844         New devices.
18845         * doc/invoke.texi (M680x0 Options): Document new coldfire cpus.
18847 2009-05-11  H.J. Lu  <hongjiu.lu@intel.com>
18849         * tree-vect-data-refs.c (vect_analyze_group_access): Use
18850         HOST_WIDE_INT for gap.
18852 2009-05-11  Ira Rosen  <irar@il.ibm.com>
18854         PR tree-optimization/40074
18855         * tree-vect-data-refs.c (vect_analyze_group_access): Take gaps into
18856         account in group size and step comparison.
18858 2009-05-11  Richard Guenther  <rguenther@suse.de>
18860         * passes.c (init_optimization_passes): Strip now incorrect comment.
18861         (execute_function_todo): Do not set PROP_alias.
18862         * tree-pass.h (PROP_alias): Remove.
18863         * tree-ssa-structalias.c (pass_build_alias): Do not provide PROP_alias.
18864         * tree-if-conv.c (pass_if_conversion): Do not require PROP_alias.
18865         * tree-nrv.c (pass_return_slot): Likewise.
18866         * tree-object-size.c (pass_object_sizes): Likewise.
18867         * tree-ssa-dom.c (pass_dominator): Likewise.
18868         (pass_phi_only_cprop): Likewise.
18869         * tree-ssa-dse.c (pass_dse): Likewise.
18870         * tree-ssa-phiopt.c (pass_phiopt): Likewise.
18871         (pass_cselim): Likewise.
18872         * tree-ssa-pre.c (pass_pre): Likewise.
18873         (pass_fre): Likewise.
18874         * tree-ssa-reassoc.c (pass_reassoc): Likewise.
18875         * tree-ssa-sink.c (pass_sink_code): Likewise.
18876         * tree-stdarg.c (pass_stdarg): Likewise.
18877         * tree-tailcall.c (pass_tail_calls): Likewise.
18878         * tree-vrp.c (pass_vrp): Likewise.
18880 2009-05-10  Ian Lance Taylor  <iant@google.com>
18882         * basic-block.h (enum profile_status): Break out of struct
18883         control_flow_graph.
18884         * cgraph.h (struct inline_summary): Break out of struct
18885         cgraph_local_info.
18886         * cgraphunit.c (enum cgraph_order_sort_kind): New enum, broken out
18887         of struct cgraph_order_sort.
18888         * combine.c (enum undo_kind): New enum, broken out of struct undo.
18889         * cse.c (struct branch_path): Break out of struct
18890         cse_basic_block_data.
18891         * except.h (enum eh_region_type): Break out of struct eh_region.
18892         * gcc.c (enum add_del): Break out of struct modify_target.
18893         * genrecog.c (enum decision_type): Break out of struct decision_test.
18894         * ggc-page.c (struct ggc_pch_ondisk): Break out of struct
18895         ggc_pch_data.
18896         * matrix-reorg.c (struct free_info): Break out of struct matrix_info.
18897         * regmove.c (enum match_use): New enum, broken out of struct match.
18898         * sched-int.h (enum post_call_group): New enum, broken out of
18899         struct deps.
18900         (struct deps_reg): Break out of struct deps.
18901         * target.h (struct asm_int_op): Break out of struct gcc_target.
18902         * tree-eh.c (struct goto_queue_node): Break out of struct
18903         leh_tf_state.
18904         * tree-inline.h (enum copy_body_cge_which): Break out of
18905         copy_body_data.
18906         * tree-pass.h (enum opt_pass_type): Break out of struct opt_pass.
18908         * c-decl.c (in_struct, struct_types): New static variables.
18909         (pushtag): Add loc parameter.  Change all callers.
18910         (lookup_tag): Add ploc parameter.  Change all callers.
18911         (check_compound_literal_type): New function.
18912         (parser_xref_tag): Add loc parameter.  Change all callers.  If
18913         -Wc++-compat, warn about struct/union/enum types defined within a
18914         struct or union.
18915         (start_struct): Add enclosing_in_struct, enclosing_struct_types,
18916         and loc parameters.  Change all callers.  Change error calls to
18917         error_at, using loc.  For a redefinition, if the location of the
18918         original definition is known, report it.  Set in_struct and
18919         struct_types.  If -Wc++-compat warn if in sizeof, typeof, or alignof.
18920         (finish_struct): Add new parameters enclosing_in_struct and
18921         enclosing_struct_types.  Change all callers.  Set
18922         C_TYPE_DEFINED_IN_STRUCT for all struct/union/enum types defined
18923         in the struct.  If in a struct, add this struct to struct_types.
18924         (start_enum): Add loc parameter.  Change all callers.  Use
18925         error_at for errors, using loc.  For a redefinition, if the
18926         location of the original definition is known, report it.  If in a
18927         struct, add this enum type to struct_types.  If -Wc++-compat warn
18928         if in sizeof, typeof, or alignof.
18929         * c-parser.c (disable_extension_diagnostics): Disable -Wc++-compat.
18930         (enable_extension_diagnostics): Reenable -Wc++-compat if appropriate.
18931         (c_parser_enum_specifier): Get enum location for start_enum.
18932         (c_parser_struct_or_union_specifier): Get struct location for
18933         start_struct.  Save in_struct and struct_types status between
18934         start_struct and finish_struct.
18935         (c_parser_cast_expression): Get location of cast.
18936         (c_parser_alignof_expression): Get location of type.
18937         (c_parser_postfix_expression): Likewise.
18938         (c_parser_postfix_expression_after_paren_type): Add type_loc
18939         parameter.  Change all callers.  Call check_compound_literal_type.
18940         Use type_loc for error about variable size type.
18941         * c-typeck.c (build_external_ref): If -Wc++-compat, warn about a use
18942         of an enum constant from an enum type defined in a struct or union.
18943         (c_cast_expr): Add loc parameter.  Change all callers.  If
18944         -Wc++-compat, warn about defining a type in a cast.
18945         * c-tree.h (C_TYPE_DEFINED_IN_STRUCT): Define.
18946         (start_enum, start_struct, finish_struct): Update declarations.
18947         (parser_xref_tag, c_cast_expr): Update declarations.
18948         (check_compound_literal_type): Declare.
18950 2009-05-11  Ben Elliston  <bje@au.ibm.com>
18952         * config/rs6000/rs6000-c.c (altivec_categorize_keyword): Update
18953         for recent libcpp interface change.
18954         (rs6000_macro_to_expand): Likewise.
18956 2009-05-10  Michael Matz  <matz@suse.de>
18958         PR target/40031
18959         * config/arm/arm.c (require_pic_register): Emit on entry edge,
18960         not at entry of function.
18962 2009-05-10  Richard Guenther  <rguenther@suse.de>
18964         PR tree-optimization/40081
18965         Revert
18966         * tree-sra.c (instantiate_element): Instantiate scalar replacements
18967         using the main variant of the element type.  Do not fiddle with
18968         TREE_THIS_VOLATILE or TREE_SIDE_EFFECTS.
18970         * tree-sra.c (sra_type_can_be_decomposed_p): Do not decompose
18971         structs with volatile fields.
18973 2009-05-10  Jan Hubicka  <jh@suse.cz>
18975         * tree-inline.c (delete_unreachable_blocks_update_callgraph): Declare.
18976         (estimate_move_cost): Assert that it does not get called for
18977         VOID_TYPE_P.
18978         (estimate_num_insns): Skip VOID types in argument handling.
18979         (optimize_inline_calls): Delete unreachable blocks and verify that
18980         callgraph is valid.
18982 2009-05-10  Jan Hubicka  <jh@suse.cz>
18984         * cgraphbuild.c (record_reference): Use cgraph_mark_address_taken_node.
18985         * cgraph.c (cgraph_mark_address_taken_node): New function.
18986         (dump_cgraph_node): Dump new flag.
18987         * cgraph.h (struct cgraph_node): Add address_taken.
18988         (cgraph_mark_address_taken_node): New function.
18989         * ipa.c (cgraph_postorder): Prioritize functions with address taken
18990         since new direct calls can be born.
18992 2009-05-10  Joseph Myers  <joseph@codesourcery.com>
18994         * c-lex.c (c_lex_with_flags): Expect cpp_hashnode in
18995         tok->val.node.node.
18997 2009-05-10  Jan Hubicka  <jh@suse.cz>
18999         PR middle-end/40084
19000         * cgraph.c (cgraph_update_edges_for_call_stmt_node): Take old_call
19001         argument; rewrite.
19002         (cgraph_update_edges_for_call_stmt): Take old_decl argument.
19003         * cgraph.h (cgraph_update_edges_for_call_stmt): Update prototype.
19004         * tree-inline.c (copy_bb): Set frequency correctly.
19005         (fold_marked_statements): Update call to
19006         cgraph_update_edges_for_call_stmt.
19008 2009-05-10  Joseph Myers  <joseph@codesourcery.com>
19010         * config/arc/arc.c (arc_handle_interrupt_attribute): Use %qE for
19011         identifiers in diagnostics.
19012         * config/arm/arm.c (arm_handle_fndecl_attribute,
19013         arm_handle_isr_attribute): Likewise.
19014         * config/avr/avr.c (avr_handle_progmem_attribute,
19015         avr_handle_fndecl_attribute, avr_handle_fntype_attribute): Likewise.
19016         * config/bfin/bfin.c (handle_int_attribute,
19017         bfin_handle_longcall_attribute, bfin_handle_l1_text_attribute,
19018         bfin_handle_l1_data_attribute, bfin_handle_longcall_attribute,
19019         bfin_handle_l1_text_attribute, bfin_handle_l1_data_attribute):
19020         Likewise.
19021         * config/darwin.c (darwin_handle_kext_attribute,
19022         darwin_handle_weak_import_attribute): Likewise.
19023         * config/h8300/h8300.c (h8300_handle_fndecl_attribute,
19024         h8300_handle_eightbit_data_attribute,
19025         h8300_handle_tiny_data_attribute): Likewise.
19026         * config/i386/i386.c (ix86_handle_cconv_attribute,
19027         ix86_handle_abi_attribute, ix86_handle_struct_attribute): Likewise.
19028         * config/i386/winnt.c (ix86_handle_shared_attribute,
19029         ix86_handle_selectany_attribute): Likewise.
19030         * config/ia64/ia64.c (ia64_handle_model_attribute): Likewise.
19031         * config/m32c/m32c.c (function_vector_handler): Likewise.
19032         * config/m68hc11/m68hc11.c (m68hc11_handle_page0_attribute,
19033         m68hc11_handle_fntype_attribute): Likewise.
19034         * config/m68k/m68k.c (m68k_handle_fndecl_attribute): Likewise.
19035         * config/mcore/mcore.c (mcore_handle_naked_attribute): Likewise.
19036         * config/mips/mips.c (mips_insert_attributes,
19037         mips_merge_decl_attributes, mips_expand_builtin): Likewise.
19038         * config/rs6000/rs6000.c (rs6000_handle_longcall_attribute,
19039         rs6000_handle_struct_attribute): Likewise.
19040         * config/sh/sh.c (sh_insert_attributes,
19041         sh_handle_resbank_handler_attribute,
19042         sh_handle_interrupt_handler_attribute,
19043         sh2a_handle_function_vector_handler_attribute,
19044         sh_handle_sp_switch_attribute, sh_handle_trap_exit_attribute):
19045         Likewise.
19046         * config/sh/symbian.c (sh_symbian_mark_dllimport): Likewise.
19047         * config/spu/spu.c (spu_handle_fndecl_attribute,
19048         spu_handle_vector_attribute): Likewise.
19049         * config/stormy16/stormy16.c
19050         (xstormy16_handle_interrupt_attribute): Likewise.
19051         * config/v850/v850-c.c (ghs_pragma_section): Likewise.
19052         * config/v850/v850.c (v850_handle_interrupt_attribute): Likewise.
19054 2009-05-10  Joseph Myers  <joseph@codesourcery.com>
19056         * pretty-print.h (struct pretty_print_info): Add translate_identifiers.
19057         (pp_translate_identifiers): New.
19058         (pp_identifier): Only conditionally translate identifier to locale
19059         character set.
19060         * pretty-print.c (pp_construct): Set pp_translate_identifiers.
19061         (pp_base_tree_identifier): Only conditionally translate identifier
19062         to locale character set.
19063         * c-pretty-print.c (M_): Define.
19064         (pp_c_type_specifier, pp_c_primary_expression): Mark English
19065         fragments for conditional translation with M_.
19066         * tree-pretty-print.c (maybe_init_pretty_print): Disable
19067         identifier translation.
19069 2009-05-10  Richard Guenther  <rguenther@suse.de>
19071         PR tree-optimization/40081
19072         * tree-sra.c (instantiate_element): Instantiate scalar replacements
19073         using the main variant of the element type.  Do not fiddle with
19074         TREE_THIS_VOLATILE or TREE_SIDE_EFFECTS.
19076 2009-05-09  Jan Hubicka  <jh@suse.cz>
19078         PR middle-end/40080
19079         * cgraphunit.c (cgraph_materialize_all_clones): Do not redirect
19080         indirect calls; verify cgraph afterwards.
19082 2009-05-09  Jan Hubicka  <jh@suse.cz>
19084         PR bootstrap/40082
19085         * ipa.c (update_inlined_to_pointer): New function.
19086         (cgraph_remove_unreachable_nodes): Use it.
19088 2009-05-09  Jan Hubicka  <jh@suse.cz>
19090         * tree-eh.c (struct leh_state): Remove prev_try.
19091         (lower_try_finally, lower_catch, lower_eh_filter, lower_cleanup): Do
19092         not track prev_try.
19093         * except.c (gen_eh_region_cleanup, duplicate_eh_regions,
19094         copy_eh_region_1, copy_eh_region, redirect_eh_edge_to_label,
19095         remove_eh_handler_and_replace, foreach_reachable_handler,
19096         verify_eh_region, verify_eh_tree): Remove tracking of prev_try pointer.
19097         * except.h (struct eh_region): Remove eh_region_u_cleanup.
19098         (gen_eh_region_cleanup): Update prototype.
19100 2009-05-09  Jan Hubicka  <jh@suse.cz>
19102         PR middle-end/40043
19103         * except.c (copy_eh_region): Always set prev_try.
19104         (redirect_eh_edge_to_label): Find outer try.
19105         (foreach_reachable_handler): When looking for prev try
19106         handle case where previous try is not going to be taken.
19108 2009-05-07  Michael Meissner  <meissner@linux.vnet.ibm.com>
19110         PR tree-optimization/40049
19111         * tree-vect-stmts.c (vectorizable_operation): If the machine has
19112         only vector/vector shifts, convert the type of the constant to the
19113         appropriate type to avoid building incorrect trees, which
19114         eventually have problems with garbage collection.
19116 2009-05-08  Joseph Myers  <joseph@codesourcery.com>
19118         * fold-const.c (fold_binary): Do not fold multiplication by 1 or
19119         -1 for complex floating-point types if honoring signed zeros.
19121 2009-05-08  Jan Hubicka  <jh@suse.cz>
19123         * cgraphbuild.c (compute_call_stmt_bb_frequency): Accept function
19124         argument; handle correctly when profile is absent.
19125         (build_cgraph_edges): Update.
19126         (rebuild_cgraph_edges): Update.
19127         * cgraph.c: Do not include varray.h.
19128         (cgraph_set_call_stmt_including_clones): New function.
19129         (cgraph_create_edge_including_clones): Likewise
19130         (cgraph_update_edges_for_call_stmt_node): New static cfunction.
19131         (cgraph_update_edges_for_call_stmt): Handle clones.
19132         (cgraph_remove_node): Handle clone tree.
19133         (cgraph_remove_node_and_inline_clones): New function.
19134         (dump_cgraph_node): Dump clone tree.
19135         (cgraph_clone_node): Handle clone tree.
19136         (clone_function_name): Bring here from tree-inline.c.
19137         (cgraph_create_virtual_clone): New function.
19138         * cgraph.h (ipa_replace_map): Move here from ipa.h.
19139         (cgraph_clone_info): New function.
19140         (strut cgraph_node): Add clone_info and new clone tree pointers.
19141         (cgraph_remove_node_and_inline_clones,
19142         cgraph_set_call_stmt_including_clones,
19143         cgraph_create_edge_including_clones,
19144         cgraph_create_virtual_clone): Declare.
19145         (cgraph_function_versioning): Use VEC argument.
19146         (compute_call_stmt_bb_frequency): Update prototype.
19147         (cgraph_materialize_all_clones): New function.
19148         * ipa-cp.c (ipcp_update_cloned_node): Remove.
19149         (ipcp_create_replace_map): Update to VECtors.
19150         (ipcp_update_callgraph): Use virtual clones.
19151         (ipcp_update_bb_counts, ipcp_update_edges_counts): Remove.
19152         (ipcp_update_profiling): Do not update local profiling.
19153         (ipcp_insert_stage): Use VECtors and virtual clones.
19154         * cgraphunit.c (verify_cgraph_node): Verify clone tree.
19155         (clone_of_p): New function.
19156         (cgraph_preserve_function_body_p): Use clone tree.
19157         (cgraph_optimize): Materialize clones.
19158         (cgraph_function_versioning): Update for VECtors.
19159         (save_inline_function_body): Use clone tree.
19160         (cgraph_materialize_clone): New function.
19161         (cgraph_materialize_all_clones): Likewise.
19162         * ipa-inline.c (cgraph_default_inline_p): Use analyzed flags.
19163         * ipa.c: Include gimple.h.
19164         (cgraph_remove_unreachable_nodes): Use clone tree.
19165         * ipa-prop.c (ipa_note_param_call): Update call to
19166         compute_call_stmt_bb_frequencycall.
19167         * ipa-prop.h (ipa_replace_map): Move to cgraph.h.
19168         * tree-inline.c: Do not include varray.h or gt-tree-inline.h.
19169         (copy_bb): Handle updating of clone tree; add new edge when new call
19170         appears.
19171         (expand_call_inline): Be strict about every call having edge.
19172         (clone_fn_id_num, clone_function_name): Move to cgraph.c.
19173         (delete_unreachable_blocks_update_callgraph): New function.
19174         (tree_function_versioning): Use VECtors; always remove unreachable
19175         blocks and fold conditionals.
19176         * tree-inline.h: Do not include varray.h.
19177         (tree_function_versioning): Remove.
19178         * Makefile.in (GTFILES): Remove tree-inline.c
19179         * passes.c (do_per_function): Do only functions having body.
19180         * ipa-struct-reorg.c (do_reorg_1, collect_data_accesses): Handle clone
19181         tree.
19183 2009-05-08  H.J. Lu  <hongjiu.lu@intel.com>
19184             Andrew Morrow  <acm@google.com>
19186         PR c/36892
19187         * c-common.c (c_common_attribute_table): Permit deprecated
19188         attribute to take an optional argument.
19189         (handle_deprecated_attribute): If the optional argument to
19190         __attribute__((deprecated)) is not a string ignore the attribute
19191         and emit a warning.
19193         * c-decl.c (grokdeclarator): Updated warn_deprecated_use call.
19194         * c-typeck.c (build_component_ref): Likewise.
19195         (build_external_ref): Likewise.
19197         * toplev.c (warn_deprecated_use): Add an attribute argument.
19198         Emit the message associated with __attribute__((deprecated)).
19200         * toplev.h (warn_deprecated_use): Updated.
19202         * doc/extend.texi: Document new optional parameter to
19203         __attribute__((deprecated))
19205 2009-05-08  Michael Eager <eager@eagercon.com>
19207         * config/rs6000/rs6000.md (*movdf_softfloat32): replace
19208         !TARGET_DOUBLE_FLOAT with TARGET_SINGLE_FLOAT.
19210 2009-05-08  Richard Guenther  <rguenther@suse.de>
19212         PR tree-optimization/40062
19213         * tree-scalar-evolution.c (follow_ssa_edge_in_condition_phi):
19214         Avoid exponential behavior.
19216 2009-05-08  Paolo Bonzini  <bonzini@gnu.org>
19218         PR rtl-optimization/33928
19219         PR 26854
19220         * fwprop.c (use_def_ref, get_def_for_use, bitmap_only_bit_bitween,
19221         process_uses, build_single_def_use_links): New.
19222         (update_df): Update use_def_ref.
19223         (forward_propagate_into): Use get_def_for_use instead of use-def
19224         chains.
19225         (fwprop_init): Call build_single_def_use_links and let it initialize
19226         dataflow.
19227         (fwprop_done): Free use_def_ref.
19228         (fwprop_addr): Eliminate duplicate call to df_set_flags.
19229         * df-problems.c (df_rd_simulate_artificial_defs_at_top,
19230         df_rd_simulate_one_insn): New.
19231         (df_rd_bb_local_compute_process_def): Update head comment.
19232         (df_chain_create_bb): Use the new RD simulation functions.
19233         * df.h (df_rd_simulate_artificial_defs_at_top,
19234         df_rd_simulate_one_insn): New.
19235         * opts.c (decode_options): Enable fwprop at -O1.
19236         * doc/invoke.texi (-fforward-propagate): Document this.
19238 2009-05-08  Joseph Myers  <joseph@codesourcery.com>
19240         PR c/24581
19241         * c-typeck.c (build_binary_op): Handle arithmetic between one real
19242         and one complex operand specially.
19243         * tree-complex.c (some_nonzerop): Do not identify a real value as
19244         zero if flag_signed_zeros.
19246 2009-05-08  Paolo Bonzini  <bonzini@gnu.org>
19248         PR rtl-optimization/33928
19249         * loop-invariant.c (record_use): Fix && vs. || mishap.
19251 2009-05-08  Paolo Bonzini  <bonzini@gnu.org>
19253         PR rtl-optimization/33928
19254         * loop-invariant.c (struct use): Add addr_use_p.
19255         (struct def): Add n_addr_uses.
19256         (struct invariant): Add cheap_address.
19257         (create_new_invariant): Set cheap_address.
19258         (record_use): Accept df_ref.  Set addr_use_p and update n_addr_uses.
19259         (record_uses): Pass df_ref to record_use.
19260         (get_inv_cost): Do not add inv->cost to comp_cost for cheap addresses
19261         used only as such.
19263 2009-05-08  Kaz Kojima  <kkojima@gcc.gnu.org>
19265         * config/sh/sh.c: Do not include c-pragma.h.
19267 2009-05-07  Andrew Pinski  <andrew_pinski@playstation.sony.com>
19269         * config/spu/spu.c: Remove include of c-common.h.
19271 2009-05-07  Janis Johnson  <janis187@us.ibm.com>
19273         PR c/39037
19274         * c-common.h (mark_valid_location_for_stdc_pragma,
19275         valid_location_for_stdc_pragma_p, set_float_const_decimal64,
19276         clear_float_const_decimal64, float_const_decimal64_p): New.
19277         * c.opt (Wunsuffixed-float-constants): New.
19278         * c-lex.c (interpret_float): Use pragma FLOAT_CONST_DECIMAL64 for
19279         unsuffixed float constant, handle new warning.
19280         * c-cppbuiltin.c (c_cpp_builtins): Use cast for double constants.
19281         * c-decl.c (c_scope): New flag float_const_decimal64.
19282         (set_float_const_decimal64, clear_float_const_decimal64,
19283         float_const_decimal64_p): New.
19284         (push_scope): Set new flag.
19285         * c-parser.c (c_parser_translation_unit): Mark when it's valid
19286         to use STDC pragmas.
19287         (c_parser_external_declaration): Ditto.
19288         (c_parser_compound_statement_nostart): Ditto.
19289         * c-pragma.c (valid_location_for_stdc_pragma,
19290         mark_valid_location_for_stdc_pragma,
19291         valid_location_for_stdc_pragma_p, handle_stdc_pragma,
19292         handle_pragma_float_const_decimal64): New.
19293         (init_pragma): Register new pragma FLOAT_CONST_DECIMAL64.
19294         * cp/semantics.c (valid_location_for_stdc_pragma_p,
19295         set_float_const_decimal64, clear_float_const_decimal64,
19296         float_const_decimal64_p): New dummy functions.
19297         * doc/extend.texi (Decimal Float): Remove statement that the
19298         pragma, and suffix for double constants, are not supported.
19299         * doc/invoke.texi (Warning Options): List new option.
19300         (-Wunsuffixed-float-constants): New.
19302 2009-05-08  Steven Bosscher  <steven@gcc.gnu.org>
19304         * config/i386/i386.c: Do not include c-common.h.
19306 2009-05-07  Mark Heffernan  <meheff@google.com>
19308         * doc/invoke.texi (Debugging Options): Document change of debugging
19309         dump location.
19310         * opts.c (decode_options): Make dump_base_name relative to
19311         aux_base_name directory.
19313 2009-05-07  Hariharan Sandanagobalane <hariharan@picochip.com>
19315         * config/picochip/picochip.h (NO_DOLLAR_IN_LABEL): Added.
19316         * config/picochip/libgccExtras/divmod15.asm : Removed redefiniton.
19318 2009-05-07  Rafael Avila de Espindola  <espindola@google.com>
19320         * Makefile.in (install-plugin): Simplify a bit.
19322 2009-05-07  Paolo Bonzini  <bonzini@gnu.org>
19324         * Makefile.in (OBJS-common): Add regcprop.o.
19325         (regcprop.o): New.
19326         * timevar.def (TV_CPROP_REGISTERS): New.
19327         * regrename.c (regrename_optimize): Return 0.
19328         (rest_of_handle_regrename): Delete.
19329         (pass_rename_registers): Point to regrename_optimize.
19330         (struct value_data_entry, struct value_data,
19331         kill_value_one_regno, kill_value_regno, kill_value,
19332         set_value_regno, init_value_data, kill_clobbered_value,
19333         kill_set_value, kill_autoinc_value, copy_value,
19334         mode_change_ok, maybe_mode_change, find_oldest_value_reg,
19335         replace_oldest_value_reg, replace_oldest_value_addr,
19336         replace_oldest_value_mem, copyprop_hardreg_forward_1,
19337         debug_value_data, validate_value_data): Move...
19338         * regcprop.c: ... here.
19339         (rest_of_handle_cprop): Delete.
19340         (pass_cprop_hardreg): Point to copyprop_hardreg_forward.
19342 2009-05-07  Jakub Jelinek  <jakub@redhat.com>
19344         PR middle-end/40057
19345         * dojump.c (prefer_and_bit_test): Use immed_double_const instead of
19346         GEN_INT for 1 << bitnum.
19347         (do_jump) <case BIT_AND_EXPR>: Use build_int_cst_wide_type instead of
19348         build_int_cst_type.
19350 2009-05-07  Uros Bizjak  <ubizjak@gmail.com>
19352         * doc/md.texi (Standard Pattern Names For Generation) [sync_nand]:
19353         Remove wrong description of "nand" operation.
19355 2009-05-06  Richard Guenther  <rguenther@suse.de>
19356             Adam Nemet  <anemet@caviumnetworks.com>
19358         * gimple.def (GIMPLE_ASSIGN): Fix incorrect information in the
19359         comment.  Add that if LHS is not a gimple register, then RHS1 has
19360         to be a single object (GIMPLE_SINGLE_RHS).
19362 2009-05-06  Adam Nemet  <anemet@caviumnetworks.com>
19364         * expr.c (get_def_for_expr): Move it up in the file.
19365         (store_field): When expanding a bit-field store, look at the
19366         defining gimple stmt for the masking conversion.
19368 2009-05-06  Janis Johnson  <janis187@us.ibm.com>
19370         PR middle-end/39986
19371         * dfp.c (encode_decimal32, decode_decimal32, encode_decimal64,
19372         decode_decimal64, encode_decimal128, decode_decimal128): Avoid
19373         32-bit memcpy into long.
19375 2009-05-06  Jakub Jelinek  <jakub@redhat.com>
19377         * dwarf2out.c (new_reg_loc_descr): Don't ever create DW_OP_regX.
19378         (one_reg_loc_descriptor): Create DW_OP_regX here instead of calling
19379         new_reg_loc_descr.
19380         (loc_by_reference): If loc is DW_OP_regX, change it into DW_OP_bregX 0
19381         instead of appending DW_OP_deref*.
19383 2009-05-06  Michael Matz  <matz@suse.de>
19385         PR middle-end/40021
19386         * cfgexpand.c (maybe_cleanup_end_of_block): New static function.
19387         (expand_gimple_cond): Use it to cleanup CFG and superfluous jumps.
19389 2009-05-06  Rafael Avila de Espindola  <espindola@google.com>
19391         * Makefile.in (install-plugin): Fix srcdir handling.
19393 2009-05-06  Andrey Belevantsev  <abel@ispras.ru>
19395         * tree-ssa.c (execute_update_address_taken): Handle TARGET_MEM_REF
19396         when processing for not_regs_needed bitmap.
19397         * gimple.c (walk_stmt_load_store_addr_ops): When visiting address,
19398         handle TARGET_MEM_REF in lhs.  Check TMR_BASE for NULL while
19399         handling it for rhs.
19401 2009-05-06  H.J. Lu  <hongjiu.lu@intel.com>
19403         * config/i386/i386.md (unnamed inc/dec peephole): Use
19404         optimize_insn_for_size_p instead of optimize_size.
19405         * config/i386/predicates.md (incdec_operand): Likewise.
19406         (aligned_operand): Likewise.
19407         * config/i386/sse.md (divv8sf3): Likewise.
19408         (sqrtv8sf2): Likewise.
19410 2009-05-06  H.J. Lu  <hongjiu.lu@intel.com>
19412         * config/i386/i386.c (ix86_build_signbit_mask): Make it static.
19414         * config/i386/i386-protos.h (ix86_build_signbit_mask): Removed.
19416 2009-05-06  H.J. Lu  <hongjiu.lu@intel.com>
19418         * config/i386/i386.md (*avx_<code><mode>3_finite): Replace
19419         ssemodesuffixf2c with avxmodesuffixf2c.
19421 2009-05-06  Joseph Myers  <joseph@codesourcery.com>
19423         PR c/40032
19424         * c-decl.c (grokdeclarator): Handle incomplete type of unnamed field.
19426 2009-05-05  Jakub Jelinek  <jakub@redhat.com>
19428         * tree.h: Remove DECL_BY_REFERENCE from private_flag comment.
19429         (struct tree_base): Adjust spacing for 8 bit boundaries.
19430         (struct tree_decl_common): Add decl_by_reference_flag bit.
19431         (DECL_BY_REFERENCE): Adjust.
19432         * print-tree.c (print_node): For VAR_DECL, PARM_DECL or RESULT_DECL,
19433         print DECL_BY_REFERENCE bit.
19434         * dbxout.c (DECL_ACCESSIBILITY_CHAR): Revert last change.
19435         * dwarf2out.c (loc_by_reference, gen_decl_die): Check
19436         DECL_BY_REFERENCE for all VAR_DECLs, not just non-static ones.
19437         (gen_variable_die): Likewise.  Check TREE_PRIVATE/TREE_PROTECTED
19438         unconditionally.
19440         PR middle-end/39666
19441         * gimplify.c (gimplify_switch_expr): If case labels cover the whole
19442         range of the type, but default label is missing, add it with one
19443         of the existing labels instead of adding a new label for it.
19445 2009-05-05  Joseph Myers  <joseph@codesourcery.com>
19447         * dwarf.h: Remove.
19449 2009-05-05  Rafael Avila de Espindola  <espindola@google.com>
19451         * Makefile.in (enable_plugin, plugin_includedir): New.
19452         (install): Depend on install-plugin.
19453         (PLUGIN_HEADERS): New.
19454         (install-plugin): New.
19455         * config.gcc: Add vxworks-dummy.h to tm_file for x86 and x86-64.
19457 2009-05-05  Richard Guenther  <rguenther@suse.de>
19459         PR tree-optimization/40022
19460         * tree-ssa-phiprop.c (struct phiprop_d): Exchange vop_stmt for
19461         the only vuse.
19462         (phivn_valid_p): Fix tuplification error, simplify.
19463         (phiprop_insert_phi): Add dumps.
19464         (propagate_with_phi): Simplify.
19466 2009-05-05  Richard Guenther  <rguenther@suse.de>
19468         PR middle-end/40023
19469         * builtins.c (gimplify_va_arg_expr): Properly build the address.
19471 2009-05-05  Shujing Zhao  <pearly.zhao@oracle.com>
19473         * tree.h (strip_float_extensions): Remove duplicate declaration.
19474         (build_low_bits_mask, debug_fold_checksum, expand_function_end,
19475         expand_function_start, stack_protect_prologue, stack_protect_epilogue,
19476         block_ultimate_origin): Rearrange the declarations line to match the
19477         comment that indicates the .c file which the functions are defined.
19478         (dwarf2out_*, set_decl_rtl): Add comment.
19479         (get_base_address): Adjust comment.
19480         (change_decl_assembler_name, maybe_fold_*, build_addr): Rearrange the
19481         declarations line and add comment.
19482         (is_builtin_name): Add blank after function name, for clarity.
19484 2009-05-04  Joseph Myers  <joseph@codesourcery.com>
19486         * attribs.c (decl_attributes): Use %qE for identifiers in
19487         diagnostics.
19488         * cgraphunit.c (verify_cgraph_node): Translate function names to
19489         locale character set in diagnostics.
19490         * coverage.c (get_coverage_counts): Use %qE for identifiers in
19491         diagnostics.
19492         * doc/invoke.texi (-finstrument-functions-exclude-function-list):
19493         Document that functions are named in UTF-8.
19494         * expr.c (expand_expr_real_1): Translate function names to locale
19495         character set in diagnostics.
19496         * gimplify.c (omp_notice_variable, omp_is_private,
19497         gimplify_scan_omp_clauses): Use %qE for identifiers in
19498         diagnostics.
19499         * langhooks.c (lhd_print_error_function): Translate function names
19500         to locale character set.
19501         * langhooks.h (decl_printable_name): Document that return value is
19502         in internal character set.
19503         * stmt.c: Include pretty-print.h
19504         (tree_conflicts_with_clobbers_p): Use %qE for identifiers in
19505         diagnostics.
19506         (resolve_operand_name_1): Translate named operand name to locale
19507         character set.
19508         * stor-layout.c (finalize_record_size): Use %qE for identifiers in
19509         diagnostics.
19510         * toplev.c (announce_function): Translate function names to locale
19511         character set.
19512         (warn_deprecated_use): Use %qE for identifiers in diagnostics.
19513         (default_tree_printer): Use pp_identifier or translate identifiers
19514         to locale character set.  Mark "<anonymous>" for translation.
19515         * tree-mudflap.c (mx_register_decls, mudflap_finish_file): Use %qE
19516         for identifiers in diagnostics.
19517         * tree.c (handle_dll_attribute): Use %qE for identifiers in
19518         diagnostics.
19519         * varasm.c (output_constructor): Use %qE for identifiers in
19520         diagnostics.
19522 2009-05-04  Rafael Avila de Espindola  <espindola@google.com>
19524         * configure.ac: use ` ` instead of $()
19525         * configure: Regenerate.
19527 2009-05-05  Ben Elliston  <bje@au.ibm.com>
19529         * config/pa/linux-atomic.c: Eliminate conditional include of
19530         errno.h on non-LP64 systems to simplify build requirements.
19532 2009-05-04  Joseph Myers  <joseph@codesourcery.com>
19534         * c-common.c (handle_mode_attribute): Use %qE for identifiers in
19535         diagnostics.
19536         * c-decl.c (check_bitfield_type_and_width): Make orig_name a tree
19537         and pass value to identifier_to_locale.
19538         (warn_variable_length_array): Make name a tree.
19539         (grokdeclarator): Separate diagnostic texts for named and unnamed
19540         declarators.  Use %qE for named declarators.
19541         * c-parser.c (c_lex_one_token): Use %qE for identifiers in
19542         diagnostics.
19543         * c-pragma.c (pop_alignment, handle_pragma_pack): Use %qE for
19544         identifiers in diagnostics.
19545         * c-typeck.c (push_member_name, start_init): Pass identifiers to
19546         identifier_to_locale.  Mark "anonymous" strings for translation.
19548 2009-05-04  Michael Eager <eager@eagercon.com>
19550         * config/rs6000/rs6000.c (rs6000_legitimate_address): Allow
19551         address for DImode/DFmode only if double-precision FP regs.
19553 2009-05-04  Michael Eager <eager@eagercon.com>
19555         * config/rs6000/rs6000.c (rs6000_libcall_value): Add
19556         TARGET_SINGLE_FLOAT check.
19558 2009-05-04  Michael Eager <eager@eagercon.com>
19560         * config/rs6000/xilinx.h: Add CPP_SPEC for -mxilinx-fpu options.
19562 2009-05-04  Michael Eager <eager@eagercon.com>
19564         * gcc/config.gcc (powerpc-xilinx-eabi*): Add tm t-xilinx
19565         * config/rs6000/t-xilinx: New
19567 2009-05-04  Paolo Bonzini  <bonzini@gnu.org>
19569         * doc/tm.texi (LEGITIMIZE_ADDRESS): Revise documentation.
19570         * gcc/defaults.h (LEGITIMIZE_ADDRESS): Delete.
19571         * gcc/explow.c (memory_address): Use target hook.
19572         * gcc/targhooks.c (default_legitimize_address): New.
19573         * gcc/targhooks.h (default_legitimize_address): New.
19574         * gcc/target.h (legitimize_address): New.
19575         * gcc/target-def.h (TARGET_LEGITIMIZE_ADDRESS): New.
19576         (TARGET_INITIALIZER): Include it.
19577         * gcc/system.h (LEGITIMIZE_ADDRESS): Poison.
19579         * config/bfin/bfin-protos.h (legitimize_address): Remove.
19580         * config/bfin/bfin.c (legitimize_address): Remove.
19581         * config/bfin/bfin.h (LEGITIMIZE_ADDRESS): Remove.
19582         * config/m68hc11/m68hc11-protos.h (m68hc11_legitimize_address):
19583         Remove.
19584         * config/m68hc11/m68hc11.c (m68hc11_legitimize_address): Remove.
19585         * config/m68hc11/m68hc11.h (LEGITIMIZE_ADDRESS): Remove.
19587         * gcc/config/arm/arm.h (LEGITIMIZE_ADDRESS, ARM_LEGITIMIZE_ADDRESS,
19588         THUMB_LEGITIMIZE_ADDRESS, THUMB2_LEGITIMIZE_ADDRESS): Delete.
19589         * gcc/config/s390/s390.h (LEGITIMIZE_ADDRESS): Delete.
19590         * gcc/config/m32c/m32c.h (LEGITIMIZE_ADDRESS): Delete.
19591         * gcc/config/sparc/sparc.h (LEGITIMIZE_ADDRESS): Delete.
19592         * gcc/config/m32r/m32r.h (LEGITIMIZE_ADDRESS): Delete.
19593         * gcc/config/i386/i386.h (LEGITIMIZE_ADDRESS): Delete.
19594         * gcc/config/sh/sh.h (LEGITIMIZE_ADDRESS): Delete.
19595         * gcc/config/avr/avr.h (LEGITIMIZE_ADDRESS): Delete.
19596         * gcc/config/m68hc11/m68hc11.h (LEGITIMIZE_ADDRESS): Delete.
19597         * gcc/config/iq2000/iq2000.h (LEGITIMIZE_ADDRESS): Delete.
19598         * gcc/config/mn10300/mn10300.h (LEGITIMIZE_ADDRESS): Delete.
19599         * gcc/config/m68k/m68k.h (LEGITIMIZE_ADDRESS): Delete.
19600         * gcc/config/score/score.h (LEGITIMIZE_ADDRESS): Delete.
19601         * gcc/config/pa/pa.h (LEGITIMIZE_ADDRESS): Delete.
19602         * gcc/config/mips/mips.h (LEGITIMIZE_ADDRESS): Delete.
19603         * gcc/config/alpha/alpha.h (LEGITIMIZE_ADDRESS): Delete.
19604         * gcc/config/frv/frv.h (LEGITIMIZE_ADDRESS): Delete.
19605         * gcc/config/spu/spu.h (LEGITIMIZE_ADDRESS): Delete.
19606         * gcc/config/xtensa/xtensa.h (LEGITIMIZE_ADDRESS): Delete.
19607         * gcc/config/cris/cris.h (LEGITIMIZE_ADDRESS): Delete.
19608         * gcc/config/rs6000/rs6000.h (LEGITIMIZE_ADDRESS): Delete.
19609         * gcc/config/picochip/picochip.h (LEGITIMIZE_ADDRESS): Delete.
19611         * gcc/config/s390/s390-protos.h (legitimize_address): Delete.
19612         * gcc/config/m32c/m32c-protos.h (m32c_legitimize_address): Delete.
19613         * gcc/config/sparc/sparc-protos.h (legitimize_address): Delete.
19614         * gcc/config/i386/i386-protos.h (legitimize_address): Delete.
19615         * gcc/config/avr/avr-protos.h (legitimize_address): Delete.
19616         * gcc/config/mn10300/mn10300-protos.h (legitimize_address): Delete.
19617         * gcc/config/score/score-protos.h (score_legitimize_address): Delete.
19618         * gcc/config/arm/arm-protos.h (arm_legitimize_address,
19619         (thumb_legitimize_address): Delete.
19620         * gcc/config/pa/pa-protos.h (hppa_legitimize_address): Delete.
19621         * gcc/config/mips/mips-protos.h (mips_legitimize_address): Delete.
19622         * gcc/config/alpha/alpha-protos.h (alpha_legitimize_address): Delete.
19623         * gcc/config/frv/frv-protos.h (frv_legitimize_address): Delete.
19624         * gcc/config/spu/spu-protos.h (spu_legitimize_address): Delete.
19625         * gcc/config/xtensa/xtensa-protos.h (xtensa_legitimize_address):
19626         Delete.
19627         * gcc/config/rs6000/rs6000-protos.h (rs6000_legitimize_address):
19628         Delete.
19630         * config/arm/arm.c (arm_legitimize_address): Maybe call Thumb version.
19631         * config/m32c/m32c.c (m32c_legitimize_address): Standardize.
19632         * config/m32r/m32r.c (m32r_legitimize_address): New.
19633         * config/m68k/m68k.c (m68k_legitimize_address): New.
19634         * config/score/score.c (score_legitimize_address): Standardize.
19635         * config/score/score3.c (score3_legitimize_address): Standardize.
19636         * config/score/score3.h (score3_legitimize_address): Adjust.
19637         * config/score/score7.c (score7_legitimize_address): Standardize.
19638         * config/score/score7.h (score7_legitimize_address): Adjust.
19639         * config/sh/sh.c (sh_legitimize_address): New.
19640         * config/iq2000/iq2000.c (iq2000_legitimize_address): New.
19642         * gcc/config/s390/s390.c (legitimize_address): Rename to...
19643         (s390_legitimize_address): ... this.
19644         * gcc/config/sparc/sparc.c (legitimize_address): Rename to...
19645         (sparc_legitimize_address): ... this.
19646         * gcc/config/i386/i386.c (legitimize_address): Rename to...
19647         (ix86_legitimize_address): ... this.
19648         * gcc/config/avr/avr.c (legitimize_address): Rename to...
19649         (avr_legitimize_address): ... this.
19650         * gcc/config/mn10300/mn10300.c (legitimize_address): Rename to...
19651         (mn10300_legitimize_address): ... this.
19652         * config/alpha/alpha.c (alpha_legitimize_address): Wrap...
19653         (alpha_legitimize_address_1): ... the old alpha_legitimize_address.
19654         (alpha_expand_mov): Adjust call.
19656         * config/frv/frv.c (frv_legitimize_address): Return x on failure.
19657         * config/spu/spu.c (spu_legitimize_address): Likewise.
19658         * config/xtensa/xtensa.c (xtensa_legitimize_address): Likewise.
19659         * config/rs6000/rs6000.c (rs6000_legitimize_address): Likewise.
19661 2009-05-04  Joseph Myers  <joseph@codesourcery.com>
19663         * intl.c (locale_encoding, locale_utf8): New.
19664         (gcc_init_libintl): Initialize locale_encoding and locale_utf8.
19665         * intl.h (locale_encoding, locale_utf8): Declare.
19666         * pretty-print.c: Include ggc.h.  Include iconv.h if HAVE_ICONV.
19667         (pp_base_tree_identifier, decode_utf8_char, identifier_to_locale):
19668         New.
19669         * pretty-print.h (pp_identifier): Call identifier_to_locale on ID
19670         argument.
19671         (pp_tree_identifier): Define to call pp_base_tree_identifier.
19672         (pp_base_tree_identifier): Declare as function.
19673         (identifier_to_locale): Declare.
19674         * Makefile.in (pretty-print.o): Update dependencies.
19675         * varasm.c (finish_aliases_1): Use %qE for identifiers in diagnostics.
19677 2009-05-04  Richard Guenther  <rguenther@suse.de>
19679         PR middle-end/40015
19680         * builtins.c (fold_builtin_memory_op): Do not decay to element
19681         type if the size matches the whole array.
19683 2009-05-04  Kazu Hirata  <kazu@codesourcery.com>
19685         * expmed.c (synth_mult): When trying out a shift, pass the result
19686         of a signed shift.
19688 2009-05-04  Kazu Hirata  <kazu@codesourcery.com>
19690         * expmed.c (shiftsub_cost): Rename to shiftsub0_cost.
19691         (shiftsub1_cost): New.
19692         (init_expmed): Compute shiftsub1_cost.
19693         (synth_mult): Optimize multiplications by constants of the form
19694         -(2^^m-1) for some constant positive integer m.
19696 2009-05-03  Richard Guenther  <rguenther@suse.de>
19698         PR c/39983
19699         * c-typeck.c (array_to_pointer_conversion): Do not built
19700         ADDR_EXPRs of arrays of pointer-to-element type.
19701         * c-gimplify.c (c_gimplify_expr): Revert change fixing
19702         up wrong ADDR_EXPRs after-the-fact.
19703         * c-common.c (strict_aliasing_warning): Strip pointer
19704         conversions for obtaining the original type.
19705         * builtins.c (fold_builtin_memset): Handle array types.
19706         (fold_builtin_memory_op): Handle folded POINTER_PLUS_EXPRs
19707         and array types
19709 2009-05-03  Richard Guenther  <rguenther@suse.de>
19711         PR middle-end/23329
19712         * tree-ssa.c (useless_type_conversion_p_1): Use get_deref_alias_set.
19713         Do not lose casts from array types with unknown extent to array
19714         types with known extent.
19715         * tree-ssa-copy.c (may_propagate_copy): Remove hack checking for
19716         alias set compatibility.
19718 2009-05-03  Manuel López-Ibáñez  <manu@gcc.gnu.org>
19720         * flags.h (extra_warnings): Delete.
19721         * toplev.c (process_options): Handle Wuninitialized here.
19722         * opts.c (extra_warnings): Delete.
19723         (set_Wextra): Delete.
19724         (common_handle_option): -Wextra can be handled automatically.
19725         * c-opts.c (c_common_handle_option): Delete obsolete code.
19726         (c_common_post_options): Simplify comment.
19727         * common.opt (W): Add Var.
19728         (Wextra): Add Var.
19729         (Wuninitialized): Initialize to -1.
19731 2009-05-03  Adam Nemet  <anemet@caviumnetworks.com>
19732             Richard Guenther  <rguenther@suse.de>
19734         * expr.c (get_def_for_expr): New function.
19735         (expand_expr_real_1) <PLUS_EXPR, MINUS_EXPR>: Adjust to work with
19736         SSA rather than trees.
19737         <MULT_EXPR>: Likewise.  Use subexp0 and subexp1 instead of
19738         TREE_OPERAND (exp, 0) and TREE_OPERAND (exp, 1).
19740 2009-05-03  Joseph Myers  <joseph@codesourcery.com>
19742         * c-common.c (reswords): Add _Imaginary.
19743         * c-common.c (enum rid): Add RID_IMAGINARY.
19745 2009-05-03  Paolo Bonzini  <bonzini@gnu.org>
19747         * tree.h (TYPE_VECTOR_OPAQUE): Fix documentation.
19748         Patch by Richard Guenther.
19750 2009-05-03  Anatoly Sokolov  <aesok@post.ru>
19752         * defaults.h (FRAME_POINTER_REQUIRED): Provide default.
19753         * doc/tm.texi (FRAME_POINTER_REQUIRED): Revise documentation.
19754         * config/alpha/alpha.h (FRAME_POINTER_REQUIRED): Delete.
19755         * config/s390/s390.h (FRAME_POINTER_REQUIRED): Delete.
19756         * config/spu/spu.h (FRAME_POINTER_REQUIRED): Delete.
19757         * config/sh/sh.h (FRAME_POINTER_REQUIRED): Delete.
19758         * config/pdp11/pdp11.h (FRAME_POINTER_REQUIRED): Delete.
19759         * config/stormy16/stormy16.h (FRAME_POINTER_REQUIRED): Delete.
19760         * config/m68hc11/m68hc11.h (FRAME_POINTER_REQUIRED): Delete.
19761         * config/iq2000/iq2000.h (FRAME_POINTER_REQUIRED): Delete.
19762         * config/mn10300/mn10300.h (FRAME_POINTER_REQUIRED): Delete.
19763         * config/ia64/ia64.h (FRAME_POINTER_REQUIRED): Delete.
19764         * config/m68k/m68k.h (FRAME_POINTER_REQUIRED): Delete.
19765         * config/rs6000/rs6000.h (FRAME_POINTER_REQUIRED): Delete.
19766         * config/picochip/picochip.h (FRAME_POINTER_REQUIRED): Delete.
19767         * config/mcore/mcore.h (FRAME_POINTER_REQUIRED): Delete.
19768         * config/h8300/h8300.h (FRAME_POINTER_REQUIRED): Delete.
19769         * config/v850/v850.h (FRAME_POINTER_REQUIRED): Delete.
19771 2009-05-02  Richard Guenther  <rguenther@suse.de>
19773         PR tree-optimization/39940
19774         * tree-ssa-pre.c (eliminate): Make sure we may propagate before
19775         doing so.
19777 2009-05-02  Richard Guenther  <rguenther@suse.de>
19779         PR middle-end/40001
19780         * tree-ssa.c (execute_update_addresses_taken): Properly check
19781         if we can mark a variable DECL_GIMPLE_REG_P.
19782         * gimple.c (is_gimple_reg): Re-order check for DECL_GIMPLE_REG_P
19783         back to the end of the function.
19784         (is_gimple_reg_type): Remove complex type special casing.
19785         * gimplify.c (gimplify_bind_expr): Do not set DECL_GIMPLE_REG_P
19786         if not optimizing.
19788 2009-05-02  Ben Elliston  <bje@au.ibm.com>
19790         * doc/collect2.texi (Collect2): Document search path behaviour
19791         when configured with --with-ld.
19793 2009-05-02  Jan Hubicka  <jh@suse.cz>
19795         * tree-ssa-coalesce.c (coalesce_cost): Do not take ciritical
19796         parameter; update callers.
19797         (coalesce_cost_edge): EH edges are costier because they needs
19798         splitting even if not critical and even more costier when there are
19799         multiple EH predecestors.
19801 2009-05-02  Jan Hubicka  <jh@suse.cz>
19803         * except.c (remove_eh_handler_and_replace): Handle updating after
19804         removing TRY blocks.
19806 2009-05-02  Eric Botcazou  <ebotcazou@adacore.com>
19808         * store-motion.c (compute_store_table): Add ENABLE_CHECKING guard.
19810 2009-05-02  Steven Bosscher  <steven@gcc.gnu.org>
19812         * varasm.c: Do not include c-pragma.h.
19813         * attribs.c: Do not incude c-common.h.
19815 2009-05-01  Michael Matz  <matz@suse.de>
19817         * calls.c (initialize_argument_information): Handle SSA names like
19818         decls with a non MEM_P DECL_RTL.
19820 2009-05-01  Steven Bosscher  <steven@gcc.gnu.org>
19822         * ipa-reference.c: Do not include c-common.h, include splay-tree.h.
19823         * ipa-utils.c: Likewise.
19824         * ipa-type-escape.c: Likewise.
19825         * cgraphunit.c Do not include c-common.h.
19826         * ipa-pure-const.c: Likewise.
19827         * tree-if-conv.c: Likewise.
19828         * matrix-reorg.c: Do not include c-common.h and c-tree.h.
19829         * ipa-struct-reorg.c: Likewise.
19830         * tree-nomudflap.c: Likewise.
19831         * tree-ssa-structalias.c: Likewise.
19833 2009-05-01  Steven Bosscher  <steven@gcc.gnu.org>
19835         * store-motion.c: Many cleanups to make this pass a first-class
19836         citizen instead of an appendix to gcse load motion.  Add TODO list
19837         to make this pass faster/cleaner/better.
19839         (struct ls_expr): Post gcse.c-split cleanups.
19840         Rename to st_expr.  Rename "loads" field to "antic_stores".  Rename
19841         "stores" field to "avail_stores".
19842         (pre_ldst_mems): Rename to store_motion_mems.
19843         (pre_ldst_table): Rename to store_motion_mems_table.
19844         (pre_ldst_expr_hash): Rename to pre_st_expr_hash, update users.
19845         (pre_ldst_expr_eq): Rename to pre_st_expr_eq, update users.
19846         (ldst_entry): Rename to st_expr_entry, update users.
19847         (free_ldst_entry): Rename to free_st_expr_entry, update users.
19848         (free_ldst_mems): Rename to free_store_motion_mems, update users.
19849         (enumerate_ldsts): Rename to enumerate_store_motion_mems,
19850         update caller.
19851         (first_ls_expr): Rename to first_st_expr, update users.
19852         (next_ls_expr): Rename to next_st_expr, update users.
19853         (print_ldst_list): Rename to print_store_motion_mems.  Print names of
19854         fields properly for store motion instead of names inherited from load
19855         motion in gcse.c.
19856         (ANTIC_STORE_LIST, AVAIL_STORE_LIST): Remove.
19857         (LAST_AVAIL_CHECK_FAILURE): Explain what this is.  Undefine when we
19858         are done with it.
19860         (ae_kill): Rename to st_kill, update users.
19861         (ae_gen): Rename to st_avloc, update users.
19862         (transp): Rename to st_transp, update users.
19863         (pre_insert_map): Rename to st_insert_map, update users.
19864         (pre_delete_map): Rename to st_delete_map, update users.
19865         (insert_store, build_store_vectors, free_store_memory,
19866         one_store_motion_pass): Update for abovementioned changes.
19868         (gcse_subst_count, gcse_create_count): Remove.
19869         (one_store_motion_pass): New statistics counters "n_stores_deleted"
19870         and "n_stores_created", local variables.
19872         (extract_mentioned_regs, extract_mentioned_regs_1): Rewrite to
19873         use for_each_rtx.
19875         (regvec, compute_store_table_current_insn): Remove.
19876         (reg_set_info, reg_clear_last_set): Remove.
19877         (compute_store_table): Use DF caches instead of local dataflow
19878         solvers.
19880 2009-05-01  Joseph Myers  <joseph@codesourcery.com>
19882         * c-objc-common.c (c_tree_printer): Print identifiers with
19883         pp_identifier, not pp_string.  Mark "({anonymous})" for
19884         translation.
19885         * c-pretty-print.c (pp_c_ws_string): New.
19886         (pp_c_cv_qualifier, pp_c_type_specifier,
19887         pp_c_specifier_qualifier_list, pp_c_parameter_type_list,
19888         pp_c_storage_class_specifier, pp_c_function_specifier,
19889         pp_c_attributes, pp_c_bool_constant, pp_c_constant,
19890         pp_c_primary_expression, pp_c_postfix_expression,
19891         pp_c_unary_expression, pp_c_shift_expression,
19892         pp_c_relational_expression, pp_c_equality_expression,
19893         pp_c_logical_and_expression, pp_c_logical_or_expression): Mostly
19894         use pp_string and pp_c_ws_string in place of pp_identifier and
19895         pp_c_identifier for non-identifiers.  Mark English strings for
19896         translation.
19897         * c-pretty-print.h (pp_c_ws_string): Declare.
19899 2009-04-30  Paul Pluzhnikov  <ppluzhnikov@google.com>
19900             Roland McGrath <roland@redhat.com>
19902         * configure.ac (HAVE_LD_BUILDID): New check for ld --build-id support.
19903         (ENABLE_LD_BUILDID): New configuration option.
19904         * gcc.c [HAVE_LD_BUILDID and ENABLE_LD_BUILDID]
19905         (LINK_BUILDID_SPEC): New macro.
19906         (init_spec): If defined, prepend it between LINK_EH_SPEC and
19907         link_spec.
19908         * doc/install.texi: Document --enable-linker-build-id option.
19909         * configure: Rebuild.
19910         * config.in: Rebuild.
19912 2009-04-30  Adam Nemet  <anemet@caviumnetworks.com>
19914         * config/mips/mips.h (FRAME_GROWS_DOWNWARD,
19915         MIPS_GP_SAVE_AREA_SIZE): Define new macros.
19916         (STARTING_FRAME_OFFSET): Return 0 if FRAME_GROWS_DOWNWARD.  Use
19917         MIPS_GP_SAVE_AREA_SIZE.
19918         * config/mips/mips.c (struct mips_frame_info): Update comment
19919         before arg_pointer_offset and hard_frame_pointer_offset.
19920         (mips_compute_frame_info): Update diagram before function: to
19921         correctly use stack_pointer_rtx for fp_sp_offset and gp_sp_offset, to
19922         indicate the position of frame_pointer_rtx with -fstack-protector and
19923         to show args_size.  Don't allocate cprestore area for leaf functions
19924         if FRAME_GROWS_DOWNWARD.  Use MIPS_GP_SAVE_AREA_SIZE to set
19925         cprestore_size.
19926         (mips_initial_elimination_offset): Update for FRAME_GROWS_DOWNWARD.
19928 2009-04-30  Michael Matz  <matz@suse.de>
19930         PR tree-optimization/39955
19931         * config/rs6000/rs6000.c (rs6000_check_sdmode): Also check SSA_NAMEs.
19933 2009-04-30  Dave Korn  <dave.korn.cygwin@gmail.com>
19935         * ira.c (setup_cover_and_important_classes):  Use safe macro
19936         REG_CLASS_FOR_CONSTRAINT instead of calling regclass_for_constraint
19937         directly.
19938         * genpreds.c (write_tm_preds_h):  Output suitable definition of
19939         REG_CLASS_FOR_CONSTRAINT.
19941 2009-04-30  Rafael Avila de Espindola  <espindola@google.com>
19943         * alloc-pool.c (alloc_pool_descriptor): Use an insert_opion value
19944         instead of an int.
19945         * bitmap.c (bitmap_descriptor): Likewise.
19946         * ggc-common.c (loc_descriptor): Likewise.
19947         * varray.c (varray_descriptor): Likewise.
19948         * vec.c (vec_descriptor): Likewise.
19950 2009-04-30  Eric Botcazou  <ebotcazou@adacore.com>
19952         * Makefile.in (dce.o): Add $(EXCEPT_H).
19953         * dce.c: Include except.h and delete redundant vector definitions.
19954         (deletable_insn_p): Return false for non-call insns that can throw
19955         if DF is running.
19957 2009-04-30  Steven Bosscher  <steven@gcc.gnu.org>
19959         * gcse.c (ae_gen): Remove.
19960         (can_assign_to_reg_p): Rename to can_assign_to_reg_without_clobbers_p
19961         and make non-static function to make it available in store-motion.c.
19962         Update call sites with search-and-replace.
19963         (enumerate_ldsts, reg_set_info, reg_clear_last_set, store_ops_ok,
19964         extract_mentioned_regs, extract_mentioned_regs_helper,
19965         find_moveable_store, compute_store_table, load_kills_store, find_loads,
19966         store_killed_in_insn, store_killed_after, store_killed_before,
19967         build_store_vectors, insert_insn_start_basic_block, insert-store,
19968         remove_reachable_equiv_notes, replace_store_insn, delete_store,
19969         free_store_memory, one_store_motion_pass, gate_rtl_store_motion,
19970         execute_rtl_store_motion, pass_rtl_store_motion): Move to...
19971         * store-motion.c: ...new file.  Also copy data structures from gcse.c
19972         and clean up to remove parts not used by store motion.
19973         * rtl.h (can_assign_to_reg_without_clobbers_p): Add prototype.
19974         * Makefile.in (store-motion.o): New rule. Add to OBJS-common.
19976 2009-04-30  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
19978         PR target/38571
19979         * config/arm/arm.h (FUNCTION_BOUNDARY): Set to 16 for thumb
19980         when optimizing for size.
19982 2009-04-30  Hans-Peter Nilsson  <hp@axis.com>
19984         * gcse.c (gcse_constant_p): Fix typo in last change.
19986 2009-04-30  Rafael Avila de Espindola  <espindola@google.com>
19988         * plugin.c: Include plugin-version.h only if ENABLE_PLUGIN is defined.
19990 2009-04-30  Andreas Krebbel  <krebbel1@de.ibm.com>
19992         * gcse.c (gcse_constant_p): Make sure the constant is sharable.
19994 2009-04-29  James E. Wilson  <wilson@codesourcery.com>
19996         * config/mips/mips.c (mips_add_offset): Use gen_int_mode for
19997         CONST_HIGH_PART result.
19999 2009-04-29  Anatoly Sokolov  <aesok@post.ru>
20001         * config/avr/avr.c (initial_elimination_offset): Rename to
20002         avr_initial_elimination_offset.
20003         (frame_pointer_required_p): Rename to avr_frame_pointer_required_p,
20004         change return type to bool.
20005         (avr_can_eliminate): New function.
20006         * config/avr/avr.h (CAN_ELIMINATE): Use avr_can_eliminate.
20007         (FRAME_POINTER_REQUIRED): Use avr_frame_pointer_required_p.
20008         (INITIAL_ELIMINATION_OFFSET): Use avr_initial_elimination_offset.
20009         * config/avr/avr-protos.h (initial_elimination_offset): Rename to
20010         avr_initial_elimination_offset.
20011         (frame_pointer_required_p): Rename to avr_frame_pointer_required_p.
20012         (avr_initial_elimination_offset): Define.
20014 2009-04-29  Eric Botcazou  <ebotcazou@adacore.com>
20015             Steven Bosscher  <steven@gcc.gnu.org>
20017         PR rtl-optimization/39938
20018         * Makefile.in (cfgrtl.o): Add $(INSN_ATTR_H).
20019         * cfgrtl.c: Include insn-attr.h.
20020         (rest_of_pass_free_cfg): New function.
20021         (pass_free_cfg): Use rest_of_pass_free_cfg as execute function.
20022         * resource.c (init_resource_info): Remove call to df_analyze.
20024 2009-04-29  Richard Guenther  <rguenther@suse.de>
20026         PR target/39943
20027         * config/i386/i386.c (ix86_vectorize_builtin_conversion): Only
20028         allow conversion to signed integers.
20030 2009-04-29  Richard Guenther  <rguenther@suse.de>
20032         * tree-cfg.c (verify_gimple_assign_binary): Allow vector
20033         shifts of floating point vectors if the shift amount is
20034         a constant multiple of the element size.
20036 2009-04-29  Andreas Krebbel  <krebbel1@de.ibm.com>
20037             Michael Matz  <matz@suse.de>
20039         PR middle-end/39927
20040         PR bootstrap/39929
20041         * tree-outof-ssa.c (emit_partition_copy): New function.
20042         (insert_partition_copy_on_edge, insert_rtx_to_part_on_edge,
20043         insert_part_to_rtx_on_edge): Perform the partition base var
20044         copy using emit_partition_copy.
20045         (insert_value_copy_on_edge): Convert constants to the right mode.
20046         (insert_rtx_to_part_on_edge): Add UNSIGNEDSRCP parameter.
20047         (elim_create): Pass the sign of the src to insert_rtx_to_part_on_edge.
20049 2009-04-29  Bernd Schmidt  <bernd.schmidt@analog.com>
20051         * config/bfin/bfin.c (bfin_optimize_loop): If we need a scratch reg,
20052         scan backwards to try to find a constant to initialize it.
20054         * config/bfin/bfin.c (bfin_optimize_loop): When looking for the last
20055         insn before the loop_end instruction, don't look past labels.
20057 2009-04-29  Richard Guenther  <rguenther@suse.de>
20059         PR middle-end/39937
20060         * tree-ssa-forwprop.c (forward_propagate_addr_expr_1): Do not
20061         loose type conversions.
20062         (forward_propagate_addr_expr): Fix tuplification bug.  Remove
20063         stmts only if there are no uses of its definition.
20065 2009-04-29  Bernd Schmidt  <bernd.schmidt@analog.com>
20067         * config/bfin/bfin.h (splitting_loops): Declare.
20068         * config/bfin/bfin-protos.h (WA_05000257, WA_05000283, WA_05000315):
20069         Reorder bit definitions to be ascending.
20070         (WA_LOAD_LCREGS, ENABLE_WA_LOAD_LCREGS): New macros.
20071         * config/bfin/bfin.c (splitting_loops): New variable.
20072         (bfin_cpus): Add WA_LOAD_LCREGS as needed.
20073         (struct loop_info): Remove members INIT and LOOP_INIT.
20074         (bfin_optimize_loop): Don't set them.  Reorder the code that generates
20075         the LSETUP sequence.  Allow LC to be loaded from any register, but
20076         also add a case to push/pop a PREG scratch if ENABLE_WA_LOAD_LCREGS.
20077         (bfin_reorg_loops): When done, split all BB_ENDs with splitting_loops
20078         set to 1.
20079         * config/bfin/bfin.md (loop_end splitter): Use splitting_loops instead
20080         of reload_completed.
20082         From Jie Zhang:
20083         * config/bfin/bfin.md (movsi_insn): Refine constraints.
20085 2009-04-29  Rafael Avila de Espindola  <espindola@google.com>
20087         * Makefile.in (PLUGIN_VERSION_H): New.
20088         (OBJS-common): Remove plugin-version.o.
20089         (plugin.o): Depend on (PLUGIN_VERSION_H).
20090         (plugin-version.o): Remove.
20091         * configure: Regenerate
20092         * configure.ac: Create plugin-version.h.
20093         * gcc-plugin.h (plugin_gcc_version): Remove.
20094         (plugin_default_version_check): Change signature.
20095         * plugin-version.c: Remove.
20096         * plugin.c: Include plugin-version.h.
20097         (str_plugin_gcc_version_name): Remove.
20098         (try_init_one_plugin): Pass gcc version to plugin_init.
20099         (plugin_default_version_check): Both gcc and plugin versions are now
20100         arguments.
20102 2009-04-29  Bernd Schmidt  <bernd.schmidt@analog.com>
20104         * config/bfin/bfin.c (bfin_optimize_loop): Unify handling of
20105         problematic last insns.  Test for TYPE_CALL rather than CALL_P.
20106         Remove special case testing for last insn of inner loops. Don't fail
20107         if the loop ends with a jump, emit an extra nop instead.
20109         * config/bfin/bfin.c (bfin_register_move_cost): Test for subsets of
20110         DREGS rather than comparing directly.  Remove code that tries to
20111         account for latencies.
20113 2009-04-29  Richard Guenther  <rguenther@suse.de>
20115         PR tree-optimization/39941
20116         * tree-ssa-pre.c (eliminate): Schedule update-ssa after
20117         eliminating an indirect call.
20119 2009-04-29  Richard Guenther  <rguenther@suse.de>
20121         * tree-cfg.c (verify_types_in_gimple_reference): Add require_lvalue
20122         parameter.  Allow invariants as base if !require_lvalue.
20123         (verify_gimple_assign_single): Adjust.
20125 2009-04-29  Bernd Schmidt  <bernd.schmidt@analog.com>
20127         * config/bfin/bfin.md (sp_or_sm, spm_string, spm_name): New macro.
20128         (ss<spm_name>hi3, ss<spm_name>hi3_parts, ss<spm_name>hi3_low_parts,
20129         ss<spm_name_hi3_high_parts): New patterns, replacing ssaddhi3,
20130         ssubhi3, ssaddhi3_parts and sssubhi3_parts.
20131         (flag_mulhi3_parts): Produce a HImode output rather than trying to set
20132         a VEC_SELECT.
20133         * config/bfin/bfin.c (bfin_expand_builtin,
20134         case BFIN_BUILTIN_CPLX_SQU): Adjust accordingly.
20136 2009-04-28  Richard Guenther  <rguenther@suse.de>
20138         * tree-vect-loop.c (get_initial_def_for_induction): Use
20139         correct types for pointer increment.
20141 2009-04-29  Kaveh R. Ghazi  <ghazi@caip.rutgers.edu>
20143         * toplev.c (print_version): Update GMP version string calculation.
20145 2009-04-28  Eric Botcazou  <ebotcazou@adacore.com>
20147         PR rtl-optimization/39938
20148         * resource.c (init_resource_info): Add call to df_analyze.
20150 2009-04-28  Uros Bizjak  <ubizjak@gmail.com>
20152         * config/alpha/alpha.md (usegp): Cast the result of
20153         alpha_find_lo_sum_using_gp to enum attr_usegp.
20154         * config/alpha/alpha.c (override_options): Remove end-of-structure
20155         marker element from cpu_table.  Use array size of cpu_table to handle
20156         -mcpu and -mtune options.
20157         (tls_symbolic_operand_type): Change 0 to TLS_MODEL_NONE.
20159 2009-04-28  Joseph Myers  <joseph@codesourcery.com>
20161         * config.gcc (powerpc*-*-* | rs6000-*-*): Add
20162         rs6000/option-defaults.h to tm_file.  Support cpu_32, cpu_64,
20163         tune_32 and tune_64.
20164         * doc/install.texi (--with-cpu-32, --with-cpu-64): Document
20165         support on PowerPC.
20166         * config/rs6000/rs6000.h (OPTION_DEFAULT_SPECS): Move to ...
20167         * config/rs6000/option-defaults.h: ... here.  New file.
20168         (OPT_64, OPT_32): Define.
20169         (MASK_64BIT): Define to 0 if not already defined.
20170         (OPT_ARCH64, OPT_ARCH32): Define.
20171         (OPTION_DEFAULT_SPECS): Add entries for cpu_32, cpu_64, tune_32
20172         and tune_64.
20174 2009-04-28  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
20176         * config/arm/arm.c (arm_override_options): Emit error on using
20177         fpa with AAPCS.
20179 2009-04-28  Uros Bizjak  <ubizjak@gmail.com>
20181         PR rtl-optimization/39914
20182         * ira-conflicts.c (ira_build_conflicts): Prohibit call used
20183         registers for allocnos created from user-defined variables only
20184         when not optimizing.
20186 2009-04-28  Richard Guenther  <rguenther@suse.de>
20188         PR middle-end/39937
20189         * fold-const.c (fold_binary): Use distribute_real_division only
20190         on float types.
20192 2009-04-28  Steve Ellcey  <sje@cup.hp.com>
20194         * config.gcc (hppa*64*-*-hpux11*): Set use_gcc_stdint and
20195         add hpux-stdint.h to tm_file.
20196         (hppa[12]*-*-hpux11*): Ditto.
20197         (ia64*-*-hpux*): Ditto.
20198         * config/hpux-stdint.h: New.
20199         * config/ia64/hpux.h (TARGET_OS_CPP_BUILTINS): Set
20200         __STDC_EXT__ for all compiles.
20201         * config/pa/pa-hpux.h: Ditto.
20202         * config/pa/pa-hpux10.h: Ditto.
20203         * config/pa/pa-hpux11.h: Ditto.
20205 2009-04-28  Catherine Moore  <clm@codesourcery.com>
20207         * debug.h (set_name): Add comment.
20209 2009-04-28  Andrew Pinski  <pinskia@gmail.com>
20211         PR target/39929
20212         * config/darwin.c (machopic_gen_offset): Check
20213         currently_expanding_to_rtl if current_ir_type returns IR_GIMPLE.
20214         * config/arm/arm.c (require_pic_register): Likewise.
20216 2009-04-28  Paolo Bonzini  <bonzini@gnu.org>
20218         * config/m32c/m32c.c (TARGET_PROMOTE_FUNCTION_RETURN,
20219         m32c_promote_function_return, TARGET_PROMOTE_PROTOTYPES,
20220         m32c_promote_prototypes): Delete.
20222 2009-04-28  Michael Matz  <matz@suse.de>
20224         PR middle-end/39922
20225         * tree-outof-ssa.c (insert_value_copy_on_edge): Don't convert
20226         constants.
20228 2009-04-28  Richard Guenther  <rguenther@suse.de>
20230         * tree-vect-stmts.c (vect_get_vec_def_for_operand): Fix type error.
20232 2009-04-28  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
20234         * config/arm/arm-cores.def: Add support for arm1156t2f-s.
20235         * doc/invoke.texi (ARM Options): Document support for arm1156t2f-s.
20236         * config/arm/arm-tune.md: Regenerate.
20238 2009-04-28  Alexander Monakov  <amonakov@ispras.ru>
20240         * sel-sched-ir.c (maybe_tidy_empty_bb): Do not attempt to delete a
20241         block if there are complex incoming edges.
20242         (sel_merge_blocks): Remove useless assert.
20243         (sel_redirect_edge_and_branch): Check that edge was redirected.
20244         * sel-sched-ir.h (_eligible_successor_edge_p): Remove assert.
20245         (sel_find_rgns): Delete declaration.
20246         * sel-sched.c (purge_empty_blocks): Attempt to remove first block of
20247         the region when it is not a preheader.
20249 2009-04-28  Uros Bizjak  <ubizjak@gmail.com>
20251         PR c/39323
20252         * config/alpha/elf.h (MAX_OFILE_ALIGNMENT): Sync with elfos.h
20254 2009-04-28  Richard Guenther  <rguenther@suse.de>
20256         * tree.h (SSA_NAME_VALUE): Remove.
20257         (struct tree_ssa_name): Remove value_handle member.
20258         * tree-vrp.c (execute_vrp): Initialize/free the value-handle
20259         array for jump threading.
20260         * tree-ssa-propagate.c (ssa_prop_init): Do not initialize
20261         SSA_NAME_VALUEs.
20262         * print-tree.c (print_node): Do not dump SSA_NAME_VALUEs.
20263         * tree-flow.h (threadedge_initialize_values): Declare.
20264         (threadedge_finalize_values): Likewise.
20265         * tree-ssa-threadedge.c (ssa_name_values): New global variable.
20266         (SSA_NAME_VALUE): Define.
20267         (threadedge_initialize_values): New function.
20268         (threadedge_finalize_values): Likewise.
20269         * tree-ssa-dom.c (ssa_name_values): New global variable.
20270         (SSA_NAME_VALUE): Define.
20271         (tree_ssa_dominator_optimize): Initialize/free the value-handle array.
20273 2009-04-28  Ira Rosen  <irar@il.ibm.com>
20275         * tree-vect-loop-manip.c (vect_create_cond_for_alias_checks):
20276         Use REPORT_VECTORIZED_LOCATIONS instead
20277         REPORT_VECTORIZED_LOOPS.
20278         * tree-vectorizer.c (vect_verbosity_level): Make static.
20279         (vect_loop_location): Rename to vect_location.
20280         (vect_set_verbosity_level): Update comment.
20281         (vect_set_dump_settings): Use REPORT_VECTORIZED_LOCATIONS
20282         and vect_location.
20283         (vectorize_loops): Fix comment. Use REPORT_VECTORIZED_LOCATIONS
20284         and vect_location. Use REPORT_UNVECTORIZED_LOCATIONS
20285         instead REPORT_UNVECTORIZED_LOOPS.
20286         * tree-vectorizer.h (enum vect_def_type): Rename vect_invariant_def
20287         and vect_loop_def to vect_external_def and vect_internal_def.
20288         (enum verbosity_levels): Rename REPORT_VECTORIZED_LOOPS
20289         and REPORT_UNVECTORIZED_LOOPS to REPORT_VECTORIZED_LOCATIONS and
20290         REPORT_UNVECTORIZED_LOCATIONS.
20291         (enum vect_relevant): Update comment. Rename vect_unused_in_loop
20292         and vect_used_in_loop and to vect_unused_in_scope and
20293         vect_used_in_scope.
20294         (STMT_VINFO_RELEVANT_P): Use vect_unused_in_scope.
20295         (vect_verbosity_level): Remove declaration.
20296         (vect_analyze_operations): Likewise.
20297         (vect_analyze_stmt): Declare.
20298         * tree-vect-loop.c (vect_determine_vectorization_factor): Use
20299         REPORT_UNVECTORIZED_LOCATIONS.
20300         (vect_get_loop_niters): Fix indentation.
20301         (vect_analyze_loop_form): Use REPORT_UNVECTORIZED_LOCATIONS.
20302         (vect_analyze_loop_operations): New function.
20303         (vect_analyze_loop): Call vect_analyze_loop_operations instead of
20304         vect_analyze_operations.
20305         (vect_is_simple_reduction): Use new names.
20306         (vectorizable_live_operation, vect_transform_loop): Likewise.
20307         * tree-vect-data-refs.c (vect_check_interleaving): Add a return value
20308         to specify whether the data references can be a part of interleaving
20309         chain.
20310         (vect_analyze_data_ref_dependence): Use new names.
20311         (vect_analyze_data_refs_alignment, vect_analyze_data_refs): Likewise.
20312         (vect_create_addr_base_for_vector_ref): Remove redundant code.
20313         * tree-vect-patterns.c (widened_name_p): Use new names.
20314         (vect_recog_dot_prod_pattern): Likewise.
20315         * tree-vect-stmts.c (vect_stmt_relevant_p): Use new names.
20316         (process_use, vect_mark_stmts_to_be_vectorized,
20317         vect_model_simple_cost, vect_model_store_cost,
20318         vect_get_vec_def_for_operand, vect_get_vec_def_for_stmt_copy,
20319         vectorizable_call, vectorizable_conversion, vectorizable_assignment,
20320         vectorizable_operation, vectorizable_type_demotion,
20321         vectorizable_type_promotion, vectorizable_store, vectorizable_load,
20322         vectorizable_condition): Likewise.
20323         (vect_analyze_operations): Split into vect_analyze_loop_operations
20324         and ...
20325         (vect_analyze_stmt): ... new function.
20326         (new_stmt_vec_info): Use new names.
20327         (vect_is_simple_use): Use new names and fix comment.
20328         * tree-vect-slp.c (vect_get_and_check_slp_defs): Use new names.
20329         (vect_build_slp_tree, vect_analyze_slp, vect_schedule_slp): Likewise.
20331 2009-04-28  Uros Bizjak  <ubizjak@gmail.com>
20333         PR target/39911
20334         * config/i386/i386.c (print_operand) ['Z']: Handle floating point
20335         and integer modes for x87 operands.  Do not ICE for unsupported size,
20336         generate error instead.  Generate error for unsupported operand types.
20337         ['z']: Do not handle HImode memory operands specially.  Warning
20338         for floating-point operands.  Fallthru to 'Z' for unsupported operand
20339         types.  Do not ICE for unsupported size, generate error instead.
20340         (output_387_binary_op): Use %Z to output operands.
20341         (output_fp_compare): Ditto.
20342         (output_387_reg_move): Ditto.
20344 2009-04-28  Ben Elliston  <bje@au.ibm.com>
20346         PR c++/35652
20347         Revert:
20349         2009-03-27  Manuel Lopez-Ibanez  <manu@gcc.gnu.org>
20351         * builtins.c (c_strlen): Do not warn here.
20352         * c-typeck.c (build_binary_op): Adjust calls to pointer_int_sum.
20353         * c-common.c (pointer_int_sum): Take an explicit location.
20354         Warn about offsets out of bounds.
20355         * c-common.h (pointer_int_sum): Adjust declaration.
20357 2009-04-27  Ian Lance Taylor  <iant@google.com>
20359         * collect2.c (is_ctor_dtor): Change type of ret field in struct
20360         names to symkind.
20361         * dce.c (run_fast_df_dce): Change type of old_flags to int.
20362         * df-core.c (df_set_flags): Change return type to int.  Change
20363         type of old_flags to int.
20364         (df_clear_flags): Likewise.
20365         * df-scan.c (df_def_record_1): Change 0 to VOIDmode.
20366         (df_get_conditional_uses): Likewise.
20367         * df.h (df_set_flags, df_clear_flags): Update declarations.
20368         * dwarf2out.c (struct indirect_string_node): Change type of form
20369         field to enum dwarf_form.
20370         (AT_string_form): Change return type to enum dwarf_form.
20371         * fixed-value.c (fixed_compare): Add cast to enum type.
20372         * fwprop.c (update_df): Change 0 to VOIDmode.
20373         * gensupport.c: Change 0 to UNKNOWN.
20374         * gimple.h (gimple_cond_code): Add cast to enum type.
20375         * haifa-sched.c (reemit_notes): Add cast to enum type.
20376         * hooks.c (hook_int_void_no_regs): Remove function.
20377         * hooks.h (hook_int_void_no_regs): Remove declaration.
20378         * optabs.c (expand_widen_pattern_expr): Change 0 to VOIDmode.
20379         * predict.c (combine_predictions_for_insn): Add casts to enum type.
20380         * real.c (real_arithmetic): Add cast to enum type.
20381         (real_compare): Likewise.
20382         * target.h (struct gcc_target): Change return type of
20383         branch_target_register_class to enum reg_class.
20384         * target-def.h (TARGET_BRANCH_TARGET_REGISTER_CLASS): Define as
20385         default_branch_target_register_class.
20386         * targhooks.c (default_branch_target_register_class): New function.
20387         * targhooks.h (default_branch_target_register_class): Declare.
20388         * tree-data-ref.c (print_direction_vector): Add cast to enum type.
20389         * tree-vect-data-refs.c (vect_supportable_dr_alignment): Remove
20390         cast to int.
20391         * tree-vect-loop.c (vect_create_epilog_for_reduction): Change 0 to
20392         ERROR_MARK.
20393         * tree-vect-slp.c (vect_build_slp_tree): Change 0 to
20394         vect_uninitialized_def.  Change 0 to ERROR_MARK.
20395         * tree-vect-stmts.c (supportable_widening_operation): Don't
20396         initialize icode1 and icode2.
20397         * tree-vectorizer.h (enum vect_def_type): Add vect_uninitialized_def.
20398         * config/sol2-c.c (cmn_err_length_specs): Change 0 to FMT_LEN_none
20399         and to STD_C89.
20400         (cmn_err_flag_specs): Change 0 to STD_C89.
20401         (cmn_err_char_table): Likewise.
20402         * config/arm/arm.c (get_arm_condition_code): Change type of code
20403         to enum arm_cond_code.
20404         (IWMMXT_BUILTIN): Change 0 to UNKNOWN.
20405         (IWMMXT_BUILTIN2): Likewise.
20406         (neon_builtin_type_bits): Don't define typedef.
20407         (neon_builtin_datum): Change type of bits field to int.
20408         (arm_expand_neon_args): Add cast to enum type.
20409         * config/ia64/ia64.c (tls_symbolic_operand_type): Change 0 to
20410         TLS_MODEL_NONE.
20411         * config/i386/i386.c (bdesc_multi_arg): Change 0 to UNKNOWN.  Add
20412         casts to enum type.
20413         * config/mips/mips.c (LOONGSON_BUILTIN_ALIAS): Change 0 to
20414         MIPS_FP_COND_f.
20415         * config/mips/mips.md (jal_macro): Return enum constant.
20416         (single_insn): Likewise.
20417         * config/rs6000/rs6000.c (bdesc_altivec_preds): Change 0 to
20418         CODE_FOR_nothing.
20419         * config/rs6000/rs6000-c.c (altivec_overloaded_builtins): Add
20420         casts to enum type.
20421         * config/s390/s390.c (s390_tune_flags): Change type to int.
20422         (s390_arch_flags): Likewise.
20423         (s390_handle_arch_option): Change flags field of struct pta to int.
20424         * config/s390/s390.h (s390_tune_flags): Update declaration.
20425         (s390_arch_flags): Likewise.
20426         * config/sh/sh.c (prepare_move_operands): Compare
20427         tls_symbolic_operand result with enum constant.
20428         (sh_reorg): Change PUT_MODE to PUT_REG_NOTE_KIND.
20429         (sh_expand_prologue): Add cast to enum type.
20430         (sh_expand_epilogue): Likewise.
20431         (tls_symbolic_operand): Change return type to enum tls_model.
20432         (fpscr_set_from_mem): Add cast to enum type.
20433         (legitimize_pic_address): Compare tls_symbolic_operand result with
20434         enum constant.
20435         (sh_target_reg_class): Change return type to enum reg_class.
20436         * config/sh/sh.h (OVERRIDE_OPTIONS): Change CPU_xxx to
20437         PROCESSOR_xxx.
20438         * config/sh/sh-protos.h (tls_symbolic_operand): Update declaration.
20439         * config/sparc/sparc.c (sparc_override_options): Add cast to enum type.
20440         * config/sparc/sparc.md (empty_delay_slot): Return enum constant.
20441         (pic, calls_alloca, calls_eh_return, leaf_function): Likewise.
20442         (delayed_branch, tls_call_delay): Likewise.
20443         (eligible_for_sibcall_delay): Likewise.
20444         (eligible_for_return_delay): Likewise.
20445         * config/spu/spu.c (expand_builtin_args): Add cast to enum type.
20446         (spu_expand_builtin_1): Likewise.
20448         * c-typeck.c (convert_for_assignment): Issue -Wc++-compat warnings
20449         for all types of conversions.
20450         (output_init_element): Issue -Wc++-compat warning if needed when
20451         initializing a bitfield with enum type.
20452         * c-parser.c (c_parser_expression): Set original_type to
20453         original_type of right hand operand of comma operator.
20455 2009-04-27  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
20457         * doc/c-tree.texi (Types, Functions, Expression trees): Fix
20458         grammar nits.
20459         * doc/cfg.texi (Maintaining the CFG, Liveness information): Likewise.
20460         * doc/cpp.texi (Standard Predefined Macros)
20461         (Implementation-defined behavior): Likewise.
20462         * doc/extend.texi (Function Attributes, Type Attributes): Likewise.
20463         * doc/gimple.texi (GIMPLE Exception Handling)
20464         (@code{GIMPLE_ASSIGN}): Likewise.
20465         * doc/install.texi (Prerequisites, Configuration, Specific): Likewise.
20466         * doc/invoke.texi (Warning Options, Optimize Options)
20467         (AVR Options, Darwin Options): Likewise.
20468         (Optimize Options): Reformulate -fwhole-program description.
20469         * doc/loop.texi (Lambda): Likewise.
20470         * doc/md.texi (Output Template, Define Constraints)
20471         (Standard Names, Insn Splitting): Likewise.
20472         * doc/options.texi (Option properties): Likewise.
20473         * doc/passes.texi (Tree-SSA passes): Likewise.
20474         * doc/rtl.texi (Side Effects, Assembler, Insns): Likewise.
20475         * doc/tm.texi (Register Classes, Old Constraints, Scalar Return)
20476         (File Names and DBX): Likewise.
20477         * doc/trouble.texi (Incompatibilities): Likewise.
20479 2009-04-27  Trevor Smigiel  <trevor_smigiel@playstation.sony.com>
20481         * spu.c (spu_machine_dependent_reorg): Make sure branch label on hint
20482         instruction is correct.
20484 2009-04-27  Trevor Smigiel  <trevor_smigiel@playstation.sony.com>
20486         Allow non-constant arguments to conversion intrinsics.
20487         * spu-protos.h (exp2_immediate_p, spu_gen_exp2): Declare.
20488         * predicates.md (spu_inv_exp2_operand, spu_exp2_operand): New.
20489         * spu.c (print_operand): Handle 'v' and 'w'.
20490         (exp2_immediate_p, spu_gen_exp2): Define.
20491         * spu-builtins.def (spu_convts, spu_convtu, spu_convtf_0,
20492         spu_convtf_1): Update parameter descriptions.
20493         * spu-builtins.md (spu_csflt, spu_cuflt, spu_cflts, spu_cfltu): Update.
20494         * constraints.md ('v', 'w'): New.
20495         * spu.md (UNSPEC_CSFLT, UNSPEC_CFLTS, UNSPEC_CUFLT, UNSPEC_CFLTU):
20496         Remove.
20497         (i2f, I2F): New define_mode_attr.
20498         (floatsisf2, floatv4siv4sf2, fix_truncsfsi2, fix_truncv4sfv4si2,
20499         floatunssisf2, floatunsv4siv4sf2, fixuns_truncsfsi2,
20500         fixuns_truncv4sfv4si2):  Update to use mode attribute.
20501         (float<mode><i2f>2_mul, float<mode><i2f>2_div,
20502         fix_trunc<mode><f2i>2_mul, floatuns<mode><i2f>2_mul,
20503         floatuns<mode><i2f>2_div, fixuns_trunc<mode><f2i>2_mul): New
20504         patterns for combine.
20506 2009-04-27  Steven Bosscher  <steven@gcc.gnu.org>
20508         * dbgcnt.def (cprop1, cprop2, gcse, jump_bypass): Remove
20509         (cprop, hoist, pre, store_motion): New debug counters.
20510         * tree-pass.h (pass_tracer): Move to list of gimple passes, it
20511         is not an RTL pass anymore.
20512         (pass_profiling): Remove extern decl for pass removed in 2005.
20513         (pass_gcse, pass_jump_bypass): Remove.
20514         * final.c (rest_of_clean_state): Set flag_rerun_cse_after_global_opts
20515         to 0 for clean state.
20516         * toplev.h (flag_rerun_cse_after_global_opts): Add extern declaration.
20517         * cse.c (gate_handle_cse_after_global_opts,
20518         rest_of_handle_cse_after_global_opts): New functions.
20519         (pass_cse_after_global_opts): New pass, does local CSE.
20520         * timevar.def (TV_GCSE, TV_CPROP1, TV_CPROP2, TV_BYPASS): Remove.
20521         (TV_CPROP): New timevar.
20522         * gcse.c (flag_rerun_cse_after_global_opts): New global variable.
20523         (run_jump_opt_after_gcse, max_gcse_regno): Remove global vars.
20524         (gcse_main, recompute_all_luids): Remove.
20525         (compute_hash_table_work): Call max_reg_num instead of reading
20526         max_gcse_regno.
20527         (cprop_jump): Don't set run_jump_opt_after_gcse.
20528         (constprop_register): Always allow to alter jumps.
20529         (cprop_insn): Likewise.
20530         (do_local_cprop): Likewise.
20531         (local_cprop_pass): Likewise.  Return non-zero if something changed.
20532         (cprop): Remove function, fold interesting bits into one_cprop_pass.
20533         (find_implicit_sets): Add note about missed optimization opportunity.
20534         (one_cprop_pass): Rewrite to be "the" CPROP pass, called from the
20535         pass_rtl_cprop execute function.
20536         Don't bother tracking the pass number, each pass gets its own dumpfile
20537         now anyway.
20538         Always allow to alter jumpsand bypass jumps.
20539         (bypass_block): Don't ignore regno >= max_gcse_regno, find_bypass_set
20540         will just find no suitable set.
20541         (pre_edge_insert): Fix dumping, this function is for PRE only.
20542         (one_pre_gcse_pass): Rewrite to be "the" PRE pass, called from the
20543         pass_rtl_pre execute function.
20544         (hoist_code): Return non-zero if something changed.  Keep track of
20545         substitutions and insertions for statistics gathering similar to PRE.
20546         (one_code_hoisting_pass): Rewrite to be "the" code hoisting pass,
20547         called from the pass_rtl_hoist execute function.  Show pass statistics.
20548         (compute_store_table): Use max_reg_num directly instead of using the
20549         formerly global max_gcse_regno.
20550         (build_store_vectors): Likewise.
20551         (replace_store_insn): Fix dumping.
20552         (store_motion): Rename to ...
20553         (one_store_motion_pass): ... this.  Rewrite to be "the" STORE_MOTION
20554         pass, called from the pass_rtl_store_motion execute function.  Keep
20555         track of substitutions and insertions for statistics gathering similar
20556         to PRE.
20557         (bypass_jumps): Remove, fold interesting bits into ...
20558         (one_cprop_pass): ... this.  Rewrite to be "the" CPROP pass, called
20559         from the pass_rtl_cprop execute function.
20560         (gate_handle_jump_bypass, rest_of_handle_jump_bypass,
20561         pass_jump_bypass): Remove.
20562         (gate_handle_gcse, rest_of_handle_gcse): Remove.
20563         (gate_rtl_cprop, execute_rtl_cprop, pass_rtl_cprop): New.
20564         (gate_rtl_pre, execute_rtl_pre, pass_rtl_pre): New.
20565         (gate_rtl_hoist, execute_rtl_hoist, pass_rtl_hoist): New.
20566         (gate_rtl_store_motion, execute_rtl_store_motion,
20567         pass_rtl_store_motion): New.
20568         * common.opt: Remove flag_cse_skip_blocks, adjust documentation to
20569         make it clear that -fcse-skip-blocks is a no-op for backward compat.
20570         * passes.c (init_optimization_passes): Remove pass_gcse and
20571         pass_jump_bypass.  Schedule cprop, pre, hoist, cprop, store_motion,
20572         and cse_after_global_opts in place of pass_gcse.  Schedule cprop
20573         instead of pass_jump_bypass.
20575 2009-04-27  Richard Guenther  <rguenther@suse.de>
20577         PR middle-end/39928
20578         * gimplify.c (gimplify_expr): If we are required to create
20579         a temporary make sure it ends up as register.
20581 2009-04-27  H.J. Lu  <hongjiu.lu@intel.com>
20583         PR target/39903
20584         * config/i386/i386.c (construct_container): Don't call
20585         gen_reg_or_parallel with BLKmode on X86_64_SSE_CLASS,
20586         X86_64_SSESF_CLASS and X86_64_SSEDF_CLASS.
20588 2009-04-27  Michael Matz  <matz@suse.de>
20590         * ssaexpand.h (struct ssaexpand): Member 'values' is a bitmap.
20591         (get_gimple_for_ssa_name): Adjust, lookup using SSA_NAME_DEF_STMT.
20592         * tree-ssa-live.h (find_replaceable_exprs): Return a bitmap.
20593         (dump_replaceable_exprs): Take a bitmap.
20594         * cfgexpand.c (gimple_cond_pred_to_tree): Handle bitmap instead of
20595         array.
20596         (expand_gimple_basic_block): Likewise.
20597         * tree-ssa-ter.c (struct temp_expr_table_d): Make
20598         replaceable_expressions member a bitmap.
20599         (free_temp_expr_table): Pass back and deal with bitmap, not gimple*.
20600         (mark_replaceable): Likewise.
20601         (find_replaceable_in_bb, dump_replaceable_exprs): Likewise.
20602         * tree-outof-ssa.c (remove_ssa_form): 'values' is a bitmap.
20604 2009-04-27  Richard Guenther  <rguenther@suse.de>
20606         * tree-cfg.c (remove_useless_stmts): Verify stmts afterwards.
20607         (verify_stmts): Dispatch to gimple/type verification code.
20608         * tree-inline.c (remap_gimple_op_r): Work around C++ FE
20609         issue with call argument types.
20611 2009-04-27  Michael Matz  <matz@suse.de>
20613         * tree-into-ssa.c (regs_to_rename, mem_syms_to_rename): Remove.
20614         (init_update_ssa, delete_update_ssa, update_ssa): Remove references
20615         to above.
20617 2009-04-27  Richard Sandiford  <rdsandiford@googlemail.com>
20618             Eric Botcazou  <ebotcazou@adacore.com>
20620         * resource.c (find_basic_block): Use BLOCK_FOR_INSN to look up
20621         a label's basic block.
20622         (mark_target_live_regs): Tidy and rework obsolete comments.
20623         Change back DF problem to LIVE.  If a label starts a basic block,
20624         assume that all registers that used to be live then still are.
20625         (init_resource_info): If a label starts a basic block, set its
20626         BLOCK_FOR_INSN accordingly.
20627         (fini_resource_info): Undo the setting of BLOCK_FOR_INSN.
20629 2009-04-27  Richard Guenther  <rguenther@suse.de>
20631         * tree-flow-inline.h (function_ann): Remove.
20632         (get_function_ann): Likewise.
20633         * tree-dfa.c (create_function_ann): Remove.
20634         * tree-flow.h (struct static_var_ann_d): Remove.
20635         (struct function_ann_d): Likewise.
20636         (union tree_ann_d): Remove fdecl member.
20637         (function_ann_t): Remove.
20638         (function_ann, get_function_ann, create_function_ann): Remove
20639         declarations.
20641 2009-04-27  Uros Bizjak  <ubizjak@gmail.com>
20643         * config/alpha/alpha.c (code_for_builtin): Declare as enum insn_code.
20645 2009-04-27  Jan Hubicka  <jh@suse.cz>
20647         * ipa-pure-const.c (struct funct_state_d): New fields
20648         state_previously_known, looping_previously_known; remove
20649         state_set_in_source.
20650         (analyze_function): Use new fields.
20651         (propagate): Avoid assumption that state_set_in_source imply
20652         nonlooping.
20654         * tree-ssa-loop-niter.c (finite_loop_p): New function.
20655         * tree-ssa-loop-ivcanon.c (empty_loop_p): Use it.
20656         * cfgloop.h (finite_loop_p): Declare.
20658 2009-04-26  Michael Matz  <matz@suse.de>
20660         * tree-flow.h (tree_ann_common_d): Remove aux and value_handle members.
20662 2009-04-26  Michael Matz  <matz@suse.de>
20664         * tree-pass.h (pass_del_ssa, pass_mark_used_blocks,
20665         pass_free_cfg_annotations, pass_free_datastructures): Remove decls.
20666         * gimple-low.c (mark_blocks_with_used_vars, mark_used_blocks,
20667         pass_mark_used_blocks): Remove.
20668         * tree-optimize.c (pass_free_datastructures,
20669         execute_free_cfg_annotations, pass_free_cfg_annotations): Remove.
20670         * passes.c (init_optimization_passes): Don't call
20671         pass_mark_used_blocks, remove dead code.
20673 2009-04-26  H.J. Lu  <hongjiu.lu@intel.com>
20675         * tree-outof-ssa.c (rewrite_trees): Add ATTRIBUTE_UNUSED.
20676         * tree-ssa-live.h (register_ssa_partition): Likewise.
20678 2009-04-26  Michael Matz  <matz@suse.de>
20680         Expand from SSA.
20681         * builtins.c (fold_builtin_next_arg): Handle SSA names.
20682         * tree-ssa-copyrename.c (rename_ssa_copies): Use ssa_name() directly.
20683         * tree-ssa-coalesce.c (create_outofssa_var_map): Mark only useful
20684         SSA names.
20685         (compare_pairs): Swap cost comparison.
20686         (coalesce_ssa_name): Don't use change_partition_var.
20687         * tree-nrv.c (struct nrv_data): Add modified member.
20688         (finalize_nrv_r): Set it.
20689         (tree_nrv): Use it to update statements.
20690         (pass_nrv): Require PROP_ssa.
20691         * tree-mudflap.c (mf_decl_cache_locals,
20692         mf_build_check_statement_for): Use make_rename_temp.
20693         (pass_mudflap_2): Require PROP_ssa, run ssa update at finish.
20694         * alias.c (find_base_decl): Handle SSA names.
20695         * emit-rtl (set_reg_attrs_for_parm): Make non-static.
20696         (component_ref_for_mem_expr): Don't leak SSA names into RTL.
20697         * rtl.h (set_reg_attrs_for_parm): Declare.
20698         * tree-optimize.c (pass_cleanup_cfg_post_optimizing): Rename
20699         to "optimized", remove unused locals at finish.
20700         (execute_free_datastructures): Make global, call
20701         delete_tree_cfg_annotations.
20702         (execute_free_cfg_annotations): Don't call
20703         delete_tree_cfg_annotations.
20705         * ssaexpand.h: New file.
20706         * expr.c (toplevel): Include ssaexpand.h.
20707         (expand_assignment): Handle SSA names the same as register variables.
20708         (expand_expr_real_1): Expand SSA names.
20709         * cfgexpand.c (toplevel): Include ssaexpand.h.
20710         (SA): New global variable.
20711         (gimple_cond_pred_to_tree): Fold TERed comparisons into predicates.
20712         (SSAVAR): New macro.
20713         (set_rtl): New helper function.
20714         (add_stack_var): Deal with SSA names, use set_rtl.
20715         (expand_one_stack_var_at): Likewise.
20716         (expand_one_stack_var): Deal with SSA names.
20717         (stack_var_size_cmp): Use code (SSA_NAME / DECL) as tie breaker
20718         before unique numbers.
20719         (expand_stack_vars): Use set_rtl.
20720         (expand_one_var): Accept SSA names, add asserts for them, feed them
20721         to above subroutines.
20722         (expand_used_vars): Expand all partitions (without default defs),
20723         then only the local decls (ignoring those expanded already).
20724         (expand_gimple_cond): Remove edges when jumpif() expands an
20725         unconditional jump.
20726         (expand_gimple_basic_block): Don't clear EDGE_EXECUTABLE here,
20727         or remove abnormal edges.  Ignore insns setting the LHS of a TERed
20728         SSA name.
20729         (gimple_expand_cfg): Call into rewrite_out_of_ssa, initialize
20730         members of SA; deal with PARM_DECL partitions here; expand
20731         all PHI nodes, free tree datastructures and SA.  Commit instructions
20732         on edges, clear EDGE_EXECUTABLE and remove abnormal edges here.
20733         (pass_expand): Require and destroy PROP_ssa, verify SSA form, flow
20734         info and statements at start, collect garbage at finish.
20735         * tree-ssa-live.h (struct _var_map): Remove partition_to_var member.
20736         (VAR_ANN_PARTITION) Remove.
20737         (change_partition_var): Don't declare.
20738         (partition_to_var): Always return SSA names.
20739         (var_to_partition): Only accept SSA names.
20740         (register_ssa_partition): Only check argument.
20741         * tree-ssa-live.c (init_var_map): Don't allocate partition_to_var
20742         member.
20743         (delete_var_map): Don't free it.
20744         (var_union): Only accept SSA names, simplify.
20745         (partition_view_init): Mark only useful SSA names as used.
20746         (partition_view_fini): Only deal with SSA names.
20747         (change_partition_var): Remove.
20748         (dump_var_map): Use ssa_name instead of partition_to_var member.
20749         * tree-ssa.c (delete_tree_ssa): Don't remove PHI nodes on RTL
20750         basic blocks.
20751         * tree-outof-ssa.c (toplevel): Include ssaexpand.h and expr.h.
20752         (struct _elim_graph): New member const_dests; nodes member vector of
20753         ints.
20754         (set_location_for_edge): New static helper.
20755         (create_temp): Remove.
20756         (insert_partition_copy_on_edge, insert_part_to_rtx_on_edge,
20757         insert_value_copy_on_edge, insert_rtx_to_part_on_edge): New functions.
20758         (new_elim_graph): Allocate const_dests member.
20759         (clean_elim_graph): Truncate const_dests member.
20760         (delete_elim_graph): Free const_dests member.
20761         (elim_graph_size): Adapt to new type of nodes member.
20762         (elim_graph_add_node): Likewise.
20763         (eliminate_name): Likewise.
20764         (eliminate_build): Don't take basic block argument, deal only with
20765         partition numbers, not variables.
20766         (get_temp_reg): New static helper.
20767         (elim_create): Use it, deal with RTL temporaries instead of trees.
20768         (eliminate_phi): Adjust all calls to new signature.
20769         (assign_vars, replace_use_variable, replace_def_variable): Remove.
20770         (rewrite_trees): Only do checking.
20771         (edge_leader, stmt_list, leader_has_match, leader_match): Remove.
20772         (same_stmt_list_p, identical_copies_p, identical_stmt_lists_p,
20773         init_analyze_edges_for_bb, fini_analyze_edges_for_bb,
20774         contains_tree_r, MAX_STMTS_IN_LATCH,
20775         process_single_block_loop_latch, analyze_edges_for_bb,
20776         perform_edge_inserts): Remove.
20777         (expand_phi_nodes): New global function.
20778         (remove_ssa_form): Take ssaexpand parameter.  Don't call removed
20779         functions, initialize new parameter, remember partitions having a
20780         default def.
20781         (finish_out_of_ssa): New global function.
20782         (rewrite_out_of_ssa): Make global.  Adjust call to remove_ssa_form,
20783         don't reset in_ssa_p here, don't disable TER when mudflap.
20784         (pass_del_ssa): Remove.
20785         * tree-flow.h (struct var_ann_d): Remove out_of_ssa_tag and
20786         partition members.
20787         (execute_free_datastructures): Declare.
20788         * Makefile.in (SSAEXPAND_H): New variable.
20789         (tree-outof-ssa.o, expr.o, cfgexpand.o): Depend on SSAEXPAND_H.
20790         * basic-block.h (commit_one_edge_insertion): Declare.
20791         * passes.c (init_optimization_passes): Move pass_nrv and
20792         pass_mudflap2 before pass_cleanup_cfg_post_optimizing, remove
20793         pass_del_ssa, pass_free_datastructures, pass_free_cfg_annotations.
20794         * cfgrtl.c (commit_one_edge_insertion): Make global, don't declare.
20795         (redirect_branch_edge): Deal with super block when expanding, split
20796         out jump patching itself into ...
20797         (patch_jump_insn): ... here, new static helper.
20799 2009-04-26  Michael Matz  <matz@suse.de>
20801         * tree-ssa-copyrename.c (rename_ssa_copies): Don't iterate
20802         beyond num_ssa_names.
20803         * tree-ssa-ter.c (free_temp_expr_table): Likewise.
20804         * tree-ssa-coalesce.c (create_outofssa_var_map): Likewise.
20806 2009-04-26  Jakub Jelinek  <jakub@redhat.com>
20808         PR inline-asm/39543
20809         * fwprop.c (forward_propagate_asm): New function.
20810         (forward_propagate_and_simplify): Propagate also into __asm, if it
20811         doesn't increase the number of referenced registers.
20813         PR c/39889
20814         * stmt.c (warn_if_unused_value): Look through NON_LVALUE_EXPR.
20816 2009-04-26  Jakub Jelinek  <jakub@redhat.com>
20818         * tree-nested.c (get_nonlocal_vla_type): If not optimizing, call
20819         note_nonlocal_vla_type for nonlocal VLAs.
20820         (note_nonlocal_vla_type, note_nonlocal_block_vlas,
20821         contains_remapped_vars, remap_vla_decls): New functions.
20822         (convert_nonlocal_reference_stmt): If not optimizing, call
20823         note_nonlocal_block_vlas on GIMPLE_BIND block vars.
20824         (nesting_copy_decl): Return {VAR,PARM,RESULT}_DECL unmodified
20825         if it wasn't found in var_map.
20826         (finalize_nesting_tree_1): Call remap_vla_decls.  If outermost
20827         GIMPLE_BIND doesn't have gimple_bind_block, chain debug_var_chain
20828         to BLOCK_VARS (DECL_INITIAL (root->context)) instead of calling
20829         declare_vars.
20830         * gimplify.c (nonlocal_vlas): New variable.
20831         (gimplify_var_or_parm_decl): Add debug VAR_DECLs for non-local
20832         referenced VLAs.
20833         (gimplify_body): Create and destroy nonlocal_vlas.
20835         * dwarf2out.c (loc_descr_plus_const): New function.
20836         (build_cfa_aligned_loc, tls_mem_loc_descriptor,
20837         mem_loc_descriptor, loc_descriptor_from_tree_1,
20838         descr_info_loc, gen_variable_die): Use it.
20840         * tree.h (DECL_BY_REFERENCE): Note that it is also valid for
20841         !TREE_STATIC VAR_DECLs.
20842         * dwarf2out.c (loc_by_reference, gen_decl_die): Handle
20843         DECL_BY_REFERENCE on !TREE_STATIC VAR_DECLs.
20844         (gen_variable_die): Likewise.  Don't look at TREE_PRIVATE if
20845         DECL_BY_REFERENCE is valid.
20846         * dbxout.c (DECL_ACCESSIBILITY_CHAR): Don't look at TREE_PRIVATE
20847         for PARM_DECLs, RESULT_DECLs or !TREE_STATIC VAR_DECLs.
20848         * tree-nested.c (get_nonlocal_debug_decl, get_local_debug_decl):
20849         Copy DECL_BY_REFERENCE.
20850         (struct nesting_copy_body_data): New type.
20851         (nesting_copy_decl): New function.
20852         (finalize_nesting_tree_1): Remap types of debug_var_chain variables,
20853         if they have variable length.
20855 2009-04-26  Michael Matz  <matz@suse.de>
20857         * tree-sra.c (sra_build_assignment): Don't use into_ssa mode,
20858         mark new temporaries for renaming.
20860 2009-04-26  Joseph Myers  <joseph@codesourcery.com>
20862         PR c/39581
20863         * c-decl.c (global_bindings_p): Return negative value.
20864         (c_variable_size): New.  Based on variable_size from
20865         stor-layout.c.
20866         (grokdeclarator): Call c_variable_size not variable_size.
20868 2009-04-26  Uros Bizjak  <ubizjak@gmail.com>
20870         * config/i386/i386.c (print_operand) ['z']: Fix typo.
20872 2009-04-26  Kai Tietz  <kai.tietz@onevision.com>
20874         * config/i386/mingw-w64.h (STANDARD_INCLUDE_DIR):
20875         Redefine it to just use mingw/include.
20876         (ASM_SPEC): Rules for -m32 and -m64.
20877         (LINK_SPEC): Use Likewise.
20878         (SPEC_32): New define.
20879         (SPEC_64): Likewise.
20880         (SUB_LINK_SPEC): Likewise.
20881         (MULTILIB_DEFAULTS): New define.
20882         * config/i386/t-mingw-w64 (MULTILIB_OPTIONS):
20883         Add multilib options.
20884         (MULTILIB_DIRNAMES): Likewise.
20885         (MULTILIB_OSDIRNAMES): Likewise.
20886         (LIBGCC): Likewise.
20887         (INSTALL_LIBGCC): Likewise.
20889 2009-04-26  Joseph Myers  <joseph@codesourcery.com>
20891         PR c/39556
20892         * c-tree.h (enum c_inline_static_type): New.
20893         (record_inline_static): Declare.
20894         * c-decl.c (struct c_inline_static, c_inline_statics,
20895         record_inline_static, check_inline_statics): New.
20896         (pop_file_scope): Call check_inline_statics.
20897         (start_decl): Call record_inline_static instead of pedwarning
20898         directly for static in inline function.
20899         * c-typeck.c (build_external_ref): Call record_inline_static
20900         instead of pedwarning directly for static referenced in inline
20901         function.
20903 2009-04-26  Steven Bosscher  <steven@gcc.gnu.org>
20905         * df-scan.c (df_insn_rescan): Salvage insn's LUID if the insn is
20906         not new but only being rescanned.
20907         * gcse.c (uid_cuid, max_uid, INSN_CUID, max_cuid, struct reg_set,
20908         reg_set_table, REG_SET_TABLE_SLOP, reg_set_in_block,
20909         alloc_reg_set_mem, free_reg_set_mem, record_one_set,
20910         record_set_info, compute_set, grealloc): Remove.
20911         (recompute_all_luids): New function.
20912         (gcse_main): Don't compute sets, and don't do related memory
20913         allocations/free-ing.  If something changed before the end of the
20914         pass, update LUIDs using recompute_all_luids.
20915         (alloc_gcse_mem): Don't compute LUIDs.  Don't allocate reg_set memory.
20916         (free_gcse_mem): Don't free it either.
20917         (oprs_unchanged_p, load_killed_in_block, record_last_reg_set_info):
20918         Use the df insn LUIDs.
20919         (load_killed_in_block): Likewise.
20920         (compute_hash_table_work): Don't compute reg_set_in_block.
20921         (compute_transp): Use DF_REG_DEF_CHAINs.
20922         (local_cprop_pass): Don't use compute_sets and related functions.
20923         (one_cprop_pass, pre_gcse, one_pre_gcse_pass, one_code_hoisting_pass):
20924         Use get_max_uid() instead of max_cuid.
20925         (insert_insn_end_basic_block, pre_insert_copy_insn,
20926         update_ld_motion_stores): Don't try to
20927         keep reg_set tables up to date.
20928         (pre_insert_copies): Use df insn LUIDs.
20929         (sbitmap pre_redundant_insns): Replace with uses of INSN_DELETED_P.
20930         (reg_set_info): Don't use extra bitmap argument.
20931         (compute_store_table): Don't compute reg_set_in_block.  Use DF scan
20932         information to compute regs_set_in_block.
20933         (free_store_memory, store_motion): Don't nullify reg_set_in_block.
20934         (bypass_jumps): Don't use compute_sets and friends.
20936 2009-04-26  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
20938         PR testsuite/39710
20939         * opts.c (undocumented_msg): Do not leave blank even with
20940         ENABLE_CHECKING.
20942 2009-04-25  Joseph Myers  <joseph@codesourcery.com>
20944         * c-decl.c (build_enumerator): Allow values folding to integer
20945         constants but not integer constant expressions with a pedwarn if
20946         pedantic.
20948 2009-04-25  Joseph Myers  <joseph@codesourcery.com>
20950         PR c/39582
20951         * c-typeck.c (c_expr_sizeof_type): Create a C_MAYBE_CONST_EXPR
20952         with non-null C_MAYBE_CONST_EXPR_PRE if size of a variable-length
20953         type is an integer constant.
20955 2009-04-25  Uros Bizjak  <ubizjak@gmail.com>
20957         PR target/39897
20958         * config/i386/i386.c (print_operand) ['z']: Revert handling of
20959         HImode operands.
20961 2009-04-25  Joseph Myers  <joseph@codesourcery.com>
20963         PR c/39564
20964         * c-decl.c (grokdeclarator): Diagnose declarations of functions
20965         with variably modified return type and no storage class
20966         specifiers, except for the case of nested functions.  Distinguish
20967         extern declarations of functions with variably modified return
20968         types from those of objects with variably modified types.
20970 2009-04-25  Jan Hubicka  <jh@suse.cz>
20972         * tree.c (list_equal_p): New function.
20973         * tree.h (list_equal_p): Declare.
20974         * coretypes.h (edge_def, edge, const_edge, basic_block_def
20975         basic_block_def, basic_block, const_basic_block): New.
20976         * tree-eh.c (make_eh_edge): EH edges are not abnormal.
20977         (redirect_eh_edge): New function.
20978         (make_eh_edge_update_phi): EH edges are not abnormal.
20979         * except.c: Include tree-flow.h.
20980         (list_match): New function.
20981         (eh_region_replaceable_by_p): New function.
20982         (replace_region): New function.
20983         (hash_type_list): New function.
20984         (hash_eh_region): New function.
20985         (eh_regions_equal_p): New function.
20986         (merge_peers): New function.
20987         (remove_unreachable_regions): Verify EH tree when checking;
20988         merge peers.
20989         (copy_eh_region_1): New function.
20990         (copy_eh_region): New function.
20991         (push_reachable_handler): New function.
20992         (build_post_landing_pads, dw2_build_landing_pads): Be ready for
20993         regions without label but with live RESX.
20994         * except.h (redirect_eh_edge_to_label): New.
20995         * tree-flow.h (redirect_eh_edge): New.
20996         * coretypes.h (edge_def, edge, const_edge, basic_block_def
20997         basic_block_def, basic_block, const_basic_block): Remove.
20998         * Makefile.in (except.o): Add dependency on tree-flow.h
20999         * tree-cfg.c (gimple_redirect_edge_and_branch): Handle EH edges.
21000         * basic-block.h (edge, const_edge, basic_block, const_basic_block):
21001         Remove.
21003 2009-04-25  Eric Botcazou  <ebotcazou@adacore.com>
21005         PR bootstrap/39645
21006         * config/sparc/sparc.c (sparc_gimplify_va_arg): Set TREE_ADDRESSABLE
21007         on the destination of memcpy.
21009 2009-04-25  Paolo Bonzini  <bonzini@gnu.org>
21011         * doc/tm.texi (REGNO_OK_FOR_BASE_P, REGNO_MODE_OK_FOR_BASE_P,
21012         REGNO_MODE_OK_FOR_REG_BASE_P, REGNO_MODE_CODE_OK_FOR_BASE_P,
21013         REGNO_OK_FOR_INDEX_P): Mention strict/nonstrict difference.
21015 2009-04-25  Jan Hubicka  <jh@suse.cz>
21017         * tree-eh.c (tree_remove_unreachable_handlers): Handle shared labels.
21018         (tree_empty_eh_handler_p): Allow non-EH predecestors; allow region
21019         to be reached by different label than left.
21020         (update_eh_edges): Update comment; remove edge_to_remove if possible
21021         and return true if suceeded.
21022         (cleanup_empty_eh): Accept sharing map; handle shared regions.
21023         (cleanup_eh): Compute sharing map.
21024         * except.c (remove_eh_handler_and_replace): Add argument if we should
21025         update regions.
21026         (remove_unreachable_regions): Update for label sharing.
21027         (label_to_region_map): Likewise.
21028         (get_next_region_sharing_label): New function.
21029         (remove_eh_handler_and_replace): Add update_catch_try parameter; update
21030         prev_try pointers.
21031         (remove_eh_handler): Update.
21032         (remove_eh_region_and_replace_by_outer_of): New function.
21033         * except.h (struct eh_region): Add next_region_sharing_label.
21034         (remove_eh_region_and_replace_by_outer_of,
21035         get_next_region_sharing_label): Declare.
21036         * tree-cfgcleanup.c (tree_forwarder_block_p): Simplify.
21038 2009-04-25  Jan Hubicka  <jh@suse.cz>
21040         * tree-cfg.c (split_critical_edges): Split also edges where we can't
21041         insert code even if they are not critical.
21043 2009-04-25  Jan Hubicka  <jh@suse.cz>
21045         * tree-cfg.c (gimple_can_merge_blocks_p): EH edges are unmergable.
21046         (gimple_can_remove_branch_p): EH edges won't remove branch by
21047         redirection.
21048         * tree-inline.c (update_ssa_across_abnormal_edges): Do handle
21049         updating of non-abnormal EH edges.
21050         * tree-cfg.c (gimple_can_merge_blocks_p): EH edges are unmergable.
21051         (gimple_can_remove_branch_p): EH edges are unremovable by redirection.
21052         (split_critical_edges): Split also edges where emitting code on them
21053         will lead to splitting later.
21055 2009-04-25  Uros Bizjak  <ubizjak@gmail.com>
21056             H.J. Lu  <hongjiu.lu@intel.com>
21058         PR target/39590
21059         * configure.ac (HAVE_AS_IX86_FILDQ): On x86 targets check whether
21060         the configured assembler supports fildq and fistpq mnemonics.
21061         (HAVE_AS_IX86_FILDS): Rename from HAVE_GAS_FILDS_FISTS.
21062         * configure: Regenerated.
21063         * config.in: Ditto.
21065         * config/i386/i386.c (print_operand): Handle 'Z'.
21066         ['z']: Remove handling of special fild/fist suffixes.
21067         (output_fix_trunc): Use '%Z' to output suffix of fist{,p,tp} insn.
21068         * config/i386/i386.md (*floathi<mode>2_i387): Use '%Z' to output
21069         suffix of fild insn.
21070         (*floatsi<mode>2_vector_mixed): Ditto.
21071         (*float<SSEMODEI24:mode><MODEF:mode>2_mixed_interunit): Ditto.
21072         (*float<SSEMODEI24:mode><MODEF:mode>2_mixed_nointerunit): Ditto.
21073         (*float<SSEMODEI24:mode><X87MODEF:mode>2_i387_with_temp): Ditto.
21074         (*float<SSEMODEI24:mode><X87MODEF:mode>2_i387): Ditto.
21075         * config/i386/gas.h (GAS_MNEMONICS): Remove.
21077 2009-04-25  Ben Elliston  <bje@au.ibm.com>
21079         * genrecog.c (validate_pattern): Do not warn for VOIDmode CALLs as
21080         the source of a set operation.
21082 2009-04-25  Anatoly Sokolov  <aesok@post.ru>
21084         * target.h (struct gcc_target): Add case_values_threshold field.
21085         * target-def.h (TARGET_CASE_VALUES_THRESHOLD): New.
21086         (TARGET_INITIALIZER): Use TARGET_CASE_VALUES_THRESHOLD.
21087         * targhooks.c (default_case_values_threshold): New function.
21088         * targhooks.h (default_case_values_threshold): Declare function.
21089         * stmt.c (expand_case): Use case_values_threshold target hook.
21090         * expr.h (case_values_threshold): Remove declartation.
21091         * expr.c (case_values_threshold): Remove function.
21092         * doc/tm.texi (CASE_VALUES_THRESHOLD): Revise documentation.
21094         * config/avr/avr.h (CASE_VALUES_THRESHOLD): Remove macro.
21095         * config/avr/avr.c (TARGET_CASE_VALUES_THRESHOLD): Define macro.
21096         (avr_case_values_threshold): Declare as static.
21097         * config/avr/avr-protos.h (avr_case_values_threshold): Remove.
21099         * config/avr/mn10300.h (CASE_VALUES_THRESHOLD): Remove macro.
21100         * config/avr/mn10300.c (TARGET_CASE_VALUES_THRESHOLD): Define macro.
21101         (mn10300_case_values_threshold): New function.
21103 2009-04-24  H.J. Lu  <hongjiu.lu@intel.com>
21105         * ira.c (setup_cover_and_important_classes): Add enum cast.
21107 2009-04-24  Vladimir Makarov  <vmakarov@redhat.com>
21109         * genpreds.c (write_enum_constraint_num): Output definition of
21110         CONSTRAINT_NUM_DEFINED_P macro.
21111         * ira.c (setup_cover_and_important_classes): Use
21112         CONSTRAINT_NUM_DEFINED_P instead of CONSTRAINT__LIMIT in #ifdef.
21114 2009-04-24  DJ Delorie  <dj@redhat.com>
21116         * config/sh/sh.h (LIBGCC2_DOUBLE_TYPE_SIZE): Test
21117         __SH2A_SINGLE_ONLY__ also.
21119 2009-04-24  Steve Ellcey  <sje@cup.hp.com>
21121         * config/ia64/ia64.md (movfs_internal): Allow flt constants.
21122         (movdf_internal): Ditto.
21123         * config/ia64/ia64.c (ia64_legitimate_constant_p): Allow
21124         SFmode and DFmode constants.
21125         (ia64_print_operand): Add 'G' format for printing
21126         floating point constants.
21128 2009-04-24  Richard Guenther  <rguenther@suse.de>
21130         * tree-vrp.c (extract_range_from_binary_expr): Handle overflow
21131         from unsigned additions.
21133 2009-04-24  Joseph Myers  <joseph@codesourcery.com>
21135         * c-typeck.c (set_init_index): Allow array designators that are
21136         not integer constant expressions with a pedwarn if pedantic.
21138 2009-04-24  Bernd Schmidt  <bernd.schmidt@analog.com>
21140         * simplify-rtx.c (simplify_binary_operation_1, case AND): Result is
21141         zero if no overlap in nonzero bits between the operands.
21143 2009-04-24  Ian Lance Taylor  <iant@google.com>
21145         * combine.c (record_value_for_reg): Change 0 to VOIDmode, twice.
21146         (record_dead_and_set_regs): Likewise.
21147         * df.h (struct df_mw_hardreg): Change flags field to int.
21148         (struct df_base_ref): Likewise.
21149         (struct df): Change changeable_flags field to int.
21150         * df-scan.c (df_defs_record): Change clobber_flags to int.
21151         * dwarf2.h (enum dwarf_tag): Make lo_user and hi_user values enum
21152         constants rather than #define macros.
21153         (enum dwarf_attribute, enum dwarf_location_atom): Likewise.
21154         (enum dwarf_type, enum dwarf_endianity_encoding): Likewise.
21155         (enum dwarf_calling_convention): Likewise.
21156         (enum dwarf_line_number_x_ops): Likewise.
21157         (enum dwarf_call_frame_info): Likewise.
21158         (enum dwarf_source_language): Likewise.
21159         * dwarf2out.c (int_loc_descriptor): Add cast to enum type.
21160         (add_calling_convention_attribute): Likewise.
21161         * fold-const.c (fold_undefer_overflow_warnings): Add cast to enum type.
21162         (combine_comparisons): Change compcode to int.  Add cast to enum type.
21163         * genrecog.c (maybe_both_true_2): Change c to int.
21164         (write_switch): Likewise.  Add cast to enum type.
21165         * gimplify.c (gimplify_omp_for): Handle return values from
21166         gimplify_expr using MIN rather than bitwise or.
21167         (gimplify_expr): Add cast to enum type.
21168         * ipa-prop.c (update_jump_functions_after_inlining): Change
21169         IPA_BOTTOM to IPA_JF_UNKNOWN.
21170         * ira.c (setup_class_subset_and_memory_move_costs): Change mode to int.
21171         Add casts to enum type.
21172         (setup_cover_and_important_classes): Change cl to int.  Add casts
21173         to enum type.
21174         (setup_class_translate): Change cl and mode to int.
21175         (ira_init_once): Change mode to int.
21176         (free_register_move_costs): Likewise.
21177         (setup_prohibited_mode_move_regs): Add casts to enum type.
21178         * langhooks.c (add_builtin_function_common): Rework assertion that
21179         value fits bitfield.
21180         * mcf.c (add_fixup_edge): Change type parameter to edge_type.
21181         * omega.c (omega_do_elimination): Avoid math on enum types.
21182         * optabs.c (expand_vec_shift_expr): Remove casts to int.
21183         * opts.c (set_debug_level): Change 2 to enum constant.  Use new
21184         int local to handle integral_argment value.
21185         * regmove.c (try_auto_increment): Change PUT_MODE to
21186         PUT_REG_NOTE_KIND.
21187         * reload.c (push_secondary_reload): Add casts to enum type.
21188         (secondary_reload_class, find_valid_class): Likewise.
21189         * reload1.c (emit_input_reload_insns): Likewise.
21190         * rtl.h (NOTE_VAR_LOCATION_STATUS): Likewise.
21191         * sel-sched.c (init_hard_regs_data): Change cur_mode to int.
21192         * sel-sched-ir.c (hash_with_unspec_callback): Change 0 to enum
21193         constant.
21194         * tree.c (build_common_builtin_nodes): Add casts to enum type.
21195         * tree-complex.c (complex_lattice_t): Typedef to int rather than
21196         enum type.
21197         (expand_complex_libcall): Add casts to enum type.
21198         * tree-into-ssa.c (get_ssa_name_ann): Change 0 to enum constant.
21199         * tree-vect-loop.c (vect_model_reduction_cost): Compare reduc_code
21200         with ERROR_MARK, not NUM_TREE_CODES.
21201         (vect_create_epilog_for_reduction): Likewise.
21202         (vectorizable_reduction): Don't initialize epiloc_reduc_code.
21203         When not using it, set it to ERROR_MARK rather than NUM_TREE_CODES.
21204         * tree-vect-patterns.c (vect_pattern_recog_1): Change vec_mode to
21205         enum machine_mode.
21206         * tree-vect-stmts.c (new_stmt_vec_info): Change 0 to
21207         vect_unused_in_loop.  Change 0 to loop_vect.
21208         * tree-vectorizer.c (vect_set_verbosity_level): Add casts to enum type.
21209         * var-tracking.c (get_init_value): Change return type to enum
21210         var_init_status.
21211         * vec.h (DEF_VEC_FUNC_P) [iterate]: Cast 0 to type T.
21212         * config/arm/arm.c (fp_model_for_fpu): Change to array to enum
21213         arm_fp_model.
21214         (arm_override_options): Add casts to enum type.
21215         (arm_emit_tls_decoration): Likewise.
21216         * config/i386/i386.c (ix86_function_specific_restore): Add casts
21217         to enum type.
21218         * config/i386/i386-c.c (ix86_pragma_target_parse): Likewise.
21219         * config/ia64/ia64.c (ia64_expand_compare): Change magic to int.
21220         * config/rs6000/rs6000.c (rs6000_override_options): Add casts to
21221         enum type.
21222         * config/s390/s390.c (code_for_builtin_64): Change to array of
21223         enum insn_code.
21224         (code_for_builtin_31): Likewise.
21225         (s390_expand_builtin): Change code_for_builtin to enum insn_code
21226         const *.
21227         * config/sparc/sparc.c (sparc_override_options): Change value
21228         field in struct code_model to enum cmodel.  In initializer change
21229         0 to NULL and add cast to enum type.
21231         * c-typeck.c (build_modify_expr): Add lhs_origtype parameter.
21232         Change all callers.  Issue a -Wc++-compat warning using
21233         lhs_origtype if necessary.
21234         (convert_for_assignment): Issue -Wc++-compat warnings about
21235         invalid conversions to enum type on assignment.
21236         * c-common.h (build_modify_expr): Update declaration.
21238 2009-04-24  Nick Clifton  <nickc@redhat.com>
21240         * config/iq2000/iq2000.c (function_arg): Handle TImode values.
21241         (function_arg_advance): Likewise.
21242         * config/iq2000/iq2000.md (movsi_internal2): Fix the length of the
21243         5th alternative.
21245 2009-04-24  Andreas Krebbel  <krebbel1@de.ibm.com>
21247         * config/s390/constraints.md ('I', 'J'): Fix condition.
21249 2009-04-24  Diego Novillo  <dnovillo@google.com>
21251         * gengtype-parse.c (parse_error): Add newline after message.
21253 2009-04-24  H.J. Lu  <hongjiu.lu@intel.com>
21255         * config/i386/sse.md (avxmodesuffixs): Removed.
21256         (*avx_pinsr<avxmodesuffixs>): Renamed to ...
21257         (*avx_pinsr<ssevecsize>): This.
21259 2009-04-24  Bernd Schmidt  <bernd.schmidt@analog.com>
21261         * loop-iv.c (replace_single_def_regs): Look for REG_EQUAL notes;
21262         follow chains of regs with a single definition, and allow expressions
21263         that are function_invariant_p.
21264         (simple_rhs_p): Allow expressions that are function_invariant_p.
21266 2009-04-24  Paolo Bonzini  <bonzini@gnu.org>
21268         PR middle-end/39867
21269         * fold-const.c (fold_cond_expr_with_comparison): When folding
21270         > and >= to MAX, make sure the MAX uses the same type as the
21271         comparison's operands.
21273 2009-04-24  Nick Clifton  <nickc@redhat.com>
21275         * config/frv/frv.c (frv_frame_access): Do not use reg+reg
21276         addressing for DImode accesses.
21277         (frv_print_operand_address): Handle PLUS case.
21278         * config/frv/frv.h (FIXED_REGISTERS): Mark link register as fixed.
21280 2009-04-24  Jakub Jelinek  <jakub@redhat.com>
21282         PR rtl-optimization/39794
21283         * alias.c (canon_true_dependence): Add x_addr argument.
21284         * rtl.h (canon_true_dependence): Adjust prototype.
21285         * cse.c (check_dependence): Adjust canon_true_dependence callers.
21286         * cselib.c (cselib_invalidate_mem): Likewise.
21287         * gcse.c (compute_transp): Likewise.
21288         * dse.c (scan_reads_nospill): Likewise.
21289         (record_store, check_mem_read_rtx): Likewise.  For non-const-or-frame
21290         addresses pass base->val_rtx as mem_addr, for const-or-frame addresses
21291         canon_base_addr of the group, plus optional offset.
21292         (struct group_info): Rename canon_base_mem to
21293         canon_base_addr.
21294         (get_group_info): Set canon_base_addr to canon_rtx of base, not
21295         canon_rtx of base_mem.
21297 2009-04-23  Paolo Bonzini  <bonzini@gnu.org>
21299         * config/sh/sh.c (sh_expand_prologue, sh_expand_epilogue):
21300         Use memory_address_p instead of GO_IF_LEGITIMATE_ADDRESS.
21302 2009-04-23  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
21304         * config/spu/spu-builtins.h: Delete file.
21306         * config/spu/spu.h (enum spu_builtin_type): Move here from
21307         spu-builtins.h.
21308         (struct spu_builtin_description): Likewise.  Add GTY marker.
21309         Do not use enum spu_function_code or enum insn_code.
21310         (spu_builtins): Add extern declaration.
21312         * config/spu/spu.c: Do not include "spu-builtins.h".
21313         (enum spu_function_code, enum spu_builtin_type_index,
21314         V16QI_type_node, V8HI_type_node, V4SI_type_node, V2DI_type_node,
21315         V4SF_type_node, V2DF_type_node, unsigned_V16QI_type_node,
21316         unsigned_V8HI_type_node, unsigned_V4SI_type_node,
21317         unsigned_V2DI_type_node): Move here from spu-builtins.h.
21318         (spu_builtin_types): Make static.  Add GTY marker.
21319         (spu_builtins): Add extern declaration with GTY marker.
21320         Include "gt-spu.h".
21322         * config/spu/spu-c.c: Do not include "spu-builtins.h".
21323         (spu_resolve_overloaded_builtin): Do not use spu_function_code.
21324         Check programmatically whether all parameters are scalar.
21326         * config/spu/t-spu-elf (spu.o, spu-c.o): Update dependencies.
21328 2009-04-23  Eric Botcazou  <ebotcazou@adacore.com>
21330         * gimplify.c (gimplify_modify_expr_rhs) <VAR_DECL>: Do not do a direct
21331         assignment from the constructor either if the target is volatile.
21333 2009-04-23  Daniel Jacobowitz  <dan@codesourcery.com>
21335         * config/arm/arm.md (insv): Do not share operands[0].
21337 2009-04-23  Nathan Sidwell  <nathan@codesourcery.com>
21339         * config/vxlib-tls.c (active_tls_threads): Delete.
21340         (delete_hook_installed): New.
21341         (tls_delete_hook): Don't delete the delete hook.
21342         (tls_destructor): Delete it here.
21343         (__gthread_set_specific): Adjust installing the delete hook.
21344         (tls_delete_hook): Use __gthread_enter_tsd_dtor_context and
21345         __gthread_leave_tsd_dtor_context.
21347 2009-04-23  Rafael Avila de Espindola  <espindola@google.com>
21349         * c-format.c (gcc_tdiag_char_table): Add support for %E.
21351 2009-04-23  Uros Bizjak  <ubizjak@gmail.com>
21353         * config/alpha/alpha.c (alpha_legitimize_reload_address): Add cast to
21354         enum type.
21355         (alpha_rtx_costs): Ditto.
21356         (emit_unlikely_jump): Use add_reg_note.
21357         (emit_frame_store_1): Ditto.
21358         (alpha_expand_prologue): Ditto.
21359         (alpha_expand_builtin): Change 0 to EXPAND_NORMAL in function call.
21360         * config/alpha/alpha.c (Unicos/Mk address splitter): Use add_reg_note.
21362 2009-04-23  Nick Clifton  <nickc@redhat.com>
21364         * config/v850/v850.md (epilogue): Remove suppressed code.
21365         (return): Rename to return_simple and remove test of frame size.
21366         * config/v850/v850.c (expand_epilogue): Rename call to gen_return
21367         to gen_return_simple.
21369 2009-04-22  Jing Yu  <jingyu@google.com>
21371         PR testsuite/39781
21372         * config/arm/arm.h: Define HANDLE_PRAGMA_PACK_PUSH_POP.
21374 2009-04-22  Andrew Pinski  <andrew_pinski@playstation.sony.com>
21376         PR C/31499
21377         * c-typeck.c (process_init_element): Treat VECTOR_TYPE like ARRAY_TYPE
21378         and RECORD_TYPE/UNION_TYPE.  When outputing the actual element and the
21379         value is a VECTOR_CST, the element type is the element type of the
21380         vector.
21382 2009-04-22  DJ Delorie  <dj@redhat.com>
21384         * config/m32c/m32c.h: Update GTY annotations to new syntax.
21386 2009-04-22  Jakub Jelinek  <jakub@redhat.com>
21388         * alias.c (find_base_term): Move around LO_SUM case, so that
21389         CONST falls through into PLUS/MINUS handling.
21391         PR c/39855
21392         * fold-const.c (fold_binary) <case LSHIFT_EXPR>: When optimizing
21393         into 0, use omit_one_operand.
21395 2009-04-23  Ben Elliston  <bje@au.ibm.com>
21397         * config/rs6000/linux-unwind.h (get_regs): Remove type
21398         puns. Change the type of `pc' to an array of unsigned ints and
21399         update all users.  Constify frame24.
21401 2009-04-22  DJ Delorie  <dj@redhat.com>
21403         * config/m32c/m32c.c (m32c_special_page_vector_p): Move
21404         declarations before code.
21405         (current_function_special_page_vector): Likewise.
21406         (m32c_expand_insv): Silence a warning.
21408 2009-04-21  Taras Glek  <tglek@mozilla.com>
21410         * alias.c: Update GTY annotations to new syntax.
21411         * basic-block.h: Likewise.
21412         * bitmap.h: Likewise.
21413         * c-common.h: Likewise.
21414         * c-decl.c: Likewise.
21415         * c-parser.c: Likewise.
21416         * c-pragma.c: Likewise.
21417         * c-tree.h: Likewise.
21418         * cfgloop.h: Likewise.
21419         * cgraph.h: Likewise.
21420         * config/alpha/alpha.c: Likewise.
21421         * config/arm/arm.h: Likewise.
21422         * config/avr/avr.h: Likewise.
21423         * config/bfin/bfin.c: Likewise.
21424         * config/cris/cris.c: Likewise.
21425         * config/darwin.c: Likewise.
21426         * config/frv/frv.c: Likewise.
21427         * config/i386/i386.c: Likewise.
21428         * config/i386/i386.h: Likewise.
21429         * config/i386/winnt.c: Likewise.
21430         * config/ia64/ia64.h: Likewise.
21431         * config/iq2000/iq2000.c: Likewise.
21432         * config/mips/mips.c: Likewise.
21433         * config/mmix/mmix.h: Likewise.
21434         * config/pa/pa.c: Likewise.
21435         * config/pa/pa.h: Likewise.
21436         * config/rs6000/rs6000.c: Likewise.
21437         * config/s390/s390.c: Likewise.
21438         * config/sparc/sparc.c: Likewise.
21439         * config/xtensa/xtensa.c: Likewise.
21440         * cselib.h: Likewise.
21441         * dbxout.c: Likewise.
21442         * dwarf2out.c: Likewise.
21443         * except.c: Likewise.
21444         * except.h: Likewise.
21445         * fixed-value.h: Likewise.
21446         * function.c: Likewise.
21447         * function.h: Likewise.
21448         * gimple.h: Likewise.
21449         * integrate.c: Likewise.
21450         * optabs.c: Likewise.
21451         * output.h: Likewise.
21452         * real.h: Likewise.
21453         * rtl.h: Likewise.
21454         * stringpool.c: Likewise.
21455         * tree-data-ref.c: Likewise.
21456         * tree-flow.h: Likewise.
21457         * tree-scalar-evolution.c: Likewise.
21458         * tree-ssa-address.c: Likewise.
21459         * tree-ssa-alias.h: Likewise.
21460         * tree-ssa-operands.h: Likewise.
21461         * tree.c: Likewise.
21462         * tree.h: Likewise.
21463         * varasm.c: Likewise.
21464         * varray.h: Likewise.
21465         * vec.h: Likewise.
21466         * coretypes.h: Do not define GTY macro if it is already defined.
21467         * doc/gty.texi: Update GTY documentation to new syntax.
21468         * gengtype-lex.l: Enforce attribute-like syntax for GTY
21469         annotations on structs.
21470         * gengtype-parse.c: Likewise.
21472 2009-04-22  Mark Heffernan  <meheff@google.com>
21474         * gcc.c (LINK_COMMAND_SPEC): Link with gcov with -fprofile-generate=.
21476 2009-04-22  Kazu Hirata  <kazu@codesourcery.com>
21478         * config/arm/arm.c (arm_rtx_costs_1): Use power_of_two_operand
21479         where appropriate.
21481 2009-04-22  Kazu Hirata  <kazu@codesourcery.com>
21483         * config/arm/arm.c (arm_size_rtx_costs): Treat a PLUS with a shift
21484         the same as a PLUS without a shift.  Increase the cost of a
21485         CONST_INT in MULT.
21487 2009-04-22  Manuel Lopez-Ibanez  <manu@gcc.gnu.org>
21489         * Makefile.in: Update dependencies.
21490         * errors.c (warning): Remove unused parameter 'opt'. Returns 'void'.
21491         * errors.h: Remove bogus comment about compatibility.
21492         (warning): Update declaration.
21493         * genautomata.c: Update all calls to warning.
21494         * gimple.c: Do not include errors.h. Include toplev.h.
21495         * tree-ssa-structalias.c: Do not include errors.h.
21496         * omega.c: Likewise.
21497         * tree-ssa-reassoc.c: Likewise.
21498         * config/spu/spu-c.c: Likewise.
21499         * config/spu/t-spu-elf: Update dependencies.
21501 2009-04-22  Richard Guenther  <rguenther@suse.de>
21503         PR tree-optimization/39824
21504         * tree-ssa-ccp.c (fold_const_aggregate_ref): For INDIRECT_REFs
21505         make sure the types are compatible.
21507 2009-04-22  Manuel Lopez-Ibanez  <manu@gcc.gnu.org>
21509         PR c++/14875
21510         * c-common.c (c_parse_error): Take a token_flags parameter.
21511         Use token_type for the token type instead.
21512         Pass token_flags to cpp_type2name.
21513         * c-common.h (c_parse_error): Update declaration.
21514         * c-parser.c (c_parser_error): Pass 0 as token flags.
21516 2009-04-22  Andrey Belevantsev  <abel@ispras.ru>
21518         PR rtl-optimization/39580
21519         * sel-sched-ir.c (insert_in_history_vect): Remove incorrect gcc_assert.
21521 2009-04-22  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
21523         * function.c (expand_function_end): Do not emit a jump to the "naked"
21524         return label for fall-through returns.
21525         * except.c (sjlj_emit_function_exit): Always place the call to the
21526         unregister function at the location installed by expand_function_end.
21528 2009-04-22  Richard Guenther  <rguenther@suse.de>
21530         PR tree-optimization/39845
21531         * tree-switch-conversion.c (build_arrays): Add new referenced vars.
21532         (gen_inbound_check): Likewise.
21534 2009-04-22  Nathan Sidwell  <nathan@codesourcery.com>
21536         * gthr-vxworks.h (struct __gthread_once_t): Add alignment and
21537         padding for PPC.
21538         (__GTHREAD_ONCE_INIT): Adjust ppc initializer.
21539         * config/vxlib.c (__gthread_once): Add race guard for PPC.
21541 2009-04-22  Paolo Bonzini  <bonzini@gnu.org>
21543         * config/sh/sh.c (shift_insns_rtx, shiftcosts, gen_shifty_op,
21544         sh_dynamicalize_shift_p, shl_and_scr_length): Truncate
21545         shift counts to avoid out-of-bounds array accesses.
21547 2009-04-22  Paolo Bonzini  <bonzini@gnu.org>
21549         * config/sparc/sparc.h (POINTER_SIZE): Fix comment.
21550         (Pmode): Move above.
21552 2009-04-22  Uros Bizjak  <ubizjak@gmail.com>
21554         * config/alpha/alpha.c: Use REG_P, MEM_P, CONST_INT_P, JUMP_P,
21555         NONJUMP_INSN_P, CALL_P, LABEL_P and NOTE_P predicates instead of
21556         GET_CODE macro.  Use IN_RANGE macro where appropriate.
21557         * config/alpha/alpha.h: Ditto.
21558         * config/alpha/alpha.md: Ditto.
21559         * config/alpha/constraints.md: Ditto.
21560         * config/alpha/predicates.md: Ditto.
21562 2009-04-22  Paolo Bonzini  <bonzini@gnu.org>
21564         * defaults.h (GO_IF_MODE_DEPENDENT_ADDRESS): Provide empty default.
21565         * config/frv/frv.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
21566         * config/s390/s390.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
21567         * config/m32c/m32c.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
21568         * config/spu/spu.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
21569         * config/i386/i386.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
21570         * config/sh/sh.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
21571         * config/pdp11/pdp11.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
21572         * config/avr/avr.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
21573         * config/crx/crx.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
21574         * config/fr30/fr30.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
21575         * config/m68hc11/m68hc11.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
21576         * config/cris/cris.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
21577         * config/iq2000/iq2000.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
21578         * config/mn10300/mn10300.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
21579         * config/ia64/ia64.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
21580         * config/m68k/m68k.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
21581         * config/picochip/picochip.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
21582         * config/arc/arc.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
21583         * config/mcore/mcore.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
21584         * config/score/score.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
21585         * config/arm/arm.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
21586         * config/pa/pa.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
21587         * config/mips/mips.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
21588         * config/v850/v850.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
21589         * config/mmix/mmix.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
21590         * config/bfin/bfin.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
21592 2009-04-22  Laurynas Biveinis  <laurynas.biveinis@gmail.com>
21594         * cfghooks.c (tidy_fallthru_edges): Remove find_basic_blocks
21595         references from comments.
21596         * cfgbuild.c (count_basic_blocks): Delete.
21597         (find_basic_blocks_1): Delete.
21598         (find_basic_blocks): Delete.
21599         * except.c (finish_eh_generation): Make static.  Move comment from
21600         except.h here.  Remove find_basic_blocks references from comments.
21601         * except.h (finish_eh_generation): Delete.
21602         * basic-block.h (find_basic_blocks): Delete.
21603         * config/sh/sh.c (sh_output_mi_thunk): Delete a "#if 0" block.
21605 2009-04-22  Dave Korn  <dave.korn.cygwin@gmail.com>
21607         * sdbout.c (sdbout_symbol):  Pass VOIDmode to eliminate_regs.
21608         (sdbout_parms):  Likewise.
21610 2009-04-21  Kaz Kojima  <kkojima@gcc.gnu.org>
21612         * config/sh/sh.c (prepare_cbranch_operands): Use
21613         LAST_AND_UNUSED_RTX_CODE instead of CODE_FOR_nothing.
21614         (expand_cbranchdi4): Likewise.
21615         (from_compare): Add cast to enum type.
21616         (expand_cbranchsi4): Use add_reg_note.
21617         (output_stack_adjust, push, pop, sh_expand_prologue): Likewise.
21618         (sh_insn_length_adjustment): Use sh_cpu_attr instead of sh_cpu.
21619         (sh_initialize_trampoline): Change 0 to LCT_NORMAL in function call.
21620         (sh_expand_builtin): Change 0 to EXPAND_NORMAL in function call.
21621         * config/sh/sh.md (cbranchsi4): Use LAST_AND_UNUSED_RTX_CODE
21622         instead of CODE_FOR_nothing.
21623         (cbranchdi4): Likewise.  Fix the order of arguments for
21624         gen_rtx_fmt_ee.
21625         (push_fpscr): Use add_reg_note.
21626         (pop_fpscr, movdf_i4+1, reload_outdf__RnFRm+3, reload_outdf__RnFRm+4,
21627         reload_outdf__RnFRm+5, fpu_switch+1, fpu_switch+2): Likewise.
21629 2009-04-21  Joseph Myers  <joseph@codesourcery.com>
21631         * ABOUT-GCC-NLS, ChangeLog, ChangeLog-1997, ChangeLog-1998,
21632         ChangeLog-1999, ChangeLog-2000, ChangeLog-2001, ChangeLog-2002,
21633         ChangeLog-2003, ChangeLog-2004, ChangeLog-2005, ChangeLog-2006,
21634         ChangeLog-2007, ChangeLog-2008, ChangeLog.dataflow, ChangeLog.lib,
21635         ChangeLog.ptr, ChangeLog.tree-ssa, ChangeLog.tuples, FSFChangeLog,
21636         FSFChangeLog.10, FSFChangeLog.11, LANGUAGES, ONEWS, acinclude.m4,
21637         config/alpha/gnu.h, config/alpha/libgcc-alpha-ldbl.ver,
21638         config/alpha/t-osf4, config/alpha/t-vms, config/alpha/va_list.h,
21639         config/alpha/x-vms, config/arc/t-arc,
21640         config/arm/README-interworking, config/arm/arm-c.c,
21641         config/arm/gentune.sh, config/arm/libgcc-bpabi.ver,
21642         config/arm/t-arm, config/arm/t-arm-elf, config/arm/t-arm-softfp,
21643         config/arm/t-bpabi, config/arm/t-linux, config/arm/t-linux-eabi,
21644         config/arm/t-netbsd, config/arm/t-pe, config/arm/t-strongarm-elf,
21645         config/arm/t-symbian, config/arm/t-vxworks, config/arm/t-wince-pe,
21646         config/avr/t-avr, config/bfin/elf.h, config/bfin/libgcc-bfin.ver,
21647         config/bfin/linux.h, config/bfin/t-bfin, config/bfin/t-bfin-elf,
21648         config/bfin/t-bfin-linux, config/bfin/t-bfin-uclinux,
21649         config/bfin/uclinux.h, config/cris/mulsi3.asm, config/cris/t-cris,
21650         config/cris/t-elfmulti, config/crx/t-crx,
21651         config/darwin-ppc-ldouble-patch.def, config/darwin-sections.def,
21652         config/divmod.c, config/fr30/t-fr30, config/frv/libgcc-frv.ver,
21653         config/frv/t-frv, config/frv/t-linux, config/h8300/genmova.sh,
21654         config/h8300/t-h8300, config/i386/athlon.md,
21655         config/i386/darwin-libgcc.10.4.ver,
21656         config/i386/darwin-libgcc.10.5.ver, config/i386/libgcc-glibc.ver,
21657         config/i386/mach.h, config/i386/netbsd.h, config/i386/t-crtpc,
21658         config/i386/t-cygming, config/i386/t-cygwin, config/i386/t-i386,
21659         config/i386/t-linux64, config/i386/t-nwld,
21660         config/i386/t-rtems-i386, config/i386/t-sol2-10,
21661         config/i386/x-mingw32, config/ia64/div.md, config/ia64/elf.h,
21662         config/ia64/ia64.opt, config/ia64/libgcc-glibc.ver,
21663         config/ia64/libgcc-ia64.ver, config/ia64/linux.h,
21664         config/ia64/sysv4.h, config/ia64/t-hpux, config/ia64/t-ia64,
21665         config/iq2000/abi, config/iq2000/lib2extra-funcs.c,
21666         config/iq2000/t-iq2000, config/libgcc-glibc.ver,
21667         config/m32r/libgcc-glibc.ver, config/m32r/t-linux,
21668         config/m32r/t-m32r, config/m68hc11/t-m68hc11,
21669         config/m68k/t-floatlib, config/m68k/t-linux, config/m68k/t-mlibs,
21670         config/m68k/t-uclinux, config/mcore/t-mcore,
21671         config/mcore/t-mcore-pe, config/mips/20kc.md, config/mips/4130.md,
21672         config/mips/5400.md, config/mips/5500.md, config/mips/crti.asm,
21673         config/mips/crtn.asm, config/mips/irix-crti.asm,
21674         config/mips/irix-crtn.asm, config/mips/libgcc-mips16.ver,
21675         config/mips/mips-dsp.md, config/mips/mips-dspr2.md,
21676         config/mips/mips-fixed.md, config/mips/sb1.md,
21677         config/mips/sr71k.md, config/mips/t-elf, config/mips/t-gofast,
21678         config/mips/t-iris6, config/mips/t-isa3264,
21679         config/mips/t-libgcc-mips16, config/mips/t-linux64,
21680         config/mips/t-mips, config/mips/t-r3900, config/mips/t-rtems,
21681         config/mips/t-sb1, config/mips/t-sde, config/mips/t-sdemtk,
21682         config/mips/t-slibgcc-irix, config/mips/t-sr71k, config/mips/t-st,
21683         config/mips/t-vr, config/mips/t-vxworks, config/mmix/t-mmix,
21684         config/mn10300/t-linux, config/mn10300/t-mn10300,
21685         config/pa/pa32-regs.h, config/pa/t-hpux-shlib, config/pa/t-linux,
21686         config/pa/t-linux64, config/pa/t-pa64, config/pdp11/t-pdp11,
21687         config/picochip/libgccExtras/clzsi2.asm,
21688         config/picochip/t-picochip, config/rs6000/darwin-ldouble-format,
21689         config/rs6000/darwin-libgcc.10.4.ver,
21690         config/rs6000/darwin-libgcc.10.5.ver,
21691         config/rs6000/libgcc-ppc-glibc.ver, config/rs6000/ppc-asm.h,
21692         config/rs6000/t-aix43, config/rs6000/t-aix52,
21693         config/rs6000/t-darwin, config/rs6000/t-fprules,
21694         config/rs6000/t-fprules-fpbit, config/rs6000/t-linux64,
21695         config/rs6000/t-lynx, config/rs6000/t-netbsd,
21696         config/rs6000/t-ppccomm, config/rs6000/t-ppcendian,
21697         config/rs6000/t-ppcgas, config/rs6000/t-rs6000,
21698         config/rs6000/t-rtems, config/rs6000/t-spe,
21699         config/rs6000/t-vxworks, config/s390/libgcc-glibc.ver,
21700         config/score/t-score-elf, config/sh/divcost-analysis,
21701         config/sh/libgcc-glibc.ver, config/sh/t-netbsd, config/sh/t-sh,
21702         config/sh/t-sh64, config/sh/t-superh, config/sh/t-symbian,
21703         config/sparc/libgcc-sparc-glibc.ver, config/sparc/sol2-bi.h,
21704         config/sparc/sol2-gas.h, config/sparc/sol2-gld-bi.h,
21705         config/sparc/t-elf, config/sparc/t-linux64, config/sparc/t-sol2,
21706         config/stormy16/stormy-abi, config/stormy16/t-stormy16,
21707         config/t-darwin, config/t-libunwind, config/t-libunwind-elf,
21708         config/t-linux, config/t-lynx, config/t-slibgcc-elf-ver,
21709         config/t-slibgcc-sld, config/t-sol2, config/t-vxworks,
21710         config/udivmod.c, config/udivmodsi4.c, config/v850/t-v850,
21711         config/v850/t-v850e, config/xtensa/t-xtensa, diagnostic.def,
21712         gdbinit.in, glimits.h, gstab.h, gsyms.h, java/ChangeLog,
21713         java/ChangeLog.ptr, java/ChangeLog.tree-ssa, libgcc-std.ver,
21714         limitx.h, version.c, xcoff.h: Add copyright and license notices.
21715         * config/h8300/genmova.sh: Include copyright and license notices
21716         in generated output.
21717         * config/h8300/mova.md: Regenerate.
21718         * doc/install.texi2html: Include word "Copyright" in copyright
21719         notice and use name "Free Software Foundation, Inc.".
21720         * ChangeLog, ChangeLog-2000, ChangeLog-2001, ChangeLog-2002,
21721         ChangeLog-2003, ChangeLog-2004, ChangeLog-2005, ChangeLog-2006,
21722         ChangeLog-2007, ChangeLog-2008: Correct dates.
21724 2009-04-21  Eric Botcazou  <ebotcazou@adacore.com>
21726         * c-common.c (c_common_truthvalue_conversion): Use LOCATION to build
21727         NE_EXPR operations as well.
21728         * c-parser.c (c_parser_condition): Do not set location information on
21729         the condition.
21730         (c_parser_conditional_expression): Likewise.
21731         (c_parser_binary_expression): Set location information on operators.
21732         * c-typeck.c (build_unary_op) <TRUTH_NOT_EXPR>: Reset the location if
21733         TRUTH_NOT_EXPR has been folded.
21734         * fold-const.c (fold_truth_not_expr): Copy location information from
21735         the incoming expression to the outgoing one.
21736         * gimplify.c (shortcut_cond_r): Add locus parameter.  Pass it to
21737         recursive calls on the LHS of the operator but pass that of the
21738         operator to recursive calls on the RHS of the operator.  Set it
21739         on the COND_EXPR.
21740         (shortcut_cond_expr): Set the locus of the operator on the second
21741         COND_EXPR and that of the expression on the first in degenerate cases.
21742         Pass the locus of the expression to calls to shortcut_cond_r.
21743         Set the locus of the 'then' block on the associated jump, if any.
21744         (gimplify_boolean_expr): Add locus parameter.  Set it on the COND_EXPR.
21745         (gimplify_expr) <TRUTH_ANDIF_EXPR>: Pass the locus of the outer
21746         expression to call to gimplify_boolean_expr.
21748 2009-04-21  Kai Tietz  <kai.tietz@onevision.com>
21750         * config.gcc: Add additional configuration for
21751         i686-w64-mingw* and x86_64-w64-mingw* triplet.
21752         * config/i386/mingw-w64.h: New mingw-w64 specific header.
21753         (CPP_SPEC): Redefine for allowing -municode option.
21754         (STARTFILE_SPEC): Likewise.
21755         * config/i386/t-mingw-w64: New.
21756         * config/i386/mingw-w64.opt: New.
21757         (municode): Add new target option.
21758         * doc/invoke.texi (municode): Add documentation for new option.
21760 2009-04-21  Ian Lance Taylor  <iant@google.com>
21762         * config/rs6000/rs6000-c.c (altivec_resolve_overloaded_builtin):
21763         Correct test for number of arguments.
21764         * config/spu/spu-c.c (spu_resolve_overloaded_builtin): Likewise.
21766 2009-04-21  Andreas Schwab  <schwab@linux-m68k.org>
21768         * config/m68k/linux.h (FINALIZE_TRAMPOLINE): Use enum for second
21769         argument of emit_library_call.
21771 2009-04-21  Richard Guenther  <rguenther@suse.de>
21773         PR middle-end/39829
21774         * gimple.c (walk_stmt_load_store_addr_ops): Catch addresses
21775         inside VIEW_CONVERT_EXPRs.
21777 2009-04-21  Martin Jambor  <mjambor@suse.cz>
21779         * tree-switch-conversion.c (build_constructors): Split a long line.
21780         (constructor_contains_same_values_p): New function.
21781         (build_one_array): Create assigns of constants if possible, do not
21782         call mark_sym_for_renaming, call update_stmt.
21783         (build_arrays): Call make_ssa_name (create_tmp_var ()) instead of
21784         make_rename_temp.  Do not call mark_symbols_for_renaming, call
21785         update_stmt.
21786         (gen_def_assigns): Do not call mark_symbols_for_renaming or
21787         find_new_referenced_vars, call update_stmt.
21788         (gen_inbound_check): Use create_tmp_var and create ssa names manually
21789         instead of calling make_rename_temp.  Do not call
21790         find_new_referenced_vars or mark_symbols_for_renaming, call
21791         update_stmt.
21793 2009-04-21  Richard Guenther  <rguenther@suse.de>
21795         PR tree-optimization/39827
21796         * tree-ssa-phiprop.c (propagate_with_phi): Check SSA_NAME is in range.
21797         (tree_ssa_phiprop): Pass the correct array size.
21799 2009-04-21  Uros Bizjak  <ubizjak@gmail.com>
21801         * config/alpha/alpha.md (tune): Add cast to enum attr_tune.
21803 2009-04-21  Manuel López-Ibáñez  <manu@gcc.gnu.org>
21805         PR 16202
21806         * c-typeck.c (lvalue_p): Move declaration ...
21807         * c-common.h (lvalue_p): ... to here.
21808         * c-common.c (candidate_equal_p): New.
21809         (add_tlist): Use it.
21810         (merge_tlist): Use it.
21811         (warn_for_collisions_1): Likewise.
21812         (warning_candidate_p): Accept more candidates.
21813         (verify_tree): A warning candidate can be an expression. Use
21814         candidate_equal_p.
21816 2009-04-21  Ben Elliston  <bje@au.ibm.com>
21818         PR target/5267
21819         * doc/invoke.texi (RS/6000 and PowerPC Options): Add documentation
21820         for -mcall-eabi, -mcall-aixdesc, -mcall-freebsd and -mcall-openbsd
21821         options.  Remove -mcall-solaris documentation.
21823 2009-04-21  Manuel Lopez-Ibanez  <manu@gcc.gnu.org>
21825         PR c++/13358
21826         * doc/invoke.texi (-Wlong-long): Update description.
21827         * c-lex (interpret_integer): Only warn if there was no previous
21828         overflow and -Wlong-long is enabled.
21829         * c-decl.c (declspecs_add_type): Drop redundant flags.
21830         * c.opt (Wlong-long): Init to -1.
21831         * c-opts.c (sanitize_cpp_opts): Synchronize cpp's warn_long_long
21832         and front-end warn_long_long. Wlong-long only depends on other
21833         flags if it is uninitialized.
21834         * c-parser.c (disable_extension_diagnostics): warn_long_long is
21835         the same for CPP and FE.
21836         (restore_extension_diagnostics): Likewise.
21838 2009-04-20  Ian Lance Taylor  <iant@google.com>
21840         Fix enum conversions which are invalid in C++:
21841         * auto-inc-dec.c (attempt_change): Change 0 to SET in function call.
21842         * calls.c (store_one_arg): Change 0 to EXPAND_NORMAL in function call.
21843         * cse.c (hash_rtx_cb): Change 0 to VOIDmode in function call.
21844         * dbgcnt.c (dbg_cnt_set_limit_by_name): Add cast to enum type.
21845         * dbxout.c (dbxout_symbol): Change 0 to VOIDmode in function call.
21846         (dbxout_parms): Likewise.
21847         * df-core.c (df_set_flags): Change changeable_flags parameter to int.
21848         (df_clear_flags): Likewise.
21849         * df-problems.c (df_rd_bb_local_compute_process_def): Change
21850         top_flag parameter to int.
21851         (df_chain_create_bb_process_use): Likewise.
21852         (df_chain_add_problem): Change chain_flags parameter to unsigned int.
21853         Remove cast.
21854         * df-scan.c (df_ref_create): Change ref_flags parameter to int.
21855         (df_ref_create_structure, df_def_record_1): Likewise.
21856         (df_defs_record, df_uses_record, df_get_call_refs): Likewise.
21857         (df_notes_rescan): Change 0 to VOIDmode in function call.
21858         (df_get_call_refs, df_insn_refs_collect): Likewise.
21859         (df_bb_regs_collect): Likewise.
21860         (df_entry_block_defs_collect): Likewise.
21861         (df_exit_block_uses_collect): Likewise.
21862         * df.h: Update declarations.
21863         * double-int.c (double_int_divmod): Add cast to enum type.
21864         * dse.c (replace_inc_dec): Reverse parameters to gen_int_mode.
21865         * dwarf2out.c (new_reg_loc_descr): Add casts to enum type.
21866         (based_loc_descr): Likewise.
21867         (loc_descriptor_from_tree_1): Change first_op and second_op to
21868         enum dwarf_location_atom.  Add cast to enum type.
21869         * expmed.c (init_expmed): Change 0 to SET in function call.
21870         * expr.c (init_expr_target): Change 0 to VOIDmode in function call.
21871         (expand_expr_real_1): Change 0 to EXPAND_NORMAL in function call.
21872         (do_store_flag): Likewise.
21873         * fixed-value.h (struct fixed_value): Change mode to enum
21874         machine_mode.
21875         * function.c (assign_parms): Change 0 to VOIDmode in function call.
21876         * genautomata.c (insert_automaton_decl): Change 1 to INSERT in
21877         function call.
21878         (insert_insn_decl, insert_decl, insert_state): Likewise.
21879         (automata_list_finish): Likewise.
21880         * genrecog.c (process_define_predicate): Add cast to enum type.
21881         * gensupport.c (init_predicate_table): Add cast to enum type.
21882         * gimple.c (gimple_build_return): Change 0 to ERROR_MARK in
21883         function call.
21884         (gimple_build_call_1, gimple_build_label): Likewise.
21885         (gimple_build_goto, gimple_build_asm_1): Likewise.
21886         (gimple_build_switch_1, gimple_build_cdt): Likewise.
21887         * gimple.h (GIMPLE_CHECK): Change 0 to ERROR_MARK in function call.
21888         (enum fallback): Rename from enum fallback_t.
21889         (fallback_t): Typedef as int.
21890         * gimple-low.c (lower_builtin_setjmp): Change TSI_SAME_STMT to
21891         GSI_SAME_STMT in function call.
21892         * ira.c (setup_class_subset_and_memory_move_costs): Add casts to
21893         enum type.
21894         (setup_reg_class_relations): Likewise.
21895         (setup_reg_class_nregs): Change cl to int.  Add casts to enum type.
21896         (setup_prohibited_class_mode_regs): Add cast to enum type.
21897         (setup_prohibited_mode_move_regs): Likewise.
21898         * ira-costs.c (record_reg_classes): Change rclass to enum reg_class.
21899         (record_address_regs): Change i to enum reg_class.
21900         * lists.c (alloc_EXPR_LIST): Add cast to enum type.
21901         * machmode.h (GET_MODE_CLASS): Cast value to enum mode_class.
21902         (GET_MODE_WIDER_MODE): Cast value to enum machine_mode.
21903         (GET_MODE_2XWIDER_MODE): Likewise.
21904         (GET_CLASS_NARROWEST_MODE): Likewise.
21905         * omp-low.c (expand_omp_for): Add cast to enum type.
21906         * optabs.c (debug_optab_libfuncs): Add casts to enum type.
21907         * opts.c (enable_warning_as_error): Change kind to diagostic_t.
21908         * postreload.c (reload_cse_simplify_operands): Change rclass local
21909         to enum reg_class.
21910         * predict.c (combine_predictions_for_insn): Change best_predictor
21911         and predictor to enum br_predictor.
21912         (combine_predictions_for_bb): Likewise.
21913         (build_predict_expr): Change assignment to PREDICT_EXPR_OUTCOME to
21914         use SET_PREDICT_EXPR_OUTCOME.
21915         * real.c (real_arithmetic): Change icode to code in function call.
21916         * reginfo.c (init_move_cost): Add casts to enum type.
21917         (init_reg_sets_1, init_fake_stack_mems): Likewise.
21918         * regmove.c (regclass_compatible_p): Change class0 and class1 to
21919         enum reg_class.
21920         * reload.c (find_valid_class): Add casts to enum type.
21921         (push_reload): Change 0 to NO_REGS in function call.
21922         (find_reloads): Change this_alternative to array of enum
21923         reg_class.  Remove some now-unnecessary casts.
21924         (make_memloc): Change 0 to VOIDmode in function call.
21925         * reload1.c (reload): Change 0 to VOIDmode in function call.
21926         (eliminate_regs_1, elimination_effects): Likewise.
21927         (eliminate_regs_in_insn): Likewise.
21928         (emit_input_reload_insns): Add cast to enum type.
21929         (delete_output_reload): Change 0 to VOIDmode in function call.
21930         * reorg.c (insn_sets_resource_p): Convert include_delayed_effects
21931         to enum type in function call.
21932         * tree.h (PREDICT_EXPR_OUTCOME): Add cast to enum type.
21933         (SET_PREDICT_EXPR_OUTCOME): Define.
21934         * tree-dump.c (get_dump_file_info): Change phase parameter to int.
21935         (get_dump_file_name, dump_begin, dump_enabled_p): Likewise.
21936         (dump_initialized_p, dump_flag_name, dump_end): Likewise.
21937         (dump_function): Likewise.
21938         * tree-dump.h: Update declarations.
21939         * tree-pass.h: Update declarations.
21940         * varasm.c (assemble_integer): Change mclass to enum mode_class.
21941         * config/arm/arm.c (thumb_legitimize_reload_address): Add cast to
21942         enum type.
21943         (arm_rtx_costs_1): Correct parenthesization.
21944         (arm_rtx_costs): Add casts to enum type.
21945         (adjacent_mem_locations): Reverse arguments to const_ok_for_op.
21946         (vfp_emit_fstmd): Use add_rg_note.
21947         (emit_multi_reg_push, emit_sfm): Likewise.
21948         (thumb_set_frame_pointer): Likewise.
21949         (arm_expand_prologue): Likewise.
21950         (arm_regno_class): Change return type to enum reg_class.
21951         (thumb1_expand_prologue): Use add_reg_note.
21952         * config/arm/arm-protos.h (arm_regno_class): Update declaration.
21953         * config/arm/arm.h (INITIALIZE_TRAMPOLINE): Change 0 to LCT_NORMAL
21954         in function call.
21955         * config/arm/gentune.sh: Add cast to enum type.
21956         * config/arm/arm-tune.md: Rebuild.
21957         * config/i386/i386.c (ix86_expand_prologue): Use add_reg_note.
21958         (ix86_split_fp_branch, predict_jump): Likewise.
21959         (ix86_expand_multi_arg_builtin): Change sub_code from enum
21960         insn_code to enum rtx_code.
21961         (ix86_builtin_vectorized_function): Add cast to enum type.
21962         * config/i386/i386.md (truncdfsf2): Change slot to enum
21963         ix86_stack_slot.
21964         (truncxf<mode>2, isinf<mode>2): Likewise.
21965         * config/i386/i386-c.c (ix86_pragma_target_parse): Add cast to
21966         enum type.
21967         * config/ia64/ia64.c (ia64_split_tmode_move): Use add_reg_note.
21968         (spill_restore_mem, do_spill, ia64_expand_prologue): Likewise.
21969         (insert_bundle_state): Change 1 to INSERT in function call.
21970         (ia64_add_bundle_selector_before): Likewise.
21971         * config/ia64/ia64.md (cpu attr): Add cast to enum type.
21972         (save_stack_nonlocal): Change 0 to LCT_NORMAL in function call.
21973         (restore_stack_nonlocal): Likewise.
21974         * config/mips/mips.h (MIPS_ICACHE_SYNC): Change 0 to LCT_NORMAL in
21975         function call.
21976         * config/mips/mips.c (mips_binary_cost): Change 0 to SET in
21977         function call.
21978         (mips_rtx_costs): Likewise.
21979         (mips_override_options): Add casts to enum type.
21980         * config/mips/sdemtk.h (MIPS_ICACHE_SYNC): Change 0 to LCT_NORMAL
21981         in function call.
21982         * config/pa/pa.c (legitimize_pic_address): Use add_reg_note.
21983         (store_reg, set_reg_plus_d): Likewise.
21984         (hppa_expand_prologue, hppa_profile_hook): Likewise.
21985         * config/rs6000/rs6000.c (rs6000_init_hard_regno_mode_ok): Add
21986         cast to enum type.
21987         (altivec_expand_vec_set_builtin): Change 0 to EXPAND_NORMAL in
21988         function call.
21989         (emit_unlikely_jump): Use add_reg_note.
21990         (rs6000_emit_allocate_stack): Likewise.
21991         (rs6000_frame_related, rs6000_emit_prologue): Likewise.
21992         (output_toc): Change 1 to INSERT in function call.
21993         (output_profile_hook): Change 0 to LCT_NORMAL in function call.
21994         (rs6000_initialize_trampoline): Likewise.
21995         (rs6000_init_dwarf_reg_sizes_extra): Change 0 to EXPAND_NORMAL in
21996         function call.
21997         * config/s390/s390.c (s390_rtx_costs): Add cast to enum type.
21998         (s390_expand_movmem): Change 0 to OPTAB_DIRECT in function call.
21999         (s390_expand_setmem, s390_expand_cmpmem): Likewise.
22000         (save_gprs): Use add_reg_note.
22001         (s390_emit_prologue): Likewise.
22002         (s390_expand_builtin): Change 0 to EXPAND_NORMAL in function call.
22003         * config/sparc/sparc.c (sparc_expand_prologue): Use add_reg_note.
22004         (sparc_fold_builtin): Add cast to enum type.
22005         * config/spu/spu.c (spu_emit_branch_or_set): Change ior_code to
22006         enum insn_code.
22007         (spu_expand_prologue): Use add_reg_note.
22008         (expand_builtin_args): Change 0 to EXPAND_NORMAL in function call.
22010 2009-04-20  Ian Lance Taylor  <iant@google.com>
22012         * c-parser.c (c_parser_attributes): Change VEC back to tree list.
22013         (c_parser_postfix_expression_after_primary): Get VEC for list of
22014         arguments.  Get original types of arguments.  Call
22015         build_function_call_vec.
22016         (cached_expr_list_1, cached_expr_list_2): New static variables.
22017         (c_parser_expr_list): Change return type to VEC *.  Add
22018         p_orig_types parameter.  Change all callers.
22019         (c_parser_release_expr): New static function.
22020         (c_parser_vec_to_tree_list): New static function.
22021         * c-typeck.c (build_function_call): Rewrite to build a VEC and
22022         call build_function_call_vec.
22023         (build_function_call_vec): New function, based on old
22024         build_function_call.
22025         (convert_arguments): Remove nargs and argarray parameters.  Change
22026         values to a VEC.  Add origtypes parameter.
22027         (build_modify_expr): Add rhs_origtype parameter.  Change all callers.
22028         (convert_for_assignment): Add origtype parameter.  Change all
22029         callers.  If warn_cxx_compat, check for conversion to an enum
22030         type when calling a function.
22031         (store_init_value): Add origtype parameter.  Change all callers.
22032         (digest_init): Likewise.
22033         (struct init_node): Add origtype field.
22034         (add_pending_init): Add origtype parameter.  Change all callers.
22035         (output_init_element): Likewise.
22036         (output_pending_init_elements): Pass origtype from init_node to
22037         output_init_element.
22038         (process_init_element): Pass origtype from c_expr to
22039         output_init_element.
22040         (c_finish_return): Add origtype parameter.  Change all callers.
22041         * c-common.c (sync_resolve_size): Change params to VEC *.  Change
22042         caller.
22043         (sync_resolve_params): Likewise.
22044         (sync_resolve_return): Change params to first_param.  Change caller.
22045         (resolve_overloaded_builtins): Change params to VEC *.  Change
22046         callers.  Save first parameter around call to build_function_call_vec.
22047         * c-decl.c (finish_decl): Add origtype parameter.  Change all
22048         callers.  Call build_function_call_vec rather than
22049         build_function_call for cleanup.
22050         * c-tree.h: Update declarations.
22051         * c-common.h: Update declarations.
22052         * stub-objc.c (objc_rewrite_function_call): Change parameter from
22053         params to first_param.
22054         * target.h (struct gcc_target): Change resolve_overloaded_builtin
22055         params parameter from tree to void *.
22056         * config/rs6000/rs6000-c.c (altivec_resolve_overloaded_builtin):
22057         Change arglist parameter to have type void *, and to be a pointer
22058         to a VEC.
22059         * config/rs6000/rs6000-protos.h
22060         (altivec_resolve_overloaded_builtin): Update declaration.
22061         * config/spu/spu-c.c (spu_resolved_overloaded_builtin): Change
22062         fnargs parameter to have type void *, and to be a pointer to a
22063         VEC.  Call build_function_call_vec instead of
22064         build_function_call.
22065         * config/spu/spu-protos.h (spu_expand_builtin): Update declaration.
22067 2009-04-20  Joey Ye  <joey.ye@intel.com>
22068             Xuepeng Guo  <xuepeng.guo@intel.com>
22069             H.J. Lu  <hongjiu.lu@intel.com>
22071         * config/i386/atom.md: Add bypasses with ix86_dep_by_shift_count.
22073         * config/i386/i386.c (LEA_SEARCH_THRESHOLD): New macro.
22074         (IX86_LEA_PRIORITY): Likewise.
22075         (distance_non_agu_define): New function.
22076         (distance_agu_use): Likewise.
22077         (ix86_lea_for_add_ok): Likewise.
22078         (ix86_dep_by_shift_count): Likewise.
22080         * config/i386/i386.md: Call ix86_lea_for_add_ok to decide we
22081         should split for LEA.
22083         * config/i386/i386-protos.h (ix86_lea_for_add_ok): Declare new
22084         function.
22085         (ix86_dep_by_shift_count): Likewise.
22087 2009-04-20  Richard Guenther  <rguenther@suse.de>
22089         * expr.c (handled_component_p): Move ...
22090         * tree.h (handled_component_p): ... here.
22091         * tree.def: Re-order BIT_FIELD_REF, COMPONENT_REF,
22092         ARRAY_REF, ARRAY_RANGE_REF, VIEW_CONVERT_EXPR, IMAGPART_EXPR
22093         and REALPART_EXPR to be in one group.
22095 2009-04-20  Richard Guenther  <rguenther@suse.de>
22097         * basic-block.h (get_all_dominated_blocks): Declare.
22098         * dominance.c (get_all_dominated_blocks): New function.
22099         * tree-cfg.c (get_all_dominated_blocks): Remove.
22100         (remove_edge_and_dominated_blocks): Adjust.
22101         * tree-ssa-phiprop.c (tree_ssa_phiprop_1): Fold in ...
22102         (tree_ssa_phiprop): ... here.  Use get_all_dominated_blocks
22103         instead of recursing.
22105 2009-04-20  Doug Kwan  <dougkwan@google.com>
22107         * cgraph.h (cgraph_node_ptr): New type for vector functions.
22108         (struct cgraph_node_set_def): New type.
22109         (cgraph_node_set) New type. Also declare vector functions.
22110         (struct cgraph_node_set_element_def): New type.
22111         (cgraph_node_set_element): Ditto.
22112         (cgraph_node_set_iterator): New iterator type.
22113         (cgraph_node_set_new, cgraph_node_set_find, cgraph_node_set_add,
22114         cgraph_node_set_remove, dump_cgraph_node_set,
22115         debug_cgraph_node_set): New prototypes.
22116         (csi_end_p, csi_next, csi_node, csi_start, cgraph_node_in_set_p,
22117         cgraph_node_set_size): New inlines.
22118         * tree-pass.h (struct cgraph_node_set_def): New decl to avoid
22119         including cgraph.h.
22120         (struct ipa_opt_pass): Add struct cgraph_node_set_def
22121         argument to function 'write_summary'.
22122         * ipa.c: Include ggc.h.
22123         (hash_cgraph_node_set_element,
22124         eq_cgraph_node_set_element, cgraph_node_set_new,
22125         cgraph_node_set_add, cgraph_node_set_remove,
22126         cgraph_node_set_find, dump_cgraph_node_set,
22127         debug_cgraph_node_set): New functions.
22128         * Makefile.in (ipa.o): Add dependency on GGC_H.
22130 2009-04-20  Ira Rosen  <irar@il.ibm.com>
22132         PR tree-optimization/39675
22133         * tree-vect-loop.c (vect_transform_loop): Remove currently redundant
22134         check of the return code of vect_schedule_slp. Check that
22135         stmt_vec_info still exists for the statement, before checking its
22136         vectorization type.
22138 2009-04-20  Michael Matz  <matz@suse.de>
22140         * Makefile.in (generated_files): Take out $(simple_generated_c).
22142 2009-04-19  Dave Korn  <dave.korn.cygwin@gmail.com>
22144         * config/i386/cygwin-stdint.h (INTPTR_TYPE):  Remove "long".
22145         (UINTPTR_TYPE):  Likewise.
22147 2009-04-19  Joseph Myers  <joseph@codesourcery.com>
22149         PR c/37481
22150         * c-typeck.c (digest_init): Check for initializing an array with a
22151         string literal.
22153 2009-04-19  Joseph Myers  <joseph@codesourcery.com>
22155         PR c/19771
22156         * c-semantics.c (pop_stmt_list): Propagate
22157         STATEMENT_LIST_HAS_LABEL to parent statement list.
22159 2009-04-19  Adam Nemet  <anemet@caviumnetworks.com>
22161         * config/mips/mips.h (mips_tune_attr): New macro.
22162         * config/mips/mips.md (cpu): Use it.
22164 2009-04-19  Joseph Myers  <joseph@codesourcery.com>
22166         PR c/38243
22167         * c-decl.c (shadow_tag_warned): Diagnose use of restrict when
22168         declaring a tag.
22170 2009-04-19  Diego Novillo  <dnovillo@google.com>
22172         * toplev.c (compile_file): Move call to coverage_finish ...
22173         * cgraphunit.c (ipa_passes): ... here.
22174         Call cgraph_process_new_functions.
22175         * ipa-utils.c (get_base_var): Handle CONSTRUCTOR.
22176         * Makefile.in (cgraphunit.o): Add dependency on COVERAGE_H.
22178 2009-04-19  Jan Hubicka  <jh@suse.cz>
22180         * cgraph.c (cgraph_create_edge, cgraph_set_call_stmt): Set proper
22181         cfun.
22182         (dump_cgraph_node): Dump can throw external flag.
22183         * ipa-pure-const.c (propagate): Fix propagation of nothrow flags.
22185 2009-04-19  Manuel López-Ibáñez  <manu@gcc.gnu.org>
22187         PR c/32061
22188         PR c++/36954
22189         * doc/invoke.texi: Add -Wlogical-op to -Wextra.
22190         * common.opt (Wlogical-op): Move from here...
22191         * c.opt (Wlogical-op): ... to here.
22192         * c-typeck.c (parser_build_binary_op): Update call to
22193         warn_logical_operator.
22194         * c-opts.c (c_common_post_options): Enable warn_logical_op with
22195         extra_warnings.
22196         * c-common.c (warn_logical_op): Update.
22197         * c-common.h (warn_logical_op): Update declaration.
22199 2009-04-19  Eric Botcazou  <ebotcazou@adacore.com>
22201         * tree.c (protected_set_expr_location): Fix formatting.
22203 2009-04-18  Joseph Myers  <joseph@codesourcery.com>
22205         PR c/27676
22206         * c-typeck.c (readonly_warning): new.
22207         (build_unary_op, build_modify_expr): Use readonly_warning for
22208         storing into something readonly but not const-qualified.
22210 2009-04-18  Joseph Myers  <joseph@codesourcery.com>
22212         PR c/22367
22213         * c-typeck.c (build_unary_op): Check for taking address of
22214         expression of type void.
22216 2009-04-18  Joseph Myers  <joseph@codesourcery.com>
22218         PR c/35210
22219         * c-typeck.c (build_function_call): Check for calling a function
22220         with qualified void return types.  Call require_complete_type when
22221         generating a trap.
22223 2009-04-18  Jan Hubicka  <jh@suse.cz>
22225         * cgraph.c (cgraph_make_edge, dump_cgraph_node, cgraph_set_call_stmt):
22226         Set nothrow flag.
22227         * cgraph.h (struct function): Reduce loop_nest to 30 bits; add
22228         can_throw_external flag.
22229         * ipa-reference.c (ipa_utils_reduced_inorder): Update call.
22230         * ipa-pure-const.c (ignore_edge): New function.
22231         (propagate): Compute order for NOTHROW computation; set NOTHROWs
22232         only over can_throw_external edges.
22233         (local_pure_const): Add nothrow flag.
22234         * ipa-utils.c (searchc): Add ignore_edge callback.
22235         (ipa_utils_reduced_inorder): Add ignore_edge callback.
22236         * ipa-utils.h (ipa_utils_reduced_inorder): Update prototype.
22237         (set_nothrow_function_flags): Update cgraph.
22238         * tree-cfg.c (verify_stmt): Relax nothrow checking when in IPA mode.
22240 2009-04-18  Richard Guenther  <rguenther@suse.de>
22242         PR middle-end/39804
22243         * tree-ssa-ccp.c (fold_stmt_1): New function factored from ...
22244         (fold_stmt): ... this and ...
22245         (fold_stmt_inplace): ... this.
22246         (fold_stmt_1): Fold references in calls and asms.
22247         * tree-cfg.c (remove_useless_stmts_cond): Use fold_stmt.
22249 2009-04-18  Kazu Hirata  <kazu@codesourcery.com>
22251         * tree-vrp.c (ssa_name_nonzero_p): Remove.
22252         * tree.h: Remove the prototype for ssa_name_nonzero_p.
22254 2009-04-18  Kazu Hirata  <kazu@codesourcery.com>
22256         * tree.c (function_args_count): Remove.
22257         * tree.h: Remove the prototype for function_args_count.
22259 2009-04-18  Kazu Hirata  <kazu@codesourcery.com>
22261         * tree-iterator.c (expr_only): Remove.
22262         * tree.h: Remove the prototype for expr_only.
22264 2009-04-18  Kazu Hirata  <kazu@codesourcery.com>
22266         * reginfo.c (cannot_change_mode_set_regs): Remove.
22267         * rtl.h: Remove the prototype for cannot_change_mode_set_regs.
22269 2009-04-08  Anatoly Sokolov  <aesok@post.ru>
22271         * config/avr/avr.md (*rotlsi3_8, *rotlsi3_16, *rotlsi3_24 ): Check
22272         whether operands 0 and 1 overlaps.
22274 2009-04-18  Manuel López-Ibáñez  <manu@gcc.gnu.org>
22276         PR middle-end/36902
22277         * tree-vrp.c (check_array_ref): Pass a location_t instead of a
22278         pointer. Use warning_at instead of warning.
22279         (search_for_addr_array): Likewise.
22280         (check_array_bounds): Likewise.
22281         (check_all_array_refs): Check that the incoming edge is not in the
22282         list of edges to be removed.
22283         (check_all_array_refs): Avoid the temporal pointer.
22284         (vrp_visit_cond_stmt): Fix typo.
22285         (simplify_switch_using_ranges): Handle the case where the switch
22286         index is an integer constant.
22288 2009-04-18  Adam Nemet  <anemet@caviumnetworks.com>
22290         * config/mips/mips.c (mips_final_postscan_insn): Make it static.
22292 2009-04-18  Kazu Hirata  <kazu@codesourcery.com>
22294         * doc/extend.texi, doc/invoke.texi: Fix typos.
22296 2009-04-17  Cary Coutant  <ccoutant@google.com>
22298         * tree-flow-inline.h (get_lineno): Fix inverted test.
22300 2009-04-17  Diego Novillo  <dnovillo@google.com>
22302         * tree-ssa-pre.c (create_expression_by_pieces): Remove
22303         assertion for AVAIL_OUT.
22305 2009-04-17  Mike Frysinger  <vapier@gentoo.org>
22307         PR target/38627
22308         * config/sh/lib1funcs.asm [__ELF__ && __linux__]: Add .note.GNU-stack.
22309         * config/sh/linux-atomic.asm: Likewise.
22311 2009-04-17  Diego Novillo  <dnovillo@google.com>
22313         * except.c (debug_eh_tree): New.
22314         (struct eh_region, struct eh_status): Move ...
22315         * except.h: ... here.
22316         (add_type_for_runtime): Declare extern.
22317         (lookup_type_for_runtime): Likewise.
22318         (debug_eh_tree): Declare.
22319         * Makefile.in (GTFILES): List except.h before except.c
22321 2009-04-17  Diego Novillo  <dnovillo@google.com>
22323         * omp-low.c (create_omp_child_function): Set DECL_CONTEXT for DECL.
22324         * cgraphunit.c (cgraph_build_static_cdtor): Likewise.
22325         * tree-dfa.c (find_referenced_vars_in): Factor out of ...
22326         (find_vars_r): ... here.
22327         * tree-flow.h (find_referenced_vars_in): Declare.
22328         * tree-ssa-pre.c (create_expression_by_pieces): Assert
22329         that AVAIL_OUT exists for BLOCK.
22330         * Makefile.in (CGRAPH_H): Add dependency on cif-code.def
22331         (tree-loop-distribution.o): Fix dependency on TREE_VECTORIZER_H.
22332         (tree-parloops.o): Likewise.
22334 2009-04-17  Simon Baldwin  <simonb@google.com>
22336         * toplev.c (default_tree_printer): Add handling for %E format.
22338 2009-04-17  Diego Novillo  <dnovillo@google.com>
22340         * tree-pretty-print.c (dump_generic_node): Add break after
22341         TREE_BINFO handler.  Handle COMPLEX_TYPE, REAL_TYPE and
22342         FIXED_POINT_TYPE.  Handle NULL TREE_TYPEs.  Handle METHOD_TYPE and
22343         FUNCTION_TYPE together.  Call print_struct_decl when printing
22344         structures and TDF_SLIM is not given.
22345         (print_struct_decl): Fix logic for detecting recursion.
22347 2009-04-17  Rafael Avila de Espindola  <espindola@google.com>
22349         PR 31567
22350         * gcc.c (create_at_file): New.
22351         (compile_input_file_p): New.
22352         (do_spec_1): Use @args files for %i. Use create_at_file for %o.
22353         * main.c (main): Update call to toplev_main.
22354         * toplev.c (toplev_main): Change signature. Call expandargv.
22355         * toplev.h (toplev_main): Change signature.
22357 2009-04-17  Eric Botcazou  <ebotcazou@adacore.com>
22359         * dwarf2out.c (field_byte_offset): Use the type size as the field size
22360         if the latter is not constant.
22362 2009-04-17  David Edelsohn  <edelsohn@gnu.org>
22364         * dbxout.c (xcoff_debug_hooks): Add set_name_debug_nothing.
22366 2009-04-17  Eric Botcazou  <ebotcazou@adacore.com>
22368         * dbxout.c (dbxout_block): Reinstate test on TREE_USED.
22369         * tree-ssa-live.c (remove_unused_scope_block_p): Update TREE_USED bit.
22371 2009-04-17  Richard Guenther  <rguenther@suse.de>
22373         * tree-ssa-structalias.c (get_constraint_for_component_ref):
22374         Handle component references view-converting an invariant address.
22376 2009-04-17  Adam Nemet  <anemet@caviumnetworks.com>
22378         * doc/tm.texi (TARGET_DEFAULT_TARGET_FLAGS,
22379         TARGET_MIN_ANCHOR_OFFSET, TARGET_MAX_ANCHOR_OFFSET,
22380         TARGET_HAVE_SRODATA_SECTION, TARGET_HAVE_TLS,
22381         TARGET_UNWIND_TABLES_DEFAULT, TARGET_TERMINATE_DW2_EH_FRAME_INFO):
22382         Use @deftypevr rather than @deftypevar.
22384 2009-04-17  Richard Guenther  <rguenther@suse.de>
22386         * tree-ssa-forwprop.c (get_prop_dest_stmt): Clean up tuplification.
22387         (get_prop_source_stmt): Likewise.
22388         (can_propagate_from): Likewise.
22390 2009-04-17  Andrew Stubbs  <ams@codesourcery.com>
22392         * configure.ac: Add new AC_SUBST for TM_ENDIAN_CONFIG,
22393         TM_MULTILIB_CONFIG and TM_MULTILIB_EXCEPTIONS_CONFIG.
22394         (--with-multilib-list): Add default value.
22395         * configure: Regenerate.
22396         * Makefile.in (TM_ENDIAN_CONFIG): Define.
22397         (TM_MULTILIB_CONFIG, TM_MULTILIB_EXCEPTIONS_CONFIG): Define.
22398         * config.gcc (sh-*-*): Switch to using TM_ENDIAN_CONFIG,
22399         TM_MULTILIB_CONFIG, and TM_MULTILIB_EXCEPTIONS_CONFIG.
22400         Don't add default cpu to multilib list unnecessarily, but do enable
22401         the relevant compiler option..
22402         Add support for --with-multilib-list=<blank> and
22403         --with-multilib-list=!<somelib> to supress unwanted multilibs.
22404         * config/sh/t-sh (DEFAULT_ENDIAN, OTHER_ENDIAN): New variables.
22405         (MULTILIB_ENDIAN, MULTILIB_CPUS): Delete variables.
22406         (MULTILIB_OPTIONS): Redefine using OTHER_ENDIAN and
22407         TM_MULTILIB_CONFIG.
22408         (MULTILIB_EXCEPTIONS): Add TM_MULTILIB_EXCEPTIONS_CONFIG.
22409         (MULTILIB_OSDIRNAMES): New variable.
22410         * config/sh/t-1e: Delete file.
22411         * config/sh/t-mlib-sh1: Delete file.
22412         * config/sh/t-mlib-sh2: Delete file.
22413         * config/sh/t-mlib-sh2a: Delete file.
22414         * config/sh/t-mlib-sh2a-nofpu: Delete file.
22415         * config/sh/t-mlib-sh2a-single: Delete file.
22416         * config/sh/t-mlib-sh2a-single-only: Delete file.
22417         * config/sh/t-mlib-sh2e: Delete file.
22418         * config/sh/t-mlib-sh3e: Delete file.
22419         * config/sh/t-mlib-sh4: Delete file.
22420         * config/sh/t-mlib-sh4-nofpu: Delete file.
22421         * config/sh/t-mlib-sh4-single: Delete file.
22422         * config/sh/t-mlib-sh4-single-only: Delete file.
22423         * config/sh/t-mlib-sh4a: Delete file.
22424         * config/sh/t-mlib-sh4a-nofpu: Delete file.
22425         * config/sh/t-mlib-sh4a-single: Delete file.
22426         * config/sh/t-mlib-sh4a-single-only: Delete file.
22427         * config/sh/t-mlib-sh4al: Delete file.
22428         * config/sh/t-mlib-sh5-32media: Delete file.
22429         * config/sh/t-mlib-sh5-32media-nofpu: Delete file.
22430         * config/sh/t-mlib-sh5-64media: Delete file.
22431         * config/sh/t-mlib-sh5-64media-nofpu: Delete file.
22432         * config/sh/t-mlib-sh5-compact: Delete file.
22433         * config/sh/t-mlib-sh5-compact-nofpu: Delete file.
22434         * config/sh/t-linux: Don't override MULTILIB_EXCEPTIONS.
22435         * doc/install.texi (Options specification): Add
22436         --with-multilib-list and --with-endian.
22438 2009-04-17  Rafael Avila de Espindola  <espindola@google.com>
22440         * Makefile.in (REVISION_s): Always include quotes. Change ifdef to use
22441         REVISION_c.
22442         (OBJS-common): Add plugin-version.o.
22443         (plugin-version.o): New.
22444         * gcc-plugin.h (plugin_gcc_version): New.
22445         (plugin_default_version_check): New.
22446         (plugin_init_func, plugin_init): Add version argument.
22447         * plugin-version.c: New.
22448         * plugin.c (str_plugin_gcc_version_name): New.
22449         (try_init_one_plugin): Read plugin_gcc_version from the plugin and
22450         pass it to the init function.
22451         (plugin_default_version_check): New.
22453 2009-04-17  Richard Guenther  <rguenther@suse.de>
22455         * tree-ssa-alias.c (refs_may_alias_p_1): Do not use TBAA
22456         for decl-vs-decl disambiguation.
22458 2009-04-17  Andreas Krebbel  <krebbel1@de.ibm.com>
22460         * config/s390/s390.h (s390_tune_attr): New macro definition.
22461         * config/s390/s390.md (cpu attribute): Map to s390_tune_attr.
22463 2009-04-17  Richard Guenther  <rguenther@suse.de>
22465         * tree-ssa-ccp.c (struct fold_stmt_r_data): Remove.
22466         (fold_stmt_r): Likewise.
22467         (maybe_fold_reference): New function.
22468         (fold_gimple_assign): Handle cases fold_stmt_r did.
22469         (fold_stmt): Do not use fold_stmt_r.
22470         (fold_stmt_inplace): Likewise.
22472 2009-04-17  Richard Guenther  <rguenther@suse.de>
22474         * tree-ssa-dom.c (gimple_assign_unary_useless_conversion_p): Remove.
22475         (record_equivalences_from_stmt): Remove useless checks and
22476         simplifications.
22477         * tree-ssa-pre.c (eliminate): Avoid converting a constant if
22478         the type is already suitable.
22480 2009-04-17  Paolo Bonzini  <bonzini@gnu.org>
22482         * config/sh/sh.h (FUNCTION_VALUE): Fix call to sh_promote_prototypes.
22484 2009-04-17  Uros Bizjak  <ubizjak@gmail.com>
22486         * config/arm/sfp-machine.h (__gcc_CMPtype): New typedef.
22487         (CMPtype): Define as __gcc_CMPtype.
22489 2009-04-17  Aurelien Jarno  <aurelien@aurel32.net>
22491         * config.gcc: Add soft-fp/t-softfp and i386/t-linux to tmake_file
22492         for i[34567]86-*-kfreebsd*-gnu*, x86_64-*-kfreebsd*-gnu*.
22494 2009-04-17  Richard Guenther  <rguenther@suse.de>
22496         PR tree-optimization/39746
22497         * tree-ssa-alias.c (ref_maybe_used_by_call_p_1): Remove
22498         special-casing for builtins and static variable use/def.
22499         (call_may_clobber_ref_p_1): Likewise.
22501 2009-04-16  Ian Lance Taylor  <iant@google.com>
22503         * df.h: Include "timevar.h".
22504         (struct df_problem): Change tv_id field to timevar_id_t.
22505         * tree-pass.h: Include "timevar.h".
22506         (struct opt_pass): Change tv_id field to timevar_id_t.
22507         * timevar.h (timevar_id_t): Define TV_NONE.
22508         * passes.c (execute_one_ipa_transform_pass): Check for tv_id !=
22509         TV_NONE rather than tv_id != 0.
22510         (execute_one_pass): Likewise.
22511         * Makefile.in (DF_H): Add $(TIMEVAR_H).
22512         (TREE_PASS_H): Define.  Change all instances of tree-pass.h in
22513         dependencies to $(TREE_PASS_H).
22514         * bt-load.c (pass_branch_target_load_optimize1): Set tv_id field
22515         to TV_NONE.
22516         (pass_branch_target_load_optimize2): Likewise.
22517         * cfglayout.c (pass_into_cfg_layout_mode): Likewise.
22518         (pass_outof_cfg_layout_mode): Likewise.
22519         * cgraphbuild.c (pass_remove_cgraph_callee_edges): Likewise.
22520         (pass_rebuild_cgraph_edges): Likewise.
22521         (pass_remove_cgraph_callee_edges): Likewise.
22522         * df-core.c (pass_df_initialize_opt): Likewise.
22523         (pass_df_initialize_no_opt): Likewise.
22524         (pass_df_finish): Likewise.
22525         * emit-rtl.c (pass_unshare_all_rtl): Likewise.
22526         * except.c (pass_set_nothrow_function_flags): Likewise.
22527         (pass_convert_to_eh_region_ranges): Likewise.
22528         * final.c (pass_compute_alignments): Likewise.
22529         * function.c (pass_instantiate_virtual_regs): Likewise.
22530         (pass_init_function): Likewise.
22531         (pass_leaf_regs): Likewise.
22532         (pass_match_asm_constraints): Likewise.
22533         * gimple-low.c (pass_lower_cf): Likewise.
22534         (pass_mark_used_blocks): Likewise.
22535         * init-regs.c (pass_initialize_regs): Likewise.
22536         * integrate.c (pass_initial_value_sets): Likewise.
22537         * ira.c (pass_ira): Likewise.
22538         * jump.c (pass_cleanup_barriers): Likewise.
22539         * omp-low.c (pass_expand_omp): Likewise.
22540         (pass_lower_omp): Likewise.
22541         * matrix-reorg.c (pass_ipa_matrix_reorg): Likewise.
22542         * recog.c (pass_split_all_insns): Likewise.
22543         (pass_split_after_reload): Likewise.
22544         (pass_split_before_regstack): Likewise.
22545         (pass_split_before_sched2): Likewise.
22546         (pass_split_for_shorten_branches): Likewise.
22547         * reginfo.c (pass_reginfo_init): Likewise.
22548         (pass_subregs_of_mode_init): Likewise.
22549         (pass_subregs_of_mode_finish): Likewise.
22550         * passes.c (pass_postreload): Likewise.
22551         * stack-ptr-mod.c (pass_stack_ptr_mod): Likewise.
22552         * tree-cfg.c (pass_remove_useless_stmts): Likewise.
22553         (pass_warn_function_return): Likewise.
22554         (pass_warn_function_noreturn): Likewise.
22555         * tree-complex.c (pass_lower_complex): Likewise.
22556         (pass_lower_complex_O0): Likewise.
22557         * tree-if-conv.c (pass_if_conversion): Likewise.
22558         * tree-into-ssa.c (pass_build_ssa): Likewise.
22559         * tree-mudflap.c (pass_mudflap_1): Likewise.
22560         (pass_mudflap_2): Likewise.
22561         * tree-nomudflap.c (pass_mudflap_1): Likewise.
22562         (pass_mudflap_2): Likewise.
22563         * tree-nrv.c (pass_return_slot): Likewise.
22564         * tree-object-size.c (pass_object_sizes): Likewise.
22565         * tree-optimize.c (pass_all_optimizations): Likewise.
22566         (pass_early_local_passes): Likewise.
22567         (pass_all_early_optimizations): Likewise.
22568         (pass_cleanup_cfg): Likewise.
22569         (pass_cleanup_cfg_post_optimizing): Likewise.
22570         (pass_free_datastructures): Likewise.
22571         (pass_free_cfg_annotations): Likewise.
22572         (pass_fixup_cfg): Likewise.
22573         (pass_init_datastructures): Likewise.
22574         * tree-ssa.c (pass_early_warn_uninitialized): Likewise.
22575         (pass_late_warn_uninitialized): Likewise.
22576         (pass_update_address_taken): Likewise.
22577         * tree-ssa-ccp.c (pass_fold_builtins): Likewise.
22578         * tree-ssa-math-opts.c (pass_cse_reciprocals): Likewise.
22579         (pass_cse_sincos): Likewise.
22580         (pass_convert_to_rsqrt): Likewise.
22581         * tree-ssa-structalias.c (pass_build_alias): Likewise.
22582         * tree-stdarg.c (pass_stdarg): Likewise.
22583         * tree-tailcall.c (pass_tail_recursion): Likewise.
22584         (pass_tail_calls): Likewise.
22585         * tree-vect-generic.c (pass_lower_vector): Likewise.
22586         (pass_lower_vector_ssa): Likewise.
22587         * tree-vectorizer.c (pass_ipa_increase_alignment): Likewise.
22589 2009-04-16  Joseph Myers  <joseph@codesourcery.com>
22591         * config/mips/mips.c (mips_rtx_cost_data): Use SOFT_FP_COSTS in
22592         XLR entry.
22593         * config/mips/mips.h (MIPS_ISA_LEVEL_SPEC, MIPS_ARCH_FLOAT_SPEC):
22594         Handle -march=xlr.
22595         * config/mips/xlr.md (ir_xlr_alu): Also accept insn types move,
22596         logical and signext.
22598 2009-04-16  Kaz Kojima  <kkojima@gcc.gnu.org>
22600         PR target/39767
22601         * config/sh/predicates.md (arith_operand): Check if the operand
22602         of TRUNCATE is a REG.
22604 2009-04-16  Kazu Hirata  <kazu@codesourcery.com>
22606         * cfgrtl.c (delete_insn_chain_and_edges): Remove.
22607         * rtl.h: Remove the prototype for delete_insn_chain_and_edges.
22609 2009-04-16  Kazu Hirata  <kazu@codesourcery.com>
22611         * tree-iterator.c (tsi_split_statement_list_after,
22612         tsi_split_statement_list_before): Remove.
22613         * tree-iterator.h: Remove the prototypes for
22614         tsi_split_statement_list_after and tsi_split_statement_list_before.
22616 2009-04-16  Kazu Hirata  <kazu@codesourcery.com>
22618         * tree-ssa-propagate.c (stmt_makes_single_load): Remove.
22619         * tree-ssa-propagate.h: Remove the prototype for
22620         stmt_makes_single_load.
22622 2009-04-16  Kazu Hirata  <kazu@codesourcery.com>
22624         * emit-rtl.c (set_mem_attrs_from_reg): Remove.
22625         * rtl.h: Remove the prototype for set_mem_attrs_from_reg.
22627 2009-04-16  Kazu Hirata  <kazu@codesourcery.com>
22629         * tree-iterator.c (EXPR_LAST_BODY): Remove.
22631 2009-04-16  Kazu Hirata  <kazu@codesourcery.com>
22633         * except.c (eh_region_outer_p): Remove.
22634         * except.h: Remove the prototype for eh_region_outer_p.
22636 2009-04-16  Kazu Hirata  <kazu@codesourcery.com>
22638         * function.c (current_function_assembler_name): Remove.
22639         * function.h: Remove the prototype for
22640         current_function_assembler_name.
22642 2009-04-16  Ian Lance Taylor  <iant@google.com>
22644         * rtlanal.c (alloc_reg_note): New function, broken out of add_reg_note.
22645         (add_reg_note): Call alloc_reg_note.
22646         * rtl.h (alloc_reg_note): Declare.
22647         * combine.c (try_combine): Use alloc_reg_note.
22648         (recog_for_combine, move_deaths): Likewise.
22649         (distribute_notes): Use alloc_reg_note and add_reg_note.
22650         * haifa-sched.c (sched_create_recovery_edges): Use add_reg_note.
22651         * combine-stack-adj.c (adjust_frame_related_expr): Likewise.
22652         * reload1.c (eliminate_regs_1): Use alloc_reg_note.
22654 2009-04-16  Vladimir Makarov  <vmakarov@redhat.com>
22656         PR rtl-optimization/39762
22657         * ira-int.h (ira_register_move_cost, ira_may_move_in_cost,
22658         ira_may_move_out_cost): Add comments about way of their usage.
22659         (ira_get_register_move_cost, ira_get_may_move_cost): New functions.
22661         * ira-conflicts.c (process_regs_for_copy): Use function
22662         ira_get_register_move_cost instead of global
22663         ira_register_move_cost.
22665         * ira-color.c (update_copy_costs, calculate_allocno_spill_cost,
22666         color_pass, move_spill_restore, update_curr_costs): Ditto.
22668         * ira-lives.c (process_single_reg_class_operands): Ditto.
22670         * ira-emit.c (emit_move_list): Ditto.
22672         * ira-costs.c (copy_cost): Don't call ira_init_register_move_cost.
22673         (record_reg_classes): Ditto.  Use functions
22674         ira_get_register_move_cost and ira_get_may_move_cost instead of
22675         global vars ira_register_move_cost, ira_may_move_out_cost and
22676         ira_may_move_in_cost.
22677         (record_address_regs): Don't call ira_init_register_move_cost.
22678         Use function ira_get_may_move_cost instead of global
22679         ira_may_move_in_cost.
22680         (process_bb_node_for_hard_reg_moves): Use function
22681         ira_get_register_move_cost instead of global ira_register_move_cost.
22682         (ira_costs): Don't call ira_init_register_move_cost.
22684 2009-04-16  Richard Guenther  <rguenther@suse.de>
22686         * tree-cfg.c (verify_gimple_assign_binary):
22687         Allow POINTER_PLUS_EXPR-like PLUS_EXPR for vectors.
22688         * ipa-struct-reorg.c (gen_size): Fold the built expressions.
22689         (create_general_new_stmt): Note that this function is broken.
22691 2009-04-16  Rafael Avila de Espindola  <espindola@google.com>
22693         * common.opt (fhelp): Add Var(help_flag).
22694         * gcc-plugin.h (plugin_info): Add help.
22695         * plugin.c (plugin_name_args): Add help.
22696         (register_plugin_info): Set plugin->help.
22697         (print_help_one_plugin): New.
22698         (print_plugins_help): New.
22699         * plugin.h (print_plugins_help): New.
22700         * toplev.c (toplev_main): Call print_plugins_help if needed.
22702 2009-04-16  Richard Guenther  <rguenther@suse.de>
22704         * gimple.c (gimple_copy): Do not clear addresses_taken bitmap.
22705         (gimple_ior_addresses_taken_1): New function.
22706         (gimple_ior_addresses_taken): Likewise.
22707         * gimple.h (struct gimple_statement_with_ops_base): Remove
22708         addresses_taken member.
22709         (gimple_ior_addresses_taken): Declare.
22710         (gimple_addresses_taken, gimple_addresses_taken_ptr,
22711         gimple_set_addresses_taken): Remove.
22712         * ipa-reference.c (mark_address): New function.
22713         (scan_stmt_for_static_refs): Use it for marking addresses taken.
22714         * tree-ssa-operands.c (add_to_addressable_set): Rename to ...
22715         (mark_address_taken): ... this.  Just set TREE_ADDRESSABLE.
22716         (gimple_add_to_addresses_taken): Remove.
22717         (get_tmr_operands): Call mark_address_taken.
22718         (get_asm_expr_operands): Likewise.
22719         (get_expr_operands): Likewise.
22720         (build_ssa_operands): Do not clear the addresses_taken bitmap.
22721         (free_stmt_operands): Do not free it.
22722         * tree-ssa.c (delete_tree_ssa): Likewise.
22723         (execute_update_addresses_taken): Use gimple_ior_addresses_taken.
22725 2009-04-16  Richard Guenther  <rguenther@suse.de>
22727         * gimple.h (walk_stmt_load_store_addr_ops): Declare.
22728         (walk_stmt_load_store_ops): Likewise.
22729         * gimple.c (get_base_loadstore): New function.
22730         (walk_stmt_load_store_addr_ops): Likewise.
22731         (walk_stmt_load_store_ops): Likewise.
22732         * ipa-pure-const.c (check_op): Simplify.
22733         (check_load, check_store): New functions.
22734         (check_stmt): Use walk_stmt_load_store_ops.
22735         * ipa-reference.c (mark_load): Adjust signature.
22736         (mark_store): Likewise.
22737         (scan_stmt_for_static_refs): Use walk_stmt_load_store_addr_ops.
22739 2009-04-16  Rafael Avila de Espindola  <espindola@google.com>
22741         * gcc-plugin.h (plugin_event): Add PLUGIN_INFO.
22742         (plugin_info): New.
22743         * opts.c (common_handle_option): Don't call print_version.
22744         * plugin.c (plugin_name_args): Add version.
22745         (register_plugin_info): New.
22746         (register_callback): Handle PLUGIN_INFO.
22747         (try_init_one_plugin): New.
22748         (init_one_plugin): Use try_init_one_plugin. Only free plugin_name_args
22749         if failed to init.
22750         (finalize_one_plugin): New.
22751         (finalize_plugins): New.
22752         (print_one_plugin): New.
22753         (print_plugins_versions): New.
22754         * plugin.h (print_plugins_versions): New.
22755         (finalize_plugins): New.
22756         * toplev.c (compile_file): Don't call initialize_plugins.
22757         (print_version): Call print_plugins_versions.
22758         (toplev_main): Call initialize_plugins. Print version if needed.
22759         Call finalize_plugins.
22761 2009-04-16  Rafael Avila de Espindola  <espindola@google.com>
22763         * common.opt (fversion): New.
22764         * gcc.c (print_version): New.
22765         (process_command): Don't print the version. Just set print_version.
22766         (main): Print version. Call subprocesses if print_version and
22767         verbose_flag are set.
22768         * opts.c (common_handle_option): Handle OPT_fversion.
22770 2009-04-16  Richard Guenther  <rguenther@suse.de>
22771             Ira Rosen  <irar@il.ibm.com>
22773         PR tree-optimization/39698
22774         * tree-vect-loop.c (get_initial_def_for_reduction): Use the
22775         type of the reduction variable.  Only generate the def if
22776         it is needed.
22778         * omp-low.c (expand_omp_for_generic): When converting to a pointer
22779         make sure to first convert to an integer of the same precision.
22780         * tree-vect-loop-manip.c (vect_update_ivs_after_vectorizer): Retain
22781         the type of the evolution correctly in computing the new
22782         induction variable base.
22784 2009-04-16  Richard Guenther  <rguenther@suse.de>
22786         PR middle-end/39625
22787         * tree-cfg.c (make_blocks): Split statements with to-be
22788         abnormal SSA names on the lhs.
22790 2009-04-16  Paolo Bonzini  <bonzini@gnu.org>
22792         * c-common.c (vector_targets_convertible_p, vector_types_convertible_p):
22793         Use TYPE_VECTOR_OPAQUE instead of targetm.vector_opaque_p.
22794         * c-typeck.c (really_start_incremental_init): Likewise.
22795         * target-def.h (TARGET_VECTOR_OPAQUE_P): Remove.
22796         (TARGET_INITIALIZER): Remove it.
22797         * target.h (struct target): Remove vector_opaque_p.
22798         * tree.c (build_opaque_vector_type): New.
22799         * tree.h (TYPE_VECTOR_OPAQUE): New.
22800         (build_opaque_vector_type): Declare.
22801         * doc/tm.texi (TARGET_VECTOR_OPAQUE_P): Remove.
22802         * config/rs6000/rs6000.c (build_opaque_vector_type,
22803         rs6000_is_vector_type, TARGET_VECTOR_OPAQUE_P): Remove.
22804         (rs6000_init_builtins): Use build_opaque_vector_type for
22805         opaque_V4SI_type_node.
22807 2009-04-15  Catherine Moore  <clm@codesourcery.com>
22809         * debug.h (set_name):  Declare.
22810         * dwarf2out.c (dwarf2out_set_name): Declare.
22811         (dwarf2_debug_hooks): Add set_name.
22812         (find_AT_string): New.
22813         (add_AT_string): Call find_AT_string.
22814         (dwarf2out_set_name): New.
22815         * cp/decl.c (grokdeclarator): Call set_name.
22816         * vmsdbgout.c (vmsdbg_debug_hooks): Add set_name_debug_nothing.
22817         * debug.c (do_nothing_debug_hooks):  Likewise.
22818         * dbxout.c (dbx_debug_hooks): Likewise.
22819         * sdbout.c (sdb_debug_hooks): Likewise.
22821 2009-04-15  Michael Eager  <eager@eagercon.com>
22823         * config/rs6000/rs6000.c (rs6000_function_value): Set function return
22824         reg for single-precision FPU.
22825         * config/rs6000/rs6000.md (movsi_internal1): Only for
22826         !TARGET_SINGLE_FPU.
22827         (movsi_internal1_single): New. Add pattern to move SI values to/from
22828         single-precision FP regs.
22830 2009-04-15  Richard Guenther  <rguenther@suse.de>
22832         * omp-low.c (lower_rec_input_clauses): Build correct address
22833         expressions.
22834         (expand_omp_for_generic): Fix multiplication type.
22835         * tree-loop-distribution.c (build_size_arg): Build a size_t argument.
22836         (generate_memset_zero): Fix types.
22837         * tree-profile.c (prepare_instrumented_value): Correctly
22838         widen a pointer.
22840 2009-04-15  Ian Lance Taylor  <iant@google.com>
22842         * c.opt (Wenum-compare): Enable for C and Objc.  Initialize to -1.
22843         * c-opts.c (c_common_handle_option): For C, set warn_enum_compare
22844         for -Wall and for -Wc++-compat.
22845         (c_common_post_options): For C++, set warn_enum_compare if not
22846         already set.
22847         * c-tree.h (struct c_expr): Add field original_type.
22848         (build_external_ref): Update declaration.
22849         * c-parser.c (c_parser_braced_init): Set original_type.
22850         (c_parser_initelt): Likewise.
22851         (c_parser_expr_no_commas): Likewise.
22852         (c_parser_conditional_expression): Likewise.
22853         (c_parser_cast_expression): Likewise.
22854         (c_parser_unary_expression): Likewise.  Pull setting of
22855         original_code to top of function.
22856         (c_parser_sizeof_expression): Set original_type.
22857         (c_parser_alignof_expression): Likewise.
22858         (c_parser_postfix_expression): Likewise.  Pull setting of
22859         original_code to top of function.
22860         (c_parser_postfix_expression_after_paren_type): Set original_type.
22861         (c_parser_postfix_expression_after_primary): Likewise.
22862         (c_parser_expression): Likewise.
22863         * c-typeck.c (build_external_ref): Add type parameter.  Change all
22864         callers.
22865         (c_expr_sizeof_expr): Set original_type field.
22866         (parser_build_unary_op): Likewise.
22867         (parser_build_binary_op): Likewise.  Optionally warn about
22868         comparisons of enums of different types.
22869         (digest_init): Set original_type field.
22870         (really_start_incremental_init): Likewise.
22871         (push_init_level, pop_init_level): Likewise.
22872         * doc/invoke.texi (Warning Options): -Wenum-compare now
22873         supported in C.
22875 2009-04-15  Richard Guenther  <rguenther@suse.de>
22877         * tree-ssa-pre.c (eliminate): When replacing a PHI node carry
22878         out a necessary conversion.
22879         * tree-ssa-sccvn.c (run_scc_vn): Also assign value-ids to
22880         names we didn't value number.
22881         * tree-mudflap.c (mf_build_check_statement_for): Use correct types.
22883 2009-04-15  Richard Guenther  <rguenther@suse.de>
22885         PR tree-optimization/39764
22886         * tree-ssa-ccp.c (get_value): Canonicalize value with
22887         canonicalize_float_value.
22889 2009-04-15  Jan Hubicka  <jh@suse.cz>
22891         * builtins.def (va_start, va_end, va_copy): Fix my previous commit.
22892         Wrong version of patch.
22894 2009-04-15  Jan Hubicka  <jh@suse.cz>
22896         * builtins.def (va_start, va_end, va_copy): Mark nothrow.
22898 2009-04-15  Nathan Sidwell  <nathan@codesourcery.com>
22900         * config/rs6000/rs6000.c (rs6000_init_builtins): Set TYPE_NAME of
22901         our distinct integral and vector types.
22903 2009-04-15  Rafael Avila de Espindola  <espindola@google.com>
22905         * class.c (build_vtbl_ref_1): Remove call to assemble_external.
22906         * init.c (build_vtbl_address): Remove call to assemble_external.
22908 2009-04-14  Daniel Jacobowitz  <dan@codesourcery.com>
22910         * config/rs6000/rs6000.c (rs6000_dwarf_register_span): Fix debug
22911         output for other floating point modes.
22913 2009-04-14  Diego Novillo  <dnovillo@google.com>
22915         * diagnostic.c (diagnostic_report_diagnostic): Do not
22916         warn about loaded plugins for DK_ERROR and DK_WARNING.
22917         * c-decl.c (declspecs_add_type): Move call to
22918         invoke_plugin_callbacks ...
22919         * c-parser.c (c_parser_declspecs): ... here.
22920         * plugin.c (dump_active_plugins): Tidy output.
22922 2009-04-14  Diego Novillo  <dnovillo@google.com>
22923             Le-Chun Wu  <lcwu@google.com>
22925         * configure.ac: Add --enable-plugin support.
22926         Define ENABLE_PLUGIN and PLUGINLIBS when specified.
22927         * Makefile.in (PLUGIN_H): Define.
22928         Export ENABLE_PLUGIN and GMPINC to site.exp.
22929         Add PLUGINLIBS to link command.
22930         Add/modify dependencies for plugin.o and files including plugin.h.
22931         (plugin.o): New.
22932         * config.in: Regenerate.
22934         * opts.c (common_handle_option): Handle OPT_fplugin_ and
22935         OPT_fplugin_arg_.
22937 2009-04-14  Le-Chun Wu  <lcwu@google.com>
22939         * tree-pass.h (register_one_dump_file): Add a prototype for
22940         register_one_dump_file.
22941         * toplev.c (compile_file): Call initialize_plugins.
22942         (do_compile): Call invoke_plugin_callbacks.
22943         (toplev_main): Call invoke_plugin_callbacks.
22944         * common.opt: Add -fplugin= and -fplugin-arg-.
22945         * gcc-plugin.h: New public header file for plugins to include.
22946         * plugin.c: New source file.
22947         * plugin.h: New internal header file.
22948         * passes.c (register_one_dump_file): Make it external.
22950         * c-parser.c (c_parser_declspecs): Call invoke_plugin_callbacks.
22952 2009-04-14  Diego Novillo  <dnovillo@google.com>
22954         * doc/plugins.texi: New.
22955         * doc/gccint.texi: Add reference to Plugins chapter.
22956         * doc/invoke.texi: Document -fplugin and -fplugin-arg
22957         * diagnostic.c (diagnostic_report_diagnostic): Warn about
22958         loaded plugins, if any.
22959         * timevar.def (TV_PLUGIN_INIT): Define.
22960         (TV_PLUGIN_RUN): Define.
22961         * plugin.c: Include timevar.h
22962         (plugins_active_p): New.
22963         (dump_active_plugins): New.
22964         (debug_active_plugins): New.
22966 2009-04-14  Joseph Myers  <joseph@codesourcery.com>
22968         * config/sol2.h (LINK_ARCH32_SPEC_BASE): Use %R with absolute
22969         library paths.
22970         * config/sparc/sol2-bi.h (LINK_ARCH64_SPEC_BASE): Likewise.
22972 2009-04-14  Kazu Hirata  <kazu@codesourcery.com>
22974         * config/arm/arm.c (arm_rtx_costs_1): Treat a minus with a shift
22975         the same as a minus without a shift.
22977 2009-04-14  Nick Clifton  <nickc@redhat.com>
22979         * config/stormy16/stormy16.md (ineqbranch_1): Do not assume that
22980         comparisons with small integers will always produce a short
22981         branch.
22983 2009-04-14  Rafael Avila de Espindola  <espindola@google.com>
22985         Merge:
22986         2008-12-19  Diego Novillo  <dnovillo@google.com>
22988         * cgraph.c (dump_cgraph_node): Show memory address of NODE.
22990 2009-04-14  Richard Guenther  <rguenther@suse.de>
22992         * tree-cfg.c (verify_gimple_assign_unary): Adjust vector code
22993         verification.
22994         (verify_gimple_assign_binary): Likewise.  Handle shifts and
22995         rotates correctly.
22996         (verify_gimple_phi): Print the mismatched argument position.
22997         * tree-vect-loop-manip.c (vect_update_ivs_after_vectorizer):
22998         Fix types.
22999         (vect_update_init_of_dr): Likewise.
23000         * matrix-reorg.c (transform_access_sites): Do what the
23001         comment suggests.
23002         * omp-low.c (expand_omp_atomic_pipeline): Use the correct types.
23004 2009-04-13  Michael Eager  <eager@eagercon.com>
23006         * config/rs6000/rs6000-c.c: generate defines if rs6000_xilinx_fpu:
23007         _XFPU, _XFPU_SP_LITE, _XFPU_SP_FULL, _XFPU_DP_LITE, _XFPU_DP_FULL
23008         * config/rs6000/xilinx.h: New.  Spec for powerpc-xilinx-eabi
23009         * config.gcc (powerpc-xilinx-eabi): add xilinx.h to tm_file,
23010         remove duplicate config
23012 2009-04-13  Dwarakanath Rajagopal  <dwarak.rajagopal@amd.com>
23014         * ipa-inline.c (cgraph_decide_inlining_of_small_function): Dump
23015         file_name:line_number type locator of the call site.
23017 2009-04-13  Vladimir Makarov  <vmakarov@redhat.com>
23019         * genautomata.c: Put blank after comma.
23020         (automaton_decls): New.
23021         (struct unit_usage): Add comments to member next.
23022         (store_alt_unit_usage): Keep the list ordered.
23023         (unit_present_on_list_p, equal_alternatives_p): New.
23024         (check_regexp_units_distribution): Check units distribution
23025         correctness correctly.
23026         (main): Don't write automata if error is found.  Return correct
23027         exit code.
23029         * config/m68k/cf.md (cfv4_ds): Remove.
23030         (cfv4_pOEP1, cfv4_sOEP1, cfv4_pOEP2,cfv4_sOEP2, cfv4_pOEP3,
23031         cfv4_sOEP3): Assign to cfv4_oep instead of cfv4_ds.
23033         * config/rs6000/power4.md (lsuq_power4, iq_power4, fpq_power4,
23034         power4-load-ext, power4-store, power4-store-update,
23035         power4-fpstore, power4-fpstore-update, power4-two, power4-three,
23036         power4-insert, power4-compare, power4-lmul-cmp, power4-imul-cmp,
23037         power4-lmul, , power4-imul, power4-imul3, power4-sdiv,
23038         power4-sqrt, power4-isync): Modify reservation to make correct
23039         unit distribution to automata.
23041         * config/rs6000/power5.md (iq_power5, fpq_power5, power5-store,
23042         power5-store-update, power5-two, power5-three, power5-lmul,
23043         power5-imul, power5-imul3, power5-sdiv, power5-sqrt): Ditto.
23045 2009-04-13  Adam Nemet  <anemet@caviumnetworks.com>
23047         * except.c (pass_set_nothrow_function_flags): Set name and add
23048         TODO_dump_func.
23049         (set_nothrow_function_flags): Mention in the dump file when
23050         changing a function to nothrow.
23052 2009-04-13  Ozkan Sezer  <sezeroz@gmail.com>
23054         PR/39066
23055         * gbl-ctors.h (DO_GLOBAL_CTORS_BODY): Use __SIZE_TYPE__
23056         instead of unsigned long.
23058 2009-04-13  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
23060         * config/arm/arm.c (return_used_this_function): Remove.
23061         (arm_output_function_prologue): Remove use of
23062         return_used_this_function.
23063         (output_return_instruction): Replace use of
23064         return_used_this_function
23065         by cfun->machine->return_used_this_function.
23066         (arm_output_epilogue): Likewise.
23067         (arm_output_function_epilogue): Likewise.
23068         (thumb_unexpanded_epilogue): Likewise.
23069         * config/arm/arm.h (struct machine_function):
23070         New member return_used_this_function.
23072 2009-04-12  Mark Mitchell  <mark@codesourcery.com>
23074         * doc/install.texi: Correct description of default directory for
23075         --with-gxx-include-dir.
23077 2009-04-12  Eric Botcazou  <ebotcazou@adacore.com>
23079         * fold-const.c (build_range_check): Properly deal with enumeral and
23080         boolean base types.
23082 2009-04-12  Steven Bosscher  <steven@gcc.gnu.org>
23084         * doc/invoke.texi (max_gcse_passes): Remove documentation.
23085         * params.def (PARAM_MAX_GCSE_PASSES): Remove.
23086         * params.h (MAX_GCSE_PASSES): Remove.
23087         * gcse.c (gcse_main): Run CPROP1, PRE or HOIST, and CPROP2
23088         in sequence.  Remove ability to run multiple passes.
23089         (bypass_jumps): Report run as third CPROP pass.
23091 2009-04-12  Adam Nemet  <anemet@caviumnetworks.com>
23093         PR middle-end/39651
23094         * except.c (can_throw_external): Look at each insn in a SEQUENCE
23095         when deciding whether the whole SEQUENCE can throw.
23097 2009-04-12  Uros Bizjak  <ubizjak@gmail.com>
23099         PR target/39740
23100         * config/alpha/predicates.md (local_symbolic_operand): Return 1 for
23101         offseted label references.
23103 2009-04-11  Jan Hubicka  <jh@suse.cz>
23105         * tree-ssa-pre.c (eliminate): Fix call of update_stmt.
23107 2009-04-11  Richard Guenther  <rguenther@suse.de>
23109         PR middle-end/39732
23110         * tree-inline.c (declare_return_variable): Mark DECL_BY_REFERENCE
23111         return variables as TREE_ADDRESSABLE.
23113 2009-04-11  Richard Guenther  <rguenther@suse.de>
23115         PR tree-optimization/39713
23116         * tree-ssa-sccvn.c (vn_get_expr_for): Make sure built
23117         reference trees have SSA_NAME operands.
23119 2009-04-11  Richard Guenther  <rguenther@suse.de>
23121         PR c/39712
23122         * c-gimplify.c (c_gimplify_expr): Adjust check for mismatched
23123         address expressions.
23125 2009-04-11  Dave Korn  <dave.korn.cygwin@gmail.com>
23127         * config/i386/cygwin-stdint.h (INT_LEAST32_TYPE):  Update to
23128         match changes in Cygwin 1.7
23129         (UINT_LEAST32_TYPE, INT_FAST16_TYPE, INT_FAST32_TYPE,
23130         UINT_FAST16_TYPE, UINT_FAST32_TYPE):  Likewise.
23132 2009-04-10  Paolo Bonzini  <bonzini@gnu.org>
23134         PR tree-optimization/39701
23135         * doc/invoke.texi (Optimization Options): Document change in
23136         meaning and initialization of -fdelete-null-pointer-checks.
23138 2009-04-10  H.J. Lu  <hongjiu.lu@intel.com>
23140         PR middle-end/39701
23141         * common.opt (-fdelete-null-pointer-checks): Initialize to 1.
23143         * opts.c (decode_options): Don't set flag_delete_null_pointer_checks
23144         here.
23146         * doc/invoke.texi: Update -fdelete-null-pointer-checks.
23148 2009-04-10  Chao-ying Fu  <fu@mips.com>
23150         * doc/tm.texi (Instruction Output): Document
23151         TARGET_ASM_FINAL_POSTSCAN_INSN.
23152         * target.h (final_postscan_insn): New field in asm_out.
23153         * target-def.h (TARGET_ASM_FINAL_POSTSCAN_INSN): New define.
23154         (TARGET_ASM_OUT): Add TARGET_ASM_FINAL_POSTSCAN_INSN.
23155         * final.c (final_scan_insn): Call
23156         targetm.asm_out.final_postscan_insn after outputting
23157         an asm macro and a normal instruction.
23159         * config/mips/mips.h (FINAL_PRESCAN_INSN): New define.
23160         * config/mips/mips-protos.h (mips_final_prescan_insn): Declare.
23161         * config/mips/mips.c (mips_at_reg_p): New for_each_rtx callback.
23162         (mips_final_prescan_insn, mips_final_postscan_insn): New functions.
23163         (TARGET_ASM_FINAL_POSTSCAN_INSN): New define.
23165 2009-04-10  Paolo Bonzini  <bonzini@gnu.org>
23167         PR middle-end/39701
23168         * fold-const.c (tree_single_nonzero_warnv_p): Pass non-static
23169         variables as non-NULL even with -fdelete-null-pointer-checks.
23171 2009-04-10  H.J. Lu  <hongjiu.lu@intel.com>
23173         * config/rs6000/darwin-vecsave.asm: Remove extra "*/".
23175 2009-04-09  H.J. Lu  <hongjiu.lu@intel.com>
23177         PR target/39678
23178         * config/i386/i386.c (classify_argument): Handle SCmode with
23179         (bit_offset % 64) != 0.
23181 2009-04-09  Sandra Loosemore  <sandra@codesourcery.com>
23183         * doc/invoke.texi (Optimize Options): Add cross-reference to
23184         -Q --help=optimizers examples.
23186 2009-04-10  Ben Elliston  <bje@au.ibm.com>
23188         PR target/36800
23189         * config/rs6000/rs6000.c (rs6000_gimplify_va_arg): Do not set
23190         regalign for the reg == fpr and TDmode case.
23192 2009-04-09  David Ayers  <ayers@fsfe.org>
23194         PR objc/29200
23195         * objc/objc-act.c (warn_with_method): Remove helper function.
23196         (check_duplicates): Call warning and inform directly.
23197         (really_start_method): Likewise.
23199 2009-04-09  Paolo Bonzini  <bonzini@gnu.org>
23201         * expmed.c (expand_divmod): Always use a comparison for a division
23202         by a large unsigned integer.
23204         * fold-const.c (tree_single_nonzero_warnv_p): Always treat decls
23205         for things others than variables or functions as nonzero.
23207 2009-04-09  Nick Clifton  <nickc@redhat.com>
23209         * unwind-compat.c: Change copyright header to refer to version
23210         3 of the GNU General Public License with version 3.1 of the
23211         GCC Runtime Library Exception and to point readers at the
23212         COPYING3 and COPYING3.RUNTIME files and the FSF's license web page.
23213         * config/alpha/crtfastmath.c: Likewise.
23214         * config/alpha/linux-unwind.h: Likewise.
23215         * config/alpha/qrnnd.asm: Likewise.
23216         * config/alpha/vms-crt0-64.c: Likewise.
23217         * config/alpha/vms-crt0.c: Likewise.
23218         * config/alpha/vms-dwarf2.asm: Likewise.
23219         * config/alpha/vms-dwarf2eh.asm: Likewise.
23220         * config/alpha/vms-psxcrt0-64.c: Likewise.
23221         * config/alpha/vms-psxcrt0.c: Likewise.
23222         * config/alpha/vms_tramp.asm: Likewise.
23223         * config/arc/initfini.c: Likewise.
23224         * config/arc/lib1funcs.asm: Likewise.
23225         * config/arm/bpabi-v6m.S: Likewise.
23226         * config/arm/bpabi.S: Likewise.
23227         * config/arm/bpabi.c: Likewise.
23228         * config/arm/crti.asm: Likewise.
23229         * config/arm/crtn.asm: Likewise.
23230         * config/arm/ieee754-df.S: Likewise.
23231         * config/arm/ieee754-sf.S: Likewise.
23232         * config/arm/lib1funcs.asm: Likewise.
23233         * config/arm/libunwind.S: Likewise.
23234         * config/arm/linux-atomic.c: Likewise.
23235         * config/arm/mmintrin.h: Likewise.
23236         * config/arm/pr-support.c: Likewise.
23237         * config/arm/unaligned-funcs.c: Likewise.
23238         * config/arm/unwind-arm.c: Likewise.
23239         * config/arm/unwind-arm.h: Likewise.
23240         * config/avr/libgcc.S: Likewise.
23241         * config/bfin/crti.s: Likewise.
23242         * config/bfin/crtlibid.s: Likewise.
23243         * config/bfin/crtn.s: Likewise.
23244         * config/bfin/lib1funcs.asm: Likewise.
23245         * config/bfin/linux-unwind.h: Likewise.
23246         * config/cris/arit.c: Likewise.
23247         * config/cris/cris_abi_symbol.c: Likewise.
23248         * config/darwin-64.c: Likewise.
23249         * config/darwin-crt2.c: Likewise.
23250         * config/darwin-crt3.c: Likewise.
23251         * config/darwin.h: Likewise.
23252         * config/dbxelf.h: Likewise.
23253         * config/dfp-bit.c: Likewise.
23254         * config/dfp-bit.h: Likewise.
23255         * config/elfos.h: Likewise.
23256         * config/fixed-bit.c: Likewise.
23257         * config/fixed-bit.h: Likewise.
23258         * config/fp-bit.c: Likewise.
23259         * config/fp-bit.h: Likewise.
23260         * config/fr30/crti.asm: Likewise.
23261         * config/fr30/crtn.asm: Likewise.
23262         * config/fr30/lib1funcs.asm: Likewise.
23263         * config/freebsd-spec.h: Likewise.
23264         * config/frv/cmovd.c: Likewise.
23265         * config/frv/cmovh.c: Likewise.
23266         * config/frv/cmovw.c: Likewise.
23267         * config/frv/frvbegin.c: Likewise.
23268         * config/frv/frvend.c: Likewise.
23269         * config/frv/lib1funcs.asm: Likewise.
23270         * config/glibc-stdint.h: Likewise.
23271         * config/h8300/clzhi2.c: Likewise.
23272         * config/h8300/crti.asm: Likewise.
23273         * config/h8300/crtn.asm: Likewise.
23274         * config/h8300/ctzhi2.c: Likewise.
23275         * config/h8300/fixunssfsi.c: Likewise.
23276         * config/h8300/lib1funcs.asm: Likewise.
23277         * config/h8300/parityhi2.c: Likewise.
23278         * config/h8300/popcounthi2.c: Likewise.
23279         * config/i386/ammintrin.h: Likewise.
23280         * config/i386/att.h: Likewise.
23281         * config/i386/avxintrin.h: Likewise.
23282         * config/i386/biarch64.h: Likewise.
23283         * config/i386/bmmintrin.h: Likewise.
23284         * config/i386/cpuid.h: Likewise.
23285         * config/i386/cross-stdarg.h: Likewise.
23286         * config/i386/crtfastmath.c: Likewise.
23287         * config/i386/crtprec.c: Likewise.
23288         * config/i386/cygming-crtbegin.c: Likewise.
23289         * config/i386/cygming-crtend.c: Likewise.
23290         * config/i386/cygwin.asm: Likewise.
23291         * config/i386/emmintrin.h: Likewise.
23292         * config/i386/gmm_malloc.h: Likewise.
23293         * config/i386/gthr-win32.c: Likewise.
23294         * config/i386/i386.h: Likewise.
23295         * config/i386/immintrin.h: Likewise.
23296         * config/i386/linux-unwind.h: Likewise.
23297         * config/i386/linux64.h: Likewise.
23298         * config/i386/mm3dnow.h: Likewise.
23299         * config/i386/mmintrin-common.h: Likewise.
23300         * config/i386/mmintrin.h: Likewise.
23301         * config/i386/nmmintrin.h: Likewise.
23302         * config/i386/pmm_malloc.h: Likewise.
23303         * config/i386/pmmintrin.h: Likewise.
23304         * config/i386/smmintrin.h: Likewise.
23305         * config/i386/sol2-c1.asm: Likewise.
23306         * config/i386/sol2-ci.asm: Likewise.
23307         * config/i386/sol2-cn.asm: Likewise.
23308         * config/i386/sol2-gc1.asm: Likewise.
23309         * config/i386/tmmintrin.h: Likewise.
23310         * config/i386/unix.h: Likewise.
23311         * config/i386/w32-unwind.h: Likewise.
23312         * config/i386/wmmintrin.h: Likewise.
23313         * config/i386/x86-64.h: Likewise.
23314         * config/i386/x86intrin.h: Likewise.
23315         * config/i386/xmmintrin.h: Likewise.
23316         * config/ia64/crtbegin.asm: Likewise.
23317         * config/ia64/crtend.asm: Likewise.
23318         * config/ia64/crtfastmath.c: Likewise.
23319         * config/ia64/crti.asm: Likewise.
23320         * config/ia64/crtn.asm: Likewise.
23321         * config/ia64/fde-glibc.c: Likewise.
23322         * config/ia64/lib1funcs.asm: Likewise.
23323         * config/ia64/linux-unwind.h: Likewise.
23324         * config/ia64/quadlib.c: Likewise.
23325         * config/ia64/unwind-ia64.c: Likewise.
23326         * config/linux.h: Likewise.
23327         * config/m32c/m32c-lib1.S: Likewise.
23328         * config/m32c/m32c-lib2-trapv.c: Likewise.
23329         * config/m32c/m32c-lib2.c: Likewise.
23330         * config/m32r/initfini.c: Likewise.
23331         * config/m68hc11/larith.asm: Likewise.
23332         * config/m68hc11/m68hc11-crt0.S: Likewise.
23333         * config/m68k/cf.md: Likewise.
23334         * config/m68k/crti.s: Likewise.
23335         * config/m68k/crtn.s: Likewise.
23336         * config/m68k/lb1sf68.asm: Likewise.
23337         * config/m68k/linux-unwind.h: Likewise.
23338         * config/mcore/crti.asm: Likewise.
23339         * config/mcore/crtn.asm: Likewise.
23340         * config/mcore/lib1.asm: Likewise.
23341         * config/mips/linux-unwind.h: Likewise.
23342         * config/mips/loongson.h: Likewise.
23343         * config/mips/mips16.S: Likewise.
23344         * config/mmix/crti.asm: Likewise.
23345         * config/mmix/crtn.asm: Likewise.
23346         * config/pa/fptr.c: Likewise.
23347         * config/pa/hpux-unwind.h: Likewise.
23348         * config/pa/lib2funcs.asm: Likewise.
23349         * config/pa/linux-atomic.c: Likewise.
23350         * config/pa/linux-unwind.h: Likewise.
23351         * config/pa/milli64.S: Likewise.
23352         * config/pa/quadlib.c: Likewise.
23353         * config/pa/stublib.c: Likewise.
23354         * config/picochip/libgccExtras/adddi3.asm: Likewise.
23355         * config/picochip/libgccExtras/ashlsi3.asm: Likewise.
23356         * config/picochip/libgccExtras/ashlsi3.c: Likewise.
23357         * config/picochip/libgccExtras/ashrsi3.asm: Likewise.
23358         * config/picochip/libgccExtras/ashrsi3.c: Likewise.
23359         * config/picochip/libgccExtras/cmpsi2.asm: Likewise.
23360         * config/picochip/libgccExtras/divmod15.asm: Likewise.
23361         * config/picochip/libgccExtras/divmodhi4.asm: Likewise.
23362         * config/picochip/libgccExtras/divmodsi4.asm: Likewise.
23363         * config/picochip/libgccExtras/longjmp.asm: Likewise.
23364         * config/picochip/libgccExtras/lshrsi3.asm: Likewise.
23365         * config/picochip/libgccExtras/lshrsi3.c: Likewise.
23366         * config/picochip/libgccExtras/parityhi2.asm: Likewise.
23367         * config/picochip/libgccExtras/popcounthi2.asm: Likewise.
23368         * config/picochip/libgccExtras/setjmp.asm: Likewise.
23369         * config/picochip/libgccExtras/subdi3.asm: Likewise.
23370         * config/picochip/libgccExtras/ucmpsi2.asm: Likewise.
23371         * config/picochip/libgccExtras/udivmodhi4.asm: Likewise.
23372         * config/picochip/libgccExtras/udivmodsi4.asm: Likewise.
23373         * config/rs6000/750cl.h: Likewise.
23374         * config/rs6000/altivec.h: Likewise.
23375         * config/rs6000/biarch64.h: Likewise.
23376         * config/rs6000/crtresfpr.asm: Likewise.
23377         * config/rs6000/crtresgpr.asm: Likewise.
23378         * config/rs6000/crtresxfpr.asm: Likewise.
23379         * config/rs6000/crtresxgpr.asm: Likewise.
23380         * config/rs6000/crtsavfpr.asm: Likewise.
23381         * config/rs6000/crtsavgpr.asm: Likewise.
23382         * config/rs6000/darwin-asm.h: Likewise.
23383         * config/rs6000/darwin-fallback.c: Likewise.
23384         * config/rs6000/darwin-fpsave.asm: Likewise.
23385         * config/rs6000/darwin-ldouble.c: Likewise.
23386         * config/rs6000/darwin-tramp.asm: Likewise.
23387         * config/rs6000/darwin-unwind.h: Likewise.
23388         * config/rs6000/darwin-vecsave.asm: Likewise.
23389         * config/rs6000/darwin-world.asm: Likewise.
23390         * config/rs6000/e500crtres32gpr.asm: Likewise.
23391         * config/rs6000/e500crtres64gpr.asm: Likewise.
23392         * config/rs6000/e500crtres64gprctr.asm: Likewise.
23393         * config/rs6000/e500crtrest32gpr.asm: Likewise.
23394         * config/rs6000/e500crtrest64gpr.asm: Likewise.
23395         * config/rs6000/e500crtresx32gpr.asm: Likewise.
23396         * config/rs6000/e500crtresx64gpr.asm: Likewise.
23397         * config/rs6000/e500crtsav32gpr.asm: Likewise.
23398         * config/rs6000/e500crtsav64gpr.asm: Likewise.
23399         * config/rs6000/e500crtsav64gprctr.asm: Likewise.
23400         * config/rs6000/e500crtsavg32gpr.asm: Likewise.
23401         * config/rs6000/e500crtsavg64gpr.asm: Likewise.
23402         * config/rs6000/e500crtsavg64gprctr.asm: Likewise.
23403         * config/rs6000/eabi-ci.asm: Likewise.
23404         * config/rs6000/eabi-cn.asm: Likewise.
23405         * config/rs6000/eabi.asm: Likewise.
23406         * config/rs6000/linux-unwind.h: Likewise.
23407         * config/rs6000/linux64.h: Likewise.
23408         * config/rs6000/paired.h: Likewise.
23409         * config/rs6000/paired.md: Likewise.
23410         * config/rs6000/ppc64-fp.c: Likewise.
23411         * config/rs6000/ppu_intrinsics.h: Likewise.
23412         * config/rs6000/rs6000.h: Likewise.
23413         * config/rs6000/si2vmx.h: Likewise.
23414         * config/rs6000/sol-ci.asm: Likewise.
23415         * config/rs6000/sol-cn.asm: Likewise.
23416         * config/rs6000/spe.h: Likewise.
23417         * config/rs6000/spu2vmx.h: Likewise.
23418         * config/rs6000/sysv4.h: Likewise.
23419         * config/rs6000/tramp.asm: Likewise.
23420         * config/rs6000/vec_types.h: Likewise.
23421         * config/s390/linux-unwind.h: Likewise.
23422         * config/s390/tpf-unwind.h: Likewise.
23423         * config/score/crti.asm: Likewise.
23424         * config/score/crtn.asm: Likewise.
23425         * config/sh/crt1.asm: Likewise.
23426         * config/sh/crti.asm: Likewise.
23427         * config/sh/crtn.asm: Likewise.
23428         * config/sh/divtab-sh4-300.c: Likewise.
23429         * config/sh/divtab-sh4.c: Likewise.
23430         * config/sh/divtab.c: Likewise.
23431         * config/sh/lib1funcs-4-300.asm: Likewise.
23432         * config/sh/lib1funcs-Os-4-200.asm: Likewise.
23433         * config/sh/lib1funcs.asm: Likewise.
23434         * config/sh/lib1funcs.h: Likewise.
23435         * config/sh/linux-atomic.asm: Likewise.
23436         * config/sh/linux-unwind.h: Likewise.
23437         * config/sh/shmedia.h: Likewise.
23438         * config/sh/sshmedia.h: Likewise.
23439         * config/sh/ushmedia.h: Likewise.
23440         * config/sparc/crtfastmath.c: Likewise.
23441         * config/sparc/linux-unwind.h: Likewise.
23442         * config/sparc/sol2-c1.asm: Likewise.
23443         * config/sparc/sol2-ci.asm: Likewise.
23444         * config/sparc/sol2-cn.asm: Likewise.
23445         * config/spu/divmodti4.c: Likewise.
23446         * config/spu/divv2df3.c: Likewise.
23447         * config/spu/float_disf.c: Likewise.
23448         * config/spu/float_unsdidf.c: Likewise.
23449         * config/spu/float_unsdisf.c: Likewise.
23450         * config/spu/float_unssidf.c: Likewise.
23451         * config/spu/mfc_multi_tag_release.c: Likewise.
23452         * config/spu/mfc_multi_tag_reserve.c: Likewise.
23453         * config/spu/mfc_tag_release.c: Likewise.
23454         * config/spu/mfc_tag_reserve.c: Likewise.
23455         * config/spu/mfc_tag_table.c: Likewise.
23456         * config/spu/multi3.c: Likewise.
23457         * config/spu/spu_internals.h: Likewise.
23458         * config/spu/spu_intrinsics.h: Likewise.
23459         * config/spu/spu_mfcio.h: Likewise.
23460         * config/spu/vec_types.h: Likewise.
23461         * config/spu/vmx2spu.h: Likewise.
23462         * config/stormy16/stormy16-lib2.c: Likewise.
23463         * config/svr4.h: Likewise.
23464         * config/sync.c: Likewise.
23465         * config/v850/lib1funcs.asm: Likewise.
23466         * config/vxlib-tls.c: Likewise.
23467         * config/vxlib.c: Likewise.
23468         * config/vxworks-dummy.h: Likewise.
23469         * config/xtensa/crti.asm: Likewise.
23470         * config/xtensa/crtn.asm: Likewise.
23471         * config/xtensa/ieee754-df.S: Likewise.
23472         * config/xtensa/ieee754-sf.S: Likewise.
23473         * config/xtensa/lib1funcs.asm: Likewise.
23474         * config/xtensa/lib2funcs.S: Likewise.
23475         * config/xtensa/linux-unwind.h: Likewise.
23476         * config/xtensa/unwind-dw2-xtensa.c: Likewise.
23477         * config/xtensa/unwind-dw2-xtensa.h: Likewise.
23478         * coretypes.h: Likewise.
23479         * crtstuff.c: Likewise.
23480         * defaults.h: Likewise.
23481         * dwarf2.h: Likewise.
23482         * emutls.c: Likewise.
23483         * gbl-ctors.h: Likewise.
23484         * gcov-io.h: Likewise.
23485         * ginclude/float.h: Likewise.
23486         * ginclude/iso646.h: Likewise.
23487         * ginclude/stdarg.h: Likewise.
23488         * ginclude/stdbool.h: Likewise.
23489         * ginclude/stddef.h: Likewise.
23490         * ginclude/stdfix.h: Likewise.
23491         * ginclude/stdint-gcc.h: Likewise.
23492         * ginclude/tgmath.h: Likewise.
23493         * gthr-aix.h: Likewise.
23494         * gthr-dce.h: Likewise.
23495         * gthr-gnat.c: Likewise.
23496         * gthr-gnat.h: Likewise.
23497         * gthr-lynx.h: Likewise.
23498         * gthr-mipssde.h: Likewise.
23499         * gthr-nks.h: Likewise.
23500         * gthr-posix.c: Likewise.
23501         * gthr-posix.h: Likewise.
23502         * gthr-posix95.h: Likewise.
23503         * gthr-rtems.h: Likewise.
23504         * gthr-single.h: Likewise.
23505         * gthr-solaris.h: Likewise.
23506         * gthr-tpf.h: Likewise.
23507         * gthr-vxworks.h: Likewise.
23508         * gthr-win32.h: Likewise.
23509         * gthr.h: Likewise.
23510         * libgcc2.c: Likewise.
23511         * libgcc2.h: Likewise.
23512         * libgcov.c: Likewise.
23513         * tsystem.h: Likewise.
23514         * typeclass.h: Likewise.
23515         * unwind-c.c: Likewise.
23516         * unwind-compat.h: Likewise.
23517         * unwind-dw2-fde-compat.c: Likewise.
23518         * unwind-dw2-fde-darwin.c: Likewise.
23519         * unwind-dw2-fde-glibc.c: Likewise.
23520         * unwind-dw2-fde.c: Likewise.
23521         * unwind-dw2-fde.h: Likewise.
23522         * unwind-dw2.c: Likewise.
23523         * unwind-dw2.h: Likewise.
23524         * unwind-generic.h: Likewise.
23525         * unwind-pe.h: Likewise.
23526         * unwind-sjlj.c: Likewise.
23527         * unwind.inc: Likewise.
23528         * config/arm/neon-gen.ml: Change generated copyright header to
23529         refer to version 3 of the GNU General Public License with
23530         version 3.1 of the GCC Runtime Library Exception and to point
23531         readers at the COPYING3 and COPYING3.RUNTIME files and the
23532         FSF's license web page.
23533         * config/arm/arm_neon.h: Regenerate.
23535 2009-04-09  Jakub Jelinek  <jakub@redhat.com>
23537         * config/cris/cris.md: Change copyright header to refer to version
23538         3 of the GNU General Public License.
23539         * doc/install.texi2html: Change copyright header to refer to version
23540         3 of the GNU General Public License and to point readers at the
23541         COPYING3 file and the FSF's license web page.
23542         * config/vax/linux.h: Likewise.
23544 2009-04-09  Paolo Bonzini  <bonzini@gnu.org>
23546         * config/i386/i386.md (cmpcc): New.
23547         * config/i386/sync.md (sync_compare_and_swap*): Set FLAGS_REG.
23548         (sync_compare_and_swap_cc*): Delete.
23550         * config/s390/s390.c (s390_compare_emitted): Remove.
23551         (s390_emit_compare): Handle MODE_CC s390_compare_op0 like
23552         s390_compare_emitted used to be handled.  Assert that modes match.
23553         (s390_emit_compare_and_swap): Use s390_emit_compare, do not
23554         refer to sync_compare_and_swap_ccsi.
23555         * config/s390/s390.h (s390_compare_emitted): Remove.
23556         * config/s390/s390.md (seq): Look for MODE_CC s390_compare_op0
23557         instead of s390_compare_emitted.
23558         (stack_protect_test, sync_compare_and_swap_cc): Set s390_compare_op0
23559         instead of s390_compare_emitted.
23560         * config/s390/s390.md (cmpcc): New.
23561         (sync_compare_and_swapqi, sync_compare_and_swaphi): Clobber
23562         CC_REGNUM, do not pretend it's set.
23563         (sync_compare_and_swap_cc*): Delete.
23564         * config/s390/predicates.md (cc_reg_operand): New.
23566         * expr.c (sync_compare_and_swap_cc): Delete.
23567         * optabs.h (sync_compare_and_swap_cc): Delete.
23568         * optabs.c (prepare_cmp_insn): Ignore which specific CCmode
23569         is being used with can_compare_p.
23570         (emit_cmp_and_jump_insn_1): Likewise when looking in the optab.
23571         (find_cc_set): New.
23572         (expand_bool_compare_and_swap): Do not use sync_compare_and_swap_cc,
23573         look for a MODE_CC set instead.  Use emit_store_flag.
23574         (expand_compare_and_swap_loop): Likewise, with some additional
23575         complication to avoid a force_reg when useless.  Use
23576         emit_cmp_and_jump_insns.
23577         * genopinit.c (optabs): Delete sync_compare_and_swap_cc.
23578         * doc/md.texi (sync_compare_and_swap_cc): Merge with
23579         sync_compare_and_swap documentation.
23581 2009-04-09  Jan Hubicka  <jh@suse.cz>
23583         * except.c (find_prev_try): Break out from ....
23584         (duplicate_eh_regions): ... here; properly update prev_try pointers
23585         when duplication part of tree.
23586         (dump_eh_tree): Improve dumping.
23587         (verify_eh_region): New.
23588         (verify_eh_tree): Use it.
23590 2009-04-06  Richard Guenther  <rguenther@suse.de>
23592         * c-gimplify.c (c_gimplify_expr): Fix the invalid GENERIC
23593         &ARRAY addresses by adjusting their types and prepending
23594         a conversion.
23595         * tree-cfg.c (verify_gimple_assign_single): Verify that
23596         addresses are correct.
23598 2009-04-09  Richard Guenther  <rguenther@suse.de>
23600         * tree-ssa-ccp.c (maybe_fold_stmt_addition): Move non-constant
23601         indices into an array reference if possible.
23602         * tree-ssa-forwprop.c (tree_ssa_forward_propagate_single_use_vars):
23603         Fold POINTER_PLUS_EXPR statements with invariant address.
23605 2009-04-09  Alan Modra  <amodra@bigpond.net.au>
23607         PR target/39634
23608         * config.gcc (powerpc64-*-linux*): Always build biarch.
23610 2009-04-09  Joseph Myers  <joseph@codesourcery.com>
23612         PR c/39613
23613         * c-typeck.c (do_case): If case label is not an INTEGER_CST, fold
23614         it and pedwarn if this results in an INTEGER_CST.
23616 2009-04-08  Kaveh R. Ghazi  <ghazi@caip.rutgers.edu>
23618         * doc/install.texi: Update minimum GMP version.  Remove obsolete
23619         text in MPFR section.
23621 2009-04-08  Jakub Jelinek  <jakub@redhat.com>
23623         * dwarf2out.c (class_scope_p): New static inline.
23624         (class_or_namespace_scope_p): Use it.
23625         (gen_variable_die): Use DW_TAG_member tag for static data member
23626         declarations instead of DW_TAG_variable.
23628         PR middle-end/39573
23629         * omp-low.c (expand_omp_taskreg): Finalize taskreg static local_decls
23630         variables.
23632 2009-04-08  Richard Guenther  <rguenther@suse.de>
23634         * tree-ssa-sccvn.c (valueize_refs): Do not continue to
23635         valueize random data.
23637 2009-04-08  David Edelsohn  <edelsohn@gnu.org>
23639         * config.gcc (aix tm_file):  Add aix-stdint.h.
23640         (aix tm clause use_gcc_stdint):  Set to wrap.
23641         * config/rs6000/aix-stdint.h:  New file.
23643 2009-04-08  Richard Guenther  <rguenther@suse.de>
23645         PR middle-end/36291
23646         * tree-dfa.c (add_referenced_var): Do not recurse into
23647         global initializers.
23648         * tree-ssa-ccp.c (get_symbol_constant_value): Add newly
23649         exposed variables.
23650         (fold_const_aggregate_ref): Likewise.
23652 2009-04-08  Paolo Bonzini  <bonzini@gnu.org>
23654         * recog.c (ordered_comparison_operator): New.
23655         * gensupport.c (std_preds): Add it.
23656         * doc/md.texi (Machine-Independent Predicates): Document it.
23658 2009-04-08  Jan Hubicka  <jh@suse.cz>
23660         * tree-eh.c (cleanup_eh): When not optimizing, do not try EH merging.
23661         * function.h (rtl_eh): Remove exception_handler_label_map.
23662         * except.c (ehl_hash, ehl_eq, add_ehl_entry,
23663         remove_exception_handler_label, for_each_eh_label_1): Remove.
23664         (rtl_remove_unreachable_regions): Remove.
23665         (convert_from_eh_region_ranges): Do not remove unreachable regions.
23666         (find_exception_handler_labels): Don't build the hashtable.
23667         (maybe_remove_eh_handler): Remove.
23668         (for_each_eh_label): Rewrite to walk the tree.
23669         (rest_of_handle_eh): Do not cleanup cfg prior EH construction.
23670         * except.h (maybe_remove_eh_handler): Remove.
23671         * passes.c (init_optimization_passes): Schedule second EH cleanup
23672         before out-of-ssa.
23673         * cfgrtl.c (rtl_delete_block, rtl_merge_blocks,
23674         cfg_layout_merge_blocks): Do not call maybe_remove_eh_handler.
23676 2009-04-08  Paolo Bonzini  <bonzini@gnu.org>
23678         * genoutput.c (validate_optab_operands): New.
23679         (gen_insn, gen_expand): Call it.
23681         * genflags.c (gen_insn): Detect misused iterators.
23682         (main): Pass line_no to gen_insn, exit with status 1 on error.
23684         * genextract.c (line_no): Make global.
23685         (VEC_safe_set_locstr): Change assertion to error message.
23686         (main): Exit with status 1 on error.
23688 2009-04-08  Joseph Myers  <joseph@codesourcery.com>
23690         PR c/39614
23691         PR c/39673
23692         * c-common.h (C_MAYBE_CONST_EXPR_PRE, C_MAYBE_CONST_EXPR_EXPR,
23693         C_MAYBE_CONST_EXPR_INT_OPERANDS, C_MAYBE_CONST_EXPR_NON_CONST,
23694         EXPR_INT_CONST_OPERANDS): Remove duplicate definitions.
23695         * c-convert.c (convert): Do not call fold on results of conversion
23696         functions when the result is a C_MAYBE_CONST_EXPR.
23697         * c-parser.c (c_parser_postfix_expression): Do not fold condition
23698         of __builtin_choose_expr.
23699         * c-typeck.c (remove_c_maybe_const_expr): New.
23700         (build_unary_op, build_conditional_expr, build_compound_expr,
23701         build_binary_op, c_objc_common_truthvalue_conversion): Call
23702         remove_c_maybe_const_expr on any input C_MAYBE_CONST_EXPR with
23703         integer operands.
23705 2009-04-08  Bingfeng Mei  <bmei@broadcom.com>
23707         * fold-const.c (const_binop): Combine two VECTOR_CST under operation
23708         CODE to produce a new one. Add a prototype to use fold_convert_const
23710 2009-04-08  Danny Smith  <dannysmith@users.sourceforge.net>
23712         PR bootstrap/39660
23713         * config/i386/host-mingw32.c (mingw32_gt_pch_use_address): Don't
23714         mix declarations and code.
23716 2009-04-08  Ben Elliston  <bje@au.ibm.com>
23718         * gcc.c: Replace `CC' with `GCC' throughout.
23720 2009-04-07  H.J. Lu  <hongjiu.lu@intel.com>
23722         * doc/invoke.texi: Document Atom support.
23724 2009-04-07  Jason Merrill  <jason@redhat.com>
23726         PR c++/25185
23727         * c-common.h, c-common.c: Add flag_pretty_templates.
23728         * c-opts.c (c_common_handle_option): Set it.
23729         * c.opt: Add -fno-pretty-templates.
23730         * doc/invoke.texi (C++ Dialect Options): Likewise.
23732 2009-04-07  Uros Bizjak  <ubizjak@gmail.com>
23734         * config/ia64/ia64.c (ia64_builtins): Add IA64_BUILTIN_HUGE_VALQ.
23735         (ia64_init_builtins): Handle IA64_BUILTIN_HUGE_VALQ.
23736         (ia64_expand_builtin): Likewise.
23738 2009-04-07  Martin Jambor  <mjambor@suse.cz>
23740         * tree-ssa-alias.c (refs_may_alias_p_1): Check for
23741         is_gimple_min_invariant rather than CONSTANT_CLASS_P so that invariant
23742         ADDR_EXPRS are include too.
23744 2009-04-07  Richard Guenther  <rguenther@suse.de>
23746         * tree-ssa-alias.c (ref_maybe_used_by_call_p_1): Non-aliased
23747         decls are only used if passes as parameters or if they are
23748         local statics and the call is not to a builtin.
23749         (call_may_clobber_ref_p_1): Likewise.
23751 2009-04-07  Paolo Bonzini  <bonzini@gnu.org>
23753         * expr.c (do_store_flag): Remove last argument.  Simplify code
23754         to avoid duplication of tests already done by can_compare_p.
23755         (expand_expr_real_1): Adjust caller.
23757 2009-04-07  Paolo Bonzini  <bonzini@gnu.org>
23759         * optabs.c (can_compare_p): Test the predicate of a
23760         cbranch and cstore pattern.
23762 2009-04-07  Paolo Bonzini  <bonzini@gnu.org>
23764         * expr.c (convert_move): Use emit_store_flag instead of
23765         "emulating" it.
23767 2009-04-07  Paolo Bonzini  <bonzini@gnu.org>
23769         * config/i386/i386.c (ix86_compare_emitted): Remove.
23770         (ix86_expand_compare, ix86_expand_branch): Handle MODE_CC
23771         ix86_compare_op0 like ix86_compare_emitted used to be handled.
23772         * config/i386/i386.h (ix86_compare_emitted): Remove.
23773         * config/i386/i386.md (stack_protect_test): Set ix86_compare_op0
23774         instead of ix86_compare_emitted.
23775         * config/i386/sync.md (sync_compare_and_swap_cc): Likewise.
23777 2009-04-07  Andrew Stubbs  <ams@codesourcery.com>
23779         * config.gcc (sh-*-*): Add sysroot-suffix.h to tm_file.
23780         Add t-sysroot-suffix to tmake_file.
23781         * config/print-sysroot-suffix.sh: New file.
23782         * config/t-sysroot-suffix: New file.
23784 2009-04-07  Ben Elliston  <bje@au.ibm.com>
23786         * libgcc2.c (INFINITY): Use __builtin_huge_val, not __builtin_inf,
23787         as the latter produces a warning when the target does not support
23788         infinity.
23790 2009-04-07  Ben Elliston  <bje@au.ibm.com>
23792         * dfp.c: Replace type punning assignments with memcpy throughout.
23793         * Makefile.in (dfp.o-warn): Remove.
23795 2009-04-07  Alan Modra  <amodra@bigpond.net.au>
23797         PR target/39634
23798         * config.gcc: Merge powerpc-*-linux* and powerpc64-*-linux*.
23799         Include soft-fp/t-softfp after rs6000/t-linux64.
23801 2009-04-06  Eric Botcazou  <ebotcazou@adacore.com>
23803         * stor-layout.c (set_sizetype): Use the full precision of their
23804         machine mode for bitsize types.
23806 2009-04-06  H.J. Lu  <hongjiu.lu@intel.com>
23808         * config/i386/i386.md: Revert 2 accidental checkins.
23810 2009-04-06  Joey Ye  <joey.ye@intel.com>
23811             Xuepeng Guo  <xuepeng.guo@intel.com>
23812             H.J. Lu  <hongjiu.lu@intel.com>
23814         Atom pipeline model, tuning and insn selection.
23815         * config.gcc (atom): Add atom config options and target.
23817         * config/i386/atom.md: New.
23819         * config/i386/i386.c (atom_cost): New cost.
23820         (m_ATOM): New macro flag.
23821         (initial_ix86_tune_features): Set m_ATOM.
23822         (x86_accumulate_outgoing_args): Likewise.
23823         (x86_arch_always_fancy_math_387): Likewise.
23824         (processor_target): Add Atom cost.
23825         (cpu_names): Add Atom cpu name.
23826         (override_options): Set Atom ISA.
23827         (ix86_issue_rate): New case PROCESSOR_ATOM.
23828         (ix86_adjust_cost): Likewise.
23830         * config/i386/i386.h (TARGET_ATOM): New target macro.
23831         (ix86_tune_indices): Add X86_TUNE_OPT_AGU.
23832         (TARGET_OPT_AGU): New target option.
23833         (target_cpu_default): Add TARGET_CPU_DEFAULT_atom.
23834         (processor_type): Add PROCESSOR_ATOM.
23836         * config/i386/i386.md (cpu): Add new value "atom".
23837         (use_carry, movu): New attr.
23838         (atom.md): Include atom.md.
23839         (adddi3_carry_rex64): Set attr "use_carry".
23840         (addqi3_carry): Likewise.
23841         (addhi3_carry): Likewise.
23842         (addsi3_carry): Likewise.
23843         (*addsi3_carry_zext): Likewise.
23844         (subdi3_carry_rex64): Likewise.
23845         (subqi3_carry): Likewise.
23846         (subhi3_carry): Likewise.
23847         (subsi3_carry): Likewise.
23848         (x86_movdicc_0_m1_rex64): Likewise.
23849         (*x86_movdicc_0_m1_se): Likewise.
23850         (x86_movsicc_0_m1): Likewise.
23851         (*x86_movsicc_0_m1_se): Likewise.
23852         (*adddi_1_rex64): Emit add insn as much as possible.
23853         (*addsi_1): Likewise.
23854         (return_internal): Set atom_unit.
23855         (return_internal_long): Likewise.
23856         (return_pop_internal): Likewise.
23857         (*rcpsf2_sse): Set atom_sse_attr attr.
23858         (*qrt<mode>2_sse): Likewise.
23859         (*prefetch_sse): Likewise.
23861         * config/i386/i386-c.c (ix86_target_macros_internal): New case
23862         PROCESSOR_ATOM.
23863         (ix86_target_macros_internal): Likewise.
23865         * config/i386/sse.md (cpu): Set attr "atom_sse_attr".
23866         (*prefetch_sse_rex): Likewise.
23867         (sse_rcpv4sf2): Likewise.
23868         (sse_vmrcpv4sf2): Likewise.
23869         (sse_sqrtv4sf2): Likewise.
23870         (<sse>_vmsqrt<mode>2): Likewise.
23871         (sse_ldmxcsr): Likewise.
23872         (sse_stmxcsr): Likewise.
23873         (*sse_sfence): Likewise.
23874         (sse2_clflush): Likewise.
23875         (*sse2_mfence): Likewise.
23876         (*sse2_lfence): Likewise.
23877         (avx_movup<avxmodesuffixf2c><avxmodesuffix>): Set attr "movu".
23878         (<sse>_movup<ssemodesuffixf2c>): Likewise.
23879         (avx_movdqu<avxmodesuffix>): Likewise.
23880         (avx_lddqu<avxmodesuffix>): Likewise.
23881         (sse2_movntv2di): Change attr "type" to "ssemov".
23882         (sse2_movntsi): Likewise.
23883         (rsqrtv8sf2): Change attr "type" to "sseadd".
23884         (sse3_addsubv2df3): Set attr "atom_unit".
23885         (sse3_h<plusminus_insn>v4sf3): Likewise.
23886         (*sse2_pmaddwd): Likewise.
23887         (*vec_extractv2di_1_rex64): Likewise.
23888         (*vec_extractv2di_1_avx): Likewise.
23889         (sse2_psadbw): Likewise.
23890         (ssse3_phaddwv8hi3): Likewise.
23891         (ssse3_phaddwv4hi3): Likewise.
23892         (ssse3_phadddv4si3): Likewise.
23893         (ssse3_phadddv2si3): Likewise.
23894         (ssse3_phaddswv8hi3): Likewise.
23895         (ssse3_phaddswv4hi3): Likewise.
23896         (ssse3_phsubwv8hi3): Likewise.
23897         (ssse3_phsubwv4hi3): Likewise.
23898         (ssse3_phsubdv4si3): Likewise.
23899         (ssse3_phsubdv2si3): Likewise.
23900         (ssse3_phsubswv8hi3): Likewise.
23901         (ssse3_phsubswv4hi3): Likewise.
23902         (ssse3_pmaddubsw128): Likewise.
23903         (sse3_pmaddubsw: Likewise.
23904         (ssse3_palignrti): Likewise.
23905         (ssse3_palignrdi): Likewise.
23907 2009-04-06  Gerald Pfeifer  <gerald@pfeifer.com>
23909         * doc/install.texi (Specific): Fix two cross-references to MinGW.
23911 2009-04-06  Richard Guenther  <rguenther@suse.de>
23913         PR tree-optimization/28868
23914         * tree-ssa-pre.c (inserted_phi_names): New bitmap to keep track
23915         of which PHI results we inserted.
23916         (insert_into_preds_of_block): Record inserted PHIs.
23917         (eliminate): Eliminate redundant PHI nodes.
23918         (init_pre): Init inserted_phi_names.
23920 2009-04-06  Richard Guenther  <rguenther@suse.de>
23922         PR tree-optimization/39643
23923         * tree-ssa-ccp.c (ccp_fold): Fold REALPART_EXPRs and
23924         IMAGPART_EXPRs of complex constants.
23925         (execute_fold_all_builtins): If we folded a call queue
23926         TODO_update_address_taken.
23928 2009-04-06  Jan Hubicka  <jh@suse.cz>
23930         PR middle-end/39659
23931         * except.c (remove_unreachable_regions): Propagate may_contain_throw
23932         flag.
23934 2009-04-06  Andrew Stubbs  <ams@codesourcery.com>
23936         * config/sh/lib1funcs.asm (ic_invalidate): Move ICBI out of the
23937         delay slot.
23938         (ic_invalidate_array): Likewise.
23940 2009-04-06  Hariharan Sandanagobalane  <hariharan@picochip.com>
23942         * calls.c (emit_library_call_value_1): Fix a problem with parameter
23943         alignment for library calls.
23945 2009-04-06  Danny Smith  <dannysmith@users.sourceforge.net>
23947         * config.gcc (mingw32 tm_file):  Add mingw-stdint.h.
23948         (mingw32 tm clause use_gcc_stdint):  Set to wrap.
23949         * config/i386/mingw-stdint.h:  New file.
23951 2009-04-05  Richard Guenther  <rguenther@suse.de>
23953         PR tree-optimization/39648
23954         * tree-ssa-sccvn.c (vn_reference_fold_indirect): Work around
23955         our &A vs. &A[0] IL deficiencies.
23957 2009-04-04  Jan Hubicka  <jh@suse.cz>
23959         * except.c (sjlj_find_directly_reachable_regions): Be ready for
23960         removed toplevel regions.
23961         (sjlj_mark_call_sites): Likewise.
23963 2009-04-04  Dave Korn  <dave.korn.cygwin@gmail.com>
23965         * config.gcc (cygwin tm_file):  Add cygwin-stdint.h.
23966         (cygwin tm clause use_gcc_stdint):  Set to wrap.
23967         * config/i386/cygwin-stdint.h:  New file.
23969 2009-04-04  Richard Guenther  <rguenther@suse.de>
23971         * Makefile.in (tree-ssa-copy.o): Add $(CFGLOOP_H) dependency.
23972         * tree-ssa-copy.c (init_copy_prop): Do not propagate through
23973         single-argument PHIs if we are in loop-closed SSA form.
23974         * tree-vect-loop-manip.c (slpeel_add_loop_guard): Pass extra guards
23975         for the pre-condition.
23976         (slpeel_tree_peel_loop_to_edge): Likewise.
23977         (vect_build_loop_niters): Take an optional sequence to append stmts.
23978         (vect_generate_tmps_on_preheader): Likewise.
23979         (vect_do_peeling_for_loop_bound): Take extra guards for the
23980         pre-condition.
23981         (vect_do_peeling_for_alignment): Adjust.  Unconditionally apply
23982         the cost model check.
23983         (vect_loop_versioning): Take stmt and stmt list to put pre-condition
23984         guards if we are going to peel.  Do not apply versioning in that case.
23985         * tree-vectorizer.h (vect_loop_versioning): Adjust declaration.
23986         (vect_do_peeling_for_loop_bound): Likewise.
23987         * tree-vect-loop.c (vect_transform_loop): If we are peeling for
23988         loop bound only record extra pre-conditions, do not apply loop
23989         versioning.
23991 2009-04-04  Richard Guenther  <rguenther@suse.de>
23993         * tree-ssa-operands.c (pop_stmt_changes): Remove automatic
23994         renaming code.
23996 2009-04-04  Jan Hubicka  <jh@suse.cz>
23998         * tree-ssa-uncprop.c (associate_equivalences_with_edges): Use
23999         last_basic_block for size of bb->index indexed array.
24000         * bt-load.c (compute_defs_uses_and_gen, compute_kill,
24001         compute_out, link_btr_uses, build_btr_def_use_webs,
24002         build_btr_def_use_webs, migrate_btr_defs): Likewise.
24004 2009-04-04  Jan Hubicka  <jh@suse.cz>
24006         * except.c (remove_eh_handler_and_replace): Break out from ...
24007         (remove_eh_handler): ... here.
24008         (bring_to_root): New function.
24009         (remove_unreachable_regions): Collect MUST_NOT_THROW, unify runtime
24010         handled ones, bring others to root of tree.
24012 2009-04-04  Jan Hubicka  <jh@suse.cz>
24014         * tree-eh.c (tree_empty_eh_handler_p): Pattern match more curefully.
24015         (all_phis_safe_to_merge): New function.
24016         (update_info): New structure.
24017         (make_eh_edge_and_update_phi, update_eh_edges): New functions.
24018         (cleanup_empty_eh): Update SSA if possible.
24020 2009-04-04  Richard Guenther  <rguenther@suse.de>
24022         * tree-ssa.c (verify_ssa): With -O0 we do not need VOPs.
24023         * tree-ssa-operands.c (append_vdef): Do not append VOPs at -O0.
24024         (append_vuse): Likewise.
24026 2009-04-04  Jakub Jelinek  <jakub@redhat.com>
24028         * unwind-dw2.h (_Unwind_FrameState): Add REG_UNDEFINED enum value.
24029         * unwind-dw2.c (execute_cfa_program): Set how to REG_UNDEFINED
24030         instead of REG_UNSAVED for DW_CFA_undefined.
24031         (uw_update_context_1): Handle REG_UNDEFINED the same as REG_UNSAVED.
24032         (uw_update_context): If RA column is REG_UNDEFINED, mark it as
24033         outermost frame.
24035 2009-04-04  Richard Earnshaw  <rearnsha@arm.com>
24037         PR target/39501
24038         * arm.md (movsfcc): Disable if not TARGET_HARD_FLOAT.
24040 2009-04-04  Richard Guenther  <rguenther@suse.de>
24042         PR tree-optimization/8781
24043         PR tree-optimization/37892
24044         * tree-ssa-sccvn.h (vn_reference_fold_indirect): Declare.
24045         * tree-ssa-sccvn.c (vn_reference_fold_indirect): New function.
24046         (valueize_refs): Call it for *& valueizations.
24047         (shared_reference_ops_from_ref): Rename to ...
24048         (valueize_shared_reference_ops_from_ref): ... this and valueize.
24049         (shared_reference_ops_from_call): Rename to ...
24050         (valueize_shared_reference_ops_from_call): ... this and valueize.
24051         (vn_reference_lookup): Update.
24052         (visit_reference_op_call): Likewise.
24053         * tree-ssa-pre.c (phi_translate_1): Fold *&.
24054         (eliminate): Value-replace the call address in call statements.
24056 2009-04-04  Richard Guenther  <rguenther@suse.de>
24058         PR tree-optimization/39636
24059         * tree-ssa-forwprop.c
24060         (forward_propagate_addr_into_variable_array_index): Check for
24061         GIMPLE_ASSIGN before accessing the rhs code.
24063 2009-04-03  Jason Merrill  <jason@redhat.com>
24065         * stor-layout.c (set_sizetype): Set TYPE_CANONICAL.
24067 2009-04-03  Steve Ellcey  <sje@cup.hp.com>
24069         * config/ia64/ia64.md (extendsfdf2, extendsfxf2, extenddfxf2,
24070         truncdfsf2, truncxfsf2, truncxfdf2, floatdixf2, fix_truncsfdi2,
24071         fix_truncdfdi2, fix_truncxfdi2, fix_truncxfdi2_alts, floatunsdisf2,
24072         floatunsdidf2, floatunsdixf2, fixuns_truncsfdi2, fixuns_truncdfdi2,
24073         fixuns_truncxfdi2, fixuns_truncxfdi2_alts, divsi3_internal,
24074         smuldi3_highpart, umuldi3_highpart, ctzdi2, *getf_exp_xf,
24075         divdi3_internal_lat, divdi3_internal_thr, mulditi3, *mulditi3_internal,
24076         umulditi3, *umulditi3_internal, addsf3, mulsf3, abssf2, negsf2,
24077         *nabssf2, sminsf3, smaxsf3, *maddsf4, *msubsf4, *nmulsf3, *nmaddsf4,
24078         *nmaddsf4_alts, divsf3, *sqrt_approx, sqrtsf2, sqrtsf2_internal_thr,
24079         adddf3, *adddf3_trunc, muldf3, *muldf3_trunc, absdf2, negdf2, *nabsdf2,
24080         smindf3, smaxdf3, *madddf4, *madddf4_trunc, *msubdf4, *msubdf4_trunc,
24081         *nmuldf3, *nmuldf3_trunc, *nmadddf4, *nmadddf4_alts, *nmadddf4_truncsf,
24082         *nmadddf4_truncsf_alts, divdf3, sqrtdf2, sqrtdf2_internal_thr, divxf3,
24083         sqrtxf2, sqrtxf2_internal_thr, *recip_approx):
24084         Use fr_reg_or_fp01_operand instead of fr_register_operand
24086         * config/ia64/div.md (extend<mode>rf2, truncrf<mode>2,
24087         recip_approx_rf, divsf3_internal_thr, divsf3_internal_lat,
24088         divdf3_internal_thr, divdf3_internal_lat divxf3_internal): Ditto.
24090 2009-04-03  Vladimir Makarov  <vmakarov@redhat.com>
24092         PR rtl-optimization/39607
24093         PR rtl-optimization/39631
24095         Revert:
24097         2009-03-30  Vladimir Makarov  <vmakarov@redhat.com>
24098         * reload.c (push_reload, find_dummy_reload): Use df_get_live_out
24099         instead of DF_LR_OUT.
24100         * ira-lives.c (process_bb_node_lives): Ditto.
24101         * ira-color.c (ira_loop_edge_freq): Use df_get_live_{out,in}
24102         instead of DF_LR_{OUT,IN}.
24103         * ira-emit.c (generate_edge_moves, add_ranges_and_copies): Ditto.
24104         * ira-build.c (create_bb_allocnos, create_loop_allocnos): Ditto.
24106 2009-04-03  Steven Bosscher  <steven@gcc.gnu.org>
24108         * omp-low.c (pass_expand_omp): Don't claim to provide PROP_gimple_lomp.
24109         (execute_lower_omp): Always run but take the short way out if -fopenmp
24110         is not given.
24111         (gate_lower_omp): Remove, forcing the pass manager to always run the
24112         pass and always set PROP_gimple_lomp.
24113         (pass_lower_omp): Remove gate function.
24114         * matrix-reorg.c (pass_ipa_matrix_reorg): Don't claim to provide
24115         PROP_trees.  Instead, require it.
24116         * ipa-cp.c (pass_ipa_cp): Likewise.
24117         * ipa-inline.c (pass_early_inline): Don't claim to provide PROP_cfg.
24118         (pass_ipa_early_inline, pass_inline_parameters, pass_ipa_inline): Idem.
24119         * tree-profile.c (pass_tree_profile): Don't claim to provide PROP_cfg
24120         and PROP_gimple_leh.
24122 2009-04-03  Richard Guenther  <rguenther@suse.de>
24124         PR middle-end/13146
24125         PR tree-optimization/23940
24126         PR tree-optimization/33237
24127         PR middle-end/33974
24128         PR middle-end/34093
24129         PR tree-optimization/36201
24130         PR tree-optimization/36230
24131         PR tree-optimization/38049
24132         PR tree-optimization/38207
24133         PR tree-optimization/38230
24134         PR tree-optimization/38301
24135         PR tree-optimization/38585
24136         PR middle-end/38895
24137         PR tree-optimization/38985
24138         PR tree-optimization/39299
24139         * tree-ssa-structalias.h: Remove.
24140         * tree-ssa-operands.h (NULL_USE_OPERAND_P): Make of type use_operand_p.
24141         (NULL_DEF_OPERAND_P): Make of type def_operand_p.
24142         (struct vuse_element_d): Remove.
24143         (struct vuse_vec_d): Likewise.
24144         (VUSE_VECT_NUM_ELEM, VUSE_VECT_ELEMENT_NC, VUSE_ELEMENT_PTR_NC,
24145         VUSE_ELEMENT_VAR_NC, VUSE_VECT_ELEMENT, VUSE_ELEMENT_PTR,
24146         SET_VUSE_VECT_ELEMENT, SET_VUSE_ELEMENT_VAR, SET_VUSE_ELEMENT_PTR,
24147         VUSE_ELEMENT_VAR): Likewise.
24148         (struct voptype_d): Likewise.
24149         (NUM_VOP_FREE_BUCKETS): Likewise.
24150         (struct ssa_operands): Remove vop_free_buckets and mpt_table fields.
24151         (struct stmt_operands_d): Remove.
24152         (VUSE_OP_PTR, VUSE_OP, SET_VUSE_OP, VUSE_NUM, VUSE_VECT,
24153         VDEF_RESULT_PTR, VDEF_RESULT, VDEF_OP_PTR, VDEF_OP, SET_VDEF_OP,
24154         VDEF_NUM, VDEF_VECT): Likewise.
24155         (copy_virtual_operands): Remove.
24156         (operand_build_cmp): Likewise.
24157         (create_ssa_artificial_load_stmt): Likewise.
24158         (enum ssa_op_iter_type): Remove ssa_op_iter_vdef.
24159         (struct ssa_operand_iterator_d): Remove vuses, vdefs, mayusesm
24160         vuse_index and mayuse_index members.  Pack and move done and iter_type
24161         members to the front.
24162         (SSA_OP_VMAYUSE): Remove.
24163         (SSA_OP_VIRTUAL_USES): Adjust.
24164         (FOR_EACH_SSA_VDEF_OPERAND): Remove.
24165         (unlink_stmt_vdef): Declare.
24166         (add_to_addressable_set): Remove.
24167         * tree-vrp.c (stmt_interesting_for_vrp): Adjust.
24168         (vrp_visit_stmt): Likewise.
24169         * doc/tree-ssa.texi (Alias analysis): Update.
24170         * doc/invoke.texi (max-aliased-vops): Remove docs.
24171         (avg-aliased-vops): Likewise.
24172         * tree-into-ssa.c (syms_to_rename): Remove.
24173         (need_to_update_vops_p): Likewise.
24174         (need_to_initialize_update_ssa_p): Rename to ...
24175         (update_ssa_initialized_fn): ... this.  Track function we are
24176         initialized for.
24177         (symbol_marked_for_renaming): Simplify.
24178         (add_new_name_mapping): Do not set need_to_update_vops_p.
24179         (dump_currdefs): Use SYMS_TO_RENAME.
24180         (rewrite_update_stmt): Always walk all uses/defs.
24181         (dump_update_ssa): Adjust.
24182         (init_update_ssa): Take function argument.  Track what we are
24183         initialized for.
24184         (delete_update_ssa): Reset SYMS_TO_RENAME and update_ssa_initialized_fn.
24185         (create_new_def_for): Initialize for cfun, assert we are initialized
24186         for cfun.
24187         (mark_sym_for_renaming): Simplify.
24188         (mark_set_for_renaming): Do not initialize update-ssa.
24189         (need_ssa_update_p): Simplify.  Take function argument.
24190         (name_mappings_registered_p): Assert we ask for the correct function.
24191         (name_registered_for_update_p): Likewise.
24192         (ssa_names_to_replace): Likewise.
24193         (release_ssa_name_after_update_ssa): Likewise.
24194         (update_ssa): Likewise.  Use SYMS_TO_RENAME.
24195         (dump_decl_set): Do not print a newline.
24196         (debug_decl_set): Do it here.
24197         (dump_update_ssa): And here.
24198         * tree-ssa-loop-im.c (move_computations): Adjust.
24199         (movement_possibility): Likewise.
24200         (determine_max_movement): Likewise.
24201         (gather_mem_refs_stmt): Likewise.
24202         * tree-dump.c (dequeue_and_dump): Do not handle SYMBOL_MEMORY_TAG
24203         or NAME_MEMORY_TAG.
24204         * tree-complex.c (update_all_vops): Remove.
24205         (expand_complex_move): Adjust.
24206         * tree-ssa-loop-niter.c (chain_of_csts_start): Use NULL_TREE.
24207         Simplify test for memory referencing statement.  Exclude
24208         non-invariant ADDR_EXPRs.
24209         * tree-pretty-print.c (dump_generic_node): Do not handle memory tags.
24210         * tree-loop-distribution.c (generate_memset_zero): Adjust.
24211         (rdg_flag_uses): Likewise.
24212         * tree-tailcall.c (suitable_for_tail_opt_p): Remove memory-tag
24213         related code.
24214         (tree_optimize_tail_calls_1): Also split the
24215         edge from the entry block if we have degenerate PHI nodes in
24216         the first basic block.
24217         * tree.c (init_ttree): Remove memory-tag related code.
24218         (tree_code_size): Likewise.
24219         (tree_node_structure): Likewise.
24220         (build7_stat): Re-write to be build6_stat.
24221         * tree.h (MTAG_P, TREE_MEMORY_TAG_CHECK, TMR_TAG): Remove.
24222         (SSA_VAR_P): Adjust.
24223         (struct tree_memory_tag): Remove.
24224         (struct tree_memory_partition_tag): Likewise.
24225         (union tree_node): Adjust.
24226         (build7): Re-write to be build6.
24227         * tree-pass.h (pass_reset_cc_flags): Remove.
24228         (TODO_update_address_taken): New flag.
24229         (pass_simple_dse): Remove.
24230         * ipa-cp.c (ipcp_update_callgraph): Update SSA form.
24231         * params.h (MAX_ALIASED_VOPS): Remove.
24232         (AVG_ALIASED_VOPS): Likewise.
24233         * omp-low.c (expand_omp_taskreg): Update SSA form.
24234         * tree-ssa-dse.c (dse_optimize_stmt): Properly query if the rhs
24235         aliases the lhs in a copy stmt.
24236         * tree-ssa-dse.c (struct address_walk_data): Remove.
24237         (memory_ssa_name_same): Likewise.
24238         (memory_address_same): Likewise.
24239         (get_kill_of_stmt_lhs): Likewise.
24240         (dse_possible_dead_store_p): Simplify, use the oracle.  Handle
24241         unused stores.  Look through PHI nodes into post-dominated regions.
24242         (dse_optimize_stmt): Simplify.  Properly remove stores.
24243         (tree_ssa_dse): Compute dominators.
24244         (execute_simple_dse): Remove.
24245         (pass_simple_dse): Likewise.
24246         * ipa-reference.c (scan_stmt_for_static_refs): Open-code
24247         gimple_loaded_syms and gimple_stored_syms computation.
24248         * toplev.c (dump_memory_report): Dump alias and pta stats.
24249         * tree-ssa-sccvn.c (vn_reference_compute_hash): Simplify.
24250         (vn_reference_eq): Likewise.
24251         (vuses_to_vec, copy_vuses_from_stmt, vdefs_to_vec,
24252         copy_vdefs_from_stmt, shared_lookup_vops, shared_vuses_from_stmt,
24253         valueize_vuses): Remove.
24254         (get_def_ref_stmt_vuses): Simplify.  Rename to ...
24255         (get_def_ref_stmt_vuse): ... this.
24256         (vn_reference_lookup_2): New function.
24257         (vn_reference_lookup_pieces): Use walk_non_aliased_vuses for
24258         walking equivalent vuses.  Simplify.
24259         (vn_reference_lookup): Likewise.
24260         (vn_reference_insert): Likewise.
24261         (vn_reference_insert_pieces): Likewise.
24262         (visit_reference_op_call): Simplify.
24263         (visit_reference_op_load): Likewise.
24264         (visit_reference_op_store): Likewise.
24265         (init_scc_vn): Remove shared_lookup_vuses initialization.
24266         (free_scc_vn): Remove shared_lookup_vuses freeing.
24267         (sort_vuses, sort_vuses_heap): Remove.
24268         (get_ref_from_reference_ops): Export.
24269         * tree-ssa-sccvn.h (struct vn_reference_s): Replace vuses
24270         vector with single vuse pointer.
24271         (vn_reference_lookup_pieces, vn_reference_lookup,
24272         vn_reference_insert, vn_reference_insert_pieces): Adjust prototypes.
24273         (shared_vuses_from_stmt): Remove.
24274         (get_ref_from_reference_ops): Declare.
24275         * tree-ssa-loop-manip.c (slpeel_can_duplicate_loop_p): Adjust.
24276         * tree-ssa-copyrename.c (copy_rename_partition_coalesce): Remove
24277         memory-tag related code.
24278         * tree-ssa-ccp.c (get_symbol_constant_value): Remove memory-tag code.
24279         (likely_value): Add comment, skip static-chain of call statements.
24280         (surely_varying_stmt_p): Adjust.
24281         (gimplify_and_update_call_from_tree): Likewise.
24282         (execute_fold_all_builtins): Do not rebuild alias info.
24283         (gimplify_and_update_call_from_tree): Properly update VOPs.
24284         * tree-ssa-loop-ivopts.c (get_ref_tag): Remove.
24285         (copy_ref_info): Remove memory-tag related code.
24286         * tree-call-cdce.c (tree_call_cdce): Rename the VOP.
24287         * ipa-pure-const.c (check_decl): Remove memory-tag related code.
24288         (check_stmt): Open-code gimple_loaded_syms and gimple_stored_syms
24289         computation.
24290         * tree-ssa-dom.c (gimple_p): Remove typedef.
24291         (eliminate_redundant_computations): Adjust.
24292         (record_equivalences_from_stmt): Likewise.
24293         (avail_expr_hash): Likewise.
24294         (avail_expr_eq): Likewise.
24295         * tree-ssa-propagate.c (update_call_from_tree): Properly update VOPs.
24296         (stmt_makes_single_load): Likewise.
24297         (stmt_makes_single_store): Likewise.
24298         * tree-ssa-alias.c: Rewrite completely.
24299         (debug_memory_partitions, dump_mem_ref_stats, debug_mem_ref_stats,
24300         debug_mem_sym_stats, dump_mem_sym_stats_for_var,
24301         debug_all_mem_sym_stats, debug_mp_info, update_mem_sym_stats_from_stmt,
24302         delete_mem_ref_stats, create_tag_raw, dump_points_to_info,
24303         dump_may_aliases_for, debug_may_aliases_for, new_type_alias):
24304         Remove public functions.
24305         (pass_reset_cc_flags): Remove.
24306         (pass_build_alias): Move ...
24307         * tree-ssa-structalias.c (pass_build_alias): ... here.
24308         * tree-ssa-alias.c (may_be_aliased): Move ...
24309         * tree-flow-inline.h (may_be_aliased): ... here.
24310         tree-ssa-alias.c (struct count_ptr_d, count_ptr_derefs,
24311         count_uses_and_derefs): Move ...
24312         * gimple.c: ... here.
24313         * gimple.h (count_uses_and_derefs): Declare.
24314         * tree-ssa-alias.c (dump_alias_stats, ptr_deref_may_alias_global_p,
24315         ptr_deref_may_alias_decl_p, ptr_derefs_may_alias_p,
24316         same_type_for_tbaa, nonaliasing_component_refs_p, decl_refs_may_alias_p,
24317         indirect_ref_may_alias_decl_p, indirect_refs_may_alias_p,
24318         ref_maybe_used_by_call_p, ref_maybe_used_by_stmt_p,
24319         call_may_clobber_ref_p, stmt_may_clobber_ref_p, maybe_skip_until,
24320         get_continuation_for_phi, walk_non_aliased_vuses, walk_aliased_vdefs):
24321         New functions.
24322         * tree-dfa.c (refs_may_alias_p): Move ...
24323         * tree-ssa-alias.c (refs_may_alias_p): ... here.  Extend.
24324         * tree-ssa-alias.h: New file.
24325         * tree-ssa-sink.c (is_hidden_global_store): Adjust.
24326         (statement_sink_location): Likewise.
24327         * opts.c (decode_options): Do not adjust max-aliased-vops or
24328         avg-aliased-vops values.
24329         * timevar.def (TV_TREE_MAY_ALIAS): Remove.
24330         (TV_CALL_CLOBBER): Likewise.
24331         (TV_FLOW_SENSITIVE): Likewise.
24332         (TV_FLOW_INSENSITIVE): Likewise.
24333         (TV_MEMORY_PARTITIONING): Likewise.
24334         (TV_ALIAS_STMT_WALK): New timevar.
24335         * tree-ssa-loop-ivcanon.c (empty_loop_p): Adjust.
24336         * tree-ssa-address.c (create_mem_ref_raw): Use build6.
24337         (get_address_description): Remove memory-tag related code.
24338         * tree-ssa-ifcombine.c (bb_no_side_effects_p): Adjust.
24339         * treestruct.def (TS_MEMORY_TAG, TS_MEMORY_PARTITION_TAG): Remove.
24340         * tree-eh.c (cleanup_empty_eh): Do not leave stale SSA_NAMEs
24341         and immediate uses in statements.  Document.
24342         * gimple-pretty-print.c (dump_gimple_mem_ops): Adjust.
24343         (dump_symbols): Remove.
24344         (dump_gimple_mem_ops): Do not dump loaded or stored syms.
24345         * alias.c (get_deref_alias_set): New function split out from ...
24346         (get_alias_set): ... here.
24347         * alias.h (get_deref_alias_set): Declare.
24348         * tree-vect-data-refs.c (vect_create_data_ref_ptr): Remove unused
24349         type parameter.  Remove restrict pointer handling.  Create a
24350         ref-all pointer in case type-based alias sets do not conflict.
24351         (vect_analyze_data_refs): Remove SMT related code.
24352         * tree-vect-stmts.c (vectorizable_store): Re-instantiate TBAA assert.
24353         (vectorizable_load): Likewise.
24354         * tree-data-ref.h (struct dr_alias): Remove symbol_tag field.
24355         (DR_SYMBOL_TAG, DR_VOPS): Remove.
24356         * tree-data-ref.c (dr_may_alias_p): Use the alias-oracle.
24357         Ignore vops and SMTs.
24358         (dr_analyze_alias): Likewise..
24359         (free_data_ref): Likewise.
24360         (create_data_ref): Likewise.
24361         (analyze_all_data_dependences): Likewise.
24362         (get_references_in_stmt): Adjust.
24363         * tree-flow-inline.h (gimple_aliases_computed_p,
24364         gimple_addressable_vars, gimple_call_clobbered_vars,
24365         gimple_call_used_vars, gimple_global_var, may_aliases, memory_partition,
24366         factoring_name_p, mark_call_clobbered, clear_call_clobbered,
24367         compare_ssa_operands_equal, symbol_mem_tag, set_symbol_mem_tag,
24368         gimple_mem_ref_stats): Remove.
24369         (gimple_vop): New function.
24370         (op_iter_next_use): Remove vuses and mayuses cases.
24371         (op_iter_next_def): Remove vdefs case.
24372         (op_iter_next_tree): Remove vuses, mayuses and vdefs cases.
24373         (clear_and_done_ssa_iter): Do not set removed fields.
24374         (op_iter_init): Likewise.  Skip vuse and/or vdef if requested.
24375         Assert we are not iterating over vuses or vdefs if not also
24376         iterating over uses or defs.
24377         (op_iter_init_use): Likewise.
24378         (op_iter_init_def): Likewise.
24379         (op_iter_next_vdef): Remove.
24380         (op_iter_next_mustdef): Likewise.
24381         (op_iter_init_vdef): Likewise.
24382         (compare_ssa_operands_equal): Likewise.
24383         (link_use_stmts_after): Handle vuse operand.
24384         (is_call_used): Use is_call_clobbered.
24385         (is_call_clobbered): Global variables are always call clobbered,
24386         query the call-clobbers bitmap.
24387         (mark_call_clobbered): Ignore global variables.
24388         (clear_call_clobbered): Likewise.
24389         * tree-ssa-coalesce.c (create_outofssa_var_map): Adjust
24390         virtual operands sanity check.
24391         * tree.def (NAME_MEMORY_TAG, SYMBOL_MEMORY_TAG, MEMORY_PARTITION_TAG):
24392         Remove.
24393         (TARGET_MEM_REF): Remove TMR_TAG operand.
24394         * tree-dfa.c (add_referenced_var): Initialize call-clobber state.
24395         Remove call-clobber related code.
24396         (remove_referenced_var): Likewise.  Do not clear mpt or symbol_mem_tag.
24397         (dump_variable): Do not dump SMTs, memory stats, may-aliases or
24398         partitions or escape reason.
24399         (get_single_def_stmt, get_single_def_stmt_from_phi,
24400         get_single_def_stmt_with_phi): Remove.
24401         (dump_referenced_vars): Tidy.
24402         (get_ref_base_and_extent): Allow bare decls.
24403         (collect_dfa_stats): Adjust.
24404         * graphite.c (rename_variables_in_stmt): Adjust.
24405         (graphite_copy_stmts_from_block): Likewise.
24406         (translate_clast): Likewise.
24407         * tree-ssa-pre.c (struct bb_bitmap_sets): Add expr_dies bitmap.
24408         (EXPR_DIES): New.
24409         (translate_vuse_through_block): Use the oracle.
24410         (phi_translate_1): Adjust.
24411         (value_dies_in_block_x): Use the oracle.  Cache the outcome
24412         in EXPR_DIES.
24413         (valid_in_sets): Check if the VUSE for
24414         a REFERENCE is available.
24415         (eliminate): Do not remove stmts during elimination,
24416         instead queue and remove them afterwards.
24417         (do_pre): Do not rebuild alias info.
24418         (pass_pre): Run TODO_rebuild_alias before PRE.
24419         * tree-ssa-live.c (remove_unused_locals): Remove memory-tag code.
24420         * tree-sra.c (sra_walk_function): Use gimple_references_memory_p.
24421         (mark_all_v_defs_stmt): Remove.
24422         (mark_all_v_defs_seq): Adjust.
24423         (sra_replace): Likewise.
24424         (scalarize_use): Likewise.
24425         (scalarize_copy): Likewise.
24426         (scalarize_init): Likewise.
24427         (scalarize_ldst): Likewise.
24428         (todoflags): Remove.
24429         (tree_sra): Do not rebuild alias info.
24430         (tree_sra_early): Adjust.
24431         (pass_sra): Run TODO_update_address_taken before SRA.
24432         * tree-predcom.c (set_alias_info): Remove.
24433         (prepare_initializers_chain): Do not call it.
24434         (mark_virtual_ops_for_renaming): Adjust.
24435         (mark_virtual_ops_for_renaming_list): Remove.
24436         (initialize_root_vars): Adjust.
24437         (initialize_root_vars_lm): Likewise.
24438         (prepare_initializers_chain): Likewise.
24439         * tree-ssa-copy.c (may_propagate_copy): Remove memory-tag related code.
24440         (may_propagate_copy_into_stmt): Likewise.
24441         (merge_alias_info): Do nothing for now.
24442         (propagate_tree_value_into_stmt): Adjust.
24443         (stmt_may_generate_copy): Likewise.
24444         * tree-ssa-forwprop.c (tidy_after_forward_propagate_addr): Do
24445         not mark symbols for renaming.
24446         (forward_propagate_addr_expr): Match up push/pop_stmt_changes
24447         with the same statement, make sure to update the new pointed-to one.
24448         * tree-ssa-dce.c (eliminate_unnecessary_stmts): Do not copy
24449         call statements, do not mark symbols for renaming.
24450         (mark_operand_necessary): Dump something.
24451         (ref_may_be_aliased): New function.
24452         (mark_aliased_reaching_defs_necessary_1): New helper function.
24453         (mark_aliased_reaching_defs_necessary): Likewise.
24454         (mark_all_reaching_defs_necessary_1): Likewise.
24455         (mark_all_reaching_defs_necessary): Likewise.
24456         (propagate_necessity): Do not process virtual PHIs.  For
24457         non-aliased loads mark all reaching definitions as necessary.
24458         For aliased loads and stores mark the immediate dominating
24459         aliased clobbers as necessary.
24460         (visited): New global static.
24461         (perform_tree_ssa_dce): Free visited bitmap after propagating
24462         necessity.
24463         (remove_dead_phis): Perform simple dead virtual PHI removal.
24464         (remove_dead_stmt): Properly unlink virtual operands when
24465         removing stores.
24466         (eliminate_unnecessary_stmts): Schedule PHI removal after
24467         stmt removal.
24468         * tree-ssa-ter.c (is_replaceable_p): Adjust.
24469         (process_replaceable): Likewise.
24470         (find_replaceable_in_bb): Likewise.
24471         * tree-ssa.c (verify_ssa_name): Verify all VOPs are
24472         based on the single gimple vop.
24473         (verify_flow_insensitive_alias_info): Remove.
24474         (verify_flow_sensitive_alias_info): Likewise.
24475         (verify_call_clobbering): Likewise.
24476         (verify_memory_partitions): Likewise.
24477         (verify_alias_info): Likewise.
24478         (verify_ssa): Adjust..
24479         (execute_update_addresses_taken): Export.  Update SSA
24480         manually.  Optimize only when optimizing.  Use a local bitmap.
24481         (pass_update_address_taken): Remove TODO_update_ssa, add
24482         TODO_dump_func.
24483         (pass_update_address_taken): Just use TODO_update_address_taken.
24484         (init_tree_ssa): Do not initialize addressable_vars.
24485         (verify_ssa): Verify new VUSE / VDEF properties.
24486         Verify that all stmts definitions have the stmt as SSA_NAME_DEF_STMT.
24487         Do not call verify_alias_info.
24488         (delete_tree_ssa): Clear the VUSE, VDEF operands.
24489         Do not free the loaded and stored syms bitmaps.  Reset the escaped
24490         and callused solutions.  Do not free addressable_vars.
24491         Remove memory-tag related code.
24492         (warn_uninitialized_var): Aliases are always available.
24493         * tree-ssa-loop-prefetch.c (gather_memory_references): Adjust.
24494         * lambda-code.c (can_put_in_inner_loop): Adjust.
24495         (can_put_after_inner_loop): Likewise.
24496         (perfect_nestify): Likewise.
24497         * tree-vect-stmts.c (vect_stmt_relevant_p): Adjust.
24498         (vect_gen_widened_results_half): Remove CALL_EXPR handling.
24499         (vectorizable_conversion): Do not mark symbols for renaming.
24500         * tree-inline.c (remap_gimple_stmt): Clear VUSE/VDEF.
24501         (expand_call_inline): Unlink the calls virtual operands before
24502         replacing it.
24503         (tree_function_versioning): Do not call update_ssa if we are not
24504         updating clones.  Simplify.
24505         * tree-ssa-phiprop.c (phivn_valid_p): Adjust.
24506         (propagate_with_phi): Likewise..
24507         * tree-outof-ssa.c (create_temp): Remove memory tag and call
24508         clobber code.  Assert we are not aliased or global.
24509         * tree-flow.h: Include tree-ssa-alias.h
24510         (enum escape_type): Remove.
24511         (struct mem_sym_stats_d): Likewise.
24512         (struct mem_ref_stats_d): Likewise.
24513         (struct gimple_df): Add vop member.  Remove global_var,
24514         call_clobbered_vars, call_used_vars, addressable_vars,
24515         aliases_compted_p and mem_ref_stats members.  Add syms_to_rename,
24516         escaped and callused members.
24517         (struct ptr_info_def): Remove all members, add points-to solution
24518         member pt.
24519         (struct var_ann_d): Remove in_vuse_list, in_vdef_list,
24520         call_clobbered, escape_mask, mpt and symbol_mem_tag members.
24521         * Makefile.in (TREE_FLOW_H): Add tree-ssa-alias.h.
24522         (tree-ssa-structalias.o): Remove tree-ssa-structalias.h.
24523         (tree-ssa-alias.o): Likewise.
24524         (toplev.o): Add tree-ssa-alias.h
24525         (GTFILES): Remove tree-ssa-structalias.h, add tree-ssa-alias.h.
24526         * gimple.c (gimple_set_bb): Fix off-by-one error.
24527         (is_gimple_reg): Do not handle memory tags.
24528         (gimple_copy): Also copy virtual operands.
24529         Delay updating the statement.  Do not reset loaded and stored syms.
24530         (gimple_set_stored_syms): Remove.
24531         (gimple_set_loaded_syms): Likewise.
24532         (gimple_call_copy_skip_args): Copy the virtual operands
24533         and mark the new statement modified.
24534         * tree-ssa-structalias.c (may_alias_p): Remove.
24535         (set_uids_in_ptset): Take the alias set to prune with as
24536         parameter.  Fold in the alias test of may_alias_p.
24537         (compute_points_to_sets): Compute whether a ptr is dereferenced
24538         in a local sbitmap.
24539         (process_constraint): Deal with &ANYTHING on the lhs, reject all
24540         other ADDRESSOF constraints on the lhs.
24541         (get_constraint_for_component_ref): Assert that we don't get
24542         ADDRESSOF constraints from the base of the reference.
24543         Properly generate UNKNOWN_OFFSET for DEREF if needed.
24544         (struct variable_info): Remove collapsed_to member.
24545         (get_varinfo_fc): Remove.
24546         (new_var_info): Do not set collapsed_to.
24547         (dump_constraint): Do not follow cycles.
24548         (dump_constraint_graph): Likewise.
24549         (build_pred_graph): Likewise.
24550         (build_succ_graph): Likewise.
24551         (rewrite_constraints): Likewise.
24552         (do_simple_structure_copy): Remove.
24553         (do_rhs_deref_structure_copy): Remove.
24554         (do_lhs_deref_structure_copy): Remove.
24555         (collapse_rest_of_var): Remove.
24556         (do_structure_copy): Re-implement.
24557         (pta_stats): New global variable.
24558         (dump_pta_stats): New function.
24559         (struct constraint_expr): Make offset signed.
24560         (UNKNOWN_OFFSET): Define special value.
24561         (dump_constraint): Dump UNKNOWN_OFFSET as UNKNOWN.
24562         (solution_set_expand): New helper function split out from ...
24563         (do_sd_constraint): ... here.
24564         (solution_set_add): Handle UNKNOWN_OFFSET.  Handle negative offsets.
24565         (do_ds_constraint): Likewise.
24566         (do_sd_constraint): Likewise.  Do not special-case ESCAPED = *ESCAPED
24567         and CALLUSED = *CALLUSED.
24568         (set_union_with_increment): Make inc argument signed.
24569         (type_safe): Remove.
24570         (get_constraint_for_ptr_offset): Handle unknown and negative
24571         constant offsets.
24572         (first_vi_for_offset): Handle offsets before start.  Bail
24573         out early for offsets beyond the variable extent.
24574         (first_or_preceding_vi_for_offset): New function.
24575         (init_base_vars): Add ESCAPED = ESCAPED + UNKNOWN_OFFSET constraint.
24576         Together with ESCAPED = *ESCAPED this properly computes reachability.
24577         (find_what_var_points_to): New function.
24578         (find_what_p_points_to): Implement in terms of find_what_var_points_to.
24579         (pt_solution_reset, pt_solution_empty_p, pt_solution_includes_global,
24580         pt_solution_includes_1, pt_solution_includes, pt_solutions_intersect_1,
24581         pt_solutions_intersect): New functions.
24582         (compute_call_used_vars): Remove.
24583         (compute_may_aliases): New main entry into PTA computation.
24584         * gimple.h (gimple_p): New typedef.
24585         (struct gimple_statement_base): Remove references_memory_p.
24586         (struct gimple_statement_with_memory_ops_base): Remove
24587         vdef_ops, vuse_ops, stores and loads members.  Add vdef and vuse
24588         members.
24589         (gimple_vuse_ops, gimple_set_vuse_ops, gimple_vdef_ops,
24590         gimple_set_vdef_ops, gimple_loaded_syms, gimple_stored_syms,
24591         gimple_set_references_memory): Remove.
24592         (gimple_vuse_op, gimple_vdef_op, gimple_vuse, gimple_vdef,
24593         gimple_vuse_ptr, gimple_vdef_ptri, gimple_set_vuse, gimple_set_vdef):
24594         New functions.
24595         * tree-cfg.c (move_block_to_fn): Fix off-by-one error.
24596         (verify_expr): Allow RESULT_DECL.
24597         (gimple_duplicate_bb): Do not copy virtual operands.
24598         (gimple_duplicate_sese_region): Adjust.
24599         (gimple_duplicate_sese_tail): Likewise.
24600         (mark_virtual_ops_in_region): Remove.
24601         (move_sese_region_to_fn): Do not call it.
24602         * passes.c (init_optimization_passes): Remove pass_reset_cc_flags
24603         and pass_simple_dse.
24604         (execute_function_todo): Handle TODO_update_address_taken,
24605         call execute_update_addresses_taken for TODO_rebuild_alias.
24606         (execute_todo): Adjust.
24607         (execute_one_pass): Init dump files early.
24608         * ipa-struct-reorg.c (finalize_var_creation): Do not mark vars
24609         call-clobbered.
24610         (create_general_new_stmt): Clear vops.
24611         * tree-ssa-reassoc.c (get_rank): Adjust.
24612         * tree-vect-slp.c (vect_create_mask_and_perm): Do not mark
24613         symbols for renaming.
24614         * params.def (PARAM_MAX_ALIASED_VOPS): Remove.
24615         (PARAM_AVG_ALIASED_VOPS): Likewise.
24616         * tree-ssanames.c (init_ssanames): Allocate SYMS_TO_RENAME.
24617         (duplicate_ssa_name_ptr_info): No need to copy the shared bitmaps.
24618         * tree-ssa-operands.c: Simplify for new virtual operand representation.
24619         (operand_build_cmp, copy_virtual_operands,
24620         create_ssa_artificial_load_stmt, add_to_addressable_set,
24621         gimple_add_to_addresses_taken): Remove public functions.
24622         (unlink_stmt_vdef): New function.
24624 2009-04-03  Alan Modra  <amodra@bigpond.net.au>
24626         * config.gcc (powerpc-*-linux*): Merge variants.
24628 2009-04-02  Chao-ying Fu  <fu@mips.com>
24629             James Grosbach  <james.grosbach@microchip.com>
24631         * config/mips/mips.c (mips_frame_info): Add acc_mask, num_acc,
24632         num_cop0_regs, acc_save_offset, cop0_save_offset, acc_sp_offset,
24633         cop0_sp_offset.
24634         (machine_function): Add interrupt_handler_p, use_shadow_register_set_p,
24635         keep_interrupts_masked_p, use_debug_exception_return_p.
24636         (mips_attribute_table): Add interrupt, use_shadow_register_set,
24637         keep_interrupts_masked, use_debug_exception_return.
24638         (mips_interrupt_type_p, mips_use_shadow_register_set_p,
24639         mips_keep_interrupts_masked_p, mips_use_debug_exception_return_p):
24640         New functions.
24641         (mips_function_ok_for_sibcall): Return false for interrupt handlers.
24642         (mips_print_operand): Process COP0 registers to print $0 .. $31
24643         correctly for GAS to process.
24644         (mips_interrupt_extra_call_saved_reg_p): New function.
24645         (mips_cfun_call_saved_reg_p): For interrupt handlers, we need to check
24646         extra registers.
24647         (mips_cfun_might_clobber_call_saved_reg_p): Likewise.
24648         (mips_compute_frame_info): Add supports for interrupt context that
24649         includes doubleword accumulators and COP0 registers.
24650         (mips_for_each_saved_acc): New function.
24651         (mips_for_each_saved_gpr_and_fpr): Change the function name from
24652         mips_for_each_saved_reg.
24653         (mips_save_reg): Save accumulators.
24654         (mips_kernel_reg_p): A new for_each_rtx callback.
24655         (mips_expand_prologue): Support interrupt handlers.
24656         (mips_restore_reg): Restore accumulators.
24657         (mips_expand_epilogue): Support interrupt handlers.
24658         (mips_can_use_return_insn): Return false for interrupt handlers.
24659         (mips_epilogue_uses): New function.
24660         * config/mips/mips.md (UNSPEC_ERET, UNSPEC_DERET, UNSPEC_DI,
24661         UNSPEC_EHB, UNSPEC_RDPGPR, UNSPEC_COP0): New UNSPEC.
24662         (mips_eret, mips_deret, mips_di, mips_ehb, mips_rdpgpr,
24663         cop0_move): New instructions.
24664         * config/mips/mips-protos.h (mips_epilogue_uses): Declare.
24665         * config/mips/mips.h (K0_REG_NUM, K1_REG_NUM, KERNEL_REG_P): New
24666         defines.
24667         (COP0_STATUS_REG_NUM, COP0_CAUSE_REG_NUM, COP0_EPC_REG_NUM):
24668         New defines.
24669         (CAUSE_IPL, SR_IPL, SR_EXL, SR_IE): New defines.
24670         (MIPS_PROLOGUE_TEMP_REGNUM, MIPS_EPILOGUE_TEMP_REGNUM): For
24671         interrupt handlers, we use K0 as the temporary register.
24672         (EPILOGUE_USES): Change to a function call.
24673         * config/mips/sde.h (MIPS_EPILOGUE_TEMP_REGNUM): For interrupt
24674         handlers, we use K0 as the temporary register.
24676         * doc/extend.texi (Function Attributes): Document interrupt,
24677         use_shadow_register_set, keep_interrupts_masked,
24678         use_debug_exception_return for MIPS attributes.
24680 2009-04-03  Alan Modra  <amodra@bigpond.net.au>
24682         * config.gcc (powerpc64-*-gnu*): Add rs6000/default64.h to tm_file.
24683         Remove a number of t-files from tmake_file.
24684         * config/rs6000/sysv4.opt (mprototype): Name variable target_prototype.
24685         * config/rs6000/sysv4.h (TARGET_PROTOTYPE): Define.
24686         * config/rs6000/linux64.h (SUBSUBTARGET_OVERRIDE_OPTIONS): Set
24687         target_prototype, not TARGET_PROTOTYPE.
24688         (LINK_OS_GNU_SPEC): Define.
24689         * config/rs6000/t-linux64 (LIB2FUNCS_EXTRA): Delete tramp.S
24690         and darwin-ldoubdle.c.
24692 2009-04-02  Michael Meissner  <meissner@linux.vnet.ibm.com>
24694         PR driver/39293
24695         * gcc.c (save_temps_flag): Add support for -save-temps=obj.
24696         (cpp_options): Ditto.
24697         (default_compilers): Ditto.
24698         (display_help): Ditto.
24699         (process_command): Ditto.
24700         (do_spec_1): Ditto.
24701         (set_input): Use lbasename instead of duplicate code.
24702         (save_temps_prefix): New static for -save-temps=obj.
24703         (save_temps_length): Ditto.
24705         * doc/invoke.texi (-save-temps=obj): Document new variant to
24706         -save-temps switch.
24708 2009-04-02  Jeff Law  <law@redhat.com>
24710         * reload1.c (fixup_eh_region_notes): Remove write-only "trap_count"
24711         variable.
24713 2009-04-02  H.J. Lu  <hongjiu.lu@intel.com>
24715         * configure.ac: Support -Bstatic/-Bdynamic for linker version > 2.
24716         * configure: Regenerated.
24718 2009-04-02  Rafael Avila de Espindola  <espindola@google.com>
24720         * c-decl.c (merge_decls): Make sure newdecl and olddecl don't
24721         share the argument list.
24723 2009-04-02  Rafael Avila de Espindola  <espindola@google.com>
24725         Merge
24727         2009-02-12  Diego Novillo  <dnovillo@google.com>
24729         * varpool.c (debug_varpool): New.
24730         * cgraph.h (debug_varpool): Declare.
24732 2009-04-02  Jan Hubicka  <jh@suse.cz>
24734         * passes.c (init_optimization_passes): Remove two copies of ehcleanup
24735         pass.
24737 2009-04-02  H.J. Lu  <hongjiu.lu@intel.com>
24739         * config/i386/i386.c (ix86_abi): Move initialization to ...
24740         (override_options): Here.
24742 2009-04-02  Christian Bruel  <christian.bruel@st.com>
24744         * config/sh/sh.c (sh_dwarf_register_span): New function.
24745         (TARGET_DWARF_REGISTER_SPAN): Define.
24746         * config/sh/sh-protos.h (sh_dwarf_register_span): Declare.
24748 2009-04-02  Ira Rosen  <irar@il.ibm.com>
24750         PR tree-optimization/39595
24751         * tree-vect-slp.c (vect_build_slp_tree): Check that the size of
24752         interleaved loads group is not  greater than the SLP group size.
24754 2009-04-02  Rafael Avila de Espindola  <espindola@google.com>
24756         * builtins.c (is_builtin_name): New.
24757         (called_as_built_in): Use is_builtin_name.
24758         * tree.h (is_builtin_name): New.
24759         * varasm.c (incorporeal_function_p): Use is_builtin_name
24761 2009-04-02  Andrew Stubbs  <ams@codesourcery.com>
24763         * config/sh/linux-unwind.h: Disable when inhibit_libc is defined.
24765 2009-04-02  Dodji Seketeli  <dodji@redhat.com>
24767         PR c++/26693
24768         * c-decl.c (clone_underlying_type): Move this ...
24769         * c-common.c (set_underlying_type): ... here.
24770         Also, make sure the function properly sets TYPE_STUB_DECL() on
24771         the newly created typedef variant type.
24772         * c-common.h (is_typedef_decl, set_underlying_type): Declare ...
24773         * c-common.c (is_typedef_decl, set_underlying_type): ... new entry
24774         points.
24776 2009-04-02  Richard Guenther  <rguenther@suse.de>
24778         PR tree-optimization/37221
24779         * tree-flow.h (degenerate_phi_result): Declare.
24780         * tree-ssa-dom.c (degenerate_phi_result): Export.
24781         * tree-scalar-evolution.c (analyze_initial_condition): If
24782         the initial condition is defined by a degenerate PHI node
24783         use the degenerate value.
24785 2009-04-01  Eric Botcazou  <ebotcazou@adacore.com>
24787         PR rtl-optimization/39588
24788         * combine.c (merge_outer_ops): Do not set the constant when this
24789         is not necessary.
24790         (simplify_shift_const_1): Do not modify it either in this case.
24792 2009-04-01  Steven Bosscher  <steven@gcc.gnu.org>
24794         * config/ia64/ia64.c (ia64_handle_option): Inform user that Itanium1
24795         tuning is deprecated if -mtune value is set to an Itanium1 variant.
24797 2009-04-01  Janis Johnson  <janis187@us.ibm.com>
24799         PR c/29027
24800         * c-lex.c (interpret_float): Default (no suffix) is double.
24802 2009-04-1  Xinliang David Li  <davidxl@google.com>
24804         * config/i386/i386.c (legitimate_constant_p): Recognize
24805         all one vector constant.
24807 2009-04-01  Jan-Benedict Glaw  <jbglaw@jbglaw-dev.homezone.telefonica.de>
24809         * config/vax/vax.c: Add #includes to silence warnings.
24810         Change #include order to silence two warnings.
24812 2009-04-01  Jan-Benedict Glaw  <jbglaw@jbglaw-dev.homezone.telefonica.de>
24814         * config/vax/linux.h (TARGET_DEFAULT): Add the MASK_QMATH flag bit.
24815         (ASM_SPEC): Pass -k to the assembler for PIC code.
24817 2009-04-01  Jan-Benedict Glaw  <jbglaw@jbglaw-dev.homezone.telefonica.de>
24819         * config.gcc: Add vax-*-linux* to the switch.
24820         * config/vax/linux.h: New file. (TARGET_VERSION,
24821         TARGET_OS_CPP_BUILTINS, TARGET_DEFAULT, CPP_SPEC, LINK_SPEC): Define.
24823 2009-04-01  Jan-Benedict Glaw  <jbglaw@jbglaw-dev.homezone.telefonica.de>
24825         * config/vax/vax.c (vax_output_int_move, adjacent_operands_p):
24826         Use predicate macros instead of GET_CODE() == foo.
24827         * config/vax/vax.md (movsi_2, movstrictqi, and<mode>3, ashrsi3,
24828         ashlsi3, rotrsi3, <unnamed>): Likewise.
24830 2009-04-01  Jan-Benedict Glaw  <jbglaw@jbglaw-dev.homezone.telefonica.de>
24832         * config/vax/builtins.md (jbbssiqi, jbbssihi, jbbssisi, jbbcciqi,
24833         jbbccihi, jbbccisi): Remova trailing whitespace.
24834         * config/vax/constraints.md: Likewise.
24835         * config/vax/elf.h (ASM_PREFERRED_EH_DATA_FORMAT): Likewise.
24836         * config/vax/openbsd1.h (OBSD_OLD_GAS): Likewise.
24837         * config/vax/predicates.md: Likewise.
24838         * config/vax/vax.c (print_operand_address, vax_output_int_move,
24839         vax_expand_addsub_di_operands, adjacent_operands_p): Likewise.
24840         * config/vax/vax.h: Likewise.
24841         * config/vax/vax.md (nonlocal_goto): Likewise.
24843 2009-04-01  Jan-Benedict Glaw  <jbglaw@jbglaw-dev.homezone.telefonica.de>
24845         * config/vax/vax.c (vax_float_literal, vax_output_int_move)
24846         (indirectable_address_p, adjacent_operands_p): Add spaces around
24847         braces.
24848         * config/vax/vax-protos.h (adjacent_operands_p): Likewise.
24850 2009-04-01  Jan-Benedict Glaw  <jbglaw@jbglaw-dev.homezone.telefonica.de>
24852         * config/vax/vax.c (legitimate_constant_address_p,
24853         legitimate_constant_p, indirectable_address_p, nonindexed_address_p,
24854         index_term_p, reg_plus_index_p, legitimate_address_p,
24855         vax_mode_dependent_address_p): Update comments to match functions
24856         modified by the recent int->bool conversion.
24858 2009-04-01  Jan-Benedict Glaw  <jbglaw@jbglaw-dev.homezone.telefonica.de>
24860         * config/vax/builtins.md: Update copyright message.
24861         * config/vax/constraints.md: Likewise.
24862         * config/vax/netbsd-elf.h: Likewise.
24863         * config/vax/predicates.md: Likewise.
24864         * config/vax/vax-protos.h: Likewise.
24865         * config/vax/vax.c: Likewise.
24866         * config/vax/vax.h: Likewise.
24867         * config/vax/vax.md: Likewise.
24868         * config/vax/vax.opt: Likewise.
24870 2009-04-01  Jan-Benedict Glaw  <jbglaw@jbglaw-dev.homezone.telefonica.de>
24872         * config/vax/builtins.md (ffssi2, ffssi2_internal,
24873         sync_lock_test_and_set<mode>, sync_lock_release<mode>): Fix indention.
24874         * config/vax/constraints.md (B, R): Likewise.
24875         * config/vax/predicates.md (external_memory_operand,
24876         nonimmediate_addsub_di_operand): Likewise.
24877         * config/vax/vax.c (vax_output_int_add): Likewise.
24878         * config/vax/vax.md (movsi, movsi_2, mov<mode>, call_value,
24879         untyped_call): Likewise.
24881 2009-04-01  Matt Thomas  <matt@3am-software.com>
24883         * config/vax/predicates.md: New file.
24884         (symbolic_operand, local_symbolic_operand, external_symbolic_operand,
24885         external_const_operand, nonsymbolic_operand, external_memory_operand,
24886         indirect_memory_operand, indexed_memory_operand,
24887         illegal_blk_memory_operand, illegal_addsub_di_memory_operand,
24888         nonimmediate_addsub_di_operand, general_addsub_di_operand): New
24889         predicate.
24890         * config/vax/constraints.md: New file.
24891         (Z0, U06,  U08, U16, CN6, S08, S16, I, J, K, L, M, N, O, G, Q, B, R, T):
24892         New constraint.
24893         * config/vax/builtins.md: New file.
24894         (ffssi2, ffssi2_internal, sync_lock_test_and_set<mode>, jbbssiqi,
24895         jbbssihi, jbbssisi, sync_lock_release<mode>, jbbcciqi, jbbccihi,
24896         jbbccisi): Define.
24897         * config/vax/vax.opt (mqmath): Add option.
24898         * config/vax/vax.md (isfx): Extend with DI.
24899         (VAXintQH, VAXintQHSD): Define.
24900         (tst<mode>, cmp<mode>, *bit<mode>, movmemhi1, truncsiqi2, truncsihi2,
24901         mulsidi3, add<mode>3, sub<mode>, mul<mode>3, div<mode>3, and<mode>,
24902         and<mode>_const_int, ior<mode>3, xor<mode>3, neg<mode>2,
24903         one_cmpl<mode>2, ashlsi3, lshrsi3, rotlsi3): Update constraints.
24904         (movdi): Update constraints and use vax_output_int_move().
24905         (movsi, movsi_2, pushlclsymreg, pushextsymreg, movlclsymreg,
24906         movextsymreg, adddi3, adcdi3, subdi3, sbcdi3, pushextsym, movextsym,
24907         pushlclsym, movlclsym, movaddr<mode>, pushaddr<mode>,
24908         nonlocal_goto): New.
24909         (mov<mode>): Extend accepted operand types.
24910         (subdi3_old): Rename from subdi3, change update constraints and use
24911         a new implementation.
24912         * config/vax/vax.h (PCC_BITFIELD_TYPE_MATTERS): Add space.
24913         (FRAME_POINTER_CFA_OFFSET, IRA_COVER_CLASSES, CLASS_MAX_NREGS,
24914         MOVE_RATIO, CLEAR_RATIO): Define.
24915         (REG_CLASS_FROM_LETTER, CONST_OK_FOR_LETTER_P,
24916         CONST_DOUBLE_OK_FOR_LETTER_P, EXTRA_CONSTRAINT): Delete.
24917         (PRINT_OPERAND): Redefine using a function instead of inlined code.
24918         * config/vax/vax.c (TARGET_BUILTIN_SETJMP_FRAME_VALUE): Define.
24919         (split_quadword_operands): Make static and really allow variable
24920         splitting.
24921         (print_operand_address): Update for PIC generation.
24922         (print_operand, vax_builtin_setjmp_frame_value, vax_output_int_subtract,
24923         indexable_address_p, fixup_mathdi_operand,
24924         vax_expand_addsub_di_operands, adjacent_operands_p): New.
24925         (vax_float_literal, legitimate_constant_p,
24926         indirectable_constant_address_p, index_term_p,
24927         reg_plus_index_p): Return bool instead of int.
24928         (vax_rtx_costs): Fix cost for CONST_INT, indent and use HOST_WIDE_INT
24929         where needed.
24930         (vax_output_int_move, vax_output_int_add): Extend to allow PIC
24931         generation.
24932         (vax_output_conditional_branch): Indent.
24933         (legitimate_constant_address_p, indirectable_constant_address_p,
24934         indirectable_address_p, nonindexed_address_p, legitimate_address_p,
24935         vax_mode_dependent_address_p): Return bool instead of int, update for
24936         PIC generation.
24937         * config/vax/vax-protos.h (legitimate_constant_address_p,
24938         legitimate_constant_p, legitimate_address_p,
24939         vax_mode_dependent_address_p): Change declaration to bool.
24940         (legitimate_pic_operand_p, adjacent_operands_p, print_operand,
24941         vax_expand_addsub_di_operands, vax_output_int_subtract,
24942         vax_output_movmemsi): Declare.
24943         (split_quadword_operands, vax_float_literal): Delete declaration.
24944         * config/vax/netbsd-elf.h (CC1_SPEC, CC1PLUS_SPEC) Define.
24945         * config/vax/elf.h (NO_EXTERNAL_INDIRECT_ADDRESS,
24946         VAX_CC1_AND_CC1PLUS_SPEC, ASM_PREFERRED_EH_DATA_FORMAT,
24947         ASM_OUTPUT_DWARF_PCREL): Define.
24948         (ASM_SPEC): Change definition to allow PIC generation.
24950 2009-04-01  Steve Ellcey  <sje@cup.hp.com>
24952         * doc/sourcebuild.texi: Update front-end requirements.
24954 2009-04-01  Jakub Jelinek  <jakub@redhat.com>
24956         PR target/39226
24957         * config/rs6000/rs6000.md (andsi3_internal5_nomc,
24958         anddi3_internal2_nomc, anddi3_internal3_nomc): Removed.
24959         (booldi3_internal3): Use boolean_or_operator instead of
24960         boolean_operator.
24962 2009-04-01  Joseph Myers  <joseph@codesourcery.com>
24964         PR c/39605
24965         * c-decl.c (grokdeclarator): Pedwarn for file-scope array
24966         declarator whose size is not an integer constant expression but
24967         folds to an integer constant, then treat it as a constant
24968         subsequently.
24970 2009-04-01  Richard Guenther  <rguenther@suse.de>
24972         * fold-const.c (fold_plusminus_mult_expr): Do not fold
24973         i * 4 + 2 to (i * 2 + 1) * 2.
24975 2009-04-01  Jakub Jelinek  <jakub@redhat.com>
24977         PR c/37772
24978         * c-parser.c (c_parser_asm_statement): Skip until close paren and
24979         return if c_parser_asm_string_literal returned NULL.
24981 2009-04-01  Nick Clifton  <nickc@redhat.com>
24983         * config/m32c/m32c.h (LIBGCC2_UNITS_PER_WORD): Define if not
24984         already defined.
24985         * config/m32c/t-m32c (LIB2FUNCS_EXTRA): Add m32c-lib2-trapv.c.
24986         * config/m32c/m32c-lib2.c: Remove unused typedefs.  Rename the
24987         other typedefs to avoid conflicts with libgcc2.c.  Define labels
24988         to gain 16-bit bit-manipulation functions from libgcc2.c and then
24989         include it.
24990         * config/m32c/m32c-lib2-trapv.c: New file.  Define labels
24991         to gain 16-bit trapping arithmetic functions from libgcc2.c and
24992         then include it.
24994 2009-04-01  Rafael Avila de Espindola  <espindola@google.com>
24996         * varasm.c (default_function_rodata_section): Declare DOT as
24997         const char*.
24999 2009-04-01  Kai Tietz  <kai.tietz@onevision.com>
25000             Andrey Galkin  <agalkin@hypercom.com>
25002         PR/39492
25003         * config/i386/host-mingw32.c (mingw32_gt_pch_use_address):
25004         Make object_name unique for each process.
25006 2009-04-01  Jakub Jelinek  <jakub@redhat.com>
25008         PR other/39591
25009         * omp-low.c (remove_exit_barrier): Don't optimize if there are any
25010         addressable variables in the parallel that could go out of scope while
25011         running queued tasks.
25013 2009-04-01  Anatoly Sokolov  <aesok@post.ru>
25015         * config/avr/avr.h (avr_case_values_threshold): Remove declaration.
25016         (CASE_VALUES_THRESHOLD): Redefine.
25017         * config/avr/avr.c (avr_override_options): Remove initialization of
25018         avr_case_values_threshold variable.
25019         (avr_case_values_threshold): Remove variable. Add new function.
25020         * config/avr/avr-protos.h (avr_case_values_threshold): Declare.
25021         * config/avr/avr.opt (mno-tablejump): Remove option.
25022         * doc/invoke.texi (AVR Options): Remove -mno-tablejump.
25024 2009-04-01  DJ Delorie  <dj@redhat.com>
25026         * varasm.c (default_function_rodata_section): Don't assume
25027         anything about where the first '.' in the section name is.
25029 2009-04-01  Alan Modra  <amodra@bigpond.net.au>
25031         * config/rs6000/rs6000.c (rs6000_emit_stack_reset): Delete redundant
25032         rs6000_emit_stack_tie.
25034 2009-03-31  Ian Lance Taylor  <iant@google.com>
25036         * tree-eh.c (tree_remove_unreachable_handlers): Compare
25037         gimple_code with GIMPLE_RESX, not RESX.
25039 2009-03-31  Joseph Myers  <joseph@codesourcery.com>
25041         * c-common.c (c_get_ident): New.
25042         (c_common_nodes_and_builtins): Call it for type names that may be NULL.
25044 2009-04-01  Ben Elliston  <bje@au.ibm.com>
25046         * config/rs6000/sysv4.opt (msdata): Improve option description.
25048 2009-03-31  Steve Ellcey  <sje@cup.hp.com>
25050         * config/ia64/ia64.md (divsf3_internal_lat): Remove.
25051         (divdf3_internal_lat): Remove.
25052         (divxf3_internal_lat): Remove.
25053         (divxf3_internal_thr): Remove.
25054         (divxf): Use divxf3_internal.
25055         * config/ia64/div.md (divsf3_internal_lat): New.
25056         (divdf3_internal_lat): New.
25057         (divxf3_internal): New.
25059 2009-03-31  Joseph Myers  <joseph@codesourcery.com>
25061         PR c/448
25062         * Makefile.in (USE_GCC_STDINT): Define.
25063         (stmp-int-hdrs): Install stdint.h if applicable.
25064         * c-common.c (CHAR16_TYPE): Define in terms of UINT_LEAST16_TYPE
25065         if known.
25066         (CHAR32_TYPE): Define in terms of UINT_LEAST32_TYPE if known.
25067         (SIG_ATOMIC_TYPE, INT8_TYPE, INT16_TYPE, INT32_TYPE, INT64_TYPE,
25068         UINT8_TYPE, UINT16_TYPE, UINT32_TYPE, UINT64_TYPE,
25069         INT_LEAST8_TYPE, INT_LEAST16_TYPE, INT_LEAST32_TYPE,
25070         INT_LEAST64_TYPE, UINT_LEAST8_TYPE, UINT_LEAST16_TYPE,
25071         UINT_LEAST32_TYPE, UINT_LEAST64_TYPE, INT_FAST8_TYPE,
25072         INT_FAST16_TYPE, INT_FAST32_TYPE, INT_FAST64_TYPE,
25073         UINT_FAST8_TYPE, UINT_FAST16_TYPE, UINT_FAST32_TYPE,
25074         UINT_FAST64_TYPE, INTPTR_TYPE, UINTPTR_TYPE): Define.
25075         (c_common_nodes_and_builtins): Initialize
25076         underlying_wchar_type_node.  Do not initialize
25077         signed_wchar_type_node or unsigned_wchar_type_node.  Initialize
25078         nodes for new types.
25079         (c_stddef_cpp_builtins): Define macros for new types.
25080         * c-common.h (CTI_SIGNED_WCHAR_TYPE, CTI_UNSIGNED_WCHAR_TYPE):
25081         Remove.
25082         (CTI_UNDERLYING_WCHAR_TYPE, CTI_SIG_ATOMIC_TYPE, CTI_INT8_TYPE,
25083         CTI_INT16_TYPE, CTI_INT32_TYPE, CTI_INT64_TYPE, CTI_UINT8_TYPE,
25084         CTI_UINT16_TYPE, CTI_UINT32_TYPE, CTI_UINT64_TYPE,
25085         CTI_INT_LEAST8_TYPE, CTI_INT_LEAST16_TYPE, CTI_INT_LEAST32_TYPE,
25086         CTI_INT_LEAST64_TYPE, CTI_UINT_LEAST8_TYPE, CTI_UINT_LEAST16_TYPE,
25087         CTI_UINT_LEAST32_TYPE, CTI_UINT_LEAST64_TYPE, CTI_INT_FAST8_TYPE,
25088         CTI_INT_FAST16_TYPE, CTI_INT_FAST32_TYPE, CTI_INT_FAST64_TYPE,
25089         CTI_UINT_FAST8_TYPE, CTI_UINT_FAST16_TYPE, CTI_UINT_FAST32_TYPE,
25090         CTI_UINT_FAST64_TYPE, CTI_INTPTR_TYPE, CTI_UINTPTR_TYPE): Define.
25091         (signed_wchar_type_node, unsigned_wchar_type_node): Remove.
25092         (underlying_wchar_type_node, sig_atomic_type_node, int8_type_node,
25093         int16_type_node, int32_type_node, int64_type_node,
25094         uint8_type_node, uint16_type_node, c_uint32_type_node,
25095         c_uint64_type_node, int_least8_type_node, int_least16_type_node,
25096         int_least32_type_node, int_least64_type_node,
25097         uint_least8_type_node, uint_least16_type_node,
25098         uint_least32_type_node, uint_least64_type_node,
25099         int_fast8_type_node, int_fast16_type_node, int_fast32_type_node,
25100         int_fast64_type_node, uint_fast8_type_node, uint_fast16_type_node,
25101         uint_fast32_type_node, uint_fast64_type_node, intptr_type_node,
25102         uintptr_type_node): Define.
25103         * c-cppbuiltin.c (builtin_define_constants,
25104         builtin_define_type_minmax): New.
25105         (builtin_define_stdint_macros): Define more macros.
25106         (c_cpp_builtins): Define more limit macros.
25107         (type_suffix): New.
25108         (builtin_define_type_max): Define in terms of
25109         builtin_define_type_minmax.  Remove is_long parameter.  All
25110         callers changed.
25111         * config.gcc (use_gcc_stdint): Define.
25112         (tm_file): Add glibc-stdint.h for targets using glibc or uClibc.
25113         Add newlib-stdint.h for generic targets.
25114         * config/glibc-stdint.h, config/newlib-stdint.h,
25115         ginclude/stdint-gcc.h, ginclude/stdint-wrap.h: New.
25116         * config/m32c/m32c.h (UINTPTR_TYPE): Define.
25117         * config/score/score.h (UINTPTR_TYPE): Define.
25118         * config/sol2.h (SIG_ATOMIC_TYPE, INT8_TYPE, INT16_TYPE,
25119         INT32_TYPE, INT64_TYPE, UINT8_TYPE, UINT16_TYPE, UINT32_TYPE,
25120         UINT64_TYPE, INT_LEAST8_TYPE, INT_LEAST16_TYPE, INT_LEAST32_TYPE,
25121         INT_LEAST64_TYPE, UINT_LEAST8_TYPE, UINT_LEAST16_TYPE,
25122         UINT_LEAST32_TYPE, UINT_LEAST64_TYPE, INT_FAST8_TYPE,
25123         INT_FAST16_TYPE, INT_FAST32_TYPE, INT_FAST64_TYPE,
25124         UINT_FAST8_TYPE, UINT_FAST16_TYPE, UINT_FAST32_TYPE,
25125         UINT_FAST64_TYPE, INTPTR_TYPE, UINTPTR_TYPE): Define.
25126         * config/spu/spu.h (STDINT_LONG32): Define.
25127         * configure.ac (use_gcc_stdint): Substitute.
25128         * configure: Regenerate.
25129         * doc/cpp.texi (__SIG_ATOMIC_TYPE__, __INT8_TYPE__,
25130         __INT16_TYPE__, __INT32_TYPE__, __INT64_TYPE__, __UINT8_TYPE__,
25131         __UINT16_TYPE__, __UINT32_TYPE__, __UINT64_TYPE__,
25132         __INT_LEAST8_TYPE__, __INT_LEAST16_TYPE__, __INT_LEAST32_TYPE__,
25133         __INT_LEAST64_TYPE__, __UINT_LEAST8_TYPE__, __UINT_LEAST16_TYPE__,
25134         __UINT_LEAST32_TYPE_, __UINT_LEAST64_TYPE__, __INT_FAST8_TYPE__,
25135         __INT_FAST16_TYPE__, __INT_FAST32_TYPE__, __INT_FAST64_TYPE__,
25136         __UINT_FAST8_TYPE__, __UINT_FAST16_TYPE__, __UINT_FAST32_TYPE__,
25137         __UINT_FAST64_TYPE__, __INTPTR_TYPE__, __UINTPTR_TYPE__,
25138         __WINT_MAX__, __SIZE_MAX__, __PTRDIFF_MAX__, __UINTMAX_MAX__,
25139         __SIG_ATOMIC_MAX__, __INT8_MAX__, __INT16_MAX__, __INT32_MAX__,
25140         __INT64_MAX__, __UINT8_MAX__, __UINT16_MAX__, __UINT32_MAX__,
25141         __UINT64_MAX__, __INT_LEAST8_MAX__, __INT_LEAST16_MAX__,
25142         __INT_LEAST32_MAX__, __INT_LEAST64_MAX__, __UINT_LEAST8_MAX__,
25143         __UINT_LEAST16_MAX__, __UINT_LEAST32_MAX__, __UINT_LEAST64_MAX__,
25144         __INT_FAST8_MAX__, __INT_FAST16_MAX__, __INT_FAST32_MAX__,
25145         __INT_FAST64_MAX__, __UINT_FAST8_MAX__, __UINT_FAST16_MAX__,
25146         __UINT_FAST32_MAX__, __UINT_FAST64_MAX__, __INTPTR_MAX__,
25147         __UINTPTR_MAX__, __WCHAR_MIN__, __WINT_MIN__, __SIG_ATOMIC_MIN__,
25148         __INT8_C, __INT16_C, __INT32_C, __INT64_C, __UINT8_C, __UINT16_C,
25149         __UINT32_C, __UINT64_C, __INTMAX_C, __UINTMAX_C): Document.
25150         * doc/tm.texi (SIG_ATOMIC_TYPE, INT8_TYPE, INT16_TYPE, INT32_TYPE,
25151         INT64_TYPE, UINT8_TYPE, UINT16_TYPE, UINT32_TYPE, UINT64_TYPE,
25152         INT_LEAST8_TYPE, INT_LEAST16_TYPE, INT_LEAST32_TYPE,
25153         INT_LEAST64_TYPE, UINT_LEAST8_TYPE, UINT_LEAST16_TYPE,
25154         UINT_LEAST32_TYPE, UINT_LEAST64_TYPE, INT_FAST8_TYPE,
25155         INT_FAST16_TYPE, INT_FAST32_TYPE, INT_FAST64_TYPE,
25156         UINT_FAST8_TYPE, UINT_FAST16_TYPE, UINT_FAST32_TYPE,
25157         UINT_FAST64_TYPE, INTPTR_TYPE, UINTPTR_TYPE): Document.
25159 2009-03-31  Bernd Schmidt  <bernd.schmidt@analog.com>
25161         * loop-iv.c (suitable_set_for_replacement): Renamed from
25162         simplify_using_assignment; changed to return bool and to accept new
25163         args DEST and SRC.  Return true iff we find a source/destination pair
25164         that can be used to make a replacement, and fill SRC and DEST if so.
25165         Remove arg ALTERED.  Don't deal with altered regs here.  All callers
25166         changed.
25167         (simplify_using_initial_values): Deal with altered regs here and track
25168         more precisely the effect they have on the validity of our expression.
25170         * loop-iv.c (simplify_using_condition): A condition of the form
25171         (EQ REG CONST) can be used to simply make a substitution.
25172         (simplify_using_initial_values): Keep track of conditions we have seen
25173         and keep using them to simplify new expressions, while applying the
25174         same substitutions to them as to the expression.
25176         * simplify-rtx.c (simplify_relational_operation_1): Simplify
25177         (LTU (PLUS a C) C) or (LTU (PLUS a C) a) to (GEU a -C); likewise with
25178         GEU/LTU reversed.
25180         * loop-iv.c (determine_max_iter): New arg OLD_NITER.  All callers
25181         changed.  Use this when trying to improve the upper bound.
25182         Generate the comparison by using simplify_gen_relational.
25184         * loop-iv.c (simple_rhs_p): Allow more kinds of expressions.
25186         * loop-iv.c (replace_single_def_regs, replace_in_expr): New static
25187         functions.
25188         (simplify_using_assignment, simplify_using_initial_values): Call
25189         replace_in_expr to make replacements.  Call replace_single_def_regs
25190         once on the initial version of the expression.
25192 2009-03-31  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
25194         PR target/27237
25195         * doc/invoke.texi (ARM Options): Update documentation for -mthumb.
25197 2009-03-31  Richard Guenther  <rguenther@suse.de>
25199         PR middle-end/31029
25200         * fold-const.c (fold_binary): Fold X +- Y CMP X to Y CMP 0 for
25201         equality comparisons.  Fold C - X CMP X if C % 2 == 1.
25203 2009-03-31  Richard Guenther  <rguenther@suse.de>
25205         * tree.h (div_if_zero_remainder): Declare.
25206         * fold-const.c (div_if_zero_remainder): Export.
25207         * tree-ssa-forwprop.c
25208         (forward_propagate_addr_into_variable_array_index): Handle
25209         constant array index addition outside of the variable index.
25211 2009-03-31  Joseph Myers  <joseph@codesourcery.com>
25213         PR target/39592
25214         * config/i386/i386.md (*floatunssi<mode>2_1, two unnamed
25215         define_splits, floatunssi<mode>2): Require x87 conversions from
25216         DImode to be permitted.
25218 2009-03-31  Joseph Myers  <joseph@codesourcery.com>
25220         PR preprocessor/15638
25221         * c-common.c (c_cpp_error): Handle CPP_DL_FATAL.
25223 2009-03-31  Richard Guenther  <rguenther@suse.de>
25225         PR middle-end/23401
25226         PR middle-end/27810
25227         * tree.h (DECL_GIMPLE_FORMAL_TEMP_P): Remove.
25228         (struct tree_decl_with_vis): Remove gimple_formal_temp member.
25229         * tree-eh.c (lower_eh_constructs_2): Move LHS assignment to
25230         a separate statement.
25231         * gimplify.c (pop_gimplify_context): Remove formal temp handling.
25232         (lookup_tmp_var): Likewise.
25233         (is_gimple_formal_tmp_or_call_rhs): Remove.
25234         (is_gimple_reg_or_call_rhs): Rename to ...
25235         (is_gimple_reg_rhs_or_call): ... this.
25236         (is_gimple_mem_or_call_rhs): Rename to ...
25237         (is_gimple_mem_rhs_or_call): ... this.
25238         (internal_get_tmp_var): Use is_gimple_reg_rhs_or_call.  Set
25239         DECL_GIMPLE_REG_P only if is_formal is true.
25240         (gimplify_compound_lval): Use is_gimple_reg.  Remove workaround
25241         for non-proper post-modify expression gimplification.
25242         (gimplify_self_mod_expr): For post-modify expressions gimplify
25243         the lvalue to a minimal lvalue.
25244         (rhs_predicate_for): Remove formal temp case.
25245         (gimplify_modify_expr_rhs): Likewise.
25246         (gimplify_addr_expr): Use is_gimple_reg.
25247         (gimplify_expr): Remove formal temp cases.
25248         (gimple_regimplify_operands): Likewise.
25249         * tree-ssa-pre.c (get_or_alloc_expr_for): Treat EXC_PTR_EXPR
25250         and FILTER_EXPR like constants.
25251         * gimple.c (walk_gimple_op): Fix val_only initialization, use
25252         is_gimple_reg.
25253         (is_gimple_formal_tmp_rhs): Remove.
25254         (is_gimple_reg_rhs): Remove special casing.
25255         (is_gimple_mem_rhs): Fix.
25256         (is_gimple_reg): Move DECL_GIMPLE_REG_P handling earlier.
25257         (is_gimple_formal_tmp_var): Remove.
25258         (is_gimple_formal_tmp_reg): Likewise.
25259         (is_gimple_min_lval): Allow invariant component ref parts.
25260         * gimple.h (is_gimple_formal_tmp_rhs, is_gimple_formal_tmp_var,
25261         is_gimple_formal_tmp_reg): Remove declarations.
25262         * tree-cfg.c (verify_expr): Verify that variables with address
25263         taken do not have DECL_GIMPLE_REG_P set.
25264         * tree-mudflap.c (mf_build_check_statement_for): Use
25265         force_gimple_operand instead of gimplify_expr.
25267 2009-03-31  Ayal Zaks  <zaks@il.ibm.com>
25269         * modulo-sched.c (sms_schedule_by_order): Pass the actual
25270         schedulable rows to compute_split_row.
25272 2009-03-31  Ben Elliston  <bje@au.ibm.com>
25274         PR target/31635
25275         * config/rs6000/rs6000.c (rs6000_handle_option): Handle
25276         OPT_mvrsave.
25278 2009-03-31  Alan Modra  <amodra@bigpond.net.au>
25280         * doc/invoke.texi (RS/6000 and PowerPC Options):Document mtls-markers.
25281         * configure.ac (HAVE_AS_TLS_MARKERS): New gas feature check.
25282         * configure: Regenerate.
25283         * config.in: Regenerate.
25284         * config/rs6000/rs6000.opt (mtls-markers): Add.
25285         * config/rs6000/rs6000.h (TARGET_TLS_MARKERS): Define.
25286         * config/rs6000/rs6000.md (tls_gd_aix, tls_gd_sysv): Add splitter.
25287         (tls_ld_aix, tls_ld_sysv): Likewise.
25288         (tls_gd, tls_gd_call_aix, tls_gd_call_sysv): New insns.
25289         (tls_ld, tls_ld_call_aix, tls_ld_call_sysv): Likewise.
25291 2009-03-31  Alan Modra  <amodra@bigpond.net.au>
25293         * config/spu/spu.c (spu_expand_prologue): Delete redundant code.
25295 2009-03-30  Jan Hubicka  <jh@suse.cz>
25297         * tree-eh.c (make_eh_edges): Set probability 100% to first edge
25298         out of RESX.
25299         (tree_remove_unreachable_handlers): Cleanup EH predecestor
25300         detection and label handling.
25302 2009-03-30  Vladimir Makarov  <vmakarov@redhat.com>
25304         * ira-int.h (ira_allocno): Rename left_conflicts_num to
25305         left_conflicts_size.
25306         (ALLOCNO_LEFT_CONFLICTS_NUM): Rename to
25307         ALLOCNO_LEFT_CONFLICTS_SIZE.
25309         * ira-color.c (allocno_spill_priority, push_allocno_to_stack,
25310         remove_allocno_from_bucket_and_push,
25311         allocno_spill_priority_compare, push_allocnos_to_stack,
25312         setup_allocno_available_regs_num): Use ALLOCNO_LEFT_CONFLICTS_SIZE
25313         instead of ALLOCNO_LEFT_CONFLICTS_NUM.
25314         (setup_allocno_left_conflicts_num): Ditto.  Rename to
25315         setup_allocno_left_conflicts_size.
25316         (put_allocno_into_bucket): Use ALLOCNO_LEFT_CONFLICTS_SIZE
25317         instead of ALLOCNO_LEFT_CONFLICTS_NUM and
25318         setup_allocno_left_conflicts_size instead of
25319         setup_allocno_left_conflicts_num.
25321         * ira-build.c (ira_create_allocno): Use
25322         ALLOCNO_LEFT_CONFLICTS_SIZE instead of
25323         ALLOCNO_LEFT_CONFLICTS_NUM.
25325 2009-03-30  Vladimir Makarov  <vmakarov@redhat.com>
25327         * reload.c (push_reload, find_dummy_reload): Use df_get_live_out
25328         instead of DF_LR_OUT.
25330         * ira-lives.c (process_bb_node_lives): Ditto.
25332         * ira-color.c (ira_loop_edge_freq): Use df_get_live_{out,in}
25333         instead of DF_LR_{OUT,IN}.
25335         * ira-emit.c (generate_edge_moves, add_ranges_and_copies): Ditto.
25337         * ira-build.c (create_bb_allocnos, create_loop_allocnos): Ditto.
25339 2009-03-30  Jan Hubicka  <jh@suse.cz>
25341         * except.c (label_to_region_map): Fix thinko.
25343 2009-03-30  Steve Ellcey  <sje@cup.hp.com>
25345         PR middle-end/38237
25346         * tree.h (tree_find_value): New declaration.
25347         * tree.c (tree_find_value): New function.
25348         * varasm.c (assemble_external): Avoid duplicate entries on lists.
25350 2009-03-30  Jakub Jelinek  <jakub@redhat.com>
25352         PR debug/39563
25353         * c-decl.c (struct c_binding): Add locus field.
25354         (bind): Add locus argument, set locus field from it.
25355         (pop_scope): For b->nested VAR_DECL or FUNCTION_DECL,
25356         add a DECL_EXTERNAL copy of b->decl to current BLOCK_VARS.
25357         (push_file_scope, pushtag, pushdecl, pushdecl_top_level,
25358         implicitly_declare, undeclared_variable, lookup_label,
25359         declare_label, c_make_fname_decl, c_builtin_function,
25360         c_builtin_function_ext_scope, store_parm_decls_newstyle): Adjust
25361         bind callers.
25363 2009-03-30  H.J. Lu  <hongjiu.lu@intel.com>
25365         PR target/38781
25366         * config/i386/i386.c (classify_argument): Check total size of
25367         structure.
25369 2009-03-30  Martin Jambor  <mjambor@suse.cz>
25371         * ipa-prop.h (jump_func_type): Rename IPA_UNKNOWN, IPA_CONST,
25372         IPA_CONST_MEMBER_PTR, and IPA_PASS_THROUGH to IPA_JF_UNKNOWN,
25373         IPA_JF_CONST, IPA_JF_CONST_MEMBER_PTR, and IPA_JF_PASS_THROUGH
25374         respectively.
25376         * tree-dfa.c (get_ref_base_and_extent): Return -1 maxsize if
25377         seen_variable_array_ref while also traversing a union.
25379         * tree-inline.c (optimize_inline_calls): Do not call
25380         cgraph_node_remove_callees.
25381         * cgraphbuild.c (remove_cgraph_callee_edges): New function.
25382         (pass_remove_cgraph_callee_edges): New variable.
25383         * passes.c (init_optimization_passes): Add
25384         pass_remove_cgraph_callee_edges after early inlining and before all
25385         late intraprocedural passes.
25387         * omp-low.c (expand_omp_taskreg): Always set current_function_decl.
25389 2009-03-30  Paolo Bonzini  <bonzini@gnu.org>
25391         * config/sparc/sparc.md (*nand<V64mode>_vis, *nand<V32mode>_vis):
25392         Fix typos in names.
25394 2009-03-30  Paolo Bonzini  <bonzini@gnu.org>
25396         * combine.c (simplify_comparison): Use have_insn_for.
25397         * dojump.c (do_jump): Likewise.
25399 2009-03-30  Paolo Bonzini  <bonzini@gnu.org>
25401         * config/sparc/sparc.c (sparc_compare_emitted): Remove.
25402         (gen_compare_reg, emit_v9_brxx_insn): Handle MODE_CC
25403         sparc_compare_op0 like sparc_compare_emitted used to be handled.
25404         (sparc_expand_compare_and_swap_12): Set sparc_compare_op0
25405         instead of sparc_compare_emitted.
25406         * config/sparc/sparc.h (sparc_compare_emitted): Remove.
25407         * config/sparc/sparc.md (stack_protect_test): Set sparc_compare_op0
25408         instead of sparc_compare_emitted.
25410 2009-03-30  Paolo Bonzini  <bonzini@gnu.org>
25412         * bb-reorder.c (partition_hot_cold_basic_blocks): Do not
25413         enter/exit cfglayout mode.
25414         (pass_partition_block): Require it.
25415         * combine.c (find_single_use, reg_dead_at_p): Use CFG.
25416         (combine_instructions): Track basic blocks instead of labels.
25417         (update_cfg_for_uncondjump): New.
25418         (try_combine): Use it.  Update jumps after rescanning.
25419         (pass_combine): Require PROP_cfglayout.
25420         * passes.c (pass_outof_cfg_layout_mode): Move after regmove.
25422 2009-03-30  Paolo Bonzini  <bonzini@gnu.org>
25424         * cfglayout.c (pass_into_cfg_layout_mode, pass_outof_cfg_layout_mode):
25425         Provide/destroy PROP_cfglayout respectively.
25426         * gcse.c (pass_jump_bypass, pass_gcse): Require it.
25427         * tree-pass.h (PROP_cfglayout): New.
25429 2009-03-30  Paolo Bonzini  <bonzini@gnu.org>
25431         * fold-const.c (const_binop, fold_convert_const_real_from_fixed,
25432         fold_convert_const_fixed_from_fixed,
25433         fold_convert_const_fixed_from_int,
25434         fold_convert_const_fixed_from_real, fold_negate_const): Do not
25435         set TREE_CONSTANT_OVERFLOW.
25436         * tree.def: Remove mention of TREE_CONSTANT_OVERFLOW.
25437         * tree.h (TREE_CONSTANT_OVERFLOW): Delete.
25439 2009-03-30  Ira Rosen  <irar@il.ibm.com>
25441         * tree-vect-loop-manip.c: New file.
25442         * tree-vectorizer.c: Update documentation and included files.
25443         (vect_loop_location): Make extern.
25444         (rename_use_op): Move to tree-vect-loop-manip.c
25445         (rename_variables_in_bb, rename_variables_in_loop,
25446         slpeel_update_phis_for_duplicate_loop,
25447         slpeel_update_phi_nodes_for_guard1,
25448         slpeel_update_phi_nodes_for_guard2, slpeel_make_loop_iterate_ntimes,
25449         slpeel_tree_duplicate_loop_to_edge_cfg, slpeel_add_loop_guard,
25450         slpeel_can_duplicate_loop_p, slpeel_verify_cfg_after_peeling,
25451         set_prologue_iterations, slpeel_tree_peel_loop_to_edge,
25452         find_loop_location): Likewise.
25453         (new_stmt_vec_info): Move to tree-vect-stmts.c.
25454         (init_stmt_vec_info_vec, free_stmt_vec_info_vec, free_stmt_vec_info,
25455         get_vectype_for_scalar_type, vect_is_simple_use,
25456         supportable_widening_operation, supportable_narrowing_operation):
25457         Likewise.
25458         (bb_in_loop_p): Move to tree-vect-loop.c.
25459         (new_loop_vec_info, destroy_loop_vec_info,
25460         reduction_code_for_scalar_code, report_vect_op,
25461         vect_is_simple_reduction, vect_is_simple_iv_evolution): Likewise.
25462         (vect_can_force_dr_alignment_p): Move to tree-vect-data-refs.c.
25463         (vect_supportable_dr_alignment): Likewise.
25464         * tree-vectorizer.h (tree-data-ref.h): Include.
25465         (vect_loop_location): Declare.
25466         Reorganize function declarations according to the new file structure.
25467         * tree-vect-loop.c: New file.
25468         * tree-vect-analyze.c: Remove. Move functions to tree-vect-data-refs.c,
25469         tree-vect-stmts.c, tree-vect-slp.c, tree-vect-loop.c.
25470         * tree-vect-data-refs.c: New file.
25471         * tree-vect-patterns.c (timevar.h): Don't include.
25472         * tree-vect-stmts.c: New file.
25473         * tree-vect-transform.c: Remove. Move functions to tree-vect-stmts.c,
25474         tree-vect-slp.c, tree-vect-loop.c.
25475         * Makefile.in (OBJS-common): Remove tree-vect-analyze.o and
25476         tree-vect-transform.o. Add tree-vect-data-refs.o, tree-vect-stmts.o,
25477         tree-vect-loop.o, tree-vect-loop-manip.o, tree-vect-slp.o.
25478         (tree-vect-analyze.o): Remove.
25479         (tree-vect-transform.o): Likewise.
25480         (tree-vect-data-refs.o): Add rule.
25481         (tree-vect-stmts.o, tree-vect-loop.o, tree-vect-loop-manip.o,
25482         tree-vect-slp.o): Likewise.
25483         (tree-vect-patterns.o): Remove redundant dependencies.
25484         (tree-vectorizer.o): Likewise.
25485         * tree-vect-slp.c: New file.
25487 2009-03-30  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
25489         * optc-gen.awk: Warn if an option flag has multiple different
25490         help strings.
25492 2009-03-30  Sebastian Pop  <sebastian.pop@amd.com>
25494         * doc/invoke.texi (-floop-interchange, -floop-strip-mine,
25495         -floop-block): Document dependences on PPL, CLooG and Graphite.
25497 2009-03-30  Joseph Myers  <joseph@codesourcery.com>
25499         PR rtl-optimization/323
25500         * c-common.c (c_fully_fold, convert_and_check,
25501         c_common_truthvalue_conversion): Handle EXCESS_PRECISION_EXPR.
25502         (c_fully_fold_internal): Disallow EXCESS_PRECISION_EXPR.
25503         * c-common.def (EXCESS_PRECISION_EXPR): New.
25504         * c-cppbuiltin.c (builtin_define_float_constants): Define
25505         constants with enough digits for long double.
25506         * c-lex.c (interpret_float): Interpret constant with excess
25507         precision where appropriate.
25508         * c-opts.c (c_common_post_options): Set
25509         flag_excess_precision_cmdline.  Give an error for
25510         -fexcess-precision=standard for C++ for processors where the
25511         option is significant.
25512         * c-parser.c (c_parser_conditional_expression): Handle excess
25513         precision in condition.
25514         * c-typeck.c (convert_arguments): Handle arguments with excess
25515         precision.
25516         (build_unary_op): Move excess precision outside operation.
25517         (build_conditional_expr): Likewise.
25518         (build_compound_expr): Likewise.
25519         (build_c_cast): Do cast on operand of EXCESS_PRECISION_EXPR.
25520         (build_modify_expr): Handle excess precision in RHS.
25521         (convert_for_assignment): Handle excess precision in converted
25522         value.
25523         (digest_init, output_init_element, process_init_element): Handle
25524         excess precision in initializer.
25525         (c_finish_return): Handle excess precision in return value.
25526         (build_binary_op): Handle excess precision in operands and add
25527         excess precision as needed for operation.
25528         * common.opt (-fexcess-precision=): New option.
25529         * config/i386/i386.h (X87_ENABLE_ARITH, X87_ENABLE_FLOAT): New.
25530         * config/i386/i386.md (float<SSEMODEI24:mode><X87MODEF:mode>2):
25531         For standard excess precision, output explicit conversion to and
25532         truncation from XFmode.
25533         (*float<SSEMODEI24:mode><X87MODEF:mode>2_1,
25534         *float<SSEMODEI24:mode><X87MODEF:mode>2_i387_with_temp,
25535         *float<SSEMODEI24:mode><X87MODEF:mode>2_i387, two unnamed
25536         define_splits, floatdi<X87MODEF:mode>2_i387_with_xmm, two unnamed
25537         define_splits, *floatunssi<mode>2_1, two unnamed define_splits,
25538         floatunssi<mode>2, add<mode>3, sub<mode>3, mul<mode>3, divdf3,
25539         divsf3, *fop_<mode>_comm_i387, *fop_<mode>_1_i387,
25540         *fop_<MODEF:mode>_2_i387, *fop_<MODEF:mode>_3_i387,
25541         *fop_df_4_i387, *fop_df_5_i387, *fop_df_6_i387, two unnamed
25542         define_splits, sqrt<mode>2): Disable where appropriate for
25543         standard excess precision.
25544         * convert.c (convert_to_real): Do not shorten arithmetic to type
25545         for which excess precision would be used.
25546         * defaults.h (TARGET_FLT_EVAL_METHOD_NON_DEFAULT): Define.
25547         * doc/invoke.texi (-fexcess-precision=): Document option.
25548         (-mfpmath=): Correct index entry.
25549         * flags.h (enum excess_precision, flag_excess_precision_cmdline,
25550         flag_excess_precision): New.
25551         * langhooks.c (lhd_post_options): Set
25552         flag_excess_precision_cmdline.
25553         * opts.c (common_handle_option): Handle -fexcess-precision=.
25554         * toplev.c (flag_excess_precision_cmdline, flag_excess_precision,
25555         init_excess_precision): New.
25556         (lang_dependent_init_target): Call init_excess_precision.
25557         * tree.c (excess_precision_type): New.
25558         * tree.h (excess_precision_type): Declare.
25560 2009-03-30  Joseph Myers  <joseph@codesourcery.com>
25562         PR c/35235
25563         * c-typeck.c (build_component_ref): Do not copy qualifiers from
25564         non-lvalue to component.
25566 2009-03-29  Joseph Myers  <joseph@codesourcery.com>
25568         PR preprocessor/34695
25569         * Makefile.in (c-opts.o): Depend on c-tree.h.
25570         * c-common.c: Move down include of diagnostic.h.
25571         (done_lexing, c_cpp_error): New.
25572         * c-common.h (done_lexing): Declare.
25573         * c-decl.c (c_write_global_declarations): Don't check cpp_errors
25574         (parse_in).
25575         * c-opts.c: Include c-tree.h.
25576         (c_common_init_options): Set preprocessor error callback.
25577         (c_common_handle_option): Do not set preprocessor
25578         inhibit_warnings, warnings_are_errors, warn_system_headers,
25579         pedantic_errors or inhibit_warnings flags.
25580         (c_common_post_options): Do not check cpp_errors (parse_in).
25581         (c_common_finish): Do not output dependencies if there were
25582         errors.  Do not check return value of cpp_finish.
25583         * c-ppoutput.c (pp_file_change): Set input_location.
25584         * c-tree.h (c_cpp_error): Declare.
25585         * diagnostic.c (diagnostic_set_info_translated): Also initialize
25586         override_column.
25587         (diagnostic_build_prefix): Check override_column.
25588         * diagnostic.h (diagnostic_info): Add override_column field.
25589         (diagnostic_override_column): Define.
25591 2009-03-28  Paolo Bonzini  <bonzini@gnu.org>
25593         * c-common.c (c_expand_expr, c_staticp): Remove.
25594         * c-common.def (COMPOUND_LITERAL_EXPR): Delete.
25595         * c-common.h (emit_local_var, c_staticp, COMPOUND_LITERAL_EXPR_DECL,
25596         COMPOUND_LITERAL_EXPR_DECL_EXPR): Remove.
25597         * c-gimplify.c (gimplify_compound_literal_expr,
25598         optimize_compound_literals_in_ctor): Remove.
25599         (c_gimplify_expr): Remove COMPOUND_LITERAL_EXPR handling.
25600         * c-objc-common.h (LANG_HOOKS_STATICP): Remove.
25601         * c-semantics.c (emit_local_var): Remove.
25603         * langhooks-def.h (lhd_expand_expr): Remove.
25604         * langhooks.c (lhd_expand_expr): Remove.
25605         * langhooks.h (LANG_HOOKS_DEF): Remove LANG_HOOKS_EXPAND_EXPR.
25607         * expr.c (expand_expr_real_1): Move COMPOUND_LITERAL_EXPR
25608         handling from c-semantics.c; don't call into langhook.
25609         (expand_expr_addr_expr_1): Check that we don't get non-GENERIC trees.
25610         * gimplify.c (gimplify_compound_literal_expr,
25611         optimize_compound_literals_in_ctor): Move from c-gimplify.c.
25612         (gimplify_init_constructor): Call optimize_compound_literals_in_ctor.
25613         (gimplify_modify_expr_rhs, gimplify_expr): Handle COMPOUND_LITERAL_EXPR
25614         as was done in c-gimplify.c.
25615         * tree.c (staticp): Move COMPOUND_LITERAL_EXPR handling from c_staticp.
25616         * tree.h (COMPOUND_LITERAL_EXPR_DECL, COMPOUND_LITERAL_EXPR_DECL_EXPR):
25617         Move from c-common.h.
25618         * tree.def (COMPOUND_LITERAL_EXPR): Move from c-common.def.
25620         * tree.c (staticp): Do not call langhook.
25621         * langhooks.c (lhd_staticp): Delete.
25622         * langhooks-def.h (lhd_staticp): Delete prototype.
25623         (LANG_HOOKS_STATICP): Delete.
25624         (LANG_HOOKS_INITIALIZER): Delete LANG_HOOKS_STATICP.
25626         * doc/c-tree.texi (Expression nodes): Refer to DECL_EXPRs
25627         instead of DECL_STMTs.
25629 2009-03-29  Joseph Myers  <joseph@codesourcery.com>
25631         PR c/456
25632         PR c/5675
25633         PR c/19976
25634         PR c/29116
25635         PR c/31871
25636         PR c/35198
25637         * builtins.c (fold_builtin_sincos): Build COMPOUND_EXPR in
25638         void_type_node.
25639         (fold_call_expr): Return a NOP_EXPR from folding rather than the
25640         contained expression.
25641         * c-common.c (c_fully_fold, c_fully_fold_internal, c_save_expr): New.
25642         (c_common_truthvalue_conversion): Use c_save_expr.  Do not fold
25643         conditional expressions for C.
25644         (decl_constant_value_for_optimization): Move from
25645         decl_constant_value_for_broken_optimization in c-typeck.c.  Check
25646         whether optimizing and that the expression is a VAR_DECL not of
25647         array type instead of doing such checks in the caller.  Do not
25648         check pedantic.  Call gcc_unreachable for C++.
25649         * c-common.def (C_MAYBE_CONST_EXPR): New.
25650         * c-common.h (c_fully_fold, c_save_expr,
25651         decl_constant_value_for_optimization): New prototypes.
25652         (C_MAYBE_CONST_EXPR_PRE, C_MAYBE_CONST_EXPR_EXPR,
25653         C_MAYBE_CONST_EXPR_INT_OPERANDS, C_MAYBE_CONST_EXPR_NON_CONST,
25654         EXPR_INT_CONST_OPERANDS): Define.
25655         * c-convert.c (convert): Strip nops from expression.
25656         * c-decl.c (groktypename): Take extra parameters expr and
25657         expr_const_operands.  Update call to grokdeclarator.
25658         (start_decl): Update call to grokdeclarator.  Add statement for
25659         expressions used in type of decl.
25660         (grokparm): Update call to grokdeclarator.
25661         (push_parm_decl): Update call to grokdeclarator.
25662         (build_compound_literal): Add parameter non_const and build a
25663         C_MAYBE_COSNT_EXPR if applicable.
25664         (grokdeclarator): Take extra parameters expr and
25665         expr_const_operands.  Track expressions used in declaration
25666         specifiers and declarators.  Fold array sizes and track whether
25667         they are constant expressions and whether they are integer
25668         constant expressions.
25669         (parser_xref_tag): Set expr and expr_const_operands fields in
25670         return value.
25671         (grokfield): Update call to grokdeclarator.
25672         (start_function): Update call to grokdeclarator.
25673         (build_null_declspecs): Set expr and expr_const_operands fields in
25674         return value.
25675         (declspecs_add_type): Handle expressions in typeof specifiers.
25676         * c-parser.c (c_parser_declspecs): Set expr and
25677         expr_const_operands fields for declaration specifiers.
25678         (c_parser_enum_specifier): Likewise.
25679         (c_parser_struct_or_union_specifier): Likewise.
25680         (c_parser_typeof_specifier): Likewise.  Update call to
25681         groktypename.  Fold expression as needed.  Return expressions with
25682         type instead of adding statements.
25683         (c_parser_attributes): Update calls to c_parser_expr_list.
25684         (c_parser_statement_after_labels): Fold expression before passing
25685         to objc_build_throw_stmt.
25686         (c_parser_condition): Fold expression.
25687         (c_parser_asm_operands): Fold expression.
25688         (c_parser_conditional_expression): Use c_save_expr.  Update call
25689         to build_conditional_expr.
25690         (c_parser_alignof_expression): Update call to groktypename.
25691         (c_parser_postfix_expression): Preserve C_MAYBE_CONST_EXPR as
25692         original_code.  Fold expression argument of va_arg.  Create
25693         C_MAYBE_CONST_EXPR to preserve side effects of expressions in type
25694         argument to va_arg.  Update calls to groktypename.  Fold array
25695         index for offsetof.  Verify that first argument to
25696         __builtin_choose_expr has integer type.
25697         (c_parser_postfix_expression_after_paren_type): Update calls to
25698         groktypename and build_compound_literal.  Handle expressions with
25699         side effects in type name.
25700         (c_parser_postfix_expression_after_primary): Update call to
25701         c_parser_expr_list.  Set original_code for calls to
25702         __builtin_constant_p.
25703         (c_parser_expr_list): Take extra parameter fold_p.  Fold
25704         expressions if requested.
25705         (c_parser_objc_type_name): Update call to groktypename.
25706         (c_parser_objc_synchronized_statement): Fold expression.
25707         (c_parser_objc_receiver): Fold expression.
25708         (c_parser_objc_keywordexpr): Update call to c_parser_expr_list.
25709         (c_parser_omp_clause_num_threads, c_parser_omp_clause_schedule,
25710         c_parser_omp_atomic, c_parser_omp_for_loop): Fold expressions.
25711         * c-tree.h (CONSTRUCTOR_NON_CONST): Define.
25712         (struct c_typespec): Add elements expr and expr_const_operands.
25713         (struct c_declspecs): Add elements expr and expr_const_operands.
25714         (groktypename, build_conditional_expr, build_compound_literal):
25715         Update prototypes.
25716         (in_late_binary_op): Declare.
25717         * c-typeck.c (note_integer_operands): New function.
25718         (in_late_binary_op): New variable.
25719         (decl_constant_value_for_broken_optimization): Move to c-common.c
25720         and rename to decl_constant_value_for_optimization.
25721         (default_function_array_conversion): Do not strip nops.
25722         (default_conversion): Do not call
25723         decl_constant_value_for_broken_optimization.
25724         (build_array_ref): Do not fold result.
25725         (c_expr_sizeof_expr): Fold operand.  Use C_MAYBE_CONST_EXPR for
25726         result when operand is a VLA.
25727         (c_expr_sizeof_type): Update call to groktypename.  Handle
25728         expressions included in type name.  Use C_MAYBE_CONST_EXPR for
25729         result when operand names a VLA type.
25730         (build_function_call): Update call to build_compound_literal.
25731         Only fold result for calls to __builtin_* functions.  Strip
25732         NOP_EXPR from INTEGER_CST returned from such functions.  Fold
25733         the function designator.
25734         (convert_arguments): Fold arguments.  Update call to
25735         convert_for_assignment.
25736         (build_unary_op): Handle increment and decrement of
25737         C_MAYBE_CONST_EXPR.  Move lvalue checks for increment and
25738         decrement earlier.  Fold operand of increment and decrement.
25739         Handle address of C_MAYBE_CONST_EXPR.  Only fold expression being
25740         built for integer operand.  Wrap returns that are INTEGER_CSTs
25741         without being integer constant expressions or that have integer
25742         constant operands without being INTEGER_CSTs.
25743         (lvalue_p): Handle C_MAYBE_CONST_EXPR.
25744         (build_conditional_expr): Add operand ifexp_bcp.  Track whether
25745         result is an integer constant expression or can be used in
25746         unevaluated parts of one and avoid folding and wrap as
25747         appropriate.  Fold operands before possibly doing -Wsign-compare
25748         warnings.
25749         (build_compound_expr): Wrap result for C99 if operands can be used
25750         in integer constant expressions.
25751         (build_c_cast): Update call to digest_init.  Do not ignore
25752         overflow from casting floating-point constants to integers.  Wrap
25753         results that could be confused with integer constant expressions,
25754         null pointer constants or floating-point constants.
25755         (c_cast_expr): Update call to groktypename.  Handle expressions
25756         included in type name.
25757         (build_modify_expr): Handle modifying a C_MAYBE_CONST_EXPR.  Fold
25758         lhs inside possible SAVE_EXPR.  Fold RHS before assignment.
25759         Update calls to convert_for_assignment.
25760         (convert_for_assignment): Take new parameter
25761         null_pointer_constant.  Do not strip nops or call
25762         decl_constant_value_for_broken_optimization.  Set
25763         in_late_binary_op for conversions to boolean.
25764         (store_init_value): Update call to digest_init.
25765         (digest_init): Take new parameter null_pointer_constant.  Do not
25766         call decl_constant_value_for_broken_optimization.  pedwarn for
25767         initializers not constant expressions.  Update calls to
25768         convert_for_assignment.
25769         (constructor_nonconst): New.
25770         (struct constructor_stack): Add nonconst element.
25771         (really_start_incremental_init, push_init_level, pop_init_level):
25772         Handle constructor_nonconst and nonconst element.
25773         (set_init_index): Call constant_expression_warning for array
25774         designators.
25775         (output_init_element): Fold value.  Set constructor_nonconst as
25776         applicable.  pedwarn for initializers not constant expressions.
25777         Update call to digest_init.  Call constant_expression_warning
25778         where constant initializers are required.
25779         (process_init_element): Use c_save_expr.
25780         (c_finish_goto_ptr): Fold expression.
25781         (c_finish_return): Fold return value.  Update call to
25782         convert_for_assignment.
25783         (c_start_case): Fold switch expression.
25784         (c_process_expr_stmt): Fold expression.
25785         (c_finish_stmt_expr): Create C_MAYBE_CONST_EXPR as needed to
25786         ensure statement expression is not evaluated in constant expression.
25787         (build_binary_op): Track whether results are integer constant
25788         expressions or may occur in such, disable folding and wrap results
25789         as applicable.  Fold operands for -Wsign-compare warnings unless
25790         in_late_binary_op.
25791         (c_objc_common_truthvalue_conversion): Handle results folded to
25792         integer constants that are not integer constant expressions.
25793         * doc/extend.texi: Document when typeof operands are evaluated,
25794         that condition of __builtin_choose_expr is an integer constant
25795         expression, and more about use of __builtin_constant_p in
25796         initializers.
25798 2009-03-29  Richard Guenther  <rguenther@suse.de>
25800         * tree-ssa-forwprop.c (forward_propagate_addr_expr_1): Properly
25801         propagate addresses of array references.
25803 2009-03-29  Steven Bosscher  <steven@gcc.gnu.org>
25805         * regmove.c (perhaps_ends_bb_p): Remove.
25806         (optimize_reg_copy_1): Don't call perhaps_ends_bb_p.  Get basic block
25807         from INSN and check that the main loop stays within that basic block.
25808         (optimize_reg_copy_1, optimize_reg_copy_3, fixup_match_2): Likewise.
25809         (regmove_forward_pass): Split out from regmove_optimize.  Use
25810         FOR_EACH_BB and FOR_BB_INSNS instead of traversing the insns stream.
25811         (regmove_backward_pass): Split out from regmove_optimize.  Use
25812         FOR_EACH_BB_REVERSE and FOR_BB_INSNS_REVERS_SAFE.
25813         (regmove_optimize): Simplify.
25815 2009-03-29  H.J. Lu  <hongjiu.lu@intel.com>
25817         PR target/39545
25818         * config/i386/i386.c (classify_argument): Ignore flexible array
25819         member in struct and warn ABI change.
25821 2009-03-29  H.J. Lu  <hongjiu.lu@intel.com>
25823         * config/i386/i386-protos.h (ix86_agi_dependent): New.
25825         * config/i386/i386.c (ix86_agi_dependent): Rewrite.
25826         (ix86_adjust_cost): Updated.
25828 2009-03-29  Jan Hubicka  <jh@suse.cz>
25830         PR middle-end/28850
25831         * tree-pass.h (pass_cleanup_eh): New function.
25832         (remove_unreachable_regions): Break code handling RTL
25833         to rtl_remove_unreachable_regions; remove ERT_MUST_NOT_THROW
25834         that can not be reached by runtime.
25835         (can_be_reached_by_runtime): New function.
25836         (label_to_region_map): New function.
25837         (num_eh_regions): New function.
25838         (rtl_remove_unreachable_regions): New function.
25839         (convert_from_eh_region_ranges): Call rtl_remove_unreachable_regions.
25840         (remove_eh_region): New function.
25841         * except.h: Include sbitmap and vecprim.
25842         (remove_eh_region, remove_unreachable_regions, label_to_region_map,
25843         num_eh_regions): Declare.
25844         * passes.c (init_optimization_passes): Schedule cleanup_eh.
25845         * Makefile.in (EXCEPT_H): New; replace all uses of except.h by it.
25846         * tree-eh.c (tree_remove_unreachable_handlers): New function.
25847         (tree_empty_eh_handler_p): New function.
25848         (cleanup_empty_eh): New function.
25849         (cleanup_eh): New function.
25850         (pass_cleanup_eh): New function.
25852 2009-03-29  Jan Hubicka  <jh@suse.cz>
25854         * except.c (verify_eh_tree): Fix handling of fun!=cfun; be ready
25855         for removed regions.
25857 2009-03-29  Jan Hubicka  <jh@suse.cz>
25859         * except.c (dump_eh_tree): Dump all datastructures.
25861 2009-03-29  Jan Hubicka  <jh@suse.cz>
25863         * except.c (duplicate_eh_regions_0): Handle AKA bitmap.
25864         (duplicate_eh_regions_1): Likewise.
25865         (duplicate_eh_regions): Likewise; cleanup code gorwing the region
25866         vector; call EH verification.
25867         (foreach_reachable_handler, can_throw_internal_1, can_throw_external_1):
25868         Be ready for region being removed.
25870 2009-03-29  Jan Hubicka  <jh@suse.cz>
25872         * bitmap.c (bitmap_last_set_bit): New function.
25873         * bitmap.h (bitmap_last_set_bit): Declare.
25875 2009-03-29  David Ayers  <ayers@fsfe.org>
25877         PR objc/27377
25878         * c-typeck.c (build_conditional_expr): Emit ObjC warnings
25879         by calling objc_compare_types and surpress warnings about
25880         incompatible C pointers that are compatible ObjC pointers.
25882 2009-03-29  Adam Nemet  <anemet@caviumnetworks.com>
25884         * cgraphbuild.c (build_cgraph_edges, rebuild_cgraph_edges): Don't
25885         call initialize_inline_failed.
25886         (initialize_inline_failed): Move it from here ...
25887         * cgraph.c (initialize_inline_failed): ... to here.
25888         (cgraph_create_edge): Call initialize_inline_failed rather than
25889         setting inline_failed directly.
25891 2009-03-29  Ben Elliston  <bje@au.ibm.com>
25893         PR target/32542
25894         * sysv4.opt (msdata): Improve comment.
25895         * linux64.h (ASM_SPEC32): Do not pass -memb when -msdata is given.
25896         * sysv4.h (SVR4_ASM_SPEC): Likewise.
25898 2009-03-29  Ben Elliston  <bje@au.ibm.com>
25900         PR target/30451
25901         * config/rs6000/rs6000.md (*movti_ppc64): Correct the order of
25902         load and store attributes.
25904 2009-03-29  Ben Elliston  <bje@au.ibm.com>
25906         * config/i386/i386.c (enum ix86_builtins): Add IX86_BUILTIN_HUGE_VALQ.
25907         (ix86_init_builtins): Add built-in function __builtin_huge_valq.
25908         (ix86_expand_builtin): Handle IX86_BUILTIN_HUGE_VALQ.
25909         * doc/extend.texi (X86 Built-in Functions): Add index entries for
25910         __builtin_infq and __builtin_huge_valq.
25912 2009-03-28  Anatoly Sokolov  <aesok@post.ru>
25914         * config/avr/avr.c (avr_mcu_t): Add atmega8c1, atmega16c1 and
25915         atmega8m1 devices.
25916         * config/avr/avr.h (LINK_SPEC, CRT_BINUTILS_SPECS): (Ditto.).
25917         * config/avr/t-avr (MULTILIB_MATCHES): (Ditto.)
25919 2009-03-28  Xinliang David Li  <davidxl@google.com>
25921         * tree-ssa-ccp.c (ccp_finalize): Add dbg_count support.
25922         (do_dbg_cnt): New function.
25924 2009-03-28  Jan Hubicka  <jh@suse.cz>
25926         Merge from pretty-ipa:
25928         2009-03-27  Jan Hubicka  <jh@suse.cz>
25930         * cgraph.c (dump_cgraph_node): Add replace output flag by process.
25931         * tree-pass.h (function_called_by_processed_nodes_p): Declare.
25932         * passes.c (function_called_by_processed_nodes_p): New.
25933         * ipa-pure-const.c (check_call): Fix handling of operands.
25934         (analyze_function): Dump debug output for skipped bodies.
25935         (local_pure_const): Use function_called_by_processed_nodes_p.
25936         * dwarf2out.c (reference_to_unused): Use output.
25937         * passes.c (do_per_function_toporder): Likewise.
25939         2008-11-12  Jan Hubicka  <jh@suse.cz>
25941         * tree-pass.h (pass_fixup_cfg, pass_local_pure_const): Declare.
25942         * ipa-pure-const.c (funct_state_d): Add can throw field; make
25943         state_set_in_source enum
25944         (check_decl): Ignore memory tags; do not set fake looping flags;
25945         dump diagnostics.
25946         (check_operand, check_tree, check_rhs_var, check_lhs_var,
25947         get_asm_expr_operands, scan_function_op, scan_function_stmt): Remove.
25948         (check_call, analyze_function): Rewrite.
25949         (check_stmt): New.
25950         (add_new_function): Update call of analyze_function.
25951         (generate_summary): Add call of analyze_function.
25952         (propagate): Propagate can_throw; handle state_set_in_source correctly.
25953         (local_pure_const): New function.
25954         (pass_local_pure_const): New pass.
25955         * ipa-inline.c (inline_transform): Set after_inlining.
25956         * tree-eh.c (stmt_can_throw_external): New.
25957         * tree-optimize.c (execute_fixup_cfg): Do not set after_inlining;
25958         work with aliasing built.
25959         * tree-flow.h (stmt_can_throw_external): New.
25960         * passes.c (init_optimization_passes): Schedule fixup_cfg pass early;
25961         and local pure/const pass in early and late optimization queue.
25963 2009-03-28  Martin Jambor  <mjambor@suse.cz>
25965         * fold-const.c (get_pointer_modulus_and_residue): New parameter
25966         allow_func_align.
25967         (fold_binary): Allow function decl aligment consideration is the
25968         second argument is integer constant one.
25969         * tree-ssa-forwprop.c (simplify_bitwise_and): New function.
25970         (tree_ssa_forward_propagate_single_use_vars): Handle assing statements
25971         with BIT_AND_EXPR on the RHS by calling simplify_bitwise_and.
25973 2009-03-28  Jan Hubicka  <jh@suse.cz>
25975         * dwarf2out.c (dwarf2out_begin_prologue): Use crtl->nothrow
25976         * tree-eh.c (stmt_could_throw_p): Remove check for WEAK decls.
25977         * function.h (rtl_data): Add nothrow flag.
25978         * except.c (set_nothrow_function_flags): Use crtl->nothrow;
25979         set DECL_NOTHROW for AVAILABLE functions.
25981 2009-03-28  Jakub Jelinek  <jakub@redhat.com>
25983         * config/rs6000/rs6000-c.c (rs6000_macro_to_expand): If macro
25984         following vector keyword has expansion starting with pixel or bool
25985         keyword, expand vector to __vector and pixel or bool to __pixel or
25986         __bool.
25988         PR c++/39554
25989         * opts.c (warning_disallowed_functions, warn_disallowed_functions,
25990         warn_if_disallowed_function_p): Removed.
25991         (common_handle_option): Don't handle OPT_Wdisallowed_function_list_.
25992         * c-parser.c (c_parser_postfix_expression_after_primary): Don't call
25993         warning_if_disallowed_function_p.
25994         * flags.h (warn_if_disallowed_function_p,
25995         warn_disallowed_functions): Removed.
25996         * common.opt (Wdisallowed-function-list=): Removed.
25997         * doc/invoke.texi (-Wdisallowed-function-list=): Removed.
25999 2009-03-28  Richard Guenther  <rguenther@suse.de>
26001         PR tree-optimization/38723
26002         * tree-ssa-pre.c (compute_avail): Add all default definitions to
26003         the entry block.
26005 2009-03-28  Jan Hubicka  <jh@suse.cz>
26007         * tree-ssa-structalias.c (ipa_pta_execute): Fix bogus node->analyzed
26008         test introduced by my previous patch.
26010 2009-03-28  Richard Guenther  <rguenther@suse.de>
26012         * tree-ssa-copy.c (copy_prop_visit_phi_node): Do not leave
26013         the PHIs value undefined.
26015 2009-03-28  Jan Hubicka  <jh@suse.cz>
26017         * tree-pass.h (pass_fixup_cfg): New pass.
26018         * ipa-inline.c (inline_transform): Set
26019         always_inline_functions_inlined/after_inlining.
26020         * tree-optimize.c (execute_fixup_cfg): Do not set them here.
26021         (pass_fixup_cfg): New pass.
26022         * passes.c (init_optimization_passes): Add fixup_cfg.
26024 2009-03-28  Richard Guenther  <rguenther@suse.de>
26026         PR tree-optimization/38458
26027         * tree-ssa-copy.c (copy_prop_visit_phi_node): For the first
26028         argument use the arguments copy-of value.
26030 2009-03-28  Richard Guenther  <rguenther@suse.de>
26032         PR tree-optimization/38180
26033         * tree-ssa-ccp.c (get_default_value): Simplify.
26034         (likely_value): Likewise.
26035         (surely_varying_stmt_p): Properly handle VOP case.
26036         (ccp_initialize): Likewise.
26037         (ccp_fold): Handle propagating through *&.
26038         (fold_const_aggregate_ref): Also handle decls.
26040 2009-03-28  Jan Hubicka  <jh@suse.cz>
26042         * cgraph.c (dump_cgraph_node): Add replace output flag by process.
26043         * cgraph.h (cgraph_node): Likewise.
26044         * cgraphunit.c (cgraph_process_new_functions): Set process flag.
26045         (cgraph_reset_node): Use process flag.
26046         (cgraph_mark_functions_to_output): Likewise.
26047         (cgraph_expand_function): Likewise.
26048         (cgraph_expand_all_functions): Likewise.
26049         (cgraph_output_in_order): Likewise.
26050         * dwarf2out.c (reference_to_unused): Likewise.
26051         * passes.c do_per_function_toporder): Likewise.
26053 2009-03-28  Jan Hubicka  <jh@suse.cz>
26055         Bring from lto-branch:
26057         2008-09-03  Doug Kwan  <dougkwan@google.com>
26059         * cgraphbuild.c (initialize_inline_failed): Use cgraph_inline_failed_t
26060         enums instead of reason strings.
26061         * cgraph.c (cgraph_create_edge): Same.
26062         (cgraph_inline_failed_string): New function.
26063         * cgraph.h (cgraph_inline_failed_t): New enum type.
26064         (cgraph_inline_failed_string): New prototype.
26065         (struct cgraph_edge): Change type of INLINED_FAILED from constant
26066         char pointer to cgraph_inline_failed_t.
26067         (cgraph_inline_p): Adjust prototype to use cgraph_inline_failed_t.
26068         (cgraph_default_inline_p): Ditto.
26069         * cgraphunit.c (cgraph_inline_p): Change type of parameter REASON
26070         to cgraph_inline_failed_t pointer.
26071         * cif-code.def: New file.
26072         * ipa-inline.c (cgraph_mark_inline_edge): Use an enum instead of a
26073         reason string.
26074         (cgraph_check_inline_limits): Change type of REASON to pointer to
26075         cgraph_inline_failed_t.  Replace reason strings with enums.
26076         (cgraph_default_inline_p): Ditto.
26077         (cgraph_recursive_inlining_p): Ditto.
26078         (update_caller_keys): Change type of FAILED_REASON to
26079         cgraph_inline_failed_t.
26080         (cgraph_set_inline_failed): Change type of REASON to pointer to
26081         cgraph_inline_failed_t.  Call cgraph_inline_failed_string to
26082         convert enums to strings for text output.
26083         (cgraph_decide_inlining_of_small_function): Change FAILED_REASON
26084         to be of type cgraph_inline_failed_t.  Replace reason strings with
26085         enums.  Call cgraph_inline_failed_string to covert enums
26086         to strings for text output.
26087         (cgraph_decide_inlining): Replace reason strings with enums.
26088         (cgraph_decide_inlining_incrementally): Change type of FAILED_REASON
26089         to cgraph_inline_failed_t type.  Call cgraph_inline_failed_string
26090         for text output.
26091         * tree-inline.c (expand_call_inline): Change type of REASON
26092         to cgraph_inline_failed_t.  Replace reason strings with enums.
26093         Call cgraph_inline_failed_string for text output.
26094         * Makefile.in (CGRAPH_H): Add cif-code.def to dependencies.
26095         (cgraph.o): Ditto.
26097 2009-03-28  Jan Hubicka  <jh@suse.cz>
26099         * cgraph.c (cgraph_node, cgraph_remove_node, dump_cgraph_node,
26100         cgraph_clone_node): Remove master clone handling.
26101         (cgraph_is_master_clone, cgraph_master_clone): Remove.
26102         * cgraph.h (master_clone): Remove.
26103         (cgraph_is_master_clone, cgraph_master_clone): Remove.
26104         * ipa-type-escape.c (type_escape_execute): Remove use of master clone.
26105         (tree-ssa-structalias.c (ipa_pta_execute): Likewise.
26107 2009-03-28  Jan Hubicka  <jh@suse.cz>
26109         * cgraph.c (cgraph_function_body_availability): Functions declared
26110         inline are always safe to assume that it is not going to be replaced.
26112 2009-03-28  Richard Guenther  <rguenther@suse.de>
26114         PR tree-optimization/38513
26115         * tree-ssa-pre.c (eliminate): Remove redundant stores.
26116         * tree-ssa-sccvn.c (copy_reference_ops_from_ref): Handle
26117         EXC_PTR_EXPR and FILTER_EXPR.
26118         (get_ref_from_reference_ops): Likewise.
26120 2009-03-28  Richard Guenther  <rguenther@suse.de>
26122         PR tree-optimization/38968
26123         * tree-vect-analyze.c (vect_compute_data_ref_alignment):
26124         Use FLOOR_MOD_EXPR to compute misalignment.
26126 2009-03-28  Richard Guenther  <rguenther@suse.de>
26128         PR tree-optimization/37795
26129         * tree.h (combine_comparisons): Declare.
26130         * fold-const.c (combine_comparisons): Export.
26131         * tree-ssa-ifcombine.c (ifcombine_ifandif): Optimize two successive
26132         comparisons.
26133         (ifcombine_iforif): Use combine_comparisons.
26135 2009-03-28  Jan Hubicka  <jh@suse.cz>
26137         * tree-eh.c (inlinable_call_p): New function.
26138         (make_eh_edges): Use it.
26139         (verify_eh_edges): Use it.
26140         (stmt_can_throw_external, stmt_can_throw_internal): Use it.
26141         * except.c (reachable_next_level): Add inlinable_function argument
26142         (sjlj_find_directly_reachable_regions): Update.
26143         (add_reachable_handler): Do not set saw_any_handlers.
26144         (reachable_next_level): Handle MUST_NOT_THROW more curefully.
26145         (foreach_reachable_handler, can_throw_internal_1, can_throw_external_1):
26146         Add new inlinable call parameter.
26147         (can_throw_internal, can_throw_external): Update.
26148         * except.h (can_throw_internal_1, can_throw_external_1,
26149         foreach_reachable_handler): Update declaration.
26151 2009-03-28  Joseph Myers  <joseph@codesourcery.com>
26153         * config/arm/t-arm-coff, config/h8300/coff.h,
26154         config/i386/i386-aout.h, config/i386/i386-coff.h,
26155         config/libgloss.h, config/m68k/coff.h, config/m68k/m68k-aout.h,
26156         config/pdp11/2bsd.h, config/rs6000/aix41.h,
26157         config/rs6000/aix41.opt, config/rs6000/t-newas, config/sh/coff.h,
26158         fix-header.c, fixproto, gen-protos.c, protoize.c, scan-decls.c,
26159         scan-types.sh, scan.c, scan.h, sort-protos, sys-protos.h,
26160         sys-types.h: Remove.
26161         * Makefile.in: Remove protoize and fixproto support and references
26162         in comments.
26163         (SYSCALLS.c.X-warn, TARGET_GETGROUPS_T, STMP_FIXPROTO,
26164         PROTOIZE_INSTALL_NAME, UNPROTOIZE_INSTALL_NAME, FIXPROTO_DEFINES):
26165         Remove.
26166         (ALL_HOST_OBJS): Remove $(PROTO_OBJS).
26167         (MOSTLYCLEANFILES): Remove protoize$(exeext) and
26168         unprotoize$(exeext).
26169         (rest.encap): Don't depend on $(STMP_FIXPROTO)
26170         (.PHONY): Don't depend on proto.
26171         (libgcc-support): Don't depend on $(STMP_FIXPROTO).
26172         (proto, PROTO_OBJS, protoize$(exeext), unprotoize$(exeext),
26173         protoize.o, unprotoize.o, SYSCALLS.c.X, test-protoize-simple,
26174         deduced.h, GEN_PROTOS_OBJS, build/gen-protos$(build_exeext),
26175         build/gen-protos.o, build/scan.o, xsys-protos.h,
26176         build/fix-header$(build_exeext), build/fix-header.o,
26177         build/scan-decls.o, fixhdr.ready, stmp-fixproto,
26178         stmp-install-fixproto): Remove.
26179         (mostlyclean): Don't remove xsys-protos.hT, SYSCALLS.c.X,
26180         SYSCALLS.c or fixproto files.
26181         (install-common): Don't install protoize.
26182         (install-headers-tar, install-headers-cpio, install-headers-cp):
26183         Don't depend on $(STMP_FIXPROTO).
26184         (install-mkheaders): Don't depend on $(STMP_FIXPROTO).  Don't
26185         install fixproto files or write out fixproto settings.
26186         (uninstall): Don't uninstall protoize.
26187         * config.gcc (use_fixproto): Remove.
26188         (arm-*-coff*, armel-*-coff*, h8300-*-*, i[34567]86-*-aout*,
26189         i[34567]86-*-coff*, m68k-*-aout*, m68k-*-coff*, pdp11-*-bsd,
26190         rs6000-ibm-aix4.[12]*, powerpc-ibm-aix4.[12]*, sh-*-*): Remove.
26191         * config/m32r/t-linux (STMP_FIXPROTO): Remove.
26192         * config/m68k/m68k.c: Remove M68K_TARGET_COFF-conditional code.
26193         * config/mips/t-iris (FIXPROTO_DEFINES): Remove.
26194         * config/pa/t-pa-hpux (FIXPROTO_DEFINES): Remove.
26195         * config/pdp11/pdp11.c: Remove TWO_BSD-conditional code.
26196         * config/t-svr4 (FIXPROTO_DEFINES): Remove.
26197         * config/t-vxworks (STMP_FIXPROTO): Remove.
26198         * configure.ac (AC_TYPE_GETGROUPS, TARGET_GETGROUPS_T,
26199         STMP_FIXPROTO): Remove.
26200         * config.in, configure: Regenerate.
26201         * crtstuff.c (gid_t, uid_t): Don't undefine.
26202         * doc/install.texi: Change m68k-coff to m68k-elf in example.
26203         (arm-*-coff, arm-*-aout: Remove target entries.
26204         (*-ibm-aix*): Mention removal of support for AIX 4.2 and older.
26205         Remove mention of AIX 4.1.
26206         (m68k-*-*): Remove mention of m68k-*-aout and m68k-*-coff*.
26207         * doc/invoke.texi (Running Protoize): Remove.
26208         * doc/trouble.texi (Actual Bugs): Remove mention of fixproto.
26209         (Protoize Caveats): Remove.
26210         * tsystem.h: Update comments on headers assumed to exist.
26212 2009-03-27  Vladimir Makarov  <vmakarov@redhat.com>
26214         * genautomata.c: Add a new year to the copyright.  Add a new
26215         reference.
26216         (struct insn_reserv_decl): Add comments for member bypass_list.
26217         (find_bypass): Remove.
26218         (insert_bypass): New.
26219         (process_decls): Use insert_bypass.
26220         (output_internal_insn_latency_func): Output all bypasses with the
26221         same input insn in one switch case.
26223         * rtl.def (define_bypass): Describe bypass choice.
26224         * doc/md.texi (define_bypass): Ditto.
26226 2009-03-27  Richard Guenther  <rguenther@suse.de>
26228         * gimplify.c (mark_addressable): Export.
26229         * tree-flow.h (mark_addressable): Declare.
26230         * tree-ssa-loop-manip.c (create_iv): Mark the base addressable.
26231         * tree-ssa.c (verify_phi_args): Verify that address taken
26232         variables have TREE_ADDRESSABLE set.
26234 2009-03-27  Richard Guenther  <rguenther@suse.de>
26236         * fold-const.c (build_fold_addr_expr_with_type_1): Rename back to ...
26237         (build_fold_addr_expr_with_type): ... this.  Remove in_fold handling.
26238         Do not mark decls TREE_ADDRESSABLE.
26239         (build_fold_addr_expr): Adjust.
26240         (fold_addr_expr): Remove.
26241         (fold_unary): Use build_fold_addr_expr.
26242         (fold_comparison): Likewise.
26243         (split_address_to_core_and_offset): Likewise.
26244         * coverage.c (tree_coverage_counter_addr): Mark the array decl
26245         TREE_ADDRESSABLE.
26246         * gimplify.c (mark_addressable): Do not exclude RESULT_DECLs.
26247         (gimplify_modify_expr_to_memcpy): Mark source and destination
26248         addressable.
26249         * omp-low.c (create_omp_child_function): Mark the object decl
26250         TREE_ADDRESSABLE.
26251         (lower_rec_input_clauses): Mark the var we take the address of
26252         TREE_ADDRESSABLE.
26253         (lower_omp_taskreg): Mark the sender decl TREE_ADDRESSABLE.
26255 2009-03-27  H.J. Lu  <hongjiu.lu@intel.com>
26257         PR middle-end/39315
26258         * cfgexpand.c (expand_one_stack_var_at): Change alignment
26259         limit to MAX_SUPPORTED_STACK_ALIGNMENT.
26261 2009-03-27  Richard Guenther  <rguenther@suse.de>
26263         PR tree-optimization/39120
26264         * tree-ssa-structalias.c (handle_rhs_call): Fill out return
26265         constraints.
26266         (handle_lhs_call): Process return constraints.  Add escape
26267         constraints if necessary.
26268         (handle_const_call): Fill out return constraints.  Make nested
26269         case more precise.  Avoid consttmp if possible.
26270         (handle_pure_call): Fill out return constraints.  Avoid
26271         callused if possible.
26272         (find_func_aliases): Simplify call handling.
26274 2009-03-27  Richard Guenther  <rguenther@suse.de>
26276         PR tree-optimization/39120
26277         * tree-ssa-structalias.c (do_sd_constraint): Do not use CALLUSED
26278         as a representative.
26279         (solve_graph): Do propagate CALLUSED.
26280         (handle_pure_call): Use a scalar constraint from CALLUSED for
26281         the return value.
26282         (find_what_p_points_to): CALLUSED shall not appear in poins-to
26283         solutions.
26285 2009-03-27  H.J. Lu  <hongjiu.lu@intel.com>
26287         PR c/39323
26288         * c-common.c (handle_aligned_attribute): Properly check alignment
26289         overflow.  Use (1U << i) instead of (1 << i).
26291         * emit-rtl.c (get_mem_align_offset): Use "unsigned int" for align.
26293         * expr.h (get_mem_align_offset): Updated.
26295         * tree.h (tree_decl_common): Change align to "unsigned int" and
26296         move it before pointer_alias_set.
26298 2009-03-27  H.J. Lu  <hongjiu.lu@intel.com>
26299             Jakub Jelinek  <jakub@redhat.com>
26301         PR target/38034
26302         * config/ia64/sync.md (cmpxchg_rel_<mode>): Replace input
26303         gr_register_operand with gr_reg_or_0_operand.
26304         (cmpxchg_rel_di): Likewise.
26305         (sync_lock_test_and_set<mode>): Likewise.
26307 2009-03-27  H.J. Lu  <hongjiu.lu@intel.com>
26309         * jump.c (rtx_renumbered_equal_p): Use subreg_get_info.
26310         (true_regnum): Likewise.
26312         * rtlanal.c (subreg_info): Moved to ...
26313         * rtl.h (subreg_info): Here.  New.
26314         (subreg_get_info): New.
26316         * rtlanal.c (subreg_get_info): Make it extern.
26318 2009-03-27  H.J. Lu  <hongjiu.lu@intel.com>
26320         PR target/39472
26321         * config/i386/i386.c (ix86_abi): New.
26322         (override_options): Handle -mabi=.
26323         (ix86_function_arg_regno_p): Replace DEFAULT_ABI with ix86_abi.
26324         (ix86_call_abi_override): Likewise.
26325         (init_cumulative_args): Likewise.
26326         (function_arg_advance): Likewise.
26327         (function_arg_64): Likewise.
26328         (function_arg): Likewise.
26329         (ix86_pass_by_reference): Likewise.
26330         (ix86_function_value_regno_p): Likewise.
26331         (ix86_build_builtin_va_list_abi): Likewise.
26332         (setup_incoming_varargs_64): Likewise.
26333         (is_va_list_char_pointer): Likewise.
26334         (ix86_init_machine_status): Likewise.
26335         (ix86_reg_parm_stack_space): Use enum calling_abi on call_abi.
26336         (ix86_function_type_abi): Return enum calling_abi.  Rewrite
26337         for 64bit.  Replace DEFAULT_ABI with ix86_abi.
26338         (ix86_function_abi): Make it static and return enum calling_abi.
26339         (ix86_cfun_abi): Return enum calling_abi.  Replace DEFAULT_ABI
26340         with ix86_abi.
26341         (ix86_fn_abi_va_list): Updated.
26343         * config/i386/i386.h (ix86_abi): New.
26344         (STACK_BOUNDARY): Replace DEFAULT_ABI with ix86_abi.
26345         (CONDITIONAL_REGISTER_USAGE): Likewise.
26346         (CUMULATIVE_ARGS): Change call_abi type to enum calling_abi.
26347         (machine_function): Likewise.
26349         * config/i386/i386.md (untyped_call): Replace DEFAULT_ABI
26350         with ix86_abi.
26351         * config/i386/cygming.h (TARGET_64BIT_MS_ABI): Likewise.
26352         (STACK_BOUNDARY): Likewise.
26353         * config/i386/mingw32.h (EXTRA_OS_CPP_BUILTINS): Likewise.
26355         * config/i386/i386.opt (mabi=): New.
26357         * config/i386/i386-protos.h (ix86_cfun_abi): Changed to
26358         return enum calling_abi.
26359         (ix86_function_type_abi): Likewise.
26360         (ix86_function_abi): Removed.
26362         * doc/invoke.texi: Document -mabi= option for x86.
26364 2009-03-27  Kaveh R. Ghazi  <ghazi@caip.rutgers.edu>
26366         * builtins.c (real_dconstp): Delete.
26367         (fold_builtin_logarithm): Remove inaccurate log(e) special case.
26369 2009-03-27  Dodji Seketeli  <dodji@redhat.com>
26370             Jakub Jelinek  <jakub@redhat.com>
26372         PR debug/37959
26373         * dwarf2out.c (dwarf_attr_name): Handle DW_AT_explicit attribute.
26374         (gen_subprogram_die): When a function is explicit, generate the
26375         DW_AT_explicit attribute.
26376         * langhooks.h (struct lang_hooks_for_decls): Add
26377         function_decl_explicit_p langhook.
26378         * langhooks-def.h (LANG_HOOKS_FUNCTION_DECL_EXPLICIT_P): Define.
26379         (LANG_HOOKS_DECLS): Add LANG_HOOKS_FUNCTION_DECL_EXPLICIT_P.
26381 2009-03-27  Jakub Jelinek  <jakub@redhat.com>
26383         * builtins.c (fold_builtin_memory_op): Optimize memmove
26384         into memcpy if we can prove source and destination don't overlap.
26386         * tree-inline.c: Include gt-tree-inline.h.
26387         (clone_fn_id_num): New variable.
26388         (clone_function_name): New function.
26389         (tree_function_versioning): Use it.
26390         * Makefile.in (GTFILES): Add tree-inline.c.
26392 2009-03-27  Mark Mitchell  <mark@codesourcery.com>
26394         * BASE-VER: Change to 4.5.0.
26396 2009-03-27  Xinliang David Li  <davidxl@google.com>
26398         PR tree-optimization/39557
26399         * tree-ssa.c (warn_uninitialized_vars): free postdom info.
26401 2009-03-27  Xinliang David Li  <davidxl@google.com>
26403         PR tree-optimization/39548
26404         * tree-ssa-copy.c (copy_prop_visit_phi_node): Add copy
26405         candidate check.
26407 2009-03-27  H.J. Lu  <hongjiu.lu@intel.com>
26409         * c-common.c (pointer_int_sum): Use %wd on return from
26410         tree_low_cst.
26412 2009-03-27  H.J. Lu  <hongjiu.lu@intel.com>
26414         * c-common.c (pointer_int_sum): Use HOST_WIDE_INT_PRINT_DEC
26415         on return from tree_low_cst.
26417 2009-03-27  Andrew Pinski  <andrew_pinski@playstation.sony.com>
26419         PR c++/36799
26420         * ginclude/stdarg.h (va_copy): Define also for
26421         __GXX_EXPERIMENTAL_CXX0X__.
26423 2009-03-27  Manuel Lopez-Ibanez  <manu@gcc.gnu.org>
26425         PR c++/35652
26426         * builtins.h (c_strlen): Do not warn here.
26427         * c-typeck.c (build_binary_op): Adjust calls to pointer_int_sum.
26428         * c-common.c (pointer_int_sum): Take an explicit location.
26429         Warn about offsets out of bounds.
26430         * c-common.h (pointer_int_sum): Adjust declaration.
26432 2009-03-26  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
26434         * doc/invoke.texi (i386 and x86-64 Windows Options): Fix texinfo
26435         markup glitch.
26437 2009-03-26  Jakub Jelinek  <jakub@redhat.com>
26439         PR c++/39554
26440         * opts.c (warn_if_disallowed_function_p): Don't assume
26441         get_callee_fndecl must return non-NULL.
26443 2009-03-26  Vladimir Makarov  <vmakarov@redhat.com>
26445         PR rtl-optimization/39522
26446         * reload1.c (reload_as_needed): Invalidate reg_last_reload_reg too
26447         when reg_reloaded_valid is set.
26449 2009-03-26  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
26451         * config/spu/divv2df3.c: New file.
26452         * config/spu/t-spu-elf (LIB2FUNCS_STATIC_EXTRA): Add it.
26453         (DPBIT_FUNCS): Filter out _div_df.
26455 2009-03-26  Bernd Schmidt  <bernd.schmidt@analog.com>
26457         * config/bfin/bfin.c (bfin_optimize_loop): If the LSETUP goes before
26458         a jump insn, count that jump in the distance to the loop start.
26460 2009-03-25  Kaz Kojima  <kkojima@gcc.gnu.org>
26462         PR target/39523
26463         * config/sh/sh.c (calc_live_regs): Fix condition for global
26464         registers except PIC_OFFSET_TABLE_REGNUM.
26466 2009-03-25  Kai Tietz  <kai.tietz@onevision.com>
26468         PR/39518
26469         * doc/invoke.texi (-mconsole): New.
26470         (-mcygwin): New.
26471         (-mno-cygwin): New.
26472         (-mdll): New.
26473         (-mnop-fun-dllimport): New.
26474         (-mthread): New.
26475         (-mwin32): New.
26476         (-mwindows): New.
26477         (sub section "i386 and x86-64 Windows Options"): New.
26479 2009-03-25  Ralf Corsépius  <ralf.corsepius@rtems.org>
26481         * config/arm/rtems-elf.h: Remove LINK_GCC_C_SEQUENCE_SPEC.
26482         * config/rs6000/t-rtems: Remove MULTILIB_EXTRA_OPTS.
26484 2009-03-25  Richard Guenther  <rguenther@suse.de>
26486         PR middle-end/39497
26487         * Makefile.in (dfp.o-warn): Use -fno-strict-aliasing instead
26488         of -Wno-error.
26490 2009-03-25  Andrey Belevantsev  <abel@ispras.ru>
26492         * config/ia64/ia64.c (ia64_set_sched_flags): Zero spec_info->mask when
26493         neither of haifa/selective schedulers are working.
26495 2009-03-25  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
26497         * doc/invoke.texi (Debugging Options): Fix description of
26498         -fno-merge-debug-strings.
26500 2009-03-24  Hans-Peter Nilsson  <hp@axis.com>
26502         * config/cris/libgcc.ver: New version-script.
26503         * config/cris/t-linux (SHLIB_MAPFILES): Use it.
26505         * configure.ac <GAS features, nop mnemonic>: Add pattern
26506         crisv32-*-* for "nop".
26507         <GAS features, Thread-local storage>: Add item for CRIS and CRIS v32.
26508         * configure: Regenerate.
26510 2009-03-24  Ira Rosen  <irar@il.ibm.com>
26512         PR tree-optimization/39529
26513         * tree-vect-transform.c (vect_create_data_ref_ptr): Call
26514         mark_sym_for_renaming for the tag copied to the new vector
26515         pointer.
26517 2009-03-24  Arthur Loiret  <aloiret@debian.org>
26519         * config.host (alpha*-*-linux*): Use driver-alpha.o and alpha/x-alpha.
26520         * config/alpha/linux.h (host_detect_local_cpu): Declare, add to
26521         EXTRA_SPEC_FUNCTIONS.
26522         (MCPU_MTUNE_NATIVE_SPECS, DRIVER_SELF_SPECS): New macros.
26523         * config/alpha/driver-alpha.c, config/alpha/x-alpha: New.
26524         * doc/invoke.texi (DEC Alpha Options): Document 'native' value for
26525         -march and -mtune options.
26527 2009-03-24  Ralf Corsépius  <ralf.corsepius@rtems.org>
26529         * config/m68k/t-rtems: Add m5329 multilib.
26531 2009-03-24  Dodji Seketeli  <dodji@redhat.com>
26532             Jakub Jelinek  <jakub@redhat.com>
26534         PR debug/39524
26535         * dwarf2out.c (gen_variable_die): Avoid adding duplicate declaration
26536         nodes.
26538 2009-03-23  Jakub Jelinek  <jakub@redhat.com>
26540         PR c/39495
26541         * c-parser.c (c_parser_omp_for_loop): Call c_parser_binary_expression
26542         instead of c_parser_expression_conv, if original_code isn't one of the
26543         4 allowed comparison codes, fail.
26545 2009-03-23  Richard Guenther  <rguenther@suse.de>
26547         * cgraph.h (struct cgraph_node): Reorder fields for 64-bit hosts.
26548         * tree.h (struct tree_type): Likewise.
26549         * reload.h (struct insn_chain): Likewise.
26550         * dwarf2out.c (struct dw_loc_descr_struct): Likewise.
26551         * function.h (struct function): Likewise.
26552         * tree-ssa-structalias.c (struct equiv_class_label): Likewise.
26554 2009-03-23  Jakub Jelinek  <jakub@redhat.com>
26556         PR tree-optimization/39516
26557         * lambda-code.c (perfect_nestify): Fix type of the uboundvar variable.
26559 2009-03-23  Bingfeng Mei  <bmei@broadcom.com>
26561         * config.gcc (need_64bit_hwint): Make clear that need_64bit_hwint
26562         should be set true if BITS_PER_WORD of target is bigger than 32
26564 2009-03-22  Hans-Peter Nilsson  <hp@axis.com>
26566         * config/cris/linux.h (CRIS_LINK_SUBTARGET_SPEC):
26567         Translate -B-options to -rpath-link.  Correct existing
26568         rpath-link and conditionalize on !nostdlib.
26570 2009-03-22  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
26572         * doc/extend.texi (Function Attributes, Variable Attributes):
26573         Fix typos.
26574         * doc/invoke.texi (Debugging Options, Optimize Options)
26575         (i386 and x86-64 Options, MCore Options): Likewise.
26577 2009-03-20  Jakub Jelinek  <jakub@redhat.com>
26579         PR debug/37890
26580         * dwarf2out.c (gen_namespace_die): Add context_die argument and use
26581         it for block local namespace aliases.
26582         (gen_decl_die): Pass context_die to gen_namespace_die.
26584 2009-03-19  Jakub Jelinek  <jakub@redhat.com>
26586         PR c/39495
26587         * c-omp.c (c_finish_omp_for): Allow NE_EXPR with TREE_TYPE (decl)'s
26588         minimum or maximum value.
26590 2009-03-19  Alexandre Oliva  <aoliva@redhat.com>
26592         * reginfo.c (globalize_reg): Recompute derived reg sets.
26594 2009-03-19  Ozkan Sezer  <sezeroz@gmail.com>
26596         PR target/39063
26597         * libgcc2.c (mprotect): Do not use signed arguments for
26598         VirtualProtect, use DWORD arguments.  Also fix the 'may
26599         be used uninitialized' warning for the np variable.
26601 2009-03-19  Jakub Jelinek  <jakub@redhat.com>
26603         PR target/39496
26604         * config/i386/i386.c (ix86_function_regparm): Don't optimize local
26605         functions using regparm calling conventions when not optimizing.
26606         (ix86_function_sseregparm): Similarly for sseregparm calling
26607         conventions.
26609 2009-03-19  Li Feng  <nemokingdom@gmail.com>
26611         PR middle-end/39500
26612         * tree-data-ref.c (analyze_subscript_affine_affine): There is no
26613         dependence if the first conflict is after niter iterations.
26615 2009-03-19  Hans-Peter Nilsson  <hp@axis.com>
26617         PR middle-end/38609
26618         * config/cris/cris.h (FRAME_POINTER_REQUIRED): Force for all
26619         functions with dynamic stack-pointer adjustments.
26621 2009-03-19  Ben Elliston  <bje@au.ibm.com>
26623         * doc/invoke.texi (RS/6000 and PowerPC Options): Fix -msdata-data
26624         option; change to -msdata=data.
26626 2009-03-18  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
26628         * c.opt: Unify help texts for -Wdeprecated, -Wsystem-headers,
26629         and -fopenmp.
26631 2009-03-18  Eric Botcazou  <ebotcazou@adacore.com>
26633         PR target/35180
26634         * config/sparc/sparc.md (do_builtin_setjmp_setup): Prettify asm output.
26636 2009-03-18  Sandra Loosemore  <sandra@codesourcery.com>
26638         * doc/invoke.texi (Code Gen Options): Expand discussion of
26639         -fno-common.
26641 2009-03-18  Jakub Jelinek  <jakub@redhat.com>
26643         * dse.c (struct group_info): Reorder fields for 64-bit hosts.
26644         * matrix-reorg.c (struct matrix_info): Likewise.
26645         * tree-ssa-loop-ivopts.c (struct ivopts_data): Likewise.
26646         * rtl.h (struct mem_attrs): Likewise.
26647         * df.h (struct df): Likewise.
26648         * tree-data-ref.h (struct data_dependence_relation): Likewise.
26649         * ira-int.h (struct ira_allocno): Likewise.
26650         * df-scan.c (struct df_collection_rec): Likewise.
26651         * ira.c (struct equivalence): Likewise.
26652         * function.c (struct temp_slot): Likewise.
26653         * cfgloop.h (struct loop): Likewise.
26655         PR debug/39485
26656         * function.c (use_register_for_decl): When not optimizing, disregard
26657         register keyword for variables with types containing methods.
26659 2009-03-18  Sebastian Pop  <sebastian.pop@amd.com>
26661         PR middle-end/39447
26662         * graphite.c (exclude_component_ref): Renamed contains_component_ref_p.
26663         (is_simple_operand): Call contains_component_ref_p before calling data
26664         reference analysis that would fail on COMPONENT_REFs.
26666         * tree-vrp.c (search_for_addr_array): Fix formatting.
26668 2009-03-18  Richard Guenther  <rguenther@suse.de>
26670         * tree-vect-transform.c (vect_loop_versioning): Fold the
26671         generated comparisons.
26672         * tree-vectorizer.c (set_prologue_iterations): Likewise.
26673         (slpeel_tree_peel_loop_to_edge): Likewise.
26675 2009-03-17  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
26677         PR middle-end/37805
26678         * opts.c (print_specific_help): In addition to `undocumented',
26679         accept `separate' and `joined' flags if passed alone.  Describe
26680         output by the first matched one of those.
26681         (common_handle_option): Skip over empty strings.
26682         * gcc.c (display_help): Fix help string for `--help='.
26683         * doc/invoke.texi (Option Summary, Overall Options): With
26684         `--help=', classes and qualifiers can both be repeated, but
26685         only the latter can be negated.  One should not pass only
26686         negated qualifiers.  Fix markup and examples.
26688         Revert
26689         2008-10-14  Jakub Jelinek  <jakub@redhat.com>
26690         PR middle-end/37805
26691         * opts.c (common_handle_option): Don't ICE on -fhelp=joined
26692         and -fhelp=separate.
26694 2009-03-17  Jing Yu  <jingyu@google.com>
26696         PR middle-end/39378
26697         * function.h (struct rtl_data): Move is_thunk from here...
26698         (struct function): ...to here.
26699         * cp/method.c (use_thunk): Change is_thunk from crtl to cfun.
26700         * varasm.c (assemble_start_function): Change is_thunk from crtl to
26701         cfun.
26702         * config/alpha/alpha.c (alpha_sa_mask): Change is_thunk from crtl to
26703         cfun.
26704         (alpha_does_function_need_gp, alpha_start_function): Likewise.
26705         (alpha_output_function_end_prologue): Likewise.
26706         (alpha_end_function, alpha_output_mi_thunk_osf): Likewise.
26707         * config/rs6000/rs6000.c (rs6000_ra_ever_killed): Likewise.
26708         (rs6000_output_function_epilogue): Likewise.
26709         * config/arm/arm.h (ARM_DECLARE_FUNCTION_NAME): Likewise.
26711 2009-03-17  Uros Bizjak  <ubizjak@gmail.com>
26713         PR target/39482
26714         * config/i386/i386.md (*truncdfsf_mixed): Avoid combining registers
26715         from different units in a single alternative.
26716         (*truncdfsf_i387): Ditto.
26717         (*truncxfsf2_mixed): Ditto.
26718         (*truncxfdf2_mixed): Ditto.
26720 2009-03-17  Jakub Jelinek  <jakub@redhat.com>
26722         * dwarf2out.c (dwarf2out_imported_module_or_decl_1): Allow
26723         non-NAMESPACE_DECL IMPORTED_DECL_ASSOCIATED_DECL.
26725         PR debug/39474
26726         * tree-ssa-live.c (remove_unused_locals): Don't remove local
26727         unused non-artificial variables when not optimizing.
26729         PR debug/39471
26730         * dwarf2out.c (dwarf2out_imported_module_or_decl_1): Emit
26731         DW_TAG_imported_module even if decl is IMPORTED_DECL with
26732         NAMESPACE_DECL in its DECL_INITIAL.
26734         PR middle-end/39443
26735         * optabs.c (set_user_assembler_libfunc): New function.
26736         * expr.h (set_user_assembler_libfunc): New prototype.
26737         * c-common.c: Include libfuncs.h.
26738         (set_builtin_user_assembler_name): Call set_user_assembler_libfunc
26739         for memcmp, memset, memcpy, memmove and abort.
26740         * Makefile.in (c-common.o): Depend on libfuncs.h.
26742         PR debug/39412
26743         * dwarf2out.c (gen_inlined_enumeration_type_die,
26744         gen_inlined_structure_type_die, gen_inlined_union_type_die,
26745         gen_tagged_type_instantiation_die): Removed.
26746         (gen_decl_die): For TYPE_DECL_IS_STUB with non-NULL decl_origin
26747         do nothing.
26749 2009-03-17  Janis Johnson  <janis187@us.ibm.com>
26751         PR testsuite/38526
26752         * Makefile.in (site.exp): Rename TEST_GCC_EXEC_PREFIX and comment
26753         its use.
26754         (check-%): Don't set GCC_EXEC_PREFIX when invoking runtest.
26755         (check-parallel-%): Ditto.
26756         (check-consistency): Ditto.
26758 2009-03-17  Kai Tietz  <kai.tietz@onevision.com>
26760         * ipa-struct-reorg.c (create_general_new_stmt): Initialize
26761         local variable rhs by NULL_TREE.
26763 2009-03-17  H.J. Lu  <hongjiu.lu@intel.com>
26765         PR target/39477
26766         * doc/extend.texi: Correct register behavior for regparm on Intel 386.
26768 2009-03-17  H.J. Lu  <hongjiu.lu@intel.com>
26770         PR target/39476
26771         * config/i386/i386.c (ix86_function_regparm): Rewrite for 64bit.
26773 2009-03-17  H.J. Lu  <hongjiu.lu@intel.com>
26775         PR target/39473
26776         * config/i386/i386.c (ix86_expand_call): Check extra clobbers
26777         for ms->sysv ABI calls only in 64bit mode.
26779         * config/i386/i386.md (untyped_call): Support 32bit.
26781 2009-03-16  H.J. Lu  <hongjiu.lu@intel.com>
26783         * doc/extend.texi: Replace x86_65 with x86_64.
26785 2009-03-16  Jakub Jelinek  <jakub@redhat.com>
26787         PR tree-optimization/39455
26788         * tree-ssa-loop-niter.c (number_of_iterations_lt_to_ne): Fix types
26789         mismatches for POINTER_TYPE_P (type).
26790         (number_of_iterations_le): Likewise.
26792 2009-03-16  Hariharan Sandanagobalane  <hariharan@picochip.com>
26794         * config/picochip/picochip.c: Removed profiling support.
26795         * config/picochip/picochip.md: Removed profiling instruction.
26796         * config/picochip/picochip.h: Removed profiling builtin.
26798 2009-03-16  Joseph Myers  <joseph@codesourcery.com>
26800         * doc/install.texi (--with-host-libstdcxx): Document.
26802 2009-03-14  Anatoly Sokolov  <aesok@post.ru>
26804         PR target/34299
26805         * config/avr/avr.c (avr_handle_fndecl_attribute): Move code for
26806         generate a warning if the function name does not begin with
26807         "__vector" and the function has either the 'signal' or 'interrupt'
26808         attribute, from here to ...
26809         (avr_declare_function_name): ...here. New function.
26810         * config/avr/avr.h (ASM_DECLARE_FUNCTION_NAME): Redefine.
26811         * config/avr/avr-protos.h (avr_declare_function_name): Declare.
26813 2009-03-14  Jakub Jelinek  <jakub@redhat.com>
26815         PR bootstrap/39454
26816         * cse.c (fold_rtx): Don't modify original const_arg1 when
26817         canonicalizing SHIFT_COUNT_TRUNCATED shift count, do it on a
26818         separate variable instead.
26819         * rtlanal.c (nonzero_bits1) <case ASHIFTRT>: Don't assume anything
26820         from out of range shift counts.
26821         (num_sign_bit_copies1) <case ASHIFTRT, case ASHIFT>: Similarly.
26823 2009-03-13  Catherine Moore  <clm@codesourcery.com>
26825         * config/i386/x-mingw32 (host-mingw32.o): Replace
26826         diagnostic.h with $(DIAGNOSTIC_H).
26828 2009-03-12  Jakub Jelinek  <jakub@redhat.com>
26830         PR target/39431
26831         * config/i386/predicates.md (cmpxchg8b_pic_memory_operand): New
26832         predicate.
26833         * config/i386/sync.md (sync_compare_and_swap<mode>,
26834         sync_compare_and_swap_cc<mode>): For DImode with -m32 -fpic check
26835         if operands[1] is cmpxchg8b_pic_memory_operand, if not force address
26836         into a register.
26837         (sync_double_compare_and_swapdi_pic,
26838         sync_double_compare_and_swap_ccdi_pic): Require operand 1 to be
26839         cmpxchg8b_pic_memory_operand instead of just memory_operand.
26841 2009-03-12  H.J. Lu  <hongjiu.lu@intel.com>
26843         PR target/39445
26844         * config/i386/i386.c (ix86_expand_push): Don't set memory alignment.
26846 2009-03-12  H.J. Lu  <hongjiu.lu@intel.com>
26848         PR target/39327
26849         * config/i386/sse.md (avx_addsubv8sf3): Correct item bits.
26850         (avx_addsubv4df3): Likewise.
26851         (*avx_addsubv4sf3): Likewise.
26852         (sse3_addsubv4sf3): Likewise.
26854 2009-03-12  H.J. Lu  <hongjiu.lu@intel.com>
26856         PR target/38824
26857         * config/i386/i386.md: Compare REGNO on the new peephole2 patterns.
26859 2009-03-12  Vladimir Makarov  <vmakarov@redhat.com>
26861         PR debug/39432
26862         * ira-int.h (struct allocno): Fix comment for calls_crossed_num.
26863         * ira-conflicts.c (ira_build_conflicts): Prohibit call used
26864         registers for allocnos created from user-defined variables.
26866 2009-03-11  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
26868         PR target/39181
26869         * config/spu/spu.c (spu_expand_mov): Handle invalid subregs
26870         of non-integer mode as well.
26872 2009-03-11  Adam Nemet  <anemet@caviumnetworks.com>
26874         * gimplify.c (gimplify_call_expr): Don't set CALL_CANNOT_INLINE_P
26875         for functions for which the parameter types are unknown.
26877 2009-03-11  Jakub Jelinek  <jakub@redhat.com>
26879         PR target/39137
26880         * cfgexpand.c (get_decl_align_unit): Use LOCAL_DECL_ALIGNMENT macro.
26881         * defaults.h (LOCAL_DECL_ALIGNMENT): Define if not yet defined.
26882         * config/i386/i386.h (LOCAL_DECL_ALIGNMENT): Define.
26883         * config/i386/i386.c (ix86_local_alignment): For
26884         -m32 -mpreferred-stack-boundary=2 use 32-bit alignment for
26885         long long variables on the stack to avoid dynamic realignment.
26886         Allow the first argument to be a decl rather than type.
26887         * doc/tm.texi (LOCAL_DECL_ALIGNMENT): Document.
26889 2009-03-11  Nick Clifton  <nickc@redhat.com>
26891         PR target/5362
26892         * config/mcore/mcore.opt: Remove deprecated m4align and m8align
26893         options.
26894         Add description to mno-lsim option.
26895         * config/mcore/mcore.h: Remove comment about deprecated m4align
26896         option.
26897         (TARGET_DEFAULT): Remove deprecated MASK_M8ALIGN.
26898         * doc/invoke.texi: Add description of mno-lsim and
26899         mstack-increment options.
26901         * config/fr30/fr30.opt: Document the -mno-lsim option.
26902         * doc/invoke.texi: Add descriptions of the FR30's -msmall-model
26903         and -mno-lsim options.
26905 2009-03-11  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
26907         * fold-const.c (fold_comparison): Only call fold_inf_compare
26908         if the mode supports infinities.
26910 2009-03-11  Jason Merrill  <jason@redhat.com>
26912         PR debug/39086
26913         * tree-nrv.c (tree_nrv): Don't do this optimization if the front
26914         end already did.  Notice GIMPLE_CALL modifications of the result.
26915         Don't copy debug information from an ignored decl or a decl from
26916         another function.
26918 2009-03-10  Richard Guenther  <rguenther@suse.de>
26919             Nathan Froyd  <froydnj@codesourcery.com>
26921         PR middle-end/37850
26922         * libgcc2.c (__mulMODE3): Use explicit assignments to form the result.
26923         (__divMODE3): Likewise.
26925 2009-03-09  Jakub Jelinek  <jakub@redhat.com>
26927         PR tree-optimization/39394
26928         * gimplify.c (gimplify_type_sizes): Gimplify DECL_SIZE and
26929         DECL_SIZE_UNIT of variable length FIELD_DECLs.
26931 2009-03-09  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
26933         * recog.c (verfiy_changes): Disallow renaming of hard regs in
26934         inline asms for register asm ("") declarations.
26936 2009-03-09  Eric Botcazou  <ebotcazou@adacore.com>
26938         * fold-const.c (fold_unary): Fix comment.
26940 2009-03-07  Jan Hubicka  <jh@suse.cz>
26942         PR target/39361
26943         * tree-inline.c (setup_one_parameter): Do replacement of const
26944         argument by constant in SSA form.
26946 2009-03-07  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
26948         PR middle-end/38028
26949         * function.c (assign_parm_setup_stack): Use STACK_SLOT_ALIGNMENT to
26950         determine alignment passed to assign_stack_local.
26951         (assign_parms_unsplit_complex): Likewise.
26952         * except.c (sjlj_build_landing_pads): Likewise.
26954 2009-03-06  Jakub Jelinek  <jakub@redhat.com>
26956         PR middle-end/39360
26957         * tree-flow.h (add_referenced_var): Return bool instead of void.
26958         * tree-dfa.c (add_referenced_var): Return result of
26959         referenced_var_check_and_insert call.
26960         * tree-inline.c (expand_call_inline): Call add_referenced_var instead
26961         of referenced_var_check_and_insert.
26963         PR debug/39372
26964         * dwarf2out.c (add_abstract_origin_attribute): Return origin_die.
26965         (gen_variable_die): Emit DW_AT_location on abstract static variable's
26966         DIE, don't emit it if abstract origin already has it.
26967         * tree-cfg.c (remove_useless_stmts_bind): GIMPLE_BINDs with any
26968         BLOCK_NONLOCALIZED_VARS in its gimple_bind_block aren't useless.
26970 2009-03-06  Jan-Benedict Glaw  <jbglaw@lug-owl.de>
26972         * genpreds.c (needs_variable): Fix parentheses at variable name
26973         detection.
26974         (write_tm_constrs_h): Indent generated code.
26976 2009-03-06  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
26978         * doc/extend.texi (Function Attributes): Add documentation
26979         for isr attributes.
26981 2009-03-06  Jakub Jelinek  <jakub@redhat.com>
26983         PR debug/39387
26984         * dwarf2out.c (dwarf2out_imported_module_or_decl_1): For IMPORTED_DECL
26985         take locus from its DECL_SOURCE_LOCATION instead of input_location.
26987 2009-03-05  Bernd Schmidt  <bernd.schmidt@analog.com>
26989         * config/bfin/bfin.c (bfin_discover_loop): When retrying fails, mark
26990         the loop as bad.
26992 2009-03-05  Jakub Jelinek  <jakub@redhat.com>
26994         PR debug/39379
26995         * tree-cfg.c (remove_useless_stmts_bind): Don't remove GIMPLE_BINDs
26996         with blocks containing IMPORTED_DECLs in BLOCK_VARS.
26998 2009-03-05  Uros Bizjak  <ubizjak@gmail.com>
27000         * config/i386/i386.md (R8_REG, R9_REG): New constants.
27001         * config/i386/i386.h (CONDITIONAL_REGISTER_USAGE): Use named
27002         constants instead of magic numbers.
27003         (HARD_REGNO_CALLER_SAVE_MODE): Ditto.
27004         (QI_REG_P): Ditto.
27005         * config/i386/i386.c (x86_64_int_parameter_registers): Ditto.
27006         (x86_64_ms_abi_int_parameter_registers): Ditto.
27007         (x86_64_int_return_registers): Ditto.
27008         (ix86_maybe_switch_abi): Ditto.
27009         (ix86_expand_call): Ditto for clobbered_registers array.
27010         (ix86_hard_regno_mode_ok): Ditto.
27011         (x86_extended_QIreg_mentioned_p): Ditto.
27013 2009-03-05  J"orn Rennecke  <joern.rennecke@arc.com>
27015         PR tree-optimization/39349
27016         * cse.c (cse_insn): Fix loop to stop at VOIDmode.
27018         * combine.c (gen_lowpart_for_combine): Use omode when generating
27019         clobber.
27021 2009-03-04  J"orn Rennecke  <joern.rennecke@arc.com>
27023         PR rtl-optimization/39235
27024         * loop-iv.c (get_simple_loop_desc): Use XCNEW.
27026 2009-03-04  Zdenek Dvorak  <ook@ucw.cz>
27028         * graphite.c (nb_reductions_in_loop): Update simple_iv arguments.
27030 2009-03-04  Richard Guenther  <rguenther@suse.de>
27032         PR tree-optimization/39362
27033         * tree-ssa-sccvn.c (visit_use): Stores and copies from SSA_NAMEs
27034         that occur in abnormal PHIs should be varying.
27036 2009-03-04  Zdenek Dvorak  <ook@ucw.cz>
27038         * tree-scalar-evolution.c (analyze_scalar_evolution_in_loop):
27039         Extend comments.
27040         (simple_iv):  Take loop as an argument instead of statement.
27041         * tree-scalar-evolution.h (simple_iv): Declaration changed.
27042         * tree-ssa-loop-niter.c (number_of_iterations_exit): Update calls
27043         to simple_iv.
27044         * tree-ssa-loop-ivopts.c (determine_biv_step, find_givs_in_stmt_scev):
27045         Ditto.
27046         * tree-parloops.c (loop_parallel_p, canonicalize_loop_ivs): Ditto.
27047         * matrix-reorg.c (analyze_transpose): Ditto.
27048         * tree-data-ref.c (dr_analyze_innermost): Ditto.
27049         * tree-vect-analyze.c (vect_analyze_data_refs): Ditto.
27050         * tree-predcom.c (ref_at_iteration): Ditto.
27051         * tree-ssa-loop-prefetch.c (idx_analyze_ref): Ditto.
27053 2009-03-04  Richard Guenther  <rguenther@suse.de>
27055         PR tree-optimization/39358
27056         * tree-ssa-structalias.c (do_sd_constraint): Fix check for
27057         escaped_id and callused_id.
27058         (solve_graph): Likewise.
27060 2009-03-04  Richard Guenther  <rguenther@suse.de>
27062         PR tree-optimization/39339
27063         * tree-sra.c (try_instantiate_multiple_fields): Make it
27064         no longer ICE on the above.
27066 2009-03-03  Joseph Myers  <joseph@codesourcery.com>
27068         * emit-rtl.c (adjust_address_1): Reduce offset to a signed value
27069         that fits within Pmode.
27071 2009-03-03  Steve Ellcey  <sje@cup.hp.com>
27073         PR middle-end/10109
27074         * tm.texi (LIBCALL_VALUE): Update description.
27076 2009-03-03  Steve Ellcey  <sje@cup.hp.com>
27078         PR middle-end/34443
27079         * doc/extend.texi (section): Update description.
27081 2009-03-03  H.J. Lu  <hongjiu.lu@intel.com>
27083         PR middle-end/39345
27084         * tree-inline.c (remapped_type): New.
27085         (can_be_nonlocal): Call remapped_type instead of remap_type.
27087 2009-03-03  Jakub Jelinek  <jakub@redhat.com>
27089         PR fortran/39354
27090         * gimplify.c (goa_stabilize_expr): Handle tcc_comparison,
27091         TRUTH_ANDIF_EXPR and TRUTH_ORIF_EXPR.
27093 2009-03-03  Richard Guenther  <rguenther@suse.de>
27095         PR middle-end/39272
27096         * tree.c (tree_nonartificial_location): New function.
27097         * tree.h (tree_nonartificial_location): Declare.
27098         * builtins.c (expand_builtin_memory_chk): Provide location
27099         of the call location for artificial function pieces.
27100         (maybe_emit_chk_warning): Likewise.
27101         (maybe_emit_sprintf_chk_warning): Likewise.
27102         (maybe_emit_free_warning): Likewise.
27103         * expr.c (expand_expr_real_1): Likewise.
27105 2009-03-03  Jakub Jelinek  <jakub@redhat.com>
27107         PR tree-optimization/39343
27108         * tree-ssa-ccp.c (maybe_fold_offset_to_address): Don't check if
27109         COMPONENT_REF t has ARRAY_TYPE.
27111 2009-03-02  Sebastian Pop  <sebastian.pop@amd.com>
27113         PR middle-end/39335
27114         * tree-parloops.c (canonicalize_loop_ivs): Call fold_convert
27115         when the type precision of the induction variable should be
27116         larger than the type precision of nit.
27117         (gen_parallel_loop): Update use of canonicalize_loop_ivs.
27118         * graphite.c (graphite_loop_normal_form): Same.
27119         * tree-flow.h (canonicalize_loop_ivs): Update declaration.
27121 2009-03-02  Uros Bizjak  <ubizjak@gmail.com>
27123         * config/i386/i386.md (ST?_REG, MM?_REG): New constants.
27124         (*call_1_rex64_ms_sysv): Use named constants instead of magic
27125         numbers to describe clobbered registers.
27126         (*call_value_0_rex64_ms_sysv): Ditto.
27127         * config/i386/mmx.md (mmx_emms): Ditto.
27128         (mmx_femms): Ditto.
27130 2009-03-02  Richard Sandiford  <rdsandiford@googlemail.com>
27132         * config/mips/mips.c (mips_mdebug_abi_name): Fix the handling
27133         of ABI_64.
27135 2009-03-02  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
27137         * config/spu/spu.c (TARGET_SECTION_TYPE_FLAGS): Define.
27138         (spu_section_type_flags): New function.
27140 2009-03-02  Uros Bizjak  <ubizjak@gmail.com>
27142         * config/i386/i386.h (CONDITIONAL_REGISTER_USAGE): Do not copy
27143         reg_class_contents of FLOAT_REGS into a temporary.
27145 2009-03-02  Richard Guenther  <rguenther@suse.de>
27146             Ira Rosen  <irar@il.ibm.com>
27148         PR tree-optimization/39318
27149         * tree-vect-transform.c (vectorizable_call): Transfer the EH region
27150         information to the vectorized statement.
27152 2009-03-01  Uros Bizjak  <ubizjak@gmail.com>
27154         * config/i386/i386.h (CONDITIONAL_REGISTER_USAGE): Do not shadow "i"
27155         variable.  Use defined names instead of magic constants for REX SSE
27156         registers.
27158 2009-03-01  Richard Guenther  <rguenther@suse.de>
27160         PR tree-optimization/39331
27161         * omp-low.c (lower_send_shared_vars): Do not receive new
27162         values for the reference of DECL_BY_REFERENCE parms or results.
27164 2009-03-01  Jan Hubicka  <jh@suse.cz>
27166         PR debug/39267
27167         * tree.h (BLOCK_NONLOCALIZED_VARS, BLOCK_NUM_NONLOCALIZED_VARS,
27168         BLOCK_NONLOCALIZED_VAR): New macros.
27169         (tree_block): Add nonlocalized_vars.
27170         * dwarf2out.c (gen_formal_parameter_die, gen_variable_die,
27171         gen_decl_die): Add origin argument.  Allow generation of die with
27172         origin at hand only.
27173         (gen_member_die, gen_type_die_with_usage, force_decl_die,
27174         declare_in_namespace, gen_namescpace_die, dwarf2out_decl): Update use
27175         of gen_*.
27176         (gen_block_die): Fix checking for unused blocks.
27177         (process_scope_var): Break out from .... ; work with origins only.
27178         (decls_for_scope) ... here; process nonlocalized list.
27179         (dwarf2out_ignore_block): Look for nonlocalized vars.
27180         * tree-ssa-live.c (remove_unused_scope_block_p): Look for nonlocalized
27181         vars.
27182         (dump_scope_block): Dump them.
27183         * tree-inline.c (remap_decls): Handle nonlocalized vars.
27184         (remap_block): Likewise.
27185         (can_be_nonlocal): New predicate.
27186         (copy_bind_expr, copy_gimple_bind): Update use of remap_block.
27188 2009-03-01  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
27190         * configure: Regenerate.
27192 2009-03-01  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
27194         * optc-gen.awk: No need to duplicate option flags twice.
27195         Reuse help texts for duplicate options which do not have any.
27197         * gcc.c (display_help): Document --version.
27199         * gcc.c (main): If print_help_list and verbose_flag, ensure
27200         driver output comes before subprocess output.
27202         * optc-gen.awk: Assign all remaining fields to help string,
27203         space-separated, for multi-line help in *.opt.
27205         * doc/invoke.texi (Warning Options): -Wsync-nand is C/C++ only.
27206         -Wno-pedantic-ms-format is for MinGW targets only.
27208         * doc/options.texi (Option file format): Fix bad indentation,
27209         restoring dropped sentence.
27211 2009-02-28  Jan Hubicka  <jh@suse.cz>
27213         * tree-inline.c (tree_function_versioning): Output debug info.
27215 2009-02-28  Jan Hubicka  <jh@suse.cz>
27217         PR debug/39267
27218         * tree-inline.c (setup_one_parameter): Do not copy propagate
27219         arguments when not optimizing.
27221 2009-02-28  H.J. Lu  <hongjiu.lu@intel.com>
27223         PR target/39327
27224         * config/i386/sse.md (avx_addsubv8sf3): Correct item bits.
27225         (avx_addsubv4df3): Likewise.
27226         (*avx_addsubv4sf3): Likewise.
27227         (sse3_addsubv4sf3): Likewise.
27228         (*avx_addsubv2df3): Likewise.
27229         (sse3_addsubv2df3): Likewise.
27230         (avx_unpckhps256): Correct item selectors.
27231         (avx_unpcklps256): Likewise.
27232         (avx_unpckhpd256): Likewise.
27233         (avx_unpcklpd256): Likewise.
27235 2009-02-28  Jan Hubicka  <jh@suse.cz>
27237         * tree-inline.c (expand_call_inline): Avoid duplicate declarations of
27238         static vars.
27239         (copy_arguments_for_versioning): If var is declared don't declare it.
27240         (tree_function_versioning): First setup substitutions and then copy
27241         args.
27243 2009-02-27  Jan Hubicka  <jh@suse.cz>
27245         PR debug/39267
27246         * cgraph.h (varpool_output_debug_info): Remove.
27247         * cgraphunit.c (varpool_output_debug_info): Remove.
27248         * dwarf2out.c (deferred_locations_struct): New struct
27249         (deferred_locations): New type.
27250         (deferred_locations_list): New static var.
27251         (deffer_location): New function.
27252         (gen_variable_die): Use it.
27253         (decls_for_scope): Output info on local static vars.
27254         (dwarf2out_finish): Process deferred locations.
27255         * varpool.c (varpool_output_debug_info): Remove.
27257 2009-02-27  Jan Hubicka  <jh@suse.cz>
27259         PR debug/39267
27260         * tree.h (TREE_PROTECTED): Fix comment.
27261         (BLOCK_HANDLER_BLOCK): Remove.
27262         (struct tree_block): Remove handler_block add body_block.
27263         (inlined_function_outer_scope_p): New.
27264         (is_body_block): Remove.
27265         * dbxout.c (dbxout_block): Remove BLOCK_HANDLER_BLOCK.
27266         * dwarf2out.c (is_inlined_entry_point): Remove.
27267         (add_high_low_attributes): Use inlined_function_outer_scope_p.
27268         (gen_block_die): Use is_inlined_entry_point check.  Remove body block
27269         code.
27270         * langhooks.h (struct lang_hooks): Remove no_bodu_blocks.
27271         * gimplify.c (gimplify_expr): Gimplify body blocks.
27272         * tree-ssa-live.c (remove_unused_scope_block_p): Allow removing wrapper
27273         block with multiple subblocks.
27274         (dump_scope_block): Prettier output; dump more flags and info.
27275         (dump_scope_blocks): New.
27276         (remove_unused_locals): Use dump_scope_blocks.
27277         * tree-flow.h (dump_scope_blocks): Declare.
27278         * tree-cfg.c (execute_build_cfg): Dump scope blocks.
27279         * stmt.c (is_body_block): Remove.
27280         * tree-inline.c (remap_block): Copy BODY_BLOCK info.
27281         * langhooks-def.h (LANG_HOOKS_NO_BODY_BLOCKS): Remove.
27283 2009-02-27  Sebastian Pop  <sebastian.pop@amd.com>
27285         PR middle-end/39308
27286         * graphite.c (graphite_loop_normal_form): Do not call
27287         number_of_iterations_exit from a gcc_assert.
27289 2009-02-27  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
27291         * config/s390/s390.c (s390_swap_cmp): Look for conditional
27292         jumps if COND is NULL.
27293         (find_cond_jump): New function.
27294         (s390_z10_optimize_cmp): Handling for reg-reg compares added.
27295         * config/s390/s390.md: Remove z10_cobra attribute value.
27297 2009-02-26  Uros Bizjak  <ubizjak@gmail.com>
27299         * config/alpha/alpha.h (alpha_expand_mov): Return false if
27300         force_const_mem returns NULL_RTX.
27302 2009-02-26  Jan Hubicka  <jh@suse.cz>
27304         PR debug/39267
27305         * cgraph.h (varpool_output_debug_info): Remove.
27306         * cgraphunit.c (varpool_output_debug_info): Remove.
27307         * dwarf2out.c (deferred_locations_struct): New struct
27308         (deferred_locations): New type.
27309         (deferred_locations_list): New static var.
27310         (deffer_location): New function.
27311         (gen_variable_die): Use it.
27312         (decls_for_scope): Output info on local static vars.
27313         (dwarf2out_finish): Process deferred locations.
27314         * varpool.c (varpool_output_debug_info): Remove.
27316 2009-02-25  H.J. Lu  <hongjiu.lu@intel.com>
27318         PR rtl-optimization/39241
27319         * jump.c (rtx_renumbered_equal_p): Remove 2 superfluous calls
27320         to subreg_offset_representable_p.
27322 2009-02-25  Paolo Bonzini  <bonzini@gnu.org>
27324         * regmove.c (regmove_optimize): Conform to struct rtl_opt_pass
27325         execute function prototype.  Get f and nregs from max_reg_num
27326         and get_insns.  Remove the first backward pass as it's dead,
27327         guard the forward pass by flag_expensive_optimizations.
27328         (rest_of_handle_regmove): Delete.
27329         (pass_regmove): Replace it with regmove_optimize.
27331 2009-02-25  Martin Jambor  <mjambor@suse.cz>
27333         PR tree-optimization/39259
27334         * tree-inline.c (initialize_cfun): Remove asserts for calls_setjmp and
27335         calls_alloca function flags.
27336         (copy_bb): Set calls_setjmp and alls_alloca function flags if such
27337         calls are detected.
27339 2009-02-25  Paolo Bonzini  <bonzini@gnu.org>
27341         * regmove.c (discover_flags_reg, flags_set_1, mark_flags_life_zones,
27342         flags_set_1_rtx, flags_set_1_set): Delete.
27343         (regmove_optimize): Do not call mark_flags_life_zones.
27345 2009-02-24  Julian Brown  <julian@codesourcery.com>
27347         PR target/35965
27348         * config/arm/arm.c (require_pic_register): Only set
27349         cfun->machine->pic_reg once per function.
27351 2009-02-24  Sandra Loosemore  <sandra@codesourcery.com>
27353         * doc/invoke.texi (Link Options): Document an easier way to pass
27354         options that take arguments to the GNU linker using -Xlinker and -Wl.
27356 2009-02-24  Steve Ellcey  <sje@cup.hp.com>
27358         PR target/33785
27359         * doc/tm.texi (TARGET_C99_FUNCTIONS): Fix description.
27361 2009-02-24  Richard Guenther  <rguenther@suse.de>
27363         PR debug/39285
27364         * dwarf2out.c (gen_enumeration_type_die): Handle CONST_DECLs.
27366 2009-02-24  Richard Guenther  <rguenther@suse.de>
27367             Zdenek Dvorak  <ook@ucw.cz>
27369         PR tree-optimization/39233
27370         * tree-ssa-loop-ivopts.c (add_candidate_1): Do not except pointers
27371         from converting them to a generic type.
27373 2009-02-23  Sebastian Pop  <sebastian.pop@amd.com>
27375         PR tree-optimization/39260
27376         * graphite.c (harmful_stmt_in_bb): Stop a SCoP when the basic block
27377         contains a condition with a real type.
27378         (build_scop_conditions_1): Conditions are always last_stmt of a bb.
27380 2009-02-23  Jason Merrill  <jason@redhat.com>
27382         PR c++/38880
27383         * varasm.c (initializer_constant_valid_p) [PLUS_EXPR]: Check
27384         narrowing_initializer_constant_valid_p.
27385         (narrowing_initializer_constant_valid_p): Don't return
27386         null_pointer_node for adding a pointer to itself.
27388 2009-02-23  Jan Hubicka  <jh@suse.cz>
27390         PR c/12245
27391         * ggc.h (htab_create_ggc): Use ggc_free to free hashtable when
27392         resizing.
27394 2009-02-23  Jan Hubicka  <jh@suse.cz>
27396         PR tree-optimization/37709
27397         * tree.c (block_ultimate_origin): Move here from dwarf2out.
27398         * tree.h (block_ultimate_origin): Declare.
27399         * dwarf2out.c (block_ultimate_origin): Move to tree.c
27400         * tree-ssa-live.c (remove_unused_scope_block_p):
27401         Eliminate blocks containig no instructions nor live variables nor
27402         nested blocks.
27403         (dump_scope_block): New function.
27404         (remove_unused_locals): Enable removal of dead blocks by default;
27405         enable dumping at TDF_DETAILS.
27407 2009-02-21  H.J. Lu  <hongjiu.lu@intel.com>
27409         * config/i386/i386.c (classify_argument): Don't allow COImode
27410         and OImode.
27411         (function_arg_advance_32): Don't allow OImode.
27412         (function_arg_32): Likewise.
27413         (function_value_32): Likewise.
27414         (return_in_memory_32): Likewise.
27415         (function_arg_64): Remove OImode comment.
27417 2009-02-21  H.J. Lu  <hongjiu.lu@intel.com>
27419         PR target/39261
27420         * config/i386/i386.c (ix86_expand_vector_init_one_nonzero): Use
27421         ix86_expand_vector_set for V4DImode in 64bit mode only.
27422         (ix86_expand_vector_init_one_var): Likewise.
27424 2009-02-21  Sebastian Pop  <sebastian.pop@amd.com>
27426         * graphite.c (graphite_trans_loop_block): Adjust tile size to 51.
27428 2009-02-21  Richard Sandiford  <rdsandiford@googlemail.com>
27430         PR bootstrap/39257
27431         * loop-iv.c: Revert last change.
27432         * emit-rtl.c: Likewise.
27434 2009-02-21  H.J. Lu  <hongjiu.lu@intel.com>
27436         PR target/39256
27437         * config/i386/i386.c (type_natural_mode): Remove an extra
27438         space in the warning message.
27439         (function_value_32): Handle 32-byte vector modes.
27440         (return_in_memory_32): Likewise.
27442 2009-02-21  Richard Sandiford  <rdsandiford@googlemail.com>
27444         * loop-iv.c (truncate_value): New function.
27445         (iv_subreg, get_iv_value, iv_number_of_iterations): Use it instead
27446         of lowpart_subreg.
27447         (lowpart_subreg): Move to...
27448         * emit-rtl.c: ...here.
27450 2009-02-21  Danny Smith  <dannysmith@users.sourceforge.net>
27452         * config/i386/winnt.c (i386_pe_asm_output_aligned_decl_common): Revert
27453         accidental and undocumented change at revision 140860.
27455 2009-02-21  Joseph Myers  <joseph@codesourcery.com>
27457         * config/arm/arm.c (arm_gimplify_va_arg_expr): Update prototype to
27458         take gimple_seq * arguments.
27459         (arm_mangle_type): Use CONST_CAST_TREE on type argument passed to
27460         types_compatible_p langhook.
27462 2009-02-20  Mark Mitchell  <mark@codesourcery.com>
27463             Joseph Myers  <joseph@codesourcery.com>
27465         * config/arm/arm.c (arm_builtin_va_list): New function.
27466         (arm_expand_builtin_va_start): Likewise.
27467         (arm_gimplify_va_arg_expr): Likewise.
27468         (TARGET_BUILD_BUILTIN_VA_LIST): Define.
27469         (TARGET_BUILD_BUILTIN_VA_START): Likewise.
27470         (TARGET_BUILD_BUILTIN_VA_ARG_EXPR): Likewise.
27471         (va_list_type): New variable.
27472         (arm_mangle_type): Mangle va_list_type appropriately.
27474 2009-02-20  Jakub Jelinek  <jakub@redhat.com>
27476         PR middle-end/39157
27477         * Makefile.in (loop-invariant.o): Depend on $(PARAMS_H).
27478         * params.h (LOOP_INVARIANT_MAX_BBS_IN_LOOP): Define.
27479         * params.def (loop-invariant-max-bbs-in-loop): New parameter.
27480         * opts.c (decode_options): Set loop-invariant-max-bbs-in-loop
27481         parameter to 1000 for -O1 by default.
27482         * doc/invoke.texi (loop-invariant-max-bbs-in-loop): Document new
27483         parameter.
27484         * loop-invariant.c: Include params.h.
27485         (move_loop_invariants): Don't call move_single_loop_invariants on
27486         very large loops.
27488 2009-02-20  Jaka Mocnik  <jaka@xlab.si>
27490         * calls.c (emit_library_call_value_1): Use slot_offset instead of
27491         offset when calculating bounds for indexing stack_usage_map.  Fixes
27492         a buffer overflow with certain target setups.
27494 2009-02-20  Jakub Jelinek  <jakub@redhat.com>
27496         PR target/39240
27497         * calls.c (expand_call): Clear try_tail_call if caller and callee
27498         disagree in promotion of function return value.
27500 2009-02-19  Jakub Jelinek  <jakub@redhat.com>
27502         PR target/39175
27503         * c-common.c (c_determine_visibility): If visibility changed and
27504         DECL_RTL has been already set, call make_decl_rtl to update symbol
27505         flags.
27507 2009-02-19  H.J. Lu  <hongjiu.lu@intel.com>
27509         PR c++/39188
27510         * varasm.c (assemble_variable): Don't check DECL_NAME when
27511         globalizing a variable.
27513 2009-02-19  Joseph Myers  <joseph@codesourcery.com>
27515         PR c/38483
27516         * builtins.c (gimplify_va_arg_expr): Evaluate the va_list
27517         expression before any __builtin_trap call.
27518         * c-typeck.c (build_function_call): Convert and check function
27519         arguments before generating a call to a trap.  Evaluate the
27520         function arguments before the trap.
27522 2009-02-19  Uros Bizjak  <ubizjak@gmail.com>
27524         PR target/39228
27525         * config/i386/i386.md (isinfxf2): Split from isinf<mode>2.
27526         (UNSPEC_FXAM_MEM): New unspec.
27527         (fxam<mode>2_i387_with_temp): New insn and split pattern.
27528         (isinf<mode>2): Use MODEF mode iterator.  Force operand[1] through
27529         memory using fxam<mode>2_i387_with_temp to remove excess precision.
27531 2009-02-19  Richard Guenther  <rguenther@suse.de>
27533         PR tree-optimization/39207
27534         PR tree-optimization/39074
27535         * tree-ssa-structalias.c (storedanything_id, var_storedanything,
27536         storedanything_tree): New.
27537         (do_ds_constraint): Simplify ANYTHING shortcutting.  Update
27538         the STOREDANYTHING solution if the lhs solution contains ANYTHING.
27539         (build_succ_graph): Add edges from STOREDANYTHING to all
27540         non-direct nodes.
27541         (init_base_vars): Initialize STOREDANYTHING.
27542         (compute_points_to_sets): Free substitution info after
27543         building the succ graph.
27544         (ipa_pta_execute): Likewise.
27546         * tree-ssa-structalias.c (struct variable_info): Add may_have_pointers
27547         field.
27548         (do_ds_constraint): Do not add to special var or non-pointer
27549         field solutions.
27550         (type_could_have_pointers): Split out from ...
27551         (could_have_pointers): ... here.  For arrays use the element type.
27552         (create_variable_info_for): Initialize may_have_pointers.
27553         (new_var_info): Likewise.
27554         (handle_lhs_call): Make the HEAP variable unknown-sized.
27555         (intra_create_variable_infos): Use a type with pointers for
27556         PARM_NOALIAS, make it unknown-sized.
27558 2009-02-18  H.J. Lu  <hongjiu.lu@intel.com>
27560         PR target/39224
27561         * config/i386/i386.c (ix86_return_in_memory): Properly check ABI.
27563 2009-02-18  Jason Merrill  <jason@redhat.com>
27565         PR target/39179
27566         * tree-ssa-ccp.c (get_symbol_constant_value): Don't assume zero
27567         value if DECL_EXTERNAL.
27568         * tree-sra.c (sra_walk_gimple_assign): Likewise.
27569         * target.h (gcc_target::binds_local_p): Clarify "module".
27570         * tree.h (TREE_PUBLIC): Clarify "module".
27572 2009-02-17  Xuepeng Guo  <xuepeng.guo@intel.com>
27574         PR target/38891
27575         * config/i386/i386.h (CONDITIONAL_REGISTER_USAGE): Move the hunk of
27576         initialization for MS_ABI prior to the hunk of !TARGET_MMX.
27578 2009-02-17  H.J. Lu  <hongjiu.lu@intel.com>
27580         PR target/39082
27581         * c.opt (Wabi): Support C and ObjC.
27582         (Wpsabi): New.
27584         * c-opts.c (c_common_handle_option): Handle OPT_Wabi.
27586         * config/i386/i386.c (classify_argument): Warn once about the ABI
27587         change when passing union with long double.
27589         * doc/invoke.texi: Update -Wabi for warning psABI changes.
27591 2009-02-18  Joseph Myers  <joseph@codesourcery.com>
27593         PR c/35447
27594         * c-parser.c (c_parser_compound_statement): Always enter and leave
27595         a scope.
27597 2009-02-17  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
27599         PR target/34587
27600         * config/darwin.h (SUPPORTS_INIT_PRIORITY): Define.
27602 2009-02-18  Jakub Jelinek  <jakub@redhat.com>
27604         PR tree-optimization/36922
27605         * tree-data-ref.c (initialize_matrix_A): Handle BIT_NOT_EXPR.
27606         * tree-scalar-evolution.c (interpret_rhs_expr, instantiate_scev_1):
27607         Likewise.
27609 2009-02-17  Richard Sandiford  <rdsandiford@googlemail.com>
27611         * config/mips/mips.c (mips_override_options): Set flag_dwarf2_cfi_asm
27612         to 0 for EABI64.
27614 2009-02-17  Richard Sandiford  <rdsandiford@googlemail.com>
27616         * config/mips/mips.md (type): Reclassify lui_movf as "unknown".
27618 2009-02-17  Richard Sandiford  <rdsandiford@googlemail.com>
27620         * config/mips/mips.c (mips_gimplify_va_arg_expr): Fix invalid
27621         tree sharing.
27623 2009-02-17  Ruan Beihong  <ruanbeihong@gmail.com>
27624             Richard Sandiford  <rdsandiford@googlemail.com>
27626         * config/mips/mips.c (CODE_FOR_loongson_biadd): Delete.
27627         * config/mips/loongson.md (reduc_uplus_<mode>): Rename to...
27628         (loongson_biadd): ...this.
27630 2009-02-17  Richard Guenther  <rguenther@suse.de>
27632         PR tree-optimization/39202
27633         * tree-ssa-structalias.c (do_structure_copy): Before collapsing
27634         a var make sure to follow existing collapses.
27636 2009-02-17  Richard Guenther  <rguenther@suse.de>
27638         PR middle-end/39214
27639         * langhooks.c (lhd_print_error_function): Check for NULL block.
27641 2009-02-17  Richard Guenther  <rguenther@suse.de>
27643         PR tree-optimization/39204
27644         * tree-ssa-pre.c (phi_translate_1): Lookup the value-number
27645         of the PHI arg.
27647 2009-02-17  Uros Bizjak  <ubizjak@gmail.com>
27649         * config/soft-fp/double.h: Update from glibc CVS.
27651 2009-02-17  Richard Guenther  <rguenther@suse.de>
27653         PR tree-optimization/39207
27654         * tree-ssa-structalias.c (find_what_p_points_to): Do not emit
27655         strict-aliasing warnings for pointers pointing to NULL.
27657 2009-02-16  Joseph Myers  <joseph@codesourcery.com>
27659         PR c/35446
27660         * c-parser.c (c_parser_braced_init): Call pop_init_level when
27661         skipping until next close brace.
27663 2009-02-16  H.J. Lu  <hongjiu.lu@intel.com>
27665         PR target/37049
27666         * config/i386/i386.c (ix86_expand_push): Set memory alignment
27667         to function argument boundary.
27669 2009-02-16  Hariharan Sandanagobalane  <hariharan@picochip.com>
27671         * config/picochip/picochip.md (lea_add): Allow any nonimmediate
27672         in the lea_add. Reload eventually constraints it properly.
27673         * config/picochip/constraints.md: Remove the target constraint
27674         "b", since it is not needed anymore.
27676 2009-02-16  Jakub Jelinek  <jakub@redhat.com>
27678         * gthr-dce.h: Uglify function parameter and local variable names.
27679         * gthr-gnat.h: Likewise.
27680         * gthr-mipssde.h: Likewise.
27681         * gthr-nks.h: Likewise.
27682         * gthr-posix95.h: Likewise.
27683         * gthr-posix.h: Likewise.
27684         * gthr-rtems.h: Likewise.
27685         * gthr-single.h: Likewise.
27686         * gthr-solaris.h: Likewise.
27687         * gthr-tpf.h: Likewise.
27688         * gthr-vxworks.h: Likewise.
27689         * gthr-win32.h: Likewise.
27691 2009-02-15  H.J. Lu  <hongjiu.lu@intel.com>
27693         PR target/39196
27694         * config/i386/i386.md: Restrict the new peephole2 to move
27695         between MMX/SSE registers.
27697 2009-02-15  Richard Guenther  <rguenther@suse.de>
27699         Revert
27700         2009-02-13  Richard Guenther  <rguenther@suse.de>
27702         * configure.ac: Enable LFS.
27703         * configure: Re-generate.
27704         * config.in: Likewise.
27706 2009-02-13  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
27708         * config/spu/spu_internals.h (spu_sr, spu_sra, spu_srqw,
27709         spu_srqwbyte, spu_srqwbytebc): Define.
27710         * config/spu/spu-builtins.def (spu_sr, spu_sra, spu_srqw,
27711         spu_srqwbyte, spu_srqwbytebc): New overloaded builtins.
27712         * config/spu/spu.md ("shrqbybi_<mode>", "shrqbi_<mode>",
27713         "shrqby_<mode>"): New insn-and-split patterns.
27714         * config/spu/spu.c (expand_builtin_args): Determine and return
27715         number of operands using spu_builtin_description data.
27716         (spu_expand_builtin_1): Use it.
27718 2009-02-13  Steve Ellcey  <sje@cup.hp.com>
27720         PR target/38056
27721         * config/ia64/ia64.c (ia64_function_ok_for_sibcall): Check
27722         TARGET_CONST_GP.
27724 2009-02-13  H.J. Lu  <hongjiu.lu@intel.com>
27726         PR target/39149
27727         * config/i386/i386.c (override_options): Correct warning
27728         messages for -malign-loops, -malign-jumps and -malign-functions.
27730 2009-02-13  H.J. Lu  <hongjiu.lu@intel.com>
27732         PR target/39152
27733         * config/i386/i386.md: Restrict the new peephole2 to move
27734         between the general purpose registers.
27736 2009-02-13  H.J. Lu  <hongjiu.lu@intel.com>
27738         PR target/39162
27739         * config/i386/i386.c (type_natural_mode): Add a new argument.
27740         Return the original mode and warn ABI change if vector size is 32byte.
27741         (function_arg_advance): Updated.
27742         (function_arg): Likewise.
27743         (ix86_function_value): Likewise.
27744         (ix86_return_in_memory): Likewise.
27745         (ix86_sol10_return_in_memory): Likewise.
27746         (ix86_gimplify_va_arg): Likewise.
27747         (function_arg_32): Don't warn ABX ABI change here.
27748         (function_arg_64): Likewise.
27750 2009-02-13  Bernd Schmidt  <bernd.schmidt@analog.com>
27752         * loop-iv.c (implies_p): In the final case, test that operands 0
27753         of the two comparisons match.
27755         * config/bfin/bfin.c (find_prev_insn_start): New function.
27756         (bfin_optimize_loop): Use it in some cases instead of PREV_INSN.
27757         (find_next_insn_start): Move.
27759 2009-02-13  Richard Guenther  <rguenther@suse.de>
27761         * configure.ac: Enable LFS.
27762         * configure: Re-generate.
27763         * config.in: Likewise.
27765 2009-02-13  Joseph Myers  <joseph@codesourcery.com>
27767         PR c/35444
27768         * c-parser.c (c_parser_parms_list_declarator): Discard pending
27769         sizes on syntax error after some arguments have been parsed.
27771 2009-02-12  Jakub Jelinek  <jakub@redhat.com>
27773         * doc/invoke.texi (-fira): Remove.
27775 2009-02-12  H.J. Lu  <hongjiu.lu@intel.com>
27777         * caller-save.c: Replace regclass.c with reginfo.c in comments.
27778         * recog.c: Likewise.
27779         * rtl.h: Likewise.
27781 2009-02-12  Uros Bizjak  <ubizjak@gmail.com>
27783         * longlong.h (sub_ddmmss): New for ia64. Ported from GMP 4.2.
27784         (umul_ppmm): Likewise.
27785         (count_leading_zeros): Likewise.
27786         (count_trailing_zeros): Likewise.
27787         (UMUL_TIME): Likewise.
27789 2009-02-12  H.J. Lu  <hongjiu.lu@intel.com>
27791         * config.gcc (ia64*-*-linux*): Add ia64/t-fprules-softfp and
27792         soft-fp/t-softfp to tmake_file.
27794         * config/ia64/ia64.c (ia64_soft_fp_init_libfuncs): New.
27795         (ia64_expand_compare): Use HPUX library for TFmode only for HPUX.
27796         (ia64_builtins) [IA64_BUILTIN_COPYSIGNQ, IA64_BUILTIN_FABSQ,
27797         IA64_BUILTIN_INFQ]: New.
27798         (ia64_init_builtins): Initialize __builtin_infq,
27799         __builtin_fabsq and __builtin_copysignq if not HPUX.
27800         (ia64_expand_builtin): Handle IA64_BUILTIN_COPYSIGNQ,
27801         IA64_BUILTIN_FABSQ and IA64_BUILTIN_INFQ.
27803         * config/ia64/lib1funcs.asm (__divtf3): Define only if
27804         SHARED is defined.
27805         (__fixtfti): Likewise.
27806         (__fixunstfti): Likewise.
27807         (__floattitf): Likewise.
27809         * config/ia64/libgcc-glibc.ver: New.
27810         * config/ia64/t-fprules-softfp: Likewise.
27811         * config/ia64/sfp-machine.h: Likewise.
27813         * config/ia64/linux.h (LIBGCC2_HAS_TF_MODE): New.
27814         (LIBGCC2_TF_CEXT): Likewise.
27815         (TF_SIZE): Likewise.
27816         (TARGET_INIT_LIBFUNCS): Likewise.
27818         * config/ia64/t-glibc (SHLINB_MAPFILES):
27819         Add $(srcdir)/config/ia64/libgcc-glibc.ver.
27821 2009-02-12  H.J. Lu  <hongjiu.lu@intel.com>
27823         * config/i386/i386.c (construct_container): Rewrite processing
27824         BLKmode with X86_64_SSE_CLASS.
27826 2009-02-12  Paolo Bonzini  <bonzini@gnu.org>
27828         PR target/39152
27829         * config/i386/i386.md: Replace simplify_replace_rtx with
27830         replace_rtx in the new peephole2.
27832 2009-02-12  Nathan Sidwell  <nathan@codesourcery.com>
27834         * doc/invoke.texi (Optimize Options): Stop claiming inlining and
27835         loop unrolling do not happen at -O2.
27837 2009-02-12  Michael Matz  <matz@suse.de>
27839         * gcc.c (ASM_DEBUG_SPEC): Check for -g0.
27841 2009-02-12  Jakub Jelinek  <jakub@redhat.com>
27843         * dwarf2out.c (dwarf2out_finish): Force output of comp_unit_die
27844         for -g3.
27846 2009-02-12  Ben Elliston  <bje@au.ibm.com>
27848         * config/rs6000/rs6000.md (allocate_stack): Use _stack form of
27849         patterns when updating the back chain.  Missed in the 2009-02-10
27850         change.
27852 2009-02-11  Janis Johnson  <janis187@us.ibm.com>
27854         * doc/extend.texi (Decimal Floating Types): Update identifier of
27855         draft TR and list of missing support.
27857 2009-02-11  Jakub Jelinek  <jakub@redhat.com>
27859         PR middle-end/39154
27860         * gimplify.c (omp_notice_variable): If adding GOVD_SEEN
27861         bit to variable length decl's flags, add it also to its
27862         pointer replacement variable.
27864 2009-02-11  Uros Bizjak  <ubizjak@gmail.com>
27865             Jakub Jelinek  <jakub@redhat.com>
27867         PR target/39118
27868         * config/i386/i386.md (UNSPEC_MEMORY_BLOCKAGE): New constant.
27869         (memory_blockage): New expander.
27870         (*memory_blockage): New insn pattern.
27871         * config/i386/i386.c (ix86_expand_prologue): Use memory_blockage
27872         instead of general blockage at the end of function prologue when
27873         frame pointer is used to access red zone area.  Do not emit blockage
27874         when profiling, it is emitted in generic code.
27875         (ix86_expand_epilogue): Emit memory_blockage at the beginning of
27876         function epilogue when frame pointer is used to access red zone area.
27878 2009-02-11  Paolo Bonzini  <bonzini@gnu.org>
27880         PR target/38824
27881         * config/i386/i386.md: Add two new peephole2 to avoid mov followed
27882         by arithmetic with memory operands.
27883         * config/i386/predicates.md (commutative_operator): New.
27885 2009-02-10  Janis Johnson  <janis187@us.ibm.com>
27887         * doc/extend.texi (Fixed-Point Types): Break long paragraphs into
27888         bulleted lists.
27890 2009-02-10  Eric Botcazou  <ebotcazou@adacore.com>
27892         * alias.h (record_alias_subset): Declare.
27893         * alias.c (record_alias_subset): Make global.
27895 2009-02-10  Nick Clifton  <nickc@redhat.com>
27897         * tree-parloops.c: Change license to GPLv3.
27898         * ipa-struct-reorg.c: Change license to GPLv3.
27899         * ipa-struct-reorg.h: Change license to GPLv3.
27901 2009-02-10  Steve Ellcey  <sje@cup.hp.com>
27903         PR c/39084
27904         * c-decl.c (start_struct): Return NULL on error.
27906 2009-02-10  Jakub Jelinek  <jakub@redhat.com>
27908         PR middle-end/39124
27909         * cfgloopmanip.c (remove_path): Call remove_bbs after
27910         cancel_loop_tree, not before it.
27912         PR target/39139
27913         * function.h (struct function): Add has_local_explicit_reg_vars bit.
27914         * gimplify.c (gimplify_bind_expr): Set it if local DECL_HARD_REGISTER
27915         VAR_DECLs were seen.
27916         * tree-ssa-live.c (remove_unused_locals): Recompute
27917         cfun->has_local_explicit_reg_vars.
27918         * tree-ssa-sink.c (statement_sink_location): Don't sink BLKmode
27919         copies or clearings if cfun->has_local_explicit_reg_vars.
27921 2009-02-10  Uros Bizjak  <ubizjak@gmail.com>
27923         PR target/39118
27924         * config/i386/i386.c (expand_prologue): Emit blockage at the end
27925         of function prologue when frame pointer is used to access
27926         red zone area.
27928 2009-02-10  Richard Guenther  <rguenther@suse.de>
27930         PR middle-end/39127
27931         * gimplify.c (gimple_regimplify_operands): Always look if
27932         we need to create a temporary.
27934 2009-02-10  Richard Guenther  <rguenther@suse.de>
27936         PR tree-optimization/39132
27937         * tree-loop-distribution.c (todo): New global var.
27938         (generate_memset_zero): Trigger TODO_rebuild_alias.
27939         (tree_loop_distribution): Return todo.
27941 2009-02-10  H.J. Lu  <hongjiu.lu@intel.com>
27943         PR target/39119
27944         * config/i386/i386.c (x86_64_reg_class): Remove X86_64_AVX_CLASS.
27945         (x86_64_reg_class_name): Removed.
27946         (classify_argument): Return 0 if bytes > 32.  Return 0 if the
27947         first one isn't X86_64_SSE_CLASS or any other ones aren't
27948         X86_64_SSEUP_CLASS when size > 16bytes.  Don't turn
27949         X86_64_SSEUP_CLASS into X86_64_SSE_CLASS if the preceded one
27950         is X86_64_SSEUP_CLASS.  Set AVX modes to 1 X86_64_SSE_CLASS
27951         and 3 X86_64_SSEUP_CLASS.
27952         (construct_container): Remove X86_64_AVX_CLASS.  Handle 4
27953         registers with 1 X86_64_SSE_CLASS and 3 X86_64_SSEUP_CLASS.
27955 2009-02-10  Ben Elliston  <bje@au.ibm.com>
27957         * config/rs6000/rs6000.md (allocate_stack): Always use an update
27958         form instruction to update the stack back chain word, even if the
27959         user has disabled the generation of update instructions.
27960         (movdi_<mode>_update_stack): New.
27961         (movsi_update_stack): Likewise.
27962         * config/rs6000/rs6000.c (rs6000_emit_allocate_stack): Likewise,
27963         always use an update form instruction to update the stack back
27964         chain word.
27966 2009-02-09  Sebastian Pop  <sebastian.pop@amd.com>
27968         PR middle-end/38953
27969         * graphite.c (if_region_set_false_region): After moving a region in
27970         the false branch of a condition, remove the empty dummy basic block.
27971         (gloog): Remove wrong fix for PR38953.
27973 2009-02-09  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
27975         * config/spu/spu.c (array_to_constant): Fix (latent) wrong-code
27976         generation due to implicit sign extension.
27978 2009-02-09  Eric Botcazou  <ebotcazou@adacore.com>
27980         PR middle-end/38981
27981         * tree-ssa-coalesce.c (add_coalesce): Cap the costs of coalesce pairs
27982         at MUST_COALESCE_COST-1 instead of MUST_COALESCE_COST.
27984 2009-02-09  Richard Guenther  <rguenther@suse.de>
27986         PR middle-end/35202
27987         * convert.c (convert_to_real): Disable (float)fn((double)x)
27988         to fnf(x) conversion if errno differences may occur and
27989         -fmath-errno is set.
27991 2009-02-07  Anatoly Sokolov  <aesok@post.ru>
27993         * config/avr/avr.c (avr_mcu_t): Add ata6289 device.
27994         * config/avr/avr.h (LINK_SPEC, CRT_BINUTILS_SPECS): (Ditto.).
27995         * config/avr/t-avr (MULTILIB_MATCHES): (Ditto.).
27997 2009-02-06  Joseph Myers  <joseph@codesourcery.com>
27999         PR c/35434
28000         * c-common.c (handle_alias_attribute): Disallow attribute for
28001         anything not a FUNCTION_DECL or VAR_DECL.
28003 2009-02-06  Janis Johnson  <janis187@us.ibm.com>
28005         PR c/39035
28006         * real.c (do_compare): Special-case compare of zero against
28007         decimal float value.
28009 2009-02-06  Joseph Myers  <joseph@codesourcery.com>
28011         PR c/36432
28012         * c-decl.c (grokdeclarator): Don't treat [] declarators in fields
28013         as indicating flexible array members unless the field itself is
28014         being declarared as the incomplete array.
28016 2009-02-06  Jan Hubicka  <jh@suse.cz>
28018         PR tree-optimization/38844
28019         * ipa-inline.c (try_inline): Stop inlining recursion when edge
28020         is already inlined.
28022 2009-02-06  Richard Guenther  <rguenther@suse.de>
28024         PR middle-end/38977
28025         * tree-cfg.c (need_fake_edge_p): Force a fake edge for
28026         fork because we may expand it as __gcov_fork.
28028 2009-02-06  Nick Clifton  <nickc@redhat.com>
28030         * config/m32c/m32c.h (PCC_BITFIELD_TYPE_MATTERS): Define to zero.
28032 2009-02-06  Paolo Bonzini  <bonzini@gnu.org>
28034         PR tree-optimization/35659
28035         * tree-ssa-sccvn.c (vn_constant_eq, vn_reference_eq, vn_nary_op_eq
28036         vn_phi_eq): Shortcut if hashcode does not match.
28037         (vn_reference_op_compute_hash): Do not call iterative_hash_expr for
28038         NULL operands.
28039         * tree-ssa-pre.c (pre_expr_hash): Look at hashcode if available,
28040         and avoid iterative_hash_expr.
28041         (FOR_EACH_VALUE_ID_IN_SET): New.
28042         (value_id_compare): Remove.
28043         (sorted_array_from_bitmap_set): Use FOR_EACH_VALUE_ID_IN_SET to
28044         sort expressions by value id.
28046 2009-02-05  Kaz Kojima  <kkojima@gcc.gnu.org>
28048         PR target/38991
28049         * config/sh/predicates.md (general_movsrc_operand): Don't check
28050         the subreg of system registers here.
28052 2009-02-05  Jakub Jelinek  <jakub@redhat.com>
28054         PR c++/39106
28055         * cgraphunit.c (cgraph_function_versioning): Clear also DECL_VIRTUAL_P
28056         on the copied decl.
28058 2009-02-05  Paolo Bonzini  <bonzini@gnu.org>
28060         PR rtl-optimization/39110
28061         * rtlanal.c (rtx_addr_can_trap_p_1): Shortcut unaligned
28062         addresses, not aligned ones.
28064 2009-02-05  Daniel Berlin  <dberlin@dberlin.org>
28065             Richard Guenther  <rguenther@suse.de>
28067         PR tree-optimization/39100
28068         * tree-ssa-structalias.c (do_ds_constraint): Actually do what the
28069         comment says and add edges.
28071 2009-02-05  Joseph Myers  <joseph@codesourcery.com>
28073         PR c/35435
28074         * c-common.c (handle_tls_model_attribute): Ignore attribute for
28075         non-VAR_DECLs without checking DECL_THREAD_LOCAL_P.
28077 2009-02-04  Tobias Grosser  <grosser@fim.uni-passau.de>
28079         * graphite.c (bb_in_sese_p, sese_build_livein_liveouts_use,
28080         sese_build_livein_liveouts_bb, sese_build_livein_liveouts,
28081         register_bb_in_sese, new_sese, free_sese): Moved.
28082         (dot_scop_1, build_scop_loop_nests, build_loop_iteration_domains,
28083         outermost_loop_in_scop, build_scop_iteration_domain,
28084         expand_scalar_variables_ssa_name, get_vdef_before_scop,
28085         limit_scops): Use bb_in_sese_p instead of bb_in_scop_p.
28086         Use loop_in_sese_p instead of loop_in_scop_p.
28087         (new_graphite_bb, gloog): Do not initialize SCOP_BBS_B.
28088         (new_scop, free_scop): Remove SCOP_LOOP2CLOOG_LOOP and SCOP_BBS_B.
28089         (scopdet_basic_block_info): Fix bug in scop detection.
28090         (new_loop_to_cloog_loop_str, hash_loop_to_cloog_loop,
28091         eq_loop_to_cloog_loop): Remove.
28092         (nb_loops_around_loop_in_scop, nb_loop
28093         ref_nb_loops): Moved here...
28094         * graphite.h (ref_nb_loops): ... from here.
28095         (struct scop): Remove bbs_b bitmap and loop2cloog_loop.
28096         (loop_domain_dim, loop_iteration_vector_dim): Remove.
28097         (SCOP_BBS_B, bb_in_scop_p, loop_in_scop_p): Removed.
28099 2009-02-04  Paolo Bonzini  <bonzini@gnu.org>
28100             Hans-Peter Nilsson  <hp@axis.com>
28102         PR rtl-optimization/37889
28103         * rtlanal.c (rtx_addr_can_trap_p_1): Add offset and size arguments.
28104         Move offset handling from PLUS to before the switch.  Use new
28105         arguments when considering SYMBOL_REFs too.
28106         (rtx_addr_can_trap_p): Pass dummy offset and size.
28107         (enum may_trap_p_flags): Remove.
28108         (may_trap_p_1): Pass size from MEM_SIZE.
28110         PR rtl-optimization/38921
28111         * loop-invariant.c (find_invariant_insn): Use may_trap_or_fault_p.
28112         * rtl.h (may_trap_after_code_motion_p): Delete prototype.
28113         * rtlanal.c (may_trap_after_code_motion_p): Delete.
28114         (may_trap_p, may_trap_or_fault_p): Pass 0/1 as flags.
28116 2009-02-04  H.J. Lu  <hongjiu.lu@intel.com>
28118         AVX Programming Reference (January, 2009)
28119         * config/i386/sse.md (*vpclmulqdq): New.
28121 2009-02-04  Jakub Jelinek  <jakub@redhat.com>
28123         PR tree-optimization/38977
28124         PR gcov-profile/38292
28125         * calls.c (special_function_p): Disregard __builtin_ prefix.
28127 2009-02-04  Hariharan Sandanagobalane  <hariharan@picochip.com>
28129         * config/picochip/picochip.c (GO_IF_LEGITIMATE_ADDRESS): Disallow
28130         non-indexable addresses even before reload.
28132 2009-02-03  Joseph Myers  <joseph@codesourcery.com>
28134         PR c/29129
28135         * c-decl.c (grokdeclarator): Mark [*] arrays in field declarators
28136         as having variable size.  Do not give an error for unnamed
28137         parameters with [*] declarators.  Give a warning for type names
28138         with [*] declarators and mark them as variable size.
28139         * c-parser.c (c_parser_sizeof_expression): Do not give an error
28140         for sizeof applied to [*] type names.
28142 2009-02-03  Andrew Pinski  <andrew_pinski@playstation.sony.com>
28144         PR C++/36607
28145         * convert.c (convert_to_integer): Treat OFFSET_TYPE like INTEGER_TYPE.
28147 2009-02-03  Jakub Jelinek  <jakub@redhat.com>
28149         * gcc.c (process_command): Update copyright notice dates.
28150         * gcov.c (print_version): Likewise.
28151         * gcov-dump.c (print_version): Likewise.
28152         * mips-tfile.c (main): Likewise.
28153         * mips-tdump.c (main): Likewise.
28155 2009-02-03  Joseph Myers  <joseph@codesourcery.com>
28157         PR c/35433
28158         * c-typeck.c (composite_type): Set TYPE_SIZE and TYPE_SIZE_UNIT
28159         for composite type involving a zero-length array type.
28161 2009-02-03  Jakub Jelinek  <jakub@redhat.com>
28163         PR target/35318
28164         * function.c (match_asm_constraints_1): Skip over
28165         initial optional % in the constraint.
28167         PR inline-asm/39059
28168         * c-parser.c (c_parser_postfix_expression): If fixed point is not
28169         supported, don't accept FIXED_CSTs.
28170         * c-decl.c (finish_declspecs): Error if fixed point is not supported
28171         and _Sat is used without _Fract/_Accum.  Set specs->type to
28172         integer_type_node for cts_fract/cts_accum if fixed point is not
28173         supported.
28175 2009-02-02  Catherine Moore  <clm@codesourcery.com>
28177         * sde.h (SUBTARGET_ARM_SPEC): Don't assemble -fpic code as -mabicalls.
28179 2009-02-02  Richard Sandiford  <rdsandiford@googlemail.com>
28181         * config/mips/mips.h (FILE_HAS_64BIT_SYMBOLS): New macro.
28182         (ABI_HAS_64BIT_SYMBOLS): Use it.
28183         (DWARF2_ADDR_SIZE): Use it instead of ABI_HAS_64BIT_SYMBOLS.
28185 2009-02-02  Paul Brook  <paul@codesourcery.com>
28187         * config/arm/arm.md (arm_addsi3): Add r/r/k alternative.
28189 2009-02-02  Jakub Jelinek  <jakub@redhat.com>
28191         PR inline-asm/39058
28192         * recog.h (asm_operand_ok): Add constraints argument.
28193         * recog.c (asm_operand_ok): Likewise.  If it is set, for digits
28194         recurse on matching constraint.
28195         (check_asm_operands): Pass constraints as 3rd argument to
28196         asm_operand_ok.  Don't look up matching constraint here.
28197         * stmt.c (expand_asm_operands): Pass NULL as 3rd argument
28198         to asm_operand_ok.
28200 2009-02-02  Ben Elliston  <bje@au.ibm.com>
28202         * doc/tm.texi (Storage Layout): Fix TARGET_ALIGN_ANON_BITFIELD and
28203         TARGET_NARROW_VOLATILE_BITFIELD macro names.
28205 2009-01-31  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
28207         * doc/install.texi (hppa*-hp-hpux*): Update binutils and linker
28208         information.  Remove some obsolete information.  Reorganize.
28210         * config/pa/fptr.c: Revert license to GPL 2.
28211         * config/pa/milli64.S: Likewise.
28213 2009-01-31  Dave Korn  <dave.korn.cygwin@gmail.com>
28215         PR target/38904
28216         * mkmap-flat.awk (END):  Use pe_dll command-line arg to pass
28217         LIBRARY name in, instead of hard-coding it.
28218         * config.gcc (i[34567]86-*-pe | i[34567]86-*-cygwin*):  Add an
28219         extra target make frag to tmake_files according to EH model.
28220         (i[34567]86-*-mingw* | x86_64-*-mingw*):  Likewise.
28221         * config/i386/t-dw2-eh, config/i386/t-sjlj-eh:  Add new target
28222         frags that define makefile variable EH_MODEL appropriately.
28223         * config/i386/cygming.h (DWARF2_UNWIND_INFO):  Add comment.
28224         * config/i386/cygwin.h (LIBGCC_EH_EXTN):  Define to nothing or
28225         to "-sjlj" according to type of EH configured.
28226         (LIBGCC_SONAME):  Concatenate it to shared library base name.
28227         * config/i386/mingw32.h (LIBGCC_EH_EXTN):  Define to "_dw2" or
28228         to "_sjlj" according to type of EH configured.
28229         (LIBGCC_SONAME):  Concatenate it to shared library base name.
28230         * config/i386/t-cygming (SHLIB_SONAME):  Use EH_MODEL.
28231         (SHLIB_LINK):  Add missing semicolon to if-else construct.
28232         (SHLIB_MKMAP_OPTS):  Pass library name to mkmap-flat.awk as
28233         string value of "pe_dll" command-line option.
28234         * config/i386/t-cygwin (SHLIB_EH_EXTENSION):  New helper.
28235         (SHLIB_SONAME):  Use it when overriding t-cygming default.
28236         (SHLIB_IMPLIB):  Override t-cygming default.
28237         (SHLIB_MKMAP_OPTS):  Pass library name to mkmap-flat.awk as
28238         string value of "pe_dll" command-line option.
28240 2009-01-31  Dave Korn  <dave.korn.cygwin@gmail.com>
28242         PR target/38952
28243         * config/i386/i386.c (ix86_builtin_setjmp_frame_value): New.
28244         (TARGET_BUILTIN_SETJMP_FRAME_VALUE): Override default to point at it.
28246 2009-01-31  Richard Guenther  <rguenther@suse.de>
28248         PR tree-optimization/38937
28249         * tree-ssa-structalias.c (do_sd_constraint): Do not shortcut
28250         computing the transitive closure.
28252 2009-01-30  Richard Guenther  <rguenther@suse.de>
28254         PR tree-optimization/39041
28255         * tree-ssa-forwprop.c (forward_propagate_addr_expr_1):
28256         Propagate variable indices only if the types match for this stmt.
28258 2009-01-30  Jakub Jelinek  <jakub@redhat.com>
28260         PR target/39013
28261         * c-decl.c (pop_scope): Set DECL_EXTERNAL for functions declared
28262         inline but never defined.
28264 2009-01-30  Wolfgang Gellerich  <gellerich@de.ibm.com>
28266         * config/s390/s390.md (*insv<mode>_reg_extimm): Removed.
28267         (*insv_h_di_reg_extimm): New insn.
28268         (*insv_l<mode>_reg_extimm): New insn.
28270 2009-01-30  Hariharan Sandanagobalane  <hariharan@picochip.com>
28272         * config/picochip/picochip.c (flag_conserve_stack): set
28273         PARAM_LARGE_STACK_FRAME and PARAM_STACK_FRAME_GROWTH to zero under
28274         fconserve-stack. Reduce call-overhead used by inliner.
28276 2009-01-30  Hariharan Sandanagobalane  <hariharan@picochip.com>
28278         PR/38157
28279         * common.opt (flag_conserve_stack): Initialised to zero.
28281 2009-01-30  Kai Tietz  <kai.tietz@onevision.com>
28283         PR/39002
28284         * config/i386/i386.c (ix86_can_use_return_insn_p): Check for nsseregs.
28285         (ix86_expand_epilogue): Take nsseregs in account to use proper restore
28286         method.
28288 2009-01-29  H.J. Lu  <hongjiu.lu@intel.com>
28290         * ira-color.c (allocno_reload_assign): Update comments.
28291         * regmove.c (regmove_optimize): Likewise.
28293         * ra.h: Removed.
28295 2009-01-29  Robert Millan  <rmh@aybabtu.com>
28297         * config.gcc: Recognize GNU/kOpenSolaris (*-*-kopensolaris*-gnu).
28298         * config/i386/kopensolaris-gnu.h: New file.  Undefine
28299         `MD_UNWIND_SUPPORT'.
28300         * config/kopensolaris-gnu.h: New file (based on kfreebsd-gnu.h).
28302 2009-01-29  Kazu Hirata  <kazu@codesourcery.com>
28304         PR tree-optimization/39007
28305         * tree-loop-distribution.c (generate_builtin): Use
28306         recompute_dominator to compute the immediate dominator of the
28307         basic block just after the loop.
28309 2009-01-29  Rainer Orth  <ro@TechFak.Uni-Bielefeld.DE>
28311         * config/i386/sol2-10.h [!HAVE_AS_IX86_DIFF_SECT_DELTA]
28312         (ASM_OUTPUT_DWARF_PCREL): Define.
28314 2009-01-29  Vladimir Makarov  <vmakarov@redhat.com>
28316         * doc/tm.texi (TARGET_IRA_COVER_CLASSES): Modify description.
28317         * doc/passes.texi: Remove entries about regclass, local-alloc, and
28318         global.  Modify entries about regmove and IRA.
28320         * ra-conflict.c: Remove the file.
28322         * reload.c (push_reload, find_dummy_reload): Remove flag_ira.
28324         * tree-pass.h (pass_local_alloc, pass_global_alloc): Remove.
28325         (pass_regclass_init): Rename to pass_reginfo_init.
28327         * cfgloopanal.c (estimate_reg_pressure_cost): Remove flag_ira.
28329         * toplev.h (flag_ira): Remove.
28331         * caller-save.c (setup_save_areas): Remove flag_ira.
28333         * ira-color.c (ira_reuse_stack_slot, ira_mark_new_stack_slot): Ditto.
28335         * global.c: Remove the file.
28337         * opts.c (decode_options): Remove flag_ira.
28339         * hard-reg-set.h (losing_caller_save_reg_set): Remove.
28341         * regmove.c: Modify file description.
28342         (find_use_as_address, try_auto_increment): Define them only if
28343         AUTO_INC_DEC is defined.
28344         (replacement_quality, replace_in_call_usage, fixup_match_1,
28345         stable_and_no_regs_but_for_p): Remove.
28346         (reg_set_in_bb): Make it static.
28347         (regmove_optimize): Remove flag_ira and code which worked for
28348         !flag_ira.
28350         * local-alloc.c: Remove the file.
28352         * common.opt (fira): Remove.
28354         * ira.c: Include except.h.
28355         (eliminable_regset): Move from global.c.
28356         (mark_elimination): Ditto.  Remove flag_ira.
28357         (reg_renumber, struct equivalence, reg_equiv, equiv_mem,
28358         equiv_mem_modified, validate_equiv_mem_from_store,
28359         validate_equiv_mem, equiv_init_varies_p, equiv_init_movable_p,
28360         contains_replace_regs, memref_referenced_p, memref_used_between_p,
28361         no_equiv, recorded_label_ref): Move from local-alloc.c.
28362         (update_equiv_regs): Ditto.  Make it static.
28363         (print_insn_chain, print_insn_chains): Move it from global.c.
28364         (pseudo_for_reload_consideration_p): Ditto.  Remove flag_ira.
28365         (build_insn_chain): Ditto.  Make it static.
28366         (ra_init_live_subregs): Move from ra-conflict.c.  Make it static.
28367         Rename to init_live_subregs.
28368         (gate_ira): Remove flag_ira.
28370         * regclass.c: Rename reginfo.c.  Change file description.
28371         (FORBIDDEN_INC_DEC_CLASSES): Remove.
28372         (reg_class_superclasses, forbidden_inc_dec_class, in_inc_dec): Remove.
28373         (init_reg_sets_1): Remove code for evaluation of
28374         reg_class_superclasses and losing_caller_save_reg_set.
28375         (init_regs): Remove init_reg_autoinc.
28376         (struct costs, costs, init_cost, ok_for_index_p_nonstrict,
28377         ok_for_base_p_nonstrict): Remove.
28378         (regclass_init): Rename to reginfo_init.  Don't initialize init_cost.
28379         (pass_regclass_init): Rename to pass_reginfo_init.  Modify
28380         corresponding entries.
28381         (dump_regclass, record_operand_costs, scan_one_insn,
28382         init_reg_autoinc, regclass, record_reg_classes, copy_cost,
28383         record_address_regs, auto_inc_dec_reg_p): Remove.
28384         (gt-regclass.h): Rename to gt-reginfo.h.
28386         * rtl.h (dump_global_regs, retry_global_alloc,
28387         build_insn_chain, dump_local_alloc, update_equiv_regs): Remove.
28389         * Makefile.in (RA_H): Remove.
28390         (OBJS-common): Remove global.o, local-alloc.o, and ra-conflict.o.
28391         Rename regclass.o to reginfo.o.
28392         (regclass.o): Rename to reginfo.o.  Rename gt-regclass.h to
28393         gt-reginfo.h.
28394         (global.o, local-alloc.o, ra-conflict.o): Remove entries.
28395         (GTFILES): Rename regclass.c to reginfo.c.
28397         * passes.c (init_optimization_passes): Remove pass_local_alloc and
28398         pass_global_alloc.  Rename pass_regclass_init to pass_reginfo_init.
28400         * reload1.c (compute_use_by_pseudos, reload, count_pseudo,
28401         count_spilled_pseudo, find_reg, alter_reg, delete_output_reload):
28402         Remove flag_ira.
28403         (finish_spills): Ditto.  Remove code for !flag_ira.
28405 2009-01-29  Kenneth Zadeck  <zadeck@naturalbridge.com>
28407         PR middle-end/35854
28408         * doc/invoke.texi (rtl debug options): Complete rewrite.
28409         * auto-inc-dec.c (pass_inc_dec): Rename pass from "auto-inc-dec"
28410         to auto_inc_dec".
28411         * mode-switching.c (pass_mode_switching): Rename pass from
28412         "mode-sw" to "mode_sw".
28413         * except.c (pass_convert_to_eh_ranges): Rename pass from
28414         "eh-ranges" to "eh_ranges".
28415         * lower-subreg.c (pass_lower_subreg): Renamed pass from "subreg"
28416         to "subreg1".
28419 2009-01-29  Andrey Belevantsev  <abel@ispras.ru>
28420             Alexander Monakov  <amonakov@ispras.ru>
28422         PR middle-end/38857
28423         * sel-sched.c (count_occurrences_1): Check that *cur_rtx is a hard
28424         register.
28425         (move_exprs_to_boundary): Change return type and pass through
28426         should_move from move_op.  Relax assert.  Update usage ...
28427         (schedule_expr_on_boundary): ... here.  Use should_move instead of
28428         cant_move.
28429         (move_op_orig_expr_found): Indicate that insn was disconnected from
28430         stream.
28431         (code_motion_process_successors): Do not call after_merge_succs
28432         callback if original expression was not found when traversing any of
28433         the branches.
28434         (code_motion_path_driver): Change return type.  Update prototype.
28435         (move_op): Update comment.  Add a new parameter (should_move).  Update
28436         prototype.  Set *should_move based on indication provided by
28437         move_op_orig_expr_found.
28439 2009-01-28  Pat Haugen  <pthaugen@us.ibm.com>
28441         * doc/invoke.texi (avoid-indexed-addresses): Document new option.
28442         * config/rs6000/rs6000-protos.h (avoiding_indexed_address_p): Declare.
28443         * config/rs6000/rs6000.opt (avoid-indexed-addresses): New option.
28444         * config/rs6000/rs6000.c (rs6000_override_options): Default
28445         avoid-indexed-addresses on for Power6, off for everything else.
28446         (avoiding_indexed_address_p): New function.
28447         (rs6000_legitimize_address): Use it.
28448         (rs6000_legitimate_address): Likewise.
28449         * config/rs6000/rs6000.md (movXX_updateX): Likewise
28451 2009-01-28  Kazu Hirata  <kazu@codesourcery.com>
28453         PR tree-optimization/38997
28454         * tree-loop-distribution.c (generate_memset_zero): Use
28455         POINTER_PLUS_EXPR for a pointer addition.
28457 2009-01-28  Andreas Krebbel  <krebbel1@de.ibm.com>
28459         * config/s390/s390.md (bswap<mode>2): New pattern added.
28461 2009-01-28  Wolfgang Gellerich  <gellerich@de.ibm.com>
28463         * config/s390/s390.md (*tls_load_31): Added type attribute.
28465 2009-01-28  Wolfgang Gellerich  <gellerich@de.ibm.com>
28467         * config/s390/s390.md: Fix a few comments.
28469 2009-01-28  Wolfgang Gellerich  <gellerich@de.ibm.com>
28471         * config/s390/s390.md (*tmsi_reg): Fixed z10prop attribute.
28472         (*tm<mode>_full): Fixed z10prop attribute.
28473         (*tst<mode>_extimm): Fixed z10prop attribute.
28474         (*tst<mode>_cconly_extimm): Fixed z10prop attribute.
28475         (*tstqiCCT_cconly): Fixed z10prop attribute.
28476         (*cmpsi_ccu_zerohi_rlsi): Fixed z10prop attribute.
28477         (*movsi_larl): Fixed z10prop attribute.
28478         (*movsi_zarch): Fixed z10prop attribute.
28479         (*movsi_eas): Fixed z10prop attribute.
28480         (*movhi): Fixed z10prop attribute.
28481         (*movqi): Fixed z10prop attribute.
28482         (*movstrictqi): Fixed z10prop attribute.
28483         (*mov<mode>): Fixed z10prop attribute.
28484         (*movcc): Fixed z10prop attribute.
28485         (*sethighpartdi_64): Fixed z10prop attribute.
28486         (*zero_extendhi<mode>2_z10): Fixed z10prop attribute.
28487         (*negdi2_sign_cc): Fixed z10prop attribute.
28488         (*negdi2_sign): Fixed z10prop attribute.
28489         (*absdi2_sign_cc): Fixed z10prop attribute.
28490         (*absdi2_sign): Fixed z10prop attribute.
28491         (*negabsdi2_sign_cc): Fixed z10prop attribute.
28492         (*negabsdi2_sign): Fixed z10prop attribute.
28493         (*cmp_and_trap_signed_int<mode>): Fixed z10prop attribute.
28494         (*cmp_and_trap_unsigned_int<mode>): Fixed z10prop attribute.
28495         (doloop_si64): Fixed z10prop attribute.
28496         (doloop_si31): Fixed z10prop attribute.
28497         (doloop_long): Fixed z10prop attribute.
28498         (indirect_jump): Fixed z10prop attribute.
28499         (nop): Fixed z10prop attribute.
28500         (main_base_64): Fixed z10prop attribute.
28501         (reload_base_64): Fixed z10prop attribute.
28503 2009-01-28  Jakub Jelinek  <jakub@redhat.com>
28505         PR rtl-optimization/38740
28506         * reorg.c (gate_handle_delay_slots): Avoid dbr scheduling
28507         if !optimize.
28508         * config/mips/mips.c (mips_reorg): Likewise.
28510 2009-01-28  Richard Guenther  <rguenther@suse.de>
28512         PR tree-optimization/38926
28513         * tree-ssa-pre.c (add_to_value): Assert we add only expressions
28514         with the correct value id to a value.
28515         (do_regular_insertion): Use the value number of edoubleprime
28516         for the value number of the expr.
28518         Revert
28519         2008-08-21  Richard Guenther  <rguenther@suse.de>
28521         * tree-ssa-pre.c (insert_into_preds_of_block): Before inserting
28522         a PHI ask VN if it is already available.
28523         * tree-ssa-sccvn.h (vn_phi_lookup): Declare.
28524         * tree-ssa-sccvn.c (vn_phi_lookup): Export.
28526 2009-01-28  Jakub Jelinek  <jakub@redhat.com>
28528         PR middle-end/38934
28529         * tree-vrp.c (extract_range_from_assert): For LE_EXPR and LT_EXPR
28530         set to varying whenever max has TREE_OVERFLOW set, similarly
28531         for GE_EXPR and GT_EXPR and TREE_OVERFLOW min.
28533 2009-01-28  Richard Guenther  <rguenther@suse.de>
28535         PR middle-end/38908
28536         * tree-ssa.c (warn_uninitialized_var): Do not warn for seemingly
28537         uninitialized aggregate uses in call arguments.
28539 2009-01-28  Paolo Bonzini  <bonzini@gnu.org>
28541         PR tree-optimization/38984
28542         * tree-ssa-structalias.c (get_constraints_for_1): Do not use
28543         the nothing_id variable if -fno-delete-null-pointer-checks.
28545 2009-01-28  Uros Bizjak  <ubizjak@gmail.com>
28547         PR target/38988
28548         * config/i386/i386.md (set_rip_rex64): Wrap operand 1 in label_ref.
28549         (set_got_offset_rex64): Ditto.
28551 2009-01-27  H.J. Lu  <hongjiu.lu@intel.com>
28553         PR target/38941
28554         * doc/extend.texi: Improve local variable with asm reg.
28556 2009-01-27  Adam Nemet  <anemet@caviumnetworks.com>
28558         * c.opt (Wpacked-bitfield-compat): Change init value to -1.
28559         * c-opts.c (c_common_post_options): If -W*packed-bitfield-compat
28560         was not supplied then set warn_packed_bitfield_compat to the
28561         default value of 1.
28562         * stor-layout.c (place_field): Check warn_packed_bitfield_compat
28563         against 1.
28565 2009-01-27  Richard Guenther  <rguenther@suse.de>
28567         PR tree-optimization/38503
28568         * cfgexpand.c (expand_gimple_basic_block): Ignore
28569         GIMPLE_CHANGE_DYNAMIC_TYPE during expansion.
28570         * tree-ssa-structalias.c (set_uids_in_ptset): Do not prune
28571         variables that cannot have TBAA applied.
28572         (compute_points_to_sets): Do not remove GIMPLE_CHANGE_DYNAMIC_TYPE
28573         statements.
28575 2009-01-27  Uros Bizjak  <ubizjak@gmail.com>
28577         PR middle-end/38969
28578         * calls.c (initialize_argument_information): Do not wrap complex
28579         arguments in SAVE_EXPR.
28581 2009-01-26  Andreas Tobler  <a.tobler@schweiz.org>
28583         * config/t-vxworks (LIBGCC2_INCLUDES): Fix typo.
28584         (INSTALL_LIBGCC): Revert typo commit.
28586 2009-01-26  Richard Guenther  <rguenther@suse.de>
28588         PR tree-optimization/38745
28589         * tree-ssa-alias.c (update_alias_info_1): Exclude RESULT_DECL
28590         from special handling.
28592 2009-01-26  Richard Guenther  <rguenther@suse.de>
28594         PR tree-optimization/38745
28595         * tree-ssa.c (execute_update_addresses_taken): Do not include
28596         variables that cannot possibly be a register in not_reg_needs.
28597         Do not clear TREE_ADDRESSABLE on vars that may not become
28598         registers.
28599         * tree-ssa.c (update_alias_info_1): Include those in the set
28600         of addressable vars.
28602 2009-01-26  Richard Guenther  <rguenther@suse.de>
28604         PR middle-end/38851
28605         * Makefile.in (tree-ssa-dse.o): Add langhooks.h.
28606         * tree-ssa-dse.c: Include langhooks.h
28607         (execute_simple_dse): Remove stores with zero size.
28609 2009-01-24  Jakub Jelinek  <jakub@redhat.com>
28611         PR c/38957
28612         * c-typeck.c (c_finish_return): Handle POINTER_PLUS_EXPR the same way
28613         as PLUS_EXPR.
28615 2009-01-24  Julian Brown  <julian@codesourcery.com>
28617         * config/arm/t-linux-eabi (LIB2FUNCS_STATIC_EXTRA): Add
28618         config/arm/linux-atomic.c.
28619         * config/arm/linux-atomic.c: New.
28621 2009-01-24  Eric Botcazou  <ebotcazou@adacore.com>
28623         * config/sparc/linux.h (DBX_REGISTER_NUMBER): Delete.
28624         * config/sparc/linux64.h (DBX_REGISTER_NUMBER): Likewise.
28625         * config/sparc/sysv4.h (DBX_REGISTER_NUMBER): Likewise.
28627 2009-01-24  H.J. Lu  <hongjiu.lu@intel.com>
28629         PR c/38938
28630         * c-opts.c (c_common_handle_option): Update warn_pointer_sign
28631         properly.
28633 2009-01-24  Sebastian Pop  <sebastian.pop@amd.com>
28635         PR tree-optimization/38953
28636         * graphite.c (graphite_verify): Add a call to verify_loop_closed_ssa.
28637         (scop_adjust_phis_for_liveouts): Initialize false_i to zero.
28638         (gloog): Split the exit of the scop when the scop exit is a loop exit.
28639         (graphite_transform_loops): Only call cleanup_tree_cfg if gloog
28640         changed the CFG.
28642 2009-01-24  Paul Brook  <paul@codesourcery.com>
28644         * config/arm/neon.md (neon_type): Move to arm.md.
28645         (neon_mov<VSTRUCT>): Add neon_type attribute.
28646         * config/arm/arm.md (neon_type): Move to here.
28647         (conds): Add "unconditioal" and use as default for NEON insns.
28649 2009-01-24  Ben Elliston  <bje@au.ibm.com>
28651         * bitmap.h (BITMAP_FREE): Eliminate `implicit conversion from
28652         void *' warning from -Wc++-compat.
28653         * Makefile.in (dominance.o-warn): Remove.
28655 2009-01-23  Paolo Bonzini  <bonzini@gnu.org>
28657         PR tree-optimization/38932
28658         * fold-const.c (fold_unary_ignore_overflow): New.
28659         * tree.h (fold_unary_ignore_overflow): Declare.
28660         * tree-ssa-ccp.c (ccp_fold): Use fold_unary_ignore_overflow.
28661         * tree-ssa-sccvn.c (visit_reference_op_load,
28662         simplify_unary_expression): Likewise.
28664 2009-01-22  Adam Nemet  <anemet@caviumnetworks.com>
28666         * c-decl.c (finish_struct): Move code to set DECL_PACKED after
28667         DECL_BIT_FIELD is alreay known.  Also inherit packed for bitfields
28668         regardless of their type.
28669         * c-common.c (handle_packed_attribute): Don't ignore packed on
28670         bitfields.
28671         * c.opt (Wpacked-bitfield-compat): New warning option.
28672         * stor-layout.c (place_field): Warn if offset of a field changed.
28673         * doc/extend.texi (packed): Mention the ABI change.
28674         * doc/invoke.texi (-Wpacked-bitfield-compat): Document.
28675         (Warning Options): Add it to the list.
28677 2009-01-22  H.J. Lu  <hongjiu.lu@intel.com>
28679         * c-opts.c (c_common_post_options): Fix a typo in comments.
28681 2009-01-22  Steve Ellcey  <sje@cup.hp.com>
28683         PR middle-end/38615
28684         * gimplify.c (gimplify_init_constructor): Fix promotion of const
28685         variables to static.
28686         * doc/invoke.texi (-fmerge-all-constants): Update description.
28688 2009-01-22  Uros Bizjak  <ubizjak@gmail.com>
28690         PR target/38931
28691         * config/i386/i386.md (*movsi_1): Use type "mmx" for alternative 2.
28692         (*movdi_1_rex64): Use type "mmx" for alternative 5.
28694 2009-01-22  Richard Earnshaw  <rearnsha@arm.com>
28696         * arm.h (DATA_ALIGNMENT): Align structures, unions and arrays to
28697         a word boundary.
28698         (LOCAL_ALIGNMENT): Similarly.
28700 2009-01-22  Mark Shinwell  <shinwell@codesourcery.com>
28701             Joseph Myers  <joseph@codesourcery.com>
28703         * config/arm/arm.c (all_architectures): Add iWMMXt2 entry.
28704         * config/arm/arm-cores.def: New ARM_CORE entry for iWMMXt2.
28705         * config/arm/arm-tune.md: Regenerate.
28706         * doc/invoke.texi (ARM Options): Document -mcpu=iwmmxt2 and
28707         -march=iwmmxt2.
28709 2009-01-22  Mark Shinwell  <shinwell@codesourcery.com>
28711         * config/arm/bpabi.h (SUBTARGET_EXTRA_ASM_SPEC): Bump EABI
28712         version number to five.
28714 2009-01-22  Dodji Seketeli  <dodji@redhat.com>
28716         PR c++/38930
28717         * c-decl.c (clone_underlying_type): Revert PR c++/26693 changes.
28718         * c-common.c (set_underlying_type): Likewise.
28719         (is_typedef_decl ): Likewise
28720         * tree.h: Likewise
28721         (set_underlying_type): Likewise.
28722         (is_typedef_type): Likewise.
28724 2009-01-21  Vladimir Makarov  <vmakarov@redhat.com>
28726         PR middle-end/38587
28727         * ira-color.c (coalesce_spill_slots): Don't coalesce allocnos
28728         crossing setjmps.
28730 2009-01-21  Dave Korn  <dave.korn.cygwin@gmail.com>
28732         PR bootstrap/37660
28733         * config/i386/cygwin.h (SHARED_LIBGCC_SPEC):  New helper macro.
28734         (LIBGCC_SPEC):  Don't define.
28735         (REAL_LIBGCC_SPEC):  Define instead, using SHARED_LIBGCC_SPEC.
28737 2009-01-21  Uros Bizjak  <ubizjak@gmail.com>
28739         PR rtl-optimization/38879
28740         * alias.c (base_alias_check): Unaligned access via AND address can
28741         alias all surrounding object types except those with sizes equal
28742         or wider than the size of unaligned access.
28744 2009-01-21  Dodji Seketeli  <dodji@redhat.com>
28746         PR c++/26693
28747         * c-decl.c (clone_underlying_type): Move this ...
28748         * c-common.c (set_underlying_type): ... here.
28749         Also, make sure the function properly sets TYPE_STUB_DECL() on
28750         the newly created typedef variant type.
28751         (is_typedef_decl ): New entry point.
28752         * tree.h: Added a new member member_types_needing_access_check to
28753         struct tree_decl_non_common.
28754         (set_underlying_type): New entry point.
28755         (is_typedef_type): Likewise.
28757 2009-01-21  Bingfeng Mei  <bmei@broadcom.com>
28759         * alias.c (walk_mems_1, walk_mems_2, insn_alias_sets_conflict_p):
28760         Check whether two instructions have memory references that
28761         belong to conflicting alias sets.  walk_mems_1 and walk_mems_2
28762         are helper functions for traversing.
28763         * alias.h (insn_alias_sets_confilict_p): New prototypes.
28764         * ddg.c (add_inter_loop_mem_dep): Call insn_alias_sets_conflict_p
28765         not to draw dependency edge for instructions with non-conflicting
28766         alias sets.
28768 2009-01-20  Joseph Myers  <joseph@codesourcery.com>
28770         PR other/38758
28771         * longlong.h: Update copyright years.  Use soft-fp license notice.
28772         Sync __clz_tab declaration with glibc.
28774 2009-01-20  Steve Ellcey  <sje@cup.hp.com>
28776         PR target/30687
28777         * doc/extend.texi (syscall_linkage): New.
28778         (version_id): Modify.
28780 2009-01-20  Andrew Pinski  <andrew_pinski@playstation.sony.com>
28781             Richard Guenther  <rguenther@suse.de>
28783         PR tree-optimization/38747
28784         PR tree-optimization/38748
28785         * tree-ssa-forwprop.c (forward_propagate_addr_expr_1): Disable the VCE
28786         conversion if the base address is an indirect reference and the
28787         aliasing sets could cause issues.
28789 2009-01-20  Sebastian Pop  <sebastian.pop@amd.com>
28791         * common.opt (fgraphite, fgraphite-identity): Add comment for
28792         explaining why these options are not documented.
28794 2009-01-20  Sebastian Pop  <sebastian.pop@amd.com>
28796         * graphite.c (stmt_simple_for_scop_p): Also handle cases when
28797         gimple_call_lhs is NULL.
28799 2009-01-20  Paolo Bonzini  <bonzini@gnu.org>
28801         PR target/38868
28802         * emit-rtl.c (adjust_address_1): Make sure memref is never
28803         overwritten.
28805 2009-01-20  Ben Elliston  <bje@au.ibm.com>
28807         * libgcov.c (__gcov_execl, __gcov_execlp, __gcov_execle): Remove
28808         const qualifier from arg parameter. Remove unnecessary cast to char *.
28809         * gcov-io.h (__gcov_execl, __gcov_execlp, __gcov_execle): Remove
28810         const qualifier from arg 2.
28812 2009-01-19  Iain Sandoe  <iain.sandoe@sandoe-acoustics.co.uk>
28814         * config/darwin.h: Add static-libgfortran to LINK_SPEC.
28816 2009-01-19  Vladimir Makarov  <vmakarov@redhat.com>
28818         PR c/38869
28819         * rtl.h (reinit_regs): New prototype.
28820         * regclass.c: Include ira.h.
28821         (reinit_regs): New.
28822         * Makefile.in (regclass.o): Add ira.h.
28823         * config/i386/i386.c (ix86_maybe_switch_abi): Use reinit_regs.
28825 2009-01-18  H.J. Lu  <hongjiu.lu@intel.com>
28827         PR target/38736
28828         * c-common.c (handle_aligned_attribute): Use
28829         ATTRIBUTE_ALIGNED_VALUE instead of BIGGEST_ALIGNMENT for
28830         default alignment value.
28832         * c-cppbuiltin.c (c_cpp_builtins): Define __BIGGEST_ALIGNMENT__.
28834         * defaults.h (ATTRIBUTE_ALIGNED_VALUE): New.
28835         * config/i386/i386.h (ATTRIBUTE_ALIGNED_VALUE): Likewise.
28837         * doc/extend.texi: Update __attribute__ ((aligned)).  Document
28838         __BIGGEST_ALIGNMENT__.
28840         * doc/tm.texi: Document ATTRIBUTE_ALIGNED_VALUE.
28842 2009-01-18  Richard Guenther  <rguenther@suse.de>
28844         PR tree-optimization/38819
28845         * tree-flow.h (operation_could_trap_helper_p): Declare.
28846         * tree-eh.c (operation_could_trap_helper_p): Export.
28847         * tree-ssa-sccvn.h (vn_nary_may_trap): Declare.
28848         * tree-ssa-sccvn.c (vn_nary_may_trap): New function.
28849         * tree-ssa-pre.c (insert_into_preds_of_block): Check if we
28850         are about to insert a possibly trapping instruction and fail
28851         in this case.
28853 2009-01-18  Andreas Schwab  <schwab@suse.de>
28855         * doc/install.texi (Configuration): Remove obsolete paragraph
28856         about use of --with-gnu-ld with --with-gnu-as.
28858 2009-01-18  Kazu Hirata  <kazu@codesourcery.com>
28860         * doc/extend.texi, doc/gimple.texi, doc/invoke.texi,
28861         doc/md.texi, doc/sourcebuild.texi, doc/tm.texi: Fix typos.
28862         Follow spelling conventions.
28864 2009-01-18  Ben Elliston  <bje@au.ibm.com>
28866         * bitmap.c (bitmap_obstack_alloc_stat): Adjust cast to eliminate
28867         C++ warning about implicit conversion from void * to struct
28868         bitmap_head_def *.
28869         (bitmap_obstack_free): Likewise for bitmap_element *.
28870         * Makefile.in (bitmap.o-warn): Remove.
28872 2009-01-17  Dave Korn  <dave.korn.cygwin@gmail.com>
28874         * Makefile.in (BACKENDLIBS):  Reorder to match dependencies.
28876 2009-01-17  Sebastian Pop  <sebastian.pop@amd.com>
28877             Tobias Grosser  <tobi.grosser@amd.com>
28879         * graphite.c (graphite_trans_scop_block): Do not block single
28880         nested loops.
28882 2009-01-16  Alexandre Oliva  <aoliva@redhat.com>
28884         * ebitmap.h (ebitmap_iter_init): Initialize all fields.
28885         * ipa-struct-reorg.c (gen_struct_type): Replace known-true
28886         test with assertion.
28888 2009-01-16  Richard Guenther  <rguenther@suse.de>
28890         PR tree-optimization/38835
28891         PR middle-end/36227
28892         * fold-const.c (fold_binary): Remove PTR + INT -> (INT)(PTR p+ INT)
28893         and INT + PTR -> (INT)(PTR p+ INT) folding.
28894         * tree-ssa-address.c (create_mem_ref): Properly use POINTER_PLUS_EXPR.
28896 2009-01-16  Adam Nemet  <anemet@caviumnetworks.com>
28898         PR target/38554
28899         * expmed.c (expand_shift): With SHIFT_COUNT_TRUNCATED, don't lift
28900         the subreg from a lowpart subreg if it is also casting the value.
28902 2009-01-16  Sebastian Pop  <sebastian.pop@amd.com>
28903             Tobias Grosser  <tobi.grosser@amd.com>
28905         * graphite.c (compare_prefix_loops): New.
28906         (build_scop_canonical_schedules): Rewritten.
28907         (graphite_transform_loops): Move build_scop_canonical_schedules
28908         after build_scop_iteration_domain.
28910 2009-01-16  Sebastian Pop  <sebastian.pop@amd.com>
28911             Tobias Grosser  <tobi.grosser@amd.com>
28913         * graphite.c (add_conditions_to_domain): Add the loops to
28914         the dimension of the iteration domain.  Do copy the domain
28915         only when it exists.
28916         (build_scop_conditions_1): Do not call add_conditions_to_domain.
28917         (add_conditions_to_constraints): New.
28918         (can_generate_code_stmt, can_generate_code): Removed.
28919         (gloog): Do not call can_generate_code.
28920         (graphite_transform_loops): Call add_conditions_to_constraints
28921         after building the iteration domain.
28923 2009-01-16  Jakub Jelinek  <jakub@redhat.com>
28925         PR tree-optimization/38789
28926         * tree-ssa-threadedge.c
28927         (record_temporary_equivalences_from_stmts_at_dest): Ignore calls to
28928         __builtin_constant_p.
28930 2009-01-16  Kenneth Zadeck  <zadeck@naturalbridge.com>
28932         * dce.c (delete_unmarked_insns): Reversed the order that insns are
28933         examined before deleting them.
28935 2009-01-16  Richard Earnshaw  <rearnsha@arm.com>
28937         * function.c (aggregate_value_p): Correctly extract the function
28938         type from CALL_EXPR_FN lookup.
28940 2009-01-16  Hariharan Sandanagobalane  <hariharan@picochip.com>
28942         * config/picochip/picochip.c (picochip_override_options): Revert
28943         CFI asm flag disable commited previously.
28945 2009-01-15  Sebastian Pop  <sebastian.pop@amd.com>
28946             Tobias Grosser  <tobi.grosser@amd.com>
28947             Jan Sjodin  <jan.sjodin@amd.com>
28949         * graphite.c (scan_tree_for_params): On substractions negate
28950         all the coefficients of the term.
28951         (clast_to_gcc_expression_red): New.  Handle reduction expressions
28952         of more than two operands.
28953         (clast_to_gcc_expression): Call clast_to_gcc_expression_red.
28954         (get_vdef_before_scop): Handle also the case of default definitions.
28956 2009-01-15  Richard Sandiford  <rdsandiford@googlemail.com>
28958         * caller-save.c (add_used_regs_1, add_used_regs): New functions.
28959         (insert_one_insn): Use them instead of REG_DEAD and REG_INC notes.
28960         Also use them when walking CALL_INSN_FUNCTION_USAGE.
28962 2009-01-15  H.J. Lu  <hongjiu.lu@intel.com>
28963             Joey Ye  <joey.ye@intel.com>
28965         PR middle-end/37843
28966         * cfgexpand.c (expand_stack_alignment): Don't update stack
28967         boundary nor check incoming stack boundary here.
28968         (gimple_expand_cfg): Update stack boundary and check incoming
28969         stack boundary here.
28971 2009-01-15  Kenneth Zadeck  <zadeck@naturalbridge.com>
28973         * dce.c (find_call_stack_args, delete_unmarked_insns): Fixed comments.
28975 2009-01-14  Jakub Jelinek  <jakub@redhat.com>
28977         PR rtl-optimization/38245
28978         * calls.c (expand_call): Add stack arguments to
28979         CALL_INSN_FUNCTION_USAGE even for pure calls (when
28980         ACCUMULATE_OUTGOING_ARGS) and even for args partially passed
28981         in regs and partially in memory or BLKmode arguments.
28982         (emit_library_call_value_1): Add stack arguments to
28983         CALL_INSN_FUNCTION_USAGE even for pure calls (when
28984         ACCUMULATE_OUTGOING_ARGS).
28985         * dce.c: Include tm_p.h.
28986         (find_call_stack_args): New function.
28987         (deletable_insn_p): Call it for CALL_P insns.  Add ARG_STORES
28988         argument.
28989         (mark_insn): Call find_call_stack_args for CALL_Ps.
28990         (prescan_insns_for_dce): Walk insns backwards in bb rather than
28991         forwards.  Allocate and free arg_stores bitmap if needed, pass it
28992         down to deletable_insn_p, don't mark stores set in arg_stores
28993         bitmap, clear the bitmap at the beginning of each bb.
28994         * Makefile.in (dce.o): Depend on $(TM_P_H).
28996 2009-01-14  Michael Meissner  <gnu@the-meissners.org>
28998         PR target/22599
28999         * config/i386/i386.c (print_operand): Add tests for 'D', 'C', 'F', 'f'
29000         to make sure the insn is a conditional test (bug 22599).  Reformat a
29001         few long lines.
29003 2009-01-14  Sebastian Pop  <sebastian.pop@amd.com>
29005         PR middle-end/38431
29006         * graphite.c (get_vdef_before_scop, scop_adjust_vphi): New.
29007         (scop_adjust_phis_for_liveouts): Call scop_adjust_vphi.
29008         (gloog): Do not call cleanup_tree_cfg.
29009         (graphite_transform_loops): Call cleanup_tree_cfg after all
29010         scops have been code generated.
29012 2009-01-14  Basile Starynkevitch  <basile@starynkevitch.net>
29013         * doc/gty.texi (Invoking the garbage collector): Added new node
29014         and section documenting ggc_collect.
29016 2009-01-14  Richard Guenther  <rguenther@suse.de>
29018         PR tree-optimization/38826
29019         PR middle-end/38477
29020         * tree-ssa-structalias.c (emit_alias_warning): Emit the pointer
29021         initialization notes only if we actually emitted a warning.
29022         (intra_create_variable_infos): Add constraints for a result decl
29023         that is passed by hidden reference.
29024         (build_pred_graph): Mark all related variables non-direct on
29025         address-taking.
29027 2009-01-14  Nick Clifton  <nickc@redhat.com>
29029         * ira-conflicts.c: Include addresses.h for the definition of
29030         base_reg_class.
29031         (ira_build_conflicts): Use base_reg_class instead of BASE_REG_CLASS.
29032         * Makefile.in: Add a dependency of ira-conflicts.o on addresses.h.
29034 2009-01-13  Vladimir Makarov  <vmakarov@redhat.com>
29036         PR target/38811
29037         * Makefile.in (ira-lives.o): Add except.h.
29039         * ira-lives.c: Include except.h.
29040         (process_bb_node_lives): Process can_throw_internal.
29042 2009-01-13  Jakub Jelinek  <jakub@redhat.com>
29044         PR rtl-optimization/38774
29045         * combine.c (simplify_set): When undoing cc_use change, don't do
29046         PUT_CODE on the newly created comparison, but instead put back the
29047         old comparison.
29049 2009-01-13  Joseph Myers  <joseph@codesourcery.com>
29051         * doc/invoke.texi (ARM Options): Update lists of -mcpu and -march
29052         values.  Remove duplicate arm8 entry.
29054 2009-01-13  Sebastian Pop  <sebastian.pop@amd.com>
29056         PR tree-optimization/38786
29057         * graphite.c (expand_scalar_variables_ssa_name): New, outlined from
29058         the SSA_NAME case of expand_scalar_variables_expr.
29059         Set the type of an expression to the type of its assign statement.
29060         (expand_scalar_variables_expr): Also gather the scalar computation
29061         used to index the memory access.  Do not pass loop_p.
29062         Fix comment.  Stop recursion on tcc_constant or tcc_declaration.
29063         (expand_scalar_variables_stmt): Pass to expand_scalar_variables_expr
29064         the gimple_stmt_iterator where it inserts new code.
29065         Do not pass loop_p.
29066         (copy_bb_and_scalar_dependences): Do not pass loop_p.
29067         (translate_clast): Update call to copy_bb_and_scalar_dependences.
29069 2009-01-13  Sebastian Pop  <sebastian.pop@amd.com>
29071         * graphite.h (debug_value): Removed.
29072         * graphite.c (debug_value): Removed.
29074 2009-01-13  Richard Earnshaw  <rearnsha@arm.com>
29076         * config/arm/arm.c (output_move_double): Don't synthesize thumb-2
29077         ldrd/strd with two 32-bit instructions.
29079 2009-01-13  Richard Earnshaw  <rearnsha@arm.com>
29081         * config/arm/arm.c (struct processors): Pass for speed down into
29082         cost helper functions.
29083         (const_ok_for_op): Handle COMPARE and inequality nodes.
29084         (arm_rtx_costs_1): Rewrite.
29085         (arm_size_rtx_costs): Update prototype.
29086         (arm_rtx_costs): Pass speed down to helper functions.
29087         (arm_slowmul_rtx_costs): Rework cost calculations.
29088         (arm_fastmul_rtx_costs, arm_xscale_rtx_costs): Likewise.
29089         (arm_9e_rtx_costs): Likewise.
29091 2009-01-13  Uros Bizjak  <ubizjak@gmail.com>
29093         * config/alpha/alpha.c (alpha_legitimate_address_p): Explicit
29094         relocations of local symbols wider than UNITS_PER_WORD are not valid.
29095         (alpha_legitimize_address): Do not split local symbols wider than
29096         UNITS_PER_WORD into HIGH/LO_SUM parts.
29098 2009-01-13  Danny Smith  <dannysmith@users.sourceforge.net>
29100         PR bootstrap/38580
29101         * gcc.c (process_command): Replace call to execvp with calls
29102         to pex_one and exit.
29104 2009-01-03  Anatoly Sokolov  <aesok@post.ru>
29106         PR target/29141
29107         * config/avr/t-avr (LIB1ASMFUNCS): Add _tablejump_elpm.
29108         * config/avr/libgcc.S (__do_global_ctors, __do_global_dtors): Add
29109         variant for devices with 3-byte PC.
29110         (__tablejump_elpm__): New.
29112 2009-01-12  Jakub Jelinek  <jakub@redhat.com>
29114         PR c/32041
29115         * c-parser.c (c_parser_postfix_expression): Allow `->' in
29116         offsetof member-designator, handle it as `[0].'.
29118 2009-01-12  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
29120         * pa.c (pa_asm_output_mi_thunk): Use pc-relative branch to thunk
29121         function when not using named sections on targets with named sections
29122         if branch distance is less than 262132.
29124 2009-01-12  Richard Earnshaw  <rearnsha@arm.com>
29126         * combine.c (combine_instructions):  Recompute
29127         optimize_this_for_speed_p  for each BB in the main combine loop.
29129 2009-01-12  Tomas Bily  <tbily@suse.cz>
29131         PR middlend/38385
29132         * tree-loop-distribution.c (prop_phis): New function.
29133         (generate_builtin): Call prop_phis.
29135 2009-01-12  Jakub Jelinek  <jakub@redhat.com>
29137         PR tree-optimization/38807
29138         * tree-ssa-reassoc.c (remove_visited_stmt_chain): Don't look at
29139         gimple_visited_p unless stmt is GIMPLE_ASSIGN.
29141 2009-01-11  Adam Nemet  <anemet@caviumnetworks.com>
29143         * expmed.c (store_bit_field_1): Properly truncate the paradoxical
29144         subreg of op0 to the original op0.
29146 2009-01-11  Laurent GUERBY  <laurent@guerby.net>
29148         * doc/sourcebuild.texi (Source Tree): Move up intl and fixinc.
29150 2009-01-11  Markus Schoepflin  <markus.schoepflin@comsoft.de>
29152         PR debug/7055
29153         * mips-tfile.c (parse_def): Fix parsing of def strings
29154         starting with digits.
29156 2009-01-10  Jakub Jelinek  <jakub@redhat.com>
29158         PR target/38695
29159         * config/arm/arm.c (arm_is_long_call_p): Don't call
29160         arm_function_in_section_p if decl isn't a FUNCTION_DECL.
29162 2009-01-09  Steven Bosscher  <steven@gcc.gnu.org>
29164         * regrename.c (regrename_optimize): Fix dumping.
29165         (find_oldest_value_reg): Preserve REG_POINTER.
29166         (copy_hardreg_forward_1): Likewise.
29168 2009-01-09  Diego Novillo  <dnovillo@google.com>
29170         * gimple.h (struct gimple_statement_base) <uid>: Document
29171         the restrictions on its use.
29172         (gimple_uid): Tidy.
29173         (gimple_set_uid): Tidy.
29175 2009-01-09  Jakub Jelinek  <jakub@redhat.com>
29177         * config/i386/i386.c (ix86_expand_movmem, ix86_expand_setmem): Add
29178         zero guard even if align_bytes != 0 and count is smaller than
29179         size_needed.
29181 2009-01-09  Vladimir Makarov  <vmakarov@redhat.com>
29183         PR rtl-optimization/38495
29184         * ira-emit.c (print_move_list, ira_debug_move_list): New functions.
29185         (add_range_and_copies_from_move_list): Print all added ranges.
29186         Add ranges to memory optimized destination.
29188 2009-01-09  Jakub Jelinek  <jakub@redhat.com>
29190         PR target/38686
29191         PR target/38708
29192         * config/i386/i386.c (override_options): Reject
29193         -mstringop-strategy=rep_8byte with -m32.
29194         (ix86_expand_movmem): For size_needed == 1 set epilogue_size_needed
29195         to 1.  Do count comparison against epilogue_size_needed at compile
29196         time even when count_exp was constant forced into register.  For
29197         size_needed don't jump to epilogue, instead just avoid aligning
29198         and invoke the body algorithm.  If need_zero_guard, add zero guard
29199         even if count is non-zero, but smaller than size_needed + number of
29200         bytes that could be stored for alignment.
29201         (ix86_expand_setmem): For size_needed == 1 set epilogue_size_needed
29202         to 1.  If need_zero_guard, add zero guard even if count is non-zero,
29203         but smaller than size_needed + number of bytes that could be stored
29204         for alignment.  Compare size_needed with epilogue_size_needed instead
29205         of desired_align - align, don't adjust size_needed, pass
29206         epilogue_size_needed to the epilogue expanders.
29208         PR c/35742
29209         * c-pretty-print.c (pp_c_expression): Handle GOTO_EXPR like BIND_EXPR.
29211 2009-01-09  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
29213         * pa.c (last_address): Change to unsigned.
29214         (update_total_code_bytes): Change argument to unsigned.  Don't
29215         check if insn addresses are set.
29216         (pa_output_function_epilogue): Set last_address to UINT_MAX if insn
29217         addresses are not set.
29218         (pa_asm_output_mi_thunk): Handle wrap when updating last_address.
29220 2009-01-09  Nick Clifton  <nickc@redhat.com>
29222         * config/sh/symbian.c: Replace uses of DECL_INLINE with
29223         DECL_DECLARED_INLINE_P.
29225 2009-01-09  Jakub Jelinek  <jakub@redhat.com>
29227         PR middle-end/38347
29228         * dojump.c (do_jump_by_parts_zero_rtx): Use mode instead of
29229         GET_MODE (op0) in operand_subword_force calls.
29231         PR middle-end/38771
29232         * fold-const.c (fold_unary): For COMPOUND_EXPR and COND_EXPR,
29233         fold_convert arg0 operands to TREE_TYPE (op0) first.
29235 2009-01-08  Vladimir Makarov  <vmakarov@redhat.com>
29237         * params.def (ira-max-conflict-table-size): Decrease default value
29238         to 1000.
29240 2009-01-08  Jakub Jelinek  <jakub@redhat.com>
29242         PR tree-optimization/37031
29243         * lambda-code.c (lambda_collect_parameters): Call pointer_set_destroy
29244         on parameter_set.
29245         (build_access_matrix): Reserve correct size for AM_MATRIX vector,
29246         allocate it using gc instead of heap, use VEC_quick_push instead of
29247         VEC_safe_push.
29248         * graphite.c (build_access_matrix): Allocate AM_MATRIX vector using gc
29249         instead of heap, use VEC_quick_push instead of VEC_safe_push.
29250         * tree-data-ref.h (struct access_matrix): Change matrix to gc
29251         allocated vector from heap allocated.
29252         * lambda.h: Add DEF_VEC_ALLOC_P for gc allocated lambda_vector.
29253         * tree-loop-linear.c (linear_transform_loops): Allocate nest
29254         vector only after perfect_loop_nest_depth call.
29256 2009-01-08  Sebastian Pop  <sebastian.pop@amd.com>
29257             Jan Sjodin  <jan.sjodin@amd.com>
29259         PR tree-optimization/38559
29260         * graphite.c (debug_value, copy_constraint,
29261         swap_constraint_variables, scale_constraint_variable, ): New.
29262         (get_lower_bound, get_upper_bound): Removed.
29263         (graphite_trans_bb_strip_mine): Clean up this code that works
29264         only for constant number of iterations.  Fully copy upper and
29265         lower bound constraints, not only the constant part of them.
29266         * graphite.h (debug_value): Declared.
29268 2009-01-08  Ira Rosen  <irar@il.ibm.com>
29270         PR tree-optimization/37194
29271         * tree-vect-transform.c (vect_estimate_min_profitable_iters):
29272         Don't add the cost of cost model guard in prologue to scalar
29273         outside cost in case of known number of iterations.
29275 2009-01-07  Nathan Froyd  <froydnj@codesourcery.com>
29276             Alan Modra  <amodra@bigpond.net.au>
29278         * config/rs6000/rs6000.c (rs6000_legitimize_address): Check for
29279         non-word-aligned REG+CONST addressing.
29281 2009-01-07  Uros Bizjak  <ubizjak@gmail.com>
29283         PR target/38706
29284         * config/alpha/alpha.c (alpha_end_function): For TARGET_ABI_OSF, call
29285         free_after_compilation when outputting a thunk.
29286         (alpha_output_mi_thunk_osf): Assert that we are processing a thunk.
29287         Do not call free_after_compilation here.
29289 2009-01-07  Uros Bizjak  <ubizjak@gmail.com>
29291         * config/i386/i386.c (ix86_target_string): Use ARRAY_SIZE.
29292         (ix86_valid_target_attribute_inner_p): Ditto.
29294 2009-01-07  Jan Sjodin  <jan.sjodin@amd.com>
29296         PR tree-optimization/38492
29297         PR tree-optimization/38498
29298         * tree-check.c (operator_is_linear, scev_is_linear_expression): New.
29299         * tree-chrec.h (scev_is_linear_expression): Declared.
29300         * graphite.c (graphite_cannot_represent_loop_niter): New.
29301         (scopdet_basic_block_info): Call graphite_cannot_represent_loop_niter.
29302         (graphite_loop_normal_form): Use gcc_assert.
29303         (scan_tree_for_params): Use CASE_CONVERT.
29304         (phi_node_is_iv, bb_contains_non_iv_scalar_phi_nodes): New.
29305         (build_scop_conditions_1): Call bb_contains_non_iv_scalar_phi_nodes.
29306         Use gcc_assert.  Discard scops that contain unhandled cases.
29307         (build_scop_conditions): Return a boolean status for unhandled cases.
29308         (strip_mine_profitable_p): Print the loop number, not its depth.
29309         (is_interchange_valid): Pass the depth of the loop nest, don't
29310         recompute it wrongly.
29311         (graphite_trans_bb_block): Same.
29312         (graphite_trans_bb_block): Print tentative of loop blocking.
29313         (graphite_trans_scop_block): Do not print that the loop has been
29314         blocked.
29315         (graphite_transform_loops): Do not handle scops that contain condition
29316         scalar phi nodes.
29318 2009-01-07  H.J. Lu  <hongjiu.lu@intel.com>
29320         AVX Programming Reference (December, 2008)
29321         * config/i386/avxintrin.h (_mm256_stream_si256): New.
29322         (_mm256_stream_pd): Likewise.
29323         (_mm256_stream_ps): Likewise.
29325         * config/i386/i386.c (ix86_builtins): Add IX86_BUILTIN_MOVNTDQ256,
29326         IX86_BUILTIN_MOVNTPD256 and IX86_BUILTIN_MOVNTPS256.
29327         (ix86_special_builtin_type): Add VOID_FTYPE_PV4DI_V4DI.
29328         (bdesc_special_args): Add __builtin_ia32_movntdq256,
29329         __builtin_ia32_movntpd256 and __builtin_ia32_movntps256.
29330         (ix86_init_mmx_sse_builtins): Handle VOID_FTYPE_PV4DI_V4DI.
29331         (ix86_expand_special_args_builtin): Likewise.
29333         * config/i386/sse.md (AVXMODEDI): New.
29334         (avx_movnt<mode>): Likewise.
29335         (avx_movnt<mode>): Likewise.
29336         (<sse>_movnt<mode>): Remove AVX support.
29337         (sse2_movntv2di): Likewise.
29339 2009-01-07  Richard Guenther  <rguenther@suse.de>
29341         PR middle-end/38751
29342         * fold-const.c (extract_muldiv): Remove obsolete comment.
29343         (fold_plusminus_mult_expr): Undo MINUS_EXPR
29344         to PLUS_EXPR canonicalization for the canonicalization.
29346 2009-01-07  Gerald Pfeifer  <gerald@pfeifer.com>
29348         * doc/install.texi (alpha*-dec-osf*): Remove note on 32-bit
29349         hosted cross-compilers generating less efficient code.
29351 2009-01-06  Richard Sandiford  <rdsandiford@googlemail.com>
29353         * function.h (rtl_data): Add a dbr_scheduled_p field.
29354         * reorg.c (dbr_schedule): Set it.
29355         (gate_handle_delay_slots): Check it.
29356         * config/mips/mips.c (mips_base_delayed_branch): Delete.
29357         (mips_reorg): Check flag_delayed_branch instead of
29358         mips_base_delayed_branch.
29359         (mips_override_options): Don't set mips_base_delayed_branch
29360         or flag_delayed_branch.
29362 2009-01-06  Richard Sandiford  <rdsandiford@googlemail.com>
29364         PR rtl-optimization/38426.
29365         * ira.c (ira): Set current_function_is_leaf earlier.
29367 2009-01-06  Jakub Jelinek  <jakub@redhat.com>
29369         PR rtl-optimization/38722
29370         * combine.c (try_combine): Don't modify PATTERN (i3) and notes
29371         too early, only set a flag and modify after last possible
29372         undo_all point.
29374 2009-01-06  Janis Johnson  <janis187@us.ibm.com>
29376         PR c/34252
29377         * ginclude/float.h: Rename DECnn_DEN to DECnn_SUBNORMAL_MIN.
29378         * real.c (decimal_single_format): Correct values of emin and emax.
29379         (decimal_double_format): Ditto.
29380         (decimal_quad_format): Ditto.
29381         * c-cppbuiltin.c (builtin_define_decimal_float_constants): Adjust
29382         computation of DECnn_MIN and DECnn_MAX for corrected values of
29383         emin and emax.  Define __DECnn_SUBNORMAL_MIN__ instead of
29384         __DECnn_MIN__, and adjust its computation for the corrected value
29385         of emin.
29387 2009-01-06  Jan Hubicka  <jh@suse.cz>
29389         PR target/38744
29390         * config/i386/i386.c (ix86_expand_call): Use ARRAY_SIZE.
29392 2009-01-06  Gerald Pfeifer  <gerald@pfeifer.com>
29394         * doc/contrib.texi (Contributors): Slightly adjust the end note.
29395         Add Robert Clark to the list of testers.
29397 2009-01-06  Jan Hubicka  <jh@suse.cz>
29398             Kai Tietz  <kai.tietz@onevision.com>
29400         * config/i386/i386.md (*msabi_syvabi): Add SSE regs clobbers.
29401         * config/i386/i386.c (ix86_expand_call): Add clobbers.
29403 2009-01-06  Jan Hubicka  <jh@suse.cz>
29404             Kai Tietz  <kai.tietz@onevision.com>
29406         * config/i386/i386.h (CONDITIONAL_CALL_USAGE): SSE regs are not used
29407         for w64 ABI.
29408         * config/i386/i386.c (struct ix86_frame): Add padding0 and nsseregs.
29409         (ix86_nsaved_regs): Count only general purpose regs.
29410         (ix86_nsaved_sseregs): New.
29411         (ix86_compute_frame_layout): Update nsseregs; set preferred alignment
29412         to 16 for w64; compute padding and size of sse reg save area.
29413         (ix86_emit_save_regs, ix86_emit_save_regs_using_mov): Save only
29414         general purpose regs.
29415         (ix86_emit_save_sse_regs_using_mov): New.
29416         (ix86_expand_prologue): Save SSE regs if needed.
29417         (ix86_emit_restore_regs_using_mov): Use only general purpose regs.
29418         (ix86_emit_restore_sse_regs_using_mov): New.
29419         (ix86_expand_epilogue): Save SSE regs if needed.
29421 2009-01-06  Jan Hubicka  <jh@suse.cz>
29422             Kai Tietz  <kai.tietz@onevision.com>
29424         * config/i386/i386.h (ACCUMULATE_OUTGOING_ARGS): Enable for MSABI
29425         * config/i386/i386.c (init_cumulative_args): Disallow calls of MSABI
29426         functions when accumulate outgoing args is off.
29428 2009-01-06  H.J. Lu  <hongjiu.lu@intel.com>
29430         PR bootstrap/38742
29431         * ira-color.c (ira_reuse_stack_slot): Check ENABLE_IRA_CHECKING
29432         before using pseudos_have_intersected_live_ranges_p.
29434         * ira-int.h (ira_assert): Always define.
29436 2009-01-06  H.J. Lu  <hongjiu.lu@intel.com>
29438         AVX Programming Reference (December, 2008)
29439         * config/i386/avxintrin.h (_mm_permute2_pd): Removed.
29440         (_mm256_permute2_pd): Likewise.
29441         (_mm_permute2_ps): Likewise.
29442         (_mm256_permute2_ps): Likewise.
29443         * config/i386/i386.md (UNSPEC_VPERMIL2): Likewise.
29444         * config/i386/sse.md (avx_vpermil2<mode>3): Likewise.
29446         * config/i386/i386.c (ix86_builtins): Remove
29447         IX86_BUILTIN_VPERMIL2PD, IX86_BUILTIN_VPERMIL2PS,
29448         IX86_BUILTIN_VPERMIL2PD256 and IX86_BUILTIN_VPERMIL2PS256.
29449         (ix86_builtin_type): Remove V8SF_FTYPE_V8SF_V8SF_V8SI_INT,
29450         V4DF_FTYPE_V4DF_V4DF_V4DI_INT, V4SF_FTYPE_V4SF_V4SF_V4SI_INT
29451         and V2DF_FTYPE_V2DF_V2DF_V2DI_INT.
29452         (bdesc_args): Remove __builtin_ia32_vpermil2pd,
29453         __builtin_ia32_vpermil2ps, __builtin_ia32_vpermil2pd256 and
29454         __builtin_ia32_vpermil2ps256.
29455         (ix86_init_mmx_sse_builtins): Updated.
29456         (ix86_expand_args_builtin): Likewise.
29458 2009-01-05  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
29460         * pa.c (output_call): Relocate non-jump insns in the delay slot of
29461         long absolute calls when generating PA 2.0 code.
29463 2009-01-05  Vladimir Makarov  <vmakarov@redhat.com>
29465         PR rtl-optimization/38583
29466         * params.h (IRA_MAX_CONFLICT_TABLE_SIZE): New macro.
29468         * params.def (ira-max-conflict-table-size): New.
29470         * doc/invoke.texi (ira-max-conflict-table-size): Decribe.
29472         * ira.h (ira_conflicts_p): New external definition.
29474         * ira-conflicts.c (build_conflict_bit_table): Do not build too big
29475         table.  Report this.  Return result of building.
29476         (ira_build_conflicts): Use ira_conflicts_p.  Check result of
29477         building conflict table.
29479         * ira-color.c (fast_allocation): Use num instead of ira_allocnos_num.
29480         (ira_color): Use ira_conflicts_p.
29482         * global.c: Include ira.h.
29483         (pseudo_for_reload_consideration_p, build_insn_chain): Use
29484         ira_conflicts_p.
29486         * Makefile.in (global.o): Add ira.h.
29488         * ira-build.c (mark_all_loops_for_removal,
29489         propagate_some_info_from_allocno): New.
29490         (remove_unnecessary_allocnos): Call
29491         propagate_some_info_from_allocno.
29492         (remove_low_level_allocnos): New.
29493         (remove_unnecessary_regions): Add parameter.  Call
29494         mark_all_loops_for_removal and remove_low_level_allocnos.  Pass
29495         parameter to remove_unnecessary_regions.
29496         (ira_build): Remove all regions but root if the conflict table was
29497         not built.  Update conflict hard regs for allocnos crossing calls.
29499         * ira.c (ira_conflicts_p): New global.
29500         (ira): Define and use ira_conflicts_p.
29502         * reload1.c (compute_use_by_pseudos, reload, count_pseudo,
29503         count_spilled_pseudo, find_reg, alter_reg, finish_spills,
29504         emit_input_reload_insns, delete_output_reload): Use ira_conflicts_p.
29506 2009-01-06  Ben Elliston  <bje@au.ibm.com>
29508         * gengtype-lex.l (YY_NO_INPUT): Define.
29510 2009-01-05  Andrew Pinski  <andrew_pinski@playstation.sony.com>
29512         PR c/34911
29513         * c-common.c (handle_vector_size_attribute): Also reject
29514         BOOLEAN_TYPE types.
29516 2009-01-05  Sebastian Pop  <sebastian.pop@amd.com>
29518         PR tree-optimization/38492
29519         * graphite.c (rename_map_elt, debug_rename_elt,
29520         debug_rename_map_1, debug_rename_map, new_rename_map_elt,
29521         rename_map_elt_info, eq_rename_map_elts,
29522         get_new_name_from_old_name, bb_in_sese_p): Moved around.
29523         (sese_find_uses_to_rename_use): Renamed sese_build_livein_liveouts_use.
29524         (sese_find_uses_to_rename_bb): Renamed sese_build_livein_liveouts_bb.
29525         (sese_build_livein_liveouts): New.
29526         (new_sese, free_sese): New.
29527         (new_scop): Call new_sese.
29528         (free_scop): Call free_sese.
29529         (rename_variables_from_edge, rename_phis_end_scop): Removed.
29530         (register_old_new_names): Renamed register_old_and_new_names.
29531         (register_scop_liveout_renames, add_loop_exit_phis,
29532         insert_loop_close_phis, struct igp,
29533         default_liveout_before_guard, add_guard_exit_phis,
29534         insert_guard_phis, copy_renames): New.
29535         (translate_clast): Call insert_loop_close_phis and insert_guard_phis.
29536         (sese_add_exit_phis_edge): Renamed scop_add_exit_phis_edge.
29537         (rewrite_into_sese_closed_ssa): Renamed scop_insert_phis_for_liveouts.
29538         (scop_adjust_phis_for_liveouts): New.
29539         (gloog): Call scop_adjust_phis_for_liveouts.
29541         * graphite.h (struct sese): Documented.  Added fields liveout,
29542         num_ver and livein.
29543         (SESE_LIVEOUT, SESE_LIVEIN, SESE_LIVEIN_VER, SESE_NUM_VER): New.
29544         (new_sese, free_sese, sese_build_livein_liveouts): Declared.
29545         (struct scop): Added field liveout_renames.
29546         (SCOP_LIVEOUT_RENAMES): New.
29548 2009-01-05  Harsha Jagasia  <harsha.jagasia@amd.com>
29550         PR tree-optimization/38510
29551         * graphite.c (recompute_all_dominators): Call mark_irreducible_loops.
29552         (translate_clast): Call recompute_all_dominators before
29553         graphite_verify.
29554         (gloog): Call recompute_all_dominators before graphite_verify.
29556 2009-01-05  Harsha Jagasia  <harsha.jagasia@amd.com>
29557             Jan Sjodin  <jan.sjodin@amd.com>
29559         PR tree-optimization/38500
29560         * graphite.c (create_sese_edges): Call fix_loop_structure after
29561         splitting blocks.
29563 2009-01-05  Joel Sherrill  <joel.sherrill@oarcorp.com>
29565         * config.gcc: Add m32r*-*-rtems*.
29566         * config/m32r/rtems.h: New file.
29568 2009-01-05  Ben Elliston  <bje@au.ibm.com>
29570         * Makefile.in (.po.gmo): Use mkinstalldirs, not test -d || mkdir.
29571         (.po.pox): Likewise.
29572         (po/gcc.pot): Likewise.
29574 2009-01-04  David S. Miller  <davem@davemloft.net>
29576         * config/sparc/sparc.h (SECONDARY_MEMORY_NEEDED_RTX): Delete.
29577         (STARTING_FRAME_OFFSET): Always set to zero.
29579 2009-01-04  Richard Sandiford  <rdsandiford@googlemail.com>
29581         * tree.def (LSHIFT_EXPR, RSHIFT_EXPR): Add commentary.
29582         * tree-cfg.c (verify_gimple_assign_binary): Allow shifts of
29583         fixed-point types, and vectors of the same.
29585 2009-01-04  Richard Sandiford  <rdsandiford@googlemail.com>
29587         * config/mips/sync.md (*mb_barrier): Rename to...
29588         (*memory_barrier): ...this.
29590 2009-01-04  Jonathan Wakely  <jwakely.gcc@gmail.com>
29592         * doc/extend.texi (Function Attributes): Move @cindex after @item
29593         for 'artificial' and 'flatten'. Fix grammar for 'externally_visible'
29594         and put in alphabetical order. Fix 'target' name and put in order.
29595         * doc/invoke.texi (-Wstrict-null-sentinel, -fipa-matrix-reorg): Fix
29596         typos.
29598 2009-01-04  Uros Bizjak  <ubizjak@gmail.com>
29600         * config/s390/s390.md (UNSPEC_MB): Rename from UNSPECV_MB.
29601         (memory_barrier): Expand as unspec instead of unspec_volatile.
29602         Remove mem:BLK from insn operands.  Use Pmode scratch register.
29603         (*memory_barrier): Define as unspec instead of unspec_volatile.
29604         Use (match_dup 0) as input operand.
29606         * config/sparc/sparc.md (UNSPEC_MEMBAR): Rename from UNSPECV_MEMBAR.
29607         * config/sparc/sync.md (memory_barrier): Expand as unspec instead of
29608         unspec_volatile.  Remove mem:BLK from insn operands.  Use Pmode
29609         scratch register.  Remove operand 1.
29610         (*stbar): Define as unspec instead of unspec_volatile.
29611         Use (match_dup 0) as input operand, remove (const_int 8).
29612         (*membar): Define as unspec instead of unspec_volatile.
29613         Use (match_dup 0) as input operand, remove input operand 2.
29615         * config/xtensa/xtensa.md (UNSPEC_MEMW): Rename from UNSPECV_MEMW.
29616         (memory_barrier): Expand as unspec instead of unspec_volatile.
29617         Remove mem:BLK from insn operands.  Use Pmode scratch register.
29618         (*memory_barrier): Define as unspec instead of unspec_volatile.
29619         Use (match_dup 0) as input operand.
29621         * config/ia64/sync.md (memory_barrier): Redefine as expander pattern.
29622         Remove mem:BLK from insn operands.  Use Pmode scratch register.
29623         Set volatile flag on operand 0.
29624         (*memory_barrier): New insn pattern.
29626         * config/rs6000/sync.md (memory_barrier): Remove mem:BLK from
29627         insn operands.
29628         (*memory_barrier): Use (match_dup 0) as input operand.
29630         * config/mips/sync.md (memory_barrier): Redefine as expander pattern.
29631         Remove mem:BLK from insn operands.  Use Pmode scratch register.
29632         Set volatile flag on operand 0.
29633         (*mb_internal): New insn pattern.
29635         * config/alpha/sync.md (*memory_barrier): Rename from *mb_internal.
29637 2009-01-04  Steven Bosscher  <steven@gcc.gnu.org>
29639         PR middle-end/38586
29640         * function.c (struct temp_slot): Move to the section of the file
29641         that deals with temp slots.  Remove field 'address'.
29642         (temp_slot_address_table): New hash table of address -> temp slot.
29643         (struct temp_slot_address_entry): New struct, items for the table.
29644         (temp_slot_address_compute_hash, temp_slot_address_hash,
29645         temp_slot_address_eq, insert_temp_slot_address): Support functions
29646         for the new table.
29647         (find_temp_slot_from_address): Rewrite to use the new hash table.
29648         (remove_unused_temp_slot_addresses): Remove addresses of temp
29649         slots that have been made available.
29650         (remove_unused_temp_slot_addresses_1): Call-back for htab_traverse,
29651         worker function for remove_unused_temp_slot_addresses.
29652         (assign_stack_temp_for_type): Don't clear the temp slot address list.
29653         Add the temp slot address to the address -> temp slot map.
29654         (update_temp_slot_address): Update via insert_temp_slot_address.
29655         (free_temp_slots): Call remove_unused_temp_slot_addresses.
29656         (pop_temp_slots): Likewise.
29657         (init_temp_slots): Allocate the address -> temp slot map, or empty
29658         the map if it is already allocated.
29659         (prepare_function_start): Initialize temp slot processing.
29661 2009-01-04  Steven Bosscher  <steven@gcc.gnu.org>
29663         PR middle-end/38584
29664         * cfgexpand.c (estimate_stack_frame_size): Simplify the estimate:
29665         Calculate the size of all stack vars assuming no packing of stack
29666         vars will happen, replacing a quadratic algorithm with a linear one.
29668 2009-01-03  Jakub Jelinek  <jakub@redhat.com>
29670         PR target/38707
29671         * expmed.c (store_bit_field_1): Don't modify op0 if movstrict insn
29672         can't be used.
29674 2009-01-03  Diego Novillo  <dnovillo@google.com>
29676         * doc/contrib.texi: Update contributions.
29678 2009-01-03  Jakub Jelinek  <jakub@redhat.com>
29680         PR c++/38705
29681         * builtins.c (fold_builtin_memory_op): Give up if either operand
29682         is volatile.  Set srctype or desttype to non-qualified version
29683         of the other type.
29685         PR c/38700
29686         * builtins.c (fold_builtin_expect): Only check DECL_WEAK for VAR_DECLs
29687         and FUNCTION_DECLs.
29689 2009-01-02  Kenneth Zadeck  <zadeck@naturalbridge.com>
29691         PR rtl-optimization/35805
29692         * df-problems.c (df_lr_finalize): Add recursive call to resolve lr
29693         problem if fast dce is able to remove any instructions.
29694         * dce.c (dce_process_block): Fix dump message.
29696 2009-01-02  Mark Mitchell  <mark@codesourcery.com>
29698         PR 33649
29699         * tree-ssa-pre.c (compute_antic): Correct loop bounds.
29701 2009-01-02  Jakub Jelinek  <jakub@redhat.com>
29703         PR middle-end/38690
29704         * tree-flow.h (op_code_prio, op_prio): New prototypes.
29705         * tree-pretty-print.c (op_code_prio): New function.
29706         (op_prio): No longer static.  Use op_code_prio.
29707         * gimple-pretty-print.c (dump_unary_rhs, dump_binary_rhs):
29708         Use op_prio and op_code_prio to determine if () should be
29709         printed around operand(s) or not.
29711         * gimple-pretty-print.c (dump_unary_rhs, dump_binary_rhs,
29712         dump_gimple_call, dump_gimple_switch, dump_gimple_cond,
29713         dump_gimple_label, dump_gimple_try, dump_symbols, dump_gimple_phi,
29714         dump_gimple_mem_ops, dump_bb_header, dump_bb_end, pp_cfg_jump): Use
29715         pp_character instead of pp_string for single letter printing.
29717 2009-01-02  Richard Sandiford  <rdsandiford@googlemail.com>
29719         * doc/extend.texi: Fix '#pragma GCC option' typo.
29721 2009-01-02  Richard Guenther  <rguenther@suse.de>
29723         * doc/install.texi (--enable-checking): Mention different
29724         default for stage1.
29725         (--enable-stage1-checking): Document.
29727 2009-01-01  Andrew Pinski  <pinskia@gmail.com>
29729         PR middle-end/30142
29730         * tree-cfg.c (verify_expr): Add INDIRECT_REF case.  Change MODIFY_EXPR
29731         case to be an error.
29733 2009-01-02  Ben Elliston  <bje@au.ibm.com>
29735         * config/fp-bit.h (pack_d): Constify argument.
29736         * config/fp-bit.c (makenan): Constify return type. Remove casts.
29737         (isnan): Constify argument.
29738         (isinf): Likewise.
29739         (iszero): Likewise.
29740         (pack_d): Likewise.
29741         (_fpadd_parts): Constify return type.
29742         (_fpmul_parts): Likewise.
29743         (_fpdiv_parts): Likewise.
29745 2009-01-01  Jakub Jelinek  <jakub@redhat.com>
29747         PR c/36489
29748         * c-typeck.c (add_pending_init): Add IMPLICIT argument.  Only
29749         warn about overwriting initializer with side-effects or
29750         -Woverride-init if !IMPLICIT.
29751         (output_init_element): Likewise.  Pass IMPLICIT down to
29752         add_pending_init.
29753         (process_init_element): Add IMPLICIT argument.  Pass it down
29754         to output_init_element.
29755         (push_init_element, pop_init_level, set_designator): Adjust
29756         process_init_element callers.
29757         (set_nonincremental_init, set_nonincremental_init_from_string):
29758         Adjust add_pending_init callers.
29759         (output_pending_init_elements): Adjust output_init_element callers.
29760         * c-tree.h (process_init_element): Adjust prototype.
29761         * c-parser.c (c_parser_initelt, c_parser_initval): Adjust
29762         process_init_element callers.
29765 Copyright (C) 2009 Free Software Foundation, Inc.
29767 Copying and distribution of this file, with or without modification,
29768 are permitted in any medium without royalty provided the copyright
29769 notice and this notice are preserved.