2009-09-08 Segher Boessenkool <segher@kernel.crashing.org>
[official-gcc.git] / gcc / ChangeLog
blob43f4870be414b98dae3d4f681b1e73947a442542
1 2009-09-09  Segher Boessenkool  <segher@kernel.crashing.org>
3         * config/rs6000/rs6000.md (bswapdi2_64bit): Fix
4         unnecessarily stringent constraints.  Fix address
5         calculation in the splitters.
7 2009-09-09  Uros Bizjak  <ubizjak@gmail.com>
9         PR rtl-optimization/39779
10         * expr.c (convert_modes): Return when mode == oldmode after
11         CONST_INTs are processed.
13 2009-09-09  Kai Tietz  <kai.tietz@onevision.com>
15         PR/41315
16         * config/i386.c (ix86_can_use_return_insn_p): Check for padding0, too.
17         (ix86_expand_prologue): Take frame.padding0 into logic of
18         to_allocate checks.
19         (ix86_expand_epilogue): Likewise.
21 2009-09-09  Jakub Jelinek  <jakub@redhat.com>
23         * config/t-slibgcc-elf-ver (SHLIB_MAKE_SOLINK, SHLIB_INSTALL_SOLINK):
24         New variables.
25         (SHLIB_LINK, SHLIB_INSTALL): Use them.
26         * config/t-slibgcc-libgcc: New file.
27         * config.gcc (powerpc*-*-linux*, powerpc*-*-gnu*): Use it.
29 2009-09-09  Martin Jambor  <mjambor@suse.cz>
31         PR tree-optimization/41089
32         * tree-sra.c (find_var_candidates): Do not consider va_lists in
33         early SRA.
35 2009-09-09  Richard Henderson  <rth@redhat.com>
37         * gimple.h (CASE_GIMPLE_OMP): New.
38         (is_gimple_omp): Use it.
39         * tree-cfg.c (is_ctrl_altering_stmt): Likewise.
40         (verify_gimple_debug): Likewise.
42 2009-09-09  Richard Guenther  <rguenther@suse.de>
44         PR tree-optimization/41101
45         * tree-ssa-pre.c (maximal_set): Remove.
46         (compute_antic_aux): Treat the maximal set as implicitly all ones.
47         Defer all blocks we didn't visit at least one successor.
48         (add_to_exp_gen): Do not add to the maximal set.
49         (make_values_for_phi): Likewise.
50         (compute_avail): Likewise.
51         (init_pre): Do not allocate the maximal set.
52         (execute_pre): Do not dump it.
54 2009-09-09  Martin Jambor  <mjambor@suse.cz>
56         * tree-cfg.c (verify_gimple_phi): Check that gimple_phi_result is
57         an SSA_NAME rather than a is_gimple_variable.
59 2009-09-09  Richard Guenther  <rguenther@suse.de>
61         PR middle-end/41317
62         * tree-ssa-ccp.c (maybe_fold_offset_to_component_ref): Remove
63         code dealing with plain pointer bases.
64         (maybe_fold_offset_to_reference): Likewise.
65         (maybe_fold_stmt_addition): Adjust.
67 2009-09-09  Richard Guenther  <rguenther@suse.de>
69         * tree.c (free_lang_data_in_type): Do not free the type variant
70         chains.
71         (free_lang_data): Merge char_type_node with its properly signed
72         variant.
73         (pass_ipa_free): Collect after freeing language specific data.
75 2009-09-09  Michael Matz  <matz@suse.de>
77         PR middle-end/41268
78         * cfgexpand.c (expand_gimple_stmt_1): Use an int for storing
79         SUBREG_PROMOTED_UNSIGNED_P, instead of a bool.
80         * rtl.h (struct rtx, SUBREG_PROMOTED_UNSIGNED_P): Update comments
81         to reflect reality.
83 2009-09-08  DJ Delorie  <dj@redhat.com>
85         * config/mep/mep.c (conversions[]): Add "ml" pattern.
87 2009-09-04  Jason Merrill  <jason@redhat.com>
89         * tree.c (tree_find_value): Remove.
90         * tree.h: Remove prototype.
91         * varasm.c (assemble_external): Use value_member instead.
93 2009-09-08  Alexandre Oliva  <aoliva@redhat.com>
95         * toplev.c (process_options): Choose default debugging type when
96         gtoggle enables debug info and type is unset.
98 2009-09-08  Alexandre Oliva  <aoliva@redhat.com>
100         PR debug/41276
101         PR debug/41307
102         * cselib.c (cselib_expand_value_rtx_1): Don't return copy of
103         invalid subreg.
105 2009-09-08  Alexandre Oliva  <aoliva@redhat.com>
107         * configure: Rebuilt with modified libtool.m4.
109 2009-09-08  Alexandre Oliva  <aoliva@redhat.com>
111         PR debug/41229
112         PR debug/41291
113         PR debug/41300
114         * tree-ssa.c (execute_update_addresses_taken): Update debug insns.
116 2009-09-08  Alexandre Oliva  <aoliva@redhat.com>
118         * tree-ssa-loop-ivopts.c (get_phi_with_result): Remove.
119         (remove_statement): Likewise.
120         (rewrite_use_nonlinear_expr): Adjust.
121         (remove_unused_ivs): Collect SSA NAMEs to remove and call...
122         * tree-ssa.c (release_defs_bitset): ... this.  New.
123         * tree-flow.h (release_defs_bitset): Declare.
125 2009-09-08  Alexandre Oliva  <aoliva@redhat.com>
127         PR debug/41232
128         * tree-ssa-phiopt.c (minmax_replacement): Skip debug stmts
129         in the middle block.
131 2009-09-08  Kai Tietz  <kai.tietz@onevision.com>
133         * tree-ssa-reassoc.c (find_operand_rank): Cast pointer
134         via intptr_t to long type.
135         (insert_operand_rank): Cast long type via intptr_t to
136         pointer type.
137         * genattrtab.c (RTL_HASH): Use intptr_t to cast from
138         pointer to scalar.
139         * c-pretty-print.c (pp_c_tree_decl_identifier): Cast
140         from pointer to unsigned via uintptr_t.
142         * configure.ac (GCC_STDINT_TYPES): Initialize intptr_t,
143         uintptr_t, HAVE_INTTYPES_H, HAVE_STDINT_H, HAVE_UINTPTR_T,
144         and HAVE_INTPTR_T.
145         * configure: Regenerated.
146         * config.in: Regenerated
147         * system.h (stdint.h): Add include.
148         (inttypes.h): Likewise.
149         * Makefile.in (aclocal): Add config/stdint.m4.
150         * aclocal.m4: Regenerated.
152 2009-09-08  Bernd Schmidt  <bernd.schmidt@analog.com>
154         * config/bfin/bfin.c (np_check_regno, np_after_branch): New static
155         variables.
156         (note_np_check_stores): New function.
157         (harmless_null_pointer_p): New function.
158         (trapping_loads_p): New args NP_REG and AFTER_NP_BRANCH.  Callers
159         changed.  Take into account whether we're in the shadow of a condjump
160         that tested NP_REG for NULL.
161         Lose all code that tested for SEQUENCEs.
162         (workaround_speculation): Avoid inserting NOPs for loads that are
163         either always executed or a NULL pointer.
165 2009-09-08  Jan Hubicka  <jh@suse.cz>
167         * doc/invoke.texi (early-inlining-insns): Reduce from 12 to 8.
168         * params.def (early-inlining-insns): Likewise.
170 2009-09-08  Jakub Jelinek  <jakub@redhat.com>
172         PR rtl-optimization/41239
173         * sched-int.h (struct deps): Add last_function_call_may_noreturn field.
174         * sched-rgn.c (deps_join): Join also last_function_call_may_noreturn
175         lists.
176         * sched-deps.c (sched_analyze_insn): Prevent moving trapping insns
177         across calls, as the calls might not always return normally.
178         (call_may_noreturn_p): New function.
179         (deps_analyze_insn): Update last_function_call_may_noreturn list.
180         (init_deps): Initialize it.
181         (remove_from_deps): Also remove calls from
182         last_function_call_may_noreturn list.
184 2009-09-07  Richard Henderson  <rth@redhat.com>
186         * tree-ssa-sccvn.c (vn_reference_lookup_3): Don't assume there are
187         more VR->OPERANDS than LHS operands.  Free LHS before returning.
189 2009-09-07  Bernd Schmidt  <bernd.schmidt@analog.com>
191         * config/bfin/bfin.md (UNSPEC_VOLATILE_STALL): New constant.
192         (attr "addrtype"): New member "spreg".
193         Use it if mem_spfp_address_operand is true for the address.
194         (attr "type"): New entry "stall".
195         (cpu_unit "load"): New.
196         (insn_reservations "load32", "loadp", "loadi"): Add reservation of
197         "load".
198         (insn_reservation "loadsp"): New.
199         (insn_reservation "load_stall1"): New.
200         (insn_reservation "load_stall3"): New.
201         (stall): New insn.
202         * config/bfin/predicates.md (const1_operand, const3_operand): New.
203         (mem_p_address_operand): Exclude stack and frame pointer based
204         addresses.
205         (mem_spfp_address_operand): New; match them here.
206         * config/bfin/bfin.c (add_sched_insns_for_speculation): New function.
207         (bfin_reorg): Call it if scheduling insns.
208         (bfin_gen_bundles): Remove dummy insns created by
209         add_sched_insns_for_speculation.
211         From Jie Zhang <jie.zhang@analog.com>:
212         * config/bfin/bfin-protos.h (enum bfin_cpu_type, bfin_cpu_type,
213         bfin_si_revision, bfin_workarounds): Move these ...
214         * config/bfin/bfin.h: ... here.
216         From Mike Frysinger  <michael.frysinger@analog.com>
217         * config/bfin/bfin-protos.h (bfin_cpu_type): Add BFIN_CPU_BF542M,
218         BFIN_CPU_BF544M, BFIN_CPU_BF547M, BFIN_CPU_BF548M, and BFIN_CPU_BF549M.
219         * config/bfin/bfin.c (bfin_cpus[]): Add 0.3 for bf542m, bf544m,
220         bf547m, bf548m, and bf549m.
221         * config/bfin/bfin.h (TARGET_CPU_CPP_BUILTINS): Define __ADSPBF542M__
222         for BFIN_CPU_BF542M, __ADSPBF544M__ for BFIN_CPU_BF544M,
223         __ADSPBF547M__ for BFIN_CPU_BF547M, __ADSPBF548M__ for
224         BFIN_CPU_BF548M, and __ADSPBF549M__ for BFIN_CPU_BF549M.
225         * config/bfin/t-bfin-elf (MULTILIB_MATCHES): Select bf532-none for
226         bf542m-none, bf544m-none, bf547m-none, bf548m-none, and bf549m-none.
227         * config/bfin/t-bfin-linux (MULTILIB_MATCHES): Likewise.
228         * config/bfin/t-bfin-uclinux (MULTILIB_MATCHES): Likewise.
229         * doc/invoke.texi (Blackfin Options): Document that -mcpu now accepts
230         bf542m, bf544m, bf547m, bf548m, and bf549m.
232         From Jie Zhang <jie.zhang@analog.com>:
233         * config/bfin/predicates.md (p_register_operand): New predicate.
234         (dp_register_operand): New predicate.
235         * config/bfin/bfin-protos.h (WA_05000074): Define.
236         (ENABLE_WA_05000074): Define.
237         * config/bfin/bfin.c (bfin_cpus[]): Add WA_05000074 for all cpus.
238         (bfin_gen_bundles): Put dsp32shiftimm instruction in slot[0].
239         * config/bfin/bfin.md (define_attr type): Add dsp32shiftimm.
240         (define_attr addrtype): Allow load/store register to be P register.
241         (define_attr storereg): New.
242         (define_cpu_unit anomaly_05000074): New.
243         (define_insn_reservation dsp32shiftimm): New.
244         (define_insn_reservation dsp32shiftimm_anomaly_05000074): New.
245         (define_insn_reservation loadp): Cannot use slot2.
246         (define_insn_reservation loadsp): Cannot use slot2.
247         (define_insn_reservation storep): Cannot use slot2. Does not
248         apply when working around 05000074.
249         (define_insn_reservation storep_anomaly_05000074): New.
250         (define_insn_reservation storei): Does not apply when working
251         around 05000074.
252         (define_insn_reservation storei_anomaly_05000074): New.
253         (define_attr length): Add dsp32shiftimm case.
254         (define_insn movsi_insn32, movsi_insv, ashlsi3_insn, ashrsi3,
255         ror_one, rol_one, lshrsi3, lshrpdi3, ashrpdi3, movhiv2hi_low,
256         movhiv2hi_high, composev2hi, packv2hi, movv2hi_hi,
257         ssashiftv2hi3, ssashifthi3, ssashiftsi3, lshiftv2hi3, lshifthi3):
258         Set type as dsp32shiftimm for dsp32shiftimm alternatives.
260 2009-09-07  Martin Jambor  <mjambor@suse.cz>
262         PR middle-end/41282
263         * tree-sra.c (create_artificial_child_access): Return NULL if
264         build_ref_for_offset fails.
265         (propagate_subacesses_accross_link): Allow build_ref_for_offset
266         and create_artificial_child_access to fail.
268 2009-09-06  Dmitry Gorbachev  <d.g.gorbachev@gmail.com>
270         PR c++/41214
271         * unwind-dw2.c (uw_init_context_1): Mark noinline.
272         * config/ia64/unwind-ia64.c (uw_init_context_1): Likewise.
273         * config/xtensa/unwind-dw2-xtensa.c (uw_init_context_1): Likewise.
275 2009-09-07  Bernd Schmidt  <bernd.schmidt@analog.com>
277         * config/bfin/bfin.c (bfin_optimize_loop): When creating a new basic
278         block, ensure it has an exit edge.  Emit a barrier after a jump.
280 2009-09-07  Nick Clifton  <nickc@redhat.com>
282         * gcc.c (this_is_linker_script): New variable.  Like
283         this_is_library_file but for the %T constructor.
284         (end_going_arg): If this_is_linker_script is set then locate the
285         script and insert a --script switch before it
286         (do_spec_2): Initialise this_is_linker_script.
287         (do_spec_1): Likewise.  Handle %T construct.
288         (eval_spec_function): Preserve this_is_linker_script.
289         * doc/invoke.texi: Document %T construct in spec files.
290         * config/m32c/m32c.h (LIB_SPEC): Use it.
292 2009-09-07  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
294         * rtl.h (PREFETCH_SCHEDULE_BARRIER_P): New macro.
295         * sched-deps.c (sched_analyze_2): Make prefetches a hard barrier
296         when volatile flag is set.
297         * doc/rtl.texi (PREFETCH_SCHEDULE_BARRIER_P): Add documentation pieces.
299 2009-09-06  Eric Botcazou  <ebotcazou@adacore.com>
301         PR bootstrap/41241
302         * combine-stack-adj.c (try_apply_stack_adjustment): Handle stores.
303         (combine_stack_adjustments_for_block): Allow insns between stack
304         adjustments and stores with corresponding pre-(dec|inc)rement or
305         pre-modify operation.
307 2009-09-06  Jakub Jelinek  <jakub@redhat.com>
309         PR bootstrap/41241
310         * combine-stack-adj.c (struct csa_memlist): Rename to...
311         (struct csa_reflist): ... this.  Rename mem field to ref.
312         (free_csa_memlist): Rename to...
313         (free_csa_reflist): ... this.
314         (record_one_stack_memref): Rename to...
315         (record_one_stack_ref): ... this.  Handle also REG_P.
316         (try_apply_stack_adjustment): Handle also REG_P.
317         (struct record_stack_memrefs_data): Rename to...
318         (struct record_stack_refs_data): ... this.  Rename memlist field to
319         reflist.
320         (record_stack_memrefs): Rename to...
321         (record_stack_refs): ... this.  For DEBUG_INSNs keep traversing
322         subexpressions instead of failing when a MEM contains SP references.
323         For SP itself in DEBUG_INSNs queue it also onto reflist chain.
324         (combine_stack_adjustments_for_block): Adjust for mem to ref renaming.
326 2009-09-06  Richard Guenther  <rguenther@suse.de>
328         PR middle-end/41144
329         * tree.c (build_array_type): Do not record types marked
330         with structural equality in the canonical type hashtable.
332 2009-09-06  Richard Guenther  <rguenther@suse.de>
334         PR middle-end/41261
335         * tree-ssa-alias.c (refs_may_alias_p_1): Bail out for function decls.
337 2009-09-05  Richard Guenther  <rguenther@suse.de>
339         PR middle-end/41181
340         * tree-ssa-ccp.c (maybe_fold_stmt_addition): Use the correct type.
342 2009-09-05  Richard Guenther  <rguenther@suse.de>
344         PR debug/41273
345         * tree-ssa-operands.c (get_tmr_operands): Pass through opf_no_vops.
347 2009-09-05  Richard Guenther  <rguenther@suse.de>
349         PR middle-end/41271
350         * tree-ssa.c (useless_type_conversion_p): Drop qualifiers
351         before comparing function argument types.
353 2009-09-05  Francois-Xavier Coudert  <fxcoudert@gcc.gnu.org>
355         PR target/41024
356         * config/i386/mingw-w64.h (ASM_SPEC): Pass -v instead of -V to
357         the assembler.
359 2009-09-04  Uros Bizjak  <ubizjak@gmail.com>
361         Revert:
362         2009-08-18  Uros Bizjak  <ubizjak@gmail.com>
364         * config/alpha/alpha.c (alpha_output_mi_thunk_osf): Allocate insn
365         locators before emit_insn is called.
367 2009-09-04  Vladimir Makarov  <vmakarov@redhat.com>
369         PR bootstrap/41241
370         * ira.c (update_equiv_reg): Revert my previous patch for the PR.
371         * reginfo.c (resize_reg_info): Call allocate_reg_info if necessary.
372         (reginfo_init): Don't call allocate_reg_info.
374 2009-09-04  Uros Bizjak  <ubizjak@gmail.com>
376         PR target/41262
377         * config/alpha/alpha.c (alpha_does_function_need_gp): Use
378         NONDEBUG_INSN_P instead of INSN_P.
380 2009-09-04  Alexandre Oliva  <aoliva@redhat.com>
382         PR debug/41225
383         * tree-vect-stmts.c (vect_stmt_relevant_p): Skip debug uses.
385 2009-09-04  Alexandre Oliva  <aoliva@redhat.com>
387         PR target/41252
388         * config/arm/vfp.md (*cmpdf_split_vfp): Fix src mode in the second
389         pattern of the split.
391 2009-09-04  Alexandre Oliva  <aoliva@redhat.com>
393         * toplev.c (process_options): Move setter of flag_var_tracking
394         before other tests that depend on it.  Move down setter of
395         flag_rename_registers.  Don't enable var-tracking-assignments
396         by default if selective scheduling is enabled.  Warn if both
397         are enabled.
399 2009-09-04  Alexandre Oliva  <aoliva@redhat.com>
401         * var-tracking.c (dv_is_decl_p): Adjust NULL behavior to match
402         comment.  Use switch statement to catch overlaps between rtx
403         and tree codes.  Accept FUNCTION_DECLs in addition to those in...
404         (IS_DECL_CODE): ... here. Remove.
405         (check_value_is_not_decl): Remove.
406         (dv_from_decl, dv_from_value): Check after conversion.
408 2009-09-04  Richard Guenther  <rguenther@suse.de>
410         PR middle-end/41257
411         * (cgraph_finalize_compilation_unit): Move finalizing aliases
412         after emitting tunks.  Move emitting thunks and ctors from ...
413         (cgraph_optimize): ... here.  Remove redundant
414         cgraph_analyze_functions.
415         * varasm.c (find_decl_and_mark_needed): Remove no longer
416         necessary check.
417         (finish_aliases_1): Adjust check for thunk aliases.
419 2009-09-04  Daniel Gutson  <dgutson@codesourcery.com>
421         * config/arm/arm.md (ctzsi2): Added braces
422         to avoid warning that broke booststrap.
424 2009-09-04  Martin Jambor  <mjambor@suse.cz>
426         PR tree-optimization/41112
427         * tree-sra.c (build_ref_for_offset_1): Signal that we cannot
428         handle variable-bounded arrays.
429         (expr_with_var_bounded_array_refs_p): New function.
430         (analyze_access_subtree): Call expr_with_var_bounded_array_refs_p.
432 2009-09-04  Wolfgang Gellerich  <gellerich@de.ibm.com>
434         * config/s390/2097.md: Removed two incorrect bypasses.
435         (z10_fsimpdf): Fixed latency.
436         (z10_fhex): New insn_reservation.
437         (z10_floaddf): Fixed latency.
438         (z10_floadsf): Fixed latency.
439         (z10_ftrunctf): Fixed latency.
440         (z10_ftruncdf): Fixed latency.
441         * config/s390/s390.c (z10_cost): Fixed values.
442         (s390_adjust_priority): Added z10 path.
443         * config/s390/s390.md (type): Added fhex.
444         (*mov<mode>_64dfp): Updated type attribute.
445         (*mov<mode>_64): Updated type attribute.
446         (*mov<mode>_31): Updated type attribute.
447         (*mov<mode>"): Likewise.
448         * config/s390/2084.md (x_fsimpdf): Updated condition.
450 2009-09-04  Andreas Krebbel  <krebbel1@de.ibm.com>
452         * config/s390/s390.md ("*fmadd<mode>", "*fmsub<mode>"): Enable mem
453         RTXs in the predicate for operand 1.
455 2009-09-03  Daniel Gutson  <dgutson@codesourcery.com>
457         * config/arm/arm.md (UNSPEC_RBIT): New constant.
458         (rbitsi2): New insn.
459         (ctzsi2): New expand.
460         * config/arm/arm.h (CTZ_DEFINED_VALUE_AT_ZERO): New macro.
462 2009-09-03  Martin Jambor  <mjambor@suse.cz>
464         * tree-sra.c (duplicate_expr_for_different_base): Removed.
465         (create_artificial_child_access): Use build_ref_for_offset instead
466         of duplicate_expr_for_different_base.
467         (propagate_subacesses_accross_link): Likewise.
469 2009-09-03  Richard Sandiford  <rdsandiford@googlemail.com>
471         * config/mips/mips.c (USEFUL_INSN_P): Use NONDEBUG_INSN_P instead
472         of INSN_P.
473         (mips16e_collect_argument_saves): Skip debug instructions.
474         (mips_74k_agen_init): Use CALL_P || JUMP_P instead of !NONJUMP_INSN_P.
475         (mips16_lay_out_constants): Use USEFUL_INSN_P instead of INSN_P.
476         (r10k_insert_cache_barriers): Likewise.
477         (mips_reorg_process_insns): Likewise.
479 2009-09-03  Vladimir Makarov  <vmakarov@redhat.com>
481         PR bootstrap/41241
482         * ira.c (update_equiv_reg): Remove check on class likely spill.
484 2009-09-03  Jakub Jelinek  <jakub@redhat.com>
486         PR debug/41236
487         * dwarf2out.c (loc_descriptor): Don't use SUBREG_REG macro on
488         SIGN_EXTEND or ZERO_EXTEND.  Don't assume there is a REG inside of
489         it or SUBREG.
491         PR debug/41238
492         * function.c (assign_parm_find_stack_rtl): Don't set mem attributes on
493         the stack slot if it is passed by invisible reference.
494         * var-tracking.c (vt_add_function_parameters): Handle arguments passed
495         by invisible reference.
497 2009-09-03  Bernd Schmidt  <bernd.schmidt@analog.com>
499         * config/bfin/linux.h (TARGET_SUPPORTS_SYNC_CALLS): Define to 1.
500         * config/bfin/uclinux.h (TARGET_SUPPORTS_SYNC_CALLS): Define to 1.
501         * config/bfin/bfin.h (TARGET_SUPPORTS_SYNC_CALLS): Provide default of
502         0.
503         * config/bfin/sync.md: New file.
504         * config/bfin/bfin.md: Include it.
505         (UNSPEC_ATOMIC): New.
506         (UNSPEC_ONES): Provide a unique number.
508         From Jie Zhang <jie.zhang@analog.com>:
509         * config/bfin/bfin.c (ret_regs): New.
510         (must_save_fp_p): Don't return true because of frame_pointer_needed.
511         (must_save_rets_p): New.
512         (n_regs_saved_by_prologue): Use must_save_rets_p instead of
513         current_function_is_leaf.
514         (do_link): Likewise.
515         (do_unlink): Likewise.
516         (expand_interrupt_handler_prologue): Use ret_regs array.
517         (expand_interrupt_handler_epilogue): Use ret_regs array and
518         pass return register to gen_return_internal.
519         (bfin_expand_epilogue): Pass return register to
520         gen_return_internal.
521         (bfin_expand_call): Explicitly clobber RETS.
522         * config/bfin/bfin.h (FUNCTION_RETURN_REGISTERS): Define.
523         * config/bfin/bfin.md (call_symbol_fdpic, call_value_symbol_fdpic,
524         call_insn_fdpic, call_value_insn_fdpic, call_symbol,
525         call_value_symbol, call_insn, call_value_insn): Explicitly clobber
526         RETS.
527         (return_internal): Take a reg rtx rather than the register number.
529 2009-09-03  H.J. Lu  <hongjiu.lu@intel.com>
531         * tree-parloops.c (parallelize_loops): Cast to HOST_WIDE_INT
532         when comparing against estimated_loop_iterations_int return.
534 2009-09-03  Richard Guenther  <rguenther@suse.de>
536         * dwarf2out.c (dwarf2out_do_cfi_asm): Remove check of
537         eh_personality_libfunc.
539 2009-09-03  Razya Ladelsky  <razya@il.ibm.com>
541         * tree-parloops.c (separate_decls_in_region): Add space.
543 2009-09-03  Razya Ladelsky  <razya@il.ibm.com>
545         * tree-parloops.c (separate_decls_in_region): Change the condition
546         checking if there are reductions in the loop.
548 2009-09-03  Razya Ladelsky  <razya@il.ibm.com>
550         PR tree-optimization/38275
551         * tree-parloops.c (parallelize_loops): Replace profitability condition
552         for expected number of iterations.
554 2009-09-03  Alexandre Oliva  <aoliva@redhat.com>
556         * doc/invoke.texi (BUILD_CONFIG): Document --with-build-config.
557         (bootstrap-debug): Explain conditions in which it becomes default.
558         (bootstrap-debug-big): Rather than duplicate bootstrap-debug,
559         make it add to it.
561 2009-09-03  Namhyung Kim  <namhyung@gmail.com>
563         * doc/invoke.texi (Optimize Options): Move
564         -finline-small-functions to the -O2 list.
566 2009-09-03  Alexandre Oliva  <aoliva@redhat.com>
568         * toplev.c (process_options): Enable var-tracking-assignments
569         by default if var-tracking is enabled.
571 2009-09-02  David Daney  <ddaney@caviumnetworks.com>
573         * cfgbuild.c (find_bb_boundaries): Split blocks containing a
574         barrier.
575         * emit-rtl.c (prev_nonnote_insn_bb): New function.
576         * rtl.h (prev_nonnote_insn_bb): Declare it.
578 2009-09-03  Diego Novillo  <dnovillo@google.com>
580         * cgraph.c (cgraph_node_for_decl): New.
581         * cgraph.h (cgraph_node_for_decl): Declare.
582         * tree.c (host_integerp): Return 0 if T is NULL.
584 2009-09-03  Diego Novillo  <dnovillo@google.com>
586         * tree.h (struct alias_pair): Move from varasm.c.
587         (alias_pairs): Likewise.
588         (TYPE_MAXVAL): Define.
589         (TYPE_MINVAL): Define.
590         (iterative_hash_host_wide_int): Declare.
591         (remove_unreachable_alias_pairs): Declare.
592         * tree-pass.h (pass_ipa_free_lang_data): Declare.
593         * diagnostic.c (default_diagnostic_starter): Make extern.
594         (default_diagnostic_finalizer): Make extern.
595         * diagnostic.h (default_diagnostic_starter): Declare.
596         (default_diagnostic_finalizer): Declare.
597         (default_tree_printer): Declare.
598         * toplev.c (default_tree_printer): Make extern.
600 2009-09-03  Richard Guenther  <rguenther@suse.de>
601             Diego Novillo  <dnovillo@google.com>
603         * cgraph.c (cgraph_add_new_function): Remove gimplification.
604         * cgraphunit.c (cgraph_expand_function): Do not emit
605         associated thunks from here.
606         (cgraph_emit_thunks): New.
607         (cgraph_optimize): Call it.
608         Return if any IPA pass finds an error.
609         * varasm.c (finish_aliases_1): Ignore errorneous aliases used
610         by thunks.
612 2009-09-03  Simon Baldwin  <simonb@google.com>
613             Rafael Espindola  <espindola@google.com>
614             Richard Guenther  <rguenther@suse.de>
615             Doug Kwan  <dougkwan@google.com>
616             Diego Novillo  <dnovillo@google.com>
618         * tree.c: Include tree-pass.h, langhooks-def.h,
619         diagnostic.h, cgraph.h, timevar.h, except.h and debug.h.
620         (free_lang_data_in_type): New.
621         (need_assembler_name_p): New.
622         (free_lang_data_in_block): New.
623         (free_lang_data_in_decl): New.
624         (struct free_lang_data_d): New.
625         (add_tree_to_fld_list): New.
626         (find_decls_types_r): New.
627         (get_eh_types_for_runtime): New.
628         (find_decls_types_in_eh_region): New.
629         (find_decls_types_in_node): New.
630         (find_decls_types_in_var): New.
631         (free_lang_data_in_cgraph): New.
632         (free_lang_data): New.
633         (gate_free_lang_data): New.
634         (pass_ipa_free_lang_data): New.
636 2009-09-03  Diego Novillo  <dnovillo@google.com>
638         * timevar.def (TV_IPA_FREE_LANG_DATA): Define.
639         * langhooks.h (struct lang_hooks): Add field free_lang_data.
640         (lang_hooks): Remove const qualifier.
641         * ipa.c (cgraph_remove_unreachable_nodes): Call
642         remove_unreachable_alias_pairs.
643         * except.c (add_type_for_runtime): Check if TYPE has
644         already been converted.
645         (lookup_type_for_runtime): Likewise.
646         (check_handled): Handle converted types.
647         * varasm.c (remove_unreachable_alias_pairs): New.
648         * gimple.c: Include demangle.h.
649         (gimple_decl_printable_name): New.
650         (gimple_fold_obj_type_ref): New.
651         * gimple.h (gimple_decl_printable_name): Declare.
652         (gimple_fold_obj_type_ref): Declare.
653         * passes.c (init_optimization_passes): Add pass
654         pass_ipa_free_lang_data.
655         * langhooks-def.h (LANG_HOOKS_FREE_LANG_DATA): Define.
656         (LANG_HOOKS_INITIALIZER): Add LANG_HOOKS_FREE_LANG_DATA.
658 2009-09-03  Diego Novillo  <dnovillo@google.com>
660         * c-lang.c (lang_hooks): Remove const qualifier.
662 2009-09-02  Loren James Rittle  <ljrittle@acm.org>
664         * doc/install.texi (*-*-freebsd*): Update target information.
666 2009-09-02  Anatoly Sokolov  <aesok@post.ru>
668         * hard-reg-set.h (call_fixed_regs): Remove.
669         * reginfo.c (call_fixed_regs): Remove.
670         (init_reg_sets_1): Remove initialization of call_fixed_regs.
671         (globalize_reg): Don't use call_fixed_regs.
672         * caller-save.c (init_caller_save): Use call_fixed_reg_set instead of
673         call_fixed_regs.
675 2009-09-01  Michael Matz  <matz@suse.de>
677         * expr.h (emit_storent_insn, expand_expr_real_1,
678         expand_expr_real_2): Declare.
679         * expr.c (emit_storent_insn, expand_expr_real_1,
680         expand_expr_real_2): Export.
681         (store_expr): Setting and evaluating dont_return_target is useless.
682         (expand_expr_real_1, <case GOTO_EXPR, RETURN_EXPR, SWITCH_EXPR,
683         LABEL_EXPR and ASM_EXPR>): Move to gcc_unreachable.
684         * except.c (expand_resx_expr): Rename to ...
685         (expand_resx_stmt): ... this.  Rewrite to take gimple statement.
686         * except.h (expand_resx_stmt): Declare.
687         * stmt.c: Add include gimple.h
688         (expand_asm_expr): Rename to ...
689         (expand_asm_stmt): ... this. Rewrite to take gimple statement.
690         (expand_case): Rewrite to take gimple statement.
691         * tree.h (expand_asm_stmt): Declare.
692         (expand_case): Change prototype.
693         * Makefile.in (stmt.o): Depend on gimple.h.
694         * builtins.c (expand_builtin_synchronize): Build gimple asm
695         statement, not an ASM_EXPR.
696         * cfgexpand.c (gimple_cond_pred_to_tree, set_expr_location_r,
697         gimple_to_tree, release_stmt_tree): Remove.
698         (expand_gimple_cond): Don't call gimple_cond_pred_to_tree or
699         ggc_free, but hold comparison code and operands separately.
700         Call jumpif_1 and jumpifnot_1 instead of jumpif and jumpifnot.
701         (expand_call_stmt, expand_gimple_stmt_1,
702         expand_gimple_stmt): New helpers.
703         (expand_gimple_tailcall): Don't call gimple_to_tree, expand_expr_stmt,
704         release_stmt_tree.  Call expand_gimple_stmt instead.
705         (expand_gimple_basic_block): Ditto.
707         * calls.c (emit_call_1): Don't look at EH regions here, make
708         fntree parameter useless.
709         (expand_call): New local rettype for TREE_TYPE(exp), use it
710         throughout.  Remove local p, use addr instead.
711         Don't look at EH regions here.
713 2009-09-02  Vladimir Makarov  <vmakarov@redhat.com>
715         * doc/invoke.texi (-fsched-pressure): Document it.
716         (-fsched-reg-pressure-heuristic): Remove it.
718         * reload.c (ira.h): Include.
719         (find_reloads): Add choosing reload on number of small spilled
720         classes.
722         * haifa-sched.c (ira.h): Include.
723         (sched_pressure_p, sched_regno_cover_class, curr_reg_pressure,
724         saved_reg_pressure, curr_reg_live, saved_reg_live,
725         region_ref_regs): New variables.
726         (sched_init_region_reg_pressure_info, mark_regno_birth_or_death,
727         initiate_reg_pressure_info, setup_ref_regs,
728         initiate_bb_reg_pressure_info, save_reg_pressure,
729         restore_reg_pressure, dying_use_p, print_curr_reg_pressure): New
730         functions.
731         (setup_insn_reg_pressure_info): New function.
732         (rank_for_schedule): Add pressure checking and insn issue time.
733         Remove comparison of insn reg weights.
734         (ready_sort): Set insn reg pressure info.
735         (update_register_pressure, setup_insn_max_reg_pressure,
736         update_reg_and_insn_max_reg_pressure,
737         sched_setup_bb_reg_pressure_info): New functions.
738         (schedule_insn): Add code for printing and updating reg pressure info.
739         (find_set_reg_weight, find_insn_reg_weight): Remove.
740         (ok_for_early_queue_removal): Do nothing if pressure_only_p.
741         (debug_ready_list): Print reg pressure info.
742         (schedule_block): Ditto.  Check insn issue time.
743         (sched_init): Set up sched_pressure_p.  Allocate and set up some
744         reg pressure related info.
745         (sched_finish): Free some reg pressure related info.
746         (fix_tick_ready): Make insn always ready if pressure_p.
747         (init_h_i_d): Don't call find_insn_reg_weight.
748         (haifa_finish_h_i_d): Free insn reg pressure info.
750         * ira-int.h (ira_hard_regno_cover_class, ira_reg_class_nregs,
751         ira_memory_move_cost, ira_class_hard_regs,
752         ira_class_hard_regs_num, ira_no_alloc_regs,
753         ira_available_class_regs, ira_reg_class_cover_size,
754         ira_reg_class_cover, ira_class_translate): Move to ira.h.
756         * ira-lives.c (single_reg_class): Check mode to find how many
757         registers are necessary for operand.
758         (ira_implicitly_set_insn_hard_regs): New.
760         * common.opt (fsched-pressure): New options.
761         (fsched-reg-pressure-heuristic): Remove.
763         * ira.c (setup_eliminable_regset): Rename to
764         ira_setup_eliminable_regset.  Make it external.
765         (expand_reg_info): Pass cover class to setup_reg_classes.
766         (ira): Call resize_reg_info instead of allocate_reg_info.
768         * sched-deps.c: Include ira.h.
769         (implicit_reg_pending_clobbers, implicit_reg_pending_uses): New.
770         (create_insn_reg_use, create_insn_reg_set, setup_insn_reg_uses,
771         reg_pressure_info, insn_use_p, mark_insn_pseudo_birth,
772         mark_insn_hard_regno_birth, mark_insn_reg_birth,
773         mark_pseudo_death, mark_hard_regno_death, mark_reg_death,
774         mark_insn_reg_store, mark_insn_reg_clobber,
775         setup_insn_reg_pressure_info): New.
776         (sched_analyze_1): Update implicit_reg_pending_uses.
777         (sched_analyze_insn): Find implicit sets, uses, clobbers of regs.
778         Use them to create dependencies.  Set insn reg uses and pressure
779         info.  Process reg_pending_uses in one place.
780         (free_deps): Free implicit sets.
781         (remove_from_deps): Remove implicit sets if necessary.  Check
782         implicit sets when clearing reg_last_in_use.
783         (init_deps_global): Clear implicit_reg_pending_clobbers and
784         implicit_reg_pending_uses.
786         * ira.h (ira_hard_regno_cover_class, ira_reg_class_nregs,
787         ira_memory_move_cost, ira_class_hard_regs,
788         ira_class_hard_regs_num, ira_no_alloc_regs,
789         ira_available_class_regs, ira_reg_class_cover_size,
790         ira_reg_class_cover, ira_class_translate): Move from ira-int.h.
791         (ira_setup_eliminable_regset, ira_set_pseudo_classes,
792         ira_implicitly_set_insn_hard_regs): New prototypes.
794         * ira-costs.c (pseudo_classes_defined_p, allocno_p,
795         cost_elements_num): New variables.
796         (allocno_costs, total_costs): Rename to costs and
797         total_allocno_costs.
798         (COSTS_OF_ALLOCNO): Rename to COSTS.
799         (allocno_pref): Rename to pref.
800         (allocno_pref_buffer): Rename to pref_buffer.
801         (common_classes): Rename to regno_cover_class.
802         (COST_INDEX): New.
803         (record_reg_classes): Set allocno attributes only if allocno_p.
804         (record_address_regs): Ditto.  Use COST_INDEX instead of ALLOCNO_NUM.
805         (scan_one_insn): Use COST_INDEX and COSTS instead of ALLOCNO_NUM
806         and COSTS_OF_ALLOCNO.
807         (print_costs): Rename to print_allocno_costs.
808         (print_pseudo_costs): New.
809         (process_bb_node_for_costs): Split into 2 functions with new
810         function process_bb_for_costs.  Pass BB to process_bb_for_costs.
811         (find_allocno_class_costs): Rename to find_costs_and_classes.  Add
812         new parameter dump_file.  Use cost_elements_num instead of
813         ira_allocnos_num.  Make one iteration if preferred classes were
814         already calculated for scheduler.  Make 2 versions of code
815         depending on allocno_p.
816         (setup_allocno_cover_class_and_costs): Check allocno_p.  Use
817         regno_cover_class and COSTS instead of common_classes and
818         COSTS_OF_ALLOCNO.
819         (init_costs, finish_costs): New.
820         (ira_costs): Set up allocno_p and cost_elements_num.  Call
821         init_costs and finish_costs.
822         (ira_set_pseudo_classes): New.
824         * rtl.h (allocate_reg_info): Remove.
825         (resize_reg_info): Change return type.
826         (reg_cover_class): New.
827         (setup_reg_classes): Add new parameter.
829         * sched-int.h (struct deps_reg): New member implicit_sets.
830         (sched_pressure_p, sched_regno_cover_class): New external definitions.
831         (INCREASE_BITS): New macro.
832         (struct reg_pressure_data, struct reg_use_data): New.
833         (struct _haifa_insn_data): Remove reg_weight.  Add members
834         reg_pressure, reg_use_list, reg_set_list, and
835         reg_pressure_excess_cost_change.
836         (struct deps): New member implicit_sets.
837         (pressure_p): New variable.
838         (COVER_CLASS_BITS, INCREASE_BITS): New macros.
839         (struct reg_pressure_data, struct reg_use_data): New.
840         (INSN_REG_WEIGHT): Remove.
841         (INSN_REG_PRESSURE, INSN_MAX_REG_PRESSURE, INSN_REG_USE_LIST,
842         INSN_REG_SET_LIST, INSN_REG_PRESSURE_EXCESS_COST_CHANGE): New macros.
843         (sched_init_region_reg_pressure_info,
844         sched_setup_bb_reg_pressure_info): New prototypes.
846         * reginfo.c (struct reg_pref): New member coverclass.
847         (reg_cover_class): New function.
848         (reginfo_init, pass_reginfo_init): Move after free_reg_info.
849         (reg_info_size): New variable.
850         (allocate_reg_info): Make static.  Setup reg_info_size.
851         (resize_reg_info): Use reg_info_size.  Return flag of resizing.
852         (setup_reg_classes): Add a new parameter.  Setup cover class too.
854         * Makefile.in (reload.o, haifa-sched.o, sched-deps.o): Add ira.h to
855         the dependencies.
857         * sched-rgn.c (deps_join): Set up implicit_sets.
858         (schedule_region): Set up region and basic blocks pressure
859         relative info.
861         * passes.c (init_optimization_passes): Move
862         pass_subregs_of_mode_init before pass_sched.
864 2009-09-02  Martin Jambor  <mjambor@suse.cz>
866         * tree-sra.c (struct access): New field grp_hint.
867         (dump_access): Dump grp_hint.
868         (sort_and_splice_var_accesses): Set grp_hint if a group is read
869         multiple times.
870         (analyze_access_subtree): Only scalarize accesses with grp_hint set or
871         those which have been specifically read and somehow written to.
872         (propagate_subacesses_accross_link): Set grp_hint of right child and
873         also possibly of the left child.
875 2009-09-02  Jakub Jelinek  <jakub@redhat.com>
877         * tree-object-size.c (addr_object_size): Always use object_size_type
878         0 or 2 when determining the pointer pointed object size.
880 2009-09-02  Richard Guenther  <rguenther@suse.de>
882         Revert
883         2009-08-31  Richard Guenther  <rguenther@suse.de>
885         * builtins.c (fold_builtin_memory_op): Use the alias oracle
886         to query if the memory regions for memmove overlap.
887         * tree-ssa-alias.c (ptr_deref_may_alias_decl_p): Relax the
888         asserts on pointers, instead deal with odd trees.
889         (ptr_derefs_may_alias_p): Likewise.
890         (refs_may_alias_p_1): Constructor bases also never alias.
892 2009-08-01  Christian Bruel  <christian.bruel@st.com>
894         Revert:
895         2009-07-31  Christian Bruel  <christian.bruel@st.com>
896         * gcc/config.gcc (sh*-*-elf): test with_libgloss.
898 2009-09-01  Alexandre Oliva  <aoliva@redhat.com>
900         * doc/invoke.texi (-fvar-tracking-assignments): New.
901         (-fvar-tracking-assignments-toggle): New.
902         (-fdump-final-insns=file): Mark filename as optional.
903         (--param min-nondebug-insn-uid): New.
904         (-gdwarf-@{version}): Mention version 4.
905         * opts.c (common_handle_option): Accept it.
906         * tree-vrp.c (find_assert_locations_1): Skip debug stmts.
907         * regrename.c (regrename_optimize): Drop last.  Don't count debug
908         insns as uses.  Don't reject change because of debug insn.
909         (do_replace): Reject DEBUG_INSN as chain starter.  Take base_regno
910         from the chain starter, and check for inexact matches in DEBUG_INSNS.
911         (scan_rtx_reg): Accept inexact matches in DEBUG_INSNs.
912         (build_def_use): Simplify and fix the marking of DEBUG_INSNs.
913         * sched-ebb.c (schedule_ebbs): Skip boundary debug insns.
914         * fwprop.c (forward_propagate_and_simplify): ...into debug insns.
915         * doc/gimple.texi (is_gimple_debug): New.
916         (gimple_debug_bind_p): New.
917         (is_gimple_call, gimple_assign_cast_p): End sentence with period.
918         * doc/install.texi (bootstrap-debug): More details.
919         (bootstrap-debug-big, bootstrap-debug-lean): Document.
920         (bootstrap-debug-lib): More details.
921         (bootstrap-debug-ckovw): Update.
922         (bootstrap-time): New.
923         * tree-into-ssa.c (mark_def_sites): Skip debug stmts.
924         (insert_phi_nodes_for): Insert debug stmts.
925         (rewrite_stmt): Take iterator.  Insert debug stmts.
926         (rewrite_enter_block): Adjust.
927         (maybe_replace_use_in_debug_stmt): New.
928         (rewrite_update_stmt): Use it.
929         (mark_use_interesting): Return early for debug stmts.
930         * tree-ssa-loop-im.c (rewrite_bittest): Propagate DEFs into debug
931         stmts before replacing stmt.
932         (move_computations_stmt): Likewise.
933         * ira-conflicts.c (add_copies): Skip debug insns.
934         * regstat.c (regstat_init_n_sets_and_refs): Discount debug insns.
935         (regstat_bb_compute_ri): Skip debug insns.
936         * tree-ssa-threadupdate.c (redirection_block_p): Skip debug stmts.
937         * tree-ssa-loop-manip.c (find_uses_to_rename_stmt,
938         check_loop_closed_ssa_stmt): Skip debug stmts.
939         * tree-tailcall.c (find_tail_calls): Likewise.
940         * tree-ssa-loop-ch.c (should_duplicate_loop_header_p): Likewise.
941         * tree.h (MAY_HAVE_DEBUG_STMTS): New.
942         (build_var_debug_value_stat): Declare.
943         (build_var_debug_value): Define.
944         (target_for_debug_bind): Declare.
945         * reload.c (find_equiv_reg): Skip debug insns.
946         * rtlanal.c (reg_used_between_p): Skip debug insns.
947         (side_effects_p): Likewise.
948         (canonicalize_condition): Likewise.
949         * ddg.c (create_ddg_dep_from_intra_loop_link): Check that non-debug
950         insns never depend on debug insns.
951         (create_ddg_dep_no_link): Likewise.
952         (add_cross_iteration_register_deps): Use ANTI_DEP for debug insns.
953         Don't add inter-loop dependencies for debug insns.
954         (build_intra_loop_deps): Likewise.
955         (create_ddg): Count debug insns.
956         * ddg.h (struct ddg::num_debug): New.
957         (num_backargs): Pair up with previous int field.
958         * diagnostic.c (diagnostic_report_diagnostic): Skip notes on
959         -fcompare-debug-second.
960         * final.c (get_attr_length_1): Skip debug insns.
961         (rest_of_clean-state): Don't dump CFA_RESTORE_STATE.
962         * gcc.c (invoke_as): Call compare-debug-dump-opt.
963         (driver_self_specs): Map -fdump-final-insns to
964         -fdump-final-insns=..
965         (get_local_tick): New.
966         (compare_debug_dump_opt_spec_function): Test for . argument and
967         compute output name.  Compute temp output spec without flag name.
968         Compute -frandom-seed.
969         (OPT): Undef after use.
970         * cfgloopanal.c (num_loop_insns): Skip debug insns.
971         (average_num_loop_insns): Likewise.
972         * params.h (MIN_NONDEBUG_INSN_UID): New.
973         * gimple.def (GIMPLE_DEBUG): New.
974         * ipa-reference.c (scan_stmt_for_static_refs): Skip debug stmts.
975         * auto-inc-dec.c (merge_in_block): Skip debug insns.
976         (merge_in_block): Fix whitespace.
977         * toplev.c (flag_var_tracking): Update comment.
978         (flag_var_tracking_assignments): New.
979         (flag_var_tracking_assignments_toggle): New.
980         (process_options): Don't open final insns dump file if we're not
981         going to write to it.  Compute defaults for var_tracking.
982         * df-scan.c (df_insn_rescan_debug_internal): New.
983         (df_uses_record): Handle debug insns.
984         * haifa-sched.c (ready): Initialize n_debug.
985         (contributes_to_priority): Skip debug insns.
986         (dep_list_size): New.
987         (priority): Use it.
988         (rank_for_schedule): Likewise.  Schedule debug insns as soon as
989         they're ready.  Disregard previous debug insns to make decisions.
990         (queue_insn): Never queue debug insns.
991         (ready_add, ready_remove_first, ready_remove): Count debug insns.
992         (schedule_insn): Don't reject debug insns because of issue rate.
993         (get_ebb_head_tail, no_real_insns_p): Skip boundary debug insns.
994         (queue_to_ready): Skip and discount debug insns.
995         (choose_ready): Let debug insns through.
996         (schedule_block): Check boundary debug insns.  Discount debug
997         insns, schedule them early.  Adjust whitespace.
998         (set_priorities): Check for boundary debug insns.
999         (add_jump_dependencies): Use dep_list_size.
1000         (prev_non_location_insn): New.
1001         (check_cfg): Use it.
1002         * tree-ssa-loop-ivopts.c (find-interesting_users): Skip debug
1003         stmts.
1004         (remove_unused_ivs): Reset debug stmts.
1005         * modulo-sched.c (const_iteration_count): Skip debug insns.
1006         (res_MII): Discount debug insns.
1007         (loop_single_full_bb_p): Skip debug insns.
1008         (sms_schedule): Likewise.
1009         (sms_schedule_by_order): Likewise.
1010         (ps_has_conflicts): Likewise.
1011         * caller-save.c (refmarker_fn): New.
1012         (save_call_clobbered_regs): Replace regs with saved mem in
1013         debug insns.
1014         (mark_referenced_regs): Take pointer, mark and arg.  Adjust.
1015         Call refmarker_fn mark for hardregnos.
1016         (mark_reg_as_referenced): New.
1017         (replace_reg_with_saved_mem): New.
1018         * ipa-pure-const.c (check_stmt): Skip debug stmts.
1019         * cse.c (cse_insn): Canonicalize debug insns.  Skip them when
1020         searching back.
1021         (cse_extended_basic_block): Skip debug insns.
1022         (count_reg_usage): Likewise.
1023         (is_dead_reg): New, split out of...
1024         (set_live_p): ... here.
1025         (insn_live_p): Use it for debug insns.
1026         * tree-stdarg.c (check_all_va_list_escapes): Skip debug stmts.
1027         (execute_optimize_stdarg): Likewise.
1028         * tree-ssa-dom.c (propagate_rhs_into_lhs): Likewise.
1029         * tree-ssa-propagate.c (substitute_and_fold): Don't regard
1030         changes in debug stmts as changes.
1031         * sel-sched.c (moving_insn_creates_bookkeeping_block_p): New.
1032         (moveup_expr): Don't move across debug insns.  Don't move
1033         debug insn if it would create a bookkeeping block.
1034         (moveup_expr_cached): Don't use cache for debug insns that
1035         are heads of blocks.
1036         (compute_av_set_inside_bb): Skip debug insns.
1037         (sel_rank_for_schedule): Schedule debug insns first.  Remove
1038         dead code.
1039         (block_valid_for_bookkeeping_p); Support lax searches.
1040         (create_block_for_bookkeeping): Adjust block numbers when
1041         encountering debug-only blocks.
1042         (find_place_for_bookkeeping): Deal with debug-only blocks.
1043         (generate_bookkeeping_insn): Accept no place to insert.
1044         (remove_temp_moveop_nops): New argument full_tidying.
1045         (prepare_place_to_insert): Deal with debug insns.
1046         (advance_state_on_fence): Debug insns don't start cycles.
1047         (update_boundaries): Take fence as argument.  Deal with
1048         debug insns.
1049         (schedule_expr_on_boundary): No full_tidying on debug insns.
1050         (fill_insns): Deal with debug insns.
1051         (track_scheduled_insns_and_blocks): Don't count debug insns.
1052         (need_nop_to_preserve_insn_bb): New, split out of...
1053         (remove_insn_from_stream): ... this.
1054         (fur_orig_expr_not_found): Skip debug insns.
1055         * rtl.def (VALUE): Move up.
1056         (DEBUG_INSN): New.
1057         * tree-ssa-sink.c (all_immediate_uses_same_place): Skip debug stmts.
1058         (nearest_common_dominator_of_uses): Take debug_stmts argument.
1059         Set it if debug stmts are found.
1060         (statement_sink_location): Skip debug stmts.  Propagate
1061         moving defs into debug stmts.
1062         * ifcvt.c (first_active_insn): Skip debug insns.
1063         (last_active_insns): Likewise.
1064         (cond_exec_process_insns): Likewise.
1065         (noce_process_if_block): Likewise.
1066         (check_cond_move_block): Likewise.
1067         (cond_move_convert_if_block): Likewise.
1068         (block_jumps_and_fallthru_p): Likewise.
1069         (dead_or_predicable): Likewise.
1070         * dwarf2out.c (debug_str_hash_forced): New.
1071         (find_AT_string): Add comment.
1072         (gen_label_for_indirect_string): New.
1073         (get_debug_string_label): New.
1074         (AT_string_form): Use it.
1075         (mem_loc_descriptor): Handle non-TLS symbols.  Handle MINUS , DIV,
1076         MOD, AND, IOR, XOR, NOT, ABS, NEG, and CONST_STRING.  Accept but
1077         discard COMPARE, IF_THEN_ELSE, ROTATE, ROTATERT, TRUNCATE and
1078         several operations that cannot be represented with DWARF opcodes.
1079         (loc_descriptor): Ignore SIGN_EXTEND and ZERO_EXTEND.  Require
1080         dwarf_version 4 for DW_OP_implicit_value and DW_OP_stack_value.
1081         (dwarf2out_var_location): Take during-call mark into account.
1082         (output_indirect_string): Update comment.  Output if there are
1083         label and references.
1084         (prune_indirect_string): New.
1085         (prune_unused_types): Call it if debug_str_hash_forced.
1086         More in dwarf2out.c, from Jakub Jelinek <jakub@redhat.com>:
1087         (dw_long_long_const): Remove.
1088         (struct dw_val_struct): Change val_long_long type to rtx.
1089         (print_die, attr_checksum, same_dw_val_p, loc_descriptor): Adjust for
1090         val_long_long change to CONST_DOUBLE rtx from a long hi/lo pair.
1091         (output_die): Likewise.  Use HOST_BITS_PER_WIDE_INT size of each
1092         component instead of HOST_BITS_PER_LONG.
1093         (output_loc_operands): Likewise.  For const8* assert
1094         HOST_BITS_PER_WIDE_INT rather than HOST_BITS_PER_LONG is >= 64.
1095         (output_loc_operands_raw): For const8* assert HOST_BITS_PER_WIDE_INT
1096         rather than HOST_BITS_PER_LONG is >= 64.
1097         (add_AT_long_long): Remove val_hi and val_lo arguments, add
1098         val_const_double.
1099         (size_of_die): Use HOST_BITS_PER_WIDE_INT size multiplier instead of
1100         HOST_BITS_PER_LONG for dw_val_class_long_long.
1101         (add_const_value_attribute): Adjust add_AT_long_long caller.  Don't
1102         handle TLS SYMBOL_REFs.  If CONST wraps a constant, tail recurse.
1103         (dwarf_stack_op_name): Handle DW_OP_implicit_value and
1104         DW_OP_stack_value.
1105         (size_of_loc_descr, output_loc_operands, output_loc_operands_raw):
1106         Handle DW_OP_implicit_value.
1107         (extract_int): Move prototype earlier.
1108         (mem_loc_descriptor): For SUBREG punt if inner
1109         mode size is wider than DWARF2_ADDR_SIZE.  Handle SIGN_EXTEND
1110         and ZERO_EXTEND by DW_OP_shl and DW_OP_shr{a,}.  Handle
1111         EQ, NE, GT, GE, LT, LE, GTU, GEU, LTU, LEU, SMIN, SMAX, UMIN,
1112         UMAX, SIGN_EXTRACT, ZERO_EXTRACT.
1113         (loc_descriptor): Compare mode size with DWARF2_ADDR_SIZE
1114         instead of Pmode size.
1115         (loc_descriptor): Add MODE argument.  Handle CONST_INT, CONST_DOUBLE,
1116         CONST_VECTOR, CONST, LABEL_REF and SYMBOL_REF if mode != VOIDmode,
1117         attempt to handle other expressions.  Don't handle TLS SYMBOL_REFs.
1118         (concat_loc_descriptor, concatn_loc_descriptor,
1119         loc_descriptor_from_tree_1): Adjust loc_descriptor callers.
1120         (add_location_or_const_value_attribute): Likewise.  For single
1121         location loc_lists attempt to use add_const_value_attribute
1122         for constant decls.  Add DW_AT_const_value even if
1123         NOTE_VAR_LOCATION is VAR_LOCATION with CONSTANT_P or CONST_STRING
1124         in its expression.
1125         * cfgbuild.c (inside_basic_block_p): Handle debug insns.
1126         (control_flow_insn_p): Likewise.
1127         * tree-parloops.c (eliminate_local_variables_stmt): Handle debug stmt.
1128         (separate_decls_in_region_debug_bind): New.
1129         (separate_decls_in_region): Process debug bind stmts afterwards.
1130         * recog.c (verify_changes): Handle debug insns.
1131         (extract_insn): Likewise.
1132         (peephole2_optimize): Skip debug insns.
1133         * dse.c (scan_insn): Skip debug insns.
1134         * sel-sched-ir.c (return_nop_to_pool): Take full_tidying argument.
1135         Pass it on.
1136         (setup_id_for_insn): Handle debug insns.
1137         (maybe_tidy_empty_bb): Adjust whitespace.
1138         (tidy_control_flow): Skip debug insns.
1139         (sel_remove_insn): Adjust for debug insns.
1140         (sel_estimate_number_of_insns): Skip debug insns.
1141         (create_insn_rtx_from_pattern): Handle debug insns.
1142         (create_copy_of_insn_rtx): Likewise.
1143         * sel-sched-.h (sel_bb_end): Declare.
1144         (sel_bb_empty_or_nop_p): New.
1145         (get_all_loop_exits): Use it.
1146         (_eligible_successor_edge_p): Likewise.
1147         (return_nop_to_pool): Adjust.
1148         * tree-eh.c (tre_empty_eh_handler_p): Skip debug stmts.
1149         * ira-lives.c (process_bb_node_lives): Skip debug insns.
1150         * gimple-pretty-print.c (dump_gimple_debug): New.
1151         (dump_gimple_stmt): Use it.
1152         (dump_bb_header): Skip gimple debug stmts.
1153         * regmove.c (optimize_reg_copy_1): Discount debug insns.
1154         (fixup_match_2): Likewise.
1155         (regmove_backward_pass): Likewise.  Simplify combined
1156         replacement.  Handle debug insns.
1157         * function.c (instantiate_virtual_regs): Handle debug insns.
1158         * function.h (struct emit_status): Add x_cur_debug_insn_uid.
1159         * print-rtl.h: Include cselib.h.
1160         (print_rtx): Print VALUEs.  Split out and recurse for VAR_LOCATIONs.
1161         * df.h (df_inns_rescan_debug_internal): Declare.
1162         * gcse.c (alloc_hash_table): Estimate n_insns.
1163         (cprop_insn): Don't regard debug insns as changes.
1164         (bypass_conditional_jumps): Skip debug insns.
1165         (one_pre_gcse_pass): Adjust.
1166         (one_code_hoisting_pass): Likewise.
1167         (compute_ld_motion_mems): Skip debug insns.
1168         (one_cprop_pass): Adjust.
1169         * tree-if-conv.c (tree_if_convert_stmt): Reset debug stmts.
1170         (if_convertible_stmt_p): Handle debug stmts.
1171         * init-regs.c (initialize_uninitialized_regs): Skip debug insns.
1172         * tree-vect-loop.c (vect_is_simple_reduction): Skip debug stmts.
1173         * ira-build.c (create_bb_allocnos): Skip debug insns.
1174         * tree-flow-inline.h (has_zero_uses): Discount debug stmts.
1175         (has_single_use): Likewise.
1176         (single_imm_use): Likewise.
1177         (num_imm_uses): Likewise.
1178         * tree-ssa-phiopt.c (empty_block_p): Skip debug stmts.
1179         * tree-ssa-coalesce.c (build_ssa_conflict_graph): Skip debug stmts.
1180         (create_outofssa_var_map): Likewise.
1181         * lower-subreg.c (adjust_decomposed_uses): New.
1182         (resolve_debug): New.
1183         (decompose_multiword_subregs): Use it.
1184         * tree-dfa.c (find_referenced_vars): Skip debug stmts.
1185         * emit-rtl.c: Include params.h.
1186         (cur_debug_insn_uid): Define.
1187         (set_new_first_and_last_insn): Set cur_debug_insn_uid too.
1188         (copy_rtx_if_shared_1): Handle debug insns.
1189         (reset_used_flags): Likewise.
1190         (set_used_flags): LIkewise.
1191         (get_max_insn_count): New.
1192         (next_nondebug_insn): New.
1193         (prev_nondebug_insn): New.
1194         (make_debug_insn_raw): New.
1195         (emit_insn_before_noloc): Handle debug insns.
1196         (emit_jump_insn_before_noloc): Likewise.
1197         (emit_call_insn_before_noloc): Likewise.
1198         (emit_debug_insn_before_noloc): New.
1199         (emit_insn_after_noloc): Handle debug insns.
1200         (emit_jump_insn_after_noloc): Likewise.
1201         (emit_call_insn_after_noloc): Likewise.
1202         (emit_debug_insn_after_noloc): Likewise.
1203         (emit_insn_after): Take loc from earlier non-debug insn.
1204         (emit_jump_insn_after): Likewise.
1205         (emit_call_insn_after): Likewise.
1206         (emit_debug_insn_after_setloc): New.
1207         (emit_debug_insn_after): New.
1208         (emit_insn_before): Take loc from later non-debug insn.
1209         (emit_jump_insn_before): Likewise.
1210         (emit_call_insn_before): Likewise.
1211         (emit_debug_insn_before_setloc): New.
1212         (emit_debug_insn_before): New.
1213         (emit_insn): Handle debug insns.
1214         (emit_debug_insn): New.
1215         (emit_jump_insn): Handle debug insns.
1216         (emit_call_insn): Likewise.
1217         (emit): Likewise.
1218         (init_emit): Take min-nondebug-insn-uid into account.
1219         Initialize cur_debug_insn_uid.
1220         (emit_copy_of_insn_after): Handle debug insns.
1221         * cfgexpand.c (gimple_assign_rhs_to_tree): Do not overwrite
1222         location of single rhs in place.
1223         (maybe_dump_rtl_for_gimple_stmt): Dump lineno.
1224         (floor_sdiv_adjust): New.
1225         (cell_sdiv_adjust): New.
1226         (cell_udiv_adjust): New.
1227         (round_sdiv_adjust): New.
1228         (round_udiv_adjust): New.
1229         (wrap_constant): Moved from cselib.
1230         (unwrap_constant): New.
1231         (expand_debug_expr): New.
1232         (expand_debug_locations): New.
1233         (expand_gimple_basic_block): Drop hiding redeclaration.  Expand
1234         debug bind stmts.
1235         (gimple_expand_cfg): Expand debug locations.
1236         * cselib.c: Include tree-pass.h.
1237         (struct expand_value_data): New.
1238         (cselib_record_sets_hook): New.
1239         (PRESERVED_VALUE_P, LONG_TERM_PRESERVED_VALUE_P): New.
1240         (cselib_clear_table): Move, and implemnet in terms of...
1241         (cselib_reset_table_with_next_value): ... this.
1242         (cselib_get_next_unknown_value): New.
1243         (discard_useless_locs): Don't discard preserved values.
1244         (cselib_preserve_value): New.
1245         (cselib_preserved_value_p): New.
1246         (cselib_preserve_definitely): New.
1247         (cselib_clear_preserve): New.
1248         (cselib_preserve_only_values): New.
1249         (new_cselib_val): Take rtx argument.  Dump it in details.
1250         (cselib_lookup_mem): Adjust.
1251         (expand_loc): Take regs_active in struct.  Adjust.  Silence
1252         dumps unless details are requested.
1253         (cselib_expand_value_rtx_cb): New.
1254         (cselib_expand_value_rtx): Rename and reimplment in terms of...
1255         (cselib_expand_value_rtx_1): ... this.  Adjust.  Silence dumps
1256         without details.  Copy more subregs.  Try to resolve values
1257         using a callback.  Wrap constants.
1258         (cselib_subst_to_values): Adjust.
1259         (cselib_log_lookup): New.
1260         (cselib_lookup): Call it.
1261         (cselib_invalidate_regno): Don't count preserved values as useless.
1262         (cselib_invalidate_mem): Likewise.
1263         (cselib_record_set): Likewise.
1264         (struct set): Renamed to cselib_set, moved to cselib.h.
1265         (cselib_record_sets): Adjust.  Call hook.
1266         (cselib_process_insn): Reset table when it would be cleared.
1267         (dump_cselib_val): New.
1268         (dump_cselib_table): New.
1269         * tree-cfgcleanup.c (tree_forwarded_block_p): Skip debug stmts.
1270         (remove_forwarder_block): Support moving debug stmts.
1271         * cselib.h (cselib_record_sets_hook): Declare.
1272         (cselib_expand_callback): New type.
1273         (cselib_expand_value_rtx_cb): Declare.
1274         (cselib_reset_table_with_next_value): Declare.
1275         (cselib_get_next_unknown_value): Declare.
1276         (cselib_preserve_value): Declare.
1277         (cselib_preserved_value_p): Declare.
1278         (cselib_preserve_only_values): Declare.
1279         (dump_cselib_table): Declare.
1280         * cfgcleanup.c (flow_find_cross_jump): Skip debug insns.
1281         (try_crossjump_to_edge): Likewise.
1282         (delete_unreachable_blocks): Remove dominant GIMPLE blocks after
1283         dominated blocks when debug stmts are present.
1284         * simplify-rtx.c (delegitimize_mem_from_attrs): New.
1285         * tree-ssa-live.c (remove_unused_locals): Skip debug stmts.
1286         (set_var_live_on_entry): Likewise.
1287         * loop-invariant.c (find_invariants_bb): Skip debug insns.
1288         * cfglayout.c (curr_location, last_location): Make static.
1289         (set_curr_insn_source_location): Don't avoid bouncing.
1290         (get_curr_insn_source_location): New.
1291         (get_curr_insn_block): New.
1292         (duplicate_insn_chain): Handle debug insns.
1293         * tree-ssa-forwprop.c (forward_propagate_addr_expr): Propagate
1294         into debug stmts.
1295         * common.opt (fcompare-debug): Move to sort order.
1296         (fdump-unnumbered-links): Likewise.
1297         (fvar-tracking-assignments): New.
1298         (fvar-tracking-assignments-toggle): New.
1299         * tree-ssa-dce.c (mark_stmt_necessary): Don't mark blocks
1300         because of debug stmts.
1301         (mark_stmt_if_obviously_necessary): Mark debug stmts.
1302         (eliminate_unnecessary_stmts): Walk dominated blocks before
1303         dominators.
1304         * tree-ssa-ter.c (find_replaceable_in_bb): Skip debug stmts.
1305         * ira.c (memref_used_between_p): Skip debug insns.
1306         (update_equiv_regs): Likewise.
1307         * sched-deps.c (sd_lists_size): Accept empty list.
1308         (sd_init_insn): Mark debug insns.
1309         (sd_finish_insn): Unmark them.
1310         (sd_add_dep): Reject non-debug deps on debug insns.
1311         (fixup_sched_groups): Give debug insns group treatment.
1312         Skip debug insns.
1313         (sched_analyze_reg): Don't mark debug insns for sched before call.
1314         (sched_analyze_2): Handle debug insns.
1315         (sched_analyze_insn): Compute next non-debug insn.  Handle debug
1316         insns.
1317         (deps_analyze_insn): Handle debug insns.
1318         (deps_start_bb): Skip debug insns.
1319         (init_deps): Initialize last_debug_insn.
1320         * tree-ssa.c (target_for_debug_bind): New.
1321         (find_released_ssa_name): New.
1322         (propagate_var_def_into_debug_stmts): New.
1323         (propagate_defs_into_debug_stmts): New.
1324         (verify_ssa): Skip debug bind stmts without values.
1325         (warn_uninialized_vars): Skip debug stmts.
1326         * target-def.h (TARGET_DELEGITIMIZE_ADDRESS): Set default.
1327         * rtl.c (rtx_equal_p_cb): Handle VALUEs.
1328         (rtx_equal_p): Likewise.
1329         * ira-costs.c (scan_one_insn): Skip debug insns.
1330         (process_bb_node_for_hard_reg_moves): Likewise.
1331         * rtl.h (DEBUG_INSN_P): New.
1332         (NONDEBUG_INSN_P): New.
1333         (MAY_HAVE_DEBUG_INSNS): New.
1334         (INSN_P): Accept debug insns.
1335         (RTX_FRAME_RELATED_P): Likewise.
1336         (INSN_DELETED_P): Likewise
1337         (PAT_VAR_LOCATION_DECL): New.
1338         (PAT_VAR_LOCATION_LOC): New.
1339         (PAT_VAR_OCATION_STATUS): New.
1340         (NOTE_VAR_LOCATION_DECL): Reimplement.
1341         (NOTE_VAR_LOCATION_LOC): Likewise.
1342         (NOTE_VAR_LOCATION_STATUS): Likewise.
1343         (INSN_VAR_LOCATION): New.
1344         (INSN_VAR_LOCATION_DECL): New.
1345         (INSN_VAR_LOCATION_LOC): New.
1346         (INSN_VAR_LOCATION_STATUS): New.
1347         (gen_rtx_UNKNOWN_VAR_LOC): New.
1348         (VAR_LOC_UNKNOWN_P): New.
1349         (NOTE_DURING_CALL_P): New.
1350         (SCHED_GROUP_P): Accept debug insns.
1351         (emit_debug_insn_before): Declare.
1352         (emit_debug_insn_before_noloc): Declare.
1353         (emit_debug_insn_beore_setloc): Declare.
1354         (emit_debug_insn_after): Declare.
1355         (emit_debug_insn_after_noloc): Declare.
1356         (emit_debug_insn_after_setloc): Declare.
1357         (emit_debug_insn): Declare.
1358         (make_debug_insn_raw): Declare.
1359         (prev_nondebug_insn): Declare.
1360         (next_nondebug_insn): Declare.
1361         (delegitimize_mem_from_attrs): Declare.
1362         (get_max_insn_count): Declare.
1363         (wrap_constant): Declare.
1364         (unwrap_constant): Declare.
1365         (get_curr_insn_source_location): Declare.
1366         (get_curr_insn_block): Declare.
1367         * tree-inline.c (insert_debug_decl_map): New.
1368         (processing_debug_stmt): New.
1369         (remap_decl): Don't create new mappings in debug stmts.
1370         (remap_gimple_op_r): Don't add references in debug stmts.
1371         (copy_tree_body_r): Likewise.
1372         (remap_gimple_stmt): Handle debug bind stmts.
1373         (copy_bb): Skip debug stmts.
1374         (copy_edges_for_bb): Likewise.
1375         (copy_debug_stmt): New.
1376         (copy_debug_stmts): New.
1377         (copy_body): Copy debug stmts at the end.
1378         (insert_init_debug_bind): New.
1379         (insert_init_stmt): Take id.  Skip and emit debug stmts.
1380         (setup_one_parameter): Remap variable earlier, register debug mapping.
1381         (estimate_num_insns): Skip debug stmts.
1382         (expand_call_inline): Preserve debug_map.
1383         (optimize_inline_calls): Check for no debug_stmts left-overs.
1384         (unsave_expr_now): Preserve debug_map.
1385         (copy_gimple_seq_and_replace_locals): Likewise.
1386         (tree_function_versioning): Check for no debug_stmts left-overs.
1387         Init and destroy debug_map as needed.  Split edges unconditionally.
1388         (build_duplicate_type): Init and destroy debug_map as needed.
1389         * tree-inline.h: Include gimple.h instead of pointer-set.h.
1390         (struct copy_body_data): Add debug_stmts and debug_map.
1391         * sched-int.h (struct ready_list): Add n_debug.
1392         (struct deps): Add last_debug_insn.
1393         (DEBUG_INSN_SCHED_P): New.
1394         (BOUNDARY_DEBUG_INSN_P): New.
1395         (SCHEDULE_DEBUG_INSN_P): New.
1396         (sd_iterator_cond): Accept empty list.
1397         * combine.c (create_log_links): Skip debug insns.
1398         (combine_instructions): Likewise.
1399         (cleanup_auto_inc_dec): New.  From Jakub Jelinek: Make sure the
1400         return value is always unshared.
1401         (struct rtx_subst_pair): New.
1402         (auto_adjust_pair): New.
1403         (propagate_for_debug_subst): New.
1404         (propagate_for_debug): New.
1405         (try_combine): Skip debug insns.  Propagate removed defs into
1406         debug insns.
1407         (next_nonnote_nondebug_insn): New.
1408         (distribute_notes): Use it.  Skip debug insns.
1409         (distribute_links): Skip debug insns.
1410         * tree-outof-ssa.c (set_location_for_edge): Likewise.
1411         * resource.c (mark_target_live_regs): Likewise.
1412         * var-tracking.c: Include cselib.h and target.h.
1413         (enum micro_operation_type): Add MO_VAL_USE, MO_VAL_LOC, and
1414         MO_VAL_SET.
1415         (micro_operation_type_name): New.
1416         (enum emit_note_where): Add EMIT_NOTE_AFTER_CALL_INSN.
1417         (struct micro_operation_def): Update comments.
1418         (decl_or_value): New type.  Use instead of decls.
1419         (struct emit_note_data_def): Add vars.
1420         (struct attrs_def): Use decl_or_value.
1421         (struct variable_tracking_info_def): Add permp, flooded.
1422         (struct location_chain_def): Update comment.
1423         (struct variable_part_def): Use decl_or_value.
1424         (struct variable_def): Make var_part a variable length array.
1425         (valvar_pool): New.
1426         (scratch_regs): New.
1427         (cselib_hook_called): New.
1428         (dv_is_decl_p): New.
1429         (dv_is_value_p): New.
1430         (dv_as_decl): New.
1431         (dv_as_value): New.
1432         (dv_as_opaque): New.
1433         (dv_onepart_p): New.
1434         (dv_pool): New.
1435         (IS_DECL_CODE): New.
1436         (check_value_is_not_decl): New.
1437         (dv_from_decl): New.
1438         (dv_from_value): New.
1439         (dv_htab_hash): New.
1440         (variable_htab_hash): Use it.
1441         (variable_htab_eq): Support values.
1442         (variable_htab_free): Free from the right pool.
1443         (attrs_list_member, attrs_list_insert): Use decl_or_value.
1444         (attrs_list_union): Adjust.
1445         (attrs_list_mpdv_union): New.
1446         (tie_break_pointers): New.
1447         (canon_value_cmp): New.
1448         (unshare_variable): Return possibly-modified slot.
1449         (vars_copy_1): Adjust.
1450         (var_reg_decl_set): Adjust.  Split out of...
1451         (var_reg_set): ... this.
1452         (get_init_value): Adjust.
1453         (var_reg_delete_and_set): Adjust.
1454         (var_reg_delete): Adjust.
1455         (var_regno_delete): Adjust.
1456         (var_mem_decl_set): Split out of...
1457         (var_mem_set): ... this.
1458         (var_mem_delete_and_set): Adjust.
1459         (var_mem_delete): Adjust.
1460         (val_store): New.
1461         (val_reset): New.
1462         (val_resolve): New.
1463         (variable_union): Adjust.  Speed up merge of 1-part vars.
1464         (variable_canonicalize): Use unshared slot.
1465         (VALUED_RECURSED_INTO): New.
1466         (find_loc_in_1pdv): New.
1467         (struct dfset_merge): New.
1468         (insert_into_intersection): New.
1469         (intersect_loc_chains): New.
1470         (loc_cmp): New.
1471         (canonicalize_loc_order_check): New.
1472         (canonicalize_values_mark): New.
1473         (canonicalize_values_star): New.
1474         (variable_merge_over_cur): New.
1475         (variable_merge_over_src): New.
1476         (dataflow_set_merge): New.
1477         (dataflow_set_equiv_regs): New.
1478         (remove_duplicate_values): New.
1479         (struct dfset_post_merge): New.
1480         (variable_post_merge_new_vals): New.
1481         (variable_post_merge_perm_vals): New.
1482         (dataflow_post_merge_adjust): New.
1483         (find_mem_expr_in_1pdv): New.
1484         (dataflow_set_preserve_mem_locs): New.
1485         (dataflow_set_remove_mem_locs): New.
1486         (dataflow_set_clear_at_call): New.
1487         (onepart_variable_different_p): New.
1488         (variable_different_p): Use it.
1489         (dataflow_set_different_1): Adjust.  Make detailed dump more verbose.
1490         (track_expr_p): Add need_rtl parameter.  Don't generate rtl
1491         if not needed.
1492         (track_loc_p): Pass it true.
1493         (struct count_use_info): New.
1494         (find_use_val): New.
1495         (replace_expr_with_values): New.
1496         (log_op_type): New.
1497         (use_type): New, partially split out of...
1498         (count_uses): ... this.  Count new micro-ops.
1499         (count_uses_1): Adjust.
1500         (count_stores): Adjust.
1501         (count_with_sets): New.
1502         (VAL_NEEDS_RESOLUTION): New.
1503         (VAL_HOLDS_TRACK_EXPR): New.
1504         (VAL_EXPR_IS_COPIED): New.
1505         (VAL_EXPR_IS_CLOBBERED): New.
1506         (add_uses): Adjust.  Generate new micro-ops.
1507         (add_uses_1): Adjust.
1508         (add_stores): Generate new micro-ops.
1509         (add_with_sets): New.
1510         (find_src_status): Adjust.
1511         (find_src_set_src): Adjust.
1512         (compute_bb_dataflow): Use dataflow_set_clear_at_call.
1513         Handle new micro-ops.  Canonicalize value equivalances.
1514         (vt_find_locations): Compute total size of hash tables for
1515         dumping.  Perform merge for var-tracking-assignments.  Don't
1516         disregard single-block loops.
1517         (dump_attrs_list): Handle decl_or_value.
1518         (dump_variable): Take variable.  Deal with decl_or_value.
1519         (dump_variable_slot): New.
1520         (dump_vars): Use it.
1521         (dump_dataflow_sets): Adjust.
1522         (set_slot_part): New, extended to support one-part variables
1523         after splitting out of...
1524         (set_variable_part): ... this.
1525         (clobber_slot_part): New, split out of...
1526         (clobber_variable_part): ... this.
1527         (delete_slot_part): New, split out of...
1528         (delete_variable_part): .... this.
1529         (check_wrap_constant): New.
1530         (vt_expand_loc_callback): New.
1531         (vt_expand_loc): New.
1532         (emit_note_insn_var_location): Adjust.  Handle values.  Handle
1533         EMIT_NOTE_AFTER_CALL_INSN.
1534         (emit_notes_for_differences_1): Adjust.  Handle values.
1535         (emit_notes_for_differences_2): Likewise.
1536         (emit_notes_for_differences): Adjust.
1537         (emit_notes_in_bb): Take pointer to set.  Emit AFTER_CALL_INSN notes.
1538         Adjust.  Handle new micro-ops.
1539         (vt_add_function_parameters): Adjust.  Create and bind values.
1540         (vt_initialize): Adjust.  Initialize scratch_regs and
1541         valvar_pool, flooded and perm..  Initialize and use cselib.  Log
1542         operations.  Move some code to count_with_sets and add_with_sets.
1543         (delete_debug_insns): New.
1544         (vt_debug_insns_local): New.
1545         (vt_finalize): Release permp, valvar_pool, scratch_regs.  Finish
1546         cselib.
1547         (var_tracking_main): If var-tracking-assignments is enabled
1548         but var-tracking isn't, delete debug insns and leave.  Likewise
1549         if we exceed limits or fail the stack adjustments tests, and
1550         after all var-tracking processing.
1551         More in var-tracking, from Jakub Jelinek <jakub@redhat.com>:
1552         (dataflow_set): Add traversed_vars.
1553         (value_chain, const_value_chain): New typedefs.
1554         (value_chain_pool, value_chains): New variables.
1555         (value_chain_htab_hash, value_chain_htab_eq, add_value_chain,
1556         add_value_chains, add_cselib_value_chains, remove_value_chain,
1557         remove_value_chains, remove_cselib_value_chains): New functions.
1558         (shared_hash_find_slot_unshare_1, shared_hash_find_slot_1,
1559         shared_hash_find_slot_noinsert_1, shared_hash_find_1): New
1560         static inlines.
1561         (shared_hash_find_slot_unshare, shared_hash_find_slot,
1562         shared_hash_find_slot_noinsert, shared_hash_find): Update.
1563         (dst_can_be_shared): New variable.
1564         (unshare_variable): Unshare set->vars if shared, use shared_hash_*.
1565         Clear dst_can_be_shared.  If set->traversed_vars is non-NULL and
1566         different from set->vars, look up slot again instead of using the
1567         passed in slot.
1568         (dataflow_set_init): Initialize traversed_vars.
1569         (variable_union): Use shared_hash_*.  Use initially NO_INSERT
1570         lookup if set->vars is shared.  Don't keep slot cleared before
1571         calling unshare_variable.  Unshare set->vars if needed.  Adjust
1572         unshare_variable callers.  Clear dst_can_be_shared if needed.
1573         Even ->refcount == 1 vars must be unshared if set->vars is shared
1574         and var needs to be modified.
1575         (dataflow_set_union): Set traversed_vars during canonicalization.
1576         (VALUE_CHANGED, DECL_CHANGED): Define.
1577         (set_dv_changed, dv_changed_p): New static inlines.
1578         (track_expr_p): Clear DECL_CHANGED.
1579         (dump_dataflow_sets): Set it.
1580         (variable_was_changed): Call set_dv_changed.
1581         (emit_note_insn_var_location): Likewise.
1582         (changed_variables_stack): New variable.
1583         (check_changed_vars_1, check_changed_vars_2): New functions.
1584         (emit_notes_for_changes): Do nothing if changed_variables is
1585         empty.  Traverse changed_variables with check_changed_vars_1,
1586         call check_changed_vars_2 on each changed_variables_stack entry.
1587         (emit_notes_in_bb): Add SET argument.  Just clear it at the
1588         beginning, use it instead of local &set, don't destroy it at the end.
1589         (vt_emit_notes): Call dataflow_set_clear early on all
1590         VTI(bb)->out sets, never use them, instead use emit_notes_in_bb
1591         computed set, dataflow_set_clear also VTI(bb)->in when we are
1592         done with the basic block.  Initialize changed_variables_stack,
1593         free it afterwards.  If ENABLE_CHECKING verify that after noting
1594         differences to an empty set value_chains hash table is empty.
1595         (vt_initialize): Initialize value_chains and value_chain_pool.
1596         (vt_finalize): Delete value_chains htab, free value_chain_pool.
1597         (variable_tracking_main): Call dump_dataflow_sets before calling
1598         vt_emit_notes, not after it.
1599         * tree-flow.h (propagate_defs_into_debug_stmts): Declare.
1600         (propagate_var_def_into_debug_stmts): Declare.
1601         * df-problems.c (df_lr_bb_local_compute): Skip debug insns.
1602         (df_set_note): Reject debug insns.
1603         (df_whole_mw_reg_dead_p): Take added_notes_p argument.  Don't
1604         add notes to debug insns.
1605         (df_note_bb_compute): Adjust.  Likewise.
1606         (df_simulate_uses): Skip debug insns.
1607         (df_simulate_initialize_backwards): Likewise.
1608         * reg-stack.c (subst_stack_regs_in_debug_insn): New.
1609         (subst_stack_regs_pat): Reject debug insns.
1610         (convert_regs_1): Handle debug insns.
1611         * Makefile.in (TREE_INLINE_H): Take pointer-set.h from GIMPLE_H.
1612         (print-rtl.o): Depend on cselib.h.
1613         (cselib.o): Depend on TREE_PASS_H.
1614         (var-tracking.o): Depend on cselib.h and TARGET_H.
1615         * sched-rgn.c (rgn_estimate_number_of_insns): Discount debug insns.
1616         (init_ready_list): Skip boundary debug insns.
1617         (add_branch_dependences): Skip debug insns.
1618         (free_block_dependencies): Check for blocks with only debug insns.
1619         (compute_priorities): Likewise.
1620         * gimple.c (gss_for_code): Handle GIMPLE_DEBUG.
1621         (gimple_build_with_ops_stat): Take subcode as unsigned.  Adjust
1622         all callers.
1623         (gimple_build_debug_bind_stat): New.
1624         (empty_body_p): Skip debug stmts.
1625         (gimple_has_side_effects): Likewise.
1626         (gimple_rhs_has_side_effects): Likewise.
1627         * gimple.h (enum gimple_debug_subcode, GIMPLE_DEBUG_BIND): New.
1628         (gimple_build_debug_bind_stat): Declare.
1629         (gimple_build_debug_bind): Define.
1630         (is_gimple_debug): New.
1631         (gimple_debug_bind_p): New.
1632         (gimple_debug_bind_get_var): New.
1633         (gimple_debug_bind_get_value): New.
1634         (gimple_debug_bind_get_value_ptr): New.
1635         (gimple_debug_bind_set_var): New.
1636         (gimple_debug_bind_set_value): New.
1637         (GIMPLE_DEBUG_BIND_NOVALUE): New internal temporary macro.
1638         (gimple_debug_bind_reset_value): New.
1639         (gimple_debug_bind_has_value_p): New.
1640         (gsi_next_nondebug): New.
1641         (gsi_prev_nondebug): New.
1642         (gsi_start_nondebug_bb): New.
1643         (gsi_last_nondebug_bb): New.
1644         * sched-vis.c (print_pattern): Handle VAR_LOCATION.
1645         (print_insn): Handle DEBUG_INSN.
1646         * tree-cfg.c (remove_bb): Walk stmts backwards.  Let loc
1647         of first insn prevail.
1648         (first_stmt): Skip debug stmts.
1649         (first_non_label_stmt): Likewise.
1650         (last_stmt): Likewise.
1651         (has_zero_uses_1): New.
1652         (single_imm_use_1): New.
1653         (verify_gimple_debug): New.
1654         (verify_types_in_gimple_stmt): Handle debug stmts.
1655         (verify_stmt): Likewise.
1656         (debug_loop_num): Skip debug stmts.
1657         (remove_edge_and_dominated_blocks): Remove dominators last.
1658         * tree-ssa-reasssoc.c (rewrite_expr_tree): Propagate into debug stmts.
1659         (linearize_expr): Likewise.
1660         * config/i386/i386.c (ix86_delegitimize_address): Call
1661         default implementation.
1662         * config/ia64/ia64.c (ia64_safe_itanium_class): Handle debug insns.
1663         (group_barrier_needed): Skip debug insns.
1664         (emit_insn_group_barriers): Likewise.
1665         (emit_all_insn_group_barriers): Likewise.
1666         (ia64_variable_issue): Handle debug insns.
1667         (ia64_dfa_new_cycle): Likewise.
1668         (final_emit_insn_group_barriers): Skip debug insns.
1669         (ia64_dwarf2out_def_steady_cfa): Take frame argument.  Don't
1670         def cfa without frame.
1671         (process_set): Likewise.
1672         (process_for_unwind_directive): Pass frame on.
1673         * config/rs6000/rs6000.c (TARGET_DELEGITIMIZE_ADDRESS): Define.
1674         (rs6000_delegitimize_address): New.
1675         (rs6000_debug_adjust_cost): Handle debug insns.
1676         (is_microcoded_insn): Likewise.
1677         (is_cracked_insn): Likewise.
1678         (is_nonpipeline_insn): Likewise.
1679         (insn_must_be_first_in_group): Likewise.
1680         (insn_must_be_last_in_group): Likewise.
1681         (force_new_group): Likewise.
1682         * cfgrtl.c (rtl_split_block): Emit INSN_DELETED note if block
1683         contains only debug insns.
1684         (rtl_merge_blocks): Skip debug insns.
1685         (purge_dead_edges): Likewise.
1686         (rtl_block_ends_with_call_p): Skip debug insns.
1687         * dce.c (deletable_insn_p): Handle VAR_LOCATION.
1688         (mark_reg_dependencies): Skip debug insns.
1689         * params.def (PARAM_MIN_NONDEBUG_INSN_UID): New.
1690         * tree-ssanames.c (release_ssa_name): Propagate def into debug stmts.
1691         * tree-ssa-threadedge.c
1692         (record_temporary_equivalences_from_stmts): Skip debug stmts.
1693         * regcprop.c (replace_oldest_value_addr): Skip debug insns.
1694         (replace_oldest_value_mem): Use ALL_REGS for debug insns.
1695         (copyprop_hardreg_forward_1): Handle debug insns.
1696         * reload1.c (reload): Skip debug insns.  Replace unassigned
1697         pseudos in debug insns with their equivalences.
1698         (eliminate_regs_in_insn): Skip debug insns.
1699         (emit_input_reload_insns): Skip debug insns at first, adjust
1700         them later.
1701         * tree-ssa-operands.c (add_virtual_operand): Reject debug stmts.
1702         (get_indirect_ref_operands): Pass opf_no_vops on.
1703         (get_expr_operands): Likewise.  Skip debug stmts.
1704         (parse_ssa_operands): Scan debug insns with opf_no_vops.
1706 2009-09-01  Richard Henderson  <rth@redhat.com>
1708         * tree-ssa-ccp.c (ccp_initialize): Make sure to simulate
1709         stmt_ends_pp_p statements at least once.
1710         * tree-vrp.c (vrp_initialize): Likewise.
1711         (vrp_visit_stmt): Be prepared for non-interesting stmts.
1713 2009-09-01  Dodji Seketeli  <dodji@redhat.com>
1715         PR bootstrap/41205
1716         Fix AIX bootstrap after PR debug/30161
1717         * dwarf2out.c (make_ith_pack_parameter_name): Don't used strnlen
1718         that is a GNU extension.
1719         (tmpl_value_parm_die_table): Move the definition of this global
1720         outside #ifdef DWARF2_DEBUGGING_INFO region.
1722 2009-09-01  Richard Guenther  <rguenther@suse.de>
1724         * tree.c (tree_expr_size): New function.
1725         * tree.h (tree_expr_size): Declare.
1726         * rtlanal.c (rtx_addr_can_trap_p_1): Adjust comment.
1727         * builtins.c (fold_builtin_memory_op): Use tree_expr_size.
1728         * langhooks.c (lhd_expr_size): Remove.
1729         * langhooks.h (struct lang_hooks): Remove expr_size.
1730         * explow.c (expr_size): Use tree_expr_size.
1731         (int_expr_size): Likewise.
1732         * langhooks-def.h (lhd_expr_size): Remove.
1733         (LANG_HOOKS_EXPR_SIZE): Likewise.
1734         (LANG_HOOKS_INITIALIZER): Adjust.
1736 2009-09-01  Richard Guenther  <rguenther@suse.de>
1738         * tree-flow.h (mark_addressable): Move declaration ...
1739         * tree.h (mark_addressable): ... here.
1740         * stmt.c (expand_asm_operands): Use mark_addressable, not
1741         lang_hooks.mark_addressable.
1742         * langhooks-def.h (LANG_HOOKS_INITIALIZER): Remove
1743         LANG_HOOKS_MARK_ADDRESSABLE.
1744         * langhooks.h (struct lang_hooks): Remove mark_addressable langhook.
1745         * c-objc-common.h (LANG_HOOKS_MARK_ADDRESSABLE): Remove.
1747 2009-08-31  Chris Demetriou  <cgd@google.com>
1749         * config/i386/i386.c (ix86_vectorize_builtin_conversion): Never
1750         vectorize if not TARGET_SSE2.
1752 2009-08-31  DJ Delorie  <dj@redhat.com>
1754         * config/mep/mep.h (FUNCTION_ARG_REGNO_P): Exclude coprocessor
1755         registers if no coprocessor is enabled.
1757 2009-08-31  Dodji Seketeli  <dodji@redhat.com>
1759         PR debug/30161
1760         * cgraph.h (cgraph_get_node): Declare ...
1761         * cgraph.c (cgraph_get_node): ... new function.
1762         * dwarf2out.c (gen_generic_params_dies,
1763         generic_parameter_die, tree_add_const_value_attribute_for_decl,
1764         make_ith_pack_parameter_name,
1765         append_entry_to_tmpl_value_parm_die_table,
1766         gen_remaining_tmpl_value_param_die_attribute): New functions.
1767         (gen_subprogram_die): Generate debug info for template parameters
1768         if debug info level is higher than DINFO_LEVEL_TERSE.
1769         Use tree_add_const_value_attribute_for_decl instead of
1770         tree_add_const_value_attribute.
1771         (gen_const_die): Use tree_add_const_value_attribute_for_decl
1772         instead of tree_add_const_value_attribute.
1773         (gen_struct_or_union_type_die): Generate debug
1774         info for template parameters if debug info level is higher than
1775         DINFO_LEVEL_TERSE.
1776         (tree_add_const_value_attribute): Handle integral and pointer
1777         constants. Update comment.
1778         (dwarf_tag_name): Support DW_TAG_GNU_template_template_param.
1779         (dwarf_attr_name): Support DW_AT_GNU_template_name.
1780         (reference_to_unused): Fix thinko. Remove redundant predicates from
1781         tests.
1782         (tree_add_const_value_attribute): Make this work for constant
1783         expressions only.
1784         tree_add_const_value_attribute_for_decl is to be used for variable
1785         DECLs now.
1786         (add_location_or_const_value_attribute): Use
1787         tree_add_const_value_attribute_for_decl now.
1788         (dwarf2out_finish): Emit the DW_AT_const_value attribute of
1789         DW_TAG_template_value_param DIEs after function DIEs have been
1790         emitted.
1791         * langhooks.h (lang_hooks_for_types): Add
1792         get_argument_pack_elems.
1793         (lang_hooks_for_decls): Add generic_generic_parameter_decl_p.
1794         (lang_hooks): Added get_innermost_generic_parms,
1795         get_innermost_generic_args.
1796         * langhooks-def.h (LANG_HOOKS_GET_INNERMOST_GENERIC_PARMS,
1797         LANG_HOOKS_GET_INNERMOST_GENERIC_ARGS,
1798         LANG_HOOKS_GET_ARGUMENT_PACK_ELEMS,
1799         LANG_HOOKS_GENERIC_GENERIC_PARAMETER_DECL_P): New language hooks.
1801 2009-08-31  DJ Delorie  <dj@redhat.com>
1803         * config/mep/mep.c (machine_function): Add frame_locked flag.  Set
1804         it once we start generating the prologue or epilogue.
1805         (mep_call_saves_register): If the frame is locked, re-use
1806         cached values.
1807         (mep_assign_save_slots): New, broken out from mep_expand_prologue.
1808         (mep_expand_prologue): Call it.
1809         (mep_expand_epilogue): Likewise.
1810         (mep_start_function): Use the same logic as mep_expand_prologue.
1811         (mep_pass_by_reference): Make logic more readable.
1812         (mep_return_in_memory): Zero-sized objects are passed in memory.
1813         (mep_reorg_noframe): Make sure we have accurate REG_DEAD notes.
1815 2009-08-31  Richard Guenther  <rguenther@suse.de>
1817         * builtins.c (fold_builtin_memory_op): Use the alias oracle
1818         to query if the memory regions for memmove overlap.
1819         * tree-ssa-alias.c (ptr_deref_may_alias_decl_p): Relax the
1820         asserts on pointers, instead deal with odd trees.
1821         (ptr_derefs_may_alias_p): Likewise.
1822         (refs_may_alias_p_1): Constructor bases also never alias.
1824 2009-08-31  Gerald Pfeifer  <gerald@pfeifer.com>
1826         * doc/install.texi (Final install): Adjust reference on where to
1827         order printed manuals.
1829 2009-08-30  Olivier Hainque  <hainque@adacore.com>
1831         * dwarf2out.c (switch_to_frame_table_section): Move
1832         definition prior to first use.
1834 2009-08-30  Richard Guenther  <rguenther@suse.de>
1836         PR tree-optimization/41186
1837         * tree-ssa-alias.c (ptr_deref_may_alias_ref_p): Remove.
1838         (ao_ref_init_from_ptr_and_size): New function.
1839         (ref_maybe_used_by_call_p_1): Be more precise tracking
1840         used ranges for builtin functions.
1841         (ref_maybe_used_by_call_p): Adjust.
1842         (call_may_clobber_ref_p_1): Be more precise tracking clobbered
1843         ranges for builtin functions.
1844         * tree-ssa-alias.h (ao_ref_init_from_ptr_and_size): Declare.
1846 2009-08-30  Alan Modra  <amodra@bigpond.net.au>
1848         PR target/41081
1849         * fwprop.c (get_reg_use_in): Delete.
1850         (free_load_extend): New function.
1851         (forward_propagate_subreg): Use it.
1853 2009-08-29  Kaz Kojima  <kkojima@gcc.gnu.org>
1855         * config.gcc (sh*-*-elf): Add superh stuff only for sh*-superh-elf.
1857 2009-08-29  Kai Tietz<kai.tietz@onevision.com>
1859         PR/41184
1860         * config/i386.c (ix86_expand_epilogue): Correct stack adjustment for
1861         padding.
1863 2009-08-29  Douglas B Rupp  <rupp@gnat.com>
1865         * crtstuff.c (__do_global_dtors_aux): Use atexit if no
1866         fini or fini_array section.
1868 2009-08-28  Sebastian Pop  <sebastian.pop@amd.com>
1870         * graphite-dependences.c (graphite_legal_transform_bb): Call
1871         pbb_remove_duplicate_pdrs.
1872         * graphite-poly.c (can_collapse_pdr): Removed.
1873         (pdr_find_duplicate): Removed.
1874         (can_collapse_pdrs): New.
1875         (pbb_remove_duplicate_pdrs): New.
1876         (new_poly_dr): Do not look for duplicates.
1877         * graphite-poly.h (struct poly_bb): New field pdr_duplicates_removed.
1878         (PBB_PDR_DUPLICATES_REMOVED): New.
1879         (pbb_remove_duplicate_pdrs): Declared.
1881 2009-08-28  Sebastian Pop  <sebastian.pop@amd.com>
1883         * graphite-interchange.c (pbb_interchange_profitable_p): Adjust
1884         the strides by multiplying by PDR_NB_REFS.
1885         * graphite-poly.c (can_collapse_pdr): New.
1886         (pdr_find_duplicate): New.
1887         (new_poly_dr): Call pdr_find_duplicate.  Collapse duplicate PDRs.
1888         Initialize PDR_NB_REFS.
1889         * graphite-poly.h (struct poly_dr): Add field nb_refs.
1890         (PDR_NB_REFS): New.
1891         (new_poly_dr): Number of subscripts is a graphite_dim_t.
1893 2009-08-28  Sebastian Pop  <sebastian.pop@amd.com>
1895         PR middle-end/40965
1896         * graphite-poly.c (apply_poly_transforms): Remove legality test before
1897         any transform.
1899 2009-08-28  Sebastian Pop  <sebastian.pop@amd.com>
1901         * graphite-dependences.c (pddr_original_scattering): Return NULL
1902         for read-read dependence relations.
1903         * graphite-poly.h (enum poly_dr_type): Fix comment.
1904         (pdr_read_p): New.
1905         (pdr_write_p): New.
1906         (pdr_may_write_p): New.
1908 2009-08-28  Sebastian Pop  <sebastian.pop@amd.com>
1910         * graphite-poly.h (enum POLY_DR_TYPE): Renamed poly_dr_type.
1911         (struct poly_dr): Same.
1912         (new_poly_dr): Same.
1913         * graphite-poly.c (new_poly_dr): Same.
1914         * graphite-dependences.c (dot_deps): Disable call to system.
1916 2009-08-28  Cary Coutant  <ccoutant@google.com>
1918         PR debug/41063
1919         * dwarf2out.c (gen_type_die_with_usage): Use proper context for
1920         struct/union/enum types local to a function.
1922 2009-08-28  Konrad Trifunovic  <konrad.trifunovic@gmail.com>
1923             Sebastian Pop  <sebastian.pop@amd.com>
1925         * graphite-blocking.c (pbb_strip_mine_loop_depth): Renamed
1926         pbb_strip_mine_time_depth.  Changed the implementation so that
1927         transformation is expressed as a transformation on
1928         time (scatttering) dimensions.  Also, ensures that the 2d+1
1929         scheduling format is preserved.
1930         (pbb_strip_mine_profitable_p): Profitability is based on the
1931         iteration number of a given time (scattering) dimension,
1932         and not on a original loop depth dimension.
1933         (pbb_strip_mine): Call pbb_number_of_iterations_at_time.
1934         (pbb_do_strip_mine): Call psct_dynamic_dim.
1935         * graphite-poly.c (pbb_number_of_iterations_at_time): New.
1936         * graphite-poly.h (pbb_number_of_iterations_at_time): Declared.
1937         (pbb_nb_dynamic_scattering_transform): New.
1938         (psct_dynamic_dim): New.
1940 2009-08-28  Konrad Trifunovic  <konrad.trifunovic@gmail.com>
1942         * graphite-ppl.c (ppl_max_for_le): Renamed ppl_max_for_le_pointset.
1943         * graphite-ppl.h (ppl_max_for_le): Renamed ppl_max_for_le_pointset.
1944         * graphite-poly.c (pbb_number_of_iterations): Rename ppl_max_for_le.
1945         * graphite-interchange.c (build_linearized_memory_access): Same.
1946         (memory_stride_in_loop): Same.
1948 2009-08-28  Sebastian Pop  <sebastian.pop@amd.com>
1950         * graphite-dependences.c (pddr_original_scattering): New.
1951         (graphite_legal_transform_dr): Call pddr_original_scattering.
1952         (dot_deps_1): New.
1953         (dot_deps): New.
1954         * graphite-dependences.h (dot_deps): Declared.
1955         * graphite-poly.c (new_poly_dr): Initialize PDR_ID.
1956         (print_pdr): Print PDR_ID.
1957         * graphite-poly.h (struct poly_dr): Add field id.
1958         (PDR_ID): New.
1959         (pbb_index): New.
1960         * graphite-scop-detection.c (dot_all_scops_1): Cleanup comment.
1962 2009-08-28  Sebastian Pop  <sebastian.pop@amd.com>
1964         * graphite-dependences.c (graphite_carried_dependence_level_k): Do
1965         not delete the original dependence relation.
1967 2009-08-28  Sebastian Pop  <sebastian.pop@amd.com>
1969         * graphite-dependences.c (new_poly_dr_pair): Renamed new_poly_ddr.
1970         (eq_poly_dr_pair_p): Renamed eq_poly_ddr_p.
1971         (hash_poly_dr_pair_p): Renamed hash_poly_ddr_p.
1972         (free_poly_ddr): New.
1973         (pddr_is_empty): New.
1974         (dependence_polyhedron_1): Now returns a poly_ddr_p.
1975         (dependence_polyhedron): Same.  Remove useless gcc_assert.
1976         Remove fprintfs.
1977         (graphite_legal_transform_dr): Call pddr_is_empty and free_poly_ddr.
1978         (graphite_carried_dependence_level_k): Call pddr_is_empty.
1979         * graphite-dependences.h (enum poly_dependence_kind): New.
1980         (poly_dr_pair): Renamed poly_ddr.  Added a field kind.
1981         (PDRP_SOURCE): Renamed PDDR_SOURCE.
1982         (PDRP_SINK): Renamed PDDR_SINK.
1983         (PDRP_DDP): Renamed PDDR_DDP.
1984         (PDDR_KIND): New.
1985         (free_poly_ddr): Declared.
1986         * graphite-poly.c (new_scop): Use the new hash function names.
1987         * graphite-poly.h (struct scop): Renamed field original_pdr_pairs
1988         into original_pddrs.
1989         (SCOP_ORIGINAL_PDR_PAIRS): Renamed SCOP_ORIGINAL_PDDRS.
1991 2009-08-28  Sebastian Pop  <sebastian.pop@amd.com>
1993         * cfgloopmanip.c (create_empty_loop_on_edge): Generate upper
1994         bounds with LT_EXPR to make niter analysis more precise on code
1995         generated by Graphite.
1997 2009-08-28  Sebastian Pop  <sebastian.pop@amd.com>
1999         * graphite-dependences.c (graphite_legal_transform_dr): Fix formatting.
2000         (graphite_legal_transform_bb): Same.
2001         (poly_drs_may_alias_p): Same.
2003 2009-08-28  Richard Guenther  <rguenther@suse.de>
2005         * tree.def: Remove note about obsolete TYPE_NONCOPIED_PARTS.
2007 2009-08-28  Jan Beulich  <jbeulich@novell.com>
2009         * config/i386/netware.c: Include langhooks.h.
2010         (i386_nlm_encode_section_info): Simplify.
2011         (netware_override_options): Delete.
2012         * config/i386/netware.h (netware_override_options): Delete
2013         declaration.
2014         (OVERRIDE_OPTIONS): Delete definition.
2015         (SUBTARGET_OVERRIDE_OPTIONS): Define.
2016         (ASM_COMMENT_START): Define.
2017         * config/i386/nwld.h (SUBSUBTARGET_OVERRIDE_OPTIONS): Define.
2019 2009-08-28  Jan Beulich  <jbeulich@novell.com>
2021         * configure.ac: For in-tree ld, do a plain version check to
2022         determine whether comdat groups are supported.
2023         * configure: Regenerate.
2025 2009-08-28  Olivier Hainque  <hainque@adacore.com>
2027         * collect2.c (DO_COLLECT_EXPORT_LIST): New internal macro,
2028         always defined.  Reflect definition or absence of such for
2029         COLLECT_EXPORT_LIST.  Readability helper.
2030         (scanfilter): New enum, to help control what symbols
2031         are to be considered or ignored by scan_prog_file.
2032         (enum pass): Rename as "scanpass", moved together with scanfilter
2033         prior to scan_prog_file's prototype.
2034         (scan_prog_file): Accept and honor scanpass and scanfilter arguments.
2035         Group prototype with the scanpass/scanfilter definitions, factorize
2036         head comments for the several implementations at the prototype.
2037         (main): Reorganize the first pass link control to let AIX
2038         drag only the needed frame tables in executables.  Prevent
2039         frame tables collection during the scan aimed at static ctors.
2040         Pre-link and scan for frame tables later to compensate.
2041         * doc/tm.texi (ASM_OUTPUT_DWARF_TABLE_REF): New macro.
2042         A C statement to issue assembly directives that create a reference
2043         to the given DWARF table identifier label from the current function
2044         section.
2045         * dwarf2out.c (switch_to_eh_frame_section): Add a BACK argument
2046         to differentiate first time section entry.  Only emit a .data
2047         tables start identifier label the first time around.
2048         (switch_to_frame_table_section): New function.  Helper for
2049         output_call_frame_info to switch possibly BACK into the eh_frame
2050         or the debug_frame section depending on FOR_EH.
2051         (output_call_frame_info): Use helper to first enter the proper
2052         frame section.
2053         (output_fde): Use ASM_OUTPUT_DWARF_TABLE_REF when defined to
2054         emit a link to the frame table start label from each function
2055         section.
2056         * config/rs6000/rs6000.c (rs6000_aix_asm_output_dwarf_table_ref):
2057         New function.  Implementation of ASM_OUTPUT_DWARF_TABLE_REF.
2058         * config/rs6000/rs6000-protos.h: Declare it.
2059         * config/rs6000/aix.h (ASM_OUTPUT_DWARF_TABLE_REF): Define.
2061 2009-08-27  Kaz Kojima  <kkojima@gcc.gnu.org>
2063         * config/sh/sh.c (split_branches): Check the result of
2064         next_active_insn.
2066 2009-08-27  Steve Ellcey  <sje@cup.hp.com>
2068         * config/ia64/hpux.h (LIB_SPEC): Add -lrt for when
2069         using -pthread -fopenmp
2071 2009-08-27  Gerald Pfeifer  <gerald@pfeifer.com>
2073         * doc/service.texi (service directory): Update URL.
2075 2009-08-27  Uros Bizjak  <ubizjak@gmail.com>
2077         PR rtl-optimization/40861
2078         * simplify-rtx.c (simplify_subreg): Do not call simplify_gen_subreg to
2079         extract word from a multi-word subreg for negative byte positions.
2081 2009-08-27  Tristan Gingold  <gingold@adacore.com>
2082             Douglas B Rupp  <rupp@gnat.com>
2084         * config/ia64/ia64.c (ia64_attribute_table): Add "common_object" entry.
2085         (SECTION_VMS_OVERLAY): Define.
2086         (ia64_vms_common_object_attribute): Added.  Handle the "common_object"
2087         attribute.
2088         (ia64_vms_elf_asm_named_section): Added.  Generate .section pseudo-op
2089         for common_object.
2090         (ia64_vms_output_aligned_decl_common): Added.  Generate pseudo-op for
2091         common_object declarations.
2092         (ia64_section_type_flags): Set section flag for common_object.
2093         * config/ia64/ia64-protos.h
2094         (ia64_vms_output_aligned_decl_common): Declare.
2095         (ia64_vms_elf_asm_named_section): Declare.
2097 2009-08-27  Michael Matz  <matz@suse.de>
2099         * expr.c (expand_expr_real_2): New function taking exploded
2100         unary or binary expression, split out from ...
2101         (expand_expr_real_1): ... here.  Move over all unary/binary
2102         switch parts to above function, in particular these codes:
2103         PAREN_EXPR, NOP_EXPR, CONVERT_EXPR, POINTER_PLUS_EXPR, PLUS_EXPR,
2104         MINUS_EXPR, MULT_EXPR, TRUNC_DIV_EXPR, FLOOR_DIV_EXPR, CEIL_DIV_EXPR,
2105         ROUND_DIV_EXPR, EXACT_DIV_EXPR, RDIV_EXPR, TRUNC_MOD_EXPR,
2106         FLOOR_MOD_EXPR, CEIL_MOD_EXPR, ROUND_MOD_EXPR, FIXED_CONVERT_EXPR,
2107         FIX_TRUNC_EXPR, FLOAT_EXPR, NEGATE_EXPR, ABS_EXPR, MAX_EXPR, MIN_EXPR,
2108         BIT_NOT_EXPR, TRUTH_AND_EXPR, BIT_AND_EXPR, TRUTH_OR_EXPR,
2109         BIT_IOR_EXPR, TRUTH_XOR_EXPR, BIT_XOR_EXPR, LROTATE_EXPR, RROTATE_EXPR,
2110         LSHIFT_EXPR, RSHIFT_EXPR, LT_EXPR, LE_EXPR, GT_EXPR, GE_EXPR, EQ_EXPR,
2111         NE_EXPR, UNORDERED_EXPR, ORDERED_EXPR, UNLT_EXPR, UNLE_EXPR, UNGT_EXPR,
2112         UNGE_EXPR, UNEQ_EXPR, LTGT_EXPR, TRUTH_NOT_EXPR, COMPLEX_EXPR,
2113         WIDEN_SUM_EXPR, REDUC_MAX_EXPR, REDUC_MIN_EXPR, REDUC_PLUS_EXPR,
2114         VEC_EXTRACT_EVEN_EXPR, VEC_EXTRACT_ODD_EXPR, VEC_INTERLEAVE_HIGH_EXPR,
2115         VEC_INTERLEAVE_LOW_EXPR, VEC_LSHIFT_EXPR, VEC_RSHIFT_EXPR,
2116         VEC_UNPACK_HI_EXPR, VEC_UNPACK_LO_EXPR, VEC_UNPACK_FLOAT_HI_EXPR,
2117         VEC_UNPACK_FLOAT_LO_EXPR, VEC_WIDEN_MULT_HI_EXPR,
2118         VEC_WIDEN_MULT_LO_EXPR, VEC_PACK_TRUNC_EXPR, VEC_PACK_SAT_EXPR,
2119         VEC_PACK_FIX_TRUNC_EXPR.
2120         (<case PAREN_EXPR>): Call set_mem_attributes() with type, not the
2121         full expression.
2123 2009-08-27  Richard Guenther  <rguenther@suse.de>
2125         * gengtype.c (main): Handle uint64_t.
2126         * ipa-utils.c (get_base_var): Indent properly.
2127         * tree-ssa-live.c (debug_scope_block): New function.
2128         * tree-flow.h (debug_scope_block): Declare.
2129         * tree-ssa-copy.c (replace_exp_1): Add vertical space.
2130         * basic-block.h (enum profile_status): Rename to
2131         enum profile_status_d.
2132         (x_profile_status): Adjust type.
2134 2009-08-27  Dodji Seketeli  <dodji@redhat.com>
2136         PR debug/41170
2137         * dwarf2out.c (get_context_die): Declare this static function.
2138         (gen_type_die_with_usage): Make sure a DIE is a generated for
2139         the context of a typedef.
2141 2009-08-26  Anatoly Sokolov  <aesok@post.ru>
2143         * doc/invoke.texi (AVR Options): Remove documentation of -minit-stack
2144         switch.
2146 2009-08-26  Richard Sandiford  <rdsandiford@googlemail.com>
2148         * config/mips/mips-protos.h (mips_output_sync): Declare.
2149         (mips_sync_loop_insns): Likewise.
2150         (mips_output_sync_loop): Replace first two parameters with an rtx.
2151         * config/mips/mips.c (mips_multi_member): New structure.
2152         (mips_multi_members): New variable.
2153         (mips_multi_start): New function.
2154         (mips_multi_add): Likewise.
2155         (mips_multi_add_insn): Likewise.
2156         (mips_multi_add_label): Likewise.
2157         (mips_multi_last_index): Likewise.
2158         (mips_multi_copy_insn): Likewise.
2159         (mips_multi_set_operand): Likewise.
2160         (mips_multi_write): Likewise.
2161         (mips_print_operand_punctuation): Remove '%|' and '%-'.
2162         (mips_init_print_operand_punct): Update accordingly.
2163         (mips_start_ll_sc_sync_block): New function.
2164         (mips_end_ll_sc_sync_block): Likewise.
2165         (mips_output_sync): Likewise.
2166         (mips_sync_insn1_template): Likewise.
2167         (mips_sync_insn2_template): Likewise.
2168         (mips_get_sync_operand): Likewise.
2169         (mips_process_sync_loop): Likewise.
2170         (mips_output_sync_loop): Use mips_process_sync_loop.
2171         (mips_sync_loop_insns): New function.
2172         * config/mips/mips.h (MIPS_COMPARE_AND_SWAP): Delete.
2173         (MIPS_COMPARE_AND_SWAP_12): Likewise.
2174         (MIPS_COMPARE_AND_SWAP_12_ZERO_OP): Likewise.
2175         (MIPS_COMPARE_AND_SWAP_12_NONZERO_OP): Likewise.
2176         (MIPS_SYNC_OP, MIPS_SYNC_OP_12): Likewise.
2177         (MIPS_SYNC_OP_12_AND, MIPS_SYNC_OP_12_XOR): Likewise.
2178         (MIPS_SYNC_OLD_OP_12): Likewise.
2179         (MIPS_SYNC_OLD_OP_12_AND, MIPS_SYNC_OLD_OP_12_XOR): Likewise.
2180         (MIPS_SYNC_NEW_OP_12): Likewise.
2181         (MIPS_SYNC_NEW_OP_12_AND, MIPS_SYNC_NEW_OP_12_XOR): Likewise.
2182         (MIPS_SYNC_OLD_OP, MIPS_SYNC_NEW_OP): Likewise.
2183         (MIPS_SYNC_NAND, MIPS_SYNC_OLD_NAND, MIPS_SYNC_NEW_NAND): Likewise.
2184         (MIPS_SYNC_EXCHANGE, MIPS_SYNC_EXCHANGE_12): Likewise.
2185         (MIPS_SYNC_EXCHANGE_12_ZERO_OP): Likewise.
2186         (MIPS_SYNC_EXCHANGE_12_NONZER_OP): Likewise.
2187         * config/mips/mips.md (sync_mem): New attribute.
2188         (sync_oldval, sync_newval, sync_inclusive_mask): Likewise.
2189         (sync_exclusive_mask, sync_required_oldval): Likewise.
2190         (sync_insn1_op2, sync_insn1, sync_insn2): Likewise.
2191         (sync_release_barrier): Likewise.
2192         (length): Handle sync loops.
2193         (sync): Use mips_output_sync.
2194         * config/mips/sync.md (*memory_barrier): Use mips_output_sync.
2195         (sync_compare_and_swap<mode>): Set the new sync_* attributes
2196         and use mips_output_sync_loop.
2197         (compare_and_swap_12, sync_add<mode>, sync_<optab>_12): Likewise.
2198         (sync_old_<optab>_12, sync_new_<optab>_12, sync_nand_12): Likewise.
2199         (sync_old_nand_12, sync_new_nand_12, sync_sub<mode>): Likewise.
2200         (sync_old_add<mode>, sync_old_sub<mode>): Likewise.
2201         (sync_new_add<mode>, sync_new_sub<mode>): Likewise.
2202         (sync_<optab><mode>, sync_old_<optab><mode>): Likewise.
2203         (sync_new_<optab><mode>, sync_nand<mode>): Likewise.
2204         (sync_old_nand<mode>, sync_new_nand<mode>): Likewise.
2205         (sync_lock_test_and_set<mode>, test_and_set_12): Likewise.
2207 2009-08-26  Richard Guenther  <rguenther@suse.de>
2209         PR middle-end/41163
2210         * gimplify.c (gimplify_addr_expr): Canonicalize ADDR_EXPRs if
2211         the types to not match.
2212         * tree-cfg.c (verify_gimple_assign_single): Adjust ADDR_EXPR
2213         verification.
2214         * tree-ssa.c (useless_type_conversion_p): Conversions to
2215         pointers to unprototyped functions are useless.
2217 2009-08-26  Richard Guenther  <rguenther@suse.de>
2219         * tree-ssa-structalias.c (create_variable_info_for): Remove strange
2220         whole-program condition, prepare to be called for non-globals.
2221         (intra_create_variable_infos): For restrict qualified DECL_BY_REFERENCE
2222         params build a representative with known type and track its fields.
2224 2009-08-26  Uros Bizjak  <ubizjak@gmail.com>
2226         * config/alpha/sync.md: Update comment about unpredictable LL/SC lock
2227         clearing by a taken branch.
2228         (sync_<fetchop_name><mode>): Split when epilogue_completed is set,
2229         effectively after bbro pass.
2230         (sync_nand<mode>): Ditto.
2231         (sync_old_<fetchop_name><mode>): Ditto.
2232         (sync_old_nand<mode>): Ditto.
2233         (sync_new_<fetchop_name><mode>): Dito.
2234         (sync_new_nand<mode>): Ditto.
2235         (sync_compare_and_swap<mode>_1): Ditto.
2236         (*sync_compare_and_swap<mode>): Ditto.
2237         (sync_lock_test_and_set<mode>_1): Ditto.
2238         ("sync_lock_test_and_set<mode>): Ditto.
2240 2009-08-25  Douglas B Rupp  <rupp@gnat.com>
2242         * hwint.h (HOST_LONG_FORMAT): New macro
2243         * bitmap.c, c-decl.c, mips-tfile.c, print-rtl.c, print-tree.c:
2244         Use HOST_PTR_PRINTF.
2245         * system.h (HOST_PTR_PRINTF): Resurrect old macro
2246         * doc/hostconfig.texi (HOST_LONG_FORMAT): Document.
2247         (HOST_PTR_PRINTF): Document.
2249 2009-08-25 Jan Hubicka  <jh@suse.cz>
2251         * config/i386/bmmintrin.h: Replace by #error.
2253         Revert:
2254         Michael Meissner  <michael.meissner@amd.com>
2255         Dwarakanath Rajagopal  <dwarak.rajagopal@amd.com>
2256         Tony Linthicum  <tony.linthicum@amd.com>
2258         * config/i386/i386.h (TARGET_SSE5): New macro for SSE5.
2259         (TARGET_ROUND): New macro for the round/ptest instructions which
2260         are shared between SSE4.1 and SSE5.
2261         (OPTION_MASK_ISA_ROUND): Ditto.
2262         (OPTION_ISA_ROUND): Ditto.
2263         (TARGET_FUSED_MADD): New macro for -mfused-madd swtich.
2264         (TARGET_CPU_CPP_BUILTINS): Add SSE5 support.
2266         * config/i386/i386.opt (-msse5): New switch for SSE5 support.
2267         (-mfused-madd): New switch to give users control over whether the
2268         compiler optimizes to use the multiply/add SSE5 instructions.
2270         * config/i386/i386.c (enum pta_flags): Add PTA_SSE5.
2271         (ix86_handle_option): Turn off 3dnow if -msse5.
2272         (override_options): Add SSE5 support.
2273         (print_operand): %Y prints comparison codes for SSE5 com/pcom
2274         instructions.
2275         (ix86_expand_sse_movcc): Add SSE5 support.
2276         (ix86_expand_sse5_unpack): New function to use pperm to unpack a
2277         vector type to the next largest size.
2278         (ix86_expand_sse5_pack): New function to use pperm to pack a
2279         vector type to the next smallest size.
2280         (IX86_BUILTIN_FMADDSS): New for SSE5 intrinsic.
2281         (IX86_BUILTIN_FMADDSD): Ditto.
2282         (IX86_BUILTIN_FMADDPS): Ditto.
2283         (IX86_BUILTIN_FMADDPD): Ditto.
2284         (IX86_BUILTIN_FMSUBSS): Ditto.
2285         (IX86_BUILTIN_FMSUBSD): Ditto.
2286         (IX86_BUILTIN_FMSUBPS): Ditto.
2287         (IX86_BUILTIN_FMSUBPD): Ditto.
2288         (IX86_BUILTIN_FNMADDSS): Ditto.
2289         (IX86_BUILTIN_FNMADDSD): Ditto.
2290         (IX86_BUILTIN_FNMADDPS): Ditto.
2291         (IX86_BUILTIN_FNMADDPD): Ditto.
2292         (IX86_BUILTIN_FNMSUBSS): Ditto.
2293         (IX86_BUILTIN_FNMSUBSD): Ditto.
2294         (IX86_BUILTIN_FNMSUBPS): Ditto.
2295         (IX86_BUILTIN_FNMSUBPD): Ditto.
2296         (IX86_BUILTIN_PCMOV_V2DI): Ditto.
2297         (IX86_BUILTIN_PCMOV_V4SI): Ditto.
2298         (IX86_BUILTIN_PCMOV_V8HI): Ditto.
2299         (IX86_BUILTIN_PCMOV_V16QI): Ditto.
2300         (IX86_BUILTIN_PCMOV_V4SF): Ditto.
2301         (IX86_BUILTIN_PCMOV_V2DF): Ditto.
2302         (IX86_BUILTIN_PPERM): Ditto.
2303         (IX86_BUILTIN_PERMPS): Ditto.
2304         (IX86_BUILTIN_PERMPD): Ditto.
2305         (IX86_BUILTIN_PMACSSWW): Ditto.
2306         (IX86_BUILTIN_PMACSWW): Ditto.
2307         (IX86_BUILTIN_PMACSSWD): Ditto.
2308         (IX86_BUILTIN_PMACSWD): Ditto.
2309         (IX86_BUILTIN_PMACSSDD): Ditto.
2310         (IX86_BUILTIN_PMACSDD): Ditto.
2311         (IX86_BUILTIN_PMACSSDQL): Ditto.
2312         (IX86_BUILTIN_PMACSSDQH): Ditto.
2313         (IX86_BUILTIN_PMACSDQL): Ditto.
2314         (IX86_BUILTIN_PMACSDQH): Ditto.
2315         (IX86_BUILTIN_PMADCSSWD): Ditto.
2316         (IX86_BUILTIN_PMADCSWD): Ditto.
2317         (IX86_BUILTIN_PHADDBW): Ditto.
2318         (IX86_BUILTIN_PHADDBD): Ditto.
2319         (IX86_BUILTIN_PHADDBQ): Ditto.
2320         (IX86_BUILTIN_PHADDWD): Ditto.
2321         (IX86_BUILTIN_PHADDWQ): Ditto.
2322         (IX86_BUILTIN_PHADDDQ): Ditto.
2323         (IX86_BUILTIN_PHADDUBW): Ditto.
2324         (IX86_BUILTIN_PHADDUBD): Ditto.
2325         (IX86_BUILTIN_PHADDUBQ): Ditto.
2326         (IX86_BUILTIN_PHADDUWD): Ditto.
2327         (IX86_BUILTIN_PHADDUWQ): Ditto.
2328         (IX86_BUILTIN_PHADDUDQ): Ditto.
2329         (IX86_BUILTIN_PHSUBBW): Ditto.
2330         (IX86_BUILTIN_PHSUBWD): Ditto.
2331         (IX86_BUILTIN_PHSUBDQ): Ditto.
2332         (IX86_BUILTIN_PROTB): Ditto.
2333         (IX86_BUILTIN_PROTW): Ditto.
2334         (IX86_BUILTIN_PROTD): Ditto.
2335         (IX86_BUILTIN_PROTQ): Ditto.
2336         (IX86_BUILTIN_PROTB_IMM): Ditto.
2337         (IX86_BUILTIN_PROTW_IMM): Ditto.
2338         (IX86_BUILTIN_PROTD_IMM): Ditto.
2339         (IX86_BUILTIN_PROTQ_IMM): Ditto.
2340         (IX86_BUILTIN_PSHLB): Ditto.
2341         (IX86_BUILTIN_PSHLW): Ditto.
2342         (IX86_BUILTIN_PSHLD): Ditto.
2343         (IX86_BUILTIN_PSHLQ): Ditto.
2344         (IX86_BUILTIN_PSHAB): Ditto.
2345         (IX86_BUILTIN_PSHAW): Ditto.
2346         (IX86_BUILTIN_PSHAD): Ditto.
2347         (IX86_BUILTIN_PSHAQ): Ditto.
2348         (IX86_BUILTIN_FRCZSS): Ditto.
2349         (IX86_BUILTIN_FRCZSD): Ditto.
2350         (IX86_BUILTIN_FRCZPS): Ditto.
2351         (IX86_BUILTIN_FRCZPD): Ditto.
2352         (IX86_BUILTIN_CVTPH2PS): Ditto.
2353         (IX86_BUILTIN_CVTPS2PH): Ditto.
2354         (IX86_BUILTIN_COMEQSS): Ditto.
2355         (IX86_BUILTIN_COMNESS): Ditto.
2356         (IX86_BUILTIN_COMLTSS): Ditto.
2357         (IX86_BUILTIN_COMLESS): Ditto.
2358         (IX86_BUILTIN_COMGTSS): Ditto.
2359         (IX86_BUILTIN_COMGESS): Ditto.
2360         (IX86_BUILTIN_COMUEQSS): Ditto.
2361         (IX86_BUILTIN_COMUNESS): Ditto.
2362         (IX86_BUILTIN_COMULTSS): Ditto.
2363         (IX86_BUILTIN_COMULESS): Ditto.
2364         (IX86_BUILTIN_COMUGTSS): Ditto.
2365         (IX86_BUILTIN_COMUGESS): Ditto.
2366         (IX86_BUILTIN_COMORDSS): Ditto.
2367         (IX86_BUILTIN_COMUNORDSS): Ditto.
2368         (IX86_BUILTIN_COMFALSESS): Ditto.
2369         (IX86_BUILTIN_COMTRUESS): Ditto.
2370         (IX86_BUILTIN_COMEQSD): Ditto.
2371         (IX86_BUILTIN_COMNESD): Ditto.
2372         (IX86_BUILTIN_COMLTSD): Ditto.
2373         (IX86_BUILTIN_COMLESD): Ditto.
2374         (IX86_BUILTIN_COMGTSD): Ditto.
2375         (IX86_BUILTIN_COMGESD): Ditto.
2376         (IX86_BUILTIN_COMUEQSD): Ditto.
2377         (IX86_BUILTIN_COMUNESD): Ditto.
2378         (IX86_BUILTIN_COMULTSD): Ditto.
2379         (IX86_BUILTIN_COMULESD): Ditto.
2380         (IX86_BUILTIN_COMUGTSD): Ditto.
2381         (IX86_BUILTIN_COMUGESD): Ditto.
2382         (IX86_BUILTIN_COMORDSD): Ditto.
2383         (IX86_BUILTIN_COMUNORDSD): Ditto.
2384         (IX86_BUILTIN_COMFALSESD): Ditto.
2385         (IX86_BUILTIN_COMTRUESD): Ditto.
2386         (IX86_BUILTIN_COMEQPS): Ditto.
2387         (IX86_BUILTIN_COMNEPS): Ditto.
2388         (IX86_BUILTIN_COMLTPS): Ditto.
2389         (IX86_BUILTIN_COMLEPS): Ditto.
2390         (IX86_BUILTIN_COMGTPS): Ditto.
2391         (IX86_BUILTIN_COMGEPS): Ditto.
2392         (IX86_BUILTIN_COMUEQPS): Ditto.
2393         (IX86_BUILTIN_COMUNEPS): Ditto.
2394         (IX86_BUILTIN_COMULTPS): Ditto.
2395         (IX86_BUILTIN_COMULEPS): Ditto.
2396         (IX86_BUILTIN_COMUGTPS): Ditto.
2397         (IX86_BUILTIN_COMUGEPS): Ditto.
2398         (IX86_BUILTIN_COMORDPS): Ditto.
2399         (IX86_BUILTIN_COMUNORDPS): Ditto.
2400         (IX86_BUILTIN_COMFALSEPS): Ditto.
2401         (IX86_BUILTIN_COMTRUEPS): Ditto.
2402         (IX86_BUILTIN_COMEQPD): Ditto.
2403         (IX86_BUILTIN_COMNEPD): Ditto.
2404         (IX86_BUILTIN_COMLTPD): Ditto.
2405         (IX86_BUILTIN_COMLEPD): Ditto.
2406         (IX86_BUILTIN_COMGTPD): Ditto.
2407         (IX86_BUILTIN_COMGEPD): Ditto.
2408         (IX86_BUILTIN_COMUEQPD): Ditto.
2409         (IX86_BUILTIN_COMUNEPD): Ditto.
2410         (IX86_BUILTIN_COMULTPD): Ditto.
2411         (IX86_BUILTIN_COMULEPD): Ditto.
2412         (IX86_BUILTIN_COMUGTPD): Ditto.
2413         (IX86_BUILTIN_COMUGEPD): Ditto.
2414         (IX86_BUILTIN_COMORDPD): Ditto.
2415         (IX86_BUILTIN_COMUNORDPD): Ditto.
2416         (IX86_BUILTIN_COMFALSEPD): Ditto.
2417         (IX86_BUILTIN_COMTRUEPD): Ditto.
2418         (IX86_BUILTIN_PCOMEQUB): Ditto.
2419         (IX86_BUILTIN_PCOMNEUB): Ditto.
2420         (IX86_BUILTIN_PCOMLTUB): Ditto.
2421         (IX86_BUILTIN_PCOMLEUB): Ditto.
2422         (IX86_BUILTIN_PCOMGTUB): Ditto.
2423         (IX86_BUILTIN_PCOMGEUB): Ditto.
2424         (IX86_BUILTIN_PCOMFALSEUB): Ditto.
2425         (IX86_BUILTIN_PCOMTRUEUB): Ditto.
2426         (IX86_BUILTIN_PCOMEQUW): Ditto.
2427         (IX86_BUILTIN_PCOMNEUW): Ditto.
2428         (IX86_BUILTIN_PCOMLTUW): Ditto.
2429         (IX86_BUILTIN_PCOMLEUW): Ditto.
2430         (IX86_BUILTIN_PCOMGTUW): Ditto.
2431         (IX86_BUILTIN_PCOMGEUW): Ditto.
2432         (IX86_BUILTIN_PCOMFALSEUW): Ditto.
2433         (IX86_BUILTIN_PCOMTRUEUW): Ditto.
2434         (IX86_BUILTIN_PCOMEQUD): Ditto.
2435         (IX86_BUILTIN_PCOMNEUD): Ditto.
2436         (IX86_BUILTIN_PCOMLTUD): Ditto.
2437         (IX86_BUILTIN_PCOMLEUD): Ditto.
2438         (IX86_BUILTIN_PCOMGTUD): Ditto.
2439         (IX86_BUILTIN_PCOMGEUD): Ditto.
2440         (IX86_BUILTIN_PCOMFALSEUD): Ditto.
2441         (IX86_BUILTIN_PCOMTRUEUD): Ditto.
2442         (IX86_BUILTIN_PCOMEQUQ): Ditto.
2443         (IX86_BUILTIN_PCOMNEUQ): Ditto.
2444         (IX86_BUILTIN_PCOMLTUQ): Ditto.
2445         (IX86_BUILTIN_PCOMLEUQ): Ditto.
2446         (IX86_BUILTIN_PCOMGTUQ): Ditto.
2447         (IX86_BUILTIN_PCOMGEUQ): Ditto.
2448         (IX86_BUILTIN_PCOMFALSEUQ): Ditto.
2449         (IX86_BUILTIN_PCOMTRUEUQ): Ditto.
2450         (IX86_BUILTIN_PCOMEQB): Ditto.
2451         (IX86_BUILTIN_PCOMNEB): Ditto.
2452         (IX86_BUILTIN_PCOMLTB): Ditto.
2453         (IX86_BUILTIN_PCOMLEB): Ditto.
2454         (IX86_BUILTIN_PCOMGTB): Ditto.
2455         (IX86_BUILTIN_PCOMGEB): Ditto.
2456         (IX86_BUILTIN_PCOMFALSEB): Ditto.
2457         (IX86_BUILTIN_PCOMTRUEB): Ditto.
2458         (IX86_BUILTIN_PCOMEQW): Ditto.
2459         (IX86_BUILTIN_PCOMNEW): Ditto.
2460         (IX86_BUILTIN_PCOMLTW): Ditto.
2461         (IX86_BUILTIN_PCOMLEW): Ditto.
2462         (IX86_BUILTIN_PCOMGTW): Ditto.
2463         (IX86_BUILTIN_PCOMGEW): Ditto.
2464         (IX86_BUILTIN_PCOMFALSEW): Ditto.
2465         (IX86_BUILTIN_PCOMTRUEW): Ditto.
2466         (IX86_BUILTIN_PCOMEQD): Ditto.
2467         (IX86_BUILTIN_PCOMNED): Ditto.
2468         (IX86_BUILTIN_PCOMLTD): Ditto.
2469         (IX86_BUILTIN_PCOMLED): Ditto.
2470         (IX86_BUILTIN_PCOMGTD): Ditto.
2471         (IX86_BUILTIN_PCOMGED): Ditto.
2472         (IX86_BUILTIN_PCOMFALSED): Ditto.
2473         (IX86_BUILTIN_PCOMTRUED): Ditto.
2474         (IX86_BUILTIN_PCOMEQQ): Ditto.
2475         (IX86_BUILTIN_PCOMNEQ): Ditto.
2476         (IX86_BUILTIN_PCOMLTQ): Ditto.
2477         (IX86_BUILTIN_PCOMLEQ): Ditto.
2478         (IX86_BUILTIN_PCOMGTQ): Ditto.
2479         (IX86_BUILTIN_PCOMGEQ): Ditto.
2480         (IX86_BUILTIN_PCOMFALSEQ): Ditto.
2481         (IX86_BUILTIN_PCOMTRUEQ): Ditto.
2482         (enum multi_arg_type): New enum for describing the various SSE5
2483         intrinsic argument types.
2484         (bdesc_multi_arg): New table for SSE5 intrinsics.
2485         (ix86_init_mmx_sse_builtins): Add SSE5 intrinsic support.
2486         (ix86_expand_multi_arg_builtin): New function for creating SSE5
2487         intrinsics.
2488         (ix86_expand_builtin): Add SSE5 intrinsic support.
2489         (ix86_sse5_valid_op_p): New function to validate SSE5 3 and 4
2490         operand instructions.
2491         (ix86_expand_sse5_multiple_memory): New function to split the
2492         second memory reference from SSE5 instructions.
2493         (type_has_variadic_args_p): Delete in favor of stdarg_p.
2494         (ix86_return_pops_args): Use stdarg_p to determine if the function
2495         has variable arguments.
2496         (ix86_setup_incoming_varargs): Ditto.
2497         (x86_this_parameter): Ditto.
2499         * config/i386/i386-protos.h (ix86_expand_sse5_unpack): Add
2500         declaration.
2501         (ix86_expand_sse5_pack): Ditto.
2502         (ix86_sse5_valid_op_p): Ditto.
2503         (ix86_expand_sse5_multiple_memory): Ditto.
2505         * config/i386/i386.md (UNSPEC_SSE5_INTRINSIC): Add new UNSPEC
2506         constant for SSE5 support.
2507         (UNSPEC_SSE5_UNSIGNED_CMP): Ditto.
2508         (UNSPEC_SSE5_TRUEFALSE): Ditto.
2509         (UNSPEC_SSE5_PERMUTE): Ditto.
2510         (UNSPEC_SSE5_ASHIFT): Ditto.
2511         (UNSPEC_SSE5_LSHIFT): Ditto.
2512         (UNSPEC_FRCZ): Ditto.
2513         (UNSPEC_CVTPH2PS): Ditto.
2514         (UNSPEC_CVTPS2PH): Ditto.
2515         (PCOM_FALSE): Add new constant for true/false SSE5 comparisons.
2516         (PCOM_TRUE): Ditto.
2517         (COM_FALSE_S): Ditto.
2518         (COM_FALSE_P): Ditto.
2519         (COM_TRUE_S): Ditto.
2520         (COM_TRUE_P): Ditto.
2521         (type attribute): Add ssemuladd, sseiadd1, ssecvt1, sse4arg types.
2522         (unit attribute): Add support for ssemuladd, ssecvt1, sseiadd1 sse4arg
2523         types.
2524         (memory attribute): Ditto.
2525         (sse4_1_round<mode>2): Use TARGET_ROUND instead of TARGET_SSE4_1.
2526         Use SSE4_1_ROUND_* constants instead of hard coded numbers.
2527         (rint<mode>2): Use TARGET_ROUND instead of TARGET_SSE4_1.
2528         (floor<mode>2): Ditto.
2529         (ceil<mode>2): Ditto.
2530         (btrunc<mode>2): Ditto.
2531         (nearbyintdf2): Ditto.
2532         (nearbyintsf2): Ditto.
2533         (sse_setccsf): Disable if SSE5.
2534         (sse_setccdf): Ditto.
2535         (sse5_setcc<mode>): New support for SSE5 conditional move.
2536         (sse5_pcmov_<mode>): Ditto.
2538         * config/i386/sse.md (SSEMODE1248): New mode iterator for SSE5.
2539         (SSEMODEF4): Ditto.
2540         (SSEMODEF2P): Ditto.
2541         (ssemodesuffixf4): New mode attribute for SSE5.
2542         (ssemodesuffixf2s): Ditto.
2543         (ssemodesuffixf2c): Ditto.
2544         (sserotatemax): Ditto.
2545         (ssescalarmode): Ditto.
2546         (sse_maskcmpv4sf3): Disable if SSE5.
2547         (sse_maskcmpv2df3): Ditto.
2548         (sse_vmmaskcmpv4sf3): Ditto.
2549         (sse5_fmadd<mode>4): Add SSE5 floating point multiply/add instructions.
2550         (sse5_vmfmadd<mode>4): Ditto.
2551         (sse5_fmsub<mode>4): Ditto.
2552         (sse5_vmfmsub<mode>4): Ditto.
2553         (sse5_fnmadd<mode>4): Ditto.
2554         (sse5_vmfnmadd<mode>4): Ditto.
2555         (sse5_fnmsub<mode>4): Ditto.
2556         (sse5_vmfnmsub<mode>4): Ditto.
2557         (sse5i_fmadd<mode>4): Ditto.
2558         (sse5i_fmsub<mode>4): Ditto.
2559         (sse5i_fnmadd<mode>4): Ditto.
2560         (sse5i_fnmsub<mode>4): Ditto.
2561         (sse5i_vmfmadd<mode>4): Ditto.
2562         (sse5i_vmfmsub<mode>4): Ditto.
2563         (sse5i_vmfnmadd<mode>4): Ditto.
2564         (sse5i_vmfnmsub<mode>4): Ditto.
2565         (mulv16qi3): Add SSE5 support.
2566         (mulv4si3): Ditto.
2567         (sse5_mulv4si3): New insn for 32-bit multiply support on SSE5.
2568         (sse2_mulv4si3): Disable if SSE5.
2569         (sse4_1_roundpd): Use TARGET_ROUND instead of TARGET_SSE4_1.
2570         (sse4_1_roundps): Ditto.
2571         (sse4_1_roundsd): Ditto.
2572         (sse4_1_roundss): Ditto.
2573         (sse_maskcmpv4sf3): Disable if SSE5 so the SSE5 instruction will
2574         be generated.
2575         (sse_maskcmpsf3): Ditto.
2576         (sse_vmmaskcmpv4sf3): Ditto.
2577         (sse2_maskcmpv2df3): Ditto.
2578         (sse2_maskcmpdf3): Ditto.
2579         (sse2_vmmaskcmpv2df3): Ditto.
2580         (sse2_eq<mode>3): Ditto.
2581         (sse2_gt<mode>3): Ditto.
2582         (sse5_pcmov_<mode>): Add SSE5 support.
2583         (vec_unpacku_hi_v16qi): Ditto.
2584         (vec_unpacks_hi_v16qi): Ditto.
2585         (vec_unpacku_lo_v16qi): Ditto.
2586         (vec_unpacks_lo_v16qi): Ditto.
2587         (vec_unpacku_hi_v8hi): Ditto.
2588         (vec_unpacks_hi_v8hi): Ditto.
2589         (vec_unpacku_lo_v8hi): Ditto.
2590         (vec_unpacks_lo_v8hi): Ditto.
2591         (vec_unpacku_hi_v4si): Ditto.
2592         (vec_unpacks_hi_v4si): Ditto.
2593         (vec_unpacku_lo_v4si): Ditto.
2594         (vec_unpacks_lo_v4si): Ditto.
2595         (sse5_pmacsww): New SSE5 intrinsic insn.
2596         (sse5_pmacssww): Ditto.
2597         (sse5_pmacsdd): Ditto.
2598         (sse5_pmacssdd): Ditto.
2599         (sse5_pmacssdql): Ditto.
2600         (sse5_pmacssdqh): Ditto.
2601         (sse5_pmacsdqh): Ditto.
2602         (sse5_pmacsswd): Ditto.
2603         (sse5_pmacswd): Ditto.
2604         (sse5_pmadcsswd): Ditto.
2605         (sse5_pmadcswd): Ditto.
2606         (sse5_pcmov_<move>): Conditional move support on SSE5.
2607         (sse5_phaddbw): New SSE5 intrinsic insn.
2608         (sse5_phaddbd): Ditto.
2609         (sse5_phaddbq): Ditto.
2610         (sse5_phaddwd): Ditto.
2611         (sse5_phaddwq): Ditto.
2612         (sse5_phadddq): Ditto.
2613         (sse5_phaddubw): Ditto.
2614         (sse5_phaddubd): Ditto.
2615         (sse5_phaddubq): Ditto.
2616         (sse5_phadduwd): Ditto.
2617         (sse5_phadduwq): Ditto.
2618         (sse5_phaddudq): Ditto.
2619         (sse5_phsubbw): Ditto.
2620         (sse5_phsubwd): Ditto.
2621         (sse5_phsubdq): Ditto.
2622         (sse5_pperm): Ditto.
2623         (sse5_pperm_sign_v16qi_v8hi): New insns for pack/unpack with SSE5.
2624         (sse5_pperm_zero_v16qi_v8hi): Ditto.
2625         (sse5_pperm_sign_v8hi_v4si): Ditto.
2626         (sse5_pperm_zero_v8hi_v4si): Ditto.
2627         (sse5_pperm_sign_v4si_v2di): Ditto.
2628         (sse5_pperm_sign_v4si_v2di): Ditto.
2629         (sse5_pperm_pack_v2di_v4si): Ditto.
2630         (sse5_pperm_pack_v4si_v8hi): Ditto.
2631         (sse5_pperm_pack_v8hi_v16qi): Ditto.
2632         (sse5_perm<mode>): New SSE5 intrinsic insn.
2633         (rotl<mode>3): Ditto.
2634         (sse5_rotl<mode>3): Ditto.
2635         (sse5_ashl<mode>3): Ditto.
2636         (sse5_lshl<mode>3): Ditto.
2637         (sse5_frcz<mode>2): Ditto.
2638         (sse5s_frcz<mode>2): Ditto.
2639         (sse5_cvtph2ps): Ditto.
2640         (sse5_cvtps2ph): Ditto.
2641         (sse5_vmmaskcmp<mode>3): Ditto.
2642         (sse5_com_tf<mode>3): Ditto.
2643         (sse5_maskcmp<mode>3): Ditto.
2644         (sse5_maskcmp_uns<mode>3): Ditto.
2645         (sse5_maskcmp_uns2<mode>3): Ditto.
2646         (sse5_pcom_tf<mode>3): Ditto.
2648         * config/i386/predicates.md (sse5_comparison_float_operator):
2649         New predicate to match the comparison operators supported by
2650         the SSE5 com instruction.
2651         (ix86_comparison_int_operator): New predicate to match just the
2652         signed int comparisons.
2653         (ix86_comparison_uns_operator): New predicate to match just the
2654         unsigned int comparisons.
2656         * doc/invoke.texi (-msse5): Add documentation.
2657         (-mfused-madd): Ditto.
2659         * doc/extend.texi (x86 intrinsics): Document new SSE5 intrinsics.
2661         * config.gcc (i[34567]86-*-*): Include bmmintrin.h and
2662         mmintrin-common.h.
2663         (x86_64-*-*): Ditto.
2665         * config/i386/cpuid.h (bit_SSE5): Define SSE5 bit.
2667         * config/i386/bmmintrin.h: New file, provide common x86 compiler
2668         intrinisics for SSE5.
2670         * config/i386/smmintrin.h: Move instructions shared with SSE5 to
2671         mmintrin-common.h.
2673         * config/i386/mmintrin-common.h: New file, to contain common
2674         instructions between SSE4.1 and SSE5.
2676         * config/i386/netware.c (gen_stdcall_or_fastcall_decoration): Use
2677         FOREACH_FUNCTION_ARGS to iterate over the argument list.
2678         (gen_regparm_prefix): Ditto.
2680         * config/i386/winnt.c (gen_stdcall_or_fastcall_suffix): Use
2681         FOREACH_FUNCTION_ARGS to iterate over the argument list.  Use
2682         prototype_p to determine if a function is prototyped.
2684 2009-08-25 Ville Voutilainen <ville.voutilainen@gmail.com>
2686         * c-common.c (c_common_reswords) add the alignof keyword,
2687         with same RID as __alignof and __alignof__
2689 2009-08-25  Anatoly Sokolov  <aesok@post.ru>
2691         * hooks.h (hook_bool_const_int_const_int_true): Declare.
2692         * hooks.c (hook_bool_const_int_const_int_true): New function.
2693         * target.h (struct gcc_target): Add can_eliminate field.
2694         * target-def.h (TARGET_CAN_ELIMINATE): Define.
2695         (TARGET_INITIALIZER): Use TARGET_CAN_ELIMINATE.
2696         * ira.c (setup_eliminable_regset): Use can_eliminate target hook.
2697         * reload1.c (update_eliminables, init_elim_table): (Ditto.).
2698         (elim_table): Revise comment.
2699         * system.h (CAN_ELIMINATE): Poison.
2700         * defaults.h (CAN_ELIMINATE): Remove.
2701         * doc/tm.texi (CAN_ELIMINATE): Revise documentation.
2703         * config/alpha/vms.h (CAN_ELIMINATE): Remove macro.
2704         * config/alpha/alpha.c (TARGET_CAN_ELIMINATE) [TARGET_ABI_OPEN_VMS]:
2705         Define macro.
2706         (alpha_vms_can_eliminate): Declare as static, change return type to
2707         bool.
2708         * config/alpha/alpha-protos.h (alpha_vms_can_eliminate): Remove.
2710         * config/arm/arm.h (CAN_ELIMINATE): Remove macro.
2711         * config/arm/arm.c (TARGET_CAN_ELIMINATE): Define macro.
2712         (arm_can_eliminate): New function.
2714         * config/avr/avr.h (CAN_ELIMINATE): Remove macro.
2715         * config/avr/avr.c (TARGET_CAN_ELIMINATE): Define macro.
2716         (avr_can_eliminate): Declare as static.
2717         * config/avr/avr-protos.h (avr_can_eliminate): Remove.
2719         * config/bfin/bfin.h (CAN_ELIMINATE): Remove macro.
2720         * config/bfin/bfin.c (TARGET_CAN_ELIMINATE): Define macro.
2721         (bfin_can_eliminate): New function.
2723         * config/crx/crx.h (CAN_ELIMINATE): Remove macro.
2724         * config/crx/crx.c (TARGET_CAN_ELIMINATE): Define macro.
2725         (crx_can_eliminate): New function.
2727         * config/fr30/fr30.h (CAN_ELIMINATE): Remove macro.
2728         * config/fr30/fr30.c (TARGET_CAN_ELIMINATE): Define macro.
2729         (fr30_can_eliminate): New function.
2731         * config/frv/frv.h (CAN_ELIMINATE): Remove macro.
2732         * config/frv/frv.c (TARGET_CAN_ELIMINATE): Define macro.
2733         (frv_can_eliminate): New function.
2735         * config/h8300/h8300.h (CAN_ELIMINATE): Remove macro.
2736         * config/h8300/h8300.c (TARGET_CAN_ELIMINATE): Define macro.
2737         (h8300_can_eliminate): New function.
2739         * config/i386/i386.h (CAN_ELIMINATE): Remove macro.
2740         * config/i386/i386.c (TARGET_CAN_ELIMINATE): Define macro.
2741         (i386_can_eliminate): Declare as static, change return type to bool.
2742         * config/i386/i386-protos.h (i386_can_eliminate): Remove.
2744         * config/ia64/ia64.h (CAN_ELIMINATE): Remove macro.
2745         * config/ia64/ia64.c (TARGET_CAN_ELIMINATE): Define macro.
2746         (ia64_can_eliminate): New function.
2748         * config/iq2000/iq2000.h (CAN_ELIMINATE): Remove macro.
2749         * config/iq2000/iq2000.c (TARGET_CAN_ELIMINATE): Define macro.
2750         (iq2000_can_eliminate): New function.
2752         * config/m32r/m32r.h (CAN_ELIMINATE): Remove macro.
2753         * config/m32r/m32r.c (TARGET_CAN_ELIMINATE): Define macro.
2754         (m32r_can_eliminate): New function.
2756         * config/m68hc11/m68hc11.h (CAN_ELIMINATE): Remove macro.
2757         * config/m68hc11/m68hc11.c (TARGET_CAN_ELIMINATE): Define macro.
2758         (m68hc11_can_eliminate): New function.
2760         * config/m68k/m68k.h (CAN_ELIMINATE): Remove macro.
2761         * config/m68k/m68k.c (TARGET_CAN_ELIMINATE): Define macro.
2762         (m68k_can_eliminate): New function.
2764         * config/mep/mep.h (CAN_ELIMINATE): Remove macro.
2765         * config/mep/mep.c (TARGET_CAN_ELIMINATE): Define macro.
2766         (mep_can_eliminate): New function.
2768         * config/mips/mips.h (CAN_ELIMINATE): Remove macro.
2769         * config/mips/mips.c (TARGET_CAN_ELIMINATE): Define macro.
2770         (mips_can_eliminate): New function.
2772         * config/rs6000/rs6000.h (CAN_ELIMINATE): Remove macro.
2773         * config/rs6000/rs6000.c (TARGET_CAN_ELIMINATE): Define macro.
2774         (rs6000_can_eliminate): New function.
2776         * config/s390/s390.h (CAN_ELIMINATE): Remove macro.
2777         * config/s390/s390.c (TARGET_CAN_ELIMINATE): Define macro.
2778         (s390_can_eliminate): Declare as static.
2779         * config/s390/s390-protos.h (sparc_can_eliminate): Remove.
2781         * config/score/score.h (CAN_ELIMINATE): Remove macro.
2782         * config/score/score.c (TARGET_CAN_ELIMINATE): Define macro.
2783         (score_can_eliminate): New function.
2785         * config/sparc/sparc.h (CAN_ELIMINATE): Remove macro.
2786         * config/sparc/sparc.c (TARGET_CAN_ELIMINATE): Define macro.
2787         (sparc_can_eliminate): Declare as static.
2788         * config/sparc/sparc-protos.h (sparc_can_eliminate): Remove.
2790         * config/stormy16/stormy16.h (CAN_ELIMINATE): Remove macro.
2791         * config/stormy16/stormy16.c (TARGET_CAN_ELIMINATE): Define macro.
2792         (xstormy16_can_eliminate): New function.
2794         * config/v850/v850.h (CAN_ELIMINATE): Remove macro.
2795         * config/v850/v850.c (TARGET_CAN_ELIMINATE): Define macro.
2796         (v850_can_eliminate): New function.
2798 2009-08-25  Uros Bizjak  <ubizjak@gmail.com>
2800         * config/alpha/alpha.md (*cmpdf_ieee_ext[123]): Remove.
2801         (*cmpdf_internal): Enable for all ALPHA_FPTM levels.
2802         (*movdfcc_ext[1234]): Disable for IEEE mode.
2804 2009-08-25  Eric Botcazou  <ebotcazou@adacore.com>
2806         * gimplify.c (prepare_gimple_addressable): New static function.
2807         (gimplify_modify_expr_to_memcpy): Invoke it on the RHS before marking
2808         it addressable.
2809         (gimplify_addr_expr): Invoke it similarly on the operand instead of
2810         manually fiddling with it.
2812 2009-08-25  Michael Matz  <matz@suse.de>
2814         * expr.h (jumpifnot_1, jumpif_1, do_jump_1): Declare.
2815         * dojump.c (do_jump_by_parts_greater): Take two operands instead of
2816         full expression.
2817         (do_jump_by_parts_equality, do_compare_and_jump): Ditto.
2818         (jumpifnot_1, jumpif_1): New wrappers for do_jump_1.
2819         (do_jump): Split out code for simple binary comparisons into ...
2820         (do_jump_1): ... this, taking the individual operands and code.
2821         Change callers to helper function above accordingly.
2822         * expr.c (expand_expr_real_1): Use jumpifnot_1 for simple binary
2823         comparisons.
2825 2009-08-25  Michael Matz  <matz@suse.de>
2827         * expr.h (struct separate_ops, sepops): New type for passing
2828         around an exploded simple expression.
2829         * optabs.c (expand_widen_pattern_expr, expand_vec_shift_expr):
2830         Use this structure instead of expression tree.
2831         (get_vcond_icode, expand_vec_cond_expr_p): Don't take whole
2832         expression, only its type.
2833         (expand_vec_cond_expr): Take type and individual operands instead
2834         of full expression.
2835         * optabs.h (expand_widen_pattern_expr, expand_vec_cond_expr,
2836         expand_vec_shift_expr): Change prototype accordingly.
2837         * tree-vect-stmts.c (vectorizable_condition): Change call of
2838         expand_vec_cond_expr_p to pass only type.
2839         * expr.c (do_store_flags): Change prototype and implementation
2840         to take an exploded expression.
2841         (expand_expr_real_1): New local ops initialized with details
2842         of the full expression.  Use it instead of full
2843         expression in calls to do_store_flags, expand_vec_cond_expr,
2844         expand_widen_pattern_expr and expand_vec_shift_expr.
2846 2009-08-25  Michael Matz  <matz@suse.de>
2848         * expr.c (expand_expr_real_1): New local treeop0, treeop1,
2849         treeop2 initialized with first three operands of the full expression.
2850         Substitute all TREE_OPERAND (exp, [012]) calls with them.
2852 2009-08-25  Kai Tietz  <kai.tietz@onevision.com>
2854         * gcc/gthr-win32.h (__UNUSED_PARAM): Define, if not already present.
2855         (__gthread_objc_condition_allocate): Mark arguments as unused.
2856         (__gthread_objc_condition_deallocate): Likewise.
2857         (__gthread_objc_condition_wait): Likewise.
2858         (__gthread_objc_condition_broadcast): Likewise.
2859         (__gthread_objc_condition_signal): Likewise.
2860         (__gthread_objc_thread_detach): Cast via INT_PTR to pointer.
2861         (__gthread_objc_thread_id): Likewise.
2863 2009-08-25  Janus Weil  <janus@gcc.gnu.org>
2865         PR middle-end/41149
2866         * tree-pretty-print.c (print_call_name): Print the correct call name
2867         for procedure pointer components.
2869 2009-08-24  Steve Ellcey  <sje@cup.hp.com>
2871         * config/ia64/ia64.c (ia64_promote_function_mode): Call
2872         default_promote_function_mode when not VMS.
2874 2009-08-24  Olivier Hainque  <hainque@adacore.com>
2876         * convert.c (convert_to_integer): Don't assume an input pointer is
2877         POINTER_SIZE wide.  Fetch from the type instead.
2879 2009-08-24  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
2881         * configure.ac (AC_PREREQ): Bump to 2.64.
2883 2009-08-24  Rafael Avila de Espindola  <espindola@google.com>
2885         * gcc.c (standard_exec_prefix_1,standard_exec_prefix_2): Remove.
2886         (process_command): Don't search standard_exec_prefix_1 and
2887         standard_exec_prefix_2.
2889 2009-08-24  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
2891         * config/arm/arm.c (output_return_instruction): Handle for
2892         unified syntax.
2894 2009-08-24  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
2896         * config/arm/arm.c (arm_select_cc_mode): Handle subreg.
2898 2009-08-24  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
2900         * config/arm/vfp.md (*arm_movdi_vfp): Mark as predicable.
2901         (*arm_movdf_vfp): Likewise.
2903 2009-08-24  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
2905         * config/arm/neon.md (vashl<mode>3): Rename from ashl<mode>3.
2906         (vashr<mode>3): Rename from ashr<mode>3.
2907         (vlshr<mode>3): Rename from lshr<mode>3.
2909 2009-08-24  Kai Tietz  <kai.tietz@onevision.com>
2911         PR/40786
2912         * c-format.c (format_wanted_type): Add new member scalar_identity_flag.
2913         (check_format_info_main): Use scalar_identify_flag.
2914         (check_format_types): Check for scalar size identity if
2915         scalar_identify_flag is set.
2916         (printf_length_specs): Extend by new field.
2917         (asm_fprintf_length_specs): Likewise.
2918         (gcc_diag_length_specs): Likewise.
2919         (scanf_length_specs): Likewise.
2920         (strfmon_length_specs): Likewise.
2921         (gcc_gfc_length_specs): Likewise.
2922         * config/i386/msformat-c.c (ms_printf_length_specs): Likewise.
2923         (ms_printf_flag_specs): Likewise.
2924         * c-format.h (format_length_info): Add new member scalar_identity_flag.
2926 2009-08-23  Uros Bizjak  <ubizjak@gmail.com>
2928         PR target/40718
2929         * config/i386/i386.c (*call_pop_1): Disable for sibling calls.
2930         (*call_value_pop_1): Ditto.
2931         (*sibcall_pop_1): New insn pattern.
2932         (*sibcall_value_pop_1): Ditto.
2934 2009-08-23  Alan Modra  <amodra@bigpond.net.au>
2936         PR target/41081
2937         * config/rs6000/rs6000.md (rotlsi3_64, ashlsi3_64, lshrsi3_64,
2938         ashrsi3_64): New.
2940 2009-08-23  Alan Modra  <amodra@bigpond.net.au>
2942         PR target/41081
2943         * fwprop.c (try_fwprop_subst): Allow multiple sets.
2944         (get_reg_use_in): New function.
2945         (forward_propagate_subreg): Propagate through subreg of zero_extend
2946         or sign_extend.
2948 2009-08-22  Kaz Kojima  <kkojima@gcc.gnu.org>
2950         * config/sh/t-sh (TARGET_LIBGCC2_CFLAGS): Define.
2951         * config/sh/t-netbsd (TARGET_LIBGCC2_CFLAGS): Add -mieee.
2953 2009-08-22  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
2955         * configure.ac: Remove --with-datarootdir, --with-docdir,
2956         --with-htmldir switches.  No need to call AC_SUBST for
2957         datarootdir, docdir, htmldir any more.
2958         * configure: Regenerate.
2959         * doc/install.texi (Configuration): Document --datarootdir,
2960         --docdir, --htmldir, --pdfdir; update documentation for
2961         --infodir, --mandir.
2962         (Prerequisites): Bump Autoconf version to 2.64, Automake to 1.11,
2963         M4 to 1.4.6.
2965         * aclocal.m4: Regenerate.
2966         * config.in: Regenerate.
2967         * configure: Regenerate.
2969 2009-08-21  Douglas B Rupp  <rupp@gnat.com>
2970             Olivier Hainque  <hainque@adacore.com>
2972         * config/ia64/ia64.c: Include libfuncs.h.
2973         (TARGET_PROMOTE_FUNCITON_MODE): Define target macro.
2974         (ia64_expand_call): Use reg 25 on VMS.
2975         (ia64_initialize_trampoline): Fix for VMS ABI.
2976         (ia64_function_arg_offset): Always returns 0 when TARGET_ABI_OPEN_VMS.
2977         (ia64_function_arg): Initialize reg 25 on VMS.
2978         Fix OpenVMS ABI issues for varargs.
2979         For OpenVMS, emit the Argument Information register set in the
2980         incoming/sibcall case as well.
2981         (ia64_arg_type): New function.
2982         (ia64_function_arg_advance): Keep track of cum->words.
2983         Fix OpenVMS ABI issues for varargs.
2984         (ia64_function_value): On VMS, promote mode of non-aggregate types.
2985         (ia64_override_options): Set flag_no_common on VMS.
2986         (ia64_init_builtins): Disable FWRITE builtin.
2987         (ia64_asm_output_external): Call DO_CRTL_NAMES.
2988         (ia64_vms_init_libfuncs): Add decc$ routines.
2989         (ia64_vms_valid_pointer_mode): New function.
2990         (ia64_struct_value_rtx): Allways NULL_RTX on VMS.
2991         (ia64_promote_function_mode): New function
2992         * config/ia64/ia64.h (TARGET_ABI_OPEN_VMS): Define as 0 for default.
2993         (LONG_DOUBLE_TYPE_SIZE): Force to 64 on VMS.
2994         (LIBCGC2_LONG_DOUBLE_TYPE_SIZE): Likewise.
2995         (INIT_CUMULATIVE_ARGS): Add atypes for VMS.
2996         (INIT_CUMULATIVE_INCOMING_ARGS): Likewise.
2997         (ASM_OUTPUT_DEF): Use ISDIGIT instead of isdigit.
2998         Suppress trailing '#' if VALUE is numeric.
2999         * config/ia64/vms.h (PROMOTE_FUNCTION_MODE): Remove, code moved to
3000         ia64_promote_function_mode.
3001         (TARGET_VALID_POINTER_MODE): Define.
3003 2009-08-21  Michael Meissner  <meissner@linux.vnet.ibm.com>
3005         PR target/40671
3006         * config/rs6000/rs6000.c (rs6000_override_options): Use
3007         TARGET_64BIT instead of TARGET_POWERPC64 to set the size of pointers.
3009         PR target/41145
3010         * config/rs6000/rs6000.c (rs6000_handle_altivec_attribute): Fix
3011         reporting of vector + decimal/boolean/complex error.
3013 2009-08-21  Jakub Jelinek  <jakub@redhat.com>
3015         * config/rs6000/rs6000.c (rs6000_init_builtins): Fix type of
3016         __vector double TYPE_DECL.
3018 2009-08-21  Richard Earnshaw  <rearnsha@arm.com>
3020         * arm.h (MACHMODE): New define.  Include insn-modes.h if available.
3021         (CUMULATIVE_ARGS): Use MACHMODE for declaration of aapcs_vfp_mode.
3022         * arm.c (aapcs_vfp_is_call_or_return_candidate): Change base_mode
3023         to pointer to enum machine_mode.  Update all callers as needed.
3025 2009-08-21 Uros Bizjak <ubizjak@gmail.com>
3027         * config/alpha/alpha.md (exception_receiver): Emit alternative
3028         GP load sequence if flag_reorder_blocks_and_partition is set.
3029         (*exception_receiver_2): Also enable when
3030         flag_reorder_blocks_and_partition is set.
3032 2009-08-20  Matt Rice  <ratmice@gmail.com>
3033             Diego Novillo  <dnovillo@google.com>
3035         * Makefile.in (PLUGIN_HEADERS): Include incpath.h and
3036         tree-ssa-sccvn.h.
3038 2009-08-20  Richard Guenther  <rguenther@suse.de>
3040         * c-objc-common.h (LANG_HOOKS_DUP_LANG_SPECIFIC_DECL): Do not define.
3041         * c-tree.h (c_dup_lang_specific_decl): Remove.
3042         (struct lang_decl, struct lang_type): Move definitions ...
3043         * c-lang.h: ... here.  New file.
3044         * c-decl.c: Include c-lang.h.
3045         (c_dup_lang_specific_decl): Remove.
3046         * c-typeck.c: Include c-lang.h.
3047         * Makefile.in (c-decl.o): Add c-lang.h dependency.
3048         (c-typeck.o): Likewise.
3049         * c-config-lang.in (gtfiles): Add c-lang.h.
3050         * gengtype.c (get_output_file_with_visibility): Handle c-lang.h
3051         like c-tree.h.
3053 2009-08-20  Uros Bizjak  <ubizjak@gmail.com>
3055         * config/alpha/alpha.c (alpha_end_function): Do not clear
3056         crtl->emit structure and free insn locators if cfun->is_thunk is true,
3057         this is now handled in generic code.
3059 2009-08-20  Andreas Krebbel  <krebbel1@de.ibm.com>
3061         * config/s390/s390.c (Z10_PREDICT_DISTANCE): New macro.
3062         (s390_z10_fix_long_loop_prediction): New function.
3063         (s390_z10_optimize_cmp): INSN walk moved to callee - s390_reorg.
3064         (s390_reorg): Walk over the INSNs and invoke
3065         s390_z10_fix_long_loop_prediction and s390_z10_optimize_cmp.
3067 2009-08-20  Andreas Krebbel  <krebbel1@de.ibm.com>
3069         * config/s390/s390.md ("*brx_stage1_<GPR:mode>", "*brxg_64bit",
3070         "*brx_64bit", "*brx_31bit"): New patterns.
3071         * config/s390/s390.c ('E'): New output modifier.
3073 2009-08-20  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
3074             Richard Earnshaw  <richard.earnshaw@arm.com>
3076         * config/arm/arm.c (arm_emit_movpair): Handle CONST_INT.
3077         * config/arm/arm.md (*arm_movtas_ze): New pattern for movt.
3079 2009-08-19  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
3081         * pa.md (reload_inhi, reload_outhi, reload_inqi, reload_outqi): New
3082         patterns.
3083         * pa.c (emit_move_sequence): Check if address of operand1 is valid
3084         for mode mode of operand0 when doing secondary reload for SAR.
3086 2009-08-19  Jakub Jelinek  <jakub@redhat.com>
3088         PR middle-end/41123
3089         * expr.c (expand_expr_real_1) <normal_inner_ref>: Handle all kinds
3090         of CONCAT, not just bitpos 0 bitsize size of the whole CONCAT.
3092 2009-08-19  Jason Merrill  <jason@redhat.com>
3094         * doc/invoke.texi (C++ Dialect Options): Note change of minimum
3095         supported template depth in C++0x.
3097 2009-08-19  Jakub Jelinek  <jakub@redhat.com>
3099         * config/rs6000/rs6000.c (rs6000_output_mi_thunk): Don't call
3100         free_after_compilation.
3101         * config/score/score7.c (score7_output_mi_thunk): Likewise.
3102         * config/score/score3.c (score3_output_mi_thunk): Likewise.
3103         * config/ia64/ia64.c (ia64_output_mi_thunk): Likewise.
3104         * config/mips/mips.c (mips_output_mi_thunk): Likewise.
3105         * config/sh/sh.c (sh_output_mi_thunk): Likewise.
3106         * config/m68k/m68k.c (m68k_output_mi_thunk): Likewise.
3107         * config/sparc/sparc.c (sparc_output_mi_thunk): Likewise.
3109 2009-08-19  Ian Lance Taylor  <iant@google.com>
3111         * doc/md.texi (Insn Canonicalizations): Correct canonicalization
3112         of (plus (mult (neg B) C) A).
3114 2009-08-18  Michael Matz  <matz@suse.de>
3116         * omp-low.c (optimize_omp_library_calls): Use types_compatible_p
3117         instead of comparing TYPE_MAIN_VARIANT for equality.
3118         * tree-vect-patterns.c (vect_recog_dot_prod_pattern,
3119         vect_recog_widen_mult_pattern, vect_recog_widen_sum_pattern): Ditto.
3120         * tree-vect-loop.c (vect_is_simple_reduction): Ditto.
3121         * gimplify.c (goa_lhs_expr_p): Ditto and use
3122         STRIP_USELESS_TYPE_CONVERSION.
3124 2009-08-18  Michael Matz  <matz@suse.de>
3126         * tree-ssa-structalias.c (create_variable_info_for): Also mark
3127         first field in a struct.
3128         (intra_create_variable_infos): Don't deal with flag_argument_noalias.
3130 2009-08-18  Uros Bizjak  <ubizjak@gmail.com>
3132         * config/alpha/alpha.c (alpha_output_mi_thunk_osf): Allocate insn
3133         locators before emit_insn is called.  Remove assert that
3134         cfun->is_thunk.
3135         (alpha_end_function): Clear crtl->emit structure and free insn
3136         locators if cfun->is_thunk is true.
3138 2009-08-18  Jason Merrill  <jason@redhat.com>
3140         * config/elfos.h (ASM_DECLARE_OBJECT_NAME): Use gnu_unique_object
3141         type if available.
3142         * configure.ac: Test for it.
3143         * configure, config.in: Regenerate.
3144         * doc/install.texi: Document --enable-gnu-unique-object.
3146 2009-08-18  Richard Guenther  <rguenther@suse.de>
3148         PR middle-end/41094
3149         * builtins.c (fold_builtin_pow): Fold pow(pow(x,y),z) to
3150         pow(x,y*z) only if x is nonnegative.
3152 2009-08-18  Jakub Jelinek  <jakub@redhat.com>
3154         * bb-reorder.c (fix_up_fall_thru_edges): Only call invert_jump
3155         on jumps.
3157         PR target/40971
3158         * config/rs6000/rs6000.c (rs6000_legitimize_address): For
3159         [DT][FDI]mode ensure the offset isn't 4/8/12 bytes below 0x8000.
3161 2009-08-17  DJ Delorie  <dj@redhat.com>
3163         * config/m32c/m32c.md (UNS_FSETB, UNS_FREIT): New.
3164         * config/m32c/prologue.md (epilogue_freit): New.
3165         (fset_b): New.
3166         * config/m32c/m32c.c (m32c_function_needs_enter): Add prototype.
3167         (bank_switch_p): Likewise.
3168         (fast_interrupt_p): Likewise.
3169         (interrupt_p): Likewise.
3170         (m32c_conditional_register_usage): Round memregs size up.
3171         (need_to_save): We only need to save $a0 when we use ENTER.
3172         (interrupt_p): Check for fast_interrupt too.
3173         (bank_switch_p): New.
3174         (fast_interrupt_p): New.
3175         (m32c_attribute_table): Add bank_switch and fast_interrupt.
3176         (m32c_emit_prolog): Support bank switching and fast interrupts.
3177         * doc/extend.texi (Function Attributes): Add bank_switch and
3178         fast_interrupt.
3180 2009-08-17  Douglas B Rupp  <rupp@gnat.com>
3182         * config/alpha/alpha.c (vms_valid_pointer_mode): New function.
3183         * config/alpha/vms.h (TARGET_VALID_POINTER_MODE): Define.
3185 2009-08-16  Douglas B Rupp  <rupp@gnat.com>
3187         * doc/invoke.texi (Target options): Add new option list for IA-64/VMS.
3188         (menu): Add IA-64/VMS Options.
3189         (IA-64/VMS Options): Likewise.
3191 2009-08-16  Richard Sandiford  <rdsandiford@googlemail.com>
3193         PR target/38599
3194         * config/mips/mips.md (*lwxs): Use :P for pointer values.
3196 2009-08-16  Richard Sandiford  <rdsandiford@googlemail.com>
3198         * config/mips/mips-protos.h (mips_push_asm_switch): New function.
3199         (mips_pop_asm_switch): Likewise.
3200         * config/mips/mips.c (set_noreorder, set_nomacro, set_noat): Replace
3201         with...
3202         (mips_noreorder, mips_nomacro, mips_noat): ...these new variables.
3203         (mips_push_asm_switch_1, mips_pop_asm_switch_1): New functions.
3204         (mips_push_asm_switch, mips_pop_asm_switch): Likewise.
3205         (mips_print_operand_punctuation): Use them.  Check mips_noreorder
3206         instead of set_noreorder.
3207         (mips_output_function_prologue): Use the new functions.
3208         (mips_output_function_epilogue): Likewise.
3209         (mips_need_noat_wrapper_p): New function, split out from...
3210         (mips_final_prescan_insn, mips_final_postscan_insn): ...here.
3211         Use mips_push_asm_switch and mips_pop_asm_switch.
3212         * config/mips/mips.h (FUNCTION_PROFILER): Use mips_push_asm_switch
3213         and mips_pop_asm_switch.
3214         (ASM_OUTPUT_REG_POP): Likewise.
3215         (DBR_OUTPUT_SEQEND): Remove boilerplate comment.
3216         Use mips_pop_asm_switch.
3217         (mips_asm_switch): New structure.
3218         (set_noreorder, set_nomacro): Replace with...
3219         (mips_noreorder, mips_nomacro, mips_noat): ...these new variables.
3220         * config/mips/mips.md (fix_truncdfsi2_macro): Use mips_nomacro
3221         instead of set_nomacro.
3222         (fix_truncsfsi2_macro): Likewise.
3223         (cprestore): Likewise.
3224         (hazard): Use mips_noreorder instead of set_noreorder.
3225         * config/mips/sdemtk.h (FUNCTION_PROFILER): As for mips.h.
3227 2009-08-16  Uros Bizjak  <ubizjak@gmail.com>
3229         * config/alpha/alpha.c (alpha_end_function): Handle NULL_RTX returned
3230         from prev_active_insn.
3232 2009-08-16  Anatoly Sokolov  <aesok@post.ru>
3234         * config/avr/avr.h (AVR_HAVE_8BIT_SP): New macros.
3235         * config/avr/avr.c (avr_override_options): Initialize
3236         avr_current_arch variable.
3237         (avr_cpu_cpp_builtins): Define __AVR_HAVE_8BIT_SP__ or
3238         __AVR_HAVE_16BIT_SP__ according to the device type.
3239         (expand_prologue, output_movhi): Use AVR_HAVE_8BIT_SP instead of
3240         TARGET_TINY_STACK.
3241         (expand_epilogue): Use correct QI mode frame pointer for tiny stack.
3242         Use AVR_HAVE_8BIT_SP instead of TARGET_TINY_STACK.
3244 2009-08-16  Dodji Seketeli  <dodji@redhat.com>
3246         PR debug/37801
3247         * gcc/dwarf2out.c (gen_inlined_subroutine_die): Concentrate on
3248         generating inlined subroutine die only. We shouldn't be
3249         called for anything else.
3250         (gen_block_die): Don't generate inline subroutine debug info for
3251         abstract blocks.
3253 2009-08-15  Sebastian Pop  <sebastian.pop@amd.com>
3255         * graphite-poly.c (print_pbb): Print PBB index.
3257 2009-08-15  Sebastian Pop  <sebastian.pop@amd.com>
3259         PR middle-end/40981
3260         * graphite-interchange.c (ppl_max_for_le): Moved...
3261         * graphite-poly.c (pbb_number_of_iterations): Call ppl_max_for_le.
3262         * graphite-ppl.c (ppl_max_for_le): ... here.  Correct the use of
3263         ppl_Pointset_Powerset_C_Polyhedron_maximize.
3264         * graphite-ppl.h (ppl_max_for_le): Declared.
3266 2009-08-14  Olatunji Ruwase <tjruwase@google.com>
3268         * doc/extend.texi (Symbol-Renaming Pragmas): redefine_extname is
3269         supported on all platforms.
3270         * target.h (struct gcc_target): Remove handle_pragma_redefine_extname.
3271         * c-cppbuiltin.c: Remove use of targetm.handle_pragma_redefine_extname.
3272         * c-pragma.c: Likewise.
3273         * target-def.h (TARGET_INITIALIZER): Remove
3274         TARGET_HANDLE_PRAGMA_REDEFINE_EXTNAME.
3275         * config/sol2.h: Remove use of TARGET_HANDLE_PRAGMA_REDEFINE_EXTNAME.
3277 2009-08-14  Douglas B Rupp  <rupp@gnat.com>
3279         * config/ia64/fde-vms.c: New file.
3280         * config/ia64/fde-glibc.c (_Unwind_FindTableEntry): Add dummy arg.
3281         * config/ia64/unwind-ia64.c (UNW_ accessors): Move to unwind-ia64.h
3282         (MD_UNW_COMPATIBLE_PERSONALITY_P): Provide default.
3283         (uw_frame_state_for): Only register a personality routine if it is
3284         known to be compatible with our expectations.
3285         (_Unwind_FindEnclosingFunction, uw_frame_state_for):
3286         Declare unw_table_entry stack variable and
3287         mod all calls to _Unwind_FindTableEntry to add arg.
3288         * config/ia64/unwind-ia64.h (UNW_ accessors): Move here.
3289         (_Unwind_FindTableEntry): Add arg to prototype.
3291 2009-08-14  Eric Botcazou  <ebotcazou@adacore.com>
3293         * config/ia64/unwind-ia64.c (struct _Unwind_Context): Add new
3294         field 'signal_pfs_loc'.
3295         (uw_frame_state_for): Remove duplicate code dealing with leaf
3296         procedures without unwind info.
3297         If in the frame after unwinding through a signal handler, restore
3298         the AR.PFS register instead of the CFM if AR.PFS has not been saved.
3299         * config/ia64/linux-unwind.h (ia64_fallback_frame_state): Do not set
3300         'pfs_loc' to the AR.PFS location in the signal context; instead
3301         set 'signal_pfs_loc'.
3302         Manually generate the unwind info for the AR.PFS register.
3303         (ABI_MARKER_OLD_LINUX_SIGTRAMP, ABI_MARKER_OLD_LINUX_INTERRUPT,
3304         ABI_MARKER_LINUX_SIGTRAMP, ABI_MARKER_LINUX_INTERRUPT): Define.
3305         (ia64_handle_unwabi): Test 'fs->unwabi' against them.
3306         Do not set 'pfs_loc' to the AR.PFS location in the signal context;
3307         instead set 'signal_pfs_loc'.
3308         Remove code preventing the AR.PFS register from being restored
3309         from the signal context.
3311 2009-08-14  Douglas B Rupp  <rupp@gnat.com>
3312             Tristan Gingold  <gingold@adacore.com>
3314         * config.gcc (ia64-hp-*vms*): Insert ia64/t-ia64 in tmake_file.
3315         * config/ia64/t-vms: New file.
3316         * config/ia64/vms64.h: New file.
3317         * config/ia64/vms.h: New file.
3318         * config/ia64/vms-crtinit.asm: New file.
3319         * config/ia64/vms_symvec_libgcc_s.opt: New file.
3320         * config/ia64/vms-unwind.h: New file.
3322 2009-08-14  Uros Bizjak  <ubizjak@gmail.com>
3324         * config/alpha/alpha.c (alpha_emit_conditional_move): Handle
3325         TFmode compares.
3327 2009-08-14  Kaveh R. Ghazi  <ghazi@caip.rutgers.edu>
3329         PR middle-end/30789
3330         * builtins.c (do_mpc_arg2): Make extern, define for any MPC version.
3331         Move declaration...
3332         * real.h (do_mpc_arg2): ... here.
3333         * fold-const.c (const_binop): Use MPC for complex MULT_EXPR
3334         and RDIV_EXPR.
3336 2009-08-14  Rafael Avila de Espindola  <espindola@google.com>
3338         * final.c (add_debug_prefix_map): Don't use GC memory for
3339         old_prefix and new_prefix.
3341 2009-08-14  Richard Guenther  <rguenther@suse.de>
3343         * ipa-prop.c (compute_complex_pass_through): If we cannot
3344         compute a non-varying offset for IPA_JF_ANCESTOR punt.
3346 2009-08-14  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
3348         * c-lex.c (c_lex_with_flags): Increase size of local variable
3349         to avoid memory clobber.
3351 2009-08-14  Paolo Bonzini  <bonzini@gnu.org>
3353         PR target/40934
3354         * config/i386/i386.c (ix86_fp_comparison_strategy):
3355         Only enable/disable sahf at function granularity.
3357 2009-08-14  Hans-Peter Nilsson  <hp@axis.com>
3359         PR rtl-optimization/41064
3360         * reload1.c (reload_as_needed): Don't call extract_insn
3361         for known invalid replacements after calling
3362         validate_replace_rtx_group and verify_changes.
3364 2009-08-14  Uros Bizjak  <ubizjak@gmail.com>
3366         PR target/41019
3367         * config/i386/sse.md (SSEMODE124C8): New mode iterator.
3368         (vcond<SSEMODEF2P:mode>): Assert that operation is supported by
3369         ix86_expand_fp_vcond.
3370         (vcond<SSEMODE124C8:mode>): Use SSEMODE124C8 instead of SSEMODE124.
3371         Assert that operation is supported by ix86_expand_int_vcond.
3372         (vcondu<SSEMODE124C8:mode>): Ditto.
3374 2009-08-13  DJ Delorie  <dj@redhat.com>
3376         * config/i386/djgpp-stdint.h: New.
3377         * config.gcc (djgpp): Use it.
3379 2009-08-13  Kaz Kojima  <kkojima@gcc.gnu.org>
3381         * config/sh/sh.c (sh_override_options): When flag_exceptions or
3382         flag_unwind_tables is on, turn flag_reorder_blocks_and_partition off.
3384 2009-08-13  Ghassan Shobaki  <ghassan.shobaki@amd.com>
3386         * tree-ssa-loop-prefetch.c
3387         (prune_ref_by_group_reuse): Enhance probabilistic analysis
3388         for long-stride pruning.
3389         (compute_miss_rate): New function to compute the probability
3390         that two memory references access different cache lines.
3392 2009-08-13  Dave Korn  <dave.korn.cygwin@gmail.com>
3394         * gcc/config/i386/cygwin.h (LINK_SPEC): Add --enable-auto-image-base.
3396 2009-08-13  Richard Guenther  <rguenther@suse.de>
3398         PR middle-end/41047
3399         * tree-ssa-ccp.c (ccp_fold): When folding pointer additions
3400         use the constant pointer type.
3401         * gimplify.c (canonicalize_addr_expr): Canonicalize independent
3402         of CV qualifiers on the target pointer type.
3403         * tree-ssa.c (useless_type_conversion_p): Move incomplete pointer
3404         conversion check before restrict check.
3406 2009-08-12  Kaz Kojima  <kkojima@gcc.gnu.org>
3408         PR target/41029
3409         * config/sh/sh.md (reload_outdf__RnFRm+4): Fix thinko.
3411 2009-08-12  Kaz Kojima  <kkojima@gcc.gnu.org>
3413         * config/sh/sh.c (sh_promote_function_mode): Add ATTRIBUTE_UNUSED.
3415 2009-08-12  Richard Guenther  <rguenther@suse.de>
3417         PR tree-optimization/41011
3418         * ipa-cp.c (ipcp_lattice_from_jfunc): Deal with failing fold
3419         and reference constructing.
3421 2009-08-12  Xinliang David Li  <davidxl@google.com>
3423         PR tree-optimization/41012
3424         * tree-flow.h : New external interface.
3425         * gimple-low.c (check_call_arg): Change to public function.
3426         Remove argument mismatch check in lowering.
3427         * tree-inline.h (tree_can_inline_p): Interface change.
3428         * tree-inline.c (tree_can_inline_p): Fold argument mismatch check
3429         into this function.
3430         * ipa-inline.c (cgraph_decide_inlining_of_small_functions):
3431         Call change to tree_can_inline_p function.
3432         (cgraph_decide_inlining_incrementally): Ditto.
3434 2009-08-12  Richard Sandiford  <rdsandiford@googlemail.com>
3436         PR tree-optimization/41031
3437         * tree-outof-ssa.c (insert_value_copy_on_edge): Use promote_decl_mode
3438         on the partition variable rather than promote_mode on the source
3439         type.  Assert that the partition variable's type has the same
3440         mode as the source value's.
3442 2009-08-12  Paolo Bonzini  <bonzini@gnu.org>
3444         * doc/tm.texi (TARGET_PROMOTE_FUNCTION_MODE): Add documentation
3445         for for_return == 2.
3446         * function.c (assign_parm_setup_reg): Use for_return == 2, improve
3447         comments.
3448         * calls.c (expand_call): Fix typo.
3449         * explow.c (promote_decl_mode): Use for_return == 2 for RESULT_DECL
3450         and PARM_DECL.
3451         * stmt.c (expand_value_return): Use promote_function_mode to copy out
3452         of pseudo.
3453         * targhooks.c (default_promote_function_mode): Handle for_return == 2.
3454         * config/cris/cris.c (cris_promote_function_mode): Likewise.
3455         * config/mmix/mmix.c (mmix_promote_function_mode): Likewise.
3456         * config/pa/pa.c (pa_promote_function_mode): Likewise.
3458 2009-08-12  Andrew Haley  <aph@redhat.com>
3460         * config/arm/arm.c (arm_init_libfuncs): Add __sync_synchronize.
3462 2009-08-12  Sebastian Pop  <sebastian.pop@amd.com>
3464         PR bootstrap/40103
3465         * graphite.c: Remove pragma GCC diagnostic warning "-Wc++-compat".
3467 2009-08-12  Richard Guenther  <rguenther@suse.de>
3469         * alias.c (get_alias_set): Honor TYPE_STRUCTURAL_EQUALITY_P.
3470         * gimplify.c (gimplify_modify_expr): Do not use
3471         lang_hooks.types_compatible_p.
3472         * tree-ssa.c (useless_type_conversion_p): For aggregates
3473         just return false if the canonical types differ.
3475 2009-08-12  Sebastian Pop  <sebastian.pop@amd.com>
3477         PR middle-end/40980
3478         * sese.c (convert_for_phi_arg): New.
3479         (add_guard_exit_phis): Use convert_for_phi_arg.
3481 2009-08-12  Sebastian Pop  <sebastian.pop@amd.com>
3483         * graphite-sese-to-poly.c (pdr_add_data_dimensions): Dont add
3484         unknown subscript upper bounds.
3486 2009-08-12  Sebastian Pop  <sebastian.pop@amd.com>
3487             Pranav Garg  <pranav.garg2107@gmail.com>
3489         * graphite-interchange.c (gather_access_strides): Removed.
3490         (ppl_max_for_le): New.
3491         (build_linearized_memory_access): New.
3492         (memory_stride_in_loop): New.
3493         (pbb_interchange_profitable_p): Reimplemented.
3494         * graphite-ppl.h (ppl_new_id_map): New.
3495         (ppl_interchange): New.
3497 2009-08-12  Sebastian Pop  <sebastian.pop@amd.com>
3499         * graphite-interchange.c (compute_subscript): Removed.
3500         (compute_array_size_cstr): Removed.
3501         (compute_array_size_poly): Removed.
3502         (compute_array_size): Removed.
3503         (gather_access_strides_poly): Removed.
3504         (gather_access_strides): Empty.
3506 2009-08-12  Sebastian Pop  <sebastian.pop@amd.com>
3508         * graphite-dependences.c (dependence_polyhedron_1): Replace
3509         pdr_nb_subscripts with PDR_NB_SUBSCRIPTS.
3510         (graphite_legal_transform_dr): Same.
3511         (graphite_carried_dependence_level_k): Same.
3512         * graphite-poly.c (new_poly_dr): Add a parameter nb_subscripts.
3513         Initialize PDR_NB_SUBSCRIPTS.
3514         (print_pdr_access_layout): Replace pdr_nb_subscripts with
3515         PDR_NB_SUBSCRIPTS.
3516         * graphite-poly.h (struct poly_dr): Add nb_subscripts field.
3517         (PDR_NB_SUBSCRIPTS): New.
3518         (pdr_nb_subscripts): Removed.
3519         (pdr_dim): Simplified.
3520         * graphite-sese-to-poly.c (build_poly_dr): Replace pdr_nb_subscripts
3521         with PDR_NB_SUBSCRIPTS.
3523 2009-08-12  Sebastian Pop  <sebastian.pop@amd.com>
3525         * graphite-interchange.c (compute_array_size): Remove use of
3526         PDR_DATA_CONTAINER.
3527         * graphite-poly.c (new_poly_dr): Remove argument data_container.
3528         Do not initialize PDR_DATA_CONTAINER.
3529         (print_pdr): Do not print PDR_DATA_CONTAINER.
3530         * graphite-poly.h (struct poly_dr): Remove data_container field.
3531         (PDR_DATA_CONTAINER): Removed.
3532         * graphite-sese-to-poly.c (pdr_add_data_dimensions): Remove use of
3533         PDR_DATA_CONTAINER.
3534         (build_poly_dr): Same.
3536 2009-08-12  Konrad Trifunovic  <konrad.trifunovic@gmail.com>
3537             Sebastian Pop  <sebastian.pop@amd.com>
3539         * graphite-dependences.c (graphite_legal_transform_dr): Work on a
3540         copy of the dependence polyhedron.  Free the temporary objects.
3541         (graphite_carried_dependence_level_k): Free unused objects before
3542         returning.
3544         * testsuite/gcc.dg/graphite/interchange-1.c: XFAILed.
3545         * testsuite/gcc.dg/graphite/interchange-2.c: XFAILed.
3546         * testsuite/gcc.dg/graphite/interchange-3.c: XFAILed.
3547         * testsuite/gcc.dg/graphite/interchange-4.c: XFAILed.
3548         * testsuite/gcc.dg/graphite/interchange-7.c: XFAILed.
3550 2009-08-12  Sebastian Pop  <sebastian.pop@amd.com>
3552         * graphite-blocking.c (scop_do_strip_mine): Call store_scattering.
3553         Early return without analyzing the data dependences if no
3554         transform has been done.  Call restore_scattering if the transform
3555         is not legal.
3556         (graphite-interchange.c): Same.
3557         * graphite-poly.c (print_scattering_function): Test for
3558         PBB_TRANSFORMED.
3559         (graphite_read_transforms): Initialize PBB_TRANSFORMED.
3560         (apply_poly_transforms): Do not gcc_assert that
3561         the transform is legal.
3562         (new_poly_bb): Initialize PBB_TRANSFORMED, PBB_SAVED and PBB_ORIGINAL.
3563         Do not initialize PBB_NB_SCATTERING_TRANSFORM, PBB_NB_LOCAL_VARIABLES,
3564         PBB_TRANSFORMED_SCATTERING, and PBB_ORIGINAL_SCATTERING.
3565         (free_poly_dr): Free PBB_TRANSFORMED, PBB_SAVED, and PBB_ORIGINAL.
3566         * graphite-poly.h (struct poly_scattering): New.
3567         (struct poly_bb): Add original, transformed, and saved fields.
3568         Remove transformed_scattering, original_scattering,
3569         nb_local_variables and nb_scattering_transform fields.
3570         (PBB_ORIGINAL, PBB_TRANSFORMED, PBB_SAVED): New.
3571         (poly_scattering_new): New.
3572         (poly_scattering_free): New.
3573         (poly_scattering_copy): New.
3574         (store_scattering_pbb): New.
3575         (store_scattering): New.
3576         (restore_scattering_pbb): New.
3577         (restore_scattering): New.
3578         * graphite-sese-to-poly.c (build_pbb_scattering_polyhedrons):
3579         Initialize PBB_TRANSFORMED and PBB_ORIGINAL.
3581 2009-08-12  Sebastian Pop  <sebastian.pop@amd.com>
3583         * graphite-poly.c (print_pbb): Add parentheses in the pretty print.
3584         (print_scop): Same.
3586 2009-08-12  Sebastian Pop  <sebastian.pop@amd.com>
3588         * Makefile.in (graphite.o): Depends on PREDICT_H.
3589         * graphite.c: Include predict.h.
3590         (graphite_finalize): Call tree_estimate_probability.
3591         * predict.c (predict_loops): Do not call scev_initialize and
3592         scev_finalize.
3593         (tree_estimate_probability_bb): New.
3594         (tree_estimate_probability): Do not initialize loops: move that
3595         code to the driver.  Call tree_estimate_probability_bb.
3596         (tree_estimate_probability_driver): New.
3597         (pass_profile): Use tree_estimate_probability_driver.
3598         * predict.h (tree_estimate_probability): Declared.
3600 2009-08-12  Sebastian Pop  <sebastian.pop@amd.com>
3602         * graphite-clast-to-gimple.c (gloog): Add time to TV_GRAPHITE_CODE_GEN.
3603         * graphite-dependences.c (graphite_legal_transform): Add time to
3604         TV_GRAPHITE_DATA_DEPS.
3605         (dependency_between_pbbs_p): Same.
3606         * timevar.def (TV_GRAPHITE_DATA_DEPS, TV_GRAPHITE_CODE_GEN): New.
3608 2009-08-12  Andrey Belevantsev  <abel@ispras.ru>
3610         PR rtl-optimization/41033
3611         * alias.c (nonoverlapping_component_refs_p): Punt when strict
3612         aliasing is disabled.
3614 2009-08-11  Adam Nemet  <anemet@caviumnetworks.com>
3616         * config/mips/predicates.md (qi_mask_operand, hi_mask_operand,
3617         si_mask_operand, and_load_operand, low_bitmask_operand,
3618         and_reg_operand, and_operand): New predicates.
3619         * config/mips/constraints.md (Yb, Yh, Yw, Yz): New constraints.
3620         * config/mips/mips.c (and_operands_ok): New function.
3621         * config/mips/mips-protos.h (and_operands_ok): Declare it.
3622         * config/mips/mips.md (move_type): Add ext_ins and logical.
3623         (type): Handle them.
3624         (and<mode>3): Use and_reg_operand as the second operand's predicate.
3625         (*and<mode>3): Add alternatives for lbu, lhu, lwu, <d>ext and
3626         shift_shift.  Remove commutative constraint modifier.
3627         (*and<mode>3_mips16): Add alternatives for lbu, lhu, lwu and
3628         shift_shift.
3629         (*clear_upper32_dext): Remove define_insn_and_split.
3630         (*clear_upper32): Turn this define_insn_and_split ...
3631         (splitter for ANDing register with 0xffff_ffff): .. into this.
3633 2009-08-11  Adam Nemet  <anemet@caviumnetworks.com>
3635         * combine.c (try_widen_shift_mode): Factor out code to check if an
3636         integer constant is a low-order bitmask from here ...
3637         * rtlanal.c (low_bitmask_len): ... to here.
3638         * rtl.h (low_bitmask_len): Declare.
3640 2009-08-11  Uros Bizjak  <ubizjak@gmail.com>
3642         PR target/8603
3643         * config/alpha/alpha.md (addsi3): Remove expander.
3644         (addsi3): Rename from *addsi3_internal insn pattern.
3645         (subsi3): Remove expander.
3646         (subsi3): Rename from *subsi3_internal insn pattern.
3648 2009-08-11  Douglas B Rupp  <rupp@gnat.com>
3650         * config/alpha/alpha.c (alpha_init_builtins): Nullify FWRITE and
3651         FWRITE_UNLOCKED.
3653 2009-08-11  Vasiliy Fofanov  <fofanov@adacore.com>
3654             Eric Botcazou  <botcazou@adacore.com>
3655             Douglas B Rupp  <rupp@gnat.com>
3657         * config/alpha/alpha.c (alpha_return_in_memory): On VMS, ensure
3658         that records that fit in 64 bits are returned by immediate value,
3659         as required by OpenVMS Calling Standard.
3660         (function_value): Adjust for above modification.
3661         (alpha_va_start) <TARGET_ABI_OPEN_VMS>: Use
3662         virtual_incoming_args_rtx as base object, not next_arg.
3663         * config/alpha/vms.h: (DEFAULT_PCC_STRUCT_RETURN): Define as 0.
3665 2009-08-11  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
3667         * reload.c (find_reloads_subreg_address): Check the original
3668         req_equiv_mem address to detect the case where an address is
3669         not valid in the outer mode.
3671 2009-08-11  Richard Guenther  <rguenther@suse.de>
3673         PR bootstrap/40788
3674         * builtins.c (gimplify_va_arg_expr): Do not call SET_EXPR_LOCATION.
3676 2009-08-10  Douglas B Rupp  <rupp@gnat.com>
3678         * config/alpha/vms.h (OPTIMIZATION_OPTIONS): Remove
3679         (OVERRIDE_OPTIONS): Incorporate removed OPTIMIZATION_OPTIONS.
3681 2009-08-10  Olivier Hainque  <hainqueu@adacore.com>
3682             Douglas B Rupp  <rupp@gnat.com>
3684         * config/alpha/alpha.c (alpha_sa_size): Force procedure type to
3685         PT_STACK when frame_pointer_needed on OpenVMS.
3686         (alpha_pv_save_size, alpha_using_fp): Remove.
3687         (alpha_vms_can_eliminate): New function. Support for CAN_ELIMINATE
3688         with proper processing for PT_NULL.
3689         (alpha_vms_initial_elimination_offset): New function. Support for
3690         INITIAL_ELIMINATION_OFFSET with proper processing for PT_NULL.
3691         (alpha_sa_size): Force procedure type to PT_STACK when
3692         frame_pointer_needed on OpenVMS.
3693         * config/alpha/alpha-protos.h (alpha_pv_save_size): Remove prototype.
3694         (alpha_using_fp): Likewise.
3695         (alpha_vms_can_eliminate): Add prototype.
3696         (alpha_vms_initial_elimination_offset): Likewise.
3697         * config/alpha/vms.h (CAN_ELIMINATE, INITIAL_ELIMINATION_OFFSET):
3698         Call alpha_vms_can_eliminate and alpha_vms_initial_elimination_offset.
3700 2009-08-10  Eric Botcazou  <botcazou@adacore.com>
3701             Douglas B Rupp  <rupp@gnat.com>
3703         * config/alpha/alpha.c (common_object_handler): New function.
3704         (vms_attribute_table): Declare a single attribute "common_object".
3705         (vms_output_aligned_decl_common): New global function.
3706         (SECTION_VMS_OVERLAY): Delete.
3707         (SECTION_VMS_GLOBAL): Likewise.
3708         (SECTION_VMS_INITIALIZE): Likewise.
3709         (vms_asm_named_section): Remove support for above flags.
3710         (vms_section_type_flags): Delete.
3711         (TARGET_SECTION_TYPE_FLAGS): Likewise.
3712         * config/alpha/alpha-protos.h (vms_output_aligned_decl_common): New.
3713         * config/alpha/vms.h (ASM_OUTPUT_ALIGNED_COMMON): Delete.
3714         (ASM_OUTPUT_ALIGNED_DECL_COMMON): New macro.
3716 2009-08-10  SUGIOKA Toshinobu  <sugioka@itonet.co.jp>
3718         PR target/41015
3719         * longlong.h [__sh__] (udiv_qrnnd): Add T register to clobber list.
3720         (sub_ddmmss): Likewise.
3722 2009-08-10  Andreas Tobler  <a.tobler@schweiz.org>
3724         PR bootstrap/41018
3725         * config/rs6000/freebsd.h: Define SVR4_ASM_SPEC. Adjust copyright
3726         year.
3728 2009-08-10  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
3730         PR target/37053
3731         * reload1.c (reload_as_needed): Use cancel_changes to completely
3732         undo a failed replacement attempt.
3734 2009-08-10  Richard Guenther  <rguenther@suse.de>
3736         PR middle-end/41006
3737         * tree-ssa.c (useless_type_conversion_p_1): Fold into ...
3738         (useless_type_conversion_p): ... here.  Require pointer targets
3739         to be compatible.
3741 2009-08-10  Dodji Seketeli  <dodji@redhat.com>
3743         PR c++/40866
3744         * tree-inline.c (copy_statement_list): The resulting copy shouldn't
3745         loose the original type of the statement list.
3747 2009-08-09  Douglas B Rupp  <rupp@gnat.com>
3749         * config/alpha/alpha.c: Include libfuncs.h
3750         (avms_asm_output_extern): New function.
3751         (alpha_init_libfuncs): Init some decc libfuncs.
3752         * config/alpha/alpha-protos.h (avms_asm_output_external): Declare.
3753         * config/alpha/vms.h (ASM_OUTPUT_EXTERNAL): Define.
3754         (DO_CRTL_NAMES): Define.
3755         (LIB_SPEC): Remove.
3756         * config/alpha/vms64.h: (POINTERS_EXTEND_UNSIGNED): Remove undef.
3757         (LONG_TYPE_SIZE): Define.
3758         (TARGET_OS_CPP_BUILTINS): Define with __LONG_POINTERS=1
3759         (SUBTARGET_SWITCHES): Define malloc64 switch.
3760         (TARGET_DEFAULT): Default MASK_MALLOC64 set.
3761         (MASK_RETURN_ADDR): Define.
3762         doc/invoke.texi (mmalloc64): Document switch.
3764 2009-08-09  Olivier Hainque  <hainque@adacore.com>
3765             Douglas B Rupp  <rupp@gnat.com>
3767         * config/alpha/alpha.c (struct machine_function): New flag for VMS,
3768         uses_condition_handler.
3769         (alpha_expand_builtin_establish_vms_condition_handler): New expander.
3770         (alpha_expand_builtin_revert_vms_condition_handler): New expander.
3771         (enum alpha_builtin): New ALPHA_BUILTIN_REVERT_VMS_CONDITION_HANDLER
3772         and ALPHA_BUILTIN_ESTABLISH_VMS_CONDITION_HANDLER values.
3773         (code_for_builtin): New insn codes for the new alpha_builtins.
3774         (alpha_init_builtins): Register the new functions as BUILT_IN_MD.
3775         (alpha_sa_size): Account for uses_condition_handler.
3776         (alpha_expand_prologue): Likewise.
3777         (alpha_start_function): Likewise.
3778         (alpha_expand_epilogue): Likewise.
3779         * config/alpha/alpha-protos.h: Prototype the new alpha.c builtin
3780         establish/revert expanders.
3781         * config/alpha/alpha.h (DWARF_FRAME_REGNUM): Define.
3782         * config/alpha/alpha.md (builtin_establish_vms_condition_handler):
3783         New expander, resorting to the alpha.c associated function.
3784         (builtin_revert_vms_condition_handler): Likewise.
3785         * config/alpha/vms-gcc_shell_handler.c: New file. Implements
3786         __gcc_shell_handler, the static VMS condition handler used as
3787         an indirection wrapper to the current dynamically established
3788         handler.
3789         * config/alpha/vms-unwind.h: Complete rewrite.
3790         * config/alpha/t-vms (LIB2FUNCS_EXTRA): Add vms-gcc_shell_handler.c
3791         * config/alpha/vms.h (MD_UNWIND_SUPPORT):
3793 2009-08-09  Eric Botcazou  <botcazou@adacore.com>
3794             Douglas B Rupp  <rupp@gnat.com>
3796         * config/alpha/alpha.c (alpha_links): Add 'target' field.
3797         (alpha_need_linkage): Handle aliases.  Return function symbol.
3798         (alpha_use_linkage): Rename 'linkage' argument to 'func'.
3799         Use ultimate alias target for the linkage name.
3800         * config/alpha/alpha.md (movmemdi): Use the symbol returned
3801         by alpha_need_linkage for the function symbol.
3802         (setmemdi): Likewise.
3804 2009-08-09  Douglas B Rupp  <rupp@gnat.com>
3806         * config/alpha/alpha.c (TARGET_ASM_UNALIGNED_*_OP): Define if on VMS.
3807         * config/alpha/vms.h (OBJECT_FORMAT_ELF): Define.
3808         (ASM_WEAKEN_LABEL): Define.
3809         (CRT_CALL_STATIC_FUNCTION): Define.
3810         (STARTFILE_SPEC): Add crtbegin.o crtbeginS.o.
3811         (ENDFILE_SPEC): Define.
3812         (INIT_SECTION_ASM_OP): Define.
3813         * config/alpha/vms-dwarf2eh.asm (__EH_FRAME_BEGIN__): Remove.
3814         * config/alpha/t-vms (EXTRA_PARTS): Add crtbegin.o crtbeginS.o
3815         crtend.o crtendS.o.
3816         (MULTILIB_OSDIRNAMES): Define.
3817         (shlib_version): Define.
3818         (SHLIB_EXT): Define.
3819         (SHLIB_OBJS): Define.
3820         (SHLIB_NAME): Define.
3821         (SHLIB_MULTILIB): Define.
3822         (SHLIB_INSTALL): Define.
3823         (SHLIB_SYMVEC): Define.
3824         (SHLIB_SYMVECX2): Define.
3825         (SHLIB_LINK): Define.
3827 2009-08-09  Douglas B Rupp  <rupp@gnat.com>
3829         * config/alpha/alpha.c (alpha_initialize_trampoline):
3830         Initialize VMS trampoline IAW ABI for bounded procedure calls.
3831         (alpha_start_function): Emit transfer address on nested functions
3832         for VMS trampoline call.
3833         * config/alpha/t-vms (LIB2FUNCS_EXTRA): Remove vms_tramp.asm
3834         since no longer used.
3835         * config/alpha/vms-tramp.asm: Remove.
3836         * config/alpha/vms.h (TRAMPOLINE_TEMPLATE): Leave undefined
3837         since now only data initialized at runtime.
3839 2009-08-09  Douglas B Rupp  <rupp@gnat.com>
3841         * config/alpha/vms.h (HANDLE_SYSV_PRAGMA): Define.
3842         (LINK_GCC_C_SEQUENCE_SPEC): Define.
3843         (MD_EXEC_PREFIX): Remove, no longer used.
3844         (MD_STARTFILE_PREFIX): Likewise.
3845         (INCLUDE_DEFAULTS): Likewise.
3846         * config/alpha/t-vms:
3847         (vms-dwarf2.o, vms-dwarf2eh.o): Use GCC_FOR_TARGET to compile.
3849 2009-08-09  Richard Guenther  <rguenther@suse.de>
3851         PR tree-optimization/41016
3852         * tree-ssa-ifcombine.c (get_name_for_bit_test): Fix tuplification bug.
3853         (operand_precision): Remove.
3854         (integral_operand_p): Likewise.
3855         (recognize_single_bit_test): Adjust.
3857 2009-08-09  Richard Sandiford  <rdsandiford@googlemail.com>
3859         * c-common.c (c_fully_fold_internal): Issue a warning if a binary
3860         operation overflows.  Likewise non-cast unary arithmetic.
3861         If one arm of a conditional expression is always taken,
3862         inhibit evaluation warnings for the other arm.  Likewise inhibit
3863         evaluation warnings for the second && or || operand if the first
3864         operand is enough to determine the result.
3865         * c-typeck.c (build_conditional_expr): Apply the same inhibition
3866         rules here.
3867         (build_binary_op): Prevent duplicate evaluation warnings.
3869 2009-08-09  Richard Sandiford  <rdsandiford@googlemail.com>
3871         * tree-out-of-ssa.c (insert_value_copy_on_edge): If the source
3872         and destination have different modes, Use promote_mode to
3873         determine the signedness of the conversion.  Assert that the
3874         promoted source mode matches the destination mode.  Don't pass
3875         the destination and destination mode to expand_expr if the source
3876         mode is different.  Simplify conversion logic.
3878 2009-08-09  Ira Rosen  <irar@il.ibm.com>
3880         PR tree-optimization/41008
3881         * tree-vect-loop.c (vect_is_simple_reduction): Get operands
3882         from condition only in case it's a comparison. Adjust checks.
3884 2009-08-09  Bernd Schmidt  <bernd.schmidt@analog.com>
3886         * tree-dfa.c (renumber_gimple_stmt_uids_in_blocks): New function.
3887         * tree-flow.h (renumber_gimple_stmt_uids_in_blocks): Declare it.
3888         * tree-ssa-loop-ivopts.c (comp_cost): Make COST an integer.
3889         (enum iv_position): Add IP_AFTER_USE and IP_BEFORE_USE.
3890         (dump_cand): Handle them.
3891         (struct iv_cand): New members COST_STEP and AINC_USE.
3892         (stmt_after_increment): Likewise.
3893         (stmt_after_inc_pos): Renamed from stmt_after_ip_original_pos.  All
3894         callers changed.  Use gimple_uid comparison instead of scanning.
3895         (add_candidate_1): When looking for identical candidates, take
3896         AINC_USE into account.  Set it for new candidates.
3897         (force_expr_to_var_cost): Cast target_spill_cost to int.
3898         (get_address_cost): New arguments STMT_AFTER_INC and MAY_AUTOINC.
3899         All callers changed.  Check for availability of autoinc addressing
3900         modes, both in general for a given mode, and in the specific use case.
3901         (get_computation_cost_at): New argument CAN_AUTOINC.  All callers
3902         changed.
3903         (get_computation_cost): Likewise.
3904         (autoinc_possible_for_pair, set_autoinc_for_original_candidates,
3905         add_autoinc_candidates): New static functions.
3906         (add_candidate): Call add_autoinc_candidates for candidates based on
3907         a USE_ADDRESS use.
3908         (find_iv_candidates): Call set_autoinc_for_original_candidates.
3909         (determine_use_iv_cost_address): If we have an autoinc candidate at
3910         the matching use, verify autoinc is possible and subtract the cost
3911         of the candidate's step from the cost.
3912         (determine_iv_cost): Record the cost of the increment in the COST_STEP
3913         member of the candidate.
3914         (tree_ssa_iv_optimize_loop): Swap the calls to determine_iv_costs and
3915         determine_use_iv_costs.  Call renumber_gimple_stmt_uids_in_blocks.
3917 2009-08-09  Douglas B Rupp  <rupp@gnat.com>
3919         * config.build (ia64-hp-*vms*): New target.
3920         (alpha64-dec-*vms*,alpha*-dec-*vms*): Fix for config/vms and unify
3921         with ia64-hp-*vms*.
3922         * config.gcc (ia64-hp-*vms*): New target.
3923         (alpha64-dec-*vms*,alpha*-dec-*vms*): Fix for config/vms and unify
3924         with ia64-hp-*vms*.
3925         * config.host (ia64-hp-*vms*): New target.
3926         (alpha64-dec-*vms*,alpha*-dec-*vms*): Fix for config/vms and unify
3927         with ia64-hp-*vms*.
3929 2009-08-08  Richard Guenther  <rguenther@suse.de>
3931         PR tree-optimization/40991
3932         * tree-ssa-pre.c (eliminate): Delay purging EH edges.
3934 2009-08-08  Richard Sandiford  <rdsandiford@googlemail.com>
3936         * combine.c (gen_lowpart_or_truncate): Exclude CONST_INTs from
3937         mode check.  Do truncations in an integer mode.
3938         (force_to_mode): Handle subregs for all mode types.  Only do
3939         arithmetic simplifications on integer modes.
3941 2009-08-07  Richard Guenther  <rguenther@suse.de>
3943         PR tree-optimization/40999
3944         * tree-ssa-ccp.c (get_symbol_constant_value): Handle CONST_DECLs.
3945         (maybe_fold_reference): Lookup constant initializers.
3946         (fold_gimple_assign): Likewise.
3948 2009-08-07  Richard Guenther  <rguenther@suse.de>
3950         * tree-ssa.c (useless_type_conversion_p_1): Only for types
3951         that require structural equality defer to the langhook.
3953 2009-08-07  Martin Jambor  <mjambor@suse.cz>
3955         * ipa-prop.h (enum jump_func_type): New value IPA_JF_ANCESTOR, changed
3956         comments.
3957         (struct ipa_pass_through_data): New type.
3958         (struct ipa_ancestor_jf_data): New type.
3959         (union jump_func_value): Removed field formal_id, added fields
3960         pass_through and ancestor.
3961         (struct ipa_param_call_note): Changed type of formal_id to int from
3962         unsigned.
3963         * ipa-prop.c (ipa_print_node_jump_functions): Print pass through with
3964         operations jump functions and ancestor jump functions.
3965         (compute_complex_pass_through): New function.
3966         (compute_scalar_jump_functions): Call compute_complex_pass_through,
3967         reflect changes in the jump function strucutre.
3968         (update_jump_functions_after_inlining): Ignore complex pass-through
3969         and ancestor jump functions.
3970         * ipa-cp.c (ipcp_lattice_from_jfunc): Added support for ancestor and
3971         polynomial pass-through with operation jump functions.
3973 2009-08-07  Jakub Jelinek  <jakub@redhat.com>
3975         * dwarf2out.c (output_fde): When doing hot/cold partitioning, use
3976         fde->dw_fde_begin as begin label instead of hot/cold label.
3977         Use LLSDAC label instead of LLSDA for second section lsda.
3978         (dwarf2out_do_cfi_startproc): Add SECOND argument.  Use LLSDAC
3979         label instead of LLSDA if it is true.
3980         (dwarf2out_begin_prologue, dwarf2out_switch_text_section): Adjust
3981         callers.
3982         * except.c (add_call_site, dw2_size_of_call_site_table): Add
3983         SECTION argument.  Use it as index into crtl->eh.call_site_record
3984         array.
3985         (dw2_output_call_site_table): Likewise.  Add CS_FORMAT argument,
3986         use it to determine how to print table entries instead of using
3987         #ifdef HAVE_AS_LEB128.  For SECTION > 0 use hot resp. cold
3988         label instead of normal begin label as base.
3989         (sjlj_assign_call_site_values): Adjust add_call_site caller.
3990         (convert_to_eh_region_ranges): When doing hot/cold partitioning,
3991         ensure no EH range spans between sections and that landing pads
3992         are always in the corresponding section.
3993         (sjlj_size_of_call_site_table, sjlj_output_call_site_table): Adjust
3994         for crtl->eh.call_site_record being an array rather than scalar.
3995         (output_one_function_exception_table): New function, copied
3996         from output_function_exception_table.  Adjust
3997         dw2_size_of_call_site_table, dw2_output_call_site_table
3998         callers.  For SECOND section use *C suffixed labels.
3999         (output_function_exception_table): Call
4000         output_one_function_exception_table and, when doing hot/cold
4001         partitioning, also another time for the second section.
4002         * opts.c: Include except.h.
4003         (decode_options): Allow -freorder-blocks-and-partition with
4004         exceptions, unless SJLJ or TARGET_UNWIND_INFO.
4005         * Makefile.in (opts.o): Depend on $(EXCEPT_H).
4006         * function.h (struct rtl_eh): Change call_site_record from
4007         scalar into array of 2 elements.
4009 2009-08-07  Martin Jambor  <mjambor@suse.cz>
4011         * ipa-prop.c (count_formal_params_1): New function.
4012         (ipa_get_vector_of_formal_parms): New function.
4013         (get_vector_of_formal_parm_types): New function.
4014         (ipa_modify_formal_parameters): New function.
4015         (ipa_modify_call_arguments): New function.
4016         (index_in_adjustments_multiple_times_p): New function.
4017         (ipa_combine_adjustments): New function.
4018         (ipa_dump_param_adjustments): New function.
4019         * ipa-prop.h (struct ipa_parm_adjustment): New type.
4020         (ipa_get_vector_of_formal_parms): Declare.
4021         (ipa_modify_formal_parameters): Declare.
4022         (ipa_modify_call_arguments): Declare.
4023         (ipa_combine_adjustments): Declare.
4024         (ipa_dump_param_adjustments): Declare.
4025         (build_ref_for_offset): Declare.
4026         * Makefile.in (tree-sra.o): Add ipa-prop.h to dependencies.
4027         * tree-sra.c: Include ipa-prop.c.
4028         (build_ref_for_offset): Make public.
4030 2009-08-06  Neil Vachharajani  <nvachhar@gmail.com>
4032         * value-prof.c (init_pid_map): Replace xmalloc with XCNEWVEC.
4034 2009-08-06  Thomas Schwinge  <tschwinge@gnu.org>
4036         * gcc/doc/extend.texi (__builtin_extract_return_address)
4037         (__builtin_frob_return_address): Document.
4039 2009-08-06  Paul Brook  <paul@codesourcery.com>
4041         * config/arm/lib1funcs.asm (ARM_DIV_BODY): Add Thumb-2 implementation.
4042         (udivsi3, aeabi_uidivmod, divsi3, aeabi_idivmod): Only use Thumb-1
4043         implementation on ARMv6-M.
4045 2009-08-06  Richard Earnshaw  <rearnsha@arm.com>
4047         * doc/extend.texi (pcs): Document new attribute for ARM.
4049 2009-08-06  Richard Earnshaw  <rearnsha@arm.com>
4051         * arm.c (pcs_attribute_args): Comment out unsupported attribute
4052         variants.
4054 2009-08-06  Richard Earnshaw  <rearnsha@arm.com>
4056         * arm.c (arm_handle_pcs_attribute): Pass the entire name object to
4057         warning ().
4059 2009-08-06  Richard Earnshaw  <rearnsha@arm.com>
4061         * arm.c (arm_handle_pcs_attribute): Use %qE in warning.
4063 2009-08-06  Richard Earnshaw  <rearnsha@arm.com>
4065         Merge ARM/hard_vfp_branch to trunk.
4067         2009-08-04  Richard Earnshaw  <rearnsha@arm.com>
4069         * arm.c (libcall_eq): New function.
4070         (libcall_hash): New function.
4071         (add_libcall): New function.
4072         (arm_libcall_uses_aapcs_base): New function.
4073         (arm_libcall_value): Use arm_libcall_uses_aapcs_base to check for
4074         libcalls using the base PCS.
4075         (arm_init_cumulative_args): Likewise.
4077         2009-07-20  Joseph Myers  <joseph@codesourcery.com>
4079         * config/arm/arm.c (arm_libcall_value, arm_init_cumulative_args):
4080         Use base ABI for conversion libfuncs between HFmode and SFmode.
4082         2009-05-12  Joseph Myers  <joseph@codesourcery.com>
4084         * config/arm/arm.c (aapcs_vfp_sub_candidate): Use V2SImode and
4085         V4SImode as representatives of all 64-bit and 128-bit vector
4086         types.  Allow vector types without vector modes.
4087         (aapcs_vfp_is_call_or_return_candidate): Handle vector types
4088         without vector modes like BLKmode.
4089         (aapcs_vfp_allocate): Handle TImode for non-TARGET_NEON like
4090         BLKmode.  Avoid unsupported vector modes or TImode moves for
4091         non-TARGET_NEON.
4092         (aapcs_vfp_allocate_return_reg): Likewise.
4093         (arm_vector_mode_supported_p): Only support V2SImode, V4HImode and
4094         V8QImode if TARGET_NEON || TARGET_IWMMXT.
4096         2009-05-12  Joseph Myers  <joseph@codesourcery.com>
4098         * config/arm/arm.c (arm_handle_pcs_attribute): New.
4099         (arm_get_pcs_model): Pass attribute arguments to
4100         arm_pcs_from_attribute.
4101         (arm_init_cumulative_args): Use base AAPCS for conversions from
4102         floating-point types to DImode.
4103         (arm_attribute_table): Add pcs attribute.
4104         (arm_handle_pcs_attribute): New.
4105         * config/arm/bpabi.h (DECLARE_LIBRARY_RENAMES): When renaming
4106         conversions from floating-point types to DImode, also declare them
4107         to use base AAPCS and declare functions they call to use base
4108         AAPCS and their RTABI names.
4110         2009-05-12  Joseph Myers  <joseph@codesourcery.com>
4112         * doc/invoke.texi (-mfloat-abi=@var{name}): Remove statement about
4113         -mfloat-abi=hard not being supported for VFP.
4115         2009-05-11  Kazu Hirata  <kazu@codesourcery.com>
4117         * config/sparc/sparc.c (sparc_emit_float_lib_cmp): Pass a libcall
4118         SYMBOL_REF to hard_libcall_value.
4120         2009-03-05  Joseph Myers  <joseph@codesourcery.com>
4121             Richard Earnshaw  <rearnsha@arm.com>
4123         * config/arm/arm.c (aapcs_layout_arg): Once a co-processor argument
4124         has been put on the stack, all remaining co-processory arguments for
4125         that co-processor also go on the stack.
4127         2009-03-05  Joseph Myers  <joseph@codesourcery.com>
4129         * config/arm/arm.c (arm_return_in_memory): Handle returning
4130         vectors of suitable size in registers also for AAPCS case.
4132         2009-01-13  Richard Earnshaw <rearnsha@arm.com>
4134         * doc/tm.texi (TARGET_LIBCALL_VALUE): Add missing end statement.
4136         2008-12-09  Richard Earnshaw <rearnsha@arm.com>
4138         ARM Hard-VFP calling convention
4139         * target-def.h (TARGET_LIBCALL_VALUE): New hook.
4140         * target.h (gcc_target): Add libcall_value to table of call hooks.
4141         * targhooks.h (default_libcall_value): Default implementation.
4142         * targhooks.c (default_libcall_value): Likewise.
4143         * doc/tm.texi (TARGET_LIBCALL_VALUE): Document it.
4144         * optabs.c (expand_unop): Use it.
4145         * expr.h (hard_libcall_value): Pass the function RTX through.
4146         * calls.c (emit_library_call_value_1): Update call to
4147         hard_libcall_value.
4148         * explow.c (hard_libcall_value): Use new target hook.
4149         * testsuite/lib/target-supports.exp
4150         (check_effective_target_arm_hard_vfp_ok): New hook.
4151         (check_effective_target_arm_neon_ok): Improve test for neon
4152         availability.
4153         * testsuite/gcc.target/arm/eabi1.c: Only run test in base variant.
4154         * config/arm/arm.c: Include cgraph.h
4155         (TARGET_FUNCTION_VALUE): Override default hook.
4156         (arm_pcs_default): New variable.
4157         (arm_override_options): Don't fault hard calling convention with VFP.
4158         Add support for AAPCS variants.
4159         (arm_function_value): Make static.  Handle AAPCS variants.
4160         (arm_libcall_value): New function.
4161         (arm_apply_result_size): Handle VFP registers in results.
4162         (arm_return_in_memory): Rework all AAPCS variants; handle hard-vfp
4163         conventions.
4164         (pcs_attribute_args): New variable.
4165         (arm_pcs_from_attribute): New function.
4166         (arm_get_pcs_model): New function.
4167         (aapcs_vfp_cum_init): New function.
4168         (aapcs_vfp_sub_candidate): New function.
4169         (aapcs_vfp_is_return_candidate): New function.
4170         (aapcs_vfp_is_call_candidate): New function.
4171         (aapcs_vfp_allocate): New function.
4172         (aapcs_vfp_allocate_return_reg): New function.
4173         (aapcs_vfp_advance): New function.
4174         (aapcs_cp_arg_layout): New variable.
4175         (aapcs_select_call_coproc): New function.
4176         (aapcs_select_return_coproc): New function.
4177         (aapcs_allocate_return_reg): New function.
4178         (aapcs_libcall_value): New function.
4179         (aapcs_layout_arg): New function.
4180         (arm_init_cumulative_args): Initialize AAPCS args data.
4181         (arm_function_arg): Handle AAPCS variants using new interface.
4182         (arm_arg_parital_bytes): Likewise.
4183         (arm_function_arg_advance): New function.
4184         (arm_function_ok_for_sibcall): Ensure that sibling calls agree on
4185         calling conventions.
4186         (arm_setup_incoming_varargs): Handle new AAPCS args data.
4187         * arm.h (NUM_VFP_ARG_REGS): Define.
4188         (LIBCALL_VALUE): Update.
4189         (FUNCTION_VALUE): Delete.
4190         (FUNCTION_VALUE_REGNO_P): Add VFP regs.
4191         (arm_pcs): New enum.
4192         (CUMULATIVE_ARGS): New data to support AAPCS argument marshalling.
4193         (FUNCTION_ARG_ADVANCE): Call arm_function_arg_advance.
4194         (FUNCTION_ARG_REGNO_P): Add VFP regs.
4195         * arm-protos.h (arm_function_arg_advance): Add.
4196         (aapcs_libcall_value): Add.
4197         (arm_function_value): Delete.
4199 2009-08-06  Uros Bizjak  <ubizjak@gmail.com>
4200             H.J. Lu  <hongjiu.lu@intel.com>
4202         PR target/40957
4203         * config/i386/i386.c (standard_sse_mode_p): Remove.
4204         (standard_sse_constant_p): Return 2 for integer mode
4205         vector_all_ones_operand when SSE2 is enabled.
4206         (standard_sse_constant_opcode)<case 2>: Always return [v]pcmpeqd.
4207         (ix86_expand_vector_move): Do not check for negative values from
4208         standard_sse_constant_p.
4210 2009-08-06  Richard Guenther  <rguenther@suse.de>
4212         * tree-ssa.c (useless_type_conversion_p_1): Make function and
4213         array type comparisons frontend independent.
4214         * Makefile.in (tree-ssa.o): Add $(TARGET_H) dependency.
4215         * tree-ssa-sccvn.c (copy_reference_ops_from_ref): Always fill
4216         out array reference lower bound and element size operands.
4217         (ao_ref_init_from_vn_reference): Properly compute the offset
4218         for ARRAY_RANGE_REF.
4219         (vn_reference_fold_indirect): Fill out array reference lower
4220         bound and element size operands.
4221         * tree-ssa-pre.c (phi_translate_1): Fail if we have to translate
4222         a non gimple valued reference operand which can happen for
4223         array reference lower bound or element size.
4224         (create_component_ref_by_pieces_1): Properly generate the
4225         element size operand for array references.
4227 2009-08-06  Richard Guenther  <rguenther@suse.de>
4229         PR tree-optimization/40964
4230         * tree.c (iterative_hash_host_wide_int): Export.
4231         * tree.h (iterative_hash_host_wide_int): Declare.
4232         * tree-ssa-structalias.c (heapvar_map): New struct.
4233         (heapvar_map_eq): New function.
4234         (heapvar_map_hash): Likewise.
4235         (heapvar_lookup): Adjust.
4236         (heapvar_insert): Likewise.
4237         (make_constraint_from_heapvar): Allow multiple heap variables
4238         per decl at different offsets.
4239         (init_alias_heapvars): Adjust.
4241 2009-08-04  David Daney  <ddaney@caviumnetworks.com>
4243         * config/mips/mips.h (TARGET_SYNC_AFTER_SC): New macro.
4244         * mips_output_sync_loop (mips_output_sync_loop): Only emit
4245         trailing sync if TARGET_SYNC_AFTER_SC.
4247 2009-08-05  David Daney  <ddaney@caviumnetworks.com>
4249         * gcc/config/mips/sync.md (sync_compare_and_swap<mode>,
4250         compare_and_swap_12, sync_add<mode>, sync_<optab>_12,
4251         sync_old_<optab>_12, sync_new_<optab>_12, sync_nand_12,
4252         sync_old_nand_12, sync_new_nand_12, sync_sub<mode>,
4253         sync_old_add<mode>, sync_old_sub<mode>, sync_new_add<mode>,
4254         sync_new_sub<mode>, sync_<optab><mode>, sync_old_<optab><mode>,
4255         sync_new_<optab><mode>, sync_nand<mode>, sync_old_nand<mode>,
4256         sync_new_nand<mode>, sync_lock_test_and_set<mode>,
4257         test_and_set_12): Rewrite calls to mips_output_sync_loop.
4258         * gcc/config/mips/mips-protos.h (mips_output_sync_loop): Make
4259         the prototype declaration match the definition.
4260         * gcc/config/mips/mips.c (mips_output_sync_loop):  Emit sync
4261         instructions explicitly.  Add barrier_before and operands
4262         parameters.
4263         * gcc/config/mips/mips.h (MIPS_COMPARE_AND_SWAP,
4264         MIPS_COMPARE_AND_SWAP_12, MIPS_SYNC_OP, MIPS_SYNC_OP_12,
4265         MIPS_SYNC_OLD_OP_12, MIPS_SYNC_NEW_OP_12, MIPS_SYNC_OLD_OP,
4266         MIPS_SYNC_NEW_OP, MIPS_SYNC_NAND, MIPS_SYNC_OLD_NAND,
4267         MIPS_SYNC_NEW_NAND, MIPS_SYNC_EXCHANGE,
4268         MIPS_SYNC_EXCHANGE_12): Remove sync instructions.
4270 2009-08-05  Andrew Pinski  <pinskia@gmail.com>
4272         * tree-ssa-alias.c: Fix intervals to use [) syntax.
4274 2009-08-05  Uros Bizjak  <ubizjak@gmail.com>
4275             Mikulas Patocka  <mikulas@artax.karlin.mff.cuni.cz>
4277         PR target/40906
4278         * config/i386/i386.c (ix86_split_long_move): Fix push of multi-part
4279         source operand.
4281 2009-08-05  Jakub Jelinek  <jakub@redhat.com>
4283         PR rtl-optimization/40924
4284         * dse.c (canon_address): Before calling cselib_expand_value_rtx
4285         make sure canon_rtx (mem_address) isn't simpler than
4286         canon_rtx (expanded_mem_address).
4288 2009-08-05  Li Feng  <nemokingdom@gmail.com>
4290         * graphite-sese-to-poly.c (build_pbb_drs): Remove build alias set
4291         for each poly_bb_p.
4292         (build_scop_drs): Build alias set for each SCoP.
4294 2009-08-04  Sandra Loosemore  <sandra@codesourcery.com>
4296         * doc/invoke.texi (MIPS Options): Document new 1004K -march options.
4297         * config/mips/mips.c (mips_cpu_info_table): Add 1004K cores.
4298         * config/mips/mips.h (MIPS_ISA_LEVEL_SPEC): Add pattern for 1004K.
4299         (MIPS_ARCH_FLOAT_SPEC): Likewise.
4300         (BASE_DRIVER_SELF_SPECS): Likewise.
4302 2009-08-04  Andrew Pinski  <pinskia@gmail.com>
4304         * tree-ssa-alias.c: Fix some comment typos.
4306 2009-08-04  Kaz Kojima  <kkojima@gcc.gnu.org>
4308         * config/sh/linux-atomic.asm (ATOMIC_BOOL_COMPARE_AND_SWAP,
4309         ATOMIC_OP_AND_FETCH, ATOMIC_COMBOP_AND_FETCH): Define.
4311 2009-08-03  Janis Johnson  <janis187@us.ibm.com>
4313         PR c/39902
4314         * simplify-rtx.c (simplify_binary_operation_1): Disable
4315         simplifications for decimal float operations.
4317 2009-08-03  Jakub Jelinek  <jakub@redhat.com>
4319         PR middle-end/40943
4320         * tree-ssa.c (warn_uninitialized_var): Even on LHS warn for
4321         operand of INDIRECT_REF.
4323 2009-08-03  Uros Bizjak  <ubizjak@gmail.com>
4325         * config/alpha/alpha.c (alpha_legitimate_constant_p): Reject CONST
4326         constants referencing TLS symbols.
4328 2009-08-03  SUGIOKA Toshinobu  <sugioka@itonet.co.jp>
4330         * config/sh/linux-atomic.asm (ATOMIC_COMPARE_AND_SWAP): Rename
4331         __sync_compare_and_swap_* to __sync_val_compare_and_swap_*.
4333 2009-08-03  Richard Guenther  <rguenther@suse.de>
4335         * tree.c (make_vector_type): Build a main variant first,
4336         get the canonical one and then build the variant.
4337         * tree-ssa.c (useless_type_conversion_p_1): Handle
4338         fixed-point types.
4339         (useless_type_conversion_p): Conversions to pointers to
4340         incomplete record types are useless.
4342 2009-08-03  Richard Guenther  <rguenther@suse.de>
4344         * tree-cfg.c (pass_warn_unused_result): Mark name that no dump
4345         file will be created.
4346         * omp-low.c (pass_diagnose_omp_blocks): Likewise.
4347         * toplev.c (compile_file): Adjust comment.
4349 2009-08-03  Kaz Kojima  <kkojima@gcc.gnu.org>
4351         * config/sh/sh-protos.h (sh_promote_function_mode): Remove.
4352         * config/sh/sh.c (sh_promote_function_mode): Wrap long lines.
4353         (TARGET_PROMOTE_FUNCTION_MODE): Define.
4354         (TARGET_PROMOTE_FUNCTION_ARGS): Remove.
4355         (sh_promote_function_mode): Fix typo.
4357 2009-08-03  Andreas Krebbel  <krebbel1@de.ibm.com>
4359         * explow.c (promote_mode): Mark TYPE and PUNSIGNEDP as possibly unused.
4361 2009-08-02  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
4363         * pa.c (pa_promote_function_mode): Remove ATTRIBUTE_UNUSED from
4364         declaration arguments.
4366 2009-08-02  Uros Bizjak  <ubizjak@gmail.com>
4368         * config/i386/i386.c (ix86_expand_fp_compare): Use const0_rtx instead
4369         of GEN_INT (0x00) and const1_rtx instead of GEN_INT (0x01).
4370         (ix86_split_ashl): Ditto.
4371         (ix86_expand_vector_init_one_nonzero): Ditto.
4372         (ix86_expand_vector_set): Ditto.
4373         (ix86_expand_reduc_v4sf): Ditto.
4375 2009-08-02  Paolo Bonzini  <bonzini@gnu.org>
4377         * explow.c (promote_function_mode): Remove assert.
4378         * config/sh/sh.c (sh_promote_function_mode): Declare.
4380 2009-08-01  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
4382         * config/pa/pa.c (pa_promote_function_mode): Declare.
4383         Change to static.  Fix promote_mode call.
4385         * gthr-dce.h (CONST_CAST2): Define if not defined.
4386         (__gthread_setspecific): Use CONST_CAST2 to fix warning.
4388         * config.gcc (hppa[12]*-*-hpux10*): Add stdint support.
4390 2009-08-01  Paolo Bonzini  <bonzini@gnu.org>
4392         * expr.c (store_constructor): Use promote_decl_mode.  Remove
4393         now write-only variable unsignedp.
4394         (expand_expr_real_1): Use promote_decl_mode.
4395         * expr.h (promote_function_mode, promote_decl_mode): New.
4396         (promote_mode): Remove last argument.
4397         * function.c (assign_temp): Drop last argument of promote_mode.
4398         (assign_parm_find_data_types): Use promote_function_mode.
4399         (assign_parm_setup_reg): Likewise.
4400         (expand_function_end): Use promote_function_mode.
4401         * calls.c (initialize_argument_information): Use promote_function_mode.
4402         (precompute_arguments): Use promote_mode instead of checking if
4403         only PROMOTE_FUNCTION_MODE is defined.
4404         (expand_call): When making sibcall decisions, use promote_function_mode.
4405         Below, remove an if for targetm.calls.promote_function_return and
4406         and use promote_function_mode.
4407         (emit_library_call_value_1): Use promote_function_mode, fix bug
4408         where promote_mode was passed FOR_CALL == 0 for a return value in an
4409         assertion.
4410         * cfgexpand.c (expand_one_register_var): Use promote_decl_mode.
4411         * explow.c (promote_function_mode, promote_decl_mode): New.
4412         (promote_mode): Keep only the FOR_CALL == 0 case.
4413         * combine.c (setup_incoming_promotion): Remove test of
4414         promote_function_args.  Use promote_function_mode.
4415         * stmt.c (expand_value_return): Use promote_decl_mode.
4416         (expand_decl): Use promote_decl_mode.
4418         * expr.c (store_constructor): Use promote_decl_mode.  Remove
4419         now write-only variable unsignedp.
4420         (expand_expr_real_1): Use promote_decl_mode.
4421         * expr.h (promote_function_mode, promote_decl_mode): New.
4422         (promote_mode): Remove last argument.
4423         * function.c (assign_temp): Drop last argument of promote_mode.
4424         (assign_parm_find_data_types): Use promote_function_mode.
4425         (assign_parm_setup_reg): Likewise.
4426         (expand_function_end): Use promote_function_mode.
4427         * calls.c (initialize_argument_information): Use promote_function_mode.
4428         (precompute_arguments): Use promote_mode instead of checking if
4429         only PROMOTE_FUNCTION_MODE is defined.
4430         (expand_call): When making sibcall decisions, use promote_function_mode.
4431         Below, remove an if for targetm.calls.promote_function_return and
4432         and use promote_function_mode.
4433         (emit_library_call_value_1): Use promote_function_mode, fix bug
4434         where promote_mode was passed FOR_CALL == 0 for a return value in an
4435         assertion.
4436         * cfgexpand.c (expand_one_register_var): Use promote_decl_mode.
4437         * explow.c (promote_function_mode, promote_decl_mode): New.
4438         (promote_mode): Keep only the FOR_CALL == 0 case.
4439         * combine.c (setup_incoming_promotion): Remove test of
4440         promote_function_args.  Use promote_function_mode.
4441         * stmt.c (expand_value_return): Use promote_decl_mode.
4442         (expand_decl): Use promote_decl_mode.
4444         * explow.c (promote_function_mode): Just call the target hook.
4445         * targhooks.c (default_promote_function_mode,
4446         default_promote_function_mode_always_promote): New.
4447         * targhooks.h (default_promote_function_mode,
4448         default_promote_function_mode_always_promote): Declare.
4449         * target.h (promote_function_args, promote_function_return): Remove.
4450         (promote_function_mode): New.
4451         * target-def.h (TARGET_PROMOTE_FUNCTION_ARGS,
4452         TARGET_PROMOTE_FUNCTION_RETURN): Remove.
4453         (TARGET_PROMOTE_FUNCTION_MODE): New.
4454         (TARGET_CALLS): Adjust.
4455         * system.h (TARGET_PROMOTE_FUNCTION_ARGS,
4456         TARGET_PROMOTE_FUNCTION_RETURN, PROMOTE_FUNCTION_MODE): Poison.
4458         * config/s390/s390.h (PROMOTE_FUNCTION_MODE): Move...
4459         * config/s390/s390.c (s390_promote_function_mode): ... here,
4460         with pointer handling.
4461         (TARGET_PROMOTE_FUNCTION_MODE): Define.
4462         (TARGET_PROMOTE_FUNCTION_ARGS, TARGET_PROMOTE_FUNCTION_RETURN): Remove.
4464         * config/sparc/sparc.h (PROMOTE_FUNCTION_MODE): Move...
4465         * config/sparc/sparc.c (sparc_promote_function_mode): ... here,
4466         with pointer handling.
4467         (TARGET_PROMOTE_FUNCTION_MODE): Define.
4468         (TARGET_PROMOTE_FUNCTION_ARGS, TARGET_PROMOTE_FUNCTION_RETURN): Remove.
4470         * config/sh/sh-protos.h (sh_promote_function_mode): New.
4471         * config/sh/sh.c (sh_promote_function_mode): New.
4472         (TARGET_PROMOTE_FUNCTION_MODE): Define.
4473         (TARGET_PROMOTE_FUNCTION_ARGS, TARGET_PROMOTE_FUNCTION_RETURN): Remove.
4475         * config/cris/cris.h (PROMOTE_FUNCTION_MODE): Move...
4476         * config/cris/cris.c (cris_promote_function_mode): ... here.
4477         (TARGET_PROMOTE_FUNCTION_MODE): Define.
4478         (TARGET_PROMOTE_FUNCTION_ARGS): Remove.
4480         * config/mmix/mmix.h (PROMOTE_FUNCTION_MODE): Move...
4481         * config/mmix/mmix.c (mmix_promote_function_mode): ... here.
4482         (TARGET_PROMOTE_FUNCTION_MODE): Define.
4483         (TARGET_PROMOTE_FUNCTION_ARGS): Remove.
4485         * config/arm/arm.h (PROMOTE_FUNCTION_MODE): Move...
4486         * config/arm/arm.c (arm_promote_function_mode): ... here, without
4487         complex type handling.
4488         (TARGET_PROMOTE_FUNCTION_MODE): Define.
4489         (TARGET_PROMOTE_FUNCTION_ARGS, TARGET_PROMOTE_FUNCTION_RETURN): Remove.
4491         * config/pa/pa.c (pa_promote_function_mode): New.
4492         (TARGET_PROMOTE_FUNCTION_MODE): Define.
4493         (TARGET_PROMOTE_FUNCTION_RETURN): Remove.
4495         * config/alpha/alpha.c (TARGET_PROMOTE_FUNCTION_ARGS,
4496         TARGET_PROMOTE_FUNCTION_RETURN): Remove.
4497         (TARGET_PROMOTE_FUNCTION_MODE): Define equivalently.
4498         * config/xtensa/xtensa.c: Likewise.
4499         * config/stormy16/stormy16.c: Likewise.
4500         * config/iq2000/iq2000.c: Likewise.
4501         * config/rs6000/rs6000.c: Likewise.
4502         * config/picochip/picochip.c: Likewise.
4503         * config/arc/arc.c: Likewise.
4504         * config/mcore/mcore.c: Likewise.
4505         * config/score/score.c: Likewise.
4506         * config/mips/mips.c: Likewise.
4507         * config/bfin/bfin.c: Likewise.
4508         * config/ia64/ia64.c: Likewise (disabled though).
4510         * config/frv/frv.h: Remove pointless remark.
4512         * doc/tm.texi (PROMOTE_FUNCTION_MODE,
4513         TARGET_PROMOTE_FUNCTION_ARGS,
4514         TARGET_PROMOTE_FUNCTION_RETURN): Consolidate into...
4515         (TARGET_PROMOTE_FUNCTION_MODE): ... this.
4517 2009-08-01  Sebastian Pop  <sebastian.pop@amd.com>
4519         * doc/invoke.texi (-fgraphite-force-parallel): Renamed
4520         -floop-parallelize-all.
4521         * toplev.c (process_options): Rename flag_graphite_force_parallel to
4522         flag_loop_parallelize_all.
4523         * tree-ssa-loop.c (gate_graphite_transforms): Same.
4524         * graphite.c (graphite_transform_loops): Same.
4525         * common.opt: Same.
4526         * graphite-poly.c (apply_poly_transforms): Same.
4528 2009-07-31  Richard Earnshaw  <rearnsha@arm.com>
4530         PR tree-optimization/40914
4531         * ipa-prop.c (ipa_get_ptr_load_param): New argument use_delta,
4532         if set, then check the delta field of the PMF record.
4533         (ipa_get_stmt_member_ptr_load_param): Propagate new param use_delta.
4534         (ipa_analyze_call_uses): Handle machines where the vbit for a PMF
4535         call is stored in the delta.
4537 2009-07-31  Adam Nemet  <anemet@caviumnetworks.com>
4539         * config/mips/mips.md (*clear_upper32_dext): New pattern.
4541 2009-07-31  Uros Bizjak  <ubizjak@gmail.com>
4543         * config/i386/bsd.h (ASM_BYTE): New define.
4544         * config/i386/darwin.h (ASM_BYTE): Rename from ASM_BYTE_OP.
4545         * config/i386/att.h (ASM_BYTE): New define. Use ASM_BYTE instead of
4546         .byte.  Use fputs or putc instead of fprintf where appropriate.
4547         * config/i386/i386-interix.h: Use ASM_BYTE instead of .byte.  Use
4548         fputs or putc instead of fprintf where appropriate.
4549         * config/i386/i386elf.h: Ditto.
4550         * config/i386/sysv4.h: Ditto.
4552         * config/i386/i386.c (TARGET_ASM_BYTE_OP): New define.
4553         * config/i386/i386.md (x86_sahf_1): Use ASM_BYTE instead of .byte.
4554         (*tls_global_dynamic_64): Ditto.
4556 2009-07-31  Christian Bruel  <christian.bruel@st.com>
4558         * gcc/config.gcc (sh*-*-elf): test with_libgloss.
4560 2009-07-31  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
4562         * config/arm/arm.c (arm_arm_address_cost): Fix typo.
4563         Remove dead code for MINUS.
4565 2009-07-31  Anthony Green  <green@moxielogic.com>
4567         * config/moxie/moxie.c (moxie_expand_prologue): Use $r5 instead of
4568         $r12 in prologue.
4569         (moxie_expand_epilogue): Ditto for epilogue.
4570         (moxie_setup_incoming_varargs): ABI change.  Use 5 registers for
4571         incoming arguments.
4572         (moxie_function_arg): Ditto.
4573         (moxie_pass_by_reference): Ditto.
4574         (moxie_arg_partial_bytes): Ditto.
4575         * config/moxie/moxie.h (CALL_USED_REGISTERS): Ditto.
4576         (FUNCTION_ARG_ADVANCE) Ditto.
4577         (REG_PARM_STACK_SPACE) Ditto.
4578         (FUNCTION_ARG_REGNO_P) Dito.
4580         * config.gcc: Add moxie linux config support.
4581         * gcc/config/moxie/uclinux.h: New file.
4583 2009-07-31  DJ Delorie  <dj@redhat.com>
4585         * config/sh/sh.md (UNSPECV_SP_SWITCH_B): New.
4586         (UNSPECV_SP_SWITCH_E): New.
4587         (sp_switch_1): Change to an unspec.
4588         (sp_switch_2): Change to an unspec.  Don't use post-inc when we
4589         replace $r15.
4590         * config/sh/sh.c (sh_expand_prologue): Use the constant pool to
4591         reference the new stack's address
4593 2009-07-30  Sebastian Pop  <sebastian.pop@amd.com>
4595         * Makefile.in (OBJS-common): Added dependence on graphite-blocking.o,
4596         graphite-clast-to-gimple.o, graphite-dependences.o,
4597         graphite-interchange.o, graphite-poly.o, graphite-ppl.o,
4598         graphite-scop-detection.o, graphite-sese-to-poly.o, and sese.o.
4599         (graphite-blocking.o,
4600         graphite-clast-to-gimple.o, graphite-dependences.o,
4601         graphite-interchange.o, graphite-poly.o, graphite-ppl.o,
4602         graphite-scop-detection.o, graphite-sese-to-poly.o, and sese.o): New.
4603         * cfgloop.c (alloc_loop): Set loop->can_be_parallel to false.
4604         * cfgloop.h (struct loop): Add can_be_parallel field.
4605         * common.opt (fgraphite-identity): Moved up.
4606         (fgraphite-force-parallel): New flag.
4607         * graphite.c: Rewrite.
4608         * graphite.h: Rewrite.
4609         * passes.c (init_optimization_passes): Schedule a pass of DCE and LIM
4610         after Graphite.
4611         * toplev.c (graphite_out_file): New file descriptor.
4612         (graphite_in_file): New.
4613         (process_options): flag_graphite_force_parallel cannot be used without
4614         Graphite.
4615         * tree-ssa-loop.c: Include toplev.h.
4616         (gate_graphite_transforms): Enable flag_graphite for
4617         flag_graphite_force_parallel.
4619 2009-07-30  Sebastian Pop  <sebastian.pop@amd.com>
4621         * ChangeLog.graphite: New.
4622         * graphite-blocking.c: New.
4623         * graphite-clast-to-gimple.c: New.
4624         * graphite-clast-to-gimple.h: New.
4625         * graphite-dependences.c: New.
4626         * graphite-dependences.h: New.
4627         * graphite-interchange.c: New.
4628         * graphite-poly.c: New.
4629         * graphite-poly.h: New.
4630         * graphite-ppl.c: New.
4631         * graphite-ppl.h: New.
4632         * graphite-scop-detection.c: New.
4633         * graphite-scop-detection.h: New.
4634         * graphite-sese-to-poly.c: New.
4635         * graphite-sese-to-poly.h: New.
4636         * sese.c: New.
4637         * sese.h: New.
4639 2009-07-30  Sebastian Pop  <sebastian.pop@amd.com>
4641         * tree-chrec.c (evolution_function_right_is_integer_cst): New.
4642         * tree-chrec.h (evolution_function_right_is_integer_cst): Declared.
4644 2009-07-30  Sebastian Pop  <sebastian.pop@amd.com>
4646         * tree-chrec.c (operator_is_linear): Handle BIT_NOT_EXPR.
4647         (scev_is_linear_expression): Return false if the evolution is not
4648         affine multivariate.
4650 2009-07-30  Sebastian Pop  <sebastian.pop@amd.com>
4652         * tree-data-ref.c (graphite_find_data_references_in_stmt): New.
4653         * tree-data-ref.h (graphite_find_data_references_in_stmt): Declared.
4655 2009-07-30  Sebastian Pop  <sebastian.pop@amd.com>
4657         * tree-data-ref.c (debug_data_references): New.
4658         (debug_data_reference): New.
4659         * tree-data-ref.h (debug_data_references): Declared.
4660         (debug_data_reference): Declared.
4662 2009-07-30  Sebastian Pop  <sebastian.pop@amd.com>
4664         * tree-data-ref.c (stmt_simple_memref_p: Removed.
4665         * tree-data-ref.h (scop_p): Removed.
4666         (struct data_reference): Remove field scop.
4667         (DR_SCOP): Removed.
4668         (stmt_simple_memref_p): Removed.
4670 2009-07-30  Sebastian Pop  <sebastian.pop@amd.com>
4672         * cfgloop.h (create_empty_loop_on_edge): Pass an extra argument.
4673         * cfgloopmanip.c (create_empty_loop_on_edge): Leave the loop_latch
4674         basic block empty.
4676 2009-07-30  Sebastian Pop  <sebastian.pop@amd.com>
4678         * doc/invoke.texi (-fgraphite-force-parallel): Documented.
4680 2009-07-30  Sebastian Pop  <sebastian.pop@amd.com>
4682         * doc/invoke.texi (-fgraphite-identity): Documented.
4684 2009-07-30  Sebastian Pop  <sebastian.pop@amd.com>
4686         * tree-scalar-evolution.c: Fix comment.
4687         (instantiate_scev_1): Return unknow from scev instantiation if the
4688         result is not above instantiate_below.
4690 2009-07-30  Sebastian Pop  <sebastian.pop@amd.com>
4692         * tree-scalar-evolution.c (compute_overall_effect_of_inner_loop): Not
4693         static anymore.  Instantiate the symbols that may have been introduced
4694         by chrec_apply.
4695         * tree-scalar-evolution.h (compute_overall_effect_of_inner_loop):
4696         Declared.
4698 2009-07-30  DJ Delorie  <dj@redhat.com>
4700         * config/mep/mep.c (mep_asm_init_sections): Add section flags and
4701         .vliw directive to VLIW sections.
4703 2009-07-30  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
4705         * Makefile.in (AUTOCONF, ACLOCAL, ACLOCAL_AMFLAGS, aclocal_deps):
4706         New variables.
4707         ($(srcdir)/configure, $(srcdir)/aclocal.m4): New rules.
4708         (AUTOHEADER): New variable.
4709         ($(srcdir)/cstamp-h.in): Use it.
4711 2009-07-30  Michael Meissner  <meissner@linux.vnet.ibm.com>
4712             Pat Haugen  <pthaugen@us.ibm.com>
4713             Revital Eres <ERES@il.ibm.com>
4715         * config/rs6000/vector.md (VEC_F): Add VSX support.
4716         (VEC_A): Ditto.
4717         (VEC_N): Ditto.
4718         (mov<mode>): Ditto.
4719         (vector_load_<mode>): Ditto.
4720         (vector_store_<mode>): Ditto.
4721         (vector GPR move split): Ditto.
4722         (vec_reload_and_plus_<mptrsize>): Ditto.
4723         (vec_reload_and_reg_<mptrsize>): Ditto.
4724         (add<mode>3): Ditto.
4725         (sub<mode>3): Ditto.
4726         (mul<mode>3): Ditto.
4727         (neg<mode>2): Ditto.
4728         (abs<mode>2): Ditto.
4729         (smin<mode>3): Ditto.
4730         (smax<mode>3): Ditto.
4731         (vector_eq<mode>): Ditto.
4732         (vector_gt<mode>): Ditto.
4733         (vector_ge<mode>): Ditto.
4734         (vector_gtu<mode>): Ditto.
4735         (vector_select_<mode>_uns): Ditto.
4736         (vector_eq_<mode>_p): Ditto.
4737         (vector_gt_<mode>_p): Ditto.
4738         (vector_ge_<mode>_p): Ditto.
4739         (vector_gtu_<mode>_p): Ditto.
4740         (cr6_test_for_zero): Ditto.
4741         (cr6_test_for_zero_reverse): Ditto.
4742         (cr6_test_for_lt): Ditto.
4743         (cr6_test_for_lt_reverse): Ditto.
4744         (xor<mode>3): Ditto.
4745         (ior<mode>3): Ditto.
4746         (and<mode>3): Ditto.
4747         (one_cmpl<mode>2): Ditto.
4748         (nor<mode>2): Ditto.
4749         (andc<mode>2): Ditto.
4750         (float<VEC_int<mode>2): Ditto.
4751         (unsigned_float<VEC_int><mode>2): Ditto.
4752         (fix_trunc<mode><VEC_int>2): Ditto.
4753         (fixuns_trunc<mode><VEC_int>2): Ditto.
4754         (vec_init<mode>):
4755         (vec_set<mode>): Ditto.
4756         (vec_extract<mode>): Ditto.
4757         (vec_interleave_highv4sf): Ditto.
4758         (vec_interleave_lowv4sf): Ditto.
4759         (vec_realign_load_<mode>): Ditto.
4760         (vec_shl_<mode>): Ditto.
4761         (vec_shr_<mode>): Ditto.
4762         (div<mode>3): New patterns for VSX.
4763         (vec_interleave_highv2df): Ditto.
4764         (vec_interleave_lowv2df): Ditto.
4765         (vec_pack_trunc_v2df): Ditto.
4766         (vec_pack_sfix_trunc_v2df): Ditto.
4767         (vec_pack_ufix_trunc_v2df): Ditto.
4768         (vec_unpacks_hi_v4sf): Ditto.
4769         (vec_unpacks_lo_v4sf): Ditto.
4770         (vec_unpacks_float_hi_v4si): Ditto.
4771         (vec_unpacks_float_lo_v4si): Ditto.
4772         (vec_unpacku_float_hi_v4si): Ditto.
4773         (vec_unpacku_float_lo_v4si): Ditto.
4774         (movmisalign<mode>): Ditto.
4775         (vector_ceil<mode>2): New patterns for vectorizing math library.
4776         (vector_floor<mode>2): Ditto.
4777         (vector_btrunc<mode>2): Ditto.
4778         (vector_copysign<mode>3): Ditto.
4780         * config/rs6000/predicates.md (easy_vector_constant_msb): New
4781         predicate for setting the high bit in each word, used for copysign.
4783         * config/rs6000/ppc-asm.h (f19): Whitespace.
4784         (f32-f63): Define if VSX.
4785         (v0-v31): Define if Altivec.
4786         (vs0-vs63): Define if VSX.
4788         * config/rs6000/t-rs6000 (MD_INCLUDES): Add power7.md and vsx.md.
4790         * config/rs6000/power7.md: New file, provide tuning parameters for
4791         -mcpu=power7.
4793         * config/rs6000/rs6000-c.c (rs6000_macro_to_expand): Add VSX support.
4794         (rs6000_cpu_cpp_builtins): Ditto.
4795         (altivec_overloaded_builtins): Ditto.
4796         (altivec_resolve_overloaded_builtin): Ditto.
4798         * config/rs6000/rs6000.opt (-mno-vectorize-builtins): Add new
4799         debug switch to disable vectorizing simple math builtin
4800         functions.
4802         * config/rs6000/rs6000.c (rs6000_builtin_vectorized_function):
4803         Vectorize simple math builtin functions.
4804         (TARGET_VECTORIZE_BUILTIN_VECTORIZED_FUNCTION): Define target
4805         hook to vectorize math builtins.
4806         (rs6000_override_options): Enable -mvsx on -mcpu=power7.
4807         (rs6000_builtin_conversion): Add VSX/power7 support.
4808         (rs6000_builtin_vec_perm): Ditto.
4809         (vsplits_constant): Add support for loading up a vector constant
4810         with just the high bit set in each part.
4811         (rs6000_expand_vector_init): Add VSX/power7 support.
4812         (rs6000_expand_vector_set): Ditto.
4813         (rs6000_expand_vector_extract): Ditto.
4814         (rs6000_emit_move): Ditto.
4815         (bdesc_3arg): Ditto.
4816         (bdesc_2arg): Ditto.
4817         (bdesc_1arg): Ditto.
4818         (rs6000_expand_ternop_builtin): Ditto.
4819         (altivec_expand_builtin): Ditto.
4820         (rs6000_expand_unop_builtin): Ditto.
4821         (rs6000_init_builtins): Ditto.
4822         (altivec_init_builtins): Ditto.
4823         (builtin_function_type): Ditto.
4824         (rs6000_common_init_builtins): Ditto.
4825         (rs6000_handle_altivec_attribute); Ditto.
4826         (rs6000_mangle_type): Ditto.
4827         (rs6000_vector_mode_supported_p): Ditto.
4828         (rs6000_mode_dependent_address): Altivec addresses with AND -16
4829         are mode dependent.
4831         * config/rs6000/vsx.md: New file for VSX support.
4833         * config/rs6000/rs6000.h (EASY_VECTOR_MSB): New macro for
4834         identifing values with just the most significant bit set.
4835         (enum rs6000_builtins): Add builtins for VSX.  Add simple math
4836         vectorized builtins.
4838         * config/rs6000/altivec.md (UNSPEC_VRFIP): Delete.
4839         (UNSPEC_VRFIM): Delete.
4840         (splitter for loading up vector with most significant bit): New
4841         splitter for vectorizing copysign.
4842         (altivec_vrfiz): Rename from altivec_fturncv4sf2.  Add support for
4843         vectorizing simple math functions.
4844         (altivec_vrfip): Add support for vectorizing simple math functions.
4845         (altivec_vrfim): Ditto.
4846         (altivec_copysign_v4sf3): New insn for Altivec copysign support.
4848         * config/rs6000/rs6000.md (UNSPEC_BPERM): New constant.
4849         (power7.md, vsx.md): Include for power7 support.
4850         (copysigndf3): Use VSX instructions if -mvsx.
4851         (negdf2_fpr): Ditto.
4852         (absdf2_fpr): Ditto.
4853         (nabsdf2_fpr): Ditto.
4854         (adddf3_fpr): Ditto.
4855         (subdf3_fpr): Ditto.
4856         (muldf3_fpr): Ditto.
4857         (divdf3_fpr): Ditto.
4858         (fix_truncdfdi2_fpr): Ditto.
4859         (cmpdf_internal1): Ditto.
4860         (fred, fred_fpr): Convert into expander/insn to add VSX support.
4861         (btruncdf2, btruncdf2_fpr): Ditto.
4862         (ceildf2, ceildf2_fpr): Ditto.
4863         (floordf2, floordf2_fpr): Ditto.
4864         (floatdidf2, floatdidf2_fpr): Ditto.
4865         (fmadddf4_fpr): Name insn.  Use VSX instructions if -mvsx.
4866         (fmsubdf4_fpr): Ditto.
4867         (fnmadddf4_fpr_1): Ditto.
4868         (fnmadddf4_fpr_2): Ditto.
4869         (fnmsubdf4_fpr_1): Ditto.
4870         (fnmsubdf4_fpr_2): Ditto.
4871         (fixuns_truncdfdi2): Add expander for VSX support.
4872         (fix_truncdfdi2): Ditto.
4873         (fix_truncdfsi2): Ditto.
4874         (ftruncdf2): Ditto.
4875         (btruncsf2): Whitespace.
4876         (movdf_hardfloat32): Add support for VSX registers.
4877         (movdf_softfloat32): Ditto.
4878         (movdf_hardfloat64): Ditto.
4879         (movdf_hardfloat64_mfpgpr): Ditto.
4880         (movdf_softfloat64): Ditto.
4881         (movti splitters): Add check for vector registers supporting
4882         TImode in the future.
4883         (bpermd): Add power7 bpermd instruction.
4885         * config/rs6000/altivec.h (vec_div): Define if VSX.
4886         (vec_mul): Ditto.
4887         (vec_msub): Ditto.
4888         (vec_nmadd): Ditto.
4889         (vec_nearbyint): Ditto.
4890         (vec_rint): Ditto.
4891         (vec_sqrt): Ditto.
4892         (all predicates): Use the generic builtin function, and not the V4SF
4893         specific function so that the predicates will work with VSX's V2DF.
4894         (vec_all_*): Ditto.
4895         (vec_any_*): Ditto.
4897         * doc/extend.texi (PowerPC Altivec/VSX Built-in Functions):
4898         Document new VSX functions and types.
4900         * doc/invoke.texi (PowerPc options): Document -mpopcntd, -mvsx
4901         switches.
4903         * doc/md.texi (PowerPC constraints): Document "wd", "wf", "ws",
4904         "wa", and "j" constraints.  Modify "v" to talk about Altivec
4905         instead of just vector.
4907 2009-07-30  Andrew MacLeod  <amacleod@redhat.com>
4909         PR debug/26475
4910         * tree-into-ssa.c (insert_phi_nodes_for, rewrite_add_phi_arguments): Set
4911         location for phi arguments.
4912         (rewrite_update_phi_arguments): Find locations for reaching defs.
4913         * tree-ssa-threadupdate.c (create_edge_and_update_destination_phis):
4914         Add location to add_phi_arg calls.
4915         * tree-loop-districbution.c (update_phis_for_loop_copy): Add locations.
4916         * tree-ssa-loop-manip.c (create_iv, add_exit_phis_edge,
4917         split_loop_exit_edge, tree_transform_and_unroll_loop): Add locations.
4918         * tree-tailcall.c (add_successor_phi_arg, eliminate_tail_call,
4919         create_tailcall_accumulator, tree_optimize_tail_calls_1): Add locations.
4920         * tree.h (struct phi_arg_d): Add location_t to PHI arguments.
4921         * tree-phinodes.c (make_phi_node): Initialize location.
4922         (resize_phi_node): Initialize location to UNKNOWN_LOCATION.
4923         (add_phi_arg): Add location parameter.
4924         (remove_phi_arg_num): Move location when moving phi argument.
4925         * omp-low.c (expand_parallel_call, expand_omp_for_static_chunk): Set
4926         location.
4927         * tree-vect-loop-manip.c (slpeel_update_phis_for_duplicate_loop,
4928         slpeel_update_phi_nodes_for_guard1,
4929         slpeel_update_phi_nodes_for_guard2,
4930         slpeel_tree_duplicate_loop_to_edge_cfg, set_prologue_iterations,
4931         vect_loop_versioning): Set locations.
4932         * tree-parloops.c (create_phi_for_local_result,
4933         transform_to_exit_first_loop, create_parallel_loop): Add locations.
4934         * gimple-pretty-print.c (dump_gimple_phi): Dump lineno's if present.
4935         * tree-vect-loop.c (get_initial_def_for_induction,
4936         vect_create_epilog_for_reduction, vect_finalize_reduction): Add
4937         locations.
4938         * tree-flow-inline.h (gimple_phi_arg_location): New.  Return locus.
4939         (gimple_phi_arg_location_from_edge): New.  Return locus from an edge.
4940         (gimple_phi_arg_set_location): New.  Set locus.
4941         (gimple_phi_arg_has_location): New.  Check for locus.
4942         (redirect_edge_var_map_location): New.  Return locus from var_map.
4943         * tree-vect-data-refs.c (vect_setup_realignment): Set location.
4944         * tree-ssa-phiopt.c (conditional_replacement): Set locus when
4945         combining PHI arguments.
4946         (cond_store_replacement): Set location.
4947         * cfgexpand.c (gimple_assign_rhs_to_tree): Transfer locus if possible.
4948         * grpahite.c (add_loop_exit_phis, add_guard_exit_phis,
4949         scop_add_exit_phis_edge): Add locations.
4950         * tree-cfgcleanup.c (remove_forwarder_block,
4951         remove_forwarder_block_with_phi): Add locations.
4952         * tree-ssa-pre.c (insert_into_preds_of_block): Add locations.
4953         * tree-predcom.c (initialize_root_vars, initialize_root_vars_lm): Add
4954         locations.
4955         * tree-ssa-dce.c (forward_edge_to_pdom): Add locations.
4956         * tree-ssa.c (redirect_edge_var_map_add, ssa_redirect_edge,
4957         flush_pending_stmts): Add source location.
4958         * lambda-code.c (perfect_nestify): Maintain location stack with argument
4959         stack to preserve locations.
4960         * tree-vect-stmts.c (vectorizable_load): Add location.
4961         * tree-inline.c (copy_phis_for_bb): Copy locus.
4962         (setup_one_parameter): Add call locus to inlined parameter stmts.
4963         (initialize_inlined_parameters): Pass in call location as parameter
4964         assignment locus.
4965         (tree_function_versioning): Pass location to setup_one_parameter.
4966         * tree-ssa-phiprop.c (phiprop_insert_phi): Set locations.
4967         * tree-outof-ssa.c (struct _elim_graph): Add source_location vecs for
4968         copy and edge lists.
4969         (insert_partition_copy_on_edge, insert_value_copy_on_edge,
4970         insert_rtx_to_part_on_edge, insert_part_to_rtx_on_edge): Provide a
4971         locus parameter and override the stmt default if provided.
4972         (new_elim_graph, clear_elim_graph, delete_elim_graph,
4973         elim_graph_add_edge, elim_graph_remove_succ_edge,
4974         FOR_EACH_ELIM_GRAPH_SUCC, FOR_EACH_ELIM_GRAPH_PRED, eliminate_build,
4975         elim_forward, elim_unvisited_predecessor, elim_backward, elim_create,
4976         eliminate_phi):  Add locus info in elimination graph for each edge and
4977         value copy.
4978         (insert_backedge_copies): Copy locus if present.
4979         * tree-flow.h (struct _edge_var_map): Add locus field.
4980         * tree-switch_conversions.c (fix_phi_nodes): Add locations.
4981         * tree-cfg.c (reinstall_phi_args, gimple_make_forwarder_block,
4982         add_phi_args_after_copy_edge, gimple_lv_adjust_loop_header_phi): Add
4983         locations.
4984         * ipa-struct-reorg.c (make_edge_and_fix_phis_of_dest): Add locations.
4986 2009-07-30  Martin Jambor  <mjambor@suse.cz>
4988         PR tree-optimization/40570
4989         * ipa-inline.c (cgraph_decide_inlining): Watch out for dead single
4990         use inlining loops.
4992 2009-07-30  Razya Ladelsky <razya@il.ibm.com>
4994         * ssa-loop-manip.c: Include langhooks.h.
4995         (rewrite_phi_with_iv): New.
4996         (rewrite_all_phi_nodes_with_iv): New.
4997         (canonicalize_loop_ivs): Move here from tree-parloops.c.
4998         Remove reduction_list argument. Use rewrite_all_phi_nodes_with_iv.
4999         * tree-parloops.c (loop_parallel_p): Move out all conditions
5000         except dependency check.
5001         (canonicalize_loop_ivs): Move to tree-ssa-loop-manip.c.
5002         (gen_parallel_loop): Call canonicalize_loop_ivs without
5003         reduction_list argument.
5004         (build_new_reduction): New.
5005         (gather_scalar_reductions): New.
5006         (try_get_loop_niter): New.
5007         (try_create_reduction_list): New.
5008         (parallleize_loops): Change the parallel conditions check.
5009         * tree-flow.h (canonicalize_loop_ivs): Remove one argument.
5010         * Makefile.in (tree-ssa-loop-manip.o): Add langhooks.h dependency.
5012 2009-07-30  Dave Korn  <dave.korn.cygwin@gmail.com>
5014         * opt-functions.awk (opt_args): Allow argument to be enclosed in
5015         curly braces.
5016         * doc/options.texi (Option properties):  Mention new quoting syntax.
5018 2009-07-29  Douglas B Rupp  <rupp@gnat.com>
5020         * config/alpha/alpha.c (alpha_start_function):
5021         Handle VMS_DEBUG_MAIN_POINTER
5022         * config/alpha/vms.h (VMS_DEBUG_MAIN_POINTER): Define new macro.
5023         * doc/invoke.texi: Document -mdebug-main switch.
5025 2009-07-29  Richard Henderson  <rth@redhat.com>
5027         * cgraph.c (cgraph_set_call_stmt_including_clones): Tidy.
5028         (cgraph_create_edge_including_clones): Likewise.
5029         * tree-inline.c (copy_bb): Operate on the correct edges
5030         when updating the callgraph.
5032 2009-07-29  Douglas B Rupp  <rupp@gnat.com>
5034         * config/alpha/vms-cc.c: Deleted.
5035         * config/alpha/vms-ld.c: Deleted.
5036         * config/alpha/t-vms64: Moved to config/vms
5037         * config/alpha/vms-crt0-64.c: Moved to config/vms
5038         * config/alpha/vms-crt0.c: Moved to config/vms
5039         * config/alpha/vms-psxcrt0-64.c: Moved to config/vms
5040         * config/alpha/vms-psxcrt0.c: Moved to config/vms
5041         * config/alpha/xm-vms.h: Moved to config/vms
5042         * config/alpha/x-vms: Moved to config/vms
5043         * config/alpha/t-vms (vcrt0.o, pcrt0.o): Move rules to new file
5044         config/vms/t-vms.
5045         * config/vms/t-vms: Moved here from config/alpha. Alpha specific
5046         parts removed. (STMP_FIXPROTO, STMP_FIXINC, LIMITS_H_TEST): Set.
5047         (version): Set.
5048         * config/vms/t-vms64: Moved here from config/alpha
5049         * config/vms/vms-crt0-64.c: Moved here from config/alpha.
5050         (argc,argv,envp): Enforce 32bit malloc'ing.
5051         * config/vms/vms-psxcrt0-64.c: Likewise.
5052         * config/vms/vms-crt0.c: Moved here from config/alpha.
5053         * config/vms/vms-psxcrt0.c: Likewise.
5054         * config/vms/vms-crtl-64.h: New file.
5055         * config/vms/vms-crtl.h: New file.
5056         * config/vms/vms.opt: New file.
5057         * config/vms/xm-vms64.h: New file.
5058         * config/vms/xm-vms.h: Moved here from config/alpha.
5059         (STANARD_EXEC_PREFIX, STANDARD_STARTFILE_PREFIX, STANDARD_INCLUDE_DIR):
5060         Set.
5061         * config/vms/x-vms: Moved here from config/alpha.
5062         (version, VMS_EXTRA_PARTS): Moved to t-vms.
5063         (vms-ld.o, vms-cc.o): Removed.
5064         (LN, LN_S, USE_COLLECT2, POD2MAN): Set.
5066 2009-07-29  Douglas B Rupp  <rupp@gnat.com>
5068         * dwarf2out.c (add_name_and_src_coords_attributes): Push on the
5069         correct stack (obvious VMS fix).
5071 2009-07-29  Douglas B Rupp  <rupp@gnat.com>
5073         * dwarf2out.c (output_file_names): Output VMS style file name, size,
5074         date, version info if VMS_DEBUGGING_INFO defined.
5075         * vmsdgbout.c (vms_file_stats_name): New functon. VMS style file name,
5076         size, date calculating code moved here.
5078 2009-07-29  Paul Brook  <paul@codesourcery.com>
5080         * config/arm/lib1funcs.asm (clear_cache): Use ARM_FUNC_START and
5081         do_push/do_pop.
5083 2009-07-29  Uros Bizjak  <ubizjak@gmail.com>
5085         PR target/40577
5086         * config/alpha/alpha.c (alpha_expand_unaligned_store): Convert src
5087         to DImode when generating insq_le insn.
5089 2009-07-28  Douglas B Rupp  <rupp@gnat.com>
5091         * dwarf2out.c (DWARF2_INDIRECT_STRING_SUPPORT_MISSING_ON_TARGET):
5092         New macro set for VMS_DEBUGGGING_INFO.
5093         (AT_string_form): Use it.
5095 2009-07-28  DJ Delorie  <dj@redhat.com>
5097         * config/mep/mep.c (vtext_section): New.
5098         (vftext_section): New.
5099         (ftext_section): New.
5100         (mep_select_section): Add support for functions.
5101         (mep_unique_section): Likewise.
5102         (mep_asm_init_sections): Likewise.
5103         (mep_encode_section_info): Remove it from here.
5105         * config/mep/mep.h (USE_SELECT_SECTION_FOR_FUNCTIONS): Define.
5107 2009-07-28  Paolo Bonzini  <bonzinI@gnu.org>
5109         * tree.h (TREE_DEPRECATED): Document it is used for types too.
5110         (TYPE_VECTOR_OPAQUE): Use default_def_flag
5112 2009-07-28  Douglas B Rupp  <rupp@gnat.com>
5114         * dwarf2out.c (output_file_names): Test new macro
5115         DWARF2_DIR_SHOULD_END_WITH_SEPARATOR.
5116         (add_comp_dir_attribute): Likewise.
5118 2009-07-28  Kai Tietz  <kai.tietz@onevision.com>
5120         * config/i386/mingw-w64.h (LINK_SPEC): Add
5121         separating space between commands.
5123 2009-07-28  Jan Hubicka  <jh@suse.cz>
5125         PR tree-optimization/40759
5126         * tree-ssa-dce.c (mark_virtual_phi_result_for_renaming): Mark all uses
5127         for renaming.
5129 2009-07-27  DJ Delorie  <dj@redhat.com>
5131         * config/mep/mep.c (mep_expand_builtin_saveregs): Make sure 64-bit
5132         types are dword-aligned.
5133         (mep_expand_va_start): Likewise.
5135 2009-07-27  Olivier Hainque  <hainque@adacore.com>
5136             Douglas B Rupp  <rupp@gnat.com>
5138         * convert.c (convert_to_pointer): Don't assume the target
5139         pointer type is POINTER_SIZE long. Fetch its precision instead.
5141 2009-07-27  Douglas B Rupp  <rupp@gnat.com>
5143         * system.h (fopen): Undefine if macro.
5145 2009-07-27  Jakub Jelinek  <jakub@redhat.com>
5147         * dwarf2out.c (output_cfi_p): Removed.
5148         (output_cfis): New function.
5149         (output_fde): New function, split from output_call_frame_info.
5150         (output_call_frame_info): Use it.
5151         (dwarf2out_switch_text_section): Use output_cfis.
5153 2009-07-24  Kai Tietz  <kai.tietz@onevision.com>
5155         * config/i386/cygming.h (DWARF2_UNWIND_INFO): Error build when
5156         TARGET_BI_ARCH is specified without enabling SJLJ.
5157         * config/i386/mingw32.h (MD_UNWIND_SUPPORT): Define MD_UNWIND_SUPPORT,
5158         if TARGET_64BIT and TARGET_BI_ARCH aren't defined.
5160 2009-07-26  Mikael Pettersson <mikpe@it.uu.se>
5162         * arm.md (negdi2): Use DImode if forcing a value into a register.
5164 2009-07-26  Ira Rosen  <irar@il.ibm.com>
5166         PR tree-optimization/40801
5167         * tree-vect-stmts.c (vectorizable_call): Get previous copy
5168         of vector operand from the previous copy of vector statement.
5169         Pass the correct definition type value to
5170         vect_get_vec_def_for_stmt_copy().
5172 2009-07-25  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
5174         * collect2.c (scan_libraries): Use CONST_CAST2 to perform char ** to
5175         const char ** conversion.
5177 2009-07-25 David Daney <ddaney@caviumnetworks.com>
5179         * system.h (gcc_assert): Invoke __builtin_unreachable() instead of
5180         fancy_abort() if !ENABLE_ASSERT_CHECKING.
5181         (gcc_unreachable): Invoke __builtin_unreachable() if
5182         !ENABLE_ASSERT_CHECKING.
5184 2009-07-25  David Daney  <ddaney@caviumnetworks.com>
5186         PR rtl-optimization/40445
5187         * emit-rtl.c (next_nonnote_insn_bb): New function.
5188         * rtl.h (next_nonnote_insn_bb): Declare new function.
5189         * cfgcleanup.c (try_optimize_cfg): Don't remove an empty block
5190         with no successors that is the successor of the ENTRY_BLOCK.
5191         Continue from the top after removing an empty fallthrough block.
5192         * cfgrtl.c (get_last_bb_insn): Call next_nonnote_insn_bb instead
5193         of next_nonnote_insn.
5195 2009-07-25  David Daney  <ddaney@caviumnetworks.com>
5197         * cfgcleanup.c (old_insns_match_p): Handle the case of empty blocks.
5199 2009-07-25  Martin Jambor  <mjambor@suse.cz>
5201         * c-common.c (c_common_attribute_table): New element for noclone.
5202         (handle_noclone_attribute): New function. Forward-declare.
5203         * tree-inline.c (tree_versionable_function_p): Check for noclone
5204         attribute.
5205         * doc/extend.texi (Labels as Values): Document need for noclone.
5206         (Function Attributes): Document noclone attribute.
5208 2009-07-25  Jakub Jelinek  <jakub@redhat.com>
5210         PR rtl-optimization/34999
5211         * dwarf2out.c (struct dw_fde_struct): Add dw_fde_switch_cfi
5212         and dw_fde_switched_cold_to_hot fields.
5213         (output_cfi_p): New function.
5214         (output_call_frame_info): If fde->dw_fde_switched_sections,
5215         output 2 FDEs instead of one with corrupted header.
5216         (dwarf2out_do_cfi_startproc): New function.
5217         (dwarf2out_begin_prologue): Use it.  Initialize fde->dw_fde_switch_cfi
5218         and fde->dw_fde_switched_cold_to_hot.
5219         (dwarf2out_switch_text_section): Compute
5220         fde->dw_fde_switched_cold_to_hot.  Switch to new text section here.
5221         If dwarf2out_do_cfi_asm, emit .cfi_endproc before it and call
5222         dwarf2out_do_cfi_startproc plus emit again currently active CFI insns.
5223         Otherwise, compute fde->dw_fde_switch_cfi.
5225 2009-07-24  Cary Coutant  <ccoutant@google.com>
5227         * tree-cfg.c (assign_discriminator): Add explicit parentheses.
5229 2009-07-24  Cary Coutant  <ccoutant@google.com>
5231         * cfghooks.c (split_block): Copy discriminator to new block.
5232         * tree-cfg.c (assign_discriminator): Check location of last
5233         instruction in block as well as first.
5235 2009-07-24  Uros Bizjak  <ubizjak@gmail.com>
5237         * config/i386/linux.c: Use fputs or putc instead of fprintf
5238         where appropriate.
5239         * config/i386/gas.h: Ditto.
5240         * config/i386/x86-64.h: Ditto.
5241         * config/i386/att.h: Ditto.
5243 2009-07-24  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
5245         * expmed.c (emit_store_flag): Use a recursive call to optimize the
5246         xor case.
5248 2009-07-24  Martin Jambor  <mjambor@suse.cz>
5250         * ipa-prop.h (struct ipa_node_params): New flag node_enqued.
5251         (ipa_push_func_to_list_1): Declare.
5252         (ipa_push_func_to_list): New function.
5254         * ipa-prop.c (ipa_push_func_to_list_1): New function.
5255         (ipa_init_func_list): Call ipa_push_func_to_list_1.
5256         (ipa_push_func_to_list): Removed.
5257         (ipa_pop_func_from_list): Clear node_enqueued flag.
5259 2009-07-24  Andreas Krebbel  <krebbel1@de.ibm.com>
5261         * config/s390/s390.c (override_options): Default
5262         max-unrolled-insns to 100 for z10 tuning.
5264 2009-07-24  Tobias Grosser  <grosser@fim.uni-passau.de>
5266         * Makefile.in (TREE_DATA_REF_H, tree-vrp.o, tree-cfg.o, tree-if-conv.o
5267         tree-ssa-loop.o, tree-ssa-loop-niter.o, tree-ssa-loop-ivcanon.o,
5268         tree-ssa-loop-prefetch.o, tree-predcom.o, tree-affine.o,
5269         tree-scalar-evolution.o, tree-data-ref.o, tree-vect-loop.o,
5270         tree-vect-data-refs.o, tree-loop-linear.o, tree-loop-distribution.o
5271         tree-parloops.o, tree-pretty-printer.o, fold-const.o, tree-ssa-dce.o,
5272         lambda-code.o, params.o): Cleanup use of SCEV_H and TREE_DATA_REF_H.
5274 2009-07-24  Kai Tietz  <kai.tietz@onevision.com>
5276         * config/i386/mingw-w64.h (STANDARD_INCLUDE_DIR): Remove and
5277         use default set in mingw32.h header.
5278         * config/i386/mingw32.h (STANDARD_INCLUDE_DIR): Use for 32-bit and
5279         64-bit /mingw/include path.
5280         (STANDARD_STARTFILE_PREFIX_1): Use for 32-bit and 64-bit /mingw/lib
5281         path.
5283 2009-07-23  Neil Vachharajani  <nvachhar@google.com>
5285         PR rtl-optimization/40209
5286         * loop-iv.c (iv_analysis_loop_init): Call df_note_add_problem.
5288 2009-07-23  Uros Bizjak  <ubizjak@gmail.com>
5290         * config/i386/i386.c: Use ASM_LONG instead of .long.  Concatenate
5291         ASM_LONG, LPREFIX, MCOUNT_NAME and PROFILE_COUNT_REGISTER strings
5292         with the rest of string where appropriate.  Use fputs or putc
5293         instead of fprintf where appropriate.
5295 2009-07-22  Michael Meissner  <meissner@linux.vnet.ibm.com>
5296             Pat Haugen  <pthaugen@us.ibm.com>
5297             Revital Eres <ERES@il.ibm.com>
5299         * config/rs6000/vector.md: New file.  Move most of the vector
5300         expander support here from altivec.md to allow for the VSX vector
5301         unit in the future.  Add support for secondary_reload patterns.
5302         Rewrite the patterns for vector comparison, and vector comparison
5303         predicate instructions so that the RTL expresses the desired
5304         behavior, instead of using unspec.
5306         * config/rs6000/constraints.md ("f" constraint): Use
5307         rs6000_constraints to hold the precalculated register class.
5308         ("d" constraint): Ditto.
5309         ("wd" constraint): New constraint for VSX.
5310         ("wf" constraint): Ditto.
5311         ("ws" constraint): Ditto.
5312         ("wa" constraint): Ditto.
5313         ("wZ" constraint): Ditto.
5314         ("j" constraint): Ditto.
5316         * config/rs6000/predicates.md (vsx_register_operand): New
5317         predicate for VSX.
5318         (vfloat_operand): New predicate for vector.md.
5319         (vint_operand): Ditto.
5320         (vlogical_operand): Ditto.
5321         (easy_fp_constant): If VSX, 0.0 is an easy constant.
5322         (easy_vector_constant): Add VSX support.
5323         (altivec_indexed_or_indirect_operand): New predicate for
5324         recognizing Altivec style memory references with AND -16.
5326         * config/rs6000/rs6000.c (rs6000_vector_reload): New static global
5327         for vector secondary reload support.
5328         (rs6000_vector_reg_class): Delete, replacing it with
5329         rs6000_constraints.
5330         (rs6000_vsx_reg_class): Ditto.
5331         (rs6000_constraints): New array to hold the register classes of
5332         each of the register constraints that can vary at runtime.
5333         (builtin_mode_to_type): New static array for builtin function type
5334         creation.
5335         (builtin_hash_table): New static hash table for builtin function
5336         type creation.
5337         (TARGET_SECONDARY_RELOAD): Define target hook.
5338         (TARGET_IRA_COVER_CLASSES): Ditto.
5339         (rs6000_hard_regno_nregs_internal): If -mvsx, floating point
5340         registers are 128 bits if VSX memory reference instructions are used.
5341         (rs6000_hard_regno_mode_ok): For VSX, only check if the VSX memory
5342         unit is being used.
5343         (rs6000_debug_vector_unit): Move into rs6000_debug_reg_global.
5344         (rs6000_debug_reg_global): Move -mdebug=reg statements here.
5345         Print several of the scheduling related parameters.
5346         (rs6000_init_hard_regno_mode_ok): Switch to putting constraints in
5347         rs6000_constraints instead of rs6000_vector_reg_class.  Move
5348         -mdebug=reg code to rs6000_debug_reg_global.  Add support for
5349         -mvsx-align-128 debug switch.  Drop testing float_p if VSX or
5350         Altivec.  Add VSX support.  Setup for secondary reload support on
5351         Altivec/VSX registers.
5352         (rs6000_override_options): Make power7 set the scheduling groups
5353         like the power5.  Add support for new debug switches to override
5354         the scheduling defaults.  Temporarily disable -mcpu=power7 from
5355         setting -mvsx.  Add support for debug switches -malways-hint,
5356         -msched-groups, and -malign-branch-targets.
5357         (rs6000_buitlin_conversion): Add support for returning unsigned
5358         vector conversion functions to fix regressions due to stricter
5359         type checking.
5360         (rs6000_builtin_mul_widen_even): Ditto.
5361         (rs6000_builtin_mul_widen_odd): Ditto.
5362         (rs6000_builtin_vec_perm): Ditto.
5363         (rs6000_vec_const_move): On VSX, use xxlxor to clear register.
5364         (rs6000_expand_vector_init): Initial VSX support for using xxlxor
5365         to zero a register.
5366         (rs6000_emit_move): Fixup invalid const symbol_ref+reg that is
5367         generated upstream.
5368         (bdesc_3arg): Add builtins for unsigned types.  Add builtins for
5369         VSX types for bit operations.  Changes to accomidate vector.md.
5370         (bdesc_2arg): Ditto.
5371         (bdesc_1arg): Ditto.
5372         (struct builtin_description_predicates): Rewrite predicate
5373         handling so that RTL describes the operation, instead of passing
5374         the instruction to be used as a string argument.
5375         (bdesc_altivec_preds): Ditto.
5376         (altivec_expand_predicate_builtin): Ditto.
5377         (altivec_expand_builtin): Ditto.
5378         (rs6000_expand_ternop_builtin): Use a switch instead of an if
5379         statement for vsldoi support.
5380         (altivec_expand_ld_builtin): Change to use new names from vector.md.
5381         (altivec_expand_st_builtin): Ditto.
5382         (paired_expand_builtin): Whitespace changes.
5383         (rs6000_init_builtins): Add V2DF/V2DI types.  Initialize the
5384         builtin_mode_to_type table for secondary reload.  Call
5385         builtin_function_type to build random builtin functions.
5386         (altivec_init_builtins): Change to use builtin_function_type to
5387         create builtin function types dynamically as we need them.
5388         (builtin_hash_function): New support for hashing the tree types
5389         for builtin function as we need it, rather than trying to build
5390         all of the trees that we need.  Add initial preliminary VSX support.
5391         (builtin_function_type): Ditto.
5392         (builtin_function_eq): Ditto.
5393         (builtin_hash_struct): Ditto.
5394         (rs6000_init_builtins): Ditto.
5395         (rs6000_common_init_builtins): Ditto.
5396         (altivec_init_builtins): Ditto.
5397         (rs6000_common_init_builtins): Ditto.
5398         (enum reload_reg_type): New enum for simplifing reg classes.
5399         (rs6000_reload_register_type): Simplify register classes into GPR,
5400         Vector, and other registers.  Altivec and VSX addresses in reload.
5401         (rs6000_secondary_reload_inner): Ditto.
5402         (rs6000_ira_cover_classes): New target hook, that returns the
5403         appropriate cover classes, based on -mvsx being used or not.
5404         (rs6000_secondary_reload_class): Add VSX support.
5405         (get_vec_cmp_insn): Delete, rewrite vector conditionals.
5406         (get_vsel_insn): Ditto.
5407         (rs6000_emit_vector_compare): Rewrite vector conditional support
5408         so that where we can, we use RTL operators, instead of blindly use
5409         UNSPEC.
5410         (rs6000_emit_vector_select): Ditto.
5411         (rs6000_emit_vector_cond_expr): Ditto.
5412         (rs6000_emit_minmax): Directly generate min/max under altivec, vsx.
5413         (create_TOC_reference): Add -mdebug=addr support.
5414         (emit_frame_save): VSX loads/stores need register indexed addressing.
5416         * config/rs6000/rs6000.md: Include vector.md.
5418         * config/rs6000/t-rs6000 (MD_INCLUDES): Add vector.md.
5420         * config/rs6000/rs6000-c.c (altivec_overloaded_builtins): Add
5421         support for V2DI, V2DF in logical, permute, select operations.
5423         * config/rs6000/rs6000.opt (-mvsx-scalar-double): Add new debug
5424         switch for vsx/power7.
5425         (-mvsx-scalar-memory): Ditto.
5426         (-mvsx-align-128): Ditto.
5427         (-mallow-movmisalign): Ditto.
5428         (-mallow-df-permute): Ditto.
5429         (-msched-groups): Ditto.
5430         (-malways-hint): Ditto.
5431         (-malign-branch-targets): Ditto.
5433         * config/rs6000/rs6000.h (IRA_COVER_CLASSES): Delete, use target
5434         hook instead.
5435         (IRA_COVER_CLASSES_PRE_VSX): Cover classes if not -mvsx.
5436         (IRA_COVER_CLASSES_VSX): Cover classes if -mvsx.
5437         (rs6000_vector_reg_class): Delete.
5438         (rs6000_vsx_reg_class): Ditto.
5439         (enum rs6000_reg_class_enum): New enum for the constraints that
5440         vary based on target switches.
5441         (rs6000_constraints): New array to hold the register class for all
5442         of the register constraints that vary based on the switches used.
5443         (ALTIVEC_BUILTIN_*_UNS): Add unsigned builtin functions.
5444         (enum rs6000_builtins): Add unsigned varients for the builtin
5445         declarations returned by target hooks for expanding multiplies,
5446         select, and permute operations.  Add VSX builtins.
5447         (enum rs6000_builtin_type_index): Add entries for VSX.
5448         (V2DI_type_node): Ditto.
5449         (V2DF_type_node): Ditto.
5450         (unsigned_V2DI_type_node): Ditto.
5451         (bool_long_type_node): Ditto.
5452         (intDI_type_internal_node): Ditto.
5453         (uintDI_type_internal_node): Ditto.
5454         (double_type_internal_node): Ditto.
5456         * config/rs6000/altivec.md (whole file): Move all expanders to
5457         vector.md from altivec.md.  Rename insn matching functions to be
5458         altivec_foo.
5459         (UNSPEC_VCMP*): Delete, rewrite vector comparisons.
5460         (altivec_vcmp*): Ditto.
5461         (UNSPEC_VPERM_UNS): New, add for unsigned types using vperm.
5462         (VM): New iterator for moves that includes the VSX types.
5463         (altivec_vperm_<mode>): Add VSX types.  Add unsigned types.
5464         (altivec_vperm_<mode>_uns): New, for unsigned types.
5465         (altivec_vsel_*): Rewrite vector comparisons and predicate builtins.
5466         (altivec_eq<mode>): Ditto.
5467         (altivec_gt<mode>): Ditto.
5468         (altivec_gtu<mode>): Ditto.
5469         (altivec_eqv4sf): Ditto.
5470         (altivec_gev4sf): Ditto.
5471         (altivec_gtv4sf): Ditto.
5472         (altivec_vcmpbfp_p): Ditto.
5474 2009-07-23  Richard Earnshaw  <rearnsha@arm.com>
5476         * arm.md (split for ior/xor with shift and zero-extend): Cast op3 to
5477         unsigned HWI.
5479 2009-07-23  Uros Bizjak  <ubizjak@gmail.com>
5481         PR target/40832
5482         * config/i386/i386.c (output_387_ffreep): Rewrite to use
5483         ASM_SHORT instead of .word.
5484         * config/i386/i386.md (*tls_global_dynamic_64): Use ASM_SHORT
5485         instead of .word in asm template.
5487 2009-07-22  Vladimir Makarov  <vmakarov@redhat.com>
5489         PR target/37488
5490         * ira-lives.c (bb_has_abnormal_call_pred): New function.
5491         (process_bb_node_lives): Use it.
5493         * ira.c (setup_cover_and_important_classes): Don't setup
5494         ira_important_class_nums.  Add cover classes to the end of
5495         important classes.
5496         (cover_class_order, comp_reg_classes_func, reorder_important_classes):
5497         New.
5498         (find_reg_class_closure): Use reorder_important_classes.
5500         * config/i386/i386.h (IRA_COVER_CLASSES): Remove.
5502         * config/i386/i386.c (i386_ira_cover_classes): New function.
5503         (TARGET_IRA_COVER_CLASSES): Redefine.
5505         * doc/tm.texi (TARGET_IRA_COVER_CLASSES): Add a comment about
5506         importance of order of cover classes in the array.
5508 2009-07-22  Diego Novillo  <dnovillo@google.com>
5510         * tree-pass.h (TDF_EH): Define.
5511         * gimple-pretty-print.c (dump_gimple_stmt): If FLAGS
5512         contains TDF_EH, print the EH region number holding GS.
5513         * tree-dump.c (dump_options): Add "eh".
5514         * doc/invoke.texi: Document it.
5516 2009-07-22  Doug Kwan  <dougkwan@google.com>
5518         * config/arm/arm.md (subdi3) Copy non-reg values to DImode registers.
5520 2009-07-22  Michael Matz  <matz@suse.de>
5522         PR tree-optimization/35229
5523         PR tree-optimization/39300
5525         * tree-ssa-pre.c (includes): Include tree-scalar-evolution.h.
5526         (inhibit_phi_insertion): New function.
5527         (insert_into_preds_of_block): Call it for REFERENCEs.
5528         (init_pre): Initialize and finalize scalar evolutions.
5529         * Makefile.in (tree-ssa-pre.o): Depend on tree-scalar-evolution.h .
5531 2009-07-22  Uros Bizjak  <ubizjak@gmail.com>
5533         * config/i386/predicates.md (zero_extended_scalar_load_operand):
5534         Use CONST_VECTOR_NUNITS to determine number of elements.
5536 2009-07-22  Andreas Krebbel  <krebbel1@de.ibm.com>
5538         * config/s390/constraints.md (ZQ, ZR, ZS, ZT): New constraints.
5539         (U, W): Constraints are now deprecated and will be removed if we
5540         run out of letters.
5541         * config/s390/s390.md (U, W): Replaced with ZQZR, ZSZT throughout
5542         the file.
5543         ("prefetch"): Add the stcmh instruction for prefetching.
5544         * config/s390/s390.c (s390_symref_operand_p): Function moved. No
5545         changes.
5546         (s390_short_displacement): Return always true if compiling for
5547         machines not providing the long displacement facility.
5548         (s390_mem_constraint): Support the new constraint letter Z.
5549         (s390_check_qrst_address): New function.
5551 2009-07-21  DJ Delorie  <dj@redhat.com>
5553         * config/mep/mep.c (mep_legitimize_arg): Leave control registers
5554         alone too.
5556 2009-07-21  Jason Merrill  <jason@redhat.com>
5558         * c-common.c (max_tinst_depth): Increase default to 1024.
5560 2009-07-21  Uros Bizjak  <ubizjak@gmail.com>
5562         * config/i386/sse.md (vec_unpacku_float_hi_v4si): New expander.
5563         (vec_unpacku_float_lo_v4si): Ditto.
5565 2009-07-21  Uros Bizjak  <ubizjak@gmail.com>
5567         PR target/40811
5568         * config/i386/sse.md (sse2_cvtudq2ps): New expander.
5569         (enum ix86_builtins): Add IX86_BUILTIN_CVTUDQ2PS.
5570         (builtin_description): Add __builtin_ia32_cvtudq2ps.
5571         (ix86_vectorize_builtin_conversion): Handle IX86_BUILTIN_CVTUDQ2PS.
5573 2009-07-21  Jakub Jelinek  <jakub@redhat.com>
5575         PR tree-optimization/40813
5576         * tree-inline.c (copy_bb): Regimplify RHS after last stmt, not before
5577         it.
5579 2009-07-21  Kaz Kojima  <kkojima@gcc.gnu.org>
5581         * config/sh/sh.c (sh_gimplify_va_arg_expr): Wrap the result
5582         with a NOP_EXPR if needed.
5584 2009-07-21  Paul Brook <paul@codesourcery.com>
5586         * tree-vectorizer.c (increase_alignment): Handle nested arrays.
5587         Terminate debug dump with newline.
5589 2009-07-20  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
5591         * pa.c (compute_zdepwi_operands): Limit deposit length to 32 - lsb.
5592         Cast "1" to unsigned HOST_WIDE_INT.
5593         (compute_zdepdi_operands): Limit maximum length to 64 bits.  Limit
5594         deposit length to the maximum length - lsb.  Extend length if
5595         HOST_BITS_PER_WIDE_INT is 32.
5597 2009-07-20  Olatunji Ruwase <tjruwase@google.com>
5599         * cgraph.h (constant_pool_htab): New function.
5600         (constant_descriptor_tree): Move from varasm.c.
5601         * varasm.c (constant_pool_htab): New function.
5602         (constant_descriptor_tree): Move to cgraph.h.
5604 2009-07-20  Olatunji Ruwase  <tjruwase@google.com>
5606         * toplev.c: Invoke FINISH_UNIT callbacks before call to finalize().
5608 2009-07-20  Shujing Zhao  <pearly.zhao@oracle.com>
5610         * Makefile.in (TREE_INLINE_H, tree-inline.o, cgraph.o): Remove
5611         $(VARRAY_H).
5613 2009-07-20  Xinliang David Li  <davidxl@google.com>
5615         * dbgcnt.c (dbg_cnt_set_limit_by_name): Add length check.
5617 2009-07-20  Adam Nemet  <anemet@caviumnetworks.com>
5619         * config/mips/mips.md (move_type): Add arith.
5620         (type): Handle arith.
5621         (zero_extendsidi2): Rename this into ...
5622         (*zero_extendsidi2): ... this.  Don't match if ISA_HAS_EXT_INS.
5623         (zero_extendsidi2): New expander.
5624         (*zero_extendsidi2_dext): New pattern.
5626 2009-07-20  Nick Clifton  <nickc@redhat.com>
5628         * config.gcc (mips64-*-*): Add definition of tm_defines in order
5629         to set MIPS_ABI_DEFAULT.
5630         * config/mips/vr.h (MIPS_ABI_DEFAULT): Remove definition.
5632 2009-07-20  Jakub Jelinek  <jakub@redhat.com>
5634         * tree-object-size.c (addr_object_size): Handle unions with
5635         array in it as last field of structs in __bos (, 1) as __bos (, 0).
5637         PR tree-optimization/40792
5638         * tree.c (build_function_type_skip_args): Remove bogus assert.
5640 2009-07-20  Jan Hubicka  <jh@suse.cz>
5641             Martin Jambor  <mjambor@suse.cz>
5643         * cgraph.h (combined_args_to_skip): New field.
5644         * cgraph.c (cgraph_create_virtual_clone): Properly handle
5645         combined_args_to_skip and args_to_skip.
5646         * tree-inline.c (update_clone_info): New function.
5647         (tree_function_versioning): Call update_clone_info.
5648         * cgraphunit.c: (cgraph_materialize_clone): Dump materialized
5649         functions.
5650         (cgraph_materialize_all_clones): More extensive dumping, working
5651         with combined_args_to_skip rather than args_to_skip.
5653 2009-07-20  Ira Rosen  <irar@il.ibm.com>
5655         * tree-vectorizer.h (vectorizable_condition): Add parameters.
5656         * tree-vect-loop.c (vect_is_simple_reduction): Support COND_EXPR.
5657         (get_initial_def_for_reduction): Likewise.
5658         (vectorizable_reduction): Skip the check of first operand in case
5659         of COND_EXPR. Add check that it is outer loop vectorization if
5660         nested cycle was detected. Call vectorizable_condition() for
5661         COND_EXPR. If reduction epilogue cannot be created do not fail for
5662         nested cycles (if it is not double reduction). Assert that there
5663         is only one type in the loop in case of COND_EXPR. Call
5664         vectorizable_condition() to vectorize COND_EXPR.
5665         * tree-vect-stmts.c (vectorizable_condition): Update comment.
5666         Add parameters. Allow nested cycles if called from
5667         vectorizable_reduction(). Use reduction vector variable if provided.
5668         (vect_analyze_stmt): Call vectorizable_reduction() before
5669         vectorizable_condition().
5670         (vect_transform_stmt): Update call to vectorizable_condition().
5672 2009-07-20  Christian Bruel  <christian.bruel@st.com>
5674         * config/sh/sh.opt (-mfmovd): Resurrect and document.
5675         * doc/invoke.texi (-mfmovd): Likewise.
5676         * config/sh/sh.h (TARGET_FMOVD, MASK_FMOVD): Remove default setting.
5678 2009-07-20  Jan Hubicka  <jh@suse.cz>
5680         * tree-ssa-dce.c (remove_dead_phis): Only look for abnormal PHIs
5681         when handling SSA name.
5683 2009-07-19  Jan Hubicka  <jh@suse.cz>
5685         PR tree-optimization/40676
5686         * tree-ssa-dce.c (eliminate_unnecessary_stmts): Do renaming on all
5687         virtual PHIs in empty BBs.
5689 2009-07-18  Adam Nemet  <anemet@caviumnetworks.com>
5691         * combine.c (make_compound_operation) <SUBREG>: If force_to_mode
5692         re-expanded the compound use gen_lowpart instead to convert to the
5693         desired mode.
5695 2009-07-18  Adam Nemet  <anemet@caviumnetworks.com>
5697         * combine.c (try_widen_shift_mode): Add COUNT, OUTER_CODE and
5698         OUTER_CONST arguments.
5699         <LSHIFTRT>: Use them to allow widening if the bits shifted in from
5700         the new wider mode will be masked off.
5701         (simplify_shift_const_1): Adjust calls to try_widen_shift_mode.
5703 2009-07-18  Adam Nemet  <anemet@caviumnetworks.com>
5705         * combine.c (try_widen_shift_mode) <LSHIFTRT>: Allow widening if the
5706         high-order bits are zero.
5708 2009-07-18  Adam Nemet  <anemet@caviumnetworks.com>
5710         * combine.c (simplify_shift_const_1): Split code to determine
5711         shift_mode into ...
5712         (try_widen_shift_mode): ... here.  Allow widening for ASHIFTRT if the
5713         new bits shifted in are identical to the old sign bit.
5715 2009-07-18  Richard Guenther  <rguenther@suse.de>
5717         PR c/40787
5718         * gimplify.c (gimplify_call_expr): Reject code using results from
5719         functions returning void.
5721 2009-07-18  Richard Sandiford  <r.sandiford@uk.ibm.com>
5723         * doc/md.texi: Document the new PowerPC "es" constraint.
5724         Document that "m" can include automodified addresses on this target,
5725         and explain how %U must be used.  Extend the "Q" and "Z" documentation
5726         to suggest "es" as well as "m".
5727         * config/rs6000/constraints.md (es): New memory constraint.
5728         (Q, Z): Update strings to match new documentation.
5730 2009-07-18  Richard Sandiford  <r.sandiford@uk.ibm.com>
5732         * config/rs6000/rs6000.c (rs6000_mode_dependent_address): Allow any
5733         offset from virtual_stack_vars_rtx and arg_pointer_rtx.
5734         * config/rs6000/predicates.md (volatile_mem_operand): Use
5735         offsettable_nonstrict_memref_p.
5736         * config/rs6000/rs6000.md (*floatsidf2_internal): Remove split check.
5737         (*floatunssidf2_internal): Likewise.
5738         (*fix_truncdfsi2_internal): Likewise.
5739         (*fix_trunctfsi2_internal): Likewise.
5741 2009-07-17  Anatoly Sokolov  <aesok@post.ru>
5743         * config/avr/avr-devices.c (avr_mcu_t): Add atmega8u2, atmega16u2 and
5744         atmega32u2 devices.
5745         * config/avr/t-avr (MULTILIB_MATCHES): (Ditto.).
5747 2009-07-17  Richard Guenther  <rguenther@suse.de>
5749         PR c/40401
5750         * tree-pass.h (pass_diagnose_omp_blocks): Declare.
5751         (pass_warn_unused_result): Likewise.
5752         (TODO_set_props): Remove.
5753         * omp-low.c (diagnose_omp_structured_block_errors): Change to
5754         run as a pass.
5755         (pass_diagnose_omp_blocks): Define.
5756         * c-decl.c (pop_file_scope): Do not finalize the CU here.
5757         (c_gimple_diagnostics_recursively): Remove.
5758         (finish_function): Do not call it.
5759         (c_write_global_declarations): Continue after errors.
5760         Finalize the CU here.
5761         * c-gimplify.c (c_genericize): Do not gimplify here.
5762         * c-common.c (c_warn_unused_result): Move ...
5763         * tree-cfg.c (do_warn_unused_result): ... here.
5764         (run_warn_unused_result): New function.
5765         (gate_warn_unused_result): New function.
5766         (pass_warn_unused_result): New pass.
5767         * c-common.h (c_warn_unused_result): Remove.
5768         * flags.h (flag_warn_unused_result): Declare.
5769         * c-opts.c (c_common_init_options): Enable flag_warn_unused_result.
5770         * opts.c (flag_warn_unused_result): Initialize to false.
5771         * toplev.c (compile_file): Add comment.
5772         * omp-low.c (create_omp_child_function): Do not register
5773         the function with the frontend.
5774         (diagnose_omp_structured_block_errors): Prepare to be
5775         called as optimization pass.
5776         (gate_diagnose_omp_blocks): New function.
5777         (pass_diagnose_omp_blocks): New pass.
5778         * cgraph.h (cgraph_optimize): Remove.
5779         (cgraph_analyze_function): Likewise.
5780         * cgraph.c (cgraph_add_new_function): Gimplify C++ thunks.
5781         * cgraphunit.c (cgraph_lower_function): Lower nested functions
5782         before their parents here.
5783         (cgraph_finalize_function): Not here.
5784         (cgraph_analyze_function): Gimplify functions here.
5785         (cgraph_finalize_compilation_unit): Continue after errors.
5786         Optimize the callgraph from here.
5787         (cgraph_optimize): Make static.
5788         * langhooks.c (write_global_declarations): Finalize the CU.
5789         * gimplify.c (gimplify_asm_expr): Do not emit ASMs with errors.
5790         (gimplify_function_tree): Assert we gimplify only once.
5791         Set PROP_gimple_any property.
5792         * tree-nested.c (gimplify_all_functions): New function.
5793         (lower_nested_functions): Gimplify all nested functions.
5794         * gimple.h (diagnose_omp_structured_block_errors): Remove.
5795         * passes.c (init_optimization_passes): Add pass_warn_unused_result
5796         and pass_diagnose_omp_blocks after gimplification.  Do not
5797         set TODO_set_props on all_lowering_passes.
5798         (execute_one_pass): Do not handle TODO_set_props.
5799         * Makefile.in (cgraphunit.o): Add $(TREE_DUMP_H) dependency.
5800         (gimplify.o): Add tree-pass.h dependency.
5801         * tree-inline.c (copy_statement_list): Properly copy STATEMENT_LIST.
5802         (copy_tree_body_r): Properly handle TARGET_EXPR like SAVE_EXPR.
5803         (unsave_r): Likewise.
5804         * c-omp.c (c_finish_omp_atomic): Set DECL_CONTEXT on the
5805         temporary variable.
5807 2009-07-17  Sandra Loosemore  <sandra@codesourcery.com>
5809         * doc/service.texi (Service): Restore previously removed link,
5810         which isn't broken after all.
5812 2009-07-17  Richard Guenther  <rguenther@suse.de>
5814         PR tree-optimization/40321
5815         * tree-ssa-pre.c (add_to_exp_gen): Also add names defined by
5816         PHI nodes to the maximal set.
5817         (make_values_for_phi): Add PHI arguments to the maximal set.
5818         (execute_pre): Dump PHI_GEN and the maximal set.
5820 2009-07-17  Jakub Jelinek  <jakub@redhat.com>
5822         PR c++/40780
5823         * gimplify.c (gimplify_conversion): Don't change non-conversions into
5824         VIEW_CONVERT_EXPR.
5826 2009-07-16  Sandra Loosemore  <sandra@codesourcery.com>
5828         * doc/extend.texi (Nested Functions): Replace broken link with
5829         textual reference.
5830         * doc/service.texi (Service): Remove broken link.
5832 2009-07-16  H.J. Lu  <hongjiu.lu@intel.com>
5834         PR bootstrap/40781
5835         * builtins.c (expand_builtin_memcmp): Use loc instead of
5836         EXPR_LOCATION (exp).
5837         (expand_builtin_strncmp): Likewise.
5839 2009-07-17  Aldy Hernandez  <aldyh@redhat.com>
5840             Manuel López-Ibáñez  <manu@gcc.gnu.org>
5842         PR 40435
5843         * tree-complex.c, tree-loop-distribution.c, tree.c, tree.h,
5844         builtins.c, fold-const.c, omp-low.c, cgraphunit.c, tree-ssa-ccp.c,
5845         tree-ssa-dom.c, gimple-low.c, expr.c, tree-ssa-ifcombine.c,
5846         c-decl.c, stor-layout.c, tree-if-conv.c, c-typeck.c, gimplify.c,
5847         calls.c, tree-sra.c, tree-mudflap.c, tree-ssa-copy.c,
5848         tree-ssa-forwprop.c, c-convert.c, c-omp.c, varasm.c,
5849         tree-inline.c, c-common.c, c-common.h, gimple.c,
5850         tree-switch-conversion.c, gimple.h, tree-cfg.c, c-parser.c,
5851         convert.c: Add location argument to fold_{unary,binary,ternary},
5852         fold_build[123], build_call_expr, build_size_arg,
5853         build_fold_addr_expr, build_call_array, non_lvalue, size_diffop,
5854         fold_build1_initializer, fold_build2_initializer,
5855         fold_build3_initializer, fold_build_call_array,
5856         fold_build_call_array_initializer, fold_single_bit_test,
5857         omit_one_operand, omit_two_operands, invert_truthvalue,
5858         fold_truth_not_expr, build_fold_indirect_ref, fold_indirect_ref,
5859         combine_comparisons, fold_builtin_*, fold_call_expr,
5860         build_range_check, maybe_fold_offset_to_address, round_up,
5861         round_down.
5863 2009-07-16  Jason Merrill  <jason@redhat.com>
5865         PR libstdc++/37907
5866         * c-common.c (c_common_reswords): Add __is_standard_layout
5867         and __is_trivial.
5868         * c-common.h (enum rid): Add RID_IS_STD_LAYOUT and RID_IS_TRIVIAL.
5869         * doc/implement-cxx.texi: New.
5870         * doc/gcc.texi: Include it.
5872 2009-07-16  DJ Delorie  <dj@redhat.com>
5874         * config/m32c/m32c.c (m32c_compare_redundant): Avoid removing
5875         compares that may be indirectly affected by previous instructions.
5877 2009-07-16  Kaveh R. Ghazi  <ghazi@caip.rutgers.edu>
5879         * builtins.c (do_mpc_arg2): New.
5880         (fold_builtin_2): Fold builtin cpow.
5881         * real.h (HAVE_mpc_pow): New.
5883 2009-07-16  Bingfeng Mei  <bmei@broadcom.com>
5885         * modulo-sched.c (sms_schedule): stage_count <= 1 as correct
5886         comparison to skip unprofitable schedule
5888 2009-07-16  Simon Baldwin  <simonb@google.com>
5890         * gcc.c (option_map): New flag -no-canonical-prefixes.
5891         * (display_help): Print help text for new flag.
5892         * (process_command): Move options translation and language specifics
5893         and handle new flag early.  Use it to set a function pointer to a
5894         prefix builder.  Replace make_relative_prefix calls with calls to
5895         the function pointed to.  Ignore new flag in regular options handling.
5896         * doc/invoke.texi (Overall Options): Documented -no-canonical-prefixes.
5898 2009-07-15  DJ Delorie  <dj@redhat.com>
5900         * config/mep/mep.md (sibcall_internal): Change register to avoid
5901         argument registers.
5902         (sibcall_value_internal): Likewise.
5904 2009-07-15  Eric Botcazou  <ebotcazou@adacore.com>
5906         PR rtl-optimization/40710
5907         * resource.c (mark_target_live_regs): Reset DF problem to LR.
5909 2009-07-15  Adam Nemet  <anemet@caviumnetworks.com>
5911         * config/mips/mips.md (*extenddi_truncate<mode>,
5912         *extendsi_truncate<mode>): Change type attribute to move_type
5913         with shift_shift.  Split out code handling exts from here ...
5914         (*extend<GPR:mode>_truncate<SHORT:mode>_exts): ... to this new
5915         pattern.
5916         (*extendhi_truncateqi): Change type attribute to move_type with
5917         shift_shift.  Split out code handling exts from here ...
5918         (*extendhi_truncateqi_exts): ... to this new pattern.
5920 2009-07-15  Uros Bizjak  <ubizjak@gmail.com>
5922         * config/i386/sse.md (copysign<mode>3): Use "and-not" SSE instruction
5923         instead of "and" with inverted sign bit mask value.  Use
5924         "nonimmediate_operand" for operand 1 and operand 2 predicate.
5925         Allocate registers only for operand 4 and operand 5.
5927 2009-07-15  Jakub Jelinek  <jakub@redhat.com>
5929         PR middle-end/40747
5930         * fold-const.c (fold_cond_expr_with_comparison): When folding
5931         < and <= to MIN, make sure the MIN uses the same type as the
5932         comparison's operands.
5934 2009-07-15  Richard Earnshaw  <rearnsha@arm.com>
5936         * arm.md (ior_xor): New code iterator.
5937         (split for ior/xor with shift and zero-extend): New split pattern.
5938         * arm/predicates.md (subreg_lowpart_operator): New special predicate.
5940 2009-07-15  Richard Guenther  <rguenther@suse.de>
5942         * tree-ssa-structalias.c (make_constraint_from_heapvar): Initialize
5943         offset member.
5945 2009-07-15  Richard Guenther  <rguenther@suse.de>
5947         PR middle-end/40753
5948         * alias.c (ao_ref_from_mem): Reject FUNCTION_DECL and LABEL_DECL bases.
5950 2009-07-15  Maxim Kuvyrkov  <maxim@codesourcery.com>
5952         * config/m68k/linux-unwind.h (m68k_fallback_frame_state): Update to
5953         handle 2.6.30 kernel.
5955 2009-07-15  DJ Delorie  <dj@redhat.com>
5957         * config/mep/mep.md (sibcall_internal): Change register to allow
5958         for 24-bit addresses.
5959         (sibcall_value_internal): Likewise.
5961 2009-07-14  Ghassan Shobaki  <ghassan.shobaki@amd.com>
5963         * doc/invoke.texi: Added descriptions of the  scheduling heuristics
5964         that are enabled/disabled by the flags introduced by a previous patch.
5966 2009-07-14  DJ Delorie  <dj@redhat.com>
5968         * config/mep/mep.md (sibcall_internal): Include non-toggling
5969         non-jmp case.
5970         (sibcall_value_internal): Likewise.
5972 2009-07-14  Taras Glek  <tglek@mozilla.com>
5973             Rafael Espindola  <espindola@google.com>
5975         * doc/sourcebuild.texi: Document install-plugin target.
5976         * configure.ac: Added install-plugin target to language makefiles.
5977         * configure: Regenerate.
5978         * Makefile.in: (install-plugin): Install more headers,
5979         depend on lang.install-plugin.
5981 2009-07-15  Manuel López-Ibáñez  <manu@gcc.gnu.org>
5983         * tree-vrp.c (vrp_evaluate_conditional): Mark strings for
5984         translation.
5986 2009-07-14  DJ Delorie  <dj@redhat.com>
5988         * config/mep/mep.c (mep_vliw_jmp_match): New function.
5989         * config/mep/mep-protos.h (mep_vliw_jmp_match): Prototype it.
5990         * config/mep/mep.md (sibcall_internal): Change test from
5991         mep_vliw_mode_match to mep_vliw_jmp_match.
5992         (sibcall_value_internal): Likewise.
5994 2009-07-14  Uros Bizjak  <ubizjak@gmail.com>
5996         * config/i386/sse.md (copysign<mode>3): New expander.
5997         * config/i386/i386-protos.h (ix86_build_signbit_mask): New prototype.
5998         * config/i386/i386.c (ix86_build_signbit_mask): Make public.
5999         Use ix86_build_const_vector.
6000         (enum ix86_builtins): Add IX86_BUILTIN_CPYSGNPS and
6001         IX86_BUILTIN_CPYSGNPD.
6002         (builtin_description): Add __builtin_ia32_copysignps and
6003         __builtin_ia32_copysignpd.
6004         (ix86_builtin_vectorized_function): Handle BUILT_IN_COPYSIGN
6005         and BUILT_IN_COPYSIGNF.
6007 2009-07-13  Jason Merrill  <jason@redhat.com>
6009         * builtins.c (can_trust_pointer_alignment): New fn.
6010         (get_pointer_alignment): Factor it out from here.
6011         * tree.h: Declare it.
6013 2009-07-14  David Edelsohn  <edelsohn@gnu.org>
6015         * config/rs6000/predicates.md (offsettable_mem_operand): Test
6016         RTX_AUTOINC class.
6018 2009-07-14  Dodji Seketeli  <dodji@redhat.com>
6020         PR debug/40705
6021         PR c++/403057
6022         * dwarf2.out.c (gen_type_die_with_usage): Added comment.
6024 2009-07-14  Richard Guenther  <rguenther@suse.de>
6025             Andrey Belevantsev <abel@ispras.ru>
6027         PR middle-end/40745
6028         * cfgexpand.c (partition_stack_vars): Do not bother to update
6029         alias information when not optimizing.
6031 2009-07-14  Richard Guenther  <rguenther@suse.de>
6032             Andrey Belevantsev <abel@ispras.ru>
6034         * tree-ssa-alias.h (refs_may_alias_p_1): Declare.
6035         (pt_solution_set): Likewise.
6036         * tree-ssa-alias.c (refs_may_alias_p_1): Export.
6037         * tree-ssa-structalias.c (pt_solution_set): New function.
6038         * final.c (rest_of_clean_state): Free SSA data structures.
6039         * print-rtl.c (print_decl_name): Remove.
6040         (print_mem_expr): Implement in terms of print_generic_expr.
6041         * alias.c (ao_ref_from_mem): New function.
6042         (rtx_refs_may_alias_p): Likewise.
6043         (true_dependence): Query alias-export info.
6044         (canon_true_dependence): Likewise.
6045         (write_dependence_p): Likewise.
6046         * tree-dfa.c (get_ref_base_and_extent): For void types leave
6047         size unknown.
6048         * emit-rtl.c (component_ref_for_mem_expr): Remove.
6049         (mem_expr_equal_p): Use operand_equal_p.
6050         (set_mem_attributes_minus_bitpos): Do not use
6051         component_ref_for_mem_expr.
6052         * cfgexpand.c (add_partitioned_vars_to_ptset): New function.
6053         (update_alias_info_with_stack_vars): Likewise.
6054         (partition_stack_vars): Call update_alias_info_with_stack_vars.
6055         * tree-ssa.c (delete_tree_ssa): Do not release SSA names
6056         explicitly nor clear stmt operands.
6057         Free the decl-to-pointer map.
6058         * tree-optimize.c (execute_free_datastructures): Do not free
6059         SSA data structures here.
6060         * tree-flow.h (struct gimple_df): Add decls_to_pointers member.
6061         * Makefile.in (emit-rtl.o): Add pointer-set.h dependency.
6062         (alias.o): Add tree-ssa-alias.h, pointer-set.h and $(TREE_FLOW_H)
6063         dependencies.
6064         (print-rtl.o): Add $(DIAGNOSTIC_H) dependency.
6066 2009-07-13  DJ Delorie  <dj@redhat.com>
6068         * config/mep/mep.h (CC1_SPEC): Tweak parameters to trigger
6069         unrolling at the right iteration count.
6071         * config/mep/mep.c (mep_expand_prologue): Fix frame pointer
6072         calculations.
6074 2009-07-13  Ghassan Shobaki  <ghassan.shobaki@amd.com>
6076         * haifa-sched.c (rank_for_schedule): Introduced flags to
6077         enable/disable individual scheduling heuristics.
6078         * common.opt: Introduced flags to enable/disable individual
6079         heuristics in the scheduler.
6080         * doc/invoke.texi: Introduced flags to enable/disable individual
6081         heuristics in the scheduler.
6083 2009-07-13  Kai Tietz  <kai.tietz@onevision.com>
6085         * config/i386/t-gthr-win32 (LIB2FUNCS_EXTRA): Remove file
6086         config/i386/mingw-tls.c.
6087         * config/i386/mingw-tls.c: Removed.
6089 2009-07-13  Ira Rosen  <irar@il.ibm.com>
6091         * tree-vect-loop.c (get_initial_def_for_reduction): Ensure that the
6092         checks access only relevant statements.
6093         (vectorizable_reduction): Likewise.
6095 2009-07-12  Kai Tietz  <kai.tietz@onevision.com>
6097         * config/i386/cygming.h (TARGET_OS_CPP_BUILTINS): Define _X86_
6098         just for 32-bit case.
6100 2009-07-12  Jan Hubicka  <jh@suse.cz>
6102         PR tree-optimization/40585
6103         * except.c (expand_resx_expr): When there already is resume
6104         instruction, produce linked list.
6105         (build_post_landing_pads): Assert that resume is empty.
6106         (connect_post_landing_pads): Handle resume lists.
6107         (dump_eh_tree): Dump resume list.
6109 2009-07-12  Ira Rosen  <irar@il.ibm.com>
6111         * tree-parloops.c (loop_parallel_p): Call vect_is_simple_reduction
6112         with additional argument.
6113         * tree-vectorizer.h (enum vect_def_type): Add
6114         vect_double_reduction_def.
6115         (vect_is_simple_reduction): Add argument.
6116         * tree-vect-loop.c (vect_determine_vectorization_factor): Fix
6117         indentation.
6118         (vect_analyze_scalar_cycles_1): Detect double reduction. Call
6119         vect_is_simple_reduction with additional argument.
6120         (vect_analyze_loop_operations): Handle exit phi nodes in case of
6121         double reduction.
6122         (reduction_code_for_scalar_code): Handle additional codes by
6123         returning ERROR_MARK for them. Fix comment and indentation.
6124         (vect_is_simple_reduction): Fix comment, add argument to specify
6125         double reduction. Detect double reduction.
6126         (get_initial_def_for_induction): Fix indentation.
6127         (get_initial_def_for_reduction): Fix comment and indentation.
6128         Handle double reduction. Create initial definitions that do not
6129         require adjustment if ADJUSTMENT_DEF is NULL. Handle additional cases.
6130         (vect_create_epilog_for_reduction): Fix comment, add argument to
6131         handle double reduction. Use PLUS_EXPR in case of MINUS_EXPR in
6132         epilogue result extraction. Create double reduction phi node and
6133         replace relevant uses.
6134         (vectorizable_reduction): Call vect_is_simple_reduction with
6135         additional argument. Fix indentation. Update epilogue code treatment
6136         according to the changes in reduction_code_for_scalar_code. Check
6137         for double reduction. Call vect_create_epilog_for_reduction with
6138         additional argument.
6139         * tree-vect-stmts.c (process_use): Handle double reduction, update
6140         documentation.
6141         (vect_mark_stmts_to_be_vectorized): Handle double reduction.
6142         (vect_get_vec_def_for_operand): Likewise.
6144 2009-07-12  Danny Smith  <dansmister@gmail.com>
6146         * config/i386/winnt.c (i386_pe_determine_dllexport_p): Don't
6147         dllexport if !TREE_PUBLIC.
6148         (i386_pe_maybe_record_exported_symbol): Assert TREE_PUBLIC.
6150 2009-07-11  Anatoly Sokolov  <aesok@post.ru>
6152         * config/avr/avr.h (TARGET_CPU_CPP_BUILTINS): Redefine.
6153         (avr_extra_arch_macro) Remove declatation.
6154         * config/avr/avr.c (avr_cpu_cpp_builtins): New function.
6155         (avr_extra_arch_macro) Declare as static.
6156         * config/avr/avr-protos.h (avr_cpu_cpp_builtins): Dclare.
6158 2009-07-11  Jan Hubicka  <jh@suse.cz>
6160         PR middle-end/48388
6161         * except.c (can_be_reached_by_runtime): Test for NULL aka bitmap.
6163 2009-07-11  Jakub Jelinek  <jakub@redhat.com>
6165         PR debug/40713
6166         * dwarf2out.c (dw_fde_struct): Add in_std_section and
6167         cold_in_std_section bits.
6168         (dwarf2out_begin_prologue): Initialize them.
6169         (dwarf2out_finish): Don't emit FDE range into .debug_ranges
6170         if already covered by text_section or cold_text_section range.
6172         PR rtl-optimization/40667
6173         * defaults.h (MINIMUM_ALIGNMENT): Define if not defined.
6174         * doc/tm.texi (MINIMUM_ALIGNMENT): Document it.
6175         * config/i386/i386.h (MINIMUM_ALIGNMENT): Define.
6176         * config/i386/i386.c (ix86_minimum_alignment): New function.
6177         * config/i386/i386-protos.h (ix86_minimum_alignment): New prototype.
6178         * cfgexpand.c (expand_one_var): Use MINIMIM_ALIGNMENT.
6179         * emit-rtl.c (gen_reg_rtx): Likewise.
6180         * function.c (assign_parms): Likewise.  If nominal_type needs
6181         bigger alignment than FUNCTION_ARG_BOUNDARY, use its alignment
6182         rather than passed_type's alignment.
6184         PR target/40668
6185         * function.c (assign_parm_setup_stack): Adjust
6186         MEM_OFFSET (data->stack_parm) if promoted_mode is different
6187         from nominal_mode on big endian.
6189 2009-07-11  Paolo Bonzini  <bonzini@gnu.org>
6191         * expmed.c (emit_store_flag_1): Fix choice of zero vs. sign extension.
6193 2009-07-10  DJ Delorie  <dj@redhat.com>
6195         * config/mep/mep.c (mep_can_inline_p): Correct logic, and simplify.
6197 2009-07-10  Mark Mitchell  <mark@codesourcery.com>
6199         * config/arm/thumb2.md (thumb2_cbz): Correct computation of length
6200         attribute.
6201         (thumb2_cbnz): Likewise.
6203 2009-07-10  David Daney  <ddaney@caviumnetworks.com>
6205         PR target/39079
6206         * config.gcc (supported_defaults): Add synci.
6207         (with_synci): Add validation.
6208         (all_defaults): Add synci.
6209         * config/mips/mips.md (clear_cache): Use TARGET_SYNCI instead of
6210         ISA_HAS_SYNCI.
6211         (synci): Same.
6212         * config/mips/mips.opt (msynci): New option.
6213         * config/mips/mips.c (mips_override_options): Warn on use of
6214         -msynci for targets that do now support it.
6215         * gcc/config/mips/mips.h (OPTION_DEFAULT_SPECS): Add a default for
6216         msynci.
6217         * gcc/doc/invoke.texi (-msynci): Document the new option.
6218         * doc/install.texi (--with-synci): Document the new option.
6220 2009-07-10  Richard Guenther  <rguenther@suse.de>
6222         PR tree-optimization/40496
6223         * tree-ssa-loop-manip.c (tree_transform_and_unroll_loop): Create
6224         the PHI result with a compatible type.
6226 2009-07-10  Manuel López-Ibáñez  <manu@gcc.gnu.org>
6228         PR 25509
6229         PR 40614
6230         * c.opt (Wunused-result): New.
6231         * doc/invoke.texi: Document it.
6232         * c-common.c (c_warn_unused_result): Use it.
6234 2009-07-09  DJ Delorie  <dj@redhat.com>
6236         * targhooks.c (default_target_can_inline_p): Rename from
6237         default_target_option_can_inline_p.
6238         * targhooks.h (default_target_can_inline_p): Likewise.
6239         * target-def.h (TARGET_CAN_INLINE_P): Rename from
6240         TARGET_OPTION_CAN_INLINE_P.
6241         * config/i386/i386.c (TARGET_CAN_INLINE_P): Likewise.
6242         * config/mep/mep.c (TARGET_CAN_INLINE_P): Likewise.
6243         (mep_target_can_inline_p): Rename from
6244         mep_target_option_can_inline_p.
6246         PR target/40626
6247         * config/mep/mep.h (FUNCTION_ARG_REGNO_P): Add coprocessor
6248         registers used to pass vectors.
6250         * config/mep/mep.c (mep_option_can_inline_p): Remove error call.
6252 2009-07-09  Tom Tromey  <tromey@redhat.com>
6254         * unwind-dw2-fde-darwin.c: Include dwarf2.h.
6255         * config/mmix/mmix.c: Include dwarf2.h.
6256         * config/rs6000/darwin-fallback.c: Include dwarf2.h.
6257         * config/xtensa/unwind-dw2-xtensa.c: Include dwarf2.h.
6258         * config/sh/sh.c: Include dwarf2.h.
6259         * config/i386/i386.c: Include dwarf2.h.
6260         * Makefile.in (DWARF2_H): Remove 'elf'.
6261         * except.c: Include dwarf2.h.
6262         * unwind-dw2.c: Include dwarf2.h.
6263         * dwarf2out.c: Include dwarf2.h.
6264         * unwind-dw2-fde-glibc.c: Include dwarf2.h.
6265         * unwind-dw2-fde.c: Include dwarf2.h.
6266         * dwarf2asm.c: Include dwarf2.h.
6268 2009-07-09  Maxim Kuvyrkov  <maxim@codesourcery.com>
6270         * haifa-sched.c (insn_finishes_cycle_p): New static function.
6271         (max_issue): Use it.
6272         * sched-int.h (struct sched_info: insn_finishes_block_p): New
6273         scheduler hook.
6274         * sched-rgn.c (rgn_insn_finishes_block_p): Implement it.
6275         (region_sched_info): Update.
6276         * sched-ebb.c (ebb_sched_info): Update.
6277         * modulo-sched.c (sms_sched_info): Update.
6278         * sel-sched-ir.c (sched_sel_haifa_sched_info): Update.
6280 2009-07-09  Maxim Kuvyrkov  <maxim@codesourcery.com>
6282         * varasm.c (build_constant_desc): Don't share RTL in pool entries.
6284 2009-07-09  Basile Starynkevitch  <basile@starynkevitch.net>
6286         * plugin.c (try_init_one_plugin): passes RTLD_GLOBAL to dlopen.
6288 2009-07-09  Jakub Jelinek  <jakub@redhat.com>
6290         PR middle-end/40692
6291         * fold-const.c (fold_cond_expr_with_comparison): Don't replace
6292         arg1 with arg01 if arg1 is already INTEGER_CST.
6294 2009-07-08  Adam Nemet  <anemet@caviumnetworks.com>
6296         * simplify-rtx.c (simplify_binary_operation_1) <AND>:
6297         Transform (and (truncate)) into (truncate (and)).
6299 2009-07-08  Adam Nemet  <anemet@caviumnetworks.com>
6301         * combine.c (make_extraction): Check TRULY_NOOP_TRUNCATION before
6302         creating LHS paradoxical subregs.  Fix surrounding returns to
6303         use NULL_RTX rather than 0.
6305 2009-07-08  DJ Delorie  <dj@redhat.com>
6307         * config/mep/mep.c: (mep_option_can_inline_p): New.
6308         (TARGET_OPTION_CAN_INLINE_P): Define.
6310 2009-07-08  Mark Wielaard  <mjw@redhat.com>
6312         PR debug/40659
6313         * dwarf2out.c (add_data_member_location_attribute): When we have
6314         only a constant offset don't emit a new location description using
6315         DW_OP_plus_uconst, but just add the constant with add_AT_int, when
6316         dwarf_version > 2.
6318 2009-07-08  Richard Henderson  <rth@redhat.com>
6320         PR target/38900
6321         * config/i386/i386.h (CONDITIONAL_REGISTER_USAGE): Move to i386.c.
6322         (enum reg_class): Add CLOBBERED_REGS.
6323         (REG_CLASS_NAMES, REG_CLASS_CONTENTS): Likewise.
6324         * config/i386/i386.c (ix86_conditional_register_usage): Moved
6325         from CONDITIONAL_REGISTER_USAGE; build CLOBBERED_REGS for 64-bit.
6326         (ix86_function_ok_for_sibcall): Tidy.  Disallow MS->SYSV sibcalls.
6327         (ix86_expand_call): Use sibcall_insn_operand when needed.  Don't
6328         force 64-bit sibcalls into R11.
6329         * config/i386/constraints.md (U): New constraint.
6330         * config/i386/i386.md (sibcall_1, sibcall_value_1): Use it.
6331         (sibcall_1_rex64, sibcall_value_1_rex64): Likewise.
6332         (sibcall_1_rex64_v, sibcall_value_1_rex64_v): Remove.
6334 2009-07-08  Shujing Zhao  <pearly.zhao@oracle.com>
6336         * basic-block.h (dump_regset, debug_regset): Remove duplicate
6337         prototypes.
6338         * c-objc-common.h (c_initialize_diagnostics): Ditto.
6339         * ebitmap.h (dump_ebitmap): Ditto.
6340         * optabs.h (optab_libfunc): Ditto.
6341         * tree.h (tree_expr_nonzero_warnv_p): Ditto.
6342         * tree-flow.h (vect_can_force_dr_alignment_p,
6343         get_vectype_for_scalar_type): Ditto.
6344         (vectorize_loops): Move prototype to ...
6345         * tree-vectorizer.h: ... here. Also, adjust comment.
6346         (vect_set_verbosity_level): Remove duplicate prototype.
6347         * tree-ssa-loop.c: Include tree-vectorizer.h.
6348         * Makefile.in (tree-ssa-loop.o): Depend on tree-vectorizer.h.
6350 2009-07-08  Nick Clifton  <nickc@redhat.com>
6352         * config/i386/unix.h (ASM_COMMENT_START): Add a space after the
6353         forward slash.
6355 2009-07-08  DJ Delorie  <dj@redhat.com>
6357         * config/mep/mep-ivc2.cpu (cpmovtocsar0_C3, cpmovtocsar1_C3,
6358         cpmovtocc_C3, cpmovtocsar0_P0S_P1, cpmovtocsar1_P0S_P1,
6359         cpmovtocc_P0S_P1): Mark volatile.  Note which registers are
6360         written to.
6361         * config/mep/intrinsics.md: Regenerated.
6362         * config/mep/mep.c (mep_interrupt_saved_reg): Save IVC2 control
6363         registers when asm() or calls are detected.
6365 2009-07-08  Manuel López-Ibáñez  <manu@gcc.gnu.org>
6367         PR c++/31246
6368         * gimplify.c (gimplify_expr): Propagate no_warning flag when
6369         gimplifying.
6370         * gimple (gimple_build_call_from_tree): Likewise.
6371         * tree-cfg.c (remove_useless_stmts_warn_notreached): Check
6372         no_warning flag before warning.
6374 2009-07-07  Manuel López-Ibáñez  <manu@gcc.gnu.org>
6376         * tree.c (set_expr_locus): Remove.
6377         * tree.h (EXPR_LOCUS,SET_EXPR_LOCUS,set_expr_locus): Remove.
6378         * c-typeck.c (c_finish_stmt_expr):  Replace EXPR_LOCUS by
6379         EXPR_LOCATION.
6380         * gimplify.c (internal_get_tmp_var): Likewise.
6381         (gimplify_call_expr): Likewise.
6382         (gimplify_one_sizepos): Likewise.
6384 2009-07-07  Eric Botcazou  <ebotcazou@adacore.com>
6386         PR debug/40666
6387         * dbxout.c (dbxout_symbol) <PARM_DECL>: Deal with parameters pointing
6388         to variables for debugging purposes.
6390 2009-06-23  Mark Loeser  <mark@halcy0n.com>
6392         PR build/40010
6393         * Makefile.in (gcc.pod): Depend on gcc-vers.texi.
6395 2009-07-07  Manuel López-Ibáñez  <manu@gcc.gnu.org>
6397         * pretty-print.c (pp_base_format): Remove %J.
6398         * c-format.c (gcc_diag_char_table, gcc_tdiag_char_table,
6399         gcc_cxxdiag_char_table): Likewise.
6400         (init_dynamic_diag_info): Likewise.
6402 2009-07-07  Manuel López-Ibáñez  <manu@gcc.gnu.org>
6404         * pretty-print.c (pp_base_format): Remove %H.
6405         * c-format.c (gcc_diag_char_table, gcc_tdiag_char_table,
6406         gcc_cxxdiag_char_table): Likewise.
6407         (init_dynamic_diag_info): Likewise.
6408         * config/mep/mep.c (mep_select_section): Likewise.
6410 2009-07-07  Duncan Sands  <baldrick@free.fr>
6412         * final.c (pass_clean_state): Give the pass a name.
6413         * passes.c (pass_rest_of_compilation): Likewise.
6414         * tree-optimize.c (pass_all_optimizations): Likewise.
6416 2009-07-07  H.J. Lu  <hongjiu.lu@intel.com>
6418         * config/ia64/ia64.c (ia64_handle_model_attribute): Remove
6419         an extra 'decl' for error_at.
6421 2009-07-07  Jakub Jelinek  <jakub@redhat.com>
6423         PR middle-end/40669
6424         * tree-tailcall.c (adjust_return_value_with_ops,
6425         create_tailcall_accumulator): Set DECL_GIMPLE_REG_P on the temporary
6426         if it has complex or vector type.
6428 2009-07-07  Olivier Hainque  <hainque@adacore.com>
6430         * config/alpha/t-osf4 (SHLIB_LINK): Do not hide the dummy weak
6431         pthread symbols.
6433 2009-07-07  Basile Starynkevitch  <basile@starynkevitch.net>
6435         * Makefile.in: added more lists of includes to PLUGIN_HEADERS.
6437 2009-07-07  Manuel López-Ibáñez  <manu@gcc.gnu.org>
6439         * cgraphunit.c: Replace %J by an explicit location.  Update all calls.
6440         * c-decl.c: Likewise.
6441         * function.c: Likewise.
6442         * varasm.c: Likewise.
6443         * tree-ssa.c: Likewise.
6444         * c-common.c: Likewise.
6445         * tree-cfg.c: Likewise.
6446         * config/spu/spu.c: Likewise.
6447         * config/ia64/ia64.c: Likewise.
6448         * config/v850/v850.c: Likewise.
6450 2009-07-06  DJ Delorie  <dj@redhat.com>
6452         * config/mep/mep-core.cpu (fsft, ssarb): Mark as VOLATILE.
6453         * config/mep/mep-ivc2.cpu (many): Add VOLATILE to more insns that make
6454         unspecified accesses to control registers.
6455         * config/mep/intrinsics.md: Regenerate.
6456         * config/mep/intrinsics.h: Regenerate.
6457         * config/mep/mep-intrin.h: Regenerate.
6459 2009-07-07  Manuel López-Ibáñez  <manu@gcc.gnu.org>
6461         * c-lex.c: Replace %H by an explicit location. Update all calls.
6462         * c-common.c: Likewise.
6463         * c-decl.c: Likewise.
6464         * c-typeck.c: Likewise.
6465         * fold-const.c: Likewise.
6466         * gimplify.c: Likewise.
6467         * stmt.c: Likewise.
6468         * tree-cfg.c: Likewise.
6469         * tree-ssa-loop-niter.c: Likewise.
6470         * tree-vrp.c: Likewise.
6471         * value-prof.c: Likewise.
6473 2009-07-06  Diego Novillo  <dnovillo@google.com>
6475         * tree-dfa.c (dump_variable): Write DECL_INITIAL for VAR
6476         if it has one.  Handle cases where VAR does not have an
6477         annotation or cfun is NULL.
6479 2009-07-06  Diego Novillo  <dnovillo@google.com>
6481         * tree.c: Include debug.h.
6482         (initialize_tree_contains_struct): New.
6483         (init_ttree): Call it.
6484         (tree_node_structure_for_code): Factor out of ...
6485         (tree_node_structure): ... here.
6486         * treestruct.def (TS_PHI_NODE): Remove.
6487         (TS_GIMPLE_STATEMENT): Remove.
6489 2009-07-06  Diego Novillo  <dnovillo@google.com>
6491         * tree-pretty-print.c (dump_generic_node): Protect against NULL op0.
6492         (debug_tree_chain): Handle cycles.
6494 2009-07-06  Nick Clifton  <nickc@redhat.com>
6495             DJ Delorie  <dj@redhat.com>
6497         * config.sh/lib1funcs.h (FMOVD_WORKS): Only define if
6498         __FMOVD_ENABLED__ is defined.
6499         * config/sh/sh.h
6500         (TARGET_FMOVD): Provide a default definition.
6501         (MASK_FMOVD): Likewise.
6502         (TARGET_CPU_CPP_BUILTINS): Define
6503         __FMOVD_ENABLED__ if TARGET_FMOVD is true.
6504         * config/sh/sh.md (movdf_i4): For alternative 0 use either one or
6505         two fmov instructions depending upon whether TARGET_FMOVD is enabled.
6506         (split for DF load from memory into register): Also handle
6507         MEMs which consist of REG+DISP addressing.
6508         (split for DF store from register to memory): Likewise.
6509         (movsf_ie): Always use single fp_mode.
6510         * config/sh/sh.c (sh_override_options): Do not automatically
6511         enable TARGET_MOVD for the SH2A when supporting doubles - leave
6512         that to the -mfmovd command line switch.
6513         (broken_move): Do not restrict fldi test to only the SH4 and SH4A.
6514         (fldi_ok): Always allow.
6515         * config/sh/sh.opt (mfmovd): Remove this switch.
6516         * doc/invoke.texi (-mfmovd): Remove documentation of this switch.
6518 2009-07-06  J"orn Rennecke  <joern.rennecke@arc.com>
6519             Kaz Kojima  <kkojima@gcc.gnu.org>
6521         PR rtl-optimization/30807
6522         * postreload.c (reload_combine): For every new use of REG_SUM,
6523         record the use of BASE.
6525 2009-07-06  Jan Hubicka  <jh@suse.cz>
6527         * params.def: Revert my accidental commit at 2009-06-30.
6529 2009-07-04  Ian Lance Taylor  <iant@google.com>
6531         PR target/40636
6532         * config/i386/msformat-c.c (mingw_format_attributes): Declare as
6533         EXPORTED_CONST.
6534         (mingw_format_attribute_overrides): Likewise.
6536 2009-07-04  Jakub Jelinek  <jakub@redhat.com>
6538         PR debug/40596
6539         * dwarf2out.c (based_loc_descr): For crtl->stack_realign_tried
6540         don't check cfa.reg.  Instead of cfa.indirect use
6541         fde && fde->drap_reg != INVALID_REGNUM test.
6543 2009-07-04  Eric Botcazou  <ebotcazou@adacore.com>
6545         * postreload.c (reload_combine): Replace CONST_REG with INDEX_REG.
6547 2009-07-03  Vladimir Makarov  <vmakarov@redhat.com>
6549         PR target/40587
6550         * ira.c (build_insn_chain): Use DF_LR_OUT instead of df_get_live_out.
6552 2009-07-03  Richard Guenther  <rguenther@suse.de>
6554         PR tree-optimization/40640
6555         * tree-switch-conversion.c (build_arrays): Perform arithmetic
6556         in original type.
6558 2009-07-03  Jan Hubicka  <jh@suse.cz>
6560         * ipa-inline.c (cgraph_decide_inlining_incrementally): When optimizing
6561         for size, reduce amount of inlining.
6563 2009-07-03  Richard Guenther  <rguenther@suse.de>
6565         PR middle-end/34163
6566         * tree-chrec.c (chrec_convert_1): Fold (T2)(t +- x) to (T2)t +- (T2)x
6567         if t +- x is known to not overflow and the conversion widens the
6568         operation.
6569         * Makefile.in (tree-chrec.o): Add $(FLAGS_H) dependency.
6571 2009-07-03  Jan Hubicka  <jh@suse.cz>
6573         * ipa-pure-const.c (analyze): Update loop optimizer init.
6574         * tree-ssa-loop-iv-canon.c (empty_loop_p, remove_empty_loop,
6575         try_remove_empty_loop, remove_empty_loops): Remove.
6576         * tree-ssa-loop.c (tree_ssa_empty_loop, pass_empty_loop): Remove.
6577         * tree-ssa-dce.c (find_obviously_necessary_stmts): Use finiteness info
6578         to mark regular loops as neccesary.
6579         (degenerate_phi_p): New function.
6580         (propagate_necessity, remove_dead_phis): Use it.
6581         (forward_edge_to_pdom): Likewise.
6582         (eliminate_unnecessary_stmts): Take care to remove uses of results of
6583         virtual PHI nodes that became unreachable.
6584         (perform_tree_ssa_dce): Initialize/deinitialize loop optimizer.
6585         * tree-flow.h (remove_empty_loops): Remove.
6586         * passes.c (init_optimization_passes): Remove.
6588 2009-07-03  Uros Bizjak  <ubizjak@gmail.com>
6590         * config/i386/i386.md (fix_trunc<mode>_fisttp_i387_1): Use
6591         can_create_pseudo_p.
6592         (*fix_trunc<mode>_i387_1): Ditto.
6593         (*floathi<mode>2_1): Ditto.
6594         (*float<SSEMODEI24:mode><X87MODEF:mode>2_1): Ditto.
6595         (*fistdi2_1): Ditto.
6596         (*fist<mode>2_1): Ditto.
6597         (frndintxf2_floor): Ditto.
6598         (*fist<mode>2_floor_1): Ditto.
6599         (frndintxf2_ceil): Ditto.
6600         (*fist<mode>2_ceil_1): Ditto.
6601         (frndintxf2_trunc): Ditto.
6602         (frndintxf2_mask_pm): Ditto.
6603         (fxam<mode>2_i387_with_temp): Ditto.
6604         * config/i386/sse.md (mulv16qi3): Ditto.
6605         (*sse2_mulv4si3): Ditto.
6606         (mulv2di3): Ditto.
6607         (sse4_2_pcmpestr): Ditto.
6608         (sse4_2_pcmpistr): Ditto.
6610 2009-07-03  Jan Hubicka  <jh@suse.cz>
6612         * tree-ssa-dce.c (bb_contains_live_stmts): New bitmap.
6613         (mark_stmt_necessary): Set it.
6614         (mark_operand_necessary): Set it.
6615         (mark_control_dependent_edges_necessary): Set it.
6616         (mark_virtual_phi_result_for_renaming): New function.
6617         (get_live_post_dom): New function.
6618         (forward_edge_to_pdom): New function.
6619         (remove_dead_stmt): Fix handling of control dependences.
6620         (tree_dce_init): Init new bitmap.
6621         (tree_dce_done): Free it.
6623 2009-07-02  Richard Guenther  <rguenther@suse.de>
6625         PR bootstrap/40617
6626         * tree-ssa-structalias.c (new_var_info): Initialize
6627         is_restrict_var.
6629 2009-07-02  Jan Hubicka  <jh@suse.cz>
6631         * ipa-pure-const.c (check_op): Use PTA info to see if indirect_ref is
6632         local.
6634 2009-07-02  Paolo Bonzini  <bonzini@gnu.org>
6636         * expmed.c (emit_cstore, emit_store_flag_1): Accept target_mode
6637         instead of recomputing it.  Adjust calls.
6638         (emit_store_flag): Adjust recursive calls.
6640 2009-07-02  Richard Guenther  <rguenther@suse.de>
6642         * tree-ssa-live.c (remove_unused_locals): Do not remove
6643         heap variables.
6644         * tree-ssa-structalias.c (handle_lhs_call): Delay setting
6645         of DECL_EXTERNAL for HEAP variables.
6646         (compute_points_to_sets): Set DECL_EXTERNAL for escaped
6647         HEAP variables.  Do not adjust RESTRICT vars.
6648         (find_what_var_points_to): Nobody cares if something
6649         points to READONLY.
6651 2009-07-02  Ben Elliston  <bje@au.ibm.com>
6653         * unwind-dw2-fde-glibc.c (_Unwind_IteratePhdrCallback): Move
6654         pc_low and pc_high declarations to the top of the function.
6656 2009-07-01  DJ Delorie  <dj@redhat.com>
6658         * config/mep/mep.c (mep_handle_option): Leave IVC2 control
6659         registers as fixed.
6660         (mep_interrupt_saved_reg): Save appropriate IVC2 control registers.
6661         * config/mep/mep-ivc2.cpu: Add VOLATILE to insns that make
6662         unspecified accesses to control registers.
6663         * config/mep/intrinsics.md: Regenerate.
6664         * config/mep/intrinsics.h: Regenerate.
6665         * config/mep/mep-intrin.h: Regenerate.
6667 2009-07-01  Anthony Green  <green@moxielogic.com>
6669         * config/moxie/moxie.c (moxie_expand_prologue): Use dec
6670         instruction when possible.
6671         (moxie_expand_prologue): Ditto.  Also, save an instruction and
6672         some complexity by popping off of $r12 instead of $sp.
6673         * config/moxie/moxie.md (movsi_pop): Don't assume $sp.  Take two
6674         operands.
6676 2009-07-01  Richard Henderson  <rth@redhat.com>
6678         PR bootstrap/40347
6679         * function.c (reposition_prologue_and_epilogue_notes): If epilogue
6680         contained no insns, reposition note before last insn.
6682 2009-07-01  Richard Henderson  <rth@redhat.com>
6684         PR debug/40431
6685         * dwarf2out.c (def_cfa_1): Revert 2009-06-11 change for
6686         DW_CFA_def_cfa_offset and DW_CFA_def_cfa.
6688 2009-07-01  Michael Meissner  <meissner@linux.vnet.ibm.com>
6690         PR bootstrap/40558
6691         * config/rs6000/rs6000.c (print_operand): Undo change that breaks
6692         darwin9 for printing reg addresses with %y.
6694 2009-07-01  Adam Nemet  <anemet@caviumnetworks.com>
6696         * combine.c (force_to_mode): Handle TRUNCATE.  Factor out
6697         truncation from operands in binary operations.
6699 2009-07-01  Adam Nemet  <anemet@caviumnetworks.com>
6701         Revert:
6702         2009-01-11  Adam Nemet  <anemet@caviumnetworks.com>
6703         * expmed.c (store_bit_field_1): Properly truncate the paradoxical
6704         subreg of op0 to the original op0.
6706         * expmed.c (store_bit_field_1): Use a temporary as the destination
6707         instead of a paradoxical subreg when we need to truncate the result.
6709 2009-07-01  DJ Delorie  <dj@redhat.com>
6711         * config/mep/mep-ivc2.cpu (cmov, cmovc, cmovh): Add intrinsic
6712         names to VLIW variants.
6713         (ivc2rm, ivc2crn): Make data type consistent with non-VLIW variants.
6714         * config/mep/intrinsics.md: Regenerate.
6715         * config/mep/intrinsics.h: Regenerate.
6716         * config/mep/mep-intrin.h: Regenerate.
6718 2009-07-01  Jakub Jelinek  <jakub@redhat.com>
6720         PR debug/40462
6721         * jump.c (returnjump_p): Revert last patch.
6722         * dwarf2out.c (dwarf2out_begin_epilogue): Handle SEQUENCEs.
6724 2009-07-01  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
6726         PR target/40575
6727         * pa.md (casesi32p): Use jump table label to determine the offset
6728         of the jump table.
6729         (casesi64p): Likewise.
6731         * pa.c (forward_branch_p): Return bool type.  Use instruction
6732         addresses when available.  Assert that INSN has a jump label.
6733         (pa_adjust_insn_length): Don't call forward_branch_p if INSN doesn't
6734         have a jump label.
6736 2009-07-01  Richard Guenther  <rguenther@suse.de>
6738         PR tree-optimization/19831
6739         * tree-ssa-dce.c (propagate_necessity): Calls to functions
6740         that only act as barriers do not make any previous stores necessary.
6741         * tree-ssa-structalias.c (handle_lhs_call): Delay making
6742         HEAP variables global, do not add a constraint from nonlocal.
6743         (find_func_aliases): Handle escapes through return statements.
6744         (compute_points_to_sets): Make escaped HEAP variables global.
6746 2009-07-01  Paolo Bonzini  <bonzini@gnu.org>
6748         PR bootstrap/40597
6749         * expmed.c (emit_store_flag): Perform a conversion if necessary,
6750         after reducing a DImode cstore to SImode.
6752 2009-07-01  Paolo Bonzini  <bonzini@gnu.org>
6754         * expr.c (expand_expr_real_1): Reinstate fallthrough to
6755         TRUTH_ANDIF_EXPR if do_store_flag returns NULL.
6757 2009-07-01  Maciej W. Rozycki  <macro@linux-mips.org>
6759         * config/vax/vax.h (TARGET_BSD_DIVMOD): New macro.  Set to 1.
6760         * config/vax/linux.h (TARGET_BSD_DIVMOD): New macro.  Redefine the
6761         to 0.
6762         * config/vax/vax.c (vax_init_libfuncs): Only redefine udiv_optab
6763         and umod_optab if TARGET_BSD_DIVMOD.
6764         * config/vax/lib1funcs.asm: New file.
6765         * config/vax/t-linux: New file.
6766         * config.gcc (vax-*-linux*): Set tmake_file to vax/t-linux.
6768 2009-06-30  Jakub Jelinek  <jakub@redhat.com>
6770         PR c++/40566
6771         * convert.c (convert_to_integer) <case COND_EXPR>: Don't convert
6772         to type arguments that have void type.
6774         PR debug/40573
6775         * dwarf2out.c (gen_formal_parameter_die): Call
6776         equate_decl_number_to_die if node is different from origin.
6778 2009-06-30  Anthony Green  <green@moxielogic.com>
6780         Clean up moxie port for --enable-build-with-cxx.
6781         * config/moxie/moxie.c (moxie_function_value): First two
6782         parameters are const_tree, not tree.
6783         * config/moxie/moxie.h (enum reg_class): Rename CC_REG to CC_REGS.
6784         (REG_CLASS_NAMES): Ditto.
6785         (REGNO_REG_CLASS): Ditto.
6786         * config/moxie/moxie-protos.h (moxie_override_options): Declare.
6787         (moxie_function_value): Fix constyness of arguments.
6789 2009-06-30  Eric Botcazou  <ebotcazou@adacore.com>
6791         * cgraphunit.c (cgraph_finalize_compilation_unit): Call
6792         finalize_size_functions before further processing.
6793         * stor-layout.c: Include cgraph.h, tree-inline.h and tree-dump.h.
6794         (variable_size): Call self_referential_size on size expressions
6795         that contain a PLACEHOLDER_EXPR.
6796         (size_functions): New static variable.
6797         (copy_self_referential_tree_r): New static function.
6798         (self_referential_size): Likewise.
6799         (finalize_size_functions): New global function.
6800         * tree.c: Include tree-inline.h.
6801         (push_without_duplicates): New static function.
6802         (find_placeholder_in_expr): New global function.
6803         (substitute_in_expr) <tcc_declaration>: Return the replacement object
6804         on equality.
6805         <tcc_expression>: Likewise.
6806         <tcc_vl_exp>: If the replacement object is a constant, try to inline
6807         the call in the expression.
6808         * tree.h (finalize_size_functions): Declare.
6809         (find_placeholder_in_expr): Likewise.
6810         (FIND_PLACEHOLDER_IN_EXPR): New macro.
6811         (substitute_placeholder_in_expr): Update comment.
6812         * tree-inline.c (remap_decl): Do not unshare trees if do_not_unshare
6813         is true.
6814         (copy_tree_body_r): Likewise.
6815         (copy_tree_body): New static function.
6816         (maybe_inline_call_in_expr): New global function.
6817         * tree-inline.h (struct copy_body_data): Add do_not_unshare field.
6818         (maybe_inline_call_in_expr): Declare.
6819         * Makefile.in (tree.o): Depend on TREE_INLINE_H.
6820         (stor-layout.o): Depend on CGRAPH_H, TREE_INLINE_H, TREE_DUMP_H and
6821         GIMPLE_H.
6823 2009-06-30  Richard Guenther  <rguenther@suse.de>
6825         * tree-ssa-dce.c (mark_all_reaching_defs_necessary_1): Always
6826         continue walking.
6827         (propagate_necessity): Do not mark reaching defs of stores
6828         as necessary.
6830 2009-06-30  Jan Hubicka  <jh@suse.cz>
6832         * cfgloopanal.c (check_irred): Move into ...
6833         (mark_irreducible_loops): ... here; return true if ireducible
6834         loops was found.
6835         * ipa-pure-const.c: Include cfgloop.h and tree-scalar-evolution.h
6836         (analyze_function): Try to prove loop finiteness.
6837         * cfgloop.h (mark_irreducible_loops): Update prototype.
6838         * Makefile.in (ipa-pure-const.o): Add dependency on SCEV and CFGLOOP.
6840 2009-06-30  Basile Starynkevitch  <basile@starynkevitch.net>
6842         * Makefile.in (PLUGIN_HEADERS): added ggc, tree-dump, pretty-print.
6844 2009-06-30  Ira Rosen  <irar@il.ibm.com>
6846         PR tree-optimization/40542
6847         * tree-vect-stmts.c (vect_analyze_stmt): Don't vectorize volatile
6848         types.
6850 2009-06-30  Martin Jambor  <mjambor@suse.cz>
6852         PR tree-optimization/40582
6853         * tree-sra.c (build_ref_for_offset_1): Use types_compatible_p rather
6854         than useless_type_conversion_p.
6855         (generate_subtree_copies): Increment sra_stats.subtree_copies at a
6856         proper place.
6858 2009-06-30  Martin Jambor  <mjambor@suse.cz>
6860         PR middle-end/40554
6861         * tree-sra.c (sra_modify_expr): Add access->offset to start_offset.
6863 2009-06-30  Richard Guenther  <rguenther@suse.de>
6865         * tree-ssa-alias.c (walk_aliased_vdefs_1): Change interface to
6866         use ao_ref references.
6867         (walk_aliased_vdefs): Likewise.
6868         * tree-ssa-alias.h (walk_aliased_vdefs): Adjust prototype.
6869         * tree-ssa-dce.c (struct ref_data): Remove.
6870         (mark_aliased_reaching_defs_necessary_1): Use the ao_ref argument.
6871         (mark_aliased_reaching_defs_necessary): Adjust.
6872         (mark_all_reaching_defs_necessary_1): Likewise.
6874 2009-06-30  Paolo Bonzini  <bonzini@gnu.org>
6876         PR boostrap/40597
6877         * expmed.c (emit_cstore): New name of emit_store_flag_1.
6878         (emit_store_flag_1): Extract from emit_store_flag, adjust
6879         calls to (what now is) emit_cstore.
6880         (emit_store_flag): Call emit_store_flag_1 and also use it
6881         for what used to be recursive calls.
6883 2009-06-30  Wei Guozhi  <carrot@google.com>
6885         PR/40416
6886         * tree-ssa-sink.c (statement_sink_location): Stop sinking expression
6887         if the target bb post dominates from bb.
6888         * config/i386/i386.c (memory_address_length): Check existence of base
6889         register before using it.
6891 2009-06-30  Nick Clifton  <nickc@redhat.com>
6892             DJ Delorie  <dj@redhat.com>
6894         * config.sh/lib1funcs.h (FMOVD_WORKS): Only define if
6895         __FMOVD_ENABLED__ is defined.
6896         * config/sh/sh.h
6897         (TARGET_FMOVD): Provide a default definition.
6898         (MASK_FMOVD): Likewise.
6899         (TARGET_CPU_CPP_BUILTINS): Define
6900         __FMOVD_ENABLED__ if TARGET_FMOVD is true.
6901         * config/sh/sh.md (movdf_i4): For alternative 0 use either one or
6902         two fmov instructions depending upon whether TARGET_FMOVD is
6903         enabled.
6904         (split for DF load from memory into register): Also handle
6905         MEMs which consist of REG+DISP addressing.
6906         (split for DF store from register to memory): Likewise.
6907         * config/sh/sh.opt (mfmovd): Remove this switch.
6908         * doc/invoke.texi (-mfmovd): Remove documentation of this switch.
6909         * config/sh/sh.c (sh_override_options): Do not automatically
6910         enable TARGET_MOVD for the SH2A when supporting doubles - leave
6911         that to the -mfmovd command line switch.
6913         * config/sh/sh.c (broken_move): Do not restrict fldi test to only
6914         the SH4 and SH4A.
6915         (fldi_ok): Always allow.
6916         * config/sh/sh.md (movsf_ie): Always use single fp_mode.
6918 2009-06-29  DJ Delorie  <dj@redhat.com>
6920         * doc/install.texi (mep-x-elf): Correct chip's full name.
6922 2009-06-29  H.J. Lu  <hongjiu.lu@intel.com>
6924         * doc/extend.texi: Fix typo.
6926 2009-06-29  Tom Tromey  <tromey@redhat.com>
6928         * dwarf2.h: Remove.
6929         * Makefile.in (DWARF2_H): New variable.
6930         (except.o): Use it.
6931         (dwarf2out.o): Likewise.
6932         (dwarf2asm.o): Likewise.
6933         * config/i386/t-i386: Use DWARF2_H.
6934         * except.c: Include elf/dwarf2.h.
6935         * unwind-dw2.c: Include elf/dwarf2.h.
6936         * dwarf2out.c: Include elf/dwarf2.h.
6937         (dw_loc_descr_struct) <dw_loc_opc>: Now a bitfield.
6938         <dtprel>: New field.
6939         (dwarf_stack_op_name): Don't handle INTERNAL_DW_OP_tls_addr.
6940         (size_of_loc_descr): Likewise.
6941         (output_loc_operands_raw): Likewise.
6942         (output_loc_operands): Handle new dtprel field.
6943         (loc_checksum): Update.
6944         (loc_descriptor_from_tree_1) <VAR_DDECL>: Set dtprel field.
6945         * unwind-dw2-fde-glibc.c: Include elf/dwarf2.h.
6946         * unwind-dw2-fde.c: Include elf/dwarf2.h.
6947         * dwarf2asm.c: Include elf/dwarf2.h.
6948         * unwind-dw2-fde-darwin.c: Include elf/dwarf2.h.
6949         * config/mmix/mmix.c: Include elf/dwarf2.h.
6950         * config/rs6000/darwin-fallback.c: Include elf/dwarf2.h.
6951         * config/xtensa/unwind-dw2-xtensa.c: Include elf/dwarf2.h.
6952         * config/sh/sh.c: Include elf/dwarf2.h.
6953         * config/i386/i386.c: Include elf/dwarf2.h.
6955 2009-06-29  DJ Delorie  <dj@redhat.com>
6957         * config/mep/mep.h (CPP_SPEC): Remove __cop macro.
6959         * doc/extend.texi: Add MeP attributes and pragmas.
6960         * doc/invoke.text: Add MeP Options.
6961         * doc/contrib.texi: Add MeP contribution.
6962         * doc/md.texi: Add MeP constraints.
6963         * doc/install.texi: Add MeP target.
6965 2009-06-30  Anatoly Sokolov  <aesok@post.ru>
6967         * target.h (struct gcc_target): Add frame_pointer_required field.
6968         * target-def.h (TARGET_FRAME_POINTER_REQUIRED): New.
6969         (TARGET_INITIALIZER): Use TARGET_FRAME_POINTER_REQUIRED.
6970         * ira.c (setup_eliminable_regset): Use frame_pointer_required target
6971         hook.
6972         * reload1.c (update_eliminables): (Ditto.).
6973         * gcc/system.h (FRAME_POINTER_REQUIRED): Poison.
6974         * doc/tm.texi (FRAME_POINTER_REQUIRED): Revise documentation.
6975         (INITIAL_FRAME_POINTER_OFFSET): (Ditto.).
6977         * config/arc/arc.h (FRAME_POINTER_REQUIRED): Remove macro.
6979         * config/arm/arm.h (FRAME_POINTER_REQUIRED): Remove macro.
6980         * config/arm/arm.c (TARGET_FRAME_POINTER_REQUIRED): Define.
6981         (arm_frame_pointer_required): New function.
6983         * config/avr/avr.h (FRAME_POINTER_REQUIRED): Remove macro.
6984         * config/avr/avr.c (TARGET_FRAME_POINTER_REQUIRED): Define macro.
6985         (avr_frame_pointer_required_p): Declare as static.
6986         * config/avr/avr-protos.h (avr_frame_pointer_required_p): Remove.
6988         * config/bfin/bfin.h (FRAME_POINTER_REQUIRED): Remove macro.
6989         * config/bfin/bfin.c (TARGET_FRAME_POINTER_REQUIRED): Define.
6990         (bfin_frame_pointer_required): Make as static, change return type
6991         to bool.
6992         * config/bfin/bfin-protos.h (bfin_frame_pointer_required): Remove.
6994         * config/cris/cris.h (FRAME_POINTER_REQUIRED): Remove macro.
6995         * config/cris/cris.c (TARGET_FRAME_POINTER_REQUIRED): Define macro.
6996         (cris_frame_pointer_required): New function.
6998         * config/crx/crx.h (FRAME_POINTER_REQUIRED): Remove macro.
7000         * config/fr30/fr30.h (FRAME_POINTER_REQUIRED): Remove macro.
7001         * config/fr30/fr30.c (TARGET_FRAME_POINTER_REQUIRED): Define macro.
7002         (fr30_frame_pointer_required): New function.
7004         * config/frv/frv.h (FRAME_POINTER_REQUIRED): Remove macro.
7005         * config/frv/frv.c (TARGET_FRAME_POINTER_REQUIRED): Define.
7006         (frv_frame_pointer_required): Make as static, change return type
7007         to bool.
7008         * config/bfin/bfin-protos.h (frv_frame_pointer_required): Remove.
7010         * config/i386/i386.h (FRAME_POINTER_REQUIRED): Remove macro.
7011         * config/i386/i386.c (TARGET_FRAME_POINTER_REQUIRED): Define macro.
7012         (ix86_frame_pointer_required): Make as static, change return type to
7013         bool.
7014         * config/i386/i386-protos.h (ix86_frame_pointer_required): Remove.
7016         * config/m32c/m32c.h (FRAME_POINTER_REQUIRED): Remove macro.
7017         * config/m32c/m32c.c (TARGET_FRAME_POINTER_REQUIRED): Define macro.
7019         * config/m32r/m32r.h (FRAME_POINTER_REQUIRED): Remove macro.
7021         * config/mcore/mcore.h (CAN_ELIMINATE): Remove macro.
7023         * config/mep/mep.h (FRAME_POINTER_REQUIRED): Remove macro.
7025         * config/mips/mips.h (FRAME_POINTER_REQUIRED): Remove macro.
7026         * config/mips/mips.c (TARGET_FRAME_POINTER_REQUIRED): Define macro.
7027         (mips_frame_pointer_required): Make as static.
7028         * config/mips/mips-protos.h (mips_frame_pointer_required): Remove.
7030         * config/mmix/mmix.h (FRAME_POINTER_REQUIRED): Remove macro.
7031         * config/mmix/mmix.c (TARGET_FRAME_POINTER_REQUIRED): Define macro.
7032         (mmix_frame_pointer_required): Mew function.
7034         * config/moxie/moxie.h (FRAME_POINTER_REQUIRED): Remove macro.
7035         * config/moxie/moxie.c (TARGET_FRAME_POINTER_REQUIRED): Define macro.
7037         * config/pa/pa.h (FRAME_POINTER_REQUIRED): Remove macro.
7039         * config/score/score.h (FRAME_POINTER_REQUIRED): Remove macro.
7041         * config/sh/sh.h (CAN_ELIMINATE): Remove macro.
7043         * config/sparc/sparc.h (FRAME_POINTER_REQUIRED): Remove macro.
7044         (CAN_ELIMINATE): Redefine.
7045         * config/sparc/sparc.c (TARGET_FRAME_POINTER_REQUIRED): Define macro.
7046         (sparc_frame_pointer_required): New function.
7047         (sparc_can_eliminate): New function.
7048         * config/sparc/sparc-protos.h (sparc_can_eliminate): Declare.
7050         * config/vax/vax.h (FRAME_POINTER_REQUIRED): Remove macro.
7051         * config/vax/vax.c (TARGET_FRAME_POINTER_REQUIRED): Define.
7053         * config/xtensa/xtensa.h (FRAME_POINTER_REQUIRED): Remove macro.
7054         * config/xtensa/xtensa.c (TARGET_FRAME_POINTER_REQUIRED): Define.
7055         (xtensa_frame_pointer_required): Make as static, change return type
7056         to bool.
7057         * config/xtensa/xtensa-protos.h (xtensa_frame_pointer_required):
7058         Remove.
7060 2009-06-29  Olatunji Ruwase  <tjruwase@google.com>
7062         * doc/plugins.texi: Document PLUGIN_START_UNIT.
7063         * toplev.c (compile_file): Call PLUGIN_START_UNIT.
7064         * gcc-plugin.h (PLUGIN_START_UNIT): Added new event.
7065         * plugin.c (plugin_event_name): Added PLUGIN_START_UNIT.
7066         (register_callback): Handle PLUGIN_START_UNIT.
7067         (invoke_plugin_callbacks): Handle PLUGIN_START_UNIT.
7069 2009-06-29  Eric Botcazou  <ebotcazou@adacore.com>
7071         * tree.c (process_call_operands): Propagate TREE_READONLY from the
7072         operands.
7073         (PROCESS_ARG): Do not clear TREE_READONLY if CONSTANT_CLASS_P.
7074         (build3_stat): Propagate TREE_READONLY for COND_EXPR.
7076 2009-06-29  Daniel Jacobowitz  <dan@codesourcery.com>
7078         * config/arm/arm.h (REGISTER_MOVE_COST): Increase VFP register
7079         move cost.
7081 2009-06-29  Uros Bizjak  <ubizjak@gmail.com>
7083         * doc/extend.texi (Additional Floating Types): __float128 is also
7084         supported on i386 targets.
7086 2009-06-29  Richard Guenther  <rguenther@suse.de>
7088         PR middle-end/14187
7089         * tree-ssa-alias.h (struct pt_solution): Add vars_contains_restrict
7090         flag.
7091         (pt_solutions_same_restrict_base): Declare.
7092         * tree-ssa-structalias.c (struct variable_info): Add is_restrict_var
7093         flag.
7094         (new_var_info): Initialize is_global_var properly for SSA_NAMEs.
7095         (make_constraint_from, make_copy_constraint): Move earlier.
7096         (make_constraint_from_heapvar): New function.
7097         (make_constraint_from_restrict): Likewise.
7098         (handle_lhs_call): Use it.
7099         (find_func_aliases): Use it to track conversions to restrict
7100         qualified pointers.
7101         (struct fieldoff): Add only_restrict_pointers flag.
7102         (push_fields_onto_fieldstack): Initialize it.
7103         (create_variable_info_for): Track global restrict qualified pointers.
7104         (intra_create_variable_infos): Use make_constraint_from_heapvar.
7105         Track restrict qualified pointer arguments.
7106         (set_uids_in_ptset): Use varinfo is_global_var flag.
7107         (find_what_var_points_to): Set the vars_contains_restrict flag.
7108         Always create the points-to solution for sets including restrict tags.
7109         (pt_solutions_same_restrict_base): New function.
7110         * tree-ssa-alias.c (ptr_derefs_may_alias_p): For two restrict
7111         qualified pointers use pt_solutions_same_restrict_base as
7112         additional source for disambiguation.
7114 2009-06-29  Richard Guenther  <rguenther@suse.de>
7116         PR middle-end/38212
7117         * alias.c (find_base_decl): Remove.
7118         (get_deref_alias_set_1): Remove restrict handling.
7119         * c-common.c (c_apply_type_quals_to_decl): Do not set
7120         DECL_POINTER_ALIAS_SET.
7121         * gimplify.c (find_single_pointer_decl_1): Remove.
7122         (find_single_pointer_decl): Likewise.
7123         (internal_get_tmp_var): Remove restrict handling.
7124         (gimple_regimplify_operands): Likewise.
7125         * omp-low.c (expand_omp_atomic_pipeline): Do not set
7126         DECL_POINTER_ALIAS_SET. Use ref-all pointers.
7127         * print-tree.c (print_node): Do not print DECL_POINTER_ALIAS_SET.
7128         * tree.c (restrict_base_for_decl): Remove.
7129         (init_ttree): Do not allocate it.
7130         (make_node_stat): Do not set DECL_POINTER_ALIAS_SET.  Set
7131         LABEL_DECL_UID for label decls.
7132         (copy_node_stat): Do not copy restrict information.
7133         (decl_restrict_base_lookup): Remove.
7134         (decl_restrict_base_insert): Likewise.
7135         (print_restrict_base_statistics): Likewise.
7136         (dump_tree_statistics): Do not call print_restrict_base_statistics.
7137         * tree.h (DECL_POINTER_ALIAS_SET): Remove.
7138         (DECL_POINTER_ALIAS_SET_KNOWN_P): Likewise.
7139         (struct tree_decl_common): Rename pointer_alias_set to label_decl_uid.
7140         (LABEL_DECL_UID): Adjust.
7141         (DECL_BASED_ON_RESTRICT_P): Remove.
7142         (DECL_GET_RESTRICT_BASE): Likewise.
7143         (SET_DECL_RESTRICT_BASE): Likewise.
7144         (struct tree_decl_with_vis): Remove based_on_restrict_p flag.
7146         * config/i386/i386.c (ix86_gimplify_va_arg): Use ref-all pointers
7147         instead of DECL_POINTER_ALIAS_SET.
7148         * config/rs6000/rs6000.c (rs6000_gimplify_va_arg): Likewise.
7149         * config/s390/s390.c (s390_gimplify_va_arg): Likewise.
7150         * config/spu/spu.c (spu_gimplify_va_arg_expr): Likewise.
7152 2009-06-29  Richard Guenther  <rguenther@suse.de>
7154         PR tree-optimization/40579
7155         * tree-vrp.c (vrp_evaluate_conditional): Bail out early if
7156         the IL to simplify has constants that overflowed.
7158 2009-06-28  Uros Bizjak  <ubizjak@gmail.com>
7160         PR tree-optimization/40550
7161         * tree-vect-generic.c (expand_vector_operations_1): Compute in
7162         vector_compute_type only when the size of vector_compute_type is
7163         less than the size of type.
7165 2009-06-28  Eric Botcazou  <ebotcazou@adacore.com>
7167         * fold-const.c (contains_label_1): Fix comments.
7168         (contains_label_p): Do not walk trees multiple time.
7170 2009-06-28  Paolo Bonzini  <bonzini@gnu.org>
7172         * config/i386/i386.h (enum ix86_fpcmp_strategy): New.
7173         * config/i386/i386.md (cbranchxf4, cstorexf4, cbranch<MODEF>4,
7174         cstore<MODEF>4, mov<X87MODEF>cc): Change predicate to
7175         ix86_fp_comparison_operator.
7176         (*fp_jcc_1_mixed, *fp_jcc_1_sse, *fp_jcc_1_387, *fp_jcc_2_mixed,
7177         *fp_jcc_2_sse, *fp_jcc_2_387): Delete
7178         (*fp_jcc_3_387, *fp_jcc_4_387, *fp_jcc_5_387, *fp_jcc_6_387,
7179         *fp_jcc_7_387, *fp_jcc_8<MODEF>_387): Eliminate call to
7180         !ix86_use_fcomi_compare, change ix86_fp_jump_nontrivial_p call
7181         to !TARGET_CMOVE, change predicate to ix86_fp_comparison_operator.
7182         (related splits): Change predicate to ix86_fp_comparison_operator.
7183         * config/i386/predicates.md: Use ix86_trivial_fp_comparison_operator
7184         instead of ix86_fp_comparison_codes.
7185         (ix86_trivial_fp_comparison_operator,
7186         ix86_fp_comparison_operator): New.
7187         * config/i386/i386-protos.h (ix86_fp_comparison_strategy): New.
7188         (ix86_expand_compare): Eliminate last two parameters.
7189         (ix86_fp_jump_nontrivial_p): Kill.
7190         * config/i386/i386.c (put_condition_code): Eliminate call to
7191         ix86_fp_comparison_codes and subsequent assertion.
7192         (ix86_fp_comparison_codes): Eliminate.
7193         (ix86_fp_swap_condition): New.
7194         (ix86_fp_comparison_arithmetics_cost, ix86_fp_comparison_fcomi_cost,
7195         ix86_fp_comparison_sahf_cost, ix86_use_fcomi_compare): Consolidate
7196         into ix86_fp_comparison_cost and ix86_fp_comparison_strategy.
7197         (ix86_prepare_fp_compare_args): Use ix86_fp_comparison_strategy
7198         and ix86_fp_swap_condition.
7199         (ix86_expand_fp_compare): Eliminate code for second jump/bypass jump.
7200         Use ix86_fp_comparison_strategy.
7201         (ix86_expand_compare): Likewise.  Eliminate last two arguments.
7202         (ix86_fp_jump_nontrivial_p): Eliminate.
7203         (ix86_expand_branch): Treat SFmode/DFmode/XFmode as simple.  Adjust
7204         call to ix86_expand_compare.
7205         (ix86_split_fp_branch, ix86_expand_setcc,
7206         ix86_expand_carry_flag_compare, ix86_expand_int_movcc,
7207         ix86_expand_fp_movcc): Eliminate code for second jump/bypass jump.
7209 2009-06-28  Paolo Bonzini  <bonzini@gnu.org>
7211         * config/arm/arm.c (arm_final_prescan_ins): Eliminate code
7212         related to jump_clobbers.
7213         * config/arm/arm.md (conds): Remove jump_clob case.
7214         (addsi3_cbranch, addsi3_cbranch_scratch, subsi3_cbranch, two
7215         splits): Change comparison_operator to arm_comparison_operator.
7216         (*arm_buneq, *arm_bltgt, *arm_buneq_reversed, *arm_bltgt_reversed):
7217         Eliminate.
7219 2009-06-28  Paolo Bonzini  <bonzini@gnu.org>
7221         * dojump.c (do_compare_rtx_and_jump): Try swapping the
7222         condition for floating point modes.
7223         * expmed.c (emit_store_flag_1): Move here a bigger part
7224         of emit_store_flag.
7225         (emit_store_flag): Try swapping the condition for floating point
7226         modes.
7227         * optabs.c (emit_cmp_and_jump_insns): Cope with constant op0 better.
7229 2009-06-28  Paolo Bonzini  <bonzini@gnu.org>
7231         * expr.c (expand_expr_real_1): Just use do_store_flag.
7232         (do_store_flag): Drop support for TRUTH_NOT_EXPR.  Use
7233         emit_store_flag_force.
7234         * expmed.c (emit_store_flag_force): Copy here trick
7235         previously in expand_expr_real_1.  Try reversing the comparison.
7236         (emit_store_flag_1): Work if target is NULL.
7237         (emit_store_flag): Work if target is NULL, using the result mode
7238         from the comparison.  Use split_comparison, restructure final part
7239         to simplify conditionals.
7241 2009-06-28  Paolo Bonzini  <bonzini@gnu.org>
7243         * builtins.c (expand_errno_check): Use do_compare_rtx_and_jump.
7244         * dojump.c (do_jump): Change handling of floating-point
7245         ops to use just do_compare_and_jump.
7246         (split_comparison): New.
7247         (do_compare_rtx_and_jump): Add here logic coming previously
7248         in do_jump, using split_comparison.
7250 2009-06-27  H.J. Lu  <hongjiu.lu@intel.com>
7252         PR target/40489
7253         * config/ia64/ia64.c (ia64_reorg): Check NULL insn.
7255 2009-06-27  Paolo Bonzini  <bonzini@gnu.org>
7257         * tree-ssa-alias.c: Fix unintentional commit.
7259 2009-06-27  Paolo Bonzini  <bonzini@gnu.org>
7261         * passes.c (execute_one_pass): Fix unintentional commit.
7263 2009-06-27  Paolo Bonzini  <bonzini@gnu.org>
7265         * df-problems.c (df_set_seen, df_unset_seen): Delete.
7266         (df_rd_local_compute, df_md_local_compute): Inline them.
7268         (df_md_scratch): New.
7269         (df_md_alloc, df_md_free): Allocate/free it.
7270         (df_md_local_compute): Only include live registers in init.
7271         (df_md_transfer_function): Prune the in-set computed by
7272         the confluence function, and the gen-set too.
7274 2009-06-27  Paolo Bonzini  <bonzini@gnu.org>
7276         PR rtl-optimization/26854
7277         * timevar.def: Remove TV_DF_RU, add TV_DF_MD.
7278         * df-problems.c (df_rd_add_problem): Fix comment.
7279         (df_md_set_bb_info, df_md_free_bb_info, df_md_alloc,
7280         df_md_simulate_artificial_defs_at_top,
7281         df_md_simulate_one_insn, df_md_bb_local_compute_process_def,
7282         df_md_bb_local_compute, df_md_local_compute, df_md_reset,
7283         df_md_transfer_function, df_md_init, df_md_confluence_0,
7284         df_md_confluence_n, df_md_free, df_md_top_dump, df_md_bottom_dump,
7285         problem_MD, df_md_add_problem): New.
7286         * df.h (DF_MD, DF_MD_BB_INFO, struct df_md_bb_info, df_md,
7287         df_md_get_bb_info): New.
7288         (DF_LAST_PROBLEM_PLUS1): Adjust.
7290         * Makefile.in (fwprop.o): Include domwalk.h.
7291         * fwprop.c: Include domwalk.h.
7292         (reg_defs, reg_defs_stack): New.
7293         (bitmap_only_bit_between): Remove.
7294         (process_defs): New.
7295         (process_uses): Use reg_defs and local_md instead of
7296         bitmap_only_bit_between and local_rd.
7297         (single_def_use_enter_block): New, from build_single_def_use_links.
7298         (single_def_use_leave_block): New.
7299         (build_single_def_use_links): Remove code moved to
7300         single_def_use_enter_block, invoke domwalk.
7301         (use_killed_between): Adjust comment.
7303 2009-06-27  Paolo Bonzini  <bonzini@gnu.org>
7305         * bitmap.h (bitmap_ior_and_into): New.
7306         * bitmap.c (bitmap_ior_and_into): New.
7308 2009-06-27  Paolo Bonzini  <bonzini@gnu.org>
7310         * domwalk.h (struct dom_walk_data): Remove all callbacks except
7311         before_dom_children_before_stmts and after_dom_children_after_stmts.
7312         Rename the two remaining callbacks to just before_dom_children and
7313         after_dom_children. Remove other GIMPLE statement walking bits.
7314         * domwalk.c (walk_dominator_tree): Remove now unsupported features.
7315         * graphite.c: Do not include domwalk.h.
7316         * tree-into-ssa.c (interesting_blocks): New global.
7317         (struct mark_def_sites_global_data): Remove it and names_to_rename.
7318         (mark_def_sites, rewrite_stmt, rewrite_add_phi_arguments,
7319         rewrite_update_stmt, rewrite_update_phi_arguments): Simplify
7320         now that they're not domwalk callbacks.
7321         (rewrite_initialize_block): Rename to...
7322         (rewrite_enter_block): ... this, place after called functions.  Test
7323         interesting_blocks, call rewrite_stmt and rewrite_add_phi_arguments.
7324         (rewrite_finalize_block): Rename to...
7325         (rewrite_leave_block): ... this, place after called functions.
7326         (rewrite_update_init_block): Rename to...
7327         (rewrite_update_enter_block): ... this, place after called functions.
7328         Test interesting_blocks, call rewrite_update_stmt and
7329         rewrite_update_phi_arguments.
7330         (rewrite_update_fini_block): Rename to...
7331         (rewrite_leave_block): ... this, place after called functions.
7332         (rewrite_blocks): Remove last argument, simplify initialization of
7333         walk_data.
7334         (mark_def_sites_initialize_block): Rename to...
7335         (mark_def_sites_block): ... this, call mark_def_sites.
7336         (mark_def_sites_blocks): Remove argument, simplify initialization of
7337         walk_data.
7338         (rewrite_into_ssa): Adjust for interesting_blocks_being a global.
7339         (update_ssa): Likewise.
7340         * tree-ssa-dom.c (optimize_stmt): Simplify now that it's not a domwalk
7341         callback.
7342         (tree_ssa_dominator_optimize): Simplify initialization of walk_data.
7343         (dom_opt_initialize_block): Rename to...
7344         (dom_opt_enter_block): ... this, place after called functions.  Walk
7345         statements here, inline propagate_to_outgoing_edges.
7346         (dom_opt_finalize_block): Rename to...
7347         (dom_opt_leave_block): ... this, place after called functions.
7348         * tree-ssa-dse.c (dse_optimize_stmt): Simplify now that it's not a
7349         domwalk callback.
7350         (dse_enter_block, dse_record_phi): New.
7351         (dse_record_phis): Delete.
7352         (dse_finalize_block): Rename to...
7353         (dse_leave_block): ... this.
7354         (tree_ssa_dse): Simplify initialization of walk_data.
7355         * tree-ssa-loop-im.c (determine_invariantness, move_computations):
7356         Adjust initialization of walk_data.
7357         * tree-ssa-loop-unswitch.c: Do not include domwalk.h.
7358         * tree-ssa-loop-phiopt.c (get_non_trapping):
7359         Adjust initialization of walk_data.
7360         * tree-ssa-loop-threadedge.c: Do not include domwalk.h.
7361         * tree-ssa-uncprop.c (uncprop_into_successor_phis): Simplify now that
7362         it's not a domwalk callback.
7363         (uncprop_initialize_block): Rename to...
7364         (dse_enter_block): ... this, call uncprop_into_successor_phis.
7365         (dse_finalize_block): Rename to...
7366         (dse_leave_block): ... this.
7367         (tree_ssa_uncprop): Simplify initialization of walk_data.
7368         * Makefile.in: Adjust dependencies.
7370 2009-06-27  Richard Earnshaw  <rearnsha@arm.com>
7372         * arm.md (casesi): Fix test for Thumb1.
7373         (thumb1_casesi_internal_pic): Likewise.
7374         (thumb1_casesi_dispatch): Likewise.
7376 2009-06-26  Daniel Gutson  <dgutson@codesourcery.com>
7378         * config/arm/arm-cores.def: Added core cortex-m0.
7379         * config/arm/arm-tune.md: Regenerated.
7380         * doc/invoke.texi: Added entry for cpu ARM Cortex-M0.
7382 2009-06-26  DJ Delorie  <dj@redhat.com>
7384         * config/mep/mep.opt (mfar): Remove -mfar as it doesn't do anything.
7386         * config/mep/mep.c (mep_bundle_insns): Account for the fact that
7387         the scheduler doesn't tag jump insns.
7389 2009-06-26  H.J. Lu  <hongjiu.lu@intel.com>
7391         * c-decl.c (merge_decls): Re-indent.
7393 2009-06-26  Janis Johnson  <janis187@us.ibm.com>
7395         PR c/39902
7396         * tree.c (real_zerop, real_onep, real_twop, real_minus_onep):
7397         Special-case decimal float constants.
7399 2009-06-26  Richard Henderson  <rth@redhat.com>
7401         * function.h (struct function): Add cannot_be_copied_reason,
7402         and cannot_be_copied_set.
7403         * tree-inline.c (has_label_address_in_static_1): Rename from
7404         inline_forbidden_p_2; don't set inline_forbidden_reason here.
7405         (cannot_copy_type_1): Rename from inline_forbidden_p_op; likewise
7406         don't set inline_forbidden_reason.
7407         (copy_forbidden): New function, split out of inline_forbidden_p.
7408         (inline_forbidden_p_stmt): Don't check for nonlocal labels here.
7409         (inline_forbidden_p): Use copy_forbidden.
7410         (tree_versionable_function_p): Likewise.
7411         (inlinable_function_p): Merge into tree_inlinable_function_p.
7412         (tree_function_versioning): Remap cfun->nonlocal_goto_save_area.
7413         * ipa-cp.c (ipcp_versionable_function_p): New function.
7414         (ipcp_cloning_candidate_p): Use it.
7415         (ipcp_node_modifiable_p): Likewise.
7417 2009-06-26  Olatunji Ruwase  <tjruwase@google.com>
7419         * builtins.c (expand_builtin_alloca): Handle builtin alloca
7420         that is marked not to be inlined. Remove flag_mudflap use.
7421         * tree-mudflap.c: Rename mf_xform_derefs to mf_xfrom_statements.
7422         (mf_xform_statements): Mark builtin alloca calls as un-inlineable.
7424 2009-06-26  Steve Ellcey  <sje@cup.hp.com>
7426         PR bootstrap/40338
7427         * config/pa/t-pa-hpux10 (TARGET_LIBGCC2_CFLAGS): Add -frandom-seed.
7428         * config/pa/t-pa-hpux11 (TARGET_LIBGCC2_CFLAGS): Ditto.
7430 2009-06-26  Kai Tietz  <kai.tietz@onevision.com>
7432         * config/i386/mingw-tls.c (__mingwthr_key_dtor): Remove for none
7433         shared libgcc.
7434         (__mingwthr_remove_key_dtor): Likewise.
7436 2009-06-26  Richard Guenther  <rguenther@suse.de>
7438         * tree-ssa-structalias.c (do_ds_constraint): Simplify escape handling.
7440 2009-06-26  Steven Bosscher  <steven@gcc.gnu.org>
7442         PR middle-end/40525
7443         * ifcvt.c (dead_or_predicable): If predicating MERGE_BB fails,
7444         try the non-cond_exec path also.
7446 2009-06-25  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
7448         PR target/40468
7449         * pa.c (branch_to_delay_slot_p, branch_needs_nop_p): New functions.
7450         (output_cbranch): Use new functions.
7451         (output_lbranch, output_bb, output_bvb, output_dbra, output_movb):
7452         Likewise.
7454 2009-06-25  Michael Meissner  <meissner@linux.vnet.ibm.com>
7455             Pat Haugen  <pthaugen@us.ibm.com>
7456             Revital Eres <ERES@il.ibm.com>
7458         * config/rs6000/rs6000.c (print_operand): Correct lossage message
7459         for %c error.  Add %x support to print VSX registers as a unified
7460         register set, instead of separate float and altivec registers.
7461         Switch to use VECTOR_MEM_ALTIVEC_P instead of TARGET_ALTIVEC for
7462         %y case, and add support for VSX pre-modify addresses.
7463         (output_toc): Add assert for CONST containing an integer constant
7464         in the PLUS case.
7465         (rs6000_adjust_cost): Add POWER7 support.
7466         (insn_must_be_first_in_group): Ditto.
7467         (insn_must_be_last_in_group): Ditto.
7468         (rs6000_emit_popcount): Ditto.
7469         (rs6000_vector_mode_supported_p): Ditto.
7471         * config/rs6000/rs6000-protos.h (rs6000_secondary_reload_class):
7472         Change some of the functions called by macros to being called
7473         through a pointer, so debug functions can be inserted if
7474         -mdebug=addr or -mdebug=cost.
7475         (rs6000_preferred_reload_class_ptr): Ditto.
7476         (rs6000_secondary_reload_class_ptr): Ditto.
7477         (rs6000_secondary_memory_needed_ptr): Ditto.
7478         (rs6000_cannot_change_mode_class_ptr): Ditto.
7479         (rs6000_secondary_reload_inner): Ditto.
7480         (rs6000_legitimize_reload_address): Ditto.
7481         (rs6000_legitimize_reload_address_ptr): Ditto.
7482         (rs6000_mode_dependent_address): Ditto.
7483         (rs6000_mode_dependent_address_ptr): Ditto.
7485         * config/rs6000/rs6000.c (reg_offset_addressing_ok_p): New
7486         function to return true if the mode allows reg + integer
7487         addresses.
7488         (virtual_stack_registers_memory_p): New function to return true if
7489         the address refers to a virtual stack register.
7490         (rs6000_legitimate_offset_address_p): Move code to say whether a
7491         mode supports reg+int addressing to reg_offset_addressing_ok_p and
7492         call it.
7493         (rs6000_legitimate_address_p): Add checks for modes that only can
7494         do reg+reg addressing.  Start adding VSX support.
7495         (rs6000_legitimize_reload_address): Ditto.
7496         (rs6000_legitimize_address): Ditto.
7497         (rs6000_debug_legitimate_address_p): New debug functions for
7498         -mdebug=addr and -mdebug=cost.
7499         (rs6000_debug_rtx_costs): Ditto.
7500         (rs6000_debug_address_costs): Ditto.
7501         (rs6000_debug_adjust_cost): Ditto.
7502         (rs6000_debug_legitimize_address): Ditto.
7503         (rs6000_legitimize_reload_address_ptr): Point to call normal
7504         function or debug function.  Make functions called via pointer
7505         static.
7506         (rs6000_mode_dependent_address_ptr): Ditto.
7507         (rs6000_secondary_reload_class_ptr): Ditto.
7508         (rs6000_hard_regno_mode_ok): Add preliminary VSX support.
7509         (rs6000_emit_move): Add -mdebug=addr support.  Change an abort
7510         into a friendlier error.
7511         (rs6000_init_builtins): Add initial VSX support.
7512         (rs6000_adjust_cost): Fix some spacing issues.
7514         * config/rs6000/rs6000.h (enum reg_class): Add VSX_REGS.
7515         (REG_CLASS_NAMES): Ditto.
7516         (REG_CLASS_CONTENTS): Ditto.
7517         (PREFERRED_RELOAD_CLASS): Move from a macro to calling through a
7518         pointer, to add -mdebug=addr support.
7519         (CANNOT_CHANGE_MODE_CLASS): Ditto.
7520         (SECONDARY_RELOAD_CLASS): Call through a pointer to add
7521         -mdebug=addr support.
7522         (LEGITIMIZE_RELOAD_ADDRESS): Ditto.
7523         (GO_IF_MODE_DEPENDENT_ADDRESS): Ditto.
7524         (enum rs6000_builtins): Add RS6000_BUILTIN_BSWAP_HI.
7526         * config/rs6000/rs6000.md (bswaphi*): Add support for swapping
7527         16-bit values.
7528         (bswapsi*): Set attribute types for load/store.  Add combiner
7529         patterns to eliminate zero extend on 64-bit.
7530         (bswapdi*): Add support for swapping 64-bit values.  Use ldbrx and
7531         stdbrx if the hardware supports those instructions.
7533 2009-06-25  Ian Lance Taylor  <iant@google.com>
7535         * doc/invoke.texi (Option Summary): Mention -static-libstdc++.
7536         (Link Options): Document -static-libstdc++.
7538 2009-06-25  Andrew Pinski  <andrew_pinski@playstation.sony.com>
7540         PR target/38731
7541         * config/rs6000/rs6000.c (LOCAL_ALIGNMENT): Redefine to just use
7542         DATA_ALIGNMENT instead.
7544 2009-06-25  Richard Guenther  <rguenther@suse.de>
7546         * tree-ssa-alias.c (ref_maybe_used_by_call_p_1): Disambiguate
7547         indirect references against the callused/escaped solutions.
7548         (call_may_clobber_ref_p_1): Likewise.
7550 2009-06-25  Martin Jambor  <mjambor@suse.cz>
7552         PR tree-optimization/40493
7553         * tree-sra.c (sra_modify_expr): Correct BIT_FIELD_REF argument numbers.
7554         (enum unscalarized_data_handling): New type.
7555         (handle_unscalarized_data_in_subtree): Return what has been done.
7556         (load_assign_lhs_subreplacements): Handle left flushes differently.
7557         (sra_modify_assign): Use unscalarized_data_handling, simplified
7558         condition determining whether to remove the statement.
7560 2009-06-25  Basile Starynkevitch  <basile@starynkevitch.net>
7562         * doc/plugins.texi (Building GCC plugins): Correct typo in Makefile
7563         excerpt - @ should be doubled for texinfo.
7565 2009-06-24  Ian Lance Taylor  <iant@google.com>
7567         * config/arc/arc.c: Include "df.h".
7568         (arc_attribute_table): Make static.  Move higher in file.
7569         (arc_address_cost): Call SMALL_INT on INTVAL, not rtx.
7570         (output_shift): Initialize n later to avoid warning.
7571         * config/arm/arm.c (arm_attribute_table): Make static.  Move
7572         higher in file.
7573         * config/avr/avr.c (avr_attribute_table): Make static.  Move
7574         higher in file.
7575         (reg_class_tab): Change array type from int to enum reg_class.
7576         (avr_jump_mode): Change GET_MODE to GET_CODE when checking for
7577         LABEL_REF.
7578         (out_tsthi, ashlhi3_out): Don't use AS2 with "or" or "and".
7579         (lshrhi3_out): Likewise.
7580         (class_likely_spilled_p): Change return type to bool.
7581         (avr_rtx_costs): Use local code variable with enum type.
7582         * config/avr/avr.md (movmemhi): Use add_reg_note.
7583         (andhi3, andsi3): Don't use AS2 with "and".
7584         (iorhi3, iorsi3): Don't use AS2 with "or".
7585         * config/avr/avr-protos.h (class_likely_spilled_p): Update declaration.
7586         * config/crx/crx.c: Include "df.h".
7587         (crx_attribute_table): Make static.
7588         * config/m32r/m32r.c: Include "df.h".
7589         (m32r_attribute_table): Make static.  Move higher in file.
7590         (pop): Use add_reg_note.
7591         (block_move_call): Change 0 to LCT_NORMAL in function call.
7592         * config/m32r/m32r.md (movsi_insn): Remove unused local value.
7593         * config/m32r/m32r.h (INITIALIZE_TRAMPOLINE): Likewise.
7594         * config/m32r/m32r-protos.h (m32r_compute_function_type): Always
7595         declare, not just when TREE_CODE is defined.
7596         * config/m68hc11/m68hc11.c: Include "expr.h".
7597         (m68hc11_attribute_table): Make static.  Move higher in file.
7598         (m68hc11_small_indexed_indirect_p): Change 0 to VOIDmode in
7599         function call.
7600         (m68hc11_register_indirect_p): Likewise.
7601         (m68hc11_function_arg_padding): Change return type to enum
7602         direction.
7603         (emit_move_after_reload): Use add_reg_note.
7604         (m68hc11_emit_logical): Change code parameter to enum rtx_code.
7605         (m68hc11_split_logical): Likewise.
7606         (m68hc11_rtx_costs): Add local code_and outer_code variables with
7607         enum type.
7608         * config/m68hc11/predicates.md (reg_or_some_mem_operand): Change 0
7609         to VOIDmode in function call.
7610         * config/m68hc11/m68hc11-protos.h: Don't check TREE_CODE to see if
7611         tree is defined.
7612         (m68hc11_split_logical): Update declaration.
7613         (m68hc11_function_arg_padding): Update declaration.
7614         * config/mcore/mcore.c (regno_reg_class): Change form array of int
7615         to array of enum reg_class.
7616         (mcore_attribute_table): Make static.  Move higher in file.
7617         (mcore_rtx_costs): Add cast to enum type.
7618         * config/mcore/mcore.h (regno_reg_class): Update declaration.
7619         (GO_IF_LEGITIMATE_INDEX): Add cast to avoid warning.
7620         * config/sh/sh.c (sh_attribute_table): Make static.  Move higher
7621         in file.
7622         * config/sh/predicates.md (trapping_target_operand): Rename and to
7623         and_expr.
7624         * config/sparc/sparc.c (sparc_attribute_table): Make static.  Move
7625         higher in file.
7626         * config/spu/spu.c (spu_attribute_table): Make static.  Move
7627         higher in file.
7628         * config/v850/v850.c (v850_attribute_table): Make static.  Move
7629         higher in file.
7630         (v850_rtx_costs): Use local code with enum type.
7631         (expand_epilogue): Add cast.
7632         * config/v850/v850-c.c (ghs_pragma_section): Initialize repeat.
7634 2009-06-23  Takashi YOSHII  <yoshii.takashi@renesas.com>
7636         PR target/40515
7637         * doc/invoke.texi (SH Options): Document -m2a, -m2a-single,
7638         -m2a-single-only and -m2a-nofpu.
7639         * config/sh/sh.opt: Document m2a generates FPU code.
7641 2009-06-24  Anatoly Sokolov  <aesok@post.ru>
7643         * defaults.h (CAN_ELIMINATE): Provide default.
7644         * doc/tm.texi (CAN_ELIMINATE): Revise documentation.
7645         * config/alpha/alpha.h (CAN_ELIMINATE): Delete.
7646         * config/m32c/m32c.h (CAN_ELIMINATE): Delete.
7647         * config/spu/spu.h (CAN_ELIMINATE): Delete.
7648         * config/xtensa/xtensa.h (CAN_ELIMINATE): Delete.
7649         * config/moxie/moxie.h (CAN_ELIMINATE): Delete.
7650         * config/cris/cris.h (CAN_ELIMINATE): Delete.
7651         * config/mn10300/mn10300.h (CAN_ELIMINATE): Delete.
7652         * config/pa/pa64-linux.h (CAN_ELIMINATE): Delete.
7653         * config/mmix/mmix.h (CAN_ELIMINATE): Delete.
7655 2009-06-24  DJ Delorie  <dj@redhat.com>
7657         * mep-ext-cop.cpu: Fix copyright notice.
7658         * mep-default: Fix copyright notice.
7659         * mep-core: Fix copyright notice.
7660         * mep: Fix copyright notice.
7661         * mep-ivc2: Fix copyright notice.
7662         * mep-c5: Fix copyright notice.
7664 2009-06-24  Denis Chertykov  <chertykov@gmail.com>
7666         * doc/contrib.texi (Contributors):
7668 2009-06-24  Andreas Krebbel  <krebbel1@de.ibm.com>
7670         PR middle-end/40501
7671         * tree-ssa-math-opts.c (execute_optimize_bswap): Convert the bswap
7672         src and dst operands if necessary.
7674 2009-06-23  DJ Delorie  <dj@redhat.com>
7676         Add MeP port.
7677         * config.gcc: Add mep support.
7678         * recog.c: Resurrect validate_replace_rtx_subexp().
7679         * recog.h: Likewise.
7680         * config/mep/: Add new port:
7681         * config/mep/constraints.md: New file.
7682         * config/mep/default.h: New file.
7683         * config/mep/intrinsics.h: New file.
7684         * config/mep/intrinsics.md: New file.
7685         * config/mep/ivc2-template.h: New file.
7686         * config/mep/mep-c5.cpu: New file.
7687         * config/mep/mep-core.cpu: New file.
7688         * config/mep/mep-default.cpu: New file.
7689         * config/mep/mep-ext-cop.cpu: New file.
7690         * config/mep/mep-intrin.h: New file.
7691         * config/mep/mep-ivc2.cpu: New file.
7692         * config/mep/mep-lib1.asm: New file.
7693         * config/mep/mep-lib2.c: New file.
7694         * config/mep/mep-pragma.c: New file.
7695         * config/mep/mep-protos.h: New file.
7696         * config/mep/mep-tramp.c: New file.
7697         * config/mep/mep.c: New file.
7698         * config/mep/mep.cpu: New file.
7699         * config/mep/mep.h: New file.
7700         * config/mep/mep.md: New file.
7701         * config/mep/mep.opt: New file.
7702         * config/mep/predicates.md: New file.
7703         * config/mep/t-mep: New file.
7705 2009-06-23  Ian Lance Taylor  <iant@google.com>
7707         * configure.ac: Invoke AC_PROG_CXX.  Separate C specific warnings
7708         from loose_warn into c_loose_warn and from strict_warn into
7709         c_strict_warn.  Set and substitute warn_cxxflags.  Check for
7710         --enable-build-with-cxx.  Set and substitute
7711         ENABLE_BUILD_WITH_CXX.  Set and substitute HOST_LIBS.
7712         * Makefile.in (CXXFLAGS): New variable.
7713         (C_LOOSE_WARN, C_STRICT_WARN): New variables.
7714         (GCC_WARN_CFLAGS): Add $(C_LOOSE_WARN).  Add $(C_STRICT_WARN) if
7715         the default is the same as $(STRICT_WARN).
7716         (GCC_WARN_CXXFLAGS, WARN_CXXFLAGS): New variables.
7717         (CXX): New variable.
7718         (COMPILER): New value if ENABLE_BUILD_WITH_CXX.
7719         (COMPILER_FLAGS, LINKER, LINKER_FLAGS): Likewise.
7720         (ALL_COMPILERFLAGS, ALL_LINKERFLAGS): Likewise.
7721         (HOST_LIBS): New variable.
7722         (GCC_CFLAGS): Add $(C_LOOSE_WARN).
7723         (ALL_CXXFLAGS): New variable.
7724         (LIBS, BACKENDLIBS): Add $(HOST_LIBS).
7725         * doc/install.texi (Configuration): Document
7726         --enable-build-with-cxx, --with-stage1-ldflags,
7727         --with-stage1-libs, --with-boot-ldflags, --with-boot-libs.
7728         * configure: Rebuild.
7730 2009-06-24  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
7732         * config/arm/arm.c (arm_override_options): Fix braces and formatting
7733         from previous commit.
7735 2009-06-23  Ian Lance Taylor  <iant@google.com>
7737         * Makefile.in ($(out_object_file)): Depend upon $(DF_H).
7739 2009-06-23  Ian Lance Taylor  <iant@google.com>
7741         * reload.c (alternative_allows_const_pool_ref): Mark mem parameter
7742         with ATTRIBUTE_UNUSED.
7744 2009-06-23  Michael Meissner  <meissner@linux.vnet.ibm.com>
7745             Pat Haugen  <pthaugen@us.ibm.com>
7746             Revital Eres  <eres@il.ibm.com>
7748         * config.in (HAVE_AS_POPCNTD): Add default definition.
7749         (HAVE_AS_LWSYNC): Ditto.
7751         * configure.ac (gcc_cv_as_powerpc_mfpgpr): Provide real binutils
7752         release number.
7753         (gcc_cv_as_powerpc_cmpb): Ditto.
7754         (gcc_cv_as_powerpc_dfp): Ditto.
7755         (gcc_cv_as_powerpc_vsx): Ditto.
7756         (gcc_cv_as_powerpc_popcntd): Add feature test for assembler
7757         supporting the popcntd/lwsync instructions.
7758         (gcc_cv_as_powerpc_lwsync): Ditto.
7759         * configure: Regenerate.
7761         * config/rs6000/aix53.h (ASM_CPU_SPEC): Add support for
7762         -mcpu=native and -mcpu=power7.
7763         * config/rs6000/aix61.h (ASM_CPU_SPEC): Ditto.
7765         * config/rs6000/linux64.opt (-mprofile-kernel): Move switch to be
7766         a variable instead of a mask to reduce the number of mask bits.
7767         * config/rs6000/sysv4.opt (-mbit-align): Ditto.
7768         (-mbit-word): Ditto.
7769         (-mregnames): Ditto.
7770         * config/rs6000/rs6000.opt (-mupdate): Ditto.
7771         (-mfused-madd): Ditto.
7773         * config/rs6000/rs6000.opt (-mpopcntd): New switch for non-VSX ISA
7774         2.06 instructions.
7775         (-mvsx): New switch for VSX instructions.
7776         (-misel): Move from a variable to a mask to allow it to be set by
7777         -mcpu=.
7779         * config/rs6000/rs6000-protos.h (rs6000_hard_regno_nregs): Change
7780         function declaration to an array declaration.
7781         (rs6000_hard_regno_nregs): New external array declaration.
7783         * config/rs6000/t-rs6000 (MD_INCLUDES): Define, add all of the .md
7784         files included by rs6000.md.
7786         * config/rs6000/linux64.h (SUBSUBTARGET_OVERRIDE_OPTIONS): Use
7787         SET_PROFILE_KERNEL macro to reset the -mprofile-kernel switch.
7789         * config/rs6000/rs6000.c (rs6000_isel): Delete, -misel moved to be
7790         a target mask.
7791         (rs6000_debug_reg): New -mdebug= variables.
7792         (rs6000_debug_addr): Ditto.
7793         (rs6000_debug_cost): Ditto.
7794         (rs6000_pmode): New variable to hold Pmode.
7795         (rs6000_pointer_size): New variable to hold POINTER_SIZE.
7796         (rs6000_class_max_nregs): New array to hold CLASS_MAX_NREGS
7797         calculated at compiler start.
7798         (rs6000_hard_regno_nregs): Change function to an array which holds
7799         HARD_REGNO_NREGS calculated at compiler start.
7800         (rs6000_explicit_options): Delete isel field.
7801         (rs6000_vector_unit): New array to hold which vector unit
7802         supports arithmetic options for a given type.
7803         (rs6000_vector_mem): New array to hold which vector unit supports
7804         memory reference operations for a given type.
7805         (rs6000_vector_align): New array to given the alignment of each
7806         vector type.
7807         (power7_cost): New basic costs for power7.
7808         (SET_PROFILE_KERNEL): New macro for resetting -mprofile-kernel.
7809         (rs6000_hard_regno_nregs_internal): New function, moved from
7810         HARD_REGNO_NREGS, to calculate the number of registers each hard
7811         register takes for each type.
7812         (rs6000_debug_reg_print): New function for -mdebug=reg support.
7813         (rs6000_debug_vector_unit): New array, map rs6000_vector to string.
7814         (+rs6000_init_hard_regno_mode_ok): New function, move calculation
7815         of HARD_REGNO_NREGS, CLASS_MAX_NREGS, REGNO_REG_CLASS, and vector
7816         unit information here so it is calculated once at compiler startup
7817         time.
7818         (rs6000_override_options): Make -misel a target mask.  Add more
7819         power7 target masks.  Setup Pmode and POINTER_SIZE.  Add initial
7820         VSX support.  Add support for -mdebug=reg, -mdebug=addr, and
7821         -mdebug=cost.
7822         (POWERPC_MASKS): Add MASK_POPCNTD, MASK_VSX, and MASK_ISEL.
7823         (rs6000_handle_option): Move -misel from variable to target mask.
7824         (rs6000_builtin_mask_for_load): Add VSX support.
7825         (rs6000_conditional_register_usage): Ditto.
7826         (USE_ALTIVEC_FOR_ARG_P): Ditto.
7827         (function_arg_boundary): Ditto.
7828         (rs6000_expand_builtin): Ditto.
7829         (def_builtin): Make abort message a little friendlier.
7830         (rs6000_emit_int_cmove): Add support for 64-bit isel.
7832         * config/rs6000/rs6000.h (ASM_CPU_POWER7_SPEC): Depend on the
7833         assembler support the popcntd instruction instead of a vsx
7834         instruction to enable power7 support.
7835         (ASM_CPU_SPEC): Add support for -mcpu=native and -mcpu=power7.
7836         (EXTRA_SPECS): Add ASM_CPU_NATIVE_SPEC to allow passing the right
7837         option to the assembler if -mcpu=native.
7838         (ASM_CPU_NATIVE_SPEC): Ditto.
7839         (TARGET_POPCNTD): If assembler doesn't support popcntd, turn off
7840         ISA 2.06 features.
7841         (TARGET_LWSYNC_INSTRUCTION): Define whether it is safe to issue
7842         the lwsync instruction.
7843         (enum processor_type): Add PROCESSOR_POWER7.
7844         (rs6000_debug_reg): New -mdebug= options.
7845         (rs6000_debug_addr): Ditto.
7846         (rs6000_debug_cost): Ditto.
7847         (rs6000_isel): Delete.
7848         (enum rs6000_vector): New enum to say what vector unit we have.
7849         (VECTOR_UNIT_*): New macros to say which vector unit has
7850         arithmetic operations for a given type.
7851         (VECTOR_MEM_*): New macros to say which vector unit has memory
7852         operations for a given type.
7853         (TARGET_LDBRX): Whether the machine supports the ldbrx
7854         instruction.
7855         (TARGET_ISEL): Delete, -misel moved to be a mask.
7856         (TARGET_ISEL64): New macro for 64-bit isel support.
7857         (UNITS_PER_VSX_WORD): New macro.
7858         (POINTER_SIZE): Move to be an external variable, rather than
7859         calculating whether we are generating 32 ot 64-bit code.
7860         (Pmode): Ditto.
7861         (STACK_BOUNDARY): Add VSX support.
7862         (LOCAL_ALIGNMENT): Ditto.
7863         (SLOW_UNALIGNED_ACCESS): Ditto.
7864         (VSX_REGNO_P): New macro for VSX support.
7865         (VFLOAT_REGNO_P): Ditto.
7866         (VINT_REGNO_P): Ditto.
7867         (VLOGICAL_REGNO_P): Ditto.
7868         (VSX_VECTOR_MODE): Ditto.
7869         (VSX_SCALAR_MODE): Ditto.
7870         (VSX_MODE): Ditto.
7871         (VSX_MOVE_MODE): Ditto.
7872         (VSX_REG_CLASS_P): Ditto.
7873         (HARD_REGNO_NREGS): Instead of calling a function, use an array
7874         lookup.
7875         (UNITS_PER_SIMD_WORD): Add VSX support.
7876         (MODES_TIEABLE_P): Ditto.
7877         (STARTING_FRAME_OFFSET): Ditto.
7878         (STACK_DYNAMIC_OFFSET): Ditto.
7879         (EPILOGUE_USES): Ditto.
7880         (REGNO_REG_CLASS): Move to array lookup.
7881         (CLASS_MAX_NREGS): Ditto.
7882         (rs6000_vector_reg_class): Add declaration.
7883         (ADDITIONAL_REGISTER_NAMES): Add VSX names for the registers that
7884         overlap with the floating point and Altivec registers.
7886         * config/rs6000/e500.h (CHECK_E500_OPTIONS): Disallow -mvsx.
7888         * config/rs6000/driver-rs6000.c (asm_names): New static array to
7889         give the appropriate asm switches if -mcpu=native.
7890         (host_detect_local_cpu): Add support for "asm".
7891         (host_detect_local_cpu): Follow GNU code guidelines for name.
7893         * config/rs6000/sysv4.h (SUBTARGET_OVERRIDE_OPTIONS): Move
7894         -mbit-word to a variable instead of being a target mask.
7896         * config/rs6000/sync.md (lwsync): If the assembler supports it,
7897         emit the lwsync instruction instead of emitting the instruction as
7898         an integer constant.
7900         * config/rs6000/spe.md (spe_fixuns_truncdfsi2): Rename from
7901         fixuns_trundfsi2, move expander into rs6000.md.
7903         * config/rs6000/rs6000.md (cpu): Add power7.
7904         (sel, *ptrsize): New mode attributes for 32/64-bit isel.
7905         (logical predicate patterns): Change the single instruction
7906         primitives that set CR0 to be fast_compare instead of compare.
7907         (norsi*): Ditto.
7908         (popcntwsi2): Add support for ISA 2.06 popcount instructions.
7909         (popcntddi2): Ditto.
7910         (popcount<mode>): Ditto.
7911         (floating multiply/add insns): Name the floating point
7912         multiply/add insns.
7913         (isel_signed_<mode>): Add support for -misel on 64-bit systems.
7914         (isel_unsigned_<mode>): Ditto.
7915         (fixuns_trundfsi2): Move expander here from spe.md.
7916         (smindi3): Define if we have -misel on 64-bit systems.
7917         (smaxdi3): Ditto.
7918         (umindi3): Ditto.
7919         (umaxdi3): Ditto.
7921 2009-06-23  Anatoly Sokolov  <aesok@post.ru>
7923         * config.gcc (avr-*-rtems*, avr-*-*): Set extra_gcc_objs and
7924         extra_objs.
7925         * config/avr/avr.c (avr_current_device): New variable.
7926         (avr_arch_types, avr_mcu_types): Move to avr-deveces.c.
7927         (avr_arch, mcu_type_s): Move to avr.h.
7928         * config/avr/avr.h (base_arch_s). Add reserved2, arch_name and
7929         default_data_section_start fields.
7930         (avr_arch): Moved from avr.c.
7931         (mcu_type_s): Moved from avr.c. Add short_sp, data_section_start and
7932         library_name fields.
7933         (avr_current_device, avr_mcu_types, avr_arch_types,
7934         avr_device_to_arch, avr_device_to_data_start,
7935         avr_device_to_startfiles, avr_device_to_devicelib): Declare.
7936         (EXTRA_SPEC_FUNCTIONS): Define.
7937         (LINK_SPEC): Remove device name to '-m ...' and '-Tdata ...' linker
7938         options mapping. Use device_to_arch and device_to_data_start insted.
7939         (STARTFILE_SPEC): Use device_to_startfile instead of crt_binutils.
7940         (CRT_BINUTILS_SPECS, EXTRA_SPECS): Remove.
7941         * config/avr/t-avr (driver-avr.o, avr-devices.o): New rules.
7942         * config/avr/driver-avr.c: New file.
7943         * config/avr/avr-devices.c: New file.
7945 2009-06-23  Jakub Jelinek  <jakub@redhat.com>
7947         * var-tracking.c (unshare_variable): Force initialized to
7948         be VAR_INIT_STATUS_INITIALIZED unless flag_var_tracking_uninit.
7949         (set_variable_part): Likewise.
7950         (struct variable_union_info): Remove pos_src field.
7951         (vui_vec, vui_allocated): New variables.
7952         (variable_union): Pass VAR_INIT_STATUS_UNKNOWN to unshare_variable
7953         unconditionally.  Avoid XCVECNEW/free for every sorting, for dst_l
7954         == 1 use a simpler sorting algorithm.  Compute pos field right
7955         away, don't fill in pos_src.  For dst_l == 2 avoid qsort.
7956         Avoid quadratic comparison if !flag_var_tracking_uninit.
7957         (variable_canonicalize): Pass VAR_INIT_STATUS_UNKNOWN to
7958         unshare_variable unconditionally.
7959         (dataflow_set_different_2): Removed.
7960         (dataflow_set_different): Don't traverse second hash table.
7961         (compute_bb_dataflow): Pass VAR_INIT_STATUS_UNINITIALIZED
7962         unconditionally to var_reg_set or var_mem_set.
7963         (emit_notes_in_bb): Likewise.
7964         (delete_variable_part): Pass VAR_INIT_STATUS_UNKNOWN to
7965         unshare_variable.
7966         (emit_note_insn_var_location): Don't set initialized to
7967         VAR_INIT_STATUS_INITIALIZED early.
7968         (vt_finalize): Free vui_vec if needed, clear vui_vec and
7969         vui_allocated.
7970         * rtl.c (rtx_equal_p): Don't implement on top of rtx_equal_p_cb.
7972         * tree-object-size.c (addr_object_size): Instead of checking
7973         for non-NULL TREE_CHAIN of the FIELD_DECL check that there
7974         are no FIELD_DECLs following it.
7976 2009-06-23  Andreas Krebbel  <krebbel1@de.ibm.com>
7978         * tree-ssa-math-opts.c (find_bswap): Increase the search depth in
7979         order to match bswaps with signed source operands.
7981 2009-06-23  Rainer Orth  <ro@TechFak.Uni-Bielefeld.DE>
7983         * sdbout.c (sdbout_one_type): Fix braces in switch.
7985 2009-06-23  Richard Guenther  <rguenther@suse.de>
7987         * tree-ssa-structalias.c (struct variable_info): Add is_global_var
7988         member.
7989         (var_anything, anything_tree, var_nothing, nothing_tree, var_readonly,
7990         readonly_tree, var_escaped, escaped_tree, var_nonlocal, nonlocal_tree,
7991         var_callused, callused_tree, var_storedanything, storedanything_tree,
7992         var_integer, integer_tree): Remove global variables.
7993         (new_var_info): Do not pass new id, append the new var to the
7994         global variable vector.
7995         (do_ds_constraint): Use is_global_var member of the variable-info.
7996         (new_scalar_tmp_constraint_exp): Adjust.
7997         (create_function_info_for): Likewise.
7998         (create_variable_info_for): Likewise.
7999         (find_what_var_points_to): Remove dead code.
8000         (init_base_vars): Simplify.
8001         (compute_points_to_sets): Adjust.
8003 2009-06-22  Adam Nemet  <anemet@caviumnetworks.com>
8005         * combine.c (try_combine): Dump information about the insns we're
8006         combining.
8008 2009-06-22  Adam Nemet  <anemet@caviumnetworks.com>
8010         * combine.c (combine_simplify_rtx): Remove TRULY_NOOP_TRUNCATION
8011         check when calling force_to_mode on TRUNCATE's operand.
8013 2009-06-22  Ian Lance Taylor  <iant@google.com>
8015         * config/rs6000/rs6000.opt: Move msched-epilog before msched-prolog.
8017 2009-06-22  Steven Bosscher  <steven@gcc.gnu.org>
8019         * config/arm/arm.md (prologue_use): Set length of fake insn to 0.
8021 2009-06-22  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
8023         * doc/invoke.texi (Link Options): -nodefaultlibs and -nostdlib
8024         override library linkage flags such as -static-libgcc or
8025         -shared-libgcc.
8027 2009-06-22  Maxim Kuvyrkov  <maxim@codesourcery.com>
8029         * config/m68k/m68k-devices.def: Add line for MCF5221x.
8031 2009-06-22  Ian Lance Taylor  <iant@google.com>
8033         * config/linux.opt: Put mglibc ahead of muclibc.
8035         * c-decl.c (diagnose_mismatched_decls): Add -Wc++-compat warning
8036         for duplicate decls.
8038 2009-06-22  Matthias Klose  <doko@ubuntu.com>
8040         * Makefile.in (install-plugin): Remove extra `/' after $(DESTDIR).
8042 2009-06-22  Steven Bosscher  <steven@gcc.gnu.org>
8044         PR objc/28050
8045         * c-parser.c (c_parser_objc_message_args): Return error_mark_node
8046         instead of NULL if a parser error occurs.
8048 2009-06-22  Rainer Orth  <ro@TechFak.Uni-Bielefeld.DE>
8050         * dwarf2out.c (dwarf2_debug_hooks): Initialize
8051         non-DWARF2_DEBUGGING_INFO version.
8053 2009-06-22  Kai Tietz  <kai.tietz@onevision.com>
8055         * config.gcc (i[34567]86-*-mingw*, x86_64-*-mingw*): Add
8056         i386/t-fprules-softfp and soft-fp/t-softfp to tmake_file.
8058         * config/i386/mingw32.h (LIBGCC2_HAS_TF_MODE): Define.
8059         (LIBGCC2_TF_CEXT): Define.
8060         (TF_SIZE): Define.
8062 2009-06-22  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
8064         PR target/40463
8065         * config/arm/linux-eabi.h (CLEAR_INSN_CACHE): Fix definition.
8067 2009-06-22  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
8069         * config/arm/arm.c (arm_override_options): Disable
8070         -mcaller-super-interworking and -mcallee-super-interworking.
8071         * doc/invoke.texi (ARM Options): Document this.
8073 2009-06-22  Nathan Sidwell  <nathan@codesourcery.com>
8075         * config/arm/arm.c (arm_print_operand): Deal with HIGH.
8076         * config/arm/constraints.md (j): New constraint for movw operands.
8077         (N): Remove thumb2 meaning.
8078         * config/arm/arm.md (*arm_movw): Delete.
8079         (*arm_movsi_insn): Use j constraint for movw instead of N constraint.
8080         * config/arm/vfp.md (*arm_movsi_vfp, *thumb2_movsi_vfp): Likewise.
8081         * config/arm/thumb2.md (*thumb2_movsi_insn): Likewise.
8083 2009-06-22  Martin Jambor  <mjambor@suse.cz>
8085         PR tree-optimization/40492
8086         * tree-sra.c (sra_modify_assign): Pass zero offsets to
8087         build_ref_for_offset.
8089 2009-06-22  Shujing Zhao  <pearly.zhao@oracle.com>
8091         * alias.c: Use REG_P, MEM_P, CONST_INT_P, LABEL_P, CALL_P, NOTE_P and
8092         JUMP_TABLE_DATA_P predicates where applicable.
8093         * auto-inc-dec.c: Ditto.
8094         * builtins.c: Ditto.
8095         * caller-save.c: Ditto.
8096         * calls.c: Ditto.
8097         * cfgcleanup.c: Ditto.
8098         * cfglayout.c: Ditto.
8099         * cfgrtl.c: Ditto.
8100         * combine.c: Ditto.
8101         * combine-stack-adj.c: Ditto.
8102         * cse.c: Ditto.
8103         * cselib.c: Ditto.
8104         * dbxout.c: Ditto.
8105         * df-scan.c: Ditto.
8106         * dse.c: Ditto.
8107         * dwarf2asm.c: Ditto.
8108         * dwarf2out.c: Ditto.
8109         * emit-rtl.c: Ditto.
8110         * except.c: Ditto.
8111         * explow.c: Ditto.
8112         * expmed.c: Ditto.
8113         * expr.c: Ditto.
8114         * final.c: Ditto.
8115         * function.c: Ditto.
8116         * fwprop.c: Ditto.
8117         * gcse.c: Ditto.
8118         * genpreds.c: Ditto.
8119         * genrecog.c: Ditto.
8120         * ifcvt.c: Ditto.
8121         * ira-costs.c: Ditto.
8122         * ira-lives.c: Ditto.
8123         * jump.c: Ditto.
8124         * loop-iv.c: Ditto.
8125         * lower-subreg.c: Ditto.
8126         * modulo-sched.c: Ditto.
8127         * optabs.c: Ditto.
8128         * postreload.c: Ditto.
8129         * print-rtl.c: Ditto.
8130         * recog.c: Ditto.
8131         * reginfo.c: Ditto.
8132         * regmove.c: Ditto.
8133         * reload1.c: Ditto.
8134         * reload.c: Ditto.
8135         * reorg.c: Ditto.
8136         * rtlanal.c: Ditto.
8137         * rtl.c: Ditto.
8138         * sched-vis.c: Ditto.
8139         * sdbout.c: Ditto.
8140         * sel-sched-ir.c: Ditto.
8141         * simplify-rtx.c: Ditto.
8142         * targhooks.c: Ditto.
8143         * var-tracking.c: Ditto.
8144         * vmsdbgout.c: Ditto.
8146 2009-06-22  Matthias Klose  <doko@ubuntu.com>
8148         * Makefile.in (install-plugin): Always use DESTDIR.
8150 2009-06-22  Olivier Hainque  <hainque@adacore.com>
8152         * config/pa/pa.c (output_call): Don't optimize post call jumps
8153         into return address adjustments if the call may throw.
8155 2009-06-21  Richard Earnshaw  <rearnsha@arm.com>
8157         * arm.c (thumb1_output_casesi): New function.
8158         * arm.h (CASE_VECTOR_PC_RELATIVE): Thumb-1 code is also relative if
8159         optimizing for size or PIC.
8160         (CASE_VECTOR_SHORTEN_MODE): Handle thumb-1.
8161         * arm.md (UNSPEC_THUMB1_CASESI): New constant.
8162         (casesi): Handle Thumb-1 when optimizing for size or PIC.
8163         (thumb1_casesi_internal_pic): New expand rule.
8164         (thumb1_casesi_dispatch): New pattern.
8165         * aout.h (ASM_OUTPUT_ADDR_DIFF_ELT): Use shortened vectors for
8166         thumb-1 mode.
8167         * coff.h (JUMP_TABLES_IN_TEXT_SECTION): Thumb-1 jump tables are now
8168         in the text seciton when PIC or optimizing for size.
8169         * elf.h (JUMP_TABLES_IN_TEXT_SECTION): Likewise.
8170         * lib1funcs.asm ([__ARM_EABI__]): Add an attribute describing stack
8171         preservation properties of code.
8172         (__gnu_thumb1_case_sqi, __gnu_thumb1_case_uqi): New functions.
8173         (__gnu_thumb1_case_shi, __gnu_thumb1_case_uhi): New functions.
8174         (__gnu_thumb1_case_si): New function.
8175         * t-arm (LIB1ASMSRC): Define here.
8176         (LIB1ASMFUNCS): Add some common functions.
8177         * t-arm-elf (LIB1ASMSRC): Delete.
8178         (LIB1ASMFUNCS): Append to existing set.
8179         * t-pe (LIB1ASMSRC, LIB1ASMFUNCS): Likewise.
8180         * t-strongarm-elf (LIB1ASMSRC, LIB1ASMFUNCS): Likewise.
8181         * t-symbian (LIB1ASMFUNCS): Likewise.
8182         * t-vxworks (LIB1ASMSRC, LIB1ASMFUNCS): Likewise.
8183         * t-wince-pe (LIB1ASMSRC, LIB1ASMFUNCS): Likewise.
8185 2009-06-21  Richard Guenther  <rguenther@suse.de>
8187         PR tree-optimization/38729
8188         * tree-ssa-loop-niter.c (find_loop_niter_by_eval): Restrict
8189         to loops with a single exit if -fno-expensive-optimizations.
8191 2009-06-21  Jakub Jelinek  <jakub@redhat.com>
8193         * var-tracking.c (struct shared_hash_def, shared_hash): New types.
8194         (dataflow_set): Change vars type from htab_t to shared_hash.
8195         (shared_hash_pool, empty_shared_hash): New variables.
8196         (vars_clear): Removed.
8197         (shared_hash_shared, shared_hash_htab, shared_hash_copy,
8198         shared_hash_find_slot_unshare, shared_hash_find_slot,
8199         shared_hash_find_slot_noinsert, shared_hash_find): New
8200         static inlines.
8201         (shared_hash_unshare, shared_hash_destroy): New functions.
8202         (unshare_variable): Unshare set->vars if shared, use
8203         shared_hash_htab.
8204         (vars_copy): Use htab_traverse_noresize instead of htab_traverse.
8205         (get_init_value, find_src_set_src, dump_dataflow_set,
8206         clobber_variable_part, emit_notes_for_differences): Use
8207         shared_hash_htab.
8208         (dataflow_set_init): Remove second argument, set vars to
8209         empty_shared_hash instead of creating a new htab.
8210         (dataflow_set_clear): Call shared_hash_destroy and set vars
8211         to empty_shared_hash instead of calling vars_clear.
8212         (dataflow_set_copy): Don't call vars_copy, instead just share
8213         the src htab with dst.
8214         (variable_union): Use shared_hash_*, use initially NO_INSERT
8215         lookup if set->vars is shared.  Don't keep slot cleared before
8216         calling unshare_variable.  Unshare set->vars if needed.
8217         Even ->refcount == 1 vars must be unshared if set->vars is shared
8218         and var needs to be modified.
8219         (variable_canonicalize): New function.
8220         (dataflow_set_union): If dst->vars is empty, just share src->vars
8221         with dst->vars and traverse with variable_canonicalize to canonicalize
8222         and unshare what is needed.
8223         (dataflow_set_different): If old_set and new_set use the same shared
8224         htab, they aren't different.  If number of htab elements is different,
8225         htabs are different.  Use shared_hash_*.
8226         (dataflow_set_destroy): Call shared_hash_destroy instead of
8227         htab_delete.
8228         (compute_bb_dataflow, emit_notes_in_bb, vt_emit_notes): Don't pass
8229         second argument to dataflow_set_init.
8230         (vt_initialize): Likewise.  Initialize shared_hash_pool and
8231         empty_shared_hash, move bb in/out initialization afterwards.
8232         Use variable_htab_free instead of NULL as changed_variables del hook.
8233         (variable_was_changed): Change type of second argument to pointer to
8234         dataflow_set.  When inserting var into changed_variables, bump
8235         refcount.  Unshare set->vars if set is shared htab and slot needs to
8236         be cleared.
8237         (set_variable_part): Use shared_hash_*, use initially NO_INSERT
8238         lookup if set->vars is shared.  Unshare set->vars if needed.
8239         Even ->refcount == 1 vars must be unshared if set->vars is shared
8240         and var needs to be modified.  Adjust variable_was_changed caller.
8241         (delete_variable_part): Use shared_hash_*.  Even ->refcount == 1
8242         vars must be unshared if set->vars is shared and var needs to be
8243         modified.  Adjust variable_was_changed caller.
8244         (emit_note_insn_var_location): Don't pool_free var.
8245         (emit_notes_for_differences_1): Initialize empty_var->refcount to 0
8246         instead of 1.
8247         (vt_finalize): Call htab_delete on empty_shared_hash->htab and
8248         free_alloc_pool on shared_hash_pool.
8250 2009-06-20  Anthony Green  <green@moxielogic.com>
8252         * config/moxie/sfp-machine.h (__gcc_CMPtype, CMPtype): Define.
8253         * config/moxie/moxie.h (LOAD_EXTEND_OP): Define.
8255 2009-06-20  Richard Guenther  <rguenther@suse.de>
8257         * tree-ssa-structalias.c (find_func_aliases): For memset use
8258         a constraint from NULL if we memset to zero.
8259         * tree-ssa-alias.c (ref_maybe_used_by_call_p_1): Add builtins
8260         we explicitly handle that do not read from memory.
8261         (call_may_clobber_ref_p_1): Properly handle builtins that may
8262         set errno.
8264 2009-06-20  Richard Guenther  <rguenther@suse.de>
8266         PR tree-optimization/40495
8267         * tree-ssa-structalias.c (get_constraint_exp_for_temp): Remove.
8268         (new_scalar_tmp_constraint_exp): New function.
8269         (process_constraint): Do not create temporary decls.
8270         (process_all_all_constraints): Likewise.
8271         (handle_const_call): Likewise.
8272         (create_function_info_for): Do not set decl.
8274 2009-06-19  Ian Lance Taylor  <iant@google.com>
8276         * config/rs6000/rs6000.c (rs6000_explicit_options): Make static.
8277         (rs6000_attribute_table): Make static; move before use.
8279 2009-06-19  Eric Botcazou  <ebotcazou@adacore.com>
8281         * tree.c (substitute_in_expr) <COMPONENT_REF>: Tweak and reformat.
8282         <tcc_vl_exp>: Call process_call_operands on the new CALL_EXPR.
8283         Propagate the TREE_READONLY flag without overwriting it.
8284         (substitute_placeholder_in_expr) <tcc_vl_exp>: Likewise.
8285         Propagate the TREE_READONLY flag onto the result.
8286         (process_call_operands): Move around.  Use correct constant value.
8288 2009-06-19  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
8290         PR target/40482
8291         * config/arm/arm.c (thumb_shiftable_const): Truncate val to 32 bits.
8292         * config/arm/arm.md: Likewise.
8294 2009-06-19  Ian Lance Taylor  <iant@google.com>
8296         * tree-cfg.c (gimple_redirect_edge_and_branch): Change ERROR_MARK
8297         to GIMPLE_ERROR_MARK.
8299         * c-typeck.c (build_conditional_expr): Add op1_original_type and
8300         op2_original_type parameters.  Warn about using different enum types.
8301         * c-parser.c (c_parser_conditional_expression): Pass original
8302         types to build_conditional_expr.
8303         * c-tree.h (build_conditional_expr): Update declaration.
8305 2009-06-19  Ian Lance Taylor  <iant@google.com>
8307         * config/i386/i386.c (ix86_function_specific_save): Test that
8308         fields match values, rather than testing the values are in a
8309         certain range.
8311 2009-06-19  Richard Guenther  <rguenther@suse.de>
8313         * tree-ssa-alias.c (ptr_deref_may_alias_decl_p): Handle
8314         ADDR_EXPR pointers.
8315         (ptr_derefs_may_alias_p): Likewise.
8316         (ptr_deref_may_alias_ref_p_1): New function.
8317         (ptr_deref_may_alias_ref_p): Likewise.
8318         (ref_maybe_used_by_call_p_1): Handle builtins that are not
8319         covered by looking at the ESCAPED solution.
8320         (call_may_clobber_ref_p_1): Likewise.
8321         * tree-ssa-structalias.c (get_constraint_for_ptr_offset):
8322         Handle NULL_TREE offset.  Do not produce redundant constraints.
8323         (process_all_all_constraints): New helper function.
8324         (do_structure_copy): Use it.
8325         (handle_lhs_call): Likewise.
8326         (find_func_aliases): Handle some builtins with pointer arguments
8327         and/or return values explicitly.
8329 2009-06-19  Ian Lance Taylor  <iant@google.com>
8331         * varasm.c (const_rtx_hash_1): Remove const qualifier from shift.
8333 2009-06-19  Ian Lance Taylor  <iant@google.com>
8335         * rtl.h (SUBREG_PROMOTED_UNSIGNED_P): Add cast to int.
8337 2009-06-19  Ian Lance Taylor  <iant@google.com>
8339         * ggc-page.c (ggc_pch_write_object): Initialize emptyBytes.
8340         * sdbout.c (sdb_debug_hooks): Initialize non-SDB_DEBUGGING_INFO
8341         version.
8343         * c-decl.c (finish_decl): If -Wc++-compat, warn about
8344         uninitialized const.
8346 2009-06-19  Ian Lance Taylor  <iant@google.com>
8348         * dse.c (struct store_info): Rename bitmap field to bmap.  Change
8349         all uses.
8351         * c-decl.c (in_struct, struct_types): Remove.
8352         (struct c_binding): Add in_struct field.
8353         (c_binding_ptr): Define type, along with VEC.
8354         (struct c_struct_parse_info): Define.
8355         (struct_parse_info): New static variable.
8356         (bind): Initialize in_struct field.
8357         (start_struct): Remove enclosing_in_struct and
8358         enclosing_struct_types parameters.  Add
8359         enclosing_struct_parse_info parameter.  Change all callers.  Set
8360         struct_parse_info rather than in_struct and struct_types.
8361         (grokfield): If -Wc++-compat and there is a symbol binding for the
8362         field name, set the in_struct flag and push it on the
8363         struct_parse_info->fields vector.
8364         (warn_cxx_compat_finish_struct): New static function.
8365         (finish_struct): Remove enclosing_in_struct and
8366         enclosing_struct_types parameters.  Add
8367         enclosing_struct_parse_info parameter.  Change all callers.  Don't
8368         set C_TYPE_DEFINED_IN_STRUCT here.  Call
8369         warn_cxx_compat_finish_struct.  Free struct_parse_info and set to
8370         parameter.  Only push on struct_types if warn_cxx_compat.
8371         (finish_enum): Only push on struct_types if warn_cxx_compat.
8372         (declspecs_add_type): Add loc parameter.  Change all callers.
8373         Change all error calls to error_at.  Pass loc, not input_location,
8374         to pedwarn calls.  Warn if -Wc++-compat and a typedef name is
8375         defined in a struct.  If -Wc++-compat and parsing a struct, record
8376         that a typedef name was used.
8377         * c-parser.c (c_parser_declspecs): Get location to pass to
8378         declspecs_add_type.
8379         (c_parser_struct_or_union_specifier): Update calls to start_struct
8380         and finish_struct.
8381         * c-tree.h (struct c_struct_parse_info): Declare.
8382         (finish_struct, start_struct): Update declarations.
8383         (declspecs_add_type): Update declaration.
8385 2009-06-19  Ian Lance Taylor  <iant@google.com>
8387         * c-decl.c (grokdeclarator): If -Wc++-compat, warn about a global
8388         variable with an anonymous type.
8390 2009-06-19  Uros Bizjak  <ubizjak@gmail.com>
8392         * see.c: Remove for real.
8394 2009-06-19  Uros Bizjak  <ubizjak@gmail.com>
8396         * optabs.h (enum optab_index): Add new OTI_significand.
8397         (significand_optab): Define corresponding macro.
8398         * optabs.c (init_optabs): Initialize significand_optab.
8399         * genopinit.c (optabs): Implement significand_optab using
8400         significand?f2 patterns.
8401         * builtins.c (expand_builtin_mathfn): Handle
8402         BUILT_IN_SIGNIFICAND{,F,L}.
8403         (expand_builtin): Expand BUILT_IN_SIGNIFICAND{,F,L} using
8404         expand_builtin_mathfn if flag_unsafe_math_optimizations is set.
8406         * config/i386/i386.md (significandxf2, significand<mode>2): New
8407         expanders to implement significandf, significand and significandl
8408         built-ins as inline x87 intrinsics.
8410 2009-06-18  Anatoly Sokolov  <aesok@post.ru>
8412         * config/avr/avr.c (avr_override_options): Remove setting value of
8413         PARAM_INLINE_CALL_COST.
8415 2009-06-18  Richard Henderson  <rth@redhat.com>
8417         PR 40488
8418         * tree-pass.h (TDF_ASMNAME): New.
8419         * tree-dump.c (dump_options): Add asmname.
8420         * doc/invoke.texi: Document it.
8422         * tree-pretty-print.c (maybe_dump_asm_name): Merge into...
8423         (dump_decl_name): ...here.
8424         (dump_function_name): New flags arg; mind TDF_ASMNAME.
8425         (dump_generic_node): Update dump_function_name calls.
8426         (print_call_name): New flags arg; update all dump calls.
8427         * diagnostic.h (print_call_name): Update.
8428         * gimple-pretty-print.c (dump_gimple_call): Update.
8430 2009-06-18  H.J. Lu  <hongjiu.lu@intel.com>
8432         PR target/40470
8433         * config/i386/i386.h (CLASS_LIKELY_SPILLED_P): Add SSE_FIRST_REG.
8435 2009-06-18  Diego Novillo  <dnovillo@google.com>
8437         * doc/plugins.texi: Document plugin_is_GPL_compatible.
8438         * plugin.c (str_license): Declare.
8439         (try_init_one_plugin): Assert that the symbol
8440         'plugin_is_GPL_compatible' exists.
8442 2009-06-18  Sergei Dyshel  <sergeid@il.ibm.com>
8444         * see.c: Remove.
8445         * Makefile.in (OBJS-common): Remove see.o.
8446         (see.o): Remove.
8447         * common.opt (fsee): Mark as preserved for backward compatibility.
8448         * opts.c (common_handle_option): Add OPT_fsee to the backward
8449         compatibility section.
8450         * passes.c (init_optimization_passes, pass_see): Remove pass.
8451         * timevar.def (TV_SEE): Remove.
8452         * tree-pass.h (pass_see): Remove declaration.
8453         * doc/invoke.texi (-fsee): Remove documentation.
8455 2009-06-18  Martin Jambor  <mjambor@suse.cz>
8457         * tree-sra.c: Include statistics.h
8458         (sra_stats): New variable.
8459         (sra_initialize): Clear sra_stats.
8460         (create_access_replacement): Increment sra_stats.replacements.
8461         (get_access_replacement): Do not return twice.
8462         (analyze_all_variable_accesses): Increment statistics counter by the
8463         number of scalarized aggregates.
8464         (generate_subtree_copies): Increment sra_stats.subtree_copies.
8465         (sra_modify_expr): Increment sra_stats.exprs.
8466         (load_assign_lhs_subreplacements): Increment sra_stats.subreplacements.
8467         (sra_modify_assign): Increment sra_stats.exprs,
8468         sra_stats.separate_lhs_rhs_handling and sra_stats.deleted.
8469         (perform_intra_sra): Update statistics counters.
8470         * Makefile.in (tree-sra.o): Add statistics.h to dependencies.
8472 2009-06-18  Sandra Loosemore  <sandra@codesourcery.com>
8474         * config/arm/arm.c (TARGET_SCALAR_MODE_SUPPORTED_P): Redefine.
8475         (arm_scalar_mode_supported_p): New function.
8477 2009-06-18  Paul Brook  <paul@codesourcery.com>
8478             Sandra Loosemore  <sandra@codesourcery.com>
8480         * config/arm/sfp-machine.h (_FP_NANFRAC_H, _FP_NANSIGN_H): Define.
8481         (__extendhfsf2, __truncsfhf2): Define.
8482         * config/arm/fp16.c: New file.
8483         * config/arm/t-bpabi (LIB2FUNCS_STATIC_EXTRA): Add fp16.c.
8484         * config/arm/t-symbian (LIB2FUNCS_STATIC_EXTRA):  Add fp16.c.
8486 2009-06-18  Sandra Loosemore  <sandra@codesourcery.com>
8488         * doc/extend.texi (Half-Precision): New section.
8489         * doc/invoke.texi (Option Summary): List -mfp16-format.
8490         (ARM Options): List neon-fp16 as -mfpu value.  Document -mfp16-format.
8491         * config/arm/arm.opt (mfp16-format=): New.
8492         * config/arm/arm.c: Include intl.h.
8493         (TARGET_INVALID_PARAMETER_TYPE): Redefine.
8494         (TARGET_INVALID_RETURN_TYPE): Redefine.
8495         (TARGET_PROMOTED_TYPE): Redefine.
8496         (TARGET_CONVERT_TO_TYPE): Redefine.
8497         (arm_fp16_format): Define.
8498         (all_fpus): Add entry for neon-fp16.
8499         (fp_model_for_fpu): Likewise.
8500         (struct fp16_format): Declare.
8501         (all_fp16_formats): Define.
8502         (arm_init_libfuncs): Add entries for HFmode conversions and arithmetic
8503         functions.
8504         (arm_override_options): Set arm_fp16_format. Call sorry for fp16
8505         and no ldrh.
8506         (arm_legitimate_index_p): Treat HFmode like HImode.
8507         (thumb1_legitimate_address_p): Make it recognize HFmode constants.
8508         (coproc_secondary_reload_class): Special-case HFmode.
8509         (arm_print_operand): Add 'z' specifier for vld1.16/vst1.16.
8510         (arm_hard_regno_mode_ok): Allow HFmode values in VFP registers.
8511         (arm_init_fp16_builtins): New.
8512         (arm_init_builtins): Call it.
8513         (arm_invalid_parameter_type): New.
8514         (arm_invalid_return_type): New.
8515         (arm_promoted_type): New.
8516         (arm_convert_to_type).
8517         (arm_file_start): Deal with neon-fp16 as fpu_name.  Emit tag for fp16
8518         format.
8519         (arm_emit_fp16_const): New function.
8520         (arm_mangle_type): Mangle __fp16 as "Dh".
8521         * config/arm/arm.h (TARGET_VFPD32): Make it know about
8522         FPUTYPE_NEON_FP16.
8523         (TARGET_NEON_FP16): New.
8524         (TARGET_NEON): Make it know about FPUTYPE_NEON_FP16.
8525         (enum fputype): Add FPUTYPE_NEON_FP16.
8526         (enum arm_fp16_format_type): Declare.
8527         (arm_fp16_format): Declare.
8528         (LARGEST_EXPONENT_IS_NORMAL): Define.
8529         * config/arm/arm-protos.h (arm_emit_fp16_const): Declare.
8530         * config/arm/arm-modes.def (HFmode): Define.
8531         * config/arm/vfp.md: (*movhf_vfp): New.
8532         (extendhfsf2): New.
8533         (truncsfhf2): New.
8534         * config/arm/arm.md: (fpu): Add neon_fp16.
8535         (floatsihf2, floatdihf2): New.
8536         (fix_trunchfsi2, fix_trunchfdi2): New.
8537         (truncdfhf2): New.
8538         (extendhfdf2): New.
8539         (movhf): New.
8540         (*arm32_movhf): New.
8541         (*thumb1_movhf): New.
8542         (consttable_2): Add check for HFmode constants.
8543         (consttable_4): Handle HFmode constants.
8545 2009-06-18  Uros Bizjak  <ubizjak@gmail.com>
8547         * convert.c (convert_to_integer): Convert (int)logb() into ilogb().
8549 2009-06-17  Olivier Hainque  <hainque@adacore.com>
8551         * collect2.c (main): Use CONST_CAST2 to perform char ** to
8552         const char ** conversion in AIX specific section.
8554 2009-06-17  H.J. Lu  <hongjiu.lu@intel.com>
8556         * config/i386/i386.c (ix86_special_builtin_type): Remove
8557         UINT64_FTYPE_PINT.  Add UINT64_FTYPE_PUNSIGNED.
8558         (bdesc_special_args): Updated.
8559         (ix86_init_mmx_sse_builtins): Likewise.
8560         (ix86_expand_special_args_builtin): Likewise.
8562 2009-06-17  Richard Henderson  <rth@redhat.com>
8564         * tree-pretty-print.c (maybe_dump_asm_name): New.
8565         (dump_decl_name): Use it.
8566         (PRINT_FUNCTION_NAME): Merge into...
8567         (dump_function_name): ... here.  Use maybe_dump_asm_name.
8569 2009-06-17  Cary Coutant  <ccoutant@google.com>
8571         * dbxout.c (dbxout_source_line): Add is_stmt parameter.
8572         Change caller.
8573         * debug.c (struct gcc_debug_hooks): Change placeholder for
8574         source_line hook.
8575         (debug_nothing_int_charstar_int): Replaced by...
8576         (debug_nothing_int_charstar_int_bool): ...this.
8577         * debug.h (struct gcc_debug_hooks): Add is_stmt parameter to
8578         source_line prototype.
8579         (debug_nothing_int_charstar_int): Replaced by...
8580         (debug_nothing_int_charstar_int_bool): ...this.
8581         * defaults.h (SUPPORTS_DISCRIMINATOR): New constant.
8582         * dwarf2out.c (dwarf2out_source_line): Add is_stmt parameter.
8583         Output is_stmt operand when necessary.
8584         * final.c (final_scan_insn): Pass is_stmt to source_line debug hook.
8585         (notice_source_line): Add is_stmt parameter.
8586         * sdbout.c (sdbout_source_line): Add is_stmt parameter.
8587         * vmsdbgout.c (vmsdbgout_source_line): Add is_stmt parameter.
8588         Change callers.
8589         * xcoffout.c (xcoffout_source_line): Add is_stmt parameter.
8590         * xcoffout.h (xcoffout_source_line): Add is_stmt parameter.
8592 2009-06-17  Ian Lance Taylor  <iant@google.com>
8594         * expr.c (struct move_by_pieces_d): Rename from move_by_pieces.
8595         Change all uses.
8596         (struct store_by_pieces_d): Rename from store_by_pieces.  Change
8597         call uses.
8599 2009-06-17  Adam Nemet  <anemet@caviumnetworks.com>
8601         * tree.h (STRIP_NOPS, STRIP_SIGN_NOPS,
8602         STRIP_USELESS_TYPE_CONVERSION): Use tree_strip_nop_conversions,
8603         tree_strip_sign_nop_conversions and
8604         tree_ssa_strip_useless_type_conversions rather than stripping
8605         the operations here.
8606         (tree_strip_nop_conversions, tree_strip_sign_nop_conversions):
8607         Declare them.
8608         * gimple.h (tree_ssa_strip_useless_type_conversions): Declare it.
8609         * tree-ssa.c (tree_ssa_strip_useless_type_conversions): New function.
8610         * tree.c (tree_nop_conversion, tree_sign_nop_conversion,
8611         tree_strip_nop_conversions, tree_strip_sign_nop_conversions): New
8612         functions.
8614 2009-06-17  Michael Eager  <eager@eagercon.com>
8616         * config/rs6000/constraints.md (register_constraint "d"): New.
8617         * config/rs6000/dfp.md (movsd_store, extendsddd2, extendsdtd2,
8618         truncddsd2, *negdd2_fpr, *absdd2_fpr, *nabsdd2_fpr,
8619         *movdd_hardfloat32, *movdd_hardfloat64_mfpgpr, *movdd_hardfloat64,
8620         *negtd2_fp, *abstd2_fpr, *nabstd2_fpr, *movtd_internal, extendddtd2,
8621         trunctddd2, adddd3, addtd3, subdd3, subtd3, muldd3, multd3, divdd3,
8622         divtd3, *cmpdd_internal1, *cmptd_internal1, floatditd2, ftruncdd2,
8623         fixdddi2, ftrunctd2, fixtddi2): replace 'f' constraint with 'd'
8624         * config/rs6000/ppu_intrinsics.h (__mffs, __mtfsf, __mtfsfi, __fabs,
8625         __fnabs, __fmadd, __fmsub, __fnmadd, __fnmsub, __fsel, __frsqrte,
8626         __fsqrt, __fmul, __fmuls, __frsp, __fcfid, __fctid, __fctidz, __fctiw,
8627         __fctiwz): Same.
8628         * config/rs6000/rs6000.md (*extendsfdf2_fpr, *truncdfsf2_fpr,
8629         *fseldfsf4, *negdf2_fpr, *absdf2_fpr, *nabsdf2_fpr, *adddf3_fpr,
8630         *subdf3_fpr, *muldf3_fpr, *divdf3_fpr, recipdf3, fred, sqrtdf2,
8631         *fseldfdf4, *fselsfdf4, *floatsidf2_internal, *floatunssidf2_internal,
8632         *fix_truncdfsi2_internal, fix_truncdfsi2_internal_gfxopt,
8633         fix_truncdfsi2_mfpgpr, fctiwz, btruncdf2, ceildf2, floordf2, rounddf2,
8634         stfiwx, floatdidf2, fix_truncdfdi2, floatdisf2_internal1,
8635         *movdf_hardfloat32, *movdf_hardfloat64_mfpgpr, *movdf_hardfloat64,
8636         *movtf_internal, *extenddftf2_internal, trunctfdf2_internal1,
8637         trunctfdf2_internal2, trunctfsf2_fprs, fix_trunc_helper,
8638         *fix_trunctfsi2_internal, negtf2_internal, *movdi_internal32,
8639         *movdi_mfpgpr, *movdi_internal64, *movdf_update1, *movdf_update2,
8640         *cmpdf_internal1, *cmptf_internal1, *cmptf_internal2): Same.
8641         * doc/md.texi: Describe PowerPC 'd' constraint, update 'f' constraint.
8643 2009-06-16  Ian Lance Taylor  <iant@google.com>
8645         * profile.c (total_num_never_executed): Don't define.
8646         (compute_branch_probabilities): Don't count or print
8647         num_never_executed.
8648         (init_branch_prob): Don't set total_num_never_executed.
8649         (end_branch_prob): Don't print total_num_never_executed.
8651 2009-06-17  David Daney  <ddaney@caviumnetworks.com>
8653         * jump.c (cleanup_barriers): Handle case of no insns before a barrier.
8655 2009-06-17  David Edelsohn  <edelsohn@gnu.org>
8657         * config/rs6000/dfp.md (nabsdd2_fpr): Correct mode.
8658         (nabstd2_fpr): Same.
8660 2009-06-17  Steve Ellcey  <sje@cup.hp.com>
8662         * expr.c (expand_assignment): Change complex type check.
8664 2009-06-17  Basile Starynkevitch  <basile@starynkevitch.net>
8666         * doc/plugins.texi (Building GCC plugins): Added new section.
8668 2009-06-17  Ian Lance Taylor  <iant@google.com>
8670         * c-pch.c (get_ident): Don't set size of templ array.
8671         (pch_init): Don't set size of partial_pch array.
8673         * c-typeck.c (digest_init): If -Wc++-compat, warn about using a
8674         string constant to intialize an array whose size is the length of
8675         the string.
8677 2009-06-17  Richard Guenther  <rguenther@suse.de>
8679         PR tree-optimization/40389
8680         * tree-ssa-structalias.c (handle_rhs_call): Restrict NRV case
8681         to addressable types.
8682         * gimple.c (walk_stmt_load_store_addr_ops): Likewise.
8684 2009-06-17  Richard Guenther  <rguenther@suse.de>
8686         PR middle-end/40460
8687         * tree-chrec.h (build_polynomial_chrec): If we cannot determine
8688         if there is no evolution of left in the loop bail out.
8689         * tree-chrec.c (chrec_fold_multiply_poly_poly): CSE one
8690         chrec_fold_multiply.
8692 2009-06-16  J"orn Rennecke  <joern.rennecke@arc.com>
8693             Janis Johnson  <janis187@us.ibm.com>
8695         PR target/39254
8696         * config/rs6000/rs6000.c (rs6000_emit_move): Don't emit a USE
8697         for the symbol ref of a constant that is the source of a move
8698         - nor for any other not-obvious-label-ref constants.
8700 2009-06-16  Olatunji Ruwase  <tjruwase@google.com>
8702         * plugin.c (position_pass): Skip newly inserted pass during list
8703         traversal to avoid repeated insertion.
8705 2009-06-16  Ian Lance Taylor  <iant@google.com>
8707         * vec.h (VEC_stack_alloc): Define different version if
8708         GATHER_STATISTICS is defined, to accept and ignore MEM_STAT.
8709         (DEF_VEC_ALLOC_FUNC_P_STACK): Remove MEM_STAT_DECL.
8710         (DEF_VEC_ALLOC_FUNC_O_STACK): Likewise.
8711         (DEF_VEC_ALLOC_FUNC_I_STACK): Likewise.
8713 2009-06-16  H.J. Lu  <hongjiu.lu@intel.com>
8715         * config.gcc (extra_headers): Add ia32intrin.h for x86.
8717         * config/i386/i386.c (ix86_builtins): Add IX86_BUILTIN_BSRSI,
8718         IX86_BUILTIN_BSRDI.  IX86_BUILTIN_RDPMC, IX86_BUILTIN_RDTSC.
8719         IX86_BUILTIN_RDTSCP.  IX86_BUILTIN_ROLQI, IX86_BUILTIN_ROLHI,
8720         IX86_BUILTIN_RORQI and IX86_BUILTIN_RORHI.
8721         (ix86_special_builtin_type): Add UINT64_FTYPE_VOID,
8722         UINT64_FTYPE_PINT, INT_FTYPE_INT, UINT64_FTYPE_INT,
8723         INT64_FTYPE_INT64, UINT16_FTYPE_UINT16_INT and UINT8_FTYPE_UINT8_INT.
8724         (bdesc_special_args): Add __builtin_ia32_rdtsc and
8725         __builtin_ia32_rdtscp.
8726         (bdesc_args): Add __builtin_ia32_bsrsi, __builtin_ia32_bsrdi,
8727         __builtin_ia32_rolqi, __builtin_ia32_rolhi, __builtin_ia32_rorqi
8728         and __builtin_ia32_rorhi.
8729         (ix86_init_mmx_sse_builtins): Handle UINT64_FTYPE_VOID,
8730         UINT64_FTYPE_PINT, INT_FTYPE_INT, UINT64_FTYPE_INT,
8731         INT64_FTYPE_INT64, UINT16_FTYPE_UINT16_INT and UINT8_FTYPE_UINT8_INT.
8732         (ix86_expand_args_builtin): Likewise.
8733         (ix86_expand_special_args_builtin): Likewise.
8735         * config/i386/i386.md (UNSPECV_RDTSCP): New.
8736         (UNSPECV_RDTSC): Likewise.
8737         (UNSPECV_RDPMC): Likewise.
8738         (*bsr): Renamed to ...
8739         (bsr): This
8740         (*bsr_rex64): Renamed to ...
8741         (bsr_rex64): This.
8742         (rdpmc): New.
8743         (*rdpmc): Likewise.
8744         (*rdpmc_rex64): Likewise.
8745         (rdtsc): Likewise.
8746         (*rdtsc): Likewise.
8747         (*rdtsc_rex64): Likewise.
8748         (rdtscp): Likewise.
8749         (*rdtscp): Likewise.
8750         (*rdtscp_rex64): Likewise.
8752         * config/i386/ia32intrin.h: New.
8754         * config/i386/x86intrin.h: Include <ia32intrin.h>.
8756 2009-06-16  Ian Lance Taylor  <iant@google.com>
8758         * ira-build.c (copy_info_to_removed_store_destinations):
8759         Initialize parent_a.
8761 2009-06-16  Ian Lance Taylor  <iant@google.com>
8763         * c-decl.c (grokdeclarator): Change size_varies to bool.
8765 2009-06-16  Ian Lance Taylor  <iant@google.com>
8767         * sel-sched.c: Make forward declarations of move_op_hooks and
8768         fur_hooks explicitly extern.
8770 2009-06-16  Ian Lance Taylor  <iant@google.com>
8772         * df-problems.c (df_byte_lr_alloc): Don't set problem_data to itself.
8773         * vec.c (vec_gc_o_reserve_1): Don't set alloc to itself.
8775 2009-06-16  Ian Lance Taylor  <iant@google.com>
8777         * resource.c (mark_referenced_resources): Change
8778         include_delayed_effects parameter to bool.  Change all callers.
8779         (mark_end_of_function_resources): Likewise.
8780         * reorg.c (insn_references_resource_p): Likewise.
8781         (insn_sets_resource_p): Likewise.
8782         * resource.h (mark_referenced_resources): Update declaration.
8783         (mark_end_of_function_resources): Update declaration.
8785 2009-06-16  David Edelsohn  <edelsohn@gnu.org>
8787         * config/rs6000/aix.h (LIBSTDCXX_STATIC): Remove -lstdc++.
8789 2009-06-16  David Edelsohn  <edelsohn@gnu.org>
8791         * doc/install.texi (*-*-aix): Update explanation of XLC bootstrap.
8792         GCC can bootstrap on AIX with GNU Binutils 2.20.
8794 2009-06-16  Ian Lance Taylor  <iant@google.com>
8796         * Makefile.in (tree-vect-stmts.o): Depend upon $(TOPLEV_H).
8798 2009-06-16  Ian Lance Taylor  <iant@google.com>
8800         * toplev.h (floor_log2): If GCC_VERSION >= 3004, declare as static
8801         inline, not extern inline.
8802         (exact_log2): Likewise.
8803         * toplev.c (floor_log2): Only define if GCC_VERSION < 3004. Don't
8804         test CLZ_HWI.
8805         (exact_log2): Likewise, but don't test CTZ_HWI.
8807 2009-06-16  Ian Lance Taylor  <iant@google.com>
8809         * bitmap.c (bitmap_clear): Don't declare as inline.
8810         * gimple.c (gimplify_assign): Likewise.
8811         * tree-ssa-sccvn.c (vn_nary_op_compute_hash): Likewise.
8812         * haifa-sched.c (insn_cost): Don't declare with HAIFA_INLINE.
8813         (sched_scan_info): Remove duplicate definition.
8815 2009-06-16  Ian Lance Taylor  <iant@google.com>
8817         * c-common.c (skip_evaluation): Don't define.
8818         (c_inhibit_evaluation_warnings): Define global variable.
8819         (overflow_warning): Check c_inhibit_evaluation_warnings rather
8820         than skip_evaluation.
8821         (convert_and_check, warn_for_div_by_zero): Likewise.
8822         * c-common.h (skip_evaluation): Don't declare.
8823         (c_inhibit_evaluation_warnings): Declare.
8824         * c-parser.c (c_parser_typeof_specifier): Set
8825         c_inhibit_evaluation_warnings rather than skip_evaluation.
8826         (c_parser_conditional_expression): Likewise.
8827         (c_parser_binary_expression): Likewise.
8828         (c_parser_sizeof_expression): Likewise.
8829         (c_parser_alignof_expression): Likewise.
8830         * c-typeck.c (build_indirect_ref): Check
8831         c_inhibit_evaluation_warnings rather than skip_evaluation.
8832         (build_conditional_expr, build_binary_op): Likewise.
8834 2009-06-16  Richard Guenther  <rguenther@suse.de>
8836         * tree-ssa-alias.c (is_escape_site): Remove.
8837         * tree-ssa-alias.h (enum escape_type): Remove.
8838         (is_escape_site): Likewise.
8839         * tree-ssa-structalias.c (find_func_aliases): Handle escapes
8840         via casts and asms without deferring to is_escape_site.
8842 2009-06-16  Jakub Jelinek  <jakub@redhat.com>
8844         PR middle-end/40446
8845         * expr.c (expand_expr_real_1) <case VIEW_CONVERT_EXPR>: Don't
8846         use gen_lowpart if op0 has complex mode.
8848 2009-06-16  Richard Guenther  <rguenther@suse.de>
8850         * tree-ssa-structalias.c (do_ds_constraint): Stores in global
8851         variables add them to ESCAPED.
8852         (find_func_aliases): Do not make all indirectly stored values escaped.
8854 2009-06-16  Rafael Avila de Espindola  <espindola@google.com>
8856         * config/i386/winnt.c (i386_pe_encode_section_info): Update call to
8857         make_decl_one_only.
8859 2009-06-16  Martin Jambor  <mjambor@suse.cz>
8861         PR tree-optimization/40432
8862         * tree-sra.c (sra_modify_assign): When creating VIEW_CONVERT_EXPR,
8863         check whether we need to force gimple register operand.
8865 2009-06-16  Martin Jambor  <mjambor@suse.cz>
8867         PR tree-optimization/40413
8868         * tree-sra.c (load_assign_lhs_subreplacements): Pass offset to
8869         build_ref_for_offset.
8870         (propagate_subacesses_accross_link): Fix a typo in a comment.
8872 2009-06-16  Ira Rosen  <irar@il.ibm.com>
8874         * tree-parloops.c (loop_parallel_p): Call vect_is_simple_reduction
8875         with additional parameter.
8876         * tree-vectorizer.h (enum vect_def_type): Add new value
8877         vect_nested_cycle.
8878         (enum vect_relevant): Add comments.
8879         (vect_is_simple_reduction): Add new argument.
8880         * tree-vect-loop.c (vect_analyze_scalar_cycles_1): Add comments.
8881         Detect nested cycles.
8882         (vect_is_simple_reduction): Update documentation, add an argument to
8883         distinguish inner-loop reduction from nested cycle, detect nested
8884         cycles, fix printings and indentation, don't swap operands in case
8885         of nested cycle.
8886         (get_initial_def_for_reduction): Handle subtraction.
8887         (vect_create_epilog_for_reduction): Add new argument to specify
8888         reduction variable.
8889         (vect_finalize_reduction): Handle subtraction, fix comments.
8890         (vectorizable_reduction): Handle nested cycles. In case of nested
8891         cycle keep track of the reduction variable position. Call
8892         vect_is_simple_reduction with additional parameter. Use original
8893         statement code in reduction epilogue for nested cycle. Call
8894         vect_create_epilog_for_reduction with additional parameter.
8895         * tree-vect-patterns.c (vect_recog_dot_prod_pattern): Assert
8896         inner-loop vectorization.
8897         (vect_recog_widen_sum_pattern): Likewise.
8898         * tree-vect-stmts.c (process_use): Distinguish between nested cycles
8899         and reductions.
8900         (vect_mark_stmts_to_be_vectorized): Likewise.
8901         (vect_get_vec_def_for_operand): Handle nested cycles.
8903 2009-06-16  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
8905         * doc/invoke.texi (Debugging Options): Fix option index entries
8906         for -fdump-statistics, -frandom-seed add entries for
8907         -fdump-tree-original, -fdump-tree-optimized, -frandom-seed.
8908         (FRV Options): Fix entries for -mTLS, -mtls.
8909         (HPPA Options): Fix entries for -mgnu-ld, -mhp-ld.
8910         (i386 and x86-64 Options): Fix entry for -mno-red-zone.
8911         (M68hc1x Options): Fix @itemx for -mnominmax.
8912         (MCore Options): Fix entry for -mno-lsim.
8913         (MMIX Options): Fix entry for -mabi=mmixware.
8914         (PDP-11 Options): Fix entry for -mbcopy-builtin.
8916 2009-06-16  Basile Starynkevitch  <basile@starynkevitch.net>
8918         * doc/plugins.texi (Interacting with the GCC Garbage Collector):
8919         Mention the plugin mode of gengtype.
8920         * doc/gty.texi (Source Files Containing Type Information): Likewise.
8921         * gengtype.c: Updated copyright.
8922         (plugin_files, nb_plugin_files) Added new static variables.
8923         (measure_input_list) Care about plugin_files.
8924         (write_rtx_next): Added early return in plugin mode.
8925         (create_file): Updated copyright year in generated file. Added
8926         asserts.
8927         (oprintf): Added early return if NULL outf.
8928         (get_output_file_with_visibility): Care of plugin_files.
8929         (get_output_file_name): May return null.
8930         (write_local): Added early return.
8931         (put_mangled_filename): Ditto.
8932         (finish_root_table): Added check for base_files.
8933         (write_roots): Care about null when plugins.
8934         (main): Added plugin mode.
8936 2009-06-15  Ian Lance Taylor  <iant@google.com>
8938         * df-problems.c (df_simulate_one_insn_forwards): Fix braces in switch.
8939         * gcov.c (read_count_file): Add braces around variables declared
8940         before label.
8942         * c.opt (Wjump-misses-init): New warning.
8943         * c-opts.c (c_common_handle_option): Set warn_jump_misses_init for
8944         -Wall and -Wc++-compat if not already set.
8945         (c_common_post_options): Clear warn_jump_misses_init if it was not
8946         set.
8947         * c-decl.c (struct c_binding): Change type field to a union with
8948         new label field.  Make it the first field in the struct.  Update
8949         references to type to use u.type instead.
8950         (struct c_spot_bindings): Define.
8951         (struct c_goto_bindings): Define.
8952         (c_goto_bindings_p): Define, along with VECs.
8953         (struct c_label_vars): Define.
8954         (struct c_scope): Add has_label_bindings field.
8955         (bind_label, set_spot_bindings): New static functions.
8956         (decl_jump_unsafe, update_spot_bindings): New static functions.
8957         (update_label_decls): New static function.
8958         (pop_scope): Call update_label_decls.  Don't call c_end_vm_scope.
8959         Update binding u.label field to shadowed field.
8960         (c_binding_start_stmt_expr): New function.
8961         (c_binding_end_stmt_expr): New function.
8962         (pushdecl): Don't call c_begin_vm_scope.
8963         (make_label): Add defining and p_label_vars parameters.  Change
8964         all callers.
8965         (lookup_label): Correct test for whether a label has not yet been
8966         defined.  Call bind_label rather than bind.
8967         (warn_about_goto): New static function.
8968         (lookup_label_for_goto): New function.
8969         (declare_label): Call bind_label rather than bind.
8970         (check_earlier_gotos): New static function.
8971         (define_label): Don't give errors about jumping into statement
8972         expressions or scopes of variably modified types.  Call
8973         set_spot_bindings and check_earlier_gotos.  Call bind_label
8974         instead of bind.  Don't set label_context_stack_se or
8975         label_context_stack_vm.
8976         (c_get_switch_bindings): New function.
8977         (c_release_switch_bindings): New function.
8978         (c_check_switch_jump_warnings): New function.
8979         (start_function): Don't set label_context_stack_se or
8980         label_context_stack_vm.
8981         (finish_function): Likewise.
8982         * c-typeck.c (label_context_stack_se): Don't define.
8983         (label_context_stack_vm): Don't define.
8984         (c_finish_goto_label): Call lookup_label_for_goto rather than
8985         lookup_label.  Don't give errors about jumping into a statement
8986         expression or the scope of a variably modified type.  Don't set
8987         label_context_stack_se or label_context_stack_vm.
8988         (struct c_switch): Remove blocked_stmt_expr and blocked_vm
8989         fields.  Add bindings field.
8990         (c_start_case): Don't set deleted fields.  Set bindings field.
8991         (do_case): Rework order of tests.  Don't check blocked_stmt_expr
8992         or blocked_vm.  Call c_check_switch_jump_warnings.
8993         (c_finish_case): Don't test blocked_stmt_expr field.  Call
8994         c_release_switch_bindings.
8995         (c_begin_stmt_expr): Don't increment blocked_stmt_expr in
8996         c_switch_stack.  Don't walk label_context_stack_se labels.  Don't
8997         set label_context_stack_se.  Call c_bindings_start_stmt_expr.
8998         (c_finish_stmt_expr): Don't decrement blocked_stmt_expr in
8999         c_switch_stack.  Don't walk label_context_stack_se labels.  Don't
9000         set label_context_stack_se.  Call c_bindings_end_stmt_expr.
9001         (c_begin_vm_scope, c_end_vm_scope): Don't define.
9002         * c-tree.h (C_DECL_UNJUMPABLE_STMT_EXPR): Don't define.
9003         (C_DECL_UNDEFINABLE_STMT_EXPR): Don't define.
9004         (C_DECL_UNJUMPABLE_VM): Don't define.
9005         (C_DECL_UNDEFINABLE_VM): Don't define.
9006         (struct c_label_list): Don't define.
9007         (struct c_label_context_se): Don't define.
9008         (struct c_label_context_vm): Don't define.
9009         (struct c_spot_bindings): Declare.
9010         (c_bindings_start_stmt_expr): Declare.
9011         (c_bindings_end_stmt_expr): Declare.
9012         (lookup_label_for_goto): Declare.
9013         (c_get_switch_bindings, c_release_switch_bindings): Declare.
9014         (c_check_switch_jump_warnings): Declare.
9015         (label_context_stack_se, label_context_stack_vm): Don't declare.
9016         (c_finish_goto_label): Update declaration.
9017         (c_begin_vm_scope, c_end_vm_scope): Don't declare.
9018         * doc/invoke.texi (Option Summary): Mention -Wjump-misses-init.
9019         (Warning Options): Document -Wjump-misses-init.
9021 2009-06-15  Jakub Jelinek  <jakub@redhat.com>
9023         * tree-object-size.c (addr_object_size): Fix a pasto in the last
9024         change.
9026 2009-06-15  Rafael Avila de Espindola  <espindola@google.com>
9028         * cgraph.c (cgraph_make_node_local): Use DECL_COMDAT_GROUP.
9030 2009-06-15  Aldy Hernandez  <aldyh@redhat.com>
9032         * except.c (init_eh): Use BUILTINS_LOCATION when calling build_decl.
9034 2009-06-15  Aldy Hernandez  <aldyh@redhat.com>
9036         * tree-eh.c (lower_try_finally_switch): Initialize tf_loc.
9038 2009-06-15  Rafael Avila de Espindola  <espindola@google.com>
9040         * cgraphunit.c (cgraph_function_versioning,save_inline_function_body):
9041         Use DECL_COMDAT_GROUP instead of DECL_ONE_ONLY.
9042         * cgraph.c (cgraph_create_virtual_clone): Use DECL_COMDAT_GROUP.
9043         * config/i386/i386.c (ix86_file_end): Compute DECL_COMDAT_GROUP.
9044         * dwarf2asm.c (dw2_force_const_mem): Update call to
9045         make_decl_one_only.
9046         * langhooks-def.h (lhd_comdat_group, LANG_HOOKS_COMDAT_GROUP): Remove.
9047         (LANG_HOOKS_DECLS): Remove LANG_HOOKS_COMDAT_GROUP.
9048         * langhooks.c (lhd_comdat_group): Remove.
9049         * langhooks.h (lang_hooks_for_decls): Remove comdat_group.
9050         * tree.h (DECL_COMDAT_GROUP): New.
9051         (DECL_ONE_ONLY): Use DECL_COMDAT_GROUP.
9052         (tree_decl_with_vis): Add comdat_group. Remove one_only.
9053         (make_decl_one_only): Change signature.
9054         * varasm.c (get_emutls_init_templ_addr, emutls_decl): Update call to
9055         make_decl_one_only.
9056         (make_decl_one_only): Change signature.
9057         (default_elf_asm_named_section): Use DECL_COMDAT_GROUP.
9059 2009-06-15  Richard Guenther  <rguenther@suse.de>
9061         PR middle-end/40439
9062         * tree.c (widest_int_cst_value): Fix bootstrap on 32bit HWI hosts.
9064 2009-06-14  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
9066         * tree-ssa-math-opts.c: Remove extra divide.
9068 2009-06-14  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
9070         * config/s390/s390.md ("bswap<mode>2"): Only available on z900.
9072 2009-06-14  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
9074         * passes.c: Add bswap pass.
9075         * tree-pass.h: Add pass_optimize_bswap declaration.
9076         * tree-ssa-math-opts.c: Include diagnostics.h for print_gimple_stmt.
9077         Include rtl.h, expr.h and optabs.h for optab_handler check.
9078         (struct symbolic_number, pass_optimize_bswap): New definition.
9079         (do_shift_rotate, verify_symbolic_number_p): New functions.
9080         (find_bswap_1, find_bswap, execute_optimize_bswap): New functions.
9081         (gate_optimize_bswap): New function.
9082         * tree.c (widest_int_cst_value): New function.
9083         * tree.h (widest_int_cst_value): Prototype added.
9085 2009-06-14  Steven Bosscher  <steven@gcc.gnu.org>
9087         * cfgcleanup.c (old_insns_match_p): Remove code to substitute
9088         REG_EQUAL/REG_EQUIV notes.
9090 2009-06-14  Richard Guenther  <rguenther@suse.de>
9092         PR middle-end/40389
9093         * gimple.c (walk_stmt_load_store_addr_ops): The LHS of a call
9094         has its address taken if NRV was applied and it is addressable.
9095         * tree-ssa-structalias.c (get_constraint_for_address_of): New
9096         function split out from ...
9097         (get_constraint_for_1): ... here.
9098         (handle_rhs_call): Use it to mark the return slot escaped if
9099         it is addressable and NRV was applied.
9101 2009-06-13  Aldy Hernandez  <aldyh@redhat.com>
9103         * config/rs6000/rs6000-protos.h (altivec_resolve_overloaded_builtin):
9104         Change first argument type to location_t.
9105         * config/rs6000/rs6000-c.c (altivec_resolve_overloaded_builtin): Same.
9106         Do not set input_location.
9107         Use loc instead of input_location throughout.
9109 2009-06-13  Richard Guenther  <rguenther@suse.de>
9111         PR tree-optimization/40421
9112         * tree-predcom.c (should_unroll_loop_p): Remove.
9113         (tree_predictive_commoning_loop): Use can_unroll_loop_p.
9115 2009-06-13  Michael Meissner  <meissner@linux.vnet.ibm.com>
9117         * config/rs6000/rs6000-c.c (altivec_resolve_overloaded_builtin):
9118         Add location argument.
9120 2009-06-13  Aldy Hernandez  <aldyh@redhat.com>
9122         * config/alpha/alpha.c (alpha_build_builtin_va_list): Pass location to
9123         build_decl.
9124         * config/s390/s390.c (s390_build_builtin_va_list): Same.
9125         (s390_gimplify_va_arg): Pass location to create_artificial_label.
9126         * config/spu/spu-protos.h: Add location to
9127         spu_resolve_overloaded_builtin.
9128         * config/spu/spu.c (spu_build_builtin_va_list): Pass location to
9129         spu_build_builtin_va_list.
9130         * config/spu/spu-c.c (spu_resolve_overloaded_builtin): Add location
9131         argument.  Pass location to build_function_call_vec.
9132         * config/sh/sh.c (sh_build_builtin_va_list): Pass location to
9133         build_decl.
9134         (emit_fpu_switch): Same.
9135         (sh_gimplify_va_arg_expr): Pass location to create_artificial_label.
9136         * config/xtensa/xtensa.c (xtensa_build_builtin_va_list): Pass location
9137         to build_decl and create_artificial_label.
9138         (xtensa_gimplify_va_arg_expr): Same.
9139         * config/stormy16/stormy16.c (xstormy16_build_builtin_va_list): Same.
9140         (xstormy16_gimplify_va_arg_expr): Same.
9141         * config/iq2000/iq2000.c (iq2000_expand_prologue): Same.
9142         * config/arm/arm.c (arm_build_builtin_va_list): Same.
9143         * config/mips/mips.c (mips_build_builtin_va_list): Same.
9144         (mips16_build_function_stub): Same.
9145         (mips16_build_call_stub): Same.
9147 2009-06-13  Richard Earnshaw  <rearnsha@arm.com>
9149         PR target/40327
9150         * arm/constraints.md (Pa, Pb): New constraints.
9151         * arm/arm.md (thumb1_addsi3): Support more complex additions.  Add a
9152         split pattern to deal with them.
9154 2009-06-13  Joerg Sonnenberger  <joerg@britannica.bec.de>
9156         * doc/invoke.texi: Add missing option -Wp,OPTION in list,
9157         fix index entry for -Xpreprocessor.
9159 2009-06-12  Aldy Hernandez  <aldyh@redhat.com>
9161         * config/rs6000/rs6000-c.c (altivec_resolve_overloaded_builtin):
9162         Add location argument to build_decl call.
9163         * config/rs6000/rs6000.c (rs6000_build_builtin_va_list): Same.
9164         (rs6000_init_builtins): Same.
9165         (spe_init_builtins): Same.
9166         (rs6000_gimplify_va_arg): Add location argument to
9167         create_artificial_label call.
9169 2009-06-12  Steven Bosscher  <steven@gcc.gnu.org>
9171         * timevar.def (TV_COMBINE_STACK_ADJUST): New timevar.
9172         * combine-stack-adj.c (pass_stack_adjustments): Use it.
9173         * Makefile.in: Fix GGC dependency for gcse.o.
9175 2009-06-12  Aldy Hernandez  <aldyh@redhat.com>
9177         * tree-pretty-print.c (dump_generic_node): Dump column numbers.
9178         * gimple-pretty-print.c (dump_gimple_stmt): Same.
9179         * gimplify.c (gimplify_modify_expr): Set location for GIMPLE_ASSIGNs
9180         created.
9181         * c-parser.c (c_parser_binary_expression): Use current column while
9182         building binary operations.
9183         * common.opt (fshow-column): Enable by default.
9184         * tree-vrp.c (check_array_ref): Use warning_at.
9185         (check_array_bounds): Use location from call back if expr has no
9186         location.
9187         * tree.h: Add location argument to maybe_fold_*.
9188         * tree-ssa-ccp.c (ccp_fold): Pass location to maybe_fold_*.
9189         (maybe_fold_offset_to_array_ref): Add location argument and use it.
9190         (maybe_fold_offset_to_component_ref): Same.
9191         (maybe_fold_offset_to_reference): Same.
9192         (maybe_fold_offset_to_address): Same.
9193         (maybe_fold_stmt_indirect): Same.
9194         (maybe_fold_stmt_addition): Same.
9195         (fold_stmt_r): Pass location to maybe_fold_*.
9196         (fold_gimple_assign): Same.
9197         * c-tree.h: Add location argument to finish_decl,
9198         default_function_array_conversion, store_init_value.
9199         * c-decl.c (define_label): Use error_at.
9200         (c_make_fname_decl): Pass location to finish_decl.
9201         (finish_decl): New location argument.
9202         (build_compound_literal): Pass location to store_init_value.
9203         (grokdeclarator): Pass location to finish_decl.
9204         (grokfield): Same.
9205         * c-typeck.c (array_to_pointer_conversion): New location argument.
9206         (function_to_pointer_conversion): Same.
9207         (default_function_array_conversion): Same.
9208         (parser_build_unary_op): Pass location to overflow_warning.
9209         (parser_build_binary_op): Same.  Use warning_at.
9210         (build_unary_op): Pass location to array_to_pointer_conversion.
9211         (build_c_cast): Pass location to digest_init.
9212         (build_modify_expr): New location argument.
9213         (convert_for_assignment): Same.
9214         (store_init_value): Same.
9215         (digest_init): Same.
9216         (output_init_element): Pass location to digest_init and
9217         array_to_pointer_conversion.
9218         (c_finish_return): Pass location to convert_for_assignment.
9219         * gimplify.c (gimplify_conversion): Pass location to
9220         maybe_fold_offset_to_address.
9221         * tree-ssa-forwprop.c (forward_propagate_addr_expr_1): Pass location
9222         to maybe_fold_stmt_addition.
9223         * c-omp.c (c_finish_omp_atomic): Pass new location to
9224         build_modify_expr.
9225         (c_finish_omp_for): Same.
9226         * c-common.c (overflow_warning): New argument.
9227         * c-common.h: New argument to build_modify_expr, overflow_warning.
9228         * c-parser.c (c_parser_declaration_or_fndef): Pass location to
9229         finish_decl.
9230         (c_parser_initializer): Pass location to
9231         default_function_array_conversion.
9232         (c_parser_initelt): Same.
9233         (c_parser_initval): Same.
9234         (c_parser_asm_operands): Same.
9235         (c_parser_expr_no_commas): Same.  Pass location to build_modify_expr.
9236         (c_parser_conditional_expression): Same.
9237         (c_parser_binary_expression): Add location info to stack.  Use it.
9238         (c_parser_unary_expression): Pass location to
9239         default_function_array_conversion, parser_build_unary_op,
9240         build_indirect_ref, c_parser_postfix_expression_after_primary.
9241         (c_parser_postfix_expression_after_primary): New location argument.
9242         Use it.
9243         (c_parser_expression_conv): Pass location to
9244         default_function_array_conversion.
9245         (c_parser_expr_list): Same.
9246         (c_parser_omp_atomic): Same.
9247         (c_parser_omp_for_loop): Same.
9248         * c-tree.h: (struct c_declarator): Add comment to id_loc.
9249         (build_array_declarator): New argument.
9250         * c-decl.c (build_array_declarator): Add location argument.
9251         (grokdeclarator): Set id_loc for cdk_array.
9252         * c-parser.c (c_parser_direct_declarator_inner): Pass location to
9253         build_array_declarator.
9254         * tree.c (build_omp_clause): Add location argument.
9255         * tree.h (OMP_CLAUSE_HAS_LOCATION): New macro.
9256         (OMP_CLAUSE_LOCATION): New macro.
9257         (struct tree_omp_clause): Add location field.
9258         (build_omp_clause): Add argument.
9259         * testsuite/gcc.dg/gomp/for-1.c: Fix column.
9260         * cp/pt.c (tsubst_omp_for_iterator): Pass location to
9261         build_omp_clause.
9262         * cp/parser.c (cp_parser_omp_var_list_no_open): Same.
9263         (cp_parser_omp_clause_collapse): Same.
9264         (cp_parser_omp_clause_default): Same.
9265         (cp_parser_omp_clause_if): Same.
9266         (cp_parser_omp_clause_nowait): Same.
9267         (cp_parser_omp_clause_num_threads): Same.
9268         (cp_parser_omp_clause_ordered): Same.
9269         (cp_parser_omp_clause_schedule): Same.
9270         (cp_parser_omp_clause_untied): Same.
9271         (cp_parser_omp_for_loop): Same.
9272         (cp_parser_omp_parallel): Pass location to c_split_parallel_clauses.
9273         * c-tree.h (c_start_case): Add location argument.
9274         (c_process_expr_stmt): Same.
9275         (c_finish_goto_*): Same.
9276         * tree-parloops.c (initialize_reductions): Pass location to
9277         build_omp_clause.
9278         (create_parallel_loop): Same.
9279         * fortran/trans-openmp.c (gfc_trans_omp_variable_list): Same.
9280         (gfc_trans_omp_reduction_list): Same.
9281         (gfc_trans_omp_clauses): Same.
9282         (gfc_trans_omp_do): Same.
9283         * c-typeck.c (c_finish_goto_label): Same.
9284         (c_finish_goto_ptr): New location argument.
9285         (c_start_case): Same.
9286         (emit_side_effect_warnings): Same.
9287         (c_process_expr_stmt): Same.
9288         (c_finish_stmt_expr): Same.
9289         (c_finish_omp_clauses): Use error_at instead of error.
9290         * gimplify.c (gimplify_adjust_omp_clauses_1): Pass location to
9291         build_omp_clause.
9292         * c-omp.c (c_split_parallel_clauses): New location argument.
9293         * tree-nested.c (convert_nonlocal_reference_stmt): Pass location
9294         to build_omp_clause.
9295         (convert_local_reference_stmt): Same.
9296         (convert_gimple_call): Same.
9297         * c-common.h (c_split_parallel_clauses): New argument.
9298         * c-parser.c (c_parser_statement_after_labels): Pass location to
9299         c_finish_goto_label.
9300         (c_parser_switch_statement): Pass location to c_start_case.
9301         (c_parser_for_statement): Pass location to c_finish_expr_stmt,
9302         and c_process_expr_stmt.
9303         (c_parser_omp_variable_list): Add location argument.
9304         (c_parser_omp_clause_collapse): Pass location to build_omp_clause.
9305         (c_parser_omp_clause_default): Same.
9306         (c_parser_omp_clause_if): Same.
9307         (c_parser_omp_clause_num_threads): Same.
9308         (-c_parser_omp_clause_ordered): Same.
9309         (c_parser_omp_clause_reduction): Pass location to
9310         c_parser_omp_variable_list.
9311         (c_parser_omp_clause_schedule): Pass location to build_omp_clause.
9312         (c_parser_omp_clause_untied): Same.
9313         (c_parser_omp_for_loop): Pass location to c_process_expr_stmt.
9314         (c_parser_omp_parallel): Pass location to c_split_parallel_clauses.
9316         * c-tree.h (check_for_loop_decls, undeclared_variable,
9317         build_component_ref, build_array_ref, build_external_ref,
9318         c_expr_sizeof_expr, c_expr_sizeof_type, parser_build_unary_op,
9319         build_conditional_expr, build_compound_expr, c_cast_expr,
9320         build_c_cast, build_asm_expr, c_end_compound_stmt, c_finish_stmt_expr,
9321         c_finish_return, c_finish_omp_parallel, c_finish_omp_task): New
9322         argument.
9323         * c-semantics.c (build_stmt): Same.
9324         (build_case_label): Same.
9325         * c-decl.c (c_finish_incomplete_decl): Pass location on down.
9326         (undeclared_variable): New argument.
9327         (make_label): Same.
9328         (lookup_label): Pass location on down.
9329         (define_label): Same.
9330         (finish_decl): Same.
9331         (build_compound_literal): Same.
9332         (finish_struct): Same.
9333         (finish_function): Do not set location here.
9334         (check_for_loop_decls): New argument.
9335         * tree.c (save_expr): Set location.
9336         (build_empty_stmt): New argument.
9337         * tree.h (build_empty_stmt): New argument to build_empty_stmt.
9338         (CAN_HAVE_LOCATION_P): Make sure we have a non empty node.
9339         * builtins.c (gimplify_va_arg_expr): Use locations.
9340         (expand_builtin_sync_operation): Same.
9341         * c-typeck.c (build_component_ref): New argument.
9342         (build_array_ref): Same.
9343         (build_external_ref): Same.
9344         (c_expr_sizeof_expr): Same.
9345         (c_expr_sizeof_type): Same.
9346         (parser_build_unary_op): Same.
9347         (build_conditional_expr): Same.
9348         (build_compound_expr): Pass location on down.
9349         (build_compound_expr): New argument.
9350         (build_c_cast): Same.
9351         (c_cast_expr): Same.
9352         (build_asm_expr): Same.
9353         (c_finish_return): Same.
9354         (c_process_expr_stmt): Pass location on down.
9355         (c_finish_stmt_expr): New argument.
9356         (push_clenaup): Same.
9357         (c_finish_omp_parallel): Same.
9358         (c_finish_omp_task): Same.
9359         * gimplify.c (gimplify_call_expr): Pass location on down.
9360         * c-omp.c (c_finish_omp_master): New argument.
9361         (c_finish_omp_critical): Same.
9362         (c_finish_omp_ordered): Same.
9363         (c_finish_omp_barrier): Same.
9364         (-c_finish_omp_taskwait): Same.
9365         (c_finish_omp_atomic): Same.
9366         (c_finish_omp_flush): Same.
9367         * tree-inline.c (copy_tree_body_r): Pass location on down.
9368         (inline_forbidden_p): Remove use of input_location.
9369         * c-gimplify.c (c_build_bind_expr): New argument.
9370         * c-common.c (c_common_truthvalue_conversion): Pass location on down.
9371         (c_sizeof_or_alignof_type): New argument.
9372         (c_alignof_expr): Same.
9373         (build_va_arg): Same.
9374         (c_add_case_label): Same.
9375         * c-common.h (c_sizeof_or_alignof_type, c_alignof_expr,
9376         c_sizeof, c_alignof, build_va_arg, build_stmt, build_case_label,
9377         c_build_bind_expr, objc_build_selector_expr, objc_build_throw_stmt,
9378         c_finish_omp_master, c_finish_omp_critical, c_finish_omp_ordered,
9379         c_finish_omp_barrier, c_finish_omp_atomic, c_finish_omp_flush,
9380         c_finish_omp_taskwait, c_finish_omp_for, c_split_parallel_clauses):
9381         New argument.
9382         * stub-objc.c (objc_build_selector_expr): Same.
9383         (objc_build_throw_stmt): Same.
9384         * c-parser.c (c_parser_declaration_or_fndef): Pass location on down.
9385         (c_parser_initelt): Same.
9386         (c_parser_compound_statement): Same.
9387         (c_parser_compound_statement_nostart): Same.
9388         (c_parser_label): Same.
9389         (c_parser_statement_after_labels): Same.
9390         (c_parser_if_body): Same.
9391         (c_parser_else_body): Same.
9392         (c_parser_if_statement): Same.
9393         (c_parser_switch_statement): Same.
9394         (c_parser_while_statement): Same.
9395         (c_parser_do_statement): Same.
9396         (c_parser_for_statement): Same.
9397         (c_parser_asm_statement): Same.
9398         (c_parser_conditional_expression): Same.
9399         (c_parser_binary_expression): Same.
9400         (c_parser_cast_expression): Same.
9401         (c_parser_unary_expression): Same.
9402         (c_parser_sizeof_expression): Same.
9403         (c_parser_alignof_expression): Same.
9404         (c_parser_postfix_expression): Same.
9405         (c_parser_expression): Same.
9406         (c_parser_objc_receiver): Same.
9407         (c_parser_omp_variable_list): Same.
9408         (c_parser_omp_structured_block): Same.
9409         (c_parser_omp_atomic): New argument.
9410         (c_parser_omp_barrier): Same.
9411         (c_parser_omp_critical): Same.
9412         (c_parser_omp_flush): Pass location on down.
9413         (c_parser_omp_for_loop): New argument.
9414         (c_parser_omp_for): Same.
9415         (c_parser_omp_master): Same.
9416         (c_parser_omp_ordered): Same.
9417         (c_parser_omp_sections_scope): Same.
9418         (c_parser_omp_sections): Same.
9419         (c_parser_omp_parallel): Same.
9420         (c_parser_omp_single): Same.
9421         (c_parser_omp_task): Same.
9422         (c_parser_omp_taskwait): Pass location on down.
9423         (c_parser_omp_construct): Same.
9424         (c_parser_omp_threadprivate): Same.
9425         * dwarf2asm.c, targhooks.c, optabs.c, tree.c, tree.h, target.h,
9426         builtins.c, omp-low.c, cgraphunit.c, tree-call-cdce.c,
9427         tree-ssa-alias.c, gimple-low.c, c-tree.h, expr.c, tree-parloops.c,
9428         c-decl.c, tree-eh.c, langhooks.c, function.c, stor-layout.c,
9429         c-typeck.c, gimplify.c, c-pragma.c, expmed.c, except.c, coverage.c,
9430         emit-rtl.c, cfgexpand.c, tree-mudflap.c, varasm.c, tree-nested.c,
9431         rtl.h, tree-inline.c, tree-profile.c, c-common.c, c-common.h,
9432         tree-switch-conversion.c, tree-cfg.c, ipa-struct-reorg.c, c-parser.c,
9433         config/i386/i386.c, stmt.c:
9434         Add location argument to the following function definitions and/or
9435         function calls: build_decl, objcp_start_struct, objcp_finish_struct,
9436         start_struct, finish_struct, PUSH_FIELD, create_artificial_label,
9437         cp_make_fname_decl, pushtag, implicitly_declare, c_make_fname_decl,
9438         build_compound_literal, parser_xref_tag, resolve_overloaded_builtin,
9439         do_case, c_finish_bc_stmt, build_compound_literal,
9440         build_function_call.
9441         * c-decl.c (build_compound_literal): Add location argument.
9442         Make all diagnostic calls use location.
9443         (start_struct): Same.
9444         (finish_struct): Same.
9445         (start_enum): Same.
9446         (build_enumerator): Same.
9447         (start_function): Same.
9448         (grokdeclarator): Make all diagnostic calls use location.
9449         (store_parm_decls_oldstyle): Same.
9450         * c-typeck.c (build_function_call): Add location argument.
9451         Make all diagnostic calls use location.
9452         (do_case): Same.
9453         (c_finish_bc_stmt): Same.
9454         * tree-nested.c (get_trampoline_type): Add argument.
9455         Pass location to build_decl.
9456         (lookup_tramp_for_decl): Pass location to get_trampoline_type.
9457         * rtl.h (RTL_LOCATION): New.
9458         * c-common.c (c_add_case_label): Add location argument.
9459         Make all diagnostic calls use location.
9460         * c-common.h: Add location argument to make_fname_decl, do_case,
9461         c_add_case_label, build_function_call, resolve_overloaded_builtin.
9462         * c-parser.c (c_parser_enum_specifier): Rename ident_loc to enum_loc.
9463         Set it appropriately for every case.  Pass enum_loc to start_enum
9464         call.  Pass value_loc first to build_enumerator.  Pass enum_loc to
9465         parser_xref_tag.
9466         (c_parser_struct_or_union_specifier): Save location.  Use it for
9467         start_struct, finish_struct, and parser_xref_tag.
9469 2009-06-12  Ian Lance Taylor  <iant@google.com>
9471         * fold-const.c (fold_unary): Rename local variable and to and_expr.
9473         * c-opts.c (c_common_handle_option): For -Wc++-compat set
9474         cpp_opts->warn_cxx_operator_names.
9476 2009-06-12  Andrew Pinski  <andrew_pinski@playstation.sony.com>
9478         PR tree-opt/38865
9479         * tree-ssa-sccvn.c (visit_reference_op_load): If vn_reference_lookup
9480         is returns NULL and OP is a VCE, look through the VCE.
9482 2009-06-12  Ian Lance Taylor  <iant@google.com>
9484         PR bootstrap/40430
9485         * collect2.c (main): Use CONST_CAST2 in code inside #if
9486         LINK_ELIMINATE_DUPLICATE_LDIRECTORIES.
9488 2009-06-12  Joey Ye  <joey.ye@intel.com>
9490         PR middle-end/39146
9491         * cfgexpand.c (get_decl_align_unit): Update
9492         max_used_stack_slot_alignment with align instead of
9493         stack_alignment_needed.
9495         * function.c (assign_stack_local_1): Update
9496         max_used_stack_slot_alignment with alignment_in_bits instead
9497         of stack_alignment_needed.
9498         (locate_and_pad_parm): Don't update max_used_stack_slot_alignment
9499         here.
9501 2009-06-12  Jakub Jelinek  <jakub@redhat.com>
9503         * dwarf2out.c (last_var_location_insn): New variable.
9504         (dwarf2out_end_epilogue): Clear last_var_location_insn.
9505         (dwarf2out_var_location): Don't record anything after last real
9506         insn.  Only change labels if there were any real instructions
9507         in between last note and this one, or if changed sections.
9509 2009-06-11  Richard Henderson  <rth@redhat.com>
9511         * alpha.c (alpha_expand_prologue): Add a REF_CFA_REGISTER
9512         note when storing the frame pointer in a register.
9513         (FRP): Don't redefine to nothing for epilogue.
9514         (alpha_expand_epilogue): Mark register and sp restores.
9515         (unicosmk_gen_dsib): Don't mark weird frame pointer adjust.
9517         * config/alpha/alpha.c (alpha_emit_setcc): Fix test for
9518         when gen_lowpart is needed.
9520 2009-06-11  Richard Henderson  <rth@redhat.com>
9522         * dwarf2out.c (def_cfa_1): Likewise for DW_CFA_cfa_offset.
9524         * dwarf2out.c (need_data_align_sf_opcode): New.
9525         (div_data_align): Move earlier.
9526         (def_cfa_1, reg_save): Use it.
9528 2009-06-11  H.J. Lu  <hongjiu.lu@intel.com>
9530         * config/i386/i386.c (OPTION_MASK_ISA_CRC32_SET): New.
9531         (OPTION_MASK_ISA_CRC32_UNSET): Likewise.
9532         (ix86_handle_option): Handle OPT_mcrc32.
9533         (ix86_target_string): Add -mcrc32.
9534         (bdesc_args): Enable crc32 builtins with OPTION_MASK_ISA_CRC32.
9536         * config/i386/i386.h (TARGET_CRC32): New.
9538         * config/i386/i386.md (sse4_2_crc32<mode>): Also check TARGET_CRC32.
9539         (sse4_2_crc32di): Likewise.
9541         * config/i386/i386.opt (mcrc32): New.
9543         * doc/invoke.texi: Document -mcrc32.
9545 2009-06-11  Richard Henderson  <rth@redhat.com>
9547         * common.opt (gdwarf-): Accept a version number.
9548         * doc/invoke.texi (gdwarf-): Update docs.
9549         * opth-gen.awk: Special case -gdwarf+ to OPT_gdwarfplus.
9550         * opts.c (common_handle_option) [OPT_gdwarf_]: Verify dwarf
9551         version level, and record it.
9553         * dwarf2.h (DW_CIE_VERSION): Remove.
9554         * dwarf2out.c (DWARF_VERSION): Remove.
9555         (add_fde_cfi): Skip DW_CFA_set_loc addition for dwarf3.
9556         (output_call_frame_info): Use CIE version 3 for dwarf3,
9557         or if the return register column is out of range for version 1.
9558         (dwarf_stack_op_name): Add all dwarf3 values.
9559         (DEBUG_PUBTYPES_SECTION): New.
9560         (size_of_die) [dw_val_class_die_ref]: Handle DW_FORM_ref_addr
9561         encoding change for dwarf3.
9562         (output_die) [dw_val_class_die_ref]: Likewise.
9563         (output_compilation_unit_header): Emit correct version for dwarf3.
9564         (output_line_info): Likewise.
9565         (output_pubnames): Update for DWARF_VERSION removal.
9566         (output_aranges): Likewise.
9567         (gen_subprogram_die): Emit DW_OP_call_frame_cfa if emitting dwarf3.
9568         (dwarf2out_init): Don't ifdef DEBUG_PUBTYPES_SECTION.
9569         (dwarf2out_finish): Likewise.
9571 2009-06-11  David Daney  <ddaney@caviumnetworks.com>
9573         * system.h (gcc_assert, gcc_unreachable): Revert accidental commit
9574         in r148403.
9576 2009-06-11  David Daney  <ddaney@caviumnetworks.com>
9578         PR c/39252
9579         * doc/extend.texi ( __builtin_unreachable): Document new builtin.
9580         * builtins.c (expand_builtin_unreachable): New function.
9581         (expand_builtin): Handle BUILT_IN_UNREACHABLE case.
9582         * builtins.def (BUILT_IN_UNREACHABLE): Add new builtin.
9583         * cfgcleanup.c (try_optimize_cfg): Delete empty blocks with no
9584         successors.
9585         * cfgrtl.c (rtl_verify_flow_info): Handle empty blocks when
9586         searching for missing barriers.
9588 2009-06-11  Francois-Xavier Coudert  <fxcoudert@gcc.gnu.org>
9590         * config/darwin.h (LINK_COMMAND_SPEC): Adjust spec to link libcov
9591         when -fprofile-generate* was passed.
9592         * config/darwin9.h (LINK_COMMAND_SPEC): Likewise.
9594 2009-06-11  Anthony Green  <green@moxielogic.com>
9596         * config/moxie/moxie.md: Define length attribute for all instructions.
9597         (rCC): Define.
9598         (*b<cond:code>): Support limited branch ranges for new PC-relative
9599         branch instructions.
9600         * config/moxie/moxie.h (HAS_LONG_UNCOND_BRANCH): Define.
9602 2009-06-11  Jakub Jelinek  <jakub@redhat.com>
9604         * config/i386/i386.c (min_insn_size): Use get_attr_length
9605         for normal insns other than TYPE_MULTI, TYPE_OTHER and TYPE_FCMP.
9606         For __asm return 0.
9608         * config/i386/i386.c (ix86_pad_returns): Use emit_jump_insn_before
9609         instead of emit_insn_before.
9611 2009-06-10  Ian Lance Taylor  <iant@google.com>
9613         PR bootstrap/40408
9614         * graphite.c (add_conditions_to_domain): Change SWITCH_EXPR to
9615         GIMPLE_SWITCH.
9617 2009-06-10  Revital Eres  <eres@il.ibm.com>
9619         * passes.c (init_optimization_passes): Reschedule
9620         predictive-commoning pass before complete unroll pass.
9622 2009-06-10  Martin Jambor  <mjambor@suse.cz>
9624         * cgraph.c (cgraph_node_can_be_local_p): New function.
9625         (cgraph_make_node_local): New function.
9626         * cgraph.h (cgraph_node_can_be_local_p): Declare.
9627         (cgraph_make_node_local): Declare.
9629 2009-06-10  Nathan Froyd  <froydnj@codesourcery.com>
9631         * tree.h (tree_base): Add packed_flag and user_align fields.
9632         Decrease size of spare field.
9633         (TYPE_USER_ALIGN): Use user_align from tree_base.
9634         (DECL_USER_ALIGN): Likewise.
9635         (TYPE_PACKED): Use packed_flag from tree_base.
9636         (DECL_PACKED): Likewise.
9637         (tree_type): Delete packed_flag and user_align fields.  Widen
9638         precision field.  Widen mode field and shuffle fields to align
9639         mode on an 8-bit boundary.
9640         (tree_decl_common): Delete decl_flag_1 and user_align fields.
9641         Renumber decl_flag_* fields.  Fix comments.  Widen
9642         decl_common_unused field.
9643         (DECL_HAS_VALUE_EXPR_P): Adjust for renumbering of decl_flag_* fields.
9644         (DECL_EXTERNAL): Likewise.
9645         (DECL_BIT_FIELD): Likewise.
9646         (DECL_NONADDRESSABLE_P): Likewise.
9647         (TYPE_DECL_SUPRESS_DEBUG): Likewise.
9648         * config/arm/arm-modes.def (XImode): Make it an INT_MODE.
9650 2009-06-10  Ian Lance Taylor  <iant@google.com>
9652         * vec.h (DEF_VEC_ALLOC_I): Use DEF_VEC_NONALLOC_FUNCS_I.
9653         (DEF_VEC_ALLOC_P): Use DEF_VEC_NONALLOC_FUNCS_P.
9654         (DEF_VEC_ALLOC_O): Use DEF_VEC_NONALLOC_FUNCS_O.
9655         (DEF_VEC_ALLOC_FUNC_P): Only define VEC_OP (T,A,alloc).
9656         (DEF_VEC_NONALLOC_FUNCS_P): New macro, broken out of old
9657         DEF_VEC_ALLOC_FUNC_P.
9658         (DEF_VEC_ALLOC_FUNC_O): Only define VEC_OP (T,A,alloc).
9659         (DEF_VEC_NONALLOC_FUNCS_O): New macro, broken out of old
9660         DEF_VEC_ALLOC_FUNC_O.
9661         (DEF_VEC_ALLOC_FUNC_I): Only define VEC_OP (T,A,alloc).
9662         (DEF_VEC_NONALLOC_FUNCS_I): New macro, broken out of old
9663         DEF_VEC_ALLOC_FUNC_I.
9664         (vec_stack_p_reserve, vec_stack_p_reserve_exact): Declare.
9665         (vec_stack_p_reserve_exact_1): Declare.
9666         (vec_stack_o_reserve, vec_stack_o_reserve_exact): Declare.
9667         (vec_stack_free): Declare.
9668         (VEC_stack_alloc): Define.
9669         (DEF_VEC_ALLOC_P_STACK, DEF_VEC_ALLOC_FUNC_P_STACK): Define.
9670         (DEF_VEC_ALLOC_O_STACK, DEF_VEC_ALLOC_FUNC_O_STACK): Define.
9671         (DEF_VEC_ALLOC_I_STACK, DEF_VEC_ALLOC_FUNC_I_STACK): Define.
9672         * vec.c (void_p): New type.  Call DEF_VEC_P and DEF_VEC_ALLOC_P
9673         for void_p.
9674         (stack_vecs): New static variable.
9675         (vec_stack_p_reserve_exact_1): New function.
9676         (vec_stack_o_reserve_1): New static function.
9677         (vec_stack_p_reserve, vec_stack_p_reserve_exact): New functions.
9678         (vec_stack_o_reserve, vec_stack_o_reserve_exact): New functions.
9679         (vec_stack_free): New function.
9680         * df-scan.c (df_ref): Use DEF_VEC_P and DEF_VEC_ALLOC_P_STACK.
9681         (VEC_df_ref_stack_alloc): Define.
9682         (df_mw_hardreg_ptr): New type.  Use DEF_VEC_P and
9683         DEF_VEC_ALLOC_P_STACK.
9684         (VEC_df_mw_hardreg_ptr_stack_alloc): Define.
9685         (struct df_collection_rec): Change _vec fields to VEC.  Remove
9686         _use fields.
9687         (df_free_collection_rec): Adjust for new fields.
9688         (df_insn_rescan): Use new df_collection_rec fields.
9689         (df_notes_rescan, df_canonize_collection_rec): Likewise.
9690         (df_ref_create_structure, df_ref_record): Likewise.
9691         (df_get_conditional_uses, df_get_call_refs): Likewise.
9692         (df_insn_refs_collect, df_bb_refs_collect): Likewise.
9693         (df_bb_refs_record, df_record_entry_block_defs): Likewise.
9694         (df_record_exit_block_uses, df_bb_verify): Likewise.
9695         (df_swap_refs): Change ref_vec parameter to VEC.  Change all callers.
9696         (df_sort_and_compress_refs): Change ref_vec parameter to VEC.
9697         Remove count parameter.  Change return type to void.  Change all
9698         callers.
9699         (df_sort_and_compress_mws): Change mw_vec parameter to VEC.
9700         Remove count parameter.  Change return type to void.  Change all
9701         callers.
9702         (df_install_refs): Change old_vec parameter to VEC.  Remove count
9703         parameter.  Change all callers.
9704         (df_install_mws): Change old_vec parameter to VEC.  Remove count
9705         parameter.  Change all callers.
9706         (df_refs_verify): Change new_rec parameter to VEC.  Change call
9707         callers.
9708         (df_mws_verify): Likewise.
9710 2009-06-10  Alexandre Oliva  <aoliva@redhat.com>
9712         * gcc.c (compare_files): Cast munmap argumento to caddr_t.
9714 2009-06-10  H.J. Lu  <hongjiu.lu@intel.com>
9716         * doc/extend.texi: Add description for __builtin_ia32_crc32di.
9718 2009-06-10  Anthony Green  <green@moxielogic.com>
9720         * config/moxie/crti.asm: New file.
9721         * config/moxie/crtn.asm: New file.
9722         * config/moxie/moxie.c: New file.
9723         * config/moxie/moxie.h: New file.
9724         * config/moxie/sfp-machine.h: New file.
9725         * config/moxie/moxie-protos.h: New file.
9726         * config/moxie/t-moxie: Created.
9727         * config/moxie/t-moxie-softfp: Created.
9728         * config/moxie/moxie.md: Created.
9729         * config/moxie/constraints.md: Created.
9730         * config.gcc: Add moxie support.
9731         * doc/md.texi (Machine Constraints): Add moxie constraints.
9732         * doc/contrib.texi (Contributors): Mention moxie port.
9733         * doc/install.texi (Specific): Mention the moxie port.
9735 2009-06-09  Ian Lance Taylor  <iant@google.com>
9737         * system.h (HAVE_DESIGNATED_INITIALIZERS): Don't define if
9738         compiling with C++.
9739         * optabs.c (optab_table): Only use designated initializers if
9740         HAVE_DESIGNATED_INITIALIZERS is defined.
9741         (convert_optab_table): Likewise.
9742         (init_optabs): Always call init_insn_codes if
9743         HAVE_DESIGNATED_INITIALIZERS is not defined.
9745 2009-06-09  Ian Lance Taylor  <iant@google.com>
9747         * targhooks.c (default_builtin_vectorized_function): Change fn
9748         parameter to unsigned int.
9749         (default_builtin_vectorized_conversion): Change code parameter to
9750         unsigned int.
9751         (default_builtin_reciprocal): Change fn parameter to unsigned int.
9752         * targhooks.h: Update declarations.
9753         * config/rs6000/rs6000.c (rs6000_builtin_conversion): Change code
9754         parameter to unsigned int.
9756         * c-typeck.c (comptypes_check_enum_int): New static function.
9757         (comptypes_internal): Add enum_and_int_p parameter.  Change all
9758         callers.
9759         (comp_target_types): Add location parameter.  Change all callers.
9760         (tagged_types_tu_compatible_p): Add enum_and_int_p parameter.
9761         Change all callers.
9762         (function_types_compatible_p, type_lists_compatible_p): Likewise.
9763         (build_conditional_expr): Add colon_loc parameter.  Change all
9764         callers.
9765         (convert_for_assignment): Add location parameter.  Change all callers.
9766         * c-parser.c (c_parser_conditional_expression): Pass location of
9767         colon to build_conditional_expr.
9768         * c-tree.h (build_conditional_expr): Update declaration.
9770 2009-06-09  Sebastian Pop  <sebastian.pop@amd.com>
9772         * graphite.c: Revert previous patch.
9774 2009-06-09  Sebastian Pop  <sebastian.pop@amd.com>
9776         PR bootstrap/40103
9777         * graphite.c: Remove pragma GCC diagnostic warning "-Wc++-compat".
9779 2009-06-09  Ghassan Shobaki  <ghassan.shobaki@amd.com>
9781         * tree-ssa-loop-prefetch.c
9782         (loop_prefetch_arrays): Fixed a portability problem in printf format
9783         string.
9785 2009-06-09  Martin Jambor  <mjambor@suse.cz>
9787         PR tree-optimization/40351
9788         * tree-sra.c (propagate_subacesses_accross_link): Check that a
9789         refrence to a potential artifical subaccess can be constructed.
9791 2009-06-08  Kaz Kojima  <kkojima@gcc.gnu.org>
9793         * config/sh/sh-protos.h (sh_optimization_options): Declare.
9794         (sh_override_options): Likewise.
9795         * config/sh/sh.c: Include params.h.
9796         (sh_optimization_options): New.
9797         (sh_override_options): Likewise.
9798         * config/sh/sh.c (OPTIMIZATION_OPTIONS): Use sh_optimization_options.
9799         (OVERRIDE_OPTIONS): Use sh_override_options.
9801 2009-06-08  Jakub Jelinek  <jakub@redhat.com>
9803         * dwarf2out.c (emit_cfa_remember): New variable.
9804         (add_fde_cfi): If emit_cfa_remember, recurse to add
9805         DW_CFA_remember_state first.
9806         (dwarf2out_begin_epilogue): Don't add_fde_cfi DW_CFA_remember_state,
9807         instead just set emit_cfa_remember.
9809 2009-06-08  Jan Hubicka  <jh@suse.cz>
9811         PR debug/40126
9812         * dwarf2out.c (dwarf2out_abstract_function): Free decl_loc_table.
9814 2009-06-08  Jan Hubicka  <jh@suse.cz>
9816         PR middle-end/39834
9817         * cgraphunit.c (save_inline_function_body): Do not copy transform
9818         hooks for saved inline bodies.
9819         * ipa-passes.c (do_per_function): Do not add the hoks multiple times
9820         for given function.
9822 2009-06-08  Adam Nemet  <anemet@caviumnetworks.com>
9824         * jump.c (returnjump_p): Handle delayed branches.  Add missing
9825         function comment.
9827 2009-06-08  Jan Hubicka  <jh@suse.cz>
9829         PR middle-end/40102
9830         * cgraph.c (cgraph_create_edge_including_clones): Also asume that the
9831         original node might've been modified.
9832         * tree-inline.c (copy_bb): Do not assume that all clones are the same.
9834 2009-06-08  Jakub Jelinek  <jakub@redhat.com>
9836         * tree-object-size.c (addr_object_size): Add OSI argument.
9837         Handle also INDIRECT_REF with SSA_NAME inside of it as base address.
9838         (compute_builtin_object_size, expr_object_size): Adjust callers.
9839         (plus_stmt_object_size): Call addr_object_size instead of
9840         compute_builtin_object_size.
9842 2009-06-08  Ghassan Shobaki  <ghassan.shobaki@amd.com>
9843             Dwarakanath Rajagopal  <dwarak.rajagopal@amd.com>
9845         * tree-ssa-loop-prefetch.c
9846         (gather_memory_references): Introduced a counter for the number of
9847         memory references.
9848         (anything_to_prefetch_p): Introduced a counter for the number of
9849         prefetches.
9850         (is_loop_prefetching_profitable): New function with a cost model
9851         for prefetching.
9852         (loop_prefetch_arrays): Use the new cost model to determine if
9853         prefetching is profitable.
9854         * params.def (MIN_INSN_TO_PREFETCH_RATIO,
9855         PREFETCH_MIN_INSN_TO_MEM_RATIO): New parameters.
9856         * params.h (MIN_INSN_TO_PREFETCH_RATIO,
9857         PREFETCH_MIN_INSN_TO_MEM_RATIO): New parameters.
9858         * doc/invoke.texi (MIN_INSN_TO_PREFETCT_RATIO,
9859         PREFETCH_MIN_INSN_TO_MEM_RATIO): New parameters.
9861 2009-06-08  Michael Matz  <matz@suse.de>
9863         PR debug/40012
9864         * cfgexpand.c (set_rtl): Store place also in DECL_RTL, if all
9865         partitions use the same.
9866         (expand_one_var): Deal with DECL_RTL sometimes begin set also
9867         for basevars of SSA_NAMEs.
9868         (expand_used_vars): Reset TREE_USED for basevars of SSA_NAMEs,
9869         to not expand them twice.
9870         (gimple_expand_cfg): Clear DECL_RTL for those decls that have
9871         multiple places.
9873 2009-06-08  Alexandre Oliva  <aoliva@redhat.com>
9875         * common.opt (fcompare-debug=, fcompare-debug-second): New.
9876         (fdump-final-insns=, gtoggle): New.
9877         * doc/invoke.texi: Document them.
9878         * final.c (rest_of_clean_state): Dump final insn stream.
9879         * gcc.c (invoke_as): Hook in -fcompare-debug.
9880         (static_spec_functions): Add compare-debug-dump-opt,
9881         compare-debug-self-opt and compare-debug-auxbase-opt.
9882         (compare_debug, compare_debug_second, compare_debug_opt): New.
9883         (switches_debug_check, n_switches_debug_check): New.
9884         (debug_auxbase_opt, debug_check_temp_file): New.
9885         (process_command): Handle -fno-compare-debug, -fcompare-debug and
9886         -fcompare-debug=*.
9887         (do_self_spec): Handle arguments after switches.
9888         (do_spec_1): Add .gk extension to temp file basenames for compare.
9889         (check_live_switch): Take SWITCH_IGNORE into account, and earlier.
9890         (cc1_options): Use it instead of normal auxbase computation for
9891         the second compare-debug compilation.
9892         (compare_files): New.
9893         (main): Set up and implement compare debug mode.
9894         (compare_debug_dump_opt_spec_function): New.
9895         (compare_debug_self_opt_spec_function): New.
9896         (compare_debug_auxbase_opt_spec_function): New.
9897         * toplev.c (process_options): Handle flag_gtoggle,
9898         flag_dump_final_insns.
9899         * coverage.c (coverage_begin_output): Don't overwrite .gcno file
9900         during -fcompare-debug-second compilation.
9902 2009-06-07  Ian Lance Taylor  <iant@google.com>
9904         * dwarf2.h (enum dwarf_location_atom): Add INTERNAL_DW_OP_tls_addr.
9905         * dwarf2out.c (INTERNAL_DW_OP_tls_addr): Don't #define.
9907         * c-common.c (c_do_switch_warnings): Don't exit early for -Wswitch
9908         with no default node.  Change warning with %H to warning_at.
9909         Don't clear warn_switch around case checking.
9910         * doc/invoke.texi (Warning Options): Clarify distinction between
9911         -Wswitch and -Wswitch-enum.
9913 2009-06-07  Bernhard Reutner-Fischer  <aldot@gcc.gnu.org>
9915         * tree-pass.h (TODO_update_ssa_any): Document internal use only.
9917 2009-06-07  Bernhard Reutner-Fischer  <aldot@gcc.gnu.org>
9919         * gbl-ctors.h: Add header guard.
9921 2009-06-07  Bernhard Reutner-Fischer  <aldot@gcc.gnu.org>
9923         * tree-flow.h (make_value_handle, set_value_handle, sort_vuses,
9924         sort_vuses_heap, vn_lookup_or_add, vn_lookup_or_add_with_stmt,
9925         vn_lookup_or_add_with_vuses, vn_add, vn_add_with_vuses,
9926         vn_lookup_with_stmt, vn_lookup, vn_lookup_with_vuses): Remove
9927         prototypes for removed functions.
9928         (expressions_equal_p): Move to ...
9929         * tree-ssa-sccvn.h: ... here and ...
9930         * matrix-reorg.c: ... adjust includes.
9932 2009-06-07  Bernhard Reutner-Fischer  <aldot@gcc.gnu.org>
9934         * ipa-struct-reorg.c (do_reorg_1): Fix whitespace in dump output.
9936 2009-06-07  Bernhard Reutner-Fischer  <aldot@gcc.gnu.org>
9938         * c-decl.c (finish_decl): Use bool for variable was_incomplete.
9939         (finish_function): Remove erroneous whitespace.
9941 2009-06-07  Bernhard Reutner-Fischer  <aldot@gcc.gnu.org>
9943         * tree-cfg.c (gimple_merge_blocks): Commentary typo fix.
9944         (verify_stmts): Print statement who's gimple_bb is set to a wrong BB
9946 2009-06-07  Bernhard Reutner-Fischer  <aldot@gcc.gnu.org>
9948         * errors.c (internal_error): Commentary typo fix.
9949         * gimple-iterator.c (gsi_insert_seq_on_edge): Ditto.
9950         * tree-ssa-pre.c: Ditto.
9952 2009-06-07  Bernhard Reutner-Fischer  <aldot@gcc.gnu.org>
9954         * basic-block.h (ENTRY_BLOCK, EXIT_BLOCK): Document that neither of
9955         them is supposed to hold actual statements.
9957 2009-06-06  Ian Lance Taylor  <iant@google.com>
9959         * doc/extend.texi (Attribute Syntax): Document that C++ labels on
9960         empty statements can now have attributes.
9962 2009-06-05  Shujing Zhao  <pearly.zhao@oracle.com>
9964         * config/mips/mips.c: Use REG_P and CONST_INT_P where applicable.
9965         * config/mips/mips.md: Ditto.
9967 2009-06-05  Nathan Froyd  <froydnj@codesourcery.com>
9969         * config/rs6000/eabi.asm (__eabi_convert): Don't define if
9970         _RELOCATABLE.
9971         (__eabi_uconvert): Likewise.
9973 2009-06-05  Nathan Froyd  <froydnj@codesourcery.com>
9975         * config/rs6000/ppc-asm.h: Protect auto-host.h inclusion and
9976         CFI_* definitions with IN_GCC.
9978 2009-06-05  David Edelsohn  <edelsohn@gnu.org>
9980         * xcoffout.h (xcoffout_source_line): Update prototype.
9982 2009-06-05  Kaveh R. Ghazi  <ghazi@caip.rutgers.edu>
9984         * builtins.c (do_mpc_ckconv, do_mpc_arg1): Use
9985         mpc_realref/mpc_imagref instead of MPC_RE/MPC_IM.
9987 2009-06-05  Jakub Jelinek  <jakub@redhat.com>
9989         PR middle-end/40340
9990         * tree-ssa-live.c (remove_unused_scope_block_p): Don't prune
9991         inlined_function_outer_scope_p blocks for artificial inlines
9992         even at -g0/-g1.
9993         * tree.c (tree_nonartificial_location): Rewrite using
9994         block_nonartificial_location.
9996 2009-06-05  Revital Eres  <eres@il.ibm.com>
9997             Leehod Baruch  <leehod@il.ibm.com>
9999         * expr.c (expand_assignment): Expand MISALIGNED_INDIRECT_REF.
10000         (expand_expr_real_1): Remove comment.
10001         * tree-vect-data-refs.c (vect_enhance_data_refs_alignment):
10002         Vectorize misaligned access when the target supports it.
10003         (vect_supportable_dr_alignment): Check for unaligned access support.
10004         * tree-vect-stmts.c (vectorizable_store): Generate misaligned store
10005         and remove asset.
10007 2009-06-05  Julian Brown  <julian@codesourcery.com>
10009         * config/arm/ieee754-df.S (cmpdf2): Avoid writing below SP.
10010         * config/arm/ieee754-sf.S (cmpsf2): Likewise.
10012 2009-06-05  Richard Guenther  <rguenther@suse.de>
10014         PR bootstrap/40350
10015         * dwarf2out.c (dwarf2out_begin_function): Mark discriminator
10016         as possibly unused.
10018 2009-06-05  Jakub Jelinek  <jakub@redhat.com>
10020         * config/s390/s390.c (global_not_special_regno_p): New static inline.
10021         (save_gprs): Don't tell unwinder when a global register is saved.
10022         (s390_emit_epilogue): Emit needed epilogue unwind info.
10024 2009-06-05  Alexandre Oliva  <aoliva@redhat.com>
10026         * dwarf2out.c (deferred_asm_name): New.
10027         (add_name_and_src_coords_attributes): Defer creation of
10028         DW_AT_MIPS_linkage_name attribute if DECL_ASSEMBLER_NAME was not
10029         computed yet.
10030         (move_linkage_attr): New.
10031         (dwarf2out_finish): Revisit deferrals and emit attributes at the
10032         right place.
10034 2009-06-05  Alexandre Oliva  <aoliva@redhat.com>
10036         * tree-nested.c (finalize_nesting_tree_1): Declare the
10037         frame_decl in the binding tree.
10039 2009-06-04  Cary Coutant  <ccoutant@google.com>
10041         * basic-block.h (struct basic_block_def): Add discriminator field.
10042         * dbxout.c (dbxout_source_line): Add new parameter.  Change all
10043         callers.
10044         * debug.c (do_nothing_debug_hooks): Add additional entry.
10045         (debug_nothing_int_charstar_int): New function.
10046         * debug.h (struct gcc_debug_hooks): Add parameter to source_line hook.
10047         (debug_nothing_int_charstar_int): New declaration.
10048         * dwarf2out.c (dwarf2out_source_line): Add new parameter.  Write
10049         discriminator value in .loc directive.
10050         * final.c (last_discriminator): New variable.
10051         (discriminator): New variable.
10052         (final_start_function): Initialize above variables, pass current
10053         discriminator to debug hook.
10054         (notice_source_line): Check for discriminator change.
10055         * gimple-pretty-print.c (dump_bb_header): Print discriminator value.
10056         * sdbout.c (sdbout_source_line): New parameter.
10057         * tree-cfg.c (struct locus_discrim_map): New structure type.
10058         (discriminator_per_locus): New hash table.
10059         (build_gimple_cfg): Allocate and free discriminator hash table.
10060         (make_edges): Call assign_discriminator.
10061         (locus_map_hash): New function.
10062         (locus_map_eq): New function.
10063         (next_discriminator_for_locus): New function.
10064         (same_line_p): New function.
10065         (assign_discriminator): New function.
10066         (make_cond_expr_edges): Call assign_discriminator.
10067         (make_gimple_switch_edges): Likewise.
10068         (first_non_label_stmt): New function.
10069         * vmsdbgout.c (vmsdbgout_source_line): Add new parameter.  Change
10070         all callers.
10071         * xcoffout.c (xcoffout_source_line): Add new parameter.
10073         * configure.ac (gcc_cv_as_discriminator): New configury check for
10074         gas support for discriminator.
10075         * configure: Regenerate.
10076         * config.in: Regenerate.
10078 2009-06-04  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
10080         * config/arm/arm.c (thumb2_legitimate_index_p): Initialize
10081         val after checking for integers.
10083 2009-06-04  Uros Bizjak  <ubizjak@gmail.com>
10085         * config/i386/i386.h (X86_64_MS_REGPARM_MAX): Rename from
10086         X64_REGPARM_MAX.
10087         (REGPARM_MAX): Use X86_64_MS_REGPARM_MAX.
10088         (X86_64_MS_SSE_REGPARM_MAX): Rename from X64_SSE_REGPARM_MAX.
10089         (SSE_REGPARM_MAX): Use X86_64_MS_SSE_REGPARM_MAX.
10090         * config/i386/i386.c: Use X86_64_MS_REGPARM_MAX instead of
10091         X64_REGPARM_MAX.  Use X86_64_MS_SSE_REGPARM_MAX instead of
10092         X64_SSE_REGPARM_MAX.
10093         * config/i386/i386.md: Use X86_64_MS_SSE_REGPARM_MAX instead of
10094         X64_SSE_REGPARM_MAX.
10096 2009-06-04  Alexandre Oliva  <aoliva@redhat.com>
10098         * gcc.c (report_times_to_file): New.
10099         (execute): Implement it.
10100         (process_command): Support -time=.
10101         * doc/invoke.texi: Document it.
10103 2009-06-04  Alexandre Oliva  <aoliva@redhat.com>
10105         * tree-ssa-live.c (remove_unused_scope_block_p): Keep variables
10106         that have value exprs.
10108 2009-06-04  Alexandre Oliva  <aoliva@redhat.com>
10110         * dwarf2asm.c (dw2_force_const_mem): Defer creation of
10111         declarations for constants until...
10112         (dw2_output_indirect_constant_1): ... this point.
10114 2009-06-04  Richard Earnshaw  <rearnsha@arm.com>
10116         PR target/10242
10117         * arm.md (arm_addsi3): Don't try to split an add with an
10118         eliminable register until after reload has completed.
10120 2009-06-03  Ian Lance Taylor  <iant@google.com>
10122         * dummy-checksum.c (executable_checksum): Use EXPORTED_CONST.
10123         * genattrtab.c (write_length_unit_log): Likewise.
10124         * genchecksum.c (dosum): Likewise.
10125         * gengtype.c (write_rtx_next): Likewise.
10126         (finish_root_table, write_roots): Likewise.
10127         * gimple.c (gimple_ops_offset_): Likewise.
10128         * tree-nomudflap.c (gt_ggc_r_gt_tree_mudflap_h): Likewise.
10129         * config/arc/arc.c (arc_attribute_table): Likewise.
10130         * config/arm/arm.c (arm_attribute_table): Likewise.
10131         * config/avr/avr.c (avr_attribute_table): Likewise.
10132         * config/crx/crx.c (crx_attribute_table): Likewise.
10133         * config/m32r/m32r.c (m32r_attribute_table): Likewise.
10134         * config/m68hc11/m68hc11.c (m68hc11_attribute_table): Likewise.
10135         * config/mcore/mcore.c (mcore_attribute_table): Likewise.
10136         * config/rs6000/rs6000.c (rs6000_attribute_table): Likewise.
10137         * config/sh/sh.c (sh_attribute_table): Likewise.
10138         * config/sparc/sparc.c (sparc_attribute_table): Likewise.
10139         * config/spu/spu.c (spu_attribute_table): Likewise.
10140         * config/v850/v850.c (v850_attribute_table): Likewise.
10142         * config/alpha/alpha.c (vms_attribute_table): Make static.
10143         * config/bfin/bfin.c (bfin_attribute_table): Likewise.
10144         * config/h8300/h8300.c (h8300_attribute_table): Likewise.
10145         * config/mips/mips.c (mips_attribute_table): Likewise.
10147         * Makefile.in (dummy-checksum.o): Depend upon $(CONFIG_H) and
10148         $(SYSTEM_H).
10149         (cc1-checksum.o): Likewise.
10151 2009-06-03  Steve Ellcey  <sje@cup.hp.com>
10153         * config/ia64/vect.md (*movv2sf_internal): Handle big endian case.
10155 2009-06-03  Jakub Jelinek  <jakub@redhat.com>
10157         * config/rs6000/rs6000.c (rs6000_emit_stack_reset): Return generated
10158         insn if it is changing sp.  Use gen_add3_insn instead of
10159         conditionally gen_addsi3 and gen_adddi3.
10160         (offset_below_red_zone_p): New static inline function.
10161         (rs6000_emit_epilogue): Emit needed epilogue unwind info.
10162         Use gen_add3_insn instead of conditionally gen_addsi3 and gen_adddi3.
10163         * config/rs6000/ppc-asm.h: Include auto-host.h.
10164         (CFI_STARTPROC, CFI_ENDPROC, CFI_DEF_CFA_REGISTER, CFI_OFFSET,
10165         CFI_RESTORE): Define.
10166         * config/rs6000/crtresxgpr.asm: Add unwind info.
10167         * config/rs6000/crtresxfpr.asm: Likewise.
10168         * config/rs6000/crtresgpr.asm: Likewise.
10169         * config/rs6000/crtresfpr.asm: Likewise.
10170         * config/rs6000/crtsavgpr.asm: Likewise.
10171         * config/rs6000/crtsavfpr.asm: Likewise.
10173         * dwarf2out.c (output_cfi_directive): Pass 1 instead of 0 to second
10174         argument of DWARF2_FRAME_REG_OUT macros.
10176 2009-06-03  Julian Brown  <julian@codesourcery.com>
10178         * config/arm/arm.c (arm_hard_regno_mode_ok): Permit values of four
10179         words or less (including TImode) in core registers.
10181 2009-06-03  Richard Guenther  <rguenther@suse.de>
10183         PR middle-end/40328
10184         * fold-const.c (fold_convert): Fold the build COMPLEX_EXPR.
10186 2009-06-03  Andrey Belevantsev  <abel@ispras.ru>
10188         * statistics.c (statistics_counter_event): Do not record event
10189         in pass dump if its number == -1.
10190         (curr_statistics_hash): Add assert that we never get passes
10191         with static number == -1.
10193 2009-06-03  Richard Guenther  <rguenther@suse.de>
10194             Andrey Belevantsev  <abel@ispras.ru>
10196         * cfgexpand.c (discover_nonconstant_array_refs_r): Make only
10197         non-BLKmode arrays addressable.
10199 2009-06-03  Maxim Kuvyrkov  <maxim@codesourcery.com>
10201         * config/m68k/linux.h (HAVE_GAS_BALIGN_AND_P2ALIGN): Move to ...
10202         * config/m68k/m68k.h: ... here.
10203         * testsuite/gcc.dg/falign-labels.c (dg-options): Don't restrict for
10204         m68k and fido.
10206 2009-06-03  Martin Jambor  <mjambor@suse.cz>
10208         PR tree-optimization/40323
10209         * ipa-prop.c (get_ssa_def_if_simple_copy): Break if not single
10210         assignment.
10212 2009-06-03  Richard Guenther  <rguenther@suse.de>
10214         * tree-ssa-sccvn.c (copy_reference_ops_from_ref): Use DECL_SIZE
10215         consistently.
10217 2009-06-03  Shujing Zhao  <pearly.zhao@oracle.com>
10219         * config/sh/predicates.md: Use REG_P, MEM_P, CONST_INT_P, LABEL_P,
10220         JUMP_P, CALL_P, NONJUMP_INSN_P, NOTE_P, BARRIER_P and
10221         JUMP_TABLE_DATA_P where applicable.
10222         * config/sh/sh.c: Ditto.
10223         * config/sh/sh.h: Ditto.
10224         * config/sh/sh.md: Ditto.
10225         * config/sh/symbian.c: Ditto.
10227 2009-06-03  Uros Bizjak  <ubizjak@gmail.com>
10229         * config/i386/driver-i386.c (describe_cache): Optimize
10230         concatenation of strings.  Use snprintf instead of sprintf.
10231         (host_detect_local_cpu): Ditto.  Ignore -march and -mtune for native
10232         target when not compiling with GCC.
10234 2009-06-02  Kaz Kojima  <kkojima@gcc.gnu.org>
10236         * config/sh/sh.c: Revert last change.
10237         (sh_expand_epilogue): Emit a blockage insn before the frame
10238         pointer adjustment unconditionally.
10240 2009-06-02  Richard Sandiford  <r.sandiford@uk.ibm.com>
10242         * config/pa/pa-hpux.h (LINK_SPEC): Remove "%<fwhole-program".
10243         * config/pa/pa-hpux10.h (LINK_SPEC): Likewise.
10244         * config/pa/pa-hpux11.h (LINK_SPEC): Likewise.
10245         * gcc.c (set_collect_gcc_options): Don't add -fwhole-program
10246         to COLLECT_GCC_OPTIONS.
10248 2009-06-02  Richard Sandiford  <r.sandiford@uk.ibm.com>
10250         * collect2.c (target_system_root): New variable.
10251         (main): Handle --sysroot=.
10252         (ignore_library): Strip the sysroot from the library path.
10254 2009-06-02  Richard Sandiford  <r.sandiford@uk.ibm.com>
10256         * Makefile.in (COLLECT2_OBJS): Add collect2-aix.o.
10257         (collect2.o): Depend on collect2-aix.h.
10258         (collect2-aix.o): New rule.
10259         * collect2-aix.h: New file.
10260         * collect2-aix.c: Likewise.
10261         * collect2.c: Include collect2-aix.h.  Don't undefine
10262         OBJECT_FORMAT_COFF if CROSS_AIX_SUPPORT is defined.
10263         Guard native includes with #ifndef CROSS_DIRECTORY_STRUCTURE.
10264         Use TARGET_AIX_VERSION instead of _AIX51.
10265         * config/rs6000/aix43.h (TARGET_AIX_VERSION): Define.
10266         * config/rs6000/aix51.h (TARGET_AIX_VERSION): Likewise.
10267         * config/rs6000/aix52.h (TARGET_AIX_VERSION): Likewise.
10268         * config/rs6000/aix53.h (TARGET_AIX_VERSION): Likewise.
10269         * config/rs6000/aix61.h (TARGET_AIX_VERSION): Likewise.
10271 2009-06-02  Richard Sandiford  <r.sandiford@uk.ibm.com>
10273         * collect2.c (ignore_library): Avoid premature post-increment
10274         and null deference.
10276 2009-06-02  Richard Sandiford  <r.sandiford@uk.ibm.com>
10278         * Makefile.in (libgcc.mvars): Add TARGET_SYSTEM_ROOT.
10279         * config/rs6000/aix.h (LINK_SYSCALLS_SPEC): Add %R to the
10280         !CROSS_DIRECTORY_STRUCTURE alternative and use it for
10281         CROSS_DIRECTORY_STRUCTURE too.
10282         (LINK_LIBG_SPEC): Likewise.
10283         (LIB_SPEC): Add %R to sysroot paths.
10284         * config/rs6000/aix43.h (CPP_SPEC): Add %R to sysroot paths.
10285         (CPLUSPLUS_CPP_SPEC, LIB_SPEC): Likewise.
10286         * config/rs6000/aix51.h: As for aix43.h.
10287         * config/rs6000/aix52.h: Likewise.
10288         * config/rs6000/aix53.h: Likewise.
10289         * config/rs6000/aix61.h: Likewise.
10290         * config/rs6000/t-aix52 (SHLIB_LINK): Add $(TARGET_SYSTEM_ROOT)
10291         to the beginning of sysroot paths.
10293 2009-06-02  Alexandre Oliva  <aoliva@redhat.com>
10295         * print_rtl (print_rtx): Don't print modes in EXPR_LISTs and
10296         INSN_LISTs that are out of the REG_NOTE range.
10298 2009-06-02  Alexandre Oliva  <aoliva@redhat.com>
10300         * loop-unroll.c (struct iv_to_split): Add pointer to next.
10301         (struct var_to_expand): Likewise.
10302         (struct opt_info): Add head and tail for linked lists of the above.
10303         (analyze_insn_to_expand_var): Initialize next.
10304         (analyze_iv_to_split_insn): Likewise.
10305         (analyze_insns_in_loop): Create linked lists.
10306         (allocate_basic_variable): Simplify for use without hash table.
10307         (insert_var_expansion_initialization): Likewise, make it type-safer.
10308         (combine_var_copies_in_loop_exit): Likewise.
10309         (apply_opt_in_copies): Walk lists rather than hash tables.
10310         (release_var_copies): Simplified and inlined by hand into...
10311         (free_opt_info): ... this function.
10313 2009-06-02  Richard Guenther  <rguenther@suse.de>
10315         * tree-ssa-sccvn.c (copy_reference_ops_from_ref): Use DECL_SIZE
10316         for field decls.
10318 2009-06-02  Alexandre Oliva  <aoliva@redhat.com>
10320         * cfgexpand.c (gimple_expand_cfg): Discard the source location
10321         only for builtins that are not overridden.
10323 2009-06-02  Alexandre Oliva  <aoliva@redhat.com>
10325         * gengtype.c (adjust_field_rtx_def): Add NOTE_INSN_DELETED_LABEL's
10326         label string.
10328 2009-06-02  Alexandre Oliva  <aoliva@redhat.com>
10330         * df-core.c (df_ref_debug): Honor -fdump-noaddr.
10332 2009-06-02  Alexandre Oliva  <aoliva@redhat.com>
10334         * combine.c (move_deaths): Compare LUIDs within the same BB only.
10336 2009-06-02  Alexandre Oliva  <aoliva@redhat.com>
10338         * common.opt (fdump-unnumbered-links): New.
10339         * doc/invoke.texi (-fdump-unnumbered-links): Document it.
10340         * print-rtl.c (flag_dump_unnumbered_links): New.
10341         (print_rtx): Test it.
10343 2009-06-02  Richard Earnshaw  <rearnsha@arm.com>
10345         * arm.c (arm_get_frame_offsets): Prefer using r3 for padding a
10346         push/pop multiple to 8-byte alignment.
10348 2009-06-01  Jakub Jelinek  <jakub@redhat.com>
10350         * config/i386/i386.c (queued_cfa_restores): New static variable.
10351         (ix86_add_cfa_restore_note, ix86_add_queued_cfa_restore_notes): New
10352         functions.
10353         (pro_epilogue_adjust_stack): Call ix86_add_queued_cfa_restore_notes.
10354         (ix86_emit_restore_reg_using_pop): Add RED_OFFSET argument.
10355         Set RTX_FRAME_RELATED_P immediately after adding a REG_CFA_* note.
10356         Call ix86_add_cfa_restore_note instead of adding REG_CFA_OFFSET
10357         note unconditionally.
10358         (ix86_emit_restore_regs_using_mov): Likewise.
10359         (ix86_emit_restore_sse_regs_using_mov): Likewise.
10360         (ix86_emit_restore_regs_using_pop): Add RED_OFFSET argument, pass
10361         it through to ix86_emit_restore_reg_using_pop.
10362         (ix86_emit_leave): Add RED_OFFSET argument.  Call
10363         ix86_add_queued_cfa_restore_notes.  Call ix86_add_cfa_restore_note
10364         instead of adding REG_CFA_OFFSET note unconditionally.
10365         (ix86_expand_epilogue): Compute RED_OFFSET, pass it down to
10366         the above functions.  Call ix86_add_queued_cfa_restore_notes when
10367         needed.
10369         * dwarf2out.c (dwarf2out_cfi_label): Add FORCE argument, if true,
10370         force output of the label even for dwarf2out_do_cfi_asm.
10371         (add_fde_cfi): If -g2 and above and cfi might change CFA,
10372         force creation of CFI label and chain DW_CFA_set_loc jumping to it
10373         for convert_cfa_to_fb_loc_list.  Adjust other dwarf2out_cfi_label
10374         caller.
10375         (dwarf2out_stack_adjust, dwarf2out_frame_debug,
10376         dwarf2out_begin_epilogue, dwarf2out_frame_debug_restore_state): Adjust
10377         dwarf2out_cfi_label callers.
10378         * tree.h (dwarf2out_cfi_label): Adjust prototype.
10379         * config/arm/arm.c (thumb_pushpop, thumb1_output_function_prologue):
10380         Adjust dwarf2out_cfi_label callers.
10381         * config/vax/vax.c (vax_output_function_prologue): Likewise.
10383         * config/i386/i386.h (struct machine_cfa_state,
10384         struct machine_function): Guard with ifndef USED_FOR_TARGET
10385         instead of not IN_LIBGCC2 and not in IN_TARGET_LIBS.
10387         PR other/40024
10388         * emutls.c (__emutls_get_address): Change arr->size to mean number
10389         of allocated arr->data entries instead of # of slots + 1.
10391         PR middle-end/40316
10392         * recog.c (peep2_reinit_state): New function.
10393         (peephole2_init_state): Use it at the end of a basic block and also
10394         when seeing a RTX_FRAME_RELATED_P insn.
10396 2009-06-01  Steve Ellcey  <sje@cup.hp.com>
10398         * ia64.md (floatdirf2, fix_truncrfdi, floatunsdirf,
10399         fixuns_truncrfdi2): New.
10400         (fix_truncxfdi2_alts, fixuns_truncxfdi2_alts,
10401         *nmaddsf4_alts, *nmadddf4_alts, *nmadddf4_truncsf_alts,
10402         *mulxf3_alts, *mulxf3_truncsf_alts, *mulxf3_truncdf_alts,
10403         *maddxf4_alts, *maddxf4_alts_truncsf, *maddxf4_alts_truncdf,
10404         *nmaddxf4_alts, *nmaddxf4_truncsf_alts, *nmaddxf4_truncdf_alts,
10405         *recip_approx): Remove.
10406         (divsi3 modsi3, udivsi3, umodsi3, divsi3_internal, divdi3,
10407         moddi3, udivdi3, umoddi3, divdi3_internal_lat, divdi3_internal_thr,
10408         divsf3, sqrtsf2, divdf3, sqrtdf2, divxf3, sqrtxf2): Modify and
10409         move to div.md.
10410         * div.md (fix_truncrfdi2_alts, fixuns_truncrfdi2_alt,
10411         setf_exp_rf): New.
10413 2009-06-01  Ian Lance Taylor  <iant@google.com>
10415         * attribs.c (register_attribute): Use CONST_CAST.
10416         * collect2.c (main): Use CONST_CAST2.
10417         (scan_prog_file): Likewise.
10418         * gcc.c (process_command, main): Likewise.
10419         * toplev.c (toplev_main): Likewise.
10421         * c-typeck.c (handle_warn_cast_qual): New static function,
10422         partially broken out of build_c_cast.
10423         (build_c_cast): Call handle_warn_cast_qual.
10424         * doc/invoke.texi (Warning Options): Document new effect of
10425         -Wcast-qual.
10427 2009-06-01  Aldy Hernandez  <aldyh@redhat.com>
10429         * diagnostic.c (diagnostic_build_prefix): Always print columns.
10430         (diagnostic_report_current_module): Print columns.
10431         * common.opt (flag_show_column): Enable by default.
10433 2009-06-01  Luis Machado  <luisgpm@br.ibm.com>
10435         * alias.c (find_base_term): Check for NULL term before returning.
10437 2009-06-01  Maxim Kuvyrkov  <maxim@codesourcery.com>
10439         Revert due to PR40320:
10440         2009-06-01  Maxim Kuvyrkov  <maxim@codesourcery.com>
10441         * calls.c (emit_library_call_value_1): Don't force_operand for move
10442         and push insns.
10444 2009-06-01  Olivier Hainque  <hainque@adacore.com>
10445             Eric Botcazou  <ebotcazou@adacore.com>
10447         * tree.h (CONSTRUCTOR_BITFIELD_P): True if NODE, a FIELD_DECL, is
10448         to be processed as a bitfield for constructor output purposes.
10449         * output.h (initializer_constant_valid_for_bitfield_p): Declare
10450         new function.
10451         * varasm.c (oc_local_state): New type, output_constructor
10452         local state to support communication with helpers.
10453         (oc_outer_state): New type, output_constructor outer state of
10454         relevance in recursive calls.
10455         (output_constructor_array_range): New output_constructor helper,
10456         extracted code for an array range element.
10457         (output_constructor_regular_field): New output_constructor helper,
10458         extracted code for an element that is not a bitfield.
10459         (output_constructor_bitfield): New output_constructor helper,
10460         extracted code for a bitfield element.  Accept an OUTER state
10461         argument for recursive processing.  Recurse on record or array
10462         CONSTRUCTOR values, possibly past noop conversions.
10463         (initializer_constant_valid_for_bitfield_p): New predicate.  Whether
10464         VALUE is a valid constant-valued expression for use in a static
10465         bit-field initializer.
10466         (output_constructor): Rework to use helpers.  Accept and honor an
10467         OUTER state argument for recursive calls.  Return total size.  Be
10468         prepared for nested constructors initializing bitfields.
10469         (output_constant): Feed OUTER in calls to output_constructor.
10471 2009-06-01  Maxim Kuvyrkov  <maxim@codesourcery.com>
10473         * calls.c (emit_library_call_value_1): Don't force_operand for move
10474         and push insns.
10476 2009-06-01  Nick Clifton  <nickc@redhat.com>
10478         * doc/invoke.texi (IA-64 Options): Fix typo.
10480 2009-06-01  Ira Rosen  <irar@il.ibm.com>
10482         PR tree-optimization/39129
10483         * tree-vect-loop-manip.c (conservative_cost_threshold): Change the
10484         printed message.
10485         (vect_do_peeling_for_loop_bound): Use
10486         LOOP_REQUIRES_VERSIONING_FOR_ALIGNMENT and
10487         LOOP_REQUIRES_VERSIONING_FOR_ALIAS macros.
10488         (vect_loop_versioning): Likewise.
10489         (vect_create_cond_for_alias_checks): Fix indentation.
10490         * tree-vectorizer.h (struct _loop_vec_info): Fix indentation of the
10491         macros.
10492         (LOOP_REQUIRES_VERSIONING_FOR_ALIGNMENT): Define.
10493         (LOOP_REQUIRES_VERSIONING_FOR_ALIAS): Likewise.
10494         * tree-vect-loop.c (vect_analyze_loop_form): Change "too many BBs" to
10495         "control flow in loop".
10496         (vect_estimate_min_profitable_iters): Use
10497         LOOP_REQUIRES_VERSIONING_FOR_ALIGNMENT and
10498         LOOP_REQUIRES_VERSIONING_FOR_ALIAS macros.
10499         * tree-vect-data-refs.c (vect_enhance_data_refs_alignment): Likewise.
10500         (vect_create_data_ref_ptr): Don't mention array dimension in printing.
10501         * tree-vect-stmts.c (vectorizable_store): Replace the check that the
10502         statement belongs to a group of strided accesses with the exact code
10503         check.
10504         (vectorizable_load): Likewise.
10505         * tree-vect-slp.c (vect_analyze_slp_instance): Spell out "basic block".
10506         (vect_slp_analyze_bb, vect_slp_transform_bb): Likewise.
10508 2009-06-01  Gerald Pfeifer  <gerald@pfeifer.com>
10510         * config/freebsd-stdint.h: New file.
10511         * config.gcc (*-*-freebsd): Set use_gcc_stdint=wrap.
10512         Add freebsd-stdint.h to tm_file.
10514 2009-06-01  Richard Earnshaw  <rearnsha@arm.com>
10516         * arm/thumb2.md (thumb2_zero_extendhidi2): New insn and split.
10517         (thumb2_extendhidi2): Likewise.
10519 2009-05-31  Ian Lance Taylor  <iant@google.com>
10521         * regstat.c (regstat_n_sets_and_refs): Remove duplicate definition.
10523 2009-05-31  Ian Lance Taylor  <iant@google.com>
10525         * Makefile.in (except.o): Depend upon gt-except.h, not gt-$(EXCEPT_H).
10526         (ipa-cp.o): Depend upon $(FIBHEAP_H) and $(PARAMS_H).
10527         (ipa-reference.o): Depend upon gt-ipa-reference.h.
10529 2009-05-31  Jason Merrill  <jason@redhat.com>
10531         * tree-pretty-print.c (print_call_name): Take the callee, not the
10532         call itself.  Make non-static.  Use dump_function_name for functions.
10533         (dump_generic_node): Adjust.
10534         * diagnostic.h: Declare print_call_name.
10535         * gimple-pretty-print.c (dump_gimple_call): Use it.
10537 2009-05-31  Kaz Kojima  <kkojima@gcc.gnu.org>
10539         * config/sh/sh.md (ashldi3_std): New define_expand.
10540         (ashldi3): Use it.
10542 2009-05-31  Kaz Kojima  <kkojima@gcc.gnu.org>
10544         PR target/40313
10545         * config/sh/sh.c: Include debug.h.
10546         (sh_expand_epilogue): Emit a blockage insn before the frame
10547         pointer adjustment also when dwarf2out_do_frame returns true.
10549 2009-05-31  Richard Earnshaw  <rearnsha@arm.com>
10551         * arm/thumb2.md (thumb2_extendsidi2): Add a split sub-pattern.
10552         (thumb2_extendqidi2): New pattern.
10554 2009-05-31  Ira Rosen  <irar@il.ibm.com>
10556         * tree-vect-loop-manip.c (slpeel_update_phi_nodes_for_guard1): Don't
10557         mark phis for renaming.
10558         * tree-vectorizer.c (vect_memsyms_to_rename): Remove.
10559         (vectorize_loops): Don't allocate and free vect_memsyms_to_rename.
10560         Call mark_sym_for_renaming.
10561         * tree-vectorizer.h (vect_memsyms_to_rename): Remove.
10562         * tree-vect-loop.c (vect_transform_loop): Remove
10563         vect_memsyms_to_rename initialization and a call to
10564         mark_set_for_renaming.
10566 2009-05-31  Jakub Jelinek  <jakub@redhat.com>
10568         PR middle-end/40304
10569         * config/i386/i386.c (pro_epilogue_adjust_stack): Mark insns
10570         frame related even if !set_cfa && style < 0.
10572 2009-05-30  Kai Tietz  <kai.tietz@onevision.com>
10574         * config/i386/mingw-tls.c: New file.
10575         * config/i386/t-gthr-win32 (LIB2FUNCS_EXTRA): Add mingw-tls.c file.
10576         * gthr-win32.h (MINGW32_SUPPORTS_MT_EH): Define it for targets
10577         defining _WIN32 but not __CYGWIN__.
10579 2009-05-29  Kaveh R. Ghazi  <ghazi@caip.rutgers.edu>
10581         * configure.ac: Add MPC support.
10583         * config.in, configure: Regenerate.
10585 2009-05-29  Richard Henderson  <rth@redhat.com>
10587         * cfgcleanup.c (try_crossjump_to_edge): Only skip past
10588         NOTE_INSN_BASIC_BLOCK.
10589         * cfglayout.c (duplicate_insn_chain): Copy epilogue insn marks.
10590         Duplicate NOTE_INSN_EPILOGUE_BEG notes.
10591         * cfgrtl.c (can_delete_note_p): Allow NOTE_INSN_EPILOGUE_BEG
10592         to be deleted.
10593         * dwarf2out.c (struct cfa_loc): Change indirect field to bitfield,
10594         add in_use field.
10595         (add_cfi): Disable check redefining cfa away from drap.
10596         (lookup_cfa_1): Add remember argument; handle remember/restore.
10597         (lookup_cfa): Pass remember argument.
10598         (cfa_remember): New.
10599         (compute_barrier_args_size_1): Remove sibcall check.
10600         (dwarf2out_frame_debug_def_cfa): New.
10601         (dwarf2out_frame_debug_adjust_cfa): New.
10602         (dwarf2out_frame_debug_cfa_offset): New.
10603         (dwarf2out_frame_debug_cfa_register): New.
10604         (dwarf2out_frame_debug_cfa_restore): New.
10605         (dwarf2out_frame_debug): Handle REG_CFA_* notes.
10606         (dwarf2out_begin_epilogue): New.
10607         (dwarf2out_frame_debug_restore_state): New.
10608         (dw_cfi_oprnd1_desc): Handle DW_CFA_remember_state,
10609         DW_CFA_restore_state.
10610         (output_cfi_directive): Likewise.
10611         (convert_cfa_to_fb_loc_list): Likewise.
10612         (dw_cfi_oprnd1_desc): Handle DW_CFA_restore.
10613         * dwarf2out.h: Update.
10614         * emit-rtl.c (try_split): Don't split RTX_FRAME_RELATED_P.
10615         (copy_insn_1): Early out for null.
10616         * final.c (final_scan_insn): Call dwarf2out_begin_epilogue
10617         and dwarf2out_frame_debug_restore_state.
10618         * function.c (prologue, epilogue, sibcall_epilogue): Remove.
10619         (prologue_insn_hash, epilogue_insn_hash): New.
10620         (free_after_compilation): Adjust freeing accordingly.
10621         (record_insns): Create hash table if needed; push insns into
10622         hash instead of array.
10623         (maybe_copy_epilogue_insn): New.
10624         (contains): Search hash table instead of array.
10625         (sibcall_epilogue_contains): Remove.
10626         (thread_prologue_and_epilogue_insns): Split eh_return insns
10627         and mark them as epilogues.
10628         (reposition_prologue_and_epilogue_notes): Rewrite epilogue
10629         scanning in terms of basic blocks.
10630         * insn-notes.def (CFA_RESTORE_STATE): New.
10631         * jump.c (returnjump_p_1): Accept EH_RETURN.
10632         (eh_returnjump_p_1, eh_returnjump_p): New.
10633         * reg-notes.def (CFA_DEF_CFA, CFA_ADJUST_CFA, CFA_OFFSET,
10634         CFA_REGISTER, CFA_RESTORE): New.
10635         * rtl.def (EH_RETURN): New.
10636         * rtl.h (eh_returnjump_p, maybe_copy_epilogue_insn): Declare.
10638         * config/bfin/bfin.md (UNSPEC_VOLATILE_EH_RETURN): Remove.
10639         (eh_return_internal): Use eh_return rtx; split w/ epilogue.
10641         * config/i386/i386.c (gen_push): Update cfa state.
10642         (pro_epilogue_adjust_stack): Add set_cfa argument.  When true,
10643         add a CFA_ADJUST_CFA note.
10644         (ix86_dwarf_handle_frame_unspec): Remove.
10645         (ix86_expand_prologue): Update cfa state.
10646         (ix86_emit_restore_reg_using_pop): New.
10647         (ix86_emit_restore_regs_using_pop): New.
10648         (ix86_emit_leave): New.
10649         (ix86_emit_restore_regs_using_mov): Add CFA_RESTORE notes.
10650         (ix86_expand_epilogue): Add notes for unwinding the epilogue.
10651         * config/i386/i386.h (struct machine_cfa_state): New.
10652         (ix86_cfa_state): New.
10653         * config/i386/i386.md (UNSPEC_EH_RETURN): Remove.
10654         (eh_return_internal): Merge from eh_return_<mode>,
10655         use eh_return rtx, split w/ epilogue.
10657 2009-05-29  Ian Lance Taylor  <iant@google.com>
10659         * builtins.c (validate_gimple_arglist): Don't use va_arg with
10660         enum type.
10661         * calls.c (emit_library_call_value_1): Likewise.
10663         * c-typeck.c (c_build_va_arg): New function.
10664         * c-tree.h (c_build_va_arg): Declare.
10665         * c-parser.c (c_parser_postfix_expression): Call c_build_va_arg
10666         instead of build_va_arg.
10668 2009-05-29  Eric Botcazou  <ebotcazou@adacore.com>
10670         * tree-ssa-loop-ivopts.c (strip_offset_1) <MULT_EXPR>: New case.
10671         (force_expr_to_var_cost) <NEGATE_EXPR>: Likewise.
10672         (ptr_difference_cost): Use affine combinations to compute it.
10673         (difference_cost): Likewise.
10674         (get_computation_cost_at): Compute more accurate cost for addresses
10675         if the ratio is a multiplier allowed in addresses.
10676         For non-addresses, consider that an additional offset or symbol is
10677         added only once.
10679 2009-05-29  Jakub Jelinek  <jakub@redhat.com>
10681         * config/i386/i386.c (ix86_decompose_address): Avoid useless
10682         0 displacement.  Add 0 displacement if base is %[er]bp or %r13.
10684         * config/i386/i386.md (prefix_data16, prefix_rep): Set to 0 for
10685         TYPE_SSE{MULADD,4ARG,IADD1,CVT1} by default.
10686         (prefix_rex): For UNIT_MMX don't imply the prefix by default
10687         if MODE_DI.
10688         (prefix_extra): Default to 2 for TYPE_SSE{MULADD,4ARG} and
10689         to 1 for TYPE_SSE{IADD1,CVT1}.
10690         (prefix_vex_imm8): Removed.
10691         (length_vex): Only pass 1 as second argument to
10692         ix86_attr_length_vex_default if prefix_extra is 0.
10693         (modrm): For TYPE_INCDEC only set to 0 if not TARGET_64BIT.
10694         (length): For prefix vex computation use length_immediate
10695         attribute instead of prefix_vex_imm8.
10696         (cmpqi_ext_3_insn, cmpqi_ext_3_insn_rex64,
10697         addqi_ext_1, addqi_ext_1_rex64, *testqi_ext_0, andqi_ext_0,
10698         *andqi_ext_0_cc, *iorqi_ext_0, *xorqi_ext_0, *xorqi_cc_ext_1,
10699         *xorqi_cc_ext_1_rex64): Override modrm attribute to 1.
10700         (extendsidi2_rex64, extendhidi2, extendqidi2, extendhisi2,
10701         *extendhisi2_zext, extendqihi2, extendqisi2, *extendqisi2_zext): Emit
10702         a space in between the operands.
10703         (*anddi_1_rex64, *andsi_1): Likewise.  Override prefix_rex to 1
10704         if one operand is 0xff and the other one si, di, bp or sp.
10705         (*andhi_1): Override prefix_rex to 1 if one operand is 0xff and the
10706         other one si, di, bp or sp.
10707         (*btsq, *btrq, *btcq, *btdi_rex64, *btsi): Add mode attribute.
10708         (*ffssi_1, *ffsdi_1, ctzsi2, ctzdi2): Add
10709         type and mode attributes.
10710         (*bsr, *bsr_rex64, *bsrhi): Add type attribute.
10711         (*cmpfp_i_mixed, *cmpfp_iu_mixed): For TYPE_SSECOMI, clear
10712         prefix_rep attribute and set prefix_data16 attribute iff MODE_DF.
10713         (*cmpfp_i_sse, *cmpfp_iu_sse): Clear prefix_rep attribute and set
10714         prefix_data16 attribute iff MODE_DF.
10715         (*movsi_1): For TYPE_SSEMOV MODE_SI set prefix_data16 attribute.
10716         (fix_trunc<mode>di_sse): Set prefix_rex attribute.
10717         (*adddi_4_rex64, *addsi_4): Use const128_operand instead of
10718         constm128_operand in length_immediate computation.
10719         (*addhi_4): Likewise.  Fix mode attribute to MODE_HI.
10720         (anddi_1_rex64): Use movzbl/movzwl instead of movzbq/movzwq.
10721         (*avx_ashlti3, sse2_ashlti3, *avx_lshrti3, sse2_lshrti3): Set
10722         length_immediate attribute to 1.
10723         (x86_fnstsw_1, x86_fnstcw_1, x86_fldcw_1): Fix length attribute.
10724         (*movdi_1_rex64): Override prefix_rex or prefix_data16 attributes
10725         for certain alternatives.
10726         (*movdf_nointeger, *movdf_integer_rex64, *movdf_integer): Override
10727         prefix_data16 attribute if MODE_V1DF.
10728         (*avx_setcc<mode>, *sse_setcc<mode>, *sse5_setcc<mode>): Set
10729         length_immediate to 1.
10730         (set_got_rex64, set_rip_rex64): Remove length attribute, set
10731         length_address to 4, set mode attribute to MODE_DI.
10732         (set_got_offset_rex64): Likewise.  Set length_immediate to 0.
10733         (fxam<mode>2_i387): Set length attribute to 4.
10734         (*prefetch_sse, *prefetch_sse_rex, *prefetch_3dnow,
10735         *prefetch_3dnow_rex): Override length_address attribute.
10736         (sse4_2_crc32<mode>): Override prefix_data16 and prefix_rex
10737         attributes.
10738         * config/i386/predicates.md (ext_QIreg_nomode_operand): New predicate.
10739         (constm128_operand): Removed.
10740         * config/i386/i386.c (memory_address_length): For
10741         disp && !index && !base in 64-bit mode account for SIB byte if
10742         print_operand_address can't optimize disp32 into disp32(%rip)
10743         and UNSPEC doesn't imply (%rip) addressing.  Add 1 to length
10744         for fs: or gs: segment.
10745         (ix86_attr_length_immediate_default): When checking if shortform
10746         is possible, truncate immediate to the length of the non-shortened
10747         immediate.
10748         (ix86_attr_length_address_default): Ignore MEM_P operands
10749         with X constraint.
10750         (ix86_attr_length_vex_default): Only check for DImode on
10751         GENERAL_REG_P operands.
10752         * config/i386/sse.md (<sse>_comi, <sse>_ucomi): Clear
10753         prefix_rep attribute, set prefix_data16 attribute iff MODE_DF.
10754         (sse_cvttps2pi): Clear prefix_rep attribute.
10755         (sse2_cvttps2dq, *sse2_cvtpd2dq, sse2_cvtps2pd): Clear prefix_data16
10756         attribute.
10757         (*sse2_cvttpd2dq): Don't clear prefix_rep attribute.
10758         (*avx_ashr<mode>3, ashr<mode>3, *avx_lshr<mode>3, lshr<mode>3,
10759         *avx_ashl<mode>3, ashl<mode>3): Set length_immediate attribute to 1
10760         iff operand 2 is const_int_operand.
10761         (*vec_dupv4si, avx_shufpd256_1, *avx_shufpd_<mode>,
10762         sse2_shufpd_<mode>): Set length_immediate attribute to 1.
10763         (sse2_pshufd_1): Likewise.  Set prefix attribute to maybe_vex
10764         instead of vex.
10765         (sse2_pshuflw_1, sse2_pshufhw_1): Set length_immediate to 1 and clear
10766         prefix_data16.
10767         (sse2_unpckhpd, sse2_unpcklpd, sse2_storehpd, *vec_concatv2df): Set
10768         prefix_data16 attribute for movlpd and movhpd instructions.
10769         (sse2_loadhpd, sse2_loadlpd, sse2_movsd): Likewise.  Override
10770         length_immediate for shufpd instruction.
10771         (sse2_movntsi, sse3_lddqu): Clear prefix_data16 attribute.
10772         (avx_cmpp<avxmodesuffixf2c><mode>3,
10773         avx_cmps<ssemodesuffixf2c><mode>3, *avx_maskcmp<mode>3,
10774         <sse>_maskcmp<mode>3, <sse>_vmmaskcmp<mode>3,
10775         avx_shufps256_1, *avx_shufps_<mode>, sse_shufps_<mode>,
10776         *vec_dupv4sf_avx, *vec_dupv4sf): Set length_immediate attribute to 1.
10777         (*avx_cvtsi2ssq, *avx_cvtsi2sdq): Set length_vex attribute to 4.
10778         (sse_cvtsi2ssq, sse2_cvtsi2sdq): Set prefix_rex attribute to 1.
10779         (sse2_cvtpi2pd, sse_loadlps, sse2_storelpd): Override
10780         prefix_data16 attribute for the first alternative to 1.
10781         (*avx_loadlps): Override length_immediate for the first alternative.
10782         (*vec_concatv2sf_avx): Override length_immediate and prefix_extra
10783         attributes for second alternative.
10784         (*vec_concatv2sf_sse4_1): Override length_immediate and
10785         prefix_data16 attributes for second alternative.
10786         (*vec_setv4sf_avx, *avx_insertps, vec_extract_lo_<mode>,
10787         vec_extract_hi_<mode>, vec_extract_lo_v16hi,
10788         vec_extract_hi_v16hi, vec_extract_lo_v32qi,
10789         vec_extract_hi_v32qi): Set prefix_extra and length_immediate to 1.
10790         (*vec_setv4sf_sse4_1, sse4_1_insertps, *sse4_1_extractps): Set
10791         prefix_data16 and length_immediate to 1.
10792         (*avx_mulv2siv2di3, *avx_mulv4si3, sse4_2_gtv2di3): Set prefix_extra
10793         to 1.
10794         (*avx_<code><mode>3, *avx_eq<mode>3, *avx_gt<mode>3): Set
10795         prefix_extra attribute for variants that don't have 0f prefix alone.
10796         (*avx_pinsr<ssevecsize>): Likewise.  Set length_immediate to 1.
10797         (*sse4_1_pinsrb, *sse2_pinsrw, *sse4_1_pinsrd, *sse4_1_pextrb,
10798         *sse4_1_pextrb_memory, *sse2_pextrw, *sse4_1_pextrw_memory,
10799         *sse4_1_pextrd): Set length_immediate to 1.
10800         (*sse4_1_pinsrd): Likewise.  Set prefix_extra to 1.
10801         (*sse4_1_pinsrq, *sse4_1_pextrq): Set prefix_rex and length_immediate
10802         to 1.
10803         (*vec_extractv2di_1_rex64_avx, *vec_extractv2di_1_rex64,
10804         *vec_extractv2di_1_avx, *vec_extractv2di_1_sse2): Override
10805         length_immediate to 1 for second alternative.
10806         (*vec_concatv2si_avx, *vec_concatv2di_rex64_avx): Override
10807         prefix_extra and length_immediate attributes for the first
10808         alternative.
10809         (vec_concatv2si_sse4_1): Override length_immediate to 1 for the
10810         first alternative.
10811         (*vec_concatv2di_rex64_sse4_1): Likewise.  Override prefix_rex
10812         to 1 for the first and third alternative.
10813         (*vec_concatv2di_rex64_sse): Override prefix_rex to 1 for the second
10814         alternative.
10815         (*sse2_maskmovdqu, *sse2_maskmovdqu_rex64): Override length_vex
10816         attribute.
10817         (*sse_sfence, sse2_mfence, sse2_lfence): Override length_address
10818         attribute to 0.
10819         (*avx_phaddwv8hi3, *avx_phadddv4si3, *avx_phaddswv8hi3,
10820         *avx_phsubwv8hi3, *avx_phsubdv4si3, *avx_phsubswv8hi,
10821         *avx_pmaddubsw128, *avx_pmulhrswv8hi3, *avx_pshufbv16qi3,
10822         *avx_psign<mode>3): Set prefix_extra attribute to 1.
10823         (ssse3_phaddwv4hi3, ssse3_phadddv2si3, ssse3_phaddswv4hi3,
10824         ssse3_phsubwv4hi3, ssse3_phsubdv2si3, ssse3_phsubswv4hi3,
10825         ssse3_pmaddubsw, *ssse3_pmulhrswv4hi, ssse3_pshufbv8qi3,
10826         ssse3_psign<mode>3): Override prefix_rex attribute.
10827         (*avx_palignrti): Override prefix_extra and length_immediate to 1.
10828         (ssse3_palignrti): Override length_immediate to 1.
10829         (ssse3_palignrdi): Override length_immediate to 1, override
10830         prefix_rex attribute.
10831         (abs<mode>2): Override prefix_rep to 0, override prefix_rex attribute.
10832         (sse4a_extrqi): Override length_immediate to 2.
10833         (sse4a_insertqi): Likewise.  Override prefix_data16 to 0.
10834         (sse4a_insertq): Override prefix_data16 to 0.
10835         (avx_blendp<avxmodesuffixf2c><avxmodesuffix>,
10836         avx_blendvp<avxmodesuffixf2c><avxmodesuffix>,
10837         avx_dpp<avxmodesuffixf2c><avxmodesuffix>, *avx_mpsadbw,
10838         *avx_pblendvb, *avx_pblendw, avx_roundp<avxmodesuffixf2c>256,
10839         avx_rounds<avxmodesuffixf2c>256): Override prefix_extra
10840         and length_immediate to 1.
10841         (sse4_1_blendp<ssemodesuffixf2c>, sse4_1_dpp<ssemodesuffixf2c>,
10842         sse4_2_pcmpestr, sse4_2_pcmpestri, sse4_2_pcmpestrm,
10843         sse4_2_pcmpestr_cconly, sse4_2_pcmpistr, sse4_2_pcmpistri,
10844         sse4_2_pcmpistrm, sse4_2_pcmpistr_cconly): Override prefix_data16
10845         and length_immediate to 1.
10846         (sse4_1_blendvp<ssemodesuffixf2c>): Override prefix_data16 to 1.
10847         (sse4_1_mpsadbw, sse4_1_pblendw): Override length_immediate to 1.
10848         (*avx_packusdw, avx_vtestp<avxmodesuffixf2c><avxmodesuffix>,
10849         avx_ptest256): Override prefix_extra to 1.
10850         (sse4_1_roundp<ssemodesuffixf2c>, sse4_1_rounds<ssemodesuffixf2c>):
10851         Override prefix_data16 and length_immediate to 1.
10852         (sse5_pperm_zero_v16qi_v8hi, sse5_pperm_sign_v16qi_v8hi,
10853         sse5_pperm_zero_v8hi_v4si, sse5_pperm_sign_v8hi_v4si,
10854         sse5_pperm_zero_v4si_v2di, sse5_pperm_sign_v4si_v2di,
10855         sse5_vrotl<mode>3, sse5_ashl<mode>3, sse5_lshl<mode>3): Override
10856         prefix_data16 to 0 and prefix_extra to 2.
10857         (sse5_rotl<mode>3, sse5_rotr<mode>3): Override length_immediate to 1.
10858         (sse5_frcz<mode>2, sse5_vmfrcz<mode>2): Don't override prefix_extra
10859         attribute.
10860         (*sse5_vmmaskcmp<mode>3, sse5_com_tf<mode>3,
10861         sse5_maskcmp<mode>3, sse5_maskcmp<mode>3, sse5_maskcmp_uns<mode>3):
10862         Override prefix_data16 and prefix_rep to 0, length_immediate to 1
10863         and prefix_extra to 2.
10864         (sse5_maskcmp_uns2<mode>3, sse5_pcom_tf<mode>3): Override
10865         prefix_data16 to 0, length_immediate to 1 and prefix_extra to 2.
10866         (*avx_aesenc, *avx_aesenclast, *avx_aesdec, *avx_aesdeclast,
10867         avx_vpermilvar<mode>3,
10868         avx_vbroadcasts<avxmodesuffixf2c><avxmodesuffix>,
10869         avx_vbroadcastss256, avx_vbroadcastf128_p<avxmodesuffixf2c>256,
10870         avx_maskloadp<avxmodesuffixf2c><avxmodesuffix>,
10871         avx_maskstorep<avxmodesuffixf2c><avxmodesuffix>):
10872         Override prefix_extra to 1.
10873         (aeskeygenassist, pclmulqdq): Override length_immediate to 1.
10874         (*vpclmulqdq, avx_vpermil<mode>, avx_vperm2f128<mode>3,
10875         vec_set_lo_<mode>, vec_set_hi_<mode>, vec_set_lo_v16hi,
10876         vec_set_hi_v16hi, vec_set_lo_v32qi, vec_set_hi_v32qi): Override
10877         prefix_extra and length_immediate to 1.
10878         (*avx_vzeroall, avx_vzeroupper, avx_vzeroupper_rex64): Override
10879         modrm to 0.
10880         (*vec_concat<mode>_avx): Override prefix_extra and length_immediate
10881         to 1 for the first alternative.
10882         * config/i386/mmx.md (*mov<mode>_internal_rex64): Override
10883         prefix_rep, prefix_data16 and/or prefix_rex attributes in certain
10884         cases.
10885         (*mov<mode>_internal_avx, *movv2sf_internal_rex64,
10886         *movv2sf_internal_avx, *movv2sf_internal): Override
10887         prefix_rep attribute for certain alternatives.
10888         (*mov<mode>_internal): Override prefix_rep or prefix_data16
10889         attributes for certain alternatives.
10890         (*movv2sf_internal_rex64_avx): Override prefix_rep and length_vex
10891         attributes for certain alternatives.
10892         (*mmx_addv2sf3, *mmx_subv2sf3, *mmx_mulv2sf3,
10893         *mmx_<code>v2sf3_finite, *mmx_<code>v2sf3, mmx_rcpv2sf2,
10894         mmx_rcpit1v2sf3, mmx_rcpit2v2sf3, mmx_rsqrtv2sf2, mmx_rsqit1v2sf3,
10895         mmx_haddv2sf3, mmx_hsubv2sf3, mmx_addsubv2sf3,
10896         *mmx_eqv2sf3, mmx_gtv2sf3, mmx_gev2sf3, mmx_pf2id, mmx_pf2iw,
10897         mmx_pi2fw, mmx_floatv2si2, mmx_pswapdv2sf2, *mmx_pmulhrwv4hi3,
10898         mmx_pswapdv2si2): Set prefix_extra attribute to 1.
10899         (mmx_ashr<mode>3, mmx_lshr<mode>3, mmx_ashl<mode>3): Set
10900         length_immediate to 1 if operand 2 is const_int_operand.
10901         (*mmx_pinsrw, mmx_pextrw, mmx_pshufw_1, *vec_dupv4hi,
10902         *vec_extractv2si_1): Set length_immediate attribute to 1.
10903         (*mmx_uavgv8qi3): Override prefix_extra attribute to 1 if
10904         using old 3DNOW insn rather than SSE/3DNOW_A.
10905         (mmx_emms, mmx_femms): Clear modrm attribute.
10907 2009-05-29  Martin Jambor  <mjambor@suse.cz>
10909         * tree-sra.c:  New implementation of SRA.
10911         * params.def (PARAM_SRA_MAX_STRUCTURE_SIZE): Removed.
10912         (PARAM_SRA_MAX_STRUCTURE_COUNT): Removed.
10913         (PARAM_SRA_FIELD_STRUCTURE_RATIO): Removed.
10914         * params.h (SRA_MAX_STRUCTURE_SIZE): Removed.
10915         (SRA_MAX_STRUCTURE_COUNT): Removed.
10916         (SRA_FIELD_STRUCTURE_RATIO): Removed.
10917         * doc/invoke.texi (sra-max-structure-size): Removed.
10918         (sra-field-structure-ratio): Removed.
10920 2009-05-29  Jakub Jelinek  <jakub@redhat.com>
10922         PR middle-end/40291
10923         * builtins.c (expand_builtin_memcmp): Convert len to sizetype
10924         before expansion.
10926 2009-05-29  Andrey Belevantsev  <abel@ispras.ru>
10928         PR rtl-optimization/40101
10929         * sel-sched-ir.c (get_seqno_by_preds): Allow returning negative
10930         seqno.  Adjust comment.
10931         * sel-sched.c (find_seqno_for_bookkeeping): Assert that when
10932         inserting bookkeeping before a jump, the jump is not scheduled.
10933         When no positive seqno found, provide a value.  Add comment.
10935 2009-05-29  Richard Guenther  <rguenther@suse.de>
10937         * tree-ssa-alias.c (nonaliasing_component_refs_p): Remove
10938         short-cutting on the first component.
10940 2009-05-29  Jakub Jelinek  <jakub@redhat.com>
10942         PR middle-end/39958
10943         * omp-low.c (scan_omp_1_op): Call remap_type on TREE_TYPE
10944         for trees other than decls/types.
10946 2009-05-29  Richard Guenther  <rguenther@suse.de>
10948         * tree-ssa-operands.c (get_expr_operands): Do not handle
10949         INDIRECT_REFs in the handled-component case.  Remove
10950         unused get_ref_base_and_extent case.
10951         * tree-dfa.c (get_ref_base_and_extent): Avoid calling
10952         tree_low_cst and host_integerp where possible.
10953         * tree-ssa-structalias.c (equiv_class_label_eq): Check hash
10954         codes for equivalence.
10955         * dce.c (find_call_stack_args): Avoid redundant bitmap queries.
10957 2009-05-29  David Billinghurst <billingd@gcc.gnu.org>
10959         * config.gcc: Add i386/t-fprules-softfp and soft-fp/t-softfp
10960         to tmake_file for i[34567]86-*-cygwin*.
10962 2009-05-29  Jakub Jelinek  <jakub@redhat.com>
10964         PR target/40017
10965         * config/rs6000/rs6000-c.c (_Bool_keyword): New variable.
10966         (altivec_categorize_keyword, init_vector_keywords,
10967         rs6000_cpu_cpp_builtins): Define _Bool as conditional macro
10968         similar to bool.
10970 2009-05-29  Kai Tietz  <kai.tietz@onevision.com>
10972         * tree.c (handle_dll_attribute): Check if node is
10973         of kind FUNCTION_DECL for DECL_DECLARED_INLINE_P check.
10975 2009-05-29  Richard Earnshaw  <rearnsha@arm.com>
10977         * config/arm/thumb2.md (thumb2_zero_extendsidi2): Add a split
10978         component.
10979         (thumb2_zero_extendqidi2): Likewise.
10981 2009-05-28  Kaz Kojima  <kkojima@gcc.gnu.org>
10983         * config/sh/sh.c (sh_expand_t_scc): Use gen_xorsi3_movrt
10984         instead of gen_movrt.
10985         * config/sh/sh.md (movrt): Remove.
10987 2009-05-28  Steve Ellcey  <sje@cup.hp.com>
10989         * doc/invoke.texi (IA-64 Options):
10990         Add -msdata, -mfused-madd, -mno-inline-float-divide,
10991         -mno-inline-int-divide, -mno-inline-sqrt, -msched-spec-ldc,
10992         -msched-spec-control-ldc, -msched-prefer-non-data-spec-insns,
10993         -msched-prefer-non-control-spec-insns,
10994         -msched-stop-bits-after-every-cycle,
10995         -msched-count-spec-in-critical-path,
10996         -msel-sched-dont-check-control-spec, -msched-fp-mem-deps-zero-cost
10997         -msched-max-memory-insns-hard-limit, -msched-max-memory-insns.
10998         Remove -mt, -pthread, -msched-ldc, -mno-sched-control-ldc,
10999         and -msched-spec-verbose.
11001 2009-05-28  Joseph Myers  <joseph@codesourcery.com>
11003         * config/arm/lib1funcs.asm (__clear_cache): Define if L_clear_cache.
11004         * config/arm/linux-eabi.h (CLEAR_INSN_CACHE): Define to give an
11005         error if used.
11006         * config/arm/t-linux-eabi (LIB1ASMFUNCS): Add _clear_cache.
11008 2009-05-28  Richard Guenther  <rguenther@suse.de>
11010         * tree-ssa-alias.c (ao_ref_init): New function.
11011         (ao_ref_base): Likewise.
11012         (ao_ref_base_alias_set): Likewise.
11013         (ao_ref_alias_set): Likewise.
11014         (refs_may_alias_p_1): Change signature.
11015         (refs_may_alias_p): Adjust.
11016         (refs_anti_dependent_p): Likewise.
11017         (refs_output_dependent_p): Likewise.
11018         (call_may_clobber_ref_p_1): Change signature.
11019         (call_may_clobber_ref_p): Adjust.
11020         (stmt_may_clobber_ref_p_1): New function split out from ...
11021         (stmt_may_clobber_ref_p): ... here.
11022         (maybe_skip_until): Adjust signature.
11023         (get_continuation_for_phi): Likewise.
11024         (walk_non_aliased_vuses): Likewise.
11025         * tree-ssa-alias.h (struct ao_ref_s): New structure type.
11026         (ao_ref_init): Declare.
11027         (ao_ref_base): Likewise.
11028         (ao_ref_alias_set): Likewise.
11029         (stmt_may_clobber_ref_p_1): Likewise.
11030         (walk_non_aliased_vuses): Adjust.
11031         * tree-ssa-sccvn.c (ao_ref_init_from_vn_reference): New function.
11032         (get_ref_from_reference_ops): remove.
11033         (vn_reference_lookup_2): Adjust signature.
11034         (vn_reference_lookup_3): Do not re-build trees.  Handle unions.
11035         (vn_reference_lookup_pieces): Adjust signature, do not re-build trees.
11036         (vn_reference_lookup): Adjust.
11037         (vn_reference_insert): Likewise.
11038         (vn_reference_insert_pieces): Adjust signature.
11039         (visit_reference_op_call): Adjust.
11040         * tree-ssa-pre.c (get_expr_type): Simplify.
11041         (phi_translate_1): Adjust.
11042         (compute_avail): Likewise.
11043         (translate_vuse_through_block): Do not re-build trees.
11044         (value_dies_in_block_x): Likewise.
11045         * tree-ssa-sccvn.h (struct vn_reference_s): Add type and alias-set
11046         fields.
11047         (vn_reference_lookup_pieces): Adjust declaration.
11048         (vn_reference_insert_pieces): Likewise.
11050 2009-05-28  Benjamin Kosnik  <bkoz@redhat.com>
11052         * tree-ssa-copy.c (replace_exp_1): Move op for warning-free use
11053         with checking disabled.
11055 2009-05-28  Dave Korn  <dave.korn.cygwin@gmail.com>
11057         PR target/37216
11059         * configure.ac (HAVE_GAS_ALIGNED_COMM):  Add autoconf test and
11060         macro definition for support of three-operand format aligned
11061         .comm directive in assembler on cygwin/pe/mingw target OS.
11062         * configure:  Regenerate.
11063         * config.h:  Regenerate.
11065         * config/i386/winnt.c (i386_pe_asm_output_aligned_decl_common):  Use
11066         aligned form of .comm directive if -mpe-aligned-commons is in effect.
11067         * config/i386/cygming.opt (-mpe-aligned-commons):  Add new option.
11069         * doc/invoke.texi (-mpe-aligned-commons):  Document new target option.
11070         * doc/tm.texi (ASM_OUTPUT_COMMON):  Document zero size commons.
11072 2009-05-28  Ira Rosen  <irar@il.ibm.com>
11074         PR tree-optimization/40254
11075         * tree-data-ref.c (dr_analyze_innermost): Take POFFSET into account
11076         in analysis of basic blocks.
11078 2009-05-28  Adam Nemet  <anemet@caviumnetworks.com>
11080         PR middle-end/33699
11081         * target.h (struct gcc_target): Fix indentation.  Add const_anchor.
11082         * target-def.h (TARGET_CONST_ANCHOR): New macro.
11083         (TARGET_INITIALIZER): Use it.
11084         * cse.c (CHEAPER): Move it up to the other macros.
11085         (insert): Rename this ...
11086         (insert_with_costs): ... to this.  Add cost parameters.  Update
11087         function comment.
11088         (insert): New function.  Call insert_with_costs.
11089         (compute_const_anchors, insert_const_anchor, insert_const_anchors,
11090         find_reg_offset_for_const, try_const_anchors): New functions.
11091         (cse_insn): Call try_const_anchors.  Adjust cost of src_related
11092         when using a const-anchor.  Call insert_const_anchors.
11093         * config/mips/mips.c (mips_set_mips16_mode): Set targetm.const_anchor.
11094         * doc/tm.texi (Misc): Document TARGET_CONST_ANCHOR.
11096 2009-05-28  Alexandre Oliva  <aoliva@redhat.com>
11098         * tree-inline.c (remap_decls): Enable nonlocalized variables
11099         when not optimizing.
11101 2009-05-28  Alexandre Oliva  <aoliva@redhat.com>
11103         * tree-ssa-live.c (remove_unused_locals): Skip when not optimizing.
11104         Simplify other tests involving optimize.
11106 2009-05-27  Tom Tromey  <tromey@redhat.com>
11108         * unwind-dw2.c (_Unwind_DebugHook): New function.
11109         (uw_install_context): Call _Unwind_DebugHook.
11111 2009-05-27  Tom Tromey  <tromey@redhat.com>
11113         * system.h (CONST_CAST2): Use C++ const_cast when compiled as C++
11115 2009-05-27  Ian Lance Taylor  <iant@google.com>
11117         * Makefile.in (LINKER, LINKER_FLAGS): Define.
11118         (LINKER_FOR_BUILD, BUILD_LINKERFLAGS): Define.
11119         (ALL_LINKERFLAGS): Define.
11120         (xgcc$(exeext)): Change $(COMPILER) to $(LINKER).
11121         (cpp$(exeext), cc1-dummy$(exeext), cc1$(exeext)): Likewise.
11122         (collect2$(exeext), mips-tfile, mips-tdump): Likewise.
11123         (gcov$(exeext), gcov-dump$(exeext)): Likewise.
11124         (build/gen%$(build_exeext)): Change $(COMPILER_FOR_BUILD) to
11125         $(LINKER_FOR_BUILD).
11126         (build/gcov-iov$(build_exeext)): Likewise.
11128 2009-05-27  Julian Brown  <julian@codesourcery.com>
11130         * gcse.c (target.h): Include.
11131         (can_assign_to_reg_without_clobbers_p): Check that the target allows
11132         copy of argument to a pseudo register.
11134 2009-05-27  Diego Novillo  <dnovillo@google.com>
11136         * tree-ssa-live.c (dump_scope_block): Document arguments.
11137         (dump_scope_blocks): Document.
11138         (debug_scope_blocks): New.
11139         * tree-flow.h (debug_scope_blocks): Declare.
11141 2009-05-21  Denis Chertykov  <denisc@overta.ru>
11143         * doc/contrib.texi (Contributors): Add myself to the list.
11145 2009-05-27  Olivier Hainque  <hainque@adacore.com>
11147         * expr.c (target_align): New function.  Alignment the TARGET of an
11148         assignment may be assume to have.
11149         (highest_pow2_factor_for_target): Use it instead of relying on
11150         immediate tree attributes of TARGET, not necessarily honored when
11151         intermediate bitfields are involved.
11153 2009-05-27  H.J. Lu  <hongjiu.lu@intel.com>
11155         PR target/40266
11156         * config/i386/driver-i386.c (host_detect_local_cpu): Support
11157         AVX, SSE4, AES, PCLMUL and POPCNT.
11159 2009-05-27  Diego Novillo  <dnovillo@google.com>
11161         * tree-pretty-print.c (dump_location): New.
11162         (dump_generic_node): Call it.
11163         Factor code to handle BLOCK nodes ...
11164         (dump_block_node): ... here.
11166 2009-05-27  Rafael Avila de Espindola  <espindola@google.com>
11168         * Makefile.in (GCC_PLUGIN_H): New. Replace all uses of gcc-plugin.h
11169         with it.
11170         * doc/plugins.texi: Document that gcc-plugin.h must be the first to be
11171         included.
11172         * gcc-plugin.h: Include config.h and system.h.
11173         (IN_GCC): Define if not defined.
11175 2009-05-27  Hans-Peter Nilsson  <hp@axis.com>
11177         PR middle-end/40249
11178         * Makefile.in (CRTSTUFF_CFLAGS): Replace -fno-inline-functions
11179         with -fno-inline.
11181 2009-05-27  Shujing Zhao  <pearly.zhao@oracle.com>
11183         * config/m32r/m32r.c: Use REG_P, MEM_P and CONST_INT_P where
11184         applicable.
11185         * config/m32r/m32r.h: Ditto.
11186         * config/m32r/m32r.md: Ditto.
11187         * config/m32r/predicates.md: Ditto.
11189 2009-05-27  Alexandre Oliva  <aoliva@redhat.com>
11191         * cgraph.c (dump_cgraph_node): Honor -fdump-noaddr.
11193 2009-05-26  Basile Starynkevitch  <basile@starynkevitch.net>
11195         * doc/plugins.texi
11196         (Loading plugins): typo.
11197         (Plugin callbacks): Documented PLUGIN_INFO, PLUGIN_GGC_START,
11198         PLUGIN_GGC_MARKING, PLUGIN_GGC_END, PLUGIN_REGISTER_GGC_ROOTS.
11199         (Interacting with the GCC Garbage Collector): Added new section.
11200         (Giving information about a plugin): Added new section for
11201         PLUGIN_INFO.
11202         * ggc.h (ggc_register_root_tab): Added declaration.
11203         * gcc-plugin.h (PLUGIN_GGC_START, PLUGIN_GGC_MARKING)
11204         (PLUGIN_GGC_END, PLUGIN_REGISTER_GGC_ROOTS): Added new events.
11205         (register_callback): Improved comment in declaration.
11206         * ggc-common.c (const_ggc_root_tab_t) Added new typedef for vectors.
11207         (extra_root_vec) Added static variable for dynamic roots registration.
11208         (ggc_register_root_tab) Added new routine.
11209         (ggc_mark_roots) Added iteration inside extra_root_vec, and invoke
11210         PLUGIN_GGC_MARKING event.
11211         * ggc-zone.c: Include plugin.h.
11212         (ggc_collect): Invoke PLUGIN_GGC_START & PLUGIN_GGC_END events.
11213         * ggc-page.c: Include plugin.h.
11214         (ggc_collect): Invoke PLUGIN_GGC_START & PLUGIN_GGC_END events.
11215         * plugin.c (plugin_event_name): added names of PLUGIN_GGC_START,
11216         PLUGIN_GGC_MARKING, PLUGIN_GGC_END, PLUGIN_REGISTER_GGC_ROOTS
11217         (register_callback): check lack of callbacks for
11218         pseudo-events. Added handling of PLUGIN_REGISTER_GGC_ROOTS,
11219         PLUGIN_GGC_START, PLUGIN_GGC_MARKING, PLUGIN_GGC_END.
11220         (invoke_plugin_callbacks): Handle PLUGIN_GGC_START,
11221         PLUGIN_GGC_MARKING, PLUGIN_GGC_END, PLUGIN_REGISTER_GGC_ROOTS.
11222         * Makefile.in (ggc-common.o, ggc-zone.o, ggc-page.o): Added
11223         dependency on plugin.h.
11224         (plugin.o): Added dependency on ggc.h...
11226 2009-05-26  Richard Guenther  <rguenther@suse.de>
11228         PR middle-end/40248
11229         Revert
11230         * expr.c (expand_expr_real_1): Avoid calling do_store_flag
11231         with mismatched comparison modes.
11233         * expr.c (expand_expr_real_1): Expand the operand of a
11234         VIEW_CONVERT_EXPR in its natural mode.
11236 2009-05-26  Ian Lance Taylor  <iant@google.com>
11238         * Makefile.in (COMPILER, COMPILER_FLAGS): Define.
11239         (COMPILER_FOR_BUILD, BUILD_COMPILERFLAGS): Define.
11240         (ALL_COMPILERFLAGS): Define.
11241         (.c.o, xgcc$(exeext), cpp$(exeext)): Use $(COMPILER).
11242         (cc1-dummy$(exeext), cc1$(exeext)): Likewise.
11243         (collect2$(exeext), collect2.o): Likewise.
11244         (c-opts.o, c-cppbuiltin.o, c-pch.o, gcc.o, gccspec.o): Likewise.
11245         (gcc-options.o, version.o, prefix.o, toplev.o): Likewise.
11246         ($(out_object_file), mips-tfile, mips-tdump): Likewise.
11247         (libbackend.o, intl.o, cppdefault.o): Likewise.
11248         (gcov$(exeext), gcov-dump$(exeext)): Likewise.
11249         (build/%.o): Use $(COMPILER_FOR_BUILD).
11250         (build/gen%$(build_exeext)): Likewise.
11251         (build/gcov-iov$(build_exeext)): LIkewise.
11252         * config/t-darwin (darwin.o): Use $(COMPILER).
11253         (darwin-c.o, darwin-f.o, darwin-driver.o): Likewise.
11254         * config/t-sol2 (sol2-c.o): Likewise.
11255         (sol2.o): Likewise.
11256         * config/t-vxworks (vxworks.o): Likewise.
11257         * config/x-darwin (host-darwin.o): Likewise.
11258         * config/x-hpux (host-hpux.o): Likewise.
11259         * config/x-linux (host-linux.o): Likewise.
11260         * config/x-solaris (host-solaris.o): Likewise.
11261         * config/alpha/x-alpha (driver-alpha.o): Likewise.
11262         * config/arm/t-arm (arm-c.o): Likewise.
11263         * config/arm/t-pe (pe.o): Likewise.
11264         * config/arm/t-wince-pe (pe.o): Likewise.
11265         * config/i386/t-cygming (winnt.o): Likewise.
11266         (winnt-cxx.o, winnt-stubs.o, msformat-c.o): Likewise.
11267         * config/i386/t-cygwin (cygwin1.o): Likewise.
11268         (cygwin2.o): Likewise.
11269         * config/i386/t-i386 (i386-c.o): Likewise.
11270         * config/i386/t-interix (winnt.o): Likewise.
11271         * config/i386/t-netware (netware.o): Likewise.
11272         * config/i386/t-nwld (nwld.o): Likewise.
11273         * config/i386/x-darwin (host-i386-darwin.o): Likewise.
11274         * config/i386/x-i386 (driver-i386.o): Likewise.
11275         * config/i386/x-cygwin (host-cygwin.o): Likewise.
11276         * config/i386/x-mingw32 (host-mingw32.o): Likewise.
11277         * config/ia64/t-ia64 (ia64-c.o): Likewise.
11278         * config/m32c/t-m32c (m32c-pragma.o): Likewise.
11279         * config/mips/x-native (driver-native.o): Likewise.
11280         * config/rs6000/t-rs6000 (rs6000-c.o): Likewise.
11281         * config/rs6000/x-darwin (host-ppc-darwin.o): Likewise.
11282         * config/rs6000/x-darwin64 (host-ppc64-darwin.o): Likewise.
11283         * config/rs6000/x-rs6000 (driver-rs6000.o): Likewise.
11284         * config/score/t-score-elf (score7.o): Likewise.
11285         (score3.o): Likewise.
11286         * config/sh/t-sh (sh-c.o): Likewise.
11287         * config/sh/t-symbian (sh-c.o): Likewise.
11288         (symbian.o): Likewise.
11289         * config/spu/t-spu-elf (spu-c.o): Likewise.
11290         * config/v850/t-v850 (v850-c.o): Likewise.
11291         * config/v850/t-v850e (v850-c.o): Likewise.
11293 2009-05-26  Richard Guenther  <rguenther@suse.de>
11295         PR tree-optimization/40122
11296         * tree-ssa-ccp.c (ccp_fold): Fold vector CONSTRUCTORs to
11297         VECTOR_CSTs if possible.
11298         (fold_gimple_assign): Likewise.
11300 2009-05-26  Richard Guenther  <rguenther@suse.de>
11302         PR middle-end/40252
11303         * fold-const.c (fold_binary): Use the correct types for building
11304         rotates.
11306 2009-05-26  Richard Guenther  <rguenther@suse.de>
11308         * tree-vect-data-refs.c (vect_create_data_ref_ptr): Remove
11309         redundant calls to merge_alias_info.
11310         (bump_vector_ptr): Likewise.
11311         * tree-ssa-copy.c (merge_alias_info): Remove.
11312         (replace_exp_1): Remove call to merge_alias_info.
11313         (propagate_tree_value): Likewise.
11314         (fini_copy_prop): Propagate points-to info.
11315         * tree-flow.h (merge_alias_info): Remove.
11317 2009-05-07  Hariharan Sandanagobalane <hariharan@picochip.com>
11319         * config/picochip/picochip.C (PARAM_INLINE_CALL_COST): Remove.
11321 2009-05-25  Jan Hubicka  <jh@suse.cz>
11323         * cgraph.c (dump_cgraph_node): Dump size/time/benefit.
11324         * cgraph.h (struct inline_summary): New filed self_wize,
11325         size_inlining_benefit, self_time and time_inlining_benefit.
11326         (struct cgraph_global_info): Replace insns by time ans size fields.
11327         * ipa-cp (ipcp_cloning_candidate_p): Base estimate on size
11328         (ipcp_estimate_growth, ipcp_insert_stage): Likewise.
11329         (ipcp_update_callgraph): Do not touch function bodies.
11330         * ipa-inline.c: Include except.h
11331         (MAX_TIME): New constant.
11332         (overall_insns): Remove.
11333         (leaf_node_p): New.
11334         (overall_size, max_benefit): New static variables.
11335         (cgraph_estimate_time_after_inlining): New function.
11336         (cgraph_estimate_size_after_inlining): Rewrite using benefits.
11337         (cgraph_clone_inlined_nodes): Update size.
11338         (cgraph_mark_inline_edge): Update size.
11339         (cgraph_estimate_growth): Use size info.
11340         (cgraph_check_inline_limits): Check size.
11341         (cgraph_default_inline_p): Likewise.
11342         (cgraph_edge_badness): Compute badness based on benefit and size cost.
11343         (cgraph_decide_recursive_inlining): Check size.
11344         (cgraph_decide_inlining_of_small_function): Update size; dump sizes
11345         and times.
11346         (cgraph_decide_inlining): Likewise.
11347         (cgraph_decide_inlining_incrementally): Likewise; honor
11348         PARAM_EARLY_INLINING_INSNS.
11349         (likely_eliminated_by_inlining_p): New predicate.
11350         (estimate_function_body_sizes): New function.
11351         (compute_inline_parameters): Use it.
11352         * except.c (must_not_throw_labels): New function.
11353         * except.h (must_not_throw_labels): Declare.
11354         * tree-inline.c (init_inline_once): Kill inlining_weigths
11355         * tree-ssa-structalias.c: Avoid uninitialized warning.
11356         * params.def (PARAM_MAX_INLINE_INSNS_SINGLE): Reduce to 300.
11357         (PARAM_MAX_INLINE_INSNS_AUTO): Reduce to 60.
11358         (PARAM_INLINE_CALL_COST): Remove.
11359         (PARAM_EARLY_INLINING_INSNS): New.
11361 2009-05-25  Richard Guenther  <rguenther@suse.de>
11363         PR tree-optimization/36327
11364         * tree-ssa-alias.c (walk_non_aliased_vuses): Add second walker
11365         callback for reference translation or lookup at the point of may-defs.
11366         * tree-ssa-alias.h (walk_non_aliased_vuses): Adjust prototype.
11367         * tree-ssa-sccvn.c (get_ref_from_reference_ops): Bail out
11368         for union COMPONENT_REFs.
11369         (vn_reference_lookup_3): New callback.  Lookup from memset
11370         and CONSTRUCTOR assignment, translate through struct copies.
11371         (vn_reference_lookup_pieces): Make sure to not free the
11372         passed operands array.  Adjust walk_non_aliased_vuses call.
11373         (vn_reference_lookup): Adjust walk_non_aliased_vuses call,
11374         make sure we do not leak memory.
11376 2009-05-25  Richard Guenther  <rguenther@suse.de>
11378         * tree-ssa-alias.h (dump_points_to_solution): Declare.
11379         * tree-inline.c (expand_call_inline): Reset the escaped and
11380         callused solutions.
11381         * tree-ssa-structalias.c (pass_build_ealias): New.
11382         * tree-pass.h (pass_build_ealias): Declare.
11383         * passes.c (init_optimization_passes): Add PTA during
11384         early optimizations.
11385         * tree-ssa-alias.c (dump_alias_info): Dump the ESCAPED
11386         and CALLUSED solutions.
11387         (dump_points_to_solution): New function, split out from ...
11388         (dump_points_to_info_for): ... here.
11389         * tree-parloops.c (parallelize_loops): Reset the escaped and
11390         callused solutions.
11392 2009-05-25  Rainer Orth  <ro@TechFak.Uni-Bielefeld.DE>
11394         PR bootstrap/40027
11395         * config/i386/i386.c (USE_HIDDEN_LINKONCE): Only define if missing.
11396         * config/i386/sol2.h [!TARGET_GNU_LD] (USE_HIDDEN_LINKONCE): Define.
11398 2009-05-25  Ira Rosen  <irar@il.ibm.com>
11400         PR tree-optimization/40238
11401         * tree-vect-stmts.c (vect_init_vector): Insert initialization
11402         statements after basic block's labels.
11403         * tree-vect-slp.c (vect_slp_transform_bb): Call destroy_bb_vec_info()
11404         to free the allocated memory.
11406 2009-05-24  Kaz Kojima  <kkojima@gcc.gnu.org>
11408         * gcc/config/sh/sh.c (sh_set_return_address): Mark store of
11409         return address with a USE.
11411 2009-05-24  Richard Guenther  <rguenther@suse.de>
11413         PR middle-end/40233
11414         * tree.c (make_vector_type): Build the TYPE_DEBUG_REPRESENTATION_TYPEs
11415         array type from the main variant of the inner type.
11417 2009-05-24  Jan-Benedict Glaw  <jbglaw@lug-owl.de>
11419         * config/vax/vax-protos.h (legitimate_constant_address_p): Change
11420         definition to bool (from int) to un-break build.
11421         (legitimate_constant_p, vax_mode_dependent_address_p): Likewise.
11423 2009-05-24  Paolo Bonzini  <bonzini@gnu.org>
11425         * tree-ssa-operands.h (push_stmt_changes, pop_stmt_changes,
11426         discard_stmt_changes): Delete.
11427         * tree-ssa-operands.c (scb_stack): Delete.
11428         (init_ssa_operands): Do not initialize it.
11429         (fini_ssa_operands): Do not free it.
11430         (push_stmt_changes, pop_stmt_changes, discard_stmt_changes): Delete.
11432         * tree-cfg.c (replace_uses_by): Replace pop_stmt_changes with
11433         update_stmt, remove the others.  Fix comments.
11434         * tree-dfa.c (optimize_stack_restore): Likewise.
11435         * tree-ssa-forwprop.c (forward_propagate_addr_expr): Likewise.
11436         * tree-ssa-loop-ivopts.c (rewrite_use): Likewise.
11437         * tree-ssa-dce.c (eliminate_unnecessary_stmts): Likewise.
11438         * tree-ssa-ccp.c (optimize_stack_restore, execute_fold_all_builtins):
11439         Likewise.
11440         * tree-ssa-propagate.c (substitute_and_fold): Likewise.
11441         * tree-ssa-dom.c (propagate_rhs_into_lhs): Likewise.
11442         (dom_opt_finalize_block): Likewise, adjusting access to
11443         stmts_to_rescan.
11444         (optimize_stmt): Likewise, adjusting access to stmts_to_rescan.
11445         (stmts_to_rescan): Change item type to gimple.
11446         (tree_ssa_dominator_optimize): Change type of stmts_to_rescan.
11448 2009-05-24  Ira Rosen  <irar@il.ibm.com>
11450         * doc/passes.texi (Tree-SSA passes): Document SLP pass.
11451         * tree-pass.h (pass_slp_vectorize): New pass.
11452         * params.h (SLP_MAX_INSNS_IN_BB): Define.
11453         * timevar.def (TV_TREE_SLP_VECTORIZATION): Define.
11454         * tree-vectorizer.c (timevar.h): Include.
11455         (user_vect_verbosity_level): Declare.
11456         (vect_location): Fix comment.
11457         (vect_set_verbosity_level): Update user_vect_verbosity_level
11458         instead of vect_verbosity_level.
11459         (vect_set_dump_settings): Add an argument. Ignore user defined
11460         verbosity if dump flags require higher level of verbosity. Print to
11461         stderr only for loop vectorization.
11462         (vectorize_loops): Update call to vect_set_dump_settings.
11463         (execute_vect_slp): New function.
11464         (gate_vect_slp): Likewise.
11465         (struct gimple_opt_pass pass_slp_vectorize): New.
11466         * tree-vectorizer.h (struct _bb_vec_info): Define along macros to
11467         access its members.
11468         (vec_info_for_bb): New function.
11469         (struct _stmt_vec_info): Add bb_vinfo and a macro for its access.
11470         (VECTORIZATION_ENABLED): New macro.
11471         (SLP_ENABLED, SLP_DISABLED): Likewise.
11472         (vect_is_simple_use): Add bb_vec_info argument.
11473         (new_stmt_vec_info, vect_analyze_data_ref_dependences,
11474         vect_analyze_data_refs_alignment, vect_verify_datarefs_alignment,
11475         vect_analyze_data_ref_accesses, vect_analyze_data_refs,
11476         vect_schedule_slp, vect_analyze_slp): Likewise.
11477         (vect_analyze_stmt): Add slp_tree argument.
11478         (find_bb_location): Declare.
11479         (vect_slp_analyze_bb, vect_slp_transform_bb): Likewise.
11480         * tree-vect-loop.c (new_loop_vec_info): Adjust function calls.
11481         (vect_analyze_loop_operations, vect_analyze_loop,
11482         get_initial_def_for_induction, vect_create_epilog_for_reduction,
11483         vect_finalize_reduction, vectorizable_reduction,
11484         vectorizable_live_operation, vect_transform_loop): Likewise.
11485         * tree-data-ref.c (dr_analyze_innermost): Update comment,
11486         skip evolution analysis if analyzing a basic block.
11487         (dr_analyze_indices): Likewise.
11488         (initialize_data_dependence_relation): Skip the test whether the
11489         object is invariant for basic blocks.
11490         (compute_all_dependences): Skip dependence analysis for data
11491         references in basic blocks.
11492         (find_data_references_in_stmt): Don't fail in case of invariant
11493         access in basic block.
11494         (find_data_references_in_bb): New function.
11495         (find_data_references_in_loop): Move code to
11496         find_data_references_in_bb and add a call to it.
11497         (compute_data_dependences_for_bb): New function.
11498         * tree-data-ref.h (compute_data_dependences_for_bb): Declare.
11499         * tree-vect-data-refs.c (vect_check_interleaving): Adjust to the case
11500         that STEP is 0.
11501         (vect_analyze_data_ref_dependence): Check for interleaving in case of
11502         unknown dependence in basic block and fail in case of dependence in
11503         basic block.
11504         (vect_analyze_data_ref_dependences): Add bb_vinfo argument, get data
11505         dependence instances from either loop or basic block vectorization
11506         info.
11507         (vect_compute_data_ref_alignment): Check if it is loop vectorization
11508         before calling nested_in_vect_loop_p.
11509         (vect_compute_data_refs_alignment): Add bb_vinfo argument, get data
11510         dependence instances from either loop or basic block vectorization
11511         info.
11512         (vect_verify_datarefs_alignment): Likewise.
11513         (vect_enhance_data_refs_alignment): Adjust function calls.
11514         (vect_analyze_data_refs_alignment): Likewise.
11515         (vect_analyze_group_access): Fix printing. Skip different checks if
11516         DR_STEP is 0. Keep strided stores either in loop or basic block
11517         vectorization data structure. Fix indentation.
11518         (vect_analyze_data_ref_access): Fix comments, allow zero step in
11519         basic blocks.
11520         (vect_analyze_data_ref_accesses): Add bb_vinfo argument, get data
11521         dependence instances from either loop or basic block vectorization
11522         info.
11523         (vect_analyze_data_refs): Update comment. Call
11524         compute_data_dependences_for_bb to analyze basic blocks.
11525         (vect_create_addr_base_for_vector_ref): Check for outer loop only in
11526         case of loop vectorization. In case of basic block vectorization use
11527         data-ref itself as a base.
11528         (vect_create_data_ref_ptr): In case of basic block vectorization:
11529         don't advance the pointer, add new statements before the current
11530         statement.  Adjust function calls.
11531         (vect_supportable_dr_alignment): Support only aligned accesses in
11532         basic block vectorization.
11533         * common.opt (ftree-slp-vectorize): New flag.
11534         * tree-vect-patterns.c (widened_name_p): Adjust function calls.
11535         (vect_pattern_recog_1): Likewise.
11536         * tree-vect-stmts.c (process_use): Likewise.
11537         (vect_init_vector): Add new statements in the beginning of the basic
11538         block in case of basic block SLP.
11539         (vect_get_vec_def_for_operand): Adjust function calls.
11540         (vect_finish_stmt_generation): Likewise.
11541         (vectorizable_call): Add assert that it is loop vectorization, adjust
11542         function calls.
11543         (vectorizable_conversion, vectorizable_assignment): Likewise.
11544         (vectorizable_operation): In case of basic block SLP, take
11545         vectorization factor from statement's type and skip the relevance
11546         check. Adjust function calls.
11547         (vectorizable_type_demotion): Add assert that it is loop
11548         vectorization, adjust function calls.
11549         (vectorizable_type_promotion): Likewise.
11550         (vectorizable_store): Check for outer loop only in case of loop
11551         vectorization. Adjust function calls. For basic blocks, skip the
11552         relevance check and don't advance pointers.
11553         (vectorizable_load): Likewise.
11554         (vectorizable_condition): Add assert that it is loop vectorization,
11555         adjust function calls.
11556         (vect_analyze_stmt): Add argument. In case of basic block SLP, check
11557         that it is not reduction, get vector type, call only supported
11558         functions, skip loop specific parts.
11559         (vect_transform_stmt): Check for outer loop only in case of loop
11560         vectorization.
11561         (new_stmt_vec_info): Add new argument and initialize bb_vinfo.
11562         (vect_is_simple_use): Fix comment, add new argument, fix conditions
11563         for external definition.
11564         * passes.c (pass_slp_vectorize): New pass.
11565         * tree-vect-slp.c (find_bb_location): New function.
11566         (vect_get_and_check_slp_defs): Add argument, adjust function calls,
11567         check for patterns only in loops.
11568         (vect_build_slp_tree): Add argument, adjust function calls, fail in
11569         case of multiple types in basic block SLP.
11570         (vect_mark_slp_stmts_relevant): New function.
11571         (vect_supported_load_permutation_p): Fix comment.
11572         (vect_analyze_slp_instance): Add argument. In case of basic block
11573         SLP, take vectorization factor from statement's type, check that
11574         unrolling factor is 1. Adjust function call. Save SLP instance in
11575         either loop or basic block vectorization structure. Return FALSE,
11576         if SLP failed.
11577         (vect_analyze_slp): Add argument. Get strided stores groups from
11578         either loop or basic block vectorization structure. Return FALSE
11579         if basic block SLP failed.
11580         (new_bb_vec_info): New function.
11581         (destroy_bb_vec_info, vect_slp_analyze_node_operations,
11582         vect_slp_analyze_operations, vect_slp_analyze_bb): Likewise.
11583         (vect_schedule_slp): Add argument. Get SLP instances from either
11584         loop or basic block vectorization structure. Set vectorization factor
11585         to be 1 for basic block SLP.
11586         (vect_slp_transform_bb): New function.
11587         * params.def (PARAM_SLP_MAX_INSNS_IN_BB): Define.
11589 2009-05-23  Mark Mitchell  <mark@codesourcery.com>
11591         * final.c (shorten_branches): Do not align labels for jump tables.
11592         (final_scan_insn): Use JUMP_TABLE_DATA_P.
11594 2009-05-23  Eric Botcazou  <ebotcazou@adacore.com>
11596         * doc/passes.texi: Standardize spelling of RTL, Tree and Tree SSA.
11597         Remove outdated reference to flow.c and fix nits.
11598         * doc/gccint.texi: Tweak RTL description.
11599         * doc/rtl.texi: Likewise.
11601 2009-05-23  Denis Chertykov  <chertykov@gmail.com>
11603         * config/avr/avr.c: Change my email address.
11604         * config/avr/avr.h: Likewise.
11605         * config/avr/avr.md: Likewise.
11606         * config/avr/avr-protos.h: Likewise.
11607         * config/avr/libgcc.S: Likewise.
11609 2009-05-22  Trevor Smigiel <Trevor_Smigiel@playstation.sony.com>
11611         * config/spu/spu-protos.h (aligned_mem_p, spu_valid_mov): Remove.
11612         (spu_split_load, spu_split_store): Change return type to int.
11613         (spu_split_convert): Declare.
11614         * config/spu/predicates.md (spu_mem_operand): Remove.
11615         (spu_mov_operand): Update.
11616         (spu_dest_operand, shiftrt_operator, extend_operator): Define.
11617         * config/spu/spu.c (regno_aligned_for_load): Remove.
11618         (reg_aligned_for_addr, spu_expand_load): Define.
11619         (spu_expand_extv): Reimplement and handle MEM.
11620         (spu_expand_insv): Handle MEM.
11621         (spu_sched_reorder): Handle insn's with length 0.
11622         (spu_legitimate_address_p): Reimplement.
11623         (store_with_one_insn_p): Return TRUE for any mode with size
11624         larger than 16 bytes.
11625         (address_needs_split): Define.
11626         (spu_expand_mov): Call spu_split_load and spu_split_store for MEM
11627         operands.
11628         (spu_convert_move): Define.
11629         (spu_split_load): Use spu_expand_load and change all MEM's to TImode.
11630         (spu_split_store): Change all MEM's to TImode.
11631         (spu_init_expanders): Preallocate registers that correspond to
11632         LAST_VIRTUAL_REG+1 and LAST_VIRTUAL_REG+2 and set them with
11633         mark_reg_pointer.
11634         (spu_split_convert): Define.
11635         * config/spu/spu.md (QHSI, QHSDI): New mode iterators.
11636         (_move<mode>, _movdi, _movti): Update predicate and condition.
11637         (load, store): Change to define_split.
11638         (extendqiti2, extendhiti2, extendsiti2, extendditi2): Simplify to
11639         extend<mode>ti2.
11640         (zero_extendqiti2, zero_extendhiti2, <v>lshr<mode>3_imm): Define.
11641         (lshr<mode>3, lshr<mode>3_imm, lshr<mode>3_re): Simplify to one
11642         define_insn_and_split of lshr<mode>3.
11643         (shrqbybi_<mode>, shrqby_<mode>): Simplify to define_expand.
11644         (<v>ashr<mode>3_imm): Define.
11645         (extv, extzv, insv): Allow MEM operands.
11646         (trunc_shr_ti<mode>, trunc_shr_tidi, shl_ext_<mode>ti,
11647         shl_ext_diti, sext_trunc_lshr_tiqisi, zext_trunc_lshr_tiqisi,
11648         sext_trunc_lshr_tihisi, zext_trunc_lshr_tihisi): Define for combine.
11649         (_spu_convert2): Change to define_insn_and_split and remove the
11650         corresponding define_peephole2.
11651         (stack_protect_set, stack_protect_test, stack_protect_test_si):
11652         Change predicates to memory_operand.
11654 2009-05-22  Mark Mitchell  <mark@codesourcery.com>
11656         * config/arm/thumb2.md: Add 16-bit multiply instructions.
11658 2009-05-21  Michael Meissner  <meissner@linux.vnet.ibm.com>
11660         PR tree-optimization/40219
11661         * tree.c (iterative_hash_expr): Make sure the builtin function is
11662         a normal builtin function and not a front end or back end builtin
11663         before indexing into the built_in_decls array.
11665 2009-05-22  Richard Guenther  <rguenther@suse.de>
11667         PR middle-end/38964
11668         * alias.c (write_dependence_p): Do not use TBAA for answering
11669         anti-dependence or output-dependence.
11670         * tree-ssa-structalias.c (set_uids_in_ptset): Remove TBAA pruning code.
11671         (emit_pointer_definition): Remove.
11672         (emit_alias_warning): Likewise.
11673         (find_what_var_points_to): Remove TBAA pruning code.
11674         (find_what_p_points_to): Likewise.  Do not warn about strict-aliasing
11675         violations.
11676         (compute_points_to_sets): Remove code computing the set of
11677         dereferenced pointers.
11678         * tree-data-ref.c (dr_may_alias_p): Properly use the split
11679         oracle for querying anti and output dependencies.
11680         * tree-ssa-alias.c (refs_may_alias_p_1): Add argument specifying
11681         if TBAA may be applied.
11682         (refs_anti_dependent_p): New function.
11683         (refs_output_dependent_p): Likewise.
11684         * tree-ssa-alias.h (refs_anti_dependent_p): Declare.
11685         (refs_output_dependent_p): Likewise.
11686         * doc/tree-ssa.texi (Memory model): New section.
11687         * doc/c-tree.texi (CHANGE_DYNAMIC_TYPE_EXPR): Remove.
11688         * doc/gimple.texi (GIMPLE_CHANGE_DYNAMIC_TYPE): Remove.
11689         * cfgexpand.c (expand_gimple_basic_block): Do not handle
11690         GIMPLE_CHANGE_DYNAMIC_TYPE or CHANGE_DYNAMIC_TYPE_EXPR.
11691         * expr.c (expand_expr_real_1): Likewise.
11692         * gimple-low.c (lower_stmt): Likewise.
11693         * gimple-pretty-print.c (dump_gimple_stmt): Likewise.
11694         (dump_gimple_cdt): Remove.
11695         * gimple.c (gss_for_code): Do not handle GIMPLE_CHANGE_DYNAMIC_TYPE.
11696         (gimple_size): Likewise.
11697         (walk_gimple_op): Likewise.
11698         (is_gimple_stmt): Likewise.
11699         (walk_stmt_load_store_addr_ops): Likewise.
11700         (gimple_build_cdt): Remove.
11701         * gimple.def (GIMPLE_CHANGE_DYNAMIC_TYPE): Remove.
11702         * gimple.h (gimple_cdt_new_type): Remove.
11703         (gimple_cdt_new_type_ptr): Likewise.
11704         (gimple_cdt_set_new_type): Likewise.
11705         (gimple_cdt_location): Likewise.
11706         (gimple_cdt_location_ptr): Likewise.
11707         (gimple_cdt_set_location): Likewise.
11708         * gimplify.c (gimplify_expr): Do not handle CHANGE_DYNAMIC_TYPE_EXPR.
11709         * tree-cfg.c (remove_useless_stmts_1): Do not handle
11710         GIMPLE_CHANGE_DYNAMIC_TYPE.
11711         (verify_types_in_gimple_stmt): Likewise.
11712         * tree-inline.c (estimate_num_insns): Likewise.
11713         (expand_call_inline): Do not copy DECL_NO_TBAA_P.
11714         (copy_decl_to_var): Likewise.
11715         (copy_result_decl_to_var): Likewise.
11716         * tree-pretty-print.c (dump_generic_node): Do not handle
11717         CHANGE_DYNAMIC_TYPE_EXPR.
11718         * tree-ssa-dce.c (mark_stmt_if_obviously_necessary): Likewise.
11719         * tree-ssa-operands.c (get_expr_operands): Likewise.
11720         * tree-ssa-structalias.c (struct variable_info): Remove
11721         no_tbaa_pruning member.
11722         (new_var_info): Do not set it based on DECL_NO_TBAA_P.
11723         (unify_nodes): Do not copy it.
11724         (find_func_aliases): Do not handle GIMPLE_CHANGE_DYNAMIC_TYPE.
11725         (dump_solution_for_var): Do not dump no_tbaa_pruning state.
11726         (set_uids_in_ptset): Do not check it.
11727         (find_what_var_points_to): Likewise.
11728         (compute_tbaa_pruning): Remove.
11729         (compute_points_to_sets): Do not call it.
11730         * tree.c (walk_tree_1): Do not handle CHANGE_DYNAMIC_TYPE_EXPR.
11731         * tree.def (CHANGE_DYNAMIC_TYPE_EXPR): Remove.
11732         * tree.h (CHANGE_DYNAMIC_TYPE_NEW_TYPE): Remove.
11733         (CHANGE_DYNAMIC_TYPE_LOCATION): Likewise.
11734         (DECL_NO_TBAA_P): Likewise.
11735         (struct tree_decl_common): Move no_tbaa_flag to unused flags section.
11736         * omp-low.c (copy_var_decl): Do not copy DECL_NO_TBAA_P.
11737         (expand_omp_atomic_pipeline): Do not set it.
11738         * print-tree.c (print_node): Do not dump it.
11739         * tree-ssa-copyrename.c (copy_rename_partition_coalesce): Remove
11740         redundant check.
11742 2009-05-22 Vladimir Makarov <vmakarov@redhat.com>
11744         PR target/39856
11745         * reg-stack.c (subst_stack_regs_pat): Remove gcc_assert for note
11746         for clobber.
11748 2009-05-22  Mark Mitchell  <mark@codesourcery.com>
11750         * tree.c (handle_dll_attribute): Mark dllexport'd inlines as
11751         non-external.
11753 2009-05-22  Ben Elliston  <bje@au.ibm.com>
11755         * Makefile.in (bversion.h, s-bversion): New targets.
11756         (TOPLEV_H): Add bversion.h.
11757         * toplev.h: Include "bversion.h".
11758         (ATTRIBUTE_GCC_DIAG): When building with checking disabled, use
11759         the __format__ attribute only if compiling with the same version
11760         of GCC as the sources (the "build version").
11762 2009-05-22  Ben Elliston  <bje@au.ibm.com>
11764         * c-format.c (handle_format_attribute): Fix comment typo.
11766 2009-05-21  Steve Ellcey  <sje@cup.hp.com>
11768         PR target/37846
11769         * config/ia64/ia64.opt (mfused-madd): New.
11770         * config/ia64/ia64.h (TARGET_DEFAULT): Set MASK_FUSED_MADD.
11771         * config/ia64/hpux.h (TARGET_DEFAULT): Ditto.
11772         * config/ia64/ia64.md (maddsf4, msubsf4, nmaddsf4,
11773         madddf4, madddf4_trunc, msubdf4, msubdf4_trunc, nmadddf4,
11774         nmadddf4_truncsf, maddxf4, maddxf4_truncsf, maddxf4_truncdf,
11775         msubxf4, msubxf4_truncsf msubxf4_truncdf, nmaddxf4,
11776         nmaddxf4_truncsf, nmaddxf4_truncdf): Check TARGET_FUSED_MADD.
11777         * config/ia64/vect.md (addv2sf3, subv2sf3): Force fpma/fpms
11778         instruction if !TARGET_FUSED_MADD.
11779         (fpma, fpms): Remove colon from name.
11781 2009-05-22  Richard Guenther  <rguenther@suse.de>
11783         * tree-ssa-sccvn.c (copy_reference_ops_from_ref): Record
11784         TMR_ORIGINAL.  Always either record TMR_SYMBOL or TMR_BASE.
11785         * tree-ssa-pre.c (create_component_ref_by_pieces_1): Handle
11786         TARGET_MEM_REF.
11787         (create_expression_by_pieces): Only convert if necessary.
11788         * gimplify.c (gimplify_expr): Handle TARGET_MEM_REF.
11789         * tree-ssa-loop-im.c (gen_lsm_tmp_name): Handle INTEGER_CST.
11791 2009-05-21  Adam Nemet  <anemet@caviumnetworks.com>
11793         * config/mips/mips.md (*extzv_trunc<mode>_exts): Turn into a
11794         regular pattern from a template and rename it ...
11795         (*extzv_truncsi_exts): ... to this.
11797 2009-05-21  Richard Guenther  <rguenther@suse.de>
11799         * cgraph.h (struct cgraph_node): Remove inline_decl member.
11800         * ipa-inline.c (cgraph_mark_inline_edge): Do not check it.
11801         (cgraph_default_inline_p): Likewise.
11802         (cgraph_decide_inlining_incrementally): Likewise.
11804 2009-05-21  H.J. Lu  <hongjiu.lu@intel.com>
11805             Uros Bizjak  <ubizjak@gmail.com>
11807         * config/i386/cpuid.h (bit_MOVBE): New.
11809         * config/i386/driver-i386.c (host_detect_local_cpu): Check movbe.
11811         * config/i386/i386.c (OPTION_MASK_ISA_MOVBE_SET): New.
11812         (OPTION_MASK_ISA_MOVBE_UNSET): Likewise.
11813         (ix86_handle_option): Handle OPT_mmovbe.
11814         (ix86_target_string): Add -mmovbe.
11815         (pta_flags): Add PTA_MOVBE.
11816         (processor_alias_table): Add PTA_MOVBE to "atom".
11817         (override_options): Handle PTA_MOVBE.
11819         * config/i386/i386.h (TARGET_MOVBE): New.
11821         * config/i386/i386.md (bswapsi2): Check TARGET_MOVBE.
11822         (*bswapsi_movbe): New.
11823         (*bswapdi_movbe): Likewise.
11824         (bswapdi2): Renamed to ...
11825         (*bswapdi_1): This.
11826         (bswapdi2): New expander.
11828         * config/i386/i386.opt (mmovbe): New.
11830         * doc/invoke.texi: Document -mmovbe.
11832 2009-05-21  Taras Glek  <tglek@mozilla.com>
11834         * plugin.c (try_init_one_plugin): Updated to new plugin_init API.
11835         * gcc-plugin.h (plugin_init): Updated signature.
11836         * gcc-plugin.h (plugin_name_args): Moved to this header.
11837         * doc/plugins.texi (plugin_init): Updated documention to reflect
11838         API change.
11839         * doc/plugins.texi (plugin_name_args): Added to documention.
11841 2009-05-21  Mark Mitchell  <mark@codesourcery.com>
11843         * config/arm/neon.md (*mul<mode>3add<mode>_neon): New pattern.
11844         (*mul<mode>3neg<mode>add<mode>_neon): Likewise.
11846 2009-05-21  Shujing Zhao  <pearly.zhao@oracle.com>
11848         * config/i386/i386.c: Use REG_P, MEM_P, CONST_INT_P, LABEL_P and
11849         JUMP_TABLE_DATA_P predicates where applicable.
11850         * config/i386/predicates.md: Ditto.
11851         * config/i386/sse.md: Ditto.
11853 2009-05-21  Jakub Jelinek  <jakub@redhat.com>
11855         * config/i386/i386.md (adddi_4_rex64, addsi_4, addhi_4): For
11856         operand2 -128 override length_immediate attribute to 1.
11857         * config/i386/predicates.md (constm128_operand): New predicate.
11859         * config/i386/i386.c (memory_address_length): Handle %r12
11860         the same as %rsp and %r13 the same as %rbp.  For %rsp and %rbp
11861         also check REGNO.
11862         (ix86_attr_length_address_default): For MODE_SI lea in 64-bit
11863         mode look through optional ZERO_EXTEND and SUBREG.
11864         * config/i386/i386.md (R12_REG): New define_constant.
11865         (prefix_data16): For sse unit set also for MODE_TI insns.
11866         (prefix_rex): For -m32 always return 0.  For TYPE_IMOVX
11867         insns set if operand 1 is ext_QIreg_operand.
11868         (modrm): For TYPE_IMOV clear only if not MODE_DI.  For
11869         TYPE_{ALU{,1},ICMP,TEST} insn clear if there is non-shortened
11870         immediate.
11871         (*movdi_extzv_1, zero_extendhidi2, zero_extendqidi2): Change
11872         mode from MODE_DI to MODE_SI.
11873         (movdi_1_rex64): Override modrm and length_immediate attributes
11874         only for movabs (TYPE_IMOV, alternative 2).
11875         (zero_extendsidi2_rex64): Clear prefix_0f attribute if TYPE_IMOVX.
11876         (*float<SSEMODEI24:mode><MODEF:mode>2_mixed_interunit,
11877         *float<SSEMODEI24:mode><MODEF:mode>2_mixed_nointerunit,
11878         *float<SSEMODEI24:mode><MODEF:mode>2_sse_interunit,
11879         *float<SSEMODEI24:mode><MODEF:mode>2_sse_nointerunit): Set
11880         prefix_rex attribute if DImode.
11881         (*adddi_1_rex64, *adddi_2_rex64, *adddi_3_rex64, *adddi_5_rex64,
11882         *addsi_1, *addsi_1_zext, *addsi_2, *addsi_2_zext, *addsi_3,
11883         *addsi_3_zext, *addsi_5, *addhi_1_lea, *addhi_1, *addhi_2, *addhi_3,
11884         *addhi_5, *addqi_1_lea, *addqi_1): Override length_immediate
11885         attribute to 1 if TYPE_ALU and operand 2 is const128_operand.
11886         (pro_epilogue_adjust_stack_1, pro_epilogue_adjust_stack_rex64):
11887         Likewise.  For TYPE_IMOV clear length_immediate attribute.
11888         (*ashldi3_1_rex64, *ashldi3_cmp_rex64, *ashldi3_cconly_rex64,
11889         *ashlsi3_1, *ashlsi3_1_zext, *ashlsi3_cmp, **ashlsi3_cconly,
11890         *ashlsi3_cmp_zext, *ashlhi3_1_lea, *ashlhi3_1, *ashlhi3_cmp,
11891         *ashlhi3_cconly, *ashlqi3_1_lea, *ashlqi3_1, *ashlqi3_cmp,
11892         *ashlqi3_cconly): Override length_immediate attribute to 0 if TYPE_ALU
11893         or one operand TYPE_ISHIFT.
11894         (*ashrdi3_1_one_bit_rex64, *ashrdi3_one_bit_cmp_rex64,
11895         *ashrdi3_one_bit_cconly_rex64, *ashrsi3_1_one_bit,
11896         *ashrsi3_1_one_bit_zext, *ashrsi3_one_bit_cmp,
11897         *ashrsi3_one_bit_cconly, *ashrsi3_one_bit_cmp_zext,
11898         *ashrhi3_1_one_bit, *ashrhi3_one_bit_cmp, *ashrhi3_one_bit_cconly,
11899         *ashrqi3_1_one_bit, *ashrqi3_1_one_bit_slp, *ashrqi3_one_bit_cmp,
11900         *ashrqi3_one_bit_cconly, *lshrdi3_1_one_bit_rex64,
11901         *lshrdi3_cmp_one_bit_rex64, *lshrdi3_cconly_one_bit_rex64,
11902         *lshrsi3_1_one_bit, *lshrsi3_1_one_bit_zext, *lshrsi3_one_bit_cmp,
11903         *lshrsi3_one_bit_cconly, *lshrsi3_cmp_one_bit_zext,
11904         *lshrhi3_1_one_bit, *lshrhi3_one_bit_cmp, *lshrhi3_one_bit_cconly,
11905         *lshrqi3_1_one_bit, *lshrqi3_1_one_bit_slp, *lshrqi2_one_bit_cmp,
11906         *lshrqi2_one_bit_cconly, *rotlsi3_1_one_bit_rex64, *rotlsi3_1_one_bit,
11907         *rotlsi3_1_one_bit_zext, *rotlhi3_1_one_bit, *rotlqi3_1_one_bit_slp,
11908         *rotlqi3_1_one_bit, *rotrdi3_1_one_bit_rex64, *rotrsi3_1_one_bit,
11909         *rotrsi3_1_one_bit_zext, *rotrhi3_one_bit, *rotrqi3_1_one_bit,
11910         *rotrqi3_1_one_bit_slp): Override length_immediate attribute to 0,
11911         set mode attribute, don't override length attribute.
11912         (*btsq, *btrq, *btcq, *btdi_rex64, *btsi): Set prefix_0f attribute
11913         to 1.
11914         (return_internal_long): Set length attribute to 2 instead of 1.
11915         (*strmovqi_rex_1, *strsetqi_rex_1, *rep_stosqi_rex64,
11916         *cmpstrnqi_nz_rex_1, *cmpstrnqi_rex_1, *strlenqi_rex_1): Clear
11917         prefix_rex attribute.
11918         * config/i386/predicates.md (ext_QIreg_operand, const128_operand):
11919         New predicates.
11920         (memory_displacement_only_operand): Always return 0 for TARGET_64BIT.
11922 2009-05-21  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
11924         * config/arm/thumb2.md (orsi_notsi_si): Fix typo in pattern.
11926 2009-05-20  Ian Lance Taylor  <iant@google.com>
11928         * tree.c (build_tree_list_vec_stat): New function.
11929         (ctor_to_vec): New function.
11930         (build_nt_call_vec): New function.
11931         (build_call_array): Change args to be a const pointer.
11932         (build_call_vec): New function.
11933         * tree.h (build_nt_call_vec): Declare.
11934         (build_tree_list_vec_stat): Declare.
11935         (build_tree_list_vec): Define.
11936         (build_call_array): Update declaration.
11937         (build_call_vec): Declare.
11938         (ctor_to_vec): Declare.
11939         * c-common.c (tree_vector_cache): New static variable.
11940         (make_tree_vector): New function.
11941         (release_tree_vector): New function.
11942         (make_tree_vector_single): New function.
11943         (make_tree_vector_copy): New function.
11944         * c-common.h (tree_vector_cache, make_tree_vector): Declare.
11945         (make_tree_vector_single, make_tree_vector_copy): Declare.
11946         * c-parser.c (cached_expr_list_1, cached_expr_list_2): Remove.
11947         (c_parser_expr_list): Don't manage cache here, instead call
11948         make_tree_vector.
11949         (c_parser_release_expr_list): Remove static function.
11950         (c_parser_vec_to_tree_list): Remove static function.
11951         (c_parser_attributes): Call build_tree_list_vec instead of
11952         c_parser_vec_to_tree_list.  Call release_tree_vector instead of
11953         c_parser_release_expr_list.
11954         (c_parser_postfix_expression_after_primary): Likewise.
11955         (c_parser_objc_keywordexpr): Likewise.
11957 2009-05-20  Sandra Loosemore  <sandra@codesourcery.com>
11959         * doc/tm.texi (Misc): Document TARGET_INVALID_PARAMETER_TYPE,
11960         TARGET_INVALID_RETURN_TYPE, TARGET_PROMOTED_TYPE, and
11961         TARGET_CONVERT_TO_TYPE.
11962         * hooks.c (hook_tree_const_tree_null): Define.
11963         * hooks.h (hook_tree_const_tree_null): Declare.
11964         * target.h (struct gcc_target):  Add invalid_parameter_type,
11965         invalid_return_type, promoted_type, and convert_to_type fields.
11966         * target-def.h: (TARGET_INVALID_PARAMETER_TYPE): Define.
11967         (TARGET_INVALID_RETURN_TYPE): Define.
11968         (TARGET_PROMOTED_TYPE): Define.
11969         (TARGET_CONVERT_TO_TYPE): Define.
11970         (TARGET_INITIALIZER): Update for new fields.
11971         * c-decl.c (grokdeclarator): Check targetm.invalid_return_type.
11972         (grokparms): Check targetm.invalid_parameter_type.
11973         * c-typeck.c (default_conversion): Check targetm.promoted_type.
11974         * c-convert.c (convert): Check targetm.convert_to_type.
11976 2009-05-20  Adam Nemet  <anemet@caviumnetworks.com>
11978         * config/mips/mips.md (*extenddi_truncate<mode>,
11979         *extendsi_truncate<mode>): Emit exts if supported.  Add attribute
11980         defintions.
11981         (*extendhi_truncateqi): New define_insn_and_sptit.
11983 2009-05-20  Jakub Jelinek  <jakub@redhat.com>
11985         PR middle-end/40204
11986         * fold-const.c (fold_binary) <case BIT_AND_EXPR>: Avoid infinite
11987         recursion if build_int_cst_type returns the same INTEGER_CST as arg1.
11989 2009-05-20  Eric Botcazou  <ebotcazou@adacore.com>
11991         * fold-const.c (build_fold_addr_expr_with_type): Take the address of
11992         the operand of VIEW_CONVERT_EXPR.
11994 2009-05-20  H.J. Lu  <hongjiu.lu@intel.com>
11996         * config/i386/driver-i386.c (host_detect_local_cpu): Check
11997         extended family and model for Intel processors.  Support Intel Atom.
11999 2009-05-20  Olivier Hainque  <hainque@adacore.com>
12001         * gstab.h (stab_code_type): Define, to be used instead of the
12002         __stab_debug_code enum, made anonymous.  Add 2009 to the copyright
12003         notice.
12004         * dbxout.c (STAB_CODE_TYPE): Remove #define and replace use
12005         occurrences by stab_code_type.
12006         * mips-tfile.c (STAB_CODE_TYPE): Remove #define, unused.
12008 2009-05-20  Martin Jambor  <mjambor@suse.cz>
12010         * tree-flow.h (insert_edge_copies_seq): Undeclare.
12011         (sra_insert_before): Likewise.
12012         (sra_insert_after): Likewise.
12013         (sra_init_cache): Likewise.
12014         (sra_type_can_be_decomposed_p): Likewise.
12015         * tree-mudflap.c (insert_edge_copies_seq): Copied here from tree-sra.c
12016         * tree-sra.c (sra_type_can_be_decomposed_p): Made static.
12017         (sra_insert_before): Likewise.
12018         (sra_insert_after): Likewise.
12019         (sra_init_cache): Likewise.
12020         (insert_edge_copies_seq): Made static and moved upwards.
12022         * tree-complex.c (extract_component): Added VIEW_CONVERT_EXPR switch
12023         case.
12025         * tree-flow-inline.h (contains_view_convert_expr_p): New function.
12027         * ipa-prop.c (get_ssa_def_if_simple_copy): New function.
12028         (determine_cst_member_ptr): Call get_ssa_def_if_simple_copy to skip
12029         simple copies.
12031 2009-05-20  Richard Guenther  <rguenther@suse.de>
12033         * expr.c (expand_expr_real_1): Avoid calling do_store_flag
12034         with mismatched comparison modes.
12036 2009-05-20  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
12038         * config/arm/arm.md (*arm_iorsi3): Refactored for only ARM.
12039         (peephole ior (reg, int) -> mov, ior): Refactored for only ARM.
12040         * config/arm/thumb2.md (*thumb_andsi_not_shiftsi_si): Allow bic
12041         with shifts for Thumb2.
12042         (orsi_notsi): New for orn.
12043         (*thumb_orsi_notshiftsi_si): Allow orn with shifts.
12044         (*thumb2_iorsi3): Rewrite support for iorsi for Thumb2.
12045         * config/arm/arm.c (const_ok_for_op): Split case for IOR for Thumb2.
12046         (arm_gen_constant): Set can_invert for IOR and Thumb2, Add comments.
12047         Don't invert remainder for IOR.
12049 2009-05-19  Zdenek Dvorak  <ook@ucw.cz>
12051         PR tree-optimization/40087
12052         * tree-ssa-loop-niter.c (number_of_iterations_ne_max,
12053         number_of_iterations_ne): Rename never_infinite argument.
12054         (number_of_iterations_lt_to_ne, number_of_iterations_lt,
12055         number_of_iterations_le): Handle pointer-type ivs when
12056         exit_must_be_taken is false.
12057         (number_of_iterations_cond):  Do not always assume that
12058         exit_must_be_taken if the control variable is a pointer.
12060 2009-05-19  Andrew Pinski  <andrew_pinski@playstation.sony.com>
12062         * c-typeck.c (build_binary_op): Allow % on integal vectors.
12063         * doc/extend.texi (Vector Extension): Document that % is allowed too.
12065 2009-05-19  H.J. Lu  <hongjiu.lu@intel.com>
12067         * config/i386/i386.c (ix86_avoid_jump_mispredicts): Check
12068         ASM_OUTPUT_MAX_SKIP_PAD instead of ASM_OUTPUT_MAX_SKIP_ALIGN.
12070 2009-05-19  Manuel López-Ibáñez  <manu@gcc.gnu.org>
12072         PR c/40172
12073         * c.opt (Wlogical-op): Disabled by default.
12074         * c-opt (c_common_post_options): Do not enable Wlogical-op with
12075         Wextra.
12076         * doc/invoke.texi (Wlogical-op): Likewise.
12078 2009-05-19  Eric Botcazou  <ebotcazou@adacore.com>
12080         * tree-scalar-evolution.c (follow_ssa_edge_expr) <NOP_EXPR>: Turn
12081         into CASE_CONVERT.
12082         <PLUS_EXPR>: Strip useless type conversions instead of type nops.
12083         Propagate the type of the first operand.
12084         <ASSERT_EXPR>: Simplify.
12085         (follow_ssa_edge_in_rhs): Use gimple_expr_type to get the type.
12086         Rewrite using the RHS code as discriminant.
12087         <NOP_EXPR>: Turn into CASE_CONVERT.
12088         <PLUS_EXPR>: Propagate the type of the first operand.
12090 2009-05-19  Steve Ellcey  <sje@cup.hp.com>
12092         * config/ia64/ia64-protos.h (ia64_dconst_0_5): New.
12093         (ia64_dconst_0_375): New.
12094         * config/ia64/ia64.c (ia64_override_options): Remove
12095         -minline-sqrt-min-latency warning.
12096         (ia64_dconst_0_5_rtx, ia64_dconst_0_5): New.
12097         (ia64_dconst_0_375_rtx, ia64_dconst_0_375): New
12098         * config/ia64/ia64.md (*sqrt_approx): Remove.
12099         (sqrtsf2): Remove #if 0.
12100         (sqrtsf2_internal_thr): Rewrite and move to div.md.
12101         (sqrtdf): Remove assert.
12102         (sqrtdf2_internal_thr): Rewrite and move to div.md.
12103         (sqrtxf2): Remove #if 0.
12104         (sqrtxf2_internal_thr): Rewrite and move to div.md.
12105         * div.md (sqrt_approx_rf): New.
12106         (sqrtsf2_internal_thr): New implementation.
12107         (sqrtsf2_internal_lat): New.
12108         (sqrtdf2_internal_thr: New implementation.
12109         (sqrtxf2_internal): New implementation.
12111 2009-05-19  Francois-Xavier Coudert  <fxcoudert@gmail.com>
12112             Hans-Peter Nilsson  <hp@axis.com>
12114         * defaults.h (UINT_FAST64_TYPE, INTPTR_TYPE, UINTPTR_TYPE)
12115         (WCHAR_TYPE, MODIFIED_WCHAR_TYPE, PTRDIFF_TYPE, WINT_TYPE)
12116         (INTMAX_TYPE, UINTMAX_TYPE, SIG_ATOMIC_TYPE, INT8_TYPE, INT16_TYPE)
12117         (INT32_TYPE, INT64_TYPE, UINT8_TYPE, UINT16_TYPE, UINT32_TYPE)
12118         (UINT64_TYPE, INT_LEAST8_TYPE, INT_LEAST16_TYPE, INT_LEAST32_TYPE)
12119         (INT_LEAST64_TYPE, UINT_LEAST8_TYPE, UINT_LEAST16_TYPE)
12120         (UINT_LEAST32_TYPE, UINT_LEAST64_TYPE, INT_FAST8_TYPE)
12121         (INT_FAST16_TYPE, INT_FAST32_TYPE, INT_FAST64_TYPE)
12122         (UINT_FAST8_TYPE, UINT_FAST16_TYPE, UINT_FAST32_TYPE)
12123         (SIZE_TYPE, PID_TYPE, CHAR16_TYPE, CHAR32_TYPE): Move defaults here...
12124         * c-common.c: ...from here.
12126 2009-05-19  Manuel López-Ibáñez  <manu@gcc.gnu.org>
12128         * c-common.c (warn_logical_operator): Remove unnecessary conditionals.
12130 2009-05-19  Kaveh R. Ghazi  <ghazi@caip.rutgers.edu>
12132         * builtins.c (do_mpc_arg1): Separate MPFR/MPC C rounding types.
12134 2009-05-19  Ben Elliston  <bje@au.ibm.com>
12136         * unwind-dw2-fde.c (fde_unencoded_compare): Replace type punning
12137         assignments with memcpy calls.
12138         (add_fdes): Likewise.
12139         (binary_search_unencoded_fdes): Likewise.
12140         (linear_search_fdes): Eliminate type puns.
12142 2009-05-19  Richard Guenther  <rguenther@suse.de>
12144         * tree-ssa-forwprop.c (forward_propagate_addr_expr_1): Do
12145         not falsely claim to have propagated into all uses.
12147 2009-05-19  Ben Elliston  <bje@au.ibm.com>
12149         * doc/invoke.texi (C Dialect Options): Update OpenMP specification
12150         version to v3.0.
12152 2009-05-18  Kaz Kojima  <kkojima@gcc.gnu.org>
12154         * config/sh/sh-protos.h (sh_legitimate_address_p): Remove.
12155         * config/sh/sh.c (sh_legitimate_address_p): Make static.
12156         (TARGET_LEGITIMATE_ADDRESS_P): New.
12157         * config/sh/sh.h (GO_IF_LEGITIMATE_ADDRESS): Delete.
12158         * config/sh/sh.md: Clean up references to GO_IF_LEGITIMATE_ADDRESS.
12160 2009-05-18  Dodji Seketeli  <dodji@redhat.com>
12162         PR debug/40109
12163         * dwarf2out.c (gen_type_die_with_usage): Generate the DIE as a
12164         child of the containing namespace's DIE.
12166 2009-05-18  Adam Nemet  <anemet@caviumnetworks.com>
12168         * config/mips/mips.md (*zero_extend<GPR:mode>_trunc<SHORT:mode>,
12169         *zero_extendhi_truncqi):  Move after the zero_extend patterns.
12170         (*extenddi_truncate<mode>, *extendsi_truncate<mode>): Move after the
12171         extend patterns.
12173 2009-05-18  H.J. Lu  <hongjiu.lu@intel.com>
12175         PR target/39942
12176         * config/i386/i386.c (ix86_avoid_jump_misspredicts): Replace
12177         gen_align with gen_pad.
12178         (ix86_reorg): Check ASM_OUTPUT_MAX_SKIP_PAD instead of
12179         #ifdef ASM_OUTPUT_MAX_SKIP_ALIGN.
12181         * config/i386/i386.h (ASM_OUTPUT_MAX_SKIP_PAD): New.
12182         * config/i386/x86-64.h (ASM_OUTPUT_MAX_SKIP_PAD): Likewise.
12184         * config/i386/i386.md (align): Renamed to ...
12185         (pad): This.  Replace ASM_OUTPUT_MAX_SKIP_ALIGN with
12186         ASM_OUTPUT_MAX_SKIP_PAD.
12188 2009-05-18  Andreas Schwab  <schwab@linux-m68k.org>
12190         * config.gcc: Fix variable syntax.
12192         PR target/39531
12193         * config/m68k/m68k.c (output_andsi3): Mask off sign bit copies
12194         before calling exact_log2.
12195         (output_iorsi3): Likewise.
12196         (output_xorsi3): Likewise.
12198 2009-05-18  Kaz Kojima  <kkojima@gcc.gnu.org>
12200         * config/sh/sh.c (expand_cbranchdi4): Use a scratch register
12201         for the none zero constant operand except for EQ and NE
12202         comprisons even when the first operand is R0.
12204 2009-05-18  Andreas Krebbel  <krebbel1@de.ibm.com>
12206         * config/s390/2064.md: Remove trailing whitespaces.
12207         * config/s390/2084.md: Likewise.
12208         * config/s390/constraints.md: Likewise.
12209         * config/s390/fixdfdi.h: Likewise.
12210         * config/s390/libgcc-glibc.ver: Likewise.
12211         * config/s390/s390-modes.def: Likewise.
12212         * config/s390/s390-protos.h: Likewise.
12213         * config/s390/s390.c: Likewise.
12214         * config/s390/s390.h: Likewise.
12215         * config/s390/s390.md: Likewise.
12216         * config/s390/tpf-unwind.h: Likewise.
12218 2009-05-18  Maxim Kuvyrkov  <maxim@codesourcery.com>
12220         * config/m68k/m68k.c (m68k_legitimize_address): Fix typo in signature.
12222 2009-05-18  Maxim Kuvyrkov  <maxim@codesourcery.com>
12224         M68K TLS support.
12225         * configure.ac (m68k-*-*): Check if binutils support TLS.
12226         * configure: Regenerate.
12227         * config/m68k/predicates.md (symbolic_operand): Extend comment.
12228         * config/m68k/constraints.md (Cu): New constraint.
12229         * config/m68k/m68k.md (UNSPEC_GOTOFF): Remove.
12230         (UNSPEC_RELOC16, UNSPEC_RELOC32): New constants.
12231         (movsi): Handle TLS symbols.
12232         (addsi3_5200): Handle XTLS symbols, indent.
12233         * config/m68k/m68k-protos.h (m68k_legitimize_tls_address): Declare.
12234         (m68k_tls_reference_p): Declare.
12235         (m68k_legitimize_address): Declare.
12236         (m68k_unwrap_symbol): Declare.
12237         * config/m68k/m68k.opt (mxtls): New option.
12238         * config/m68k/m68k.c (ggc.h): Include.
12239         (m68k_output_dwarf_dtprel): Implement hook.
12240         (TARGET_HAVE_TLS, TARGET_ASM_OUTPUT_DWARF_DTPREL): Define.
12241         (m68k_expand_prologue): Load GOT pointer when function needs it.
12242         (m68k_illegitimate_symbolic_constant_p): Handle TLS symbols.
12243         (m68k_legitimate_constant_address_p): Same.
12244         (m68k_decompose_address): Handle TLS references.
12245         (m68k_get_gp): New static function.
12246         (enum m68k_reloc): New contants.
12247         (TLS_RELOC_P): New macro.
12248         (m68k_wrap_symbol): New static function.
12249         (m68k_unwrap_symbol): New function.
12250         (m68k_final_prescan_insn_1): New static function.
12251         (m68k_final_prescan_insn): New function.
12252         (m68k_move_to_reg, m68k_wrap_symbol_into_got_ref): New static
12253         functions.
12254         (legitimize_pic_address): Handle TLS references..
12255         (m68k_tls_get_addr, m68k_get_tls_get_addr)
12256         (m68k_libcall_value_in_a0_p)
12257         (m68k_call_tls_get_addr, m68k_read_tp, m68k_get_m68k_read_tp)
12258         (m68k_call_m68k_read_tp): Helper variables and functions for ...
12259         (m68k_legitimize_tls_address): Handle TLS references.
12260         (m68k_tls_symbol_p, m68k_tls_reference_p_1, m68k_tls_reference_p):
12261         New functions.
12262         (m68k_legitimize_address): Handle TLS symbols.
12263         (m68k_get_reloc_decoration): New static function.
12264         (m68k_output_addr_const_extra): Handle UNSPEC_RELOC16 and
12265         UNSPEC_RELOC32.
12266         (m68k_output_dwarf_dtprel): Implement hook.
12267         (print_operand_address): Handle UNSPEC_RELOC16 adn UNSPEC_RELOC32.
12268         (m68k_libcall_value): Return result in A0 instead of D0 when asked by
12269         m68k_call_* routines.
12270         (sched_attr_op_type): Handle TLS symbols.
12271         (gt-m68k.h): Include.
12272         * config/m68k/m68k.h (FINAL_PRESCAN_INSN): Define.
12273         (LEGITIMATE_PIC_OPERAND_P): Support TLS.
12275 2009-05-18  Martin Jambor  <mjambor@suse.cz>
12277         * ipa-prop.c (ipa_check_stmt_modifications): Removed.
12278         (visit_store_addr_for_mod_analysis): New function.
12279         (ipa_detect_param_modifications): Use walk_stmt_load_store_addr_ops.
12280         (determine_cst_member_ptr): Use gimple_assign_single_p.
12281         (ipa_get_stmt_member_ptr_load_param): Use gimple_assign_single_p.
12282         (ipa_analyze_call_uses): Use !gimple_assign_rhs2 rather than number of
12283         operands.  Don't check number of operands of a NOP_EXPR.
12285 2009-05-18  Eric Fisher  <joefoxreal@gmail.com>
12287         * doc/tree-ssa.texi (SSA Operands): Fix a mistake.
12289 2009-05-17  Manuel López-Ibáñez  <manu@gcc.gnu.org>
12291         PR c/40172
12292         * c-common.c (warn_logical_operator): Don't warn if one of
12293         expression isn't always true or false.
12295 2009-05-17  Kai Tietz  <kai.tietz@onevision.com>
12297         * config/i386/biarch32.h: New file.
12298         * config.gcc: Add for target i386-w64-* the biarch32.h to tm_file.
12300 2009-05-17  Adam Nemet  <anemet@caviumnetworks.com>
12302         * config/mips/mips.md (*zero_extend<mode>_trunchi,
12303         *zero_extend<mode>_truncqi): Merge these into ...
12304         (*zero_extend<GPR:mode>_trunc<SHORT:mode>): ... this new pattern.
12305         Name the pattern following this as *zero_extendhi_truncqi.
12307 2009-05-16  Brad Lucier  <lucier@math.purdue.edu>
12309         PR middle-end/39301
12310         * hwint.h: Add macro HOST_WIDEST_INT_PRINT.
12311         * bitmap.c (bitmap_descriptor): Make fields HOST_WIDEST_INT.
12312         (output_info): Make field HOST_WIDEST_INT.
12313         (print_statistics): Use HOST_WIDEST_INT_PRINT.
12314         (dump_bitmat_statistics): Same.
12316 2009-05-16  Francois-Xavier Coudert  <fxcoudert@gmail.com>
12318         * config.gcc (use_gcc_stdint):  Set to wrap.
12319         * config/darwin.h (SIG_ATOMIC_TYPE, INT8_TYPE, INT16_TYPE,
12320         INT32_TYPE, INT64_TYPE, UINT8_TYPE, UINT16_TYPE, UINT32_TYPE,
12321         UINT64_TYPE, INT_LEAST8_TYPE, INT_LEAST16_TYPE, INT_LEAST32_TYPE,
12322         INT_LEAST64_TYPE, UINT_LEAST8_TYPE, UINT_LEAST16_TYPE,
12323         UINT_LEAST32_TYPE, UINT_LEAST64_TYPE, INT_FAST8_TYPE,
12324         INT_FAST16_TYPE, INT_FAST32_TYPE, INT_FAST64_TYPE,
12325         UINT_FAST8_TYPE, UINT_FAST16_TYPE, UINT_FAST32_TYPE,
12326         UINT_FAST64_TYPE, INTPTR_TYPE, UINTPTR_TYPE): Define.
12328 2009-05-16  Joseph Myers  <joseph@codesourcery.com>
12330         * config.gcc (mips*-*-*): Support arch_32, arch_64, tune_32 and
12331         tune_64.
12332         * config/mips/mips.h (MIPS_ABI_DEFAULT, MULTILIB_ABI_DEFAULT):
12333         Move definitions earlier.
12334         (OPT_ARCH64, OPT_ARCH32): Define.
12335         (OPTION_DEFAULT_SPECS): Add entries for arch_32, arch_64, tune_32
12336         and tune_64.
12338 2009-05-16  Richard Earnshaw  <rearnsha@arm.com>
12340         PR target/40153
12341         * arm.md (cstoresi_nltu_thumb1): Use a neg of ltu as the pattern name
12342         implies.
12344 2009-05-16  Richard Earnshaw  <rearnsha@arm.com>
12346         * arm.md (movdi2): Copy non-reg values to DImode registers.
12348 2009-05-16  Jakub Jelinek  <jakub@redhat.com>
12350         PR target/39942
12351         * final.c (label_to_max_skip): New function.
12352         (label_to_alignment): Only use LABEL_TO_ALIGNMENT if
12353         CODE_LABEL_NUMBER <= max_labelno.
12354         * output.h (label_to_max_skip): New prototype.
12355         * config/i386/i386.c (ix86_avoid_jump_misspredicts): Renamed to...
12356         (ix86_avoid_jump_mispredicts): ... this.  Don't define if
12357         ASM_OUTPUT_MAX_SKIP_ALIGN isn't defined.  Update comment.
12358         Handle CODE_LABELs with >= 16 byte alignment or with
12359         max_skip == (1 << align) - 1.
12360         (ix86_reorg): Don't call ix86_avoid_jump_mispredicts if
12361         ASM_OUTPUT_MAX_SKIP_ALIGN isn't defined.
12363         PR target/39942
12364         * config/i386/x86-64.h (ASM_OUTPUT_MAX_SKIP_ALIGN): Don't emit second
12365         .p2align 3 if MAX_SKIP is smaller than 7.
12366         * config/i386/linux.h (ASM_OUTPUT_MAX_SKIP_ALIGN): Likewise.
12368 2009-05-15  Ian Lance Taylor  <iant@google.com>
12370         * alias.c (struct alias_set_entry_d): Rename from struct
12371         alias_set_entry.  Change all uses.
12372         * except.c (struct call_site_record_d): Rename from struct
12373         call_site_record.  Change all uses.
12374         * except.h (struct eh_region_d): Rename from struct eh_region.
12375         Change all uses.
12376         * gcse.c (struct hash_table_d): Rename from struct hash_table.
12377         Change all uses.
12378         * graphite.c (struct ivtype_map_elt_d): Rename fromstruct
12379         ivtype_map_elt.  Change all uses.
12380         (struct rename_map_elt_d): Rename fromstruct rename_map_elt.
12381         Change all uses.
12382         (struct ifsese_d): Rename fromstruct ifsese.  Change all uses.
12383         * graphite.h (struct name_tree_d): Rename from struct name_tree.
12384         Change all uses.
12385         (struct sese_d): Rename from struct sese.  Change all uses.
12386         * omega.h (struct eqn_d): Rename from struct eqn.  Change all uses.
12387         (struct omega_pb_d): Rename from struct omega_pb.  Change all uses.
12388         * optabs.h (struct optab_d): Rename from struct optab.  Change all
12389         uses.
12390         (struct convert_optab_d): Rename from struct convert_optab.
12391         Change all uses.
12392         * tree-pass.h (struct ipa_opt_pass_d): Rename fromstruct
12393         ipa_opt_pass.  Change all uses.
12394         * tree-predcom.c (struct dref_d): Rename from struct dref.  Change
12395         all uses.
12397         * c-decl.c (pushtag): If -Wc++-compat, warn if the tag is already
12398         defined as a typedef.
12399         (grokdeclarator): If -Wc++-compat, warn if a typedef is already
12400         defined as a tag.
12402 2009-05-15  Manuel López-Ibáñez  <manu@gcc.gnu.org>
12404         PR 16302
12405         * fold-const.c (make_range,build_range_check,merge_ranges): Move
12406         declaration to...
12407         (merge_ranges): Returns bool.
12408         * tree.h (make_range): .. to here.
12409         (build_range_check): Likewise.
12410         (merge_ranges): Likewise. Renamed from merge_ranges.
12411         * c-typeck.c (parser_build_binary_op): Update calls to
12412         warn_logical_operator.
12413         * c-common.c (warn_logical_operator): Add new warning.
12414         * c-common.h (warn_logical_operator): Update declaration.
12416 2009-05-15  Manuel López-Ibáñez  <manu@gcc.gnu.org>
12418         * ira-conflicts.c (add_insn_allocno_copies): Fix wrong conditional.
12420 2009-05-15  Kaveh R. Ghazi  <ghazi@caip.rutgers.edu>
12422         * doc/install.texi: Document MPC requirements, flags etc.
12424         * builtins.c (do_mpc_arg1, fold_builtin_ccos): New.
12425         (fold_builtin_cexp): Ensure we get a complex REAL_TYPE.
12426         Evaluate constant arguments.
12427         (fold_builtin_carg): Ensure we get a complex REAL_TYPE.
12428         (fold_builtin_1): Likewise, also evaluate constant arguments.
12429         Remove superfluous break.
12430         (do_mpc_ckconv): New.
12431         * real.h: Include mpc.h.
12432         * toplev.c (print_version): Output MPC version info if available.
12434 2009-05-15  Sandra Loosemore  <sandra@codesourcery.com>
12436         * fold-const.c (fold_convert_const_real_from_real): Check for overflow.
12438 2009-05-15  H.J. Lu  <hongjiu.lu@intel.com>
12440         * config/i386/i386.c (ix86_reorg): Call optimize_function_for_speed_p
12441         only once.
12443 2009-05-15  Jan Hubicka  <jh@suse.cz>
12445         * doc/invoke.texi (max-early-inliner-iterations): New flag.
12446         * ipa-inline.c (enum inlining_mode): New INLINE_SIZE_NORECURSIVE.
12447         (try_inline): Fix return value.
12448         (cgraph_decide_inlining_incrementally): Honor new value.
12449         (cgraph_early_inlining): Handle indirect inlining.
12450         * params.def (PARAM_EARLY_INLINER_MAX_ITERATIONS): New.
12452 2009-05-15  Jan Hubicka  <jh@suse.cz>
12454         * cgraph.h (struct cgraph_node): Add finalized_by_frotnend flag.
12455         * cgraphunit.c (cgraph_finalize_function): Set it.
12456         (cgraph_expand_function): Use it.
12458 2009-05-15  Sandra Loosemore  <sandra@codesourcery.com>
12460         * real.c (encode_ieee_half): Define.
12461         (decode_ieee_half): Define.
12462         (ieee_half_format): Define.
12463         (arm_half_format): Define.
12464         * real.h (ieee_half_format): Declare.
12465         (arm_half_format): Declare.
12467 2009-05-15  Sandra Loosemore  <sandra@codesourcery.com>
12469         * optabs.c (prepare_float_lib_cmp):  Test that the comparison,
12470         swapped, and reversed optabs exist before trying to use them.
12472 2009-05-15  Paul Brook  <paul@codesourcery.com>
12473             Sandra Loosemore  <sandra@codesourcery.com>
12475         * config/arm/arm.c (neon_vector_mem_operand): Handle element/structure
12476         loads.  Allow PRE_DEC.
12477         (output_move_neon): Handle PRE_DEC.
12478         (arm_print_operand): Add 'A' for neon structure loads.
12479         * config/arm/arm-protos.h (neon_vector_mem_operand): Update prototype.
12480         * config/arm/neon.md (neon_mov): Update comment.
12481         * config/arm/constraints.md (Un, Us): Update neon_vector_mem_operand
12482         calls.
12483         (Um): New constraint.
12485 2009-05-15  Jan Hubicka  <jh@suse.cz>
12487         Revert the following patch until testsuite fallout is fixed:
12488         * cgraph.c (dump_cgraph_node): Dump size/time/benefit.
12489         * cgraph.h (struct inline_summary): New filed self_wize,
12490         size_inlining_benefit, self_time and time_inlining_benefit.
12491         (struct cgraph_global_info): Replace insns by time ans size fields.
12492         * ipa-cp (ipcp_cloning_candidate_p): Base estimate on size
12493         (ipcp_estimate_growth, ipcp_insert_stage): Likewise.
12494         (ipcp_update_callgraph): Do not touch function bodies.
12495         * ipa-inline.c: Include except.h
12496         (MAX_TIME): New constant.
12497         (overall_insns): Remove
12498         (overall_size, max_benefit): New static variables.
12499         (cgraph_estimate_time_after_inlining): New function.
12500         (cgraph_estimate_size_after_inlining): Rewrite using benefits.
12501         (cgraph_clone_inlined_nodes): Update size.
12502         (cgraph_mark_inline_edge): Update size.
12503         (cgraph_estimate_growth): Use size info.
12504         (cgraph_check_inline_limits): Check size.
12505         (cgraph_default_inline_p): Likewise.
12506         (cgraph_edge_badness): Compute badness based on benefit and size cost.
12507         (cgraph_decide_recursive_inlining): Check size.
12508         (cgraph_decide_inlining_of_small_function): Update size; dump sizes
12509         and times.
12510         (cgraph_decide_inlining): Likewise.
12511         (cgraph_decide_inlining_incrementally): Likewise; honor
12512         PARAM_EARLY_INLINING_INSNS.
12513         (likely_eliminated_by_inlining_p): New predicate.
12514         (estimate_function_body_sizes): New function.
12515         (compute_inline_parameters): Use it.
12516         * except.c (must_not_throw_labels): New function.
12517         * except.h (must_not_throw_labels): Declare.
12518         * tree-inline.c (init_inline_once): Kill inlining_weigths
12519         * tree-ssa-structalias.c: Avoid uninitialized warning.
12520         * params.def (PARAM_MAX_INLINE_INSNS_SINGLE): Reduce to 300.
12521         (PARAM_MAX_INLINE_INSNS_AUTO): Reduce to 60.
12522         (PARAM_INLINE_CALL_COST): Remove.
12523         (PARAM_EARLY_INLINING_INSNS): New.
12525 2009-05-15  Richard Guenther  <rguenther@suse.de>
12527         * tree-ssa-pre.c (eliminate): Use TODO_update_ssa_only_virtuals,
12528         not TODO_update_ssa.
12530 2009-05-15  Richard Guenther  <rguenther@suse.de>
12532         PR tree-optimization/39999
12533         * gimple.h (gimple_expr_type): Use the expression type looking
12534         through useless conversions.
12535         * tree-ssa-sccvn.c (vn_nary_op_lookup_stmt): Use gimple_expr_type.
12536         (vn_nary_op_insert_stmt): Likewise.
12537         (simplify_binary_expression): Likewise.
12539 2009-05-15  Richard Guenther  <rguenther@suse.de>
12541         * common.opt (-ftree-forwprop, -ftree-phiprop, -ftree-pta):
12542         New options, enabled by default.
12543         * doc/invoke.texi (-ftree-forwprop, -ftree-phiprop, -ftree-pta):
12544         Document.
12545         * tree-ssa-forwprop.c (gate_forwprop): Use flag_tree_forwprop.
12546         * tree-ssa-phiprop.c (gate_phiprop): Use flag_tree_phiprop.
12547         * tree-ssa-structalias.c (gate_tree_pta): New function.
12548         (pass_build_alias): Use it.
12550 2009-05-15  Joseph Myers  <joseph@codesourcery.com>
12552         * tree-ssa-forwprop.c (forward_propagate_addr_expr_1): Also
12553         recurse on an invariant address if a conversion from a pointer
12554         type to a wider integer type is involved.
12556 2009-05-15  Jan Hubicka  <jh@suse.cz>
12558         * cgraph.c (dump_cgraph_node): Dump size/time/benefit.
12559         * cgraph.h (struct inline_summary): New filed self_wize,
12560         size_inlining_benefit, self_time and time_inlining_benefit.
12561         (struct cgraph_global_info): Replace insns by time ans size fields.
12562         * ipa-cp (ipcp_cloning_candidate_p): Base estimate on size
12563         (ipcp_estimate_growth, ipcp_insert_stage): Likewise.
12564         (ipcp_update_callgraph): Do not touch function bodies.
12565         * ipa-inline.c: Include except.h
12566         (MAX_TIME): New constant.
12567         (overall_insns): Remove
12568         (overall_size, max_benefit): New static variables.
12569         (cgraph_estimate_time_after_inlining): New function.
12570         (cgraph_estimate_size_after_inlining): Rewrite using benefits.
12571         (cgraph_clone_inlined_nodes): Update size.
12572         (cgraph_mark_inline_edge): Update size.
12573         (cgraph_estimate_growth): Use size info.
12574         (cgraph_check_inline_limits): Check size.
12575         (cgraph_default_inline_p): Likewise.
12576         (cgraph_edge_badness): Compute badness based on benefit and size cost.
12577         (cgraph_decide_recursive_inlining): Check size.
12578         (cgraph_decide_inlining_of_small_function): Update size; dump sizes
12579         and times.
12580         (cgraph_decide_inlining): Likewise.
12581         (cgraph_decide_inlining_incrementally): Likewise; honor
12582         PARAM_EARLY_INLINING_INSNS.
12583         (likely_eliminated_by_inlining_p): New predicate.
12584         (estimate_function_body_sizes): New function.
12585         (compute_inline_parameters): Use it.
12586         * except.c (must_not_throw_labels): New function.
12587         * except.h (must_not_throw_labels): Declare.
12588         * tree-inline.c (init_inline_once): Kill inlining_weigths
12589         * tree-ssa-structalias.c: Avoid uninitialized warning.
12590         * params.def (PARAM_MAX_INLINE_INSNS_SINGLE): Reduce to 300.
12591         (PARAM_MAX_INLINE_INSNS_AUTO): Reduce to 60.
12592         (PARAM_INLINE_CALL_COST): Remove.
12593         (PARAM_EARLY_INLINING_INSNS): New.
12594         doc/invoke.texi (max-inline-insns-auto, early-inlining-insns): Update.
12595         (inline-call-cost): Remove.
12596         (early-inlining-insns): New.
12598 2009-05-15  Eric Botcazou  <ebotcazou@adacore.com>
12600         * dbxout.c (dbxout_range_type): Add LOW and HIGH parameters.  Use them
12601         for bounds.
12602         (print_int_cst_bounds_in_octal_p): Likewise.
12603         (dbxout_type): Adjust calls to above functions.  Be prepared to deal
12604         with subtypes.
12605         * dwarf2out.c (base_type_die): Likewise.
12606         (is_subrange_type): Delete.
12607         (subrange_type_die): Add LOW and HIGH parameters.  Use them for bounds.
12608         (modified_type_die): Call subrange_type_for_debug_p on subtypes.
12609         * fold-const.c (fold_truth_not_expr) <CONVERT_EXPR>: Do not strip it
12610         if the destination type is boolean.
12611         (build_range_check): Do not special-case subtypes.
12612         (fold_sign_changed_comparison): Likewise.
12613         (fold_unary): Likewise.
12614         * langhooks-def.h (LANG_HOOKS_GET_SUBRANGE_BOUNDS): Define.
12615         (LANG_HOOKS_FOR_TYPES_INITIALIZER): Add LANG_HOOKS_GET_SUBRANGE_BOUNDS.
12616         * langhooks.h (lang_hooks_for_types): Add get_subrange_bounds.
12617         * tree.c (subrange_type_for_debug_p): New predicate based on the
12618         former is_subrange_type.
12619         * tree.h (subrange_type_for_debug_p): Declare.
12620         * tree-chrec.c (avoid_arithmetics_in_type_p): Delete.
12621         (convert_affine_scev): Remove call to above function.
12622         (chrec_convert_aggressive): Likewise.
12623         * tree-ssa.c (useless_type_conversion_p_1): Do not specifically return
12624         false for conversions involving subtypes.
12625         * tree-vrp.c (vrp_val_max): Do not special-case subtypes.
12626         (vrp_val_min): Likewise.
12627         (needs_overflow_infinity): Likewise.
12628         (extract_range_from_unary_expr): Likewise.
12630 2009-05-15  Paolo Bonzini  <bonzini@gnu.org>
12632         * config/frv/frv.h: Clean up references to GO_IF_LEGITIMATE_ADDRESS.
12633         * config/frv/frv.c: Likewise.
12634         * config/s390/s390.c: Likewise.
12635         * config/sparc/sparc.h: Likewise.
12636         * config/i386/i386.h: Likewise.
12637         * config/i386/i386.c: Likewise.
12638         * config/crx/crx.c: Likewise.
12639         * config/m68hc11/m68hc11.h: Likewise.
12640         * config/iq2000/iq2000.c: Likewise.
12641         * config/mn10300/mn10300.h: Likewise.
12642         * config/mn10300/mn10300.c: Likewise.
12643         * config/m68k/m68k.c: Likewise.
12644         * config/rs6000/rs6000.c: Likewise.
12645         * config/rs6000/xcoff.h: Likewise.
12646         * config/rs6000/linux64.h: Likewise.
12647         * config/rs6000/sysv4.h: Likewise.
12648         * config/score/score3.c: Likewise.
12649         * config/score/score7.c: Likewise.
12650         * config/score/score.c: Likewise.
12651         * config/arm/arm.md: Likewise.
12652         * config/mips/mips.c: Likewise.
12653         * config/mips/mips.md: Likewise.
12654         * config/bfin/bfin.h: Likewise.
12655         * config/pa/pa.c: Likewise.
12656         * config/pa/constraints.md: Likewise.
12658         * config/pdp11/pdp11-protos.h (legitimate_address_p): Delete.
12659         * config/pdp11/pdp11.c (legitimate_address_p): Delete.
12660         * config/pdp11/pdp11.h: Use memory_address_p instead.
12662 2009-05-14  Ian Lance Taylor  <iant@google.com>
12664         * passes.c (finish_optimization_passes): Change i to int.
12665         * plugin.c (plugins_active_p): Change event to int.
12666         (dump_active_plugins): Likewise.
12667         * reginfo.c (invalid_mode_change_p): Change to to unsigned int.
12668         Add cast.
12669         * tree.c (tree_range_check_failed): Change c to unsigned int.
12670         (omp_clause_range_check_failed): Likewise.
12671         (build_common_builtin_nodes): Change mode to int.  Add cast.
12672         * config/ia64/ia64.c (is_emitted): Change r to unsigned int.
12673         (ia64_hard_regno_rename_ok, ia64_eh_uses): Likewise.
12675         * c-typeck.c (build_unary_op): If -Wc++-compat, warn about using
12676         ++ or -- with a variable of enum type.
12678 2009-05-14  Steven Bosscher  <steven@gcc.gnu.org>
12680         PR driver/40144
12681         * opts.c (common_handle_option): Add OPT_fcse_skip_blocks as a no-op.
12683 2009-05-14  Steven Bosscher  <steven@gcc.gnu.org>
12685         * store-motion.c: Do not include params.h
12686         * Makefile.in: Fix dependencies for various files.
12688 2009-05-14  Steven Bosscher  <steven@gcc.gnu.org>
12690         * auto-inc-dec.c: Fix pass description, remove apparent
12691         accidental duplication.
12693 2009-05-14  H.J. Lu  <hongjiu.lu@intel.com>
12695         PR middle-end/40147
12696         * ipa-utils.h (memory_identifier_string): Moved to ...
12697         * tree.h (memory_identifier_string): Here.  Add GTY(()).
12699 2009-05-14  Paolo Bonzini  <bonzini@gnu.org>
12701         * doc/tm.texi (TARGET_LEGITIMATE_ADDRESS_P): Refer mainly to this
12702         in the former documentation of...
12703         (GO_IF_LEGITIMATE_ADDRESS): ... this.
12704         * ira-conflicts.c (get_dup_num): Use address_operand.
12705         * targhooks.c (default_legitimate_address_p): New.
12706         * targhooks.h (default_legitimate_address_p): New.
12707         * reload.c (strict_memory_address_p) [!GO_IF_LEGITIMATE_ADDRESS]:
12708         Call hook.
12709         * recog.c (memory_address_p) [!GO_IF_LEGITIMATE_ADDRESS]: Call hook.
12710         * target.h (struct target): Add legitimate_address_p.
12711         * target-def.h (TARGET_LEGITIMATE_ADDRESS_P): New.
12712         (TARGET_INITIALIZER): Include it.
12714         * config/alpha/alpha.h (GO_IF_LEGITIMATE_ADDRESS): Delete.
12715         * config/alpha/alpha-protos.h (alpha_legitimate_address_p): Remove.
12716         * config/alpha/alpha.c (alpha_legitimate_address_p): Make static.
12717         (TARGET_LEGITIMATE_ADDRESS_P): New.
12719         * config/frv/frv.h (GO_IF_LEGITIMATE_ADDRESS): Delete.
12720         (REG_OK_STRICT_P): Delete.
12721         * config/frv/frv-protos.h (frv_legitimate_address_p): Rename to...
12722         (frv_legitimate_address_p_1): ... this.
12723         * config/frv/frv.c (frv_legitimate_address_p): Forward to...
12724         (frv_legitimate_address_p_1): ... the renamed old
12725         frv_legitimate_address_p.
12726         * config/frv/predicates.md: Adjust calls to frv_legitimate_address_p.
12727         (TARGET_LEGITIMATE_ADDRESS_P): New.
12729         * config/s390/s390.h (GO_IF_LEGITIMATE_ADDRESS): Delete.
12730         * config/s390/s390-protos.h (legitimate_address_p): Remove.
12731         * config/s390/s390.c (legitimate_address_p): Rename to...
12732         (s390_legitimate_address_p): ... this, make static.
12733         (legitimize_address): Adjust call.
12734         (TARGET_LEGITIMATE_ADDRESS_P): New.
12735         * config/s390/constraints.md ("e"): Call strict_memory_address_p.
12737         * config/m32c/m32c.h (GO_IF_LEGITIMATE_ADDRESS): Delete.
12738         * config/m32c/m32c-protos.h (m32c_legitimate_address_p): Remove.
12739         * config/m32c/m32c.c (m32c_legitimate_address_p): Make static.
12740         (TARGET_LEGITIMATE_ADDRESS_P): New.
12742         * config/spu/spu.h (GO_IF_LEGITIMATE_ADDRESS): Delete.
12743         * config/spu/spu-protos.h (spu_legitimate_address): Remove.
12744         * config/spu/spu.c (spu_legitimate_address): Rename to...
12745         (spu_legitimate_address_p): ... this, make static.
12746         (TARGET_LEGITIMATE_ADDRESS_P): New.
12748         * config/sparc/sparc.h (GO_IF_LEGITIMATE_ADDRESS): Delete.
12749         * config/sparc/sparc-protos.h (legitimate_address_p): Remove.
12750         * config/sparc/sparc.c (legitimate_address_p): Rename to...
12751         (sparc_legitimate_address_p): ... this, make static and return bool.
12752         (legitimize_address): Adjust call.
12753         (TARGET_LEGITIMATE_ADDRESS_P): New.
12755         * config/i386/i386.h (GO_IF_LEGITIMATE_ADDRESS): Delete.
12756         * config/i386/i386-protos.h (legitimate_address_p): Remove.
12757         * config/i386/i386.c (legitimate_address_p): Rename to...
12758         (ix86_legitimate_address_p): ... this, make static.
12759         (constant_address_p): Move after it, adjust call.
12760         (TARGET_LEGITIMATE_ADDRESS_P): New.
12762         * config/avr/avr.h (GO_IF_LEGITIMATE_ADDRESS): Delete.
12763         * config/avr/avr-protos.h (legitimate_address_p): Remove.
12764         * config/avr/avr.c (legitimate_address_p): Rename to...
12765         (avr_legitimate_address_p): ... this, make static.
12766         (legitimize_address): Adjust call.
12767         (TARGET_LEGITIMATE_ADDRESS_P): New.
12769         * config/crx/crx.h (GO_IF_LEGITIMATE_ADDRESS): Delete.
12770         * config/crx/crx-protos.h (crx_legitimate_address_p): Remove.
12771         * config/crx/crx.c (crx_legitimate_address_p): Make static.
12772         (TARGET_LEGITIMATE_ADDRESS_P): New.
12774         * config/xtensa/xtensa.h (GO_IF_LEGITIMATE_ADDRESS): Delete.
12775         * config/xtensa/xtensa-protos.h (xtensa_legitimate_address_p): Remove.
12776         * config/xtensa/xtensa.c (xtensa_legitimate_address_p): Make static.
12777         (TARGET_LEGITIMATE_ADDRESS_P): New.
12779         * config/stormy16/stormy16.h (GO_IF_LEGITIMATE_ADDRESS): Delete.
12780         * config/stormy16/stormy16-protos.h (xstormy16_legitimate_address_p):
12781         Remove.
12782         * config/stormy16/stormy16.c (xstormy16_legitimate_address_p):
12783         Make static.
12784         (TARGET_LEGITIMATE_ADDRESS_P): New.
12786         * config/m68hc11/m68hc11.h (GO_IF_LEGITIMATE_ADDRESS): Delete.
12787         * config/m68hc11/m68hc11-protos.h (m68hc11_go_if_legitimate_address):
12788         Remove.
12789         * config/m68hc11/m68hc11.c (m68hc11_go_if_legitimate_address):
12790         Rename to...
12791         (m68hc11_legitimate_address_p): ... this, make static.
12792         (go_if_legitimate_address_internal): Rename to...
12793         (m68hc11_legitimate_address_p_1): ... this.
12794         (legitimize_address): Adjust call.
12795         (TARGET_LEGITIMATE_ADDRESS_P): New.
12797         * config/iq2000/iq2000.h (GO_IF_LEGITIMATE_ADDRESS): Delete.
12798         * config/iq2000/iq2000-protos.h (iq2000_legitimate_address_p): Remove.
12799         * config/iq2000/iq2000.c (iq2000_legitimate_address_p): Make static.
12800         (TARGET_LEGITIMATE_ADDRESS_P): New.
12802         * config/mn10300/mn10300.h (GO_IF_LEGITIMATE_ADDRESS): Delete.
12803         * config/mn10300/mn10300-protos.h (legitimate_address_p): Remove.
12804         * config/mn10300/mn10300.c (legitimate_address_p): Rename to...
12805         (mn10300_legitimate_address_p): ... this, make static.
12806         (TARGET_LEGITIMATE_ADDRESS_P): New.
12808         * config/m68k/m68k.h (GO_IF_LEGITIMATE_ADDRESS): Delete.
12809         * config/m68k/m68k-protos.h (m68k_legitimate_address_p): Remove.
12810         * config/m68k/m68k.c (m68k_legitimate_address_p): Make static.
12811         (TARGET_LEGITIMATE_ADDRESS_P): New.
12813         * config/rs6000/rs6000.h (GO_IF_LEGITIMATE_ADDRESS): Delete.
12814         (REG_OK_STRICT_FLAG, REG_OK_FOR_BASE_P, REG_OK_FOR_INDEX_P): Delete.
12815         (INT_REG_OK_FOR_BASE_P, INT_REG_OK_FOR_INDEX_P): Move above.
12816         * config/rs6000/rs6000.h (GO_IF_LEGITIMATE_ADDRESS): Delete.
12817         * config/rs6000/rs6000-protos.h (rs6000_legitimate_address): Remove.
12818         * config/rs6000/rs6000.c (rs6000_legitimate_address): Rename to...
12819         (rs6000_legitimate_address_p): ... this, make static.
12820         (TARGET_LEGITIMATE_ADDRESS_P): New.
12821         (REG_MODE_OK_FOR_BASE_P): Delete.
12822         (rs6000_legitimize_reload_address): Use INT_REG_OK_FOR_BASE_P.
12824         * config/picochip/picochip.h (GO_IF_LEGITIMATE_ADDRESS): Delete.
12825         * config/picochip/picochip-protos.h (picochip_legitimate_address_p):
12826         Delete.
12827         * config/picochip/picochip.c (picochip_legitimate_address_p): Make
12828         static, adjust types.
12829         (TARGET_LEGITIMATE_ADDRESS_P): New.
12831         * config/score/score.h (GO_IF_LEGITIMATE_ADDRESS): Delete.
12832         * config/score/score.c (score_address_p): Rename to...
12833         (score_legitimate_address_p): ... this.
12834         (TARGET_LEGITIMATE_ADDRESS_P): New.
12835         * config/score/score3.c (score3_address_p): Rename to...
12836         (score3_legitimate_address_p): ... this.
12837         * config/score/score7.c (score7_address_p): Rename to...
12838         (score7_legitimate_address_p): ... this.
12840         * config/arm/arm.h (ARM_GO_IF_LEGITIMATE_ADDRESS,
12841         THUMB2_GO_IF_LEGITIMATE_ADDRESS, THUMB1_GO_IF_LEGITIMATE_ADDRESS,
12842         GO_IF_LEGITIMATE_ADDRESS): Delete.
12843         * config/arm/arm-protos.h (thumb1_legitimate_address_p,
12844         thumb2_legitimate_address_p): Delete.
12845         (arm_legitimate_address_p): Rename to...
12846         (arm_legitimate_address_outer_p): ... this.
12847         * config/arm/constraints.md ("Uq"): Adjust call.
12848         * config/arm/predicates.md (arm_extendqisi_mem_op): Likewise.
12849         * config/arm/arm.c (arm_legitimate_address_p): New, rename old one
12850         to...
12851         (arm_legitimate_address_outer_p): ... this.
12852         (thumb1_legitimate_address_p, thumb2_legitimate_address_p): Make
12853         static.
12854         (TARGET_LEGITIMATE_ADDRESS_P): New.
12856         * config/mips/mips.h (GO_IF_LEGITIMATE_ADDRESS): Delete.
12857         * config/mips/mips-protos.h (mips_legitimate_address_p): Remove.
12858         * config/mips/mips.c (mips_legitimate_address_p): ... Make static.
12859         (TARGET_LEGITIMATE_ADDRESS_P): New.
12861         * config/vax/vax.h (GO_IF_LEGITIMATE_ADDRESS): Delete.
12862         * config/vax/vax-protos.h (legitimate_address_p): Remove.
12863         * config/vax/vax.c (legitimate_address_p): Rename to...
12864         (vax_legitimate_address_p): ... this, make static.
12865         (TARGET_LEGITIMATE_ADDRESS_P): New.
12867         * config/h8300/h8300.h (GO_IF_LEGITIMATE_ADDRESS): Delete.
12868         * config/h8300/h8300-protos.h (h8300_legitimate_address_p): Remove.
12869         * config/h8300/h8300.c (h8300_legitimate_address_p): ... Make static.
12870         (TARGET_LEGITIMATE_ADDRESS_P): New.
12872         * config/mmix/mmix.h (GO_IF_LEGITIMATE_ADDRESS): Delete.
12873         * config/mmix/mmix-protos.h (mmix_legitimize_address): Remove.
12874         * config/mmix/mmix.c (mmix_legitimate_address): Rename to...
12875         (mmix_legitimate_address_p): ... this, make static.
12876         (TARGET_LEGITIMATE_ADDRESS_P): New.
12878         * config/bfin/bfin.h (GO_IF_LEGITIMATE_ADDRESS): Delete.
12879         * config/bfin/bfin-protos.h (bfin_legitimate_address_p): Remove.
12880         * config/bfin/bfin.c (bfin_legitimate_address_p): ... Make static.
12881         (TARGET_LEGITIMATE_ADDRESS_P): New.
12883 2009-05-14  Paolo Bonzini  <bonzini@gnu.org>
12885         * config/arm/arm.h (PROMOTE_FUNCTION_MODE): Remove handling
12886         of MODE_COMPLEX_INT.
12888 2009-05-14  Rainer Orth  <ro@TechFak.Uni-Bielefeld.DE>
12890         * config/alpha/alpha.c (alpha_initialize_trampoline): Change 0 to
12891         LCT_NORMAL in function call.
12892         * mips-tdump.c (print_file_desc): Add cast to enum type.
12893         * mips-tfile.c (add_ext_symbol): Add casts to enum types.
12894         (mark_stabs): Add casts to enum types.
12895         (parse_stabs_common): Add casts to enum types.
12897 2009-05-13  Adam Nemet  <anemet@caviumnetworks.com>
12899         * config/mips/mips.c (mips_print_operand) <REG, MEM, default>:
12900         Check for invalid values of LETTER.
12902 2009-05-13  Taras Glek  <tglek@mozilla.com>
12904         * attribs.c (register_attribute): moved out attribute registration
12905         into register_attribute.
12906         * doc/plugins.texi: Documented register_attribute and
12907         PLUGIN_ATTRIBUTES.
12908         * gcc-plugin.h: Added forward decl for register_attribute.
12909         * gcc-plugin.h (plugins_event): Added PLUGIN_ATTRIBUTES.
12910         * plugin.c (register_callback, invoke_plugin_callbacks): Added
12911         PLUGIN_ATTRIBUTES boilerplate.
12913 2009-05-14  Dave Korn  <dave.korn.cygwin@gmail.com>
12915         * config/i386/msformat-c.c (ms_printf_length_specs):  Use enumeration
12916         values even in sentinel and empty entries.
12917         (ms_printf_flag_specs):  Likewise.
12918         (ms_scanf_flag_specs):  Likewise.
12919         (ms_strftime_flag_specs):  Likewise.
12920         (ms_print_char_table):  Likewise.
12921         (ms_scan_char_table):  Likewise.
12922         (ms_time_char_table):  Likewise.
12924 2009-05-13  Doug Kwan  <dougkwan@google.com>
12926         * tree-ssa-sccvn.c (compare_ops): Stabilize qsort.
12928 2009-05-13  Adam Nemet  <anemet@caviumnetworks.com>
12930         * config/mips/mips.md (store): Add attributes for QI and HI.
12931         Update comment.
12932         (truncdisi2, truncdihi2, truncdiqi2): Merge these into ...
12933         (truncdi<mode>2): ... this new pattern.
12935 2009-05-13  Brad Hards  <bradh@kde.org>
12937         * Makefile.in (TEXI_GCCINT_FILES): Add plugins.texi.
12939 2009-05-14  Jakub Jelinek  <jakub@redhat.com>
12940             Ben Elliston <bje@au.ibm.com>
12942         PR middle-end/40035
12943         * dse.c (check_mem_read_rtx): Guard against width == -1.
12945 2009-05-13  Michael Matz  <matz@suse.de>
12947         PR middle-end/39976
12948         * tree-outof-ssa.c (maybe_renumber_stmts_bb): New function.
12949         (trivially_conflicts_p): New function.
12950         (insert_backedge_copies): Use it.
12952 2009-05-13  Janis Johnson  <janis187@us.ibm.com>
12954         * c-pragma.c (enum pragma_switch_t): Prefix constants with PRAGMA_.
12955         (handle_stdc_pragma): Use new enum constant names.
12956         (handle_pragma_float_const_decimal64): Ditto.
12958 2009-05-13  Ian Lance Taylor  <iant@google.com>
12960         * Makefile.in (build/gencheck.o): Depend upon all-tree.def, not
12961         tree.def.
12963 2009-05-13  Nathan Sidwell  <nathan@codesourcery.com>
12965         * config/m68k/t-uclinux (M68K_MLIB_CPU): Check for FL_UCLINUX.
12966         * config/m68k/m68k-devices.def: Add FL_UCLINUX to 68020 and 54455
12967         multilibs.
12968         * config/m68k/m68k.h (FL_UCLINUX): Define.
12970 2009-05-13  Jan Hubicka  <jh@suse.cz>
12972         * options.c (gfc_post_options): -fwhole-program imply -fwhole-file.
12974 2009-05-12  Kaz Kojima  <kkojima@gcc.gnu.org>
12976         * config/sh/sh.h (OVERRIDE_OPTIONS): Clear flag_schedule_insns
12977         unless -fschedule-insns is specified.
12979 2009-05-12  Kaz Kojima  <kkojima@gcc.gnu.org>
12981         PR target/39561
12982         * config/sh/sh.h (OPTIMIZATION_OPTIONS): Don't set
12983         TARGET_EXPAND_CBRANCHDI4.
12984         * config/sh/sh.md (cbranchdi4): Don't check TARGET_EXPAND_CBRANCHDI4.
12985         * config/sh/sh.opt (mexpand-cbranchdi): Remove.
12986         (cmpeqdi): Fix comment.
12988 2009-05-12  Kaz Kojima  <kkojima@gcc.gnu.org>
12990         * config/sh/sh-protos.h (sh_legitimate_index_p): Declare.
12991         (sh_legitimate_address_p): Likewise.
12992         * config/sh/sh.c (sh_legitimate_index_p): New.
12993         (sh_legitimate_address_p): Likewise.
12994         * config/sh/sh.h (REG_OK_FOR_BASE_P): Add STRICT parameter.
12995         (REG_OK_FOR_INDEX_P, SUBREG_OK_FOR_INDEX_P): Likewise.
12996         (MODE_DISP_OK_4, MODE_DISP_OK_8): Remove.
12997         (MAYBE_BASE_REGISTER_RTX_P): New macro.
12998         (MAYBE_INDEX_REGISTER_RTX_P): Likewise.
12999         (BASE_REGISTER_RTX_P): Use MAYBE_BASE_REGISTER_RTX_P.
13000         (INDEX_REGISTER_RTX_P): Use MAYBE_INDEX_REGISTER_RTX_P.
13001         (GO_IF_LEGITIMATE_INDEX): Use sh_legitimate_index_p.
13002         (GO_IF_LEGITIMATE_ADDRESS): Use sh_legitimate_address_p.
13004 2009-05-12  Jan Hubicka  <jh@suse.cz>
13006         * tree-inline.c (estimate_operator_cost): Add operands;
13007         when division happens by constant, it is cheap.
13008         (estimate_num_insns): Loads and stores are not having cost of 0;
13009         EH magic stuff is cheap; when computing runtime cost of switch,
13010         use log2 base of amount of its cases; builtin_expect has cost of 0;
13011         compute cost for moving return value of call.
13012         (init_inline_once): Initialize time_based flags.
13013         * tree-inline.h (eni_weights_d): Add time_based flag.
13015 2009-05-12  Paolo Bonzini  <bonzini@gnu.org>
13017         * df-core.c: Update head documentation.
13019 2009-05-12  Michael Meissner  <meissner@linux.vnet.ibm.com>
13021         PR bootstrap/40118
13022         * rs6000.c (rs6000_generate_compare): Use op1b instead of
13023         shadowing exisiting variable op1.
13025 2009-05-12  Uros Bizjak  <ubizjak@gmail.com>
13027         PR target/37179
13028         * config/i386/driver-i386.c (processor_signatures): New enum.
13029         (SIG_GEODE): Move from vendor_signatures to processor_signatures.
13030         (host_detect_local_cpu): For SIG_AMD vendor, check for SIG_GEODE
13031         processor signature to detect geode processor.
13033 2009-05-12  Paolo Bonzini  <bonzini@gnu.org>
13035         Revert:
13037         2009-05-12  Paolo Bonzini  <bonzini@gnu.org>
13039         * optabs.c (prepare_cmp_insn): Temporarily disable test that
13040         causes spurious differences between trunk and cond-optab branch.
13042 2009-05-12  Paolo Bonzini  <bonzini@gnu.org>
13044         * dojump.c (compare_from_rtx): Delete.
13045         * expmed.c (emit_store_flag): Only try cstore_optab.  Canonicalize
13046         any MODE_CC mode to the cstorecc4 pattern.  Use prepare_operand, fail
13047         if the comparison does not satisfy the predicate; test predicates for
13048         operands 2 and 3 of a cstore pattern.  Don't try cstore optab
13049         further if one existing pattern fails.
13050         * expr.h (compare_from_rtx): Delete.
13051         (prepare_operand): Declare it.
13052         * optabs.c: Change "lib call" to "libcall" throughout.
13053         (bcc_gen_fctn, setcc_gen_code, trap_rtx,
13054         HAVE_conditional_trap, emit_cmp_insn): Delete.
13055         (can_compare_p): Delete cmp_optab case.
13056         (prepare_float_lib_cmp): Return an rtx and a machine mode.
13057         Accept other parameters by value.
13058         (prepare_operand): Make non-static.
13059         (prepare_cmp_insn): Return an rtx and a machine mode.  Accept
13060         other parameters by value.  Try to widen operands here based on
13061         an optab_methods argument and looking at cbranch_optab.
13062         (emit_cmp_and_jump_insn_1): Accept test and mode, remove widening
13063         loop.  Use cbranch_optab directly.
13064         (emit_cmp_and_jump_insns): Fix comment.  Adjust call to
13065         prepare_cmp_insn and emit_cmp_and_jump_insn_1, remove obsolete
13066         assertion.
13067         (emit_conditional_move, emit_conditional_add): Inline what's needed
13068         of compare_from_rtx, using new prepare_cmp_insn for the rest.
13069         (init_optabs): Init cmp_optab with UNKNOWN, cbranch_optab
13070         with COMPARE.  Move cmov_optab and cstore_optab above
13071         with cbranch_optab, move cmp_optab down with ucmp_optab,
13072         remove tst_otpab.  Do not initialize trap_rtx.
13073         (gen_cond_trap): Do it here.  Use ctrap_optab.  Test predicate
13074         for trap code.  Do not check HAVE_conditional_trap.  Use
13075         prepare_cmp_insn.  Accept no predicate for operand 3.
13076         * optabs.h (OTI_cmp): Mark as used only for libcalls.
13077         (OTI_ctrap, ctrap_optab): New.
13078         (tst_optab): Delete.
13079         (bcc_gen_fctn, setcc_gen_code, emit_cmp_insn): Delete.
13080         * ifcvt.c (find_if_header): Replace HAVE_conditional_trap
13081         with lookup of ctrap_optab.
13082         * genopinit.c (cmp_optab, tst_optab, bcc_gen_fctn, setcc_gen_code):
13083         Delete.
13084         (ctrap_optab): New.
13086         * combine.c (combine_simplify_rtx, simplify_set): Do not
13087         special case comparing against zero for cc0 machines.
13088         * simplify-rtx.c (simplify_binary_operation_1): Never remove
13089         COMPARE on cc0 machines.
13090         (simplify_relational_operation): Return a new expression when
13091         a COMPARE could be removed.
13092         * final.c (final_scan_insn): Compare cc_status values
13093         against LHS of a (compare FOO (const_int 0)) cc0 source.
13094         Also check if cc_status.value is the full compare.
13096         * doc/md.texi (bCC, sCC, tstMM, cmpMM): Delete.
13097         (cstoreMM4): Document.
13098         (conditional_trap): Document ctrapMM4 instead.
13099         (sync_compare_and_swapMM): Refer to cbranchcc4.
13100         (Dependent Patterns): Eliminate obsolete information referring to
13101         the old jump optimization phase.
13102         (Canonicalization): Include cbranchcc4 case, omit canonicalization
13103         of compares with 0 on cc0 machines.
13104         (Jump Patterns): Refer to MODE_CC jump patterns preferably,
13105         avoiding references to cc0.  Remove text about storing operands
13106         in cmpMM.
13107         * doc/tm.texi (Condition Codes): Include blurb on different
13108         condition code representations, separate into subsections for
13109         CC0, MODE_CC and conditional execution.
13111         * config/alpha/alpha-protos.h (alpha_emit_conditional_branch,
13112         alpha_emit_setcc): Accept operands and a machine mode.
13113         * config/alpha/alpha.c (alpha_emit_conditional_branch):
13114         Get code/op0/op1 from operands, use machine mode argument
13115         instead of alpha_compare.fp_p.  Emit the branch here.
13116         (alpha_emit_setcc): Likewise, and return boolean.
13117         (alpha_emit_conditional_move): Likewise.  Assert that
13118         cmp_op_mode == cmp_mode, and simplify accordingly.
13119         * config/alpha/alpha.h (struct alpha_compare, alpha_compare): Delete.
13120         * config/alpha/alpha.md (cmpdf, cmptf, cmpdi, bCC, sCC): Delete.
13121         (cbranchdf4, cbranchtf4, cbranchdi4, cstoredf4, cstoretf4,cstoredi4):
13122         Delete.
13123         (stack probe test): Use cbranchdi4.
13124         * config/alpha/predicates.md (alpha_cbranch_operator): New.
13126         * config/arc/arc.c (gen_compare_reg): Do not emit cmp.
13127         * config/arc/arc.h (movsicc, movsfcc): Use it.
13128         (movdicc, *movdicc_insn, movdfcc, *movdfcc_insn): Remove.
13129         (cbranchsi4, cstoresi4): New.
13130         (cmpsi, bCC and sCC expanders): Remove.
13132         * config/arm/arm.c (arm_compare_op0, arm_compare_op1): Delete.
13133         * config/arm/arm.h (arm_compare_op0, arm_compare_op1): Delete.
13134         * config/arm/predicates.md (arm_comparison_operator): Only include
13135         floating-point operators if there is a hardware floating-point unit.
13136         * config/arm/arm.md (cbranchsi4, cstoresi4): Enable for TARGET_32BIT,
13137         deferring to cbranch_cc and cstore_cc respectively.
13138         (cbranchsf4, cbranchdf4, cbranchdi4, cstoresf4, cstoredf4, cstoredi4,
13139         cbranch_cc, cstore_cc): New.
13140         (movsicc, movsfcc, movdfcc): Do not use arm_compare_op0 and
13141         arm_compare_op1.
13142         (bCC, sCC, cmpsi, cmpsf, cmpdf, cmpdi): Delete.
13144         * config/avr/avr-protos.h (out_tstsi, out_tsthi): Adjust prototype.
13145         * config/avr/avr.c (out_tstsi, out_tsthi): Get the tested operand
13146         as an argument.
13147         (adjust_insn_length): Adjust calls.
13148         (avr_reorg): Handle (compare (foo) (const_int 0)).
13149         * config/avr/avr.md (tstqi, tsthi, tstsi): Remove.
13150         (*negated_tstqi, *negated_tsthi, *negated_tstsi): Unmacroize.
13151         (*reversed_tsthi, *reversed_tstsi): Add a scratch for simplicity.
13152         (cmpqi, cmphi, cmpsi): Prepend asterisk, fuse tst[qhs]i here.
13153         (bCC): Remove.
13154         (cbranchqi4, cbranchhi4, cbranchsi4): New.
13155         (tst -> sbrc/sbrs peephole2, cpse peephole): Wrap RHS with COMPARE.
13157         * config/bfin/bfin.md (cmpbi, cmpsi, bCC, sCC): Delete.
13158         (cbranchsi4, cstorebi4, cstoresi4): New.
13159         (movbisi): This insn is duplicate, split it to zero_extend.
13160         * config/bfin/bfin.c (bfin_compare_op0, bfin_compare_op1): Delete
13161         (bfin_gen_compare): Do not use them.  Emit VOIDmode SET, not BImode.
13162         (bfin_optimize_loop): Use cbranch expander.
13163         * config/bfin/bfin.h (bfin_compare_op0, bfin_compare_op1): Delete.
13164         * config/bfin/predicates.md (bfin_cbranch_operator): Rename to...
13165         (bfin_bimode_comparison_operator): ... this.
13166         (bfin_direct_comparison_operator): New.
13168         * config/cris/cris.c (cris_normal_notice_update_cc): Look
13169         inside (compare FOO (const_int 0)).
13170         (cris_rtx_costs): Handle ZERO_EXTRACT.
13171         * config/cris/cris.md (tstdi, tst<mode>, cmpdi): Delete.
13172         (*tstdi_non_v32): Fold in *cmpdi_non_v32.
13173         (*tstdi_v32): Delete.
13174         (*cmpdi_non_v32): Add M alternative for operand 1.
13175         (cmpsi, cmp<mode>): Make private.
13176         (*tstsi, *tst<mode>_cmp, *tst<mode>_non_cmp, *btst): Wrap LHS
13177         with COMPARE.
13178         (cbranch<mode>4, cbranchdi4, cstore<mode>4): New.
13180         * config/crx/crx.md (cstore<mode>4, cbranchcc4): New.
13181         (cmp<mode>, bCOND_internal, b<code>, s<code>): Delete.
13182         (cbranch<mode>4, sCOND_internal): Use ordered_comparison_operator.
13183         (cc_reg_operand): New.
13184         (any_cond): Delete.
13185         * config/crx/crx.c (crx_compare_op0, crx_compare_op1,
13186         crx_expand_compare, crx_expand_branch, crx_expand_scond): Delete.
13187         * config/crx/crx.h (crx_compare_op0, crx_compare_op1): Delete.
13188         * config/crx/crx-protos.h (crx_expand_compare, crx_expand_branch,
13189         crx_expand_scond): Delete.
13191         * config/fr30/fr30.md (cmp<mode>, bCC): Delete.
13192         (cbranchsi4): New.
13193         * config/fr30/fr30.c (fr30_compare_op0, fr30_compare_op1): Delete
13194         * config/fr30/fr30.h (fr30_compare_op0, fr30_compare_op1): Delete.
13196         * config/frv/frv.md (cbranchsi4, cbranchsf4, cbranchdf4,
13197         cstoresi4, cstoresf4, cstoredf4): New.
13198         (cmpdi, cmpsi, cmpsf, cmpdf, bCC, sCC): Remove.
13199         * config/frv/frv-protos.h (frv_emit_cbranch, frv_emit_scc):
13200         Receive the entire operands array.
13201         * config/frv/frv.h (frv_compare_op0, frv_compare_op1): Delete.
13202         * config/frv/frv.c (frv_compare_op0, frv_compare_op1): Delete.
13203         * config/frv/frv-protos.h (frv_emit_cbranch, frv_emit_scc):
13204         Get test/op0/op1 from the operands array.
13205         (frv_emit_cond_move): Get test/op0/op1 from the test_rtx.
13207         * config/h8300/h8300-protos.h (h8300_expand_branch): Accept operands.
13208         (h8300_expand_store): New.
13209         * config/h8300/h8300.c (h8300_rtx_costs): Handle (compare FOO
13210         (const_int 0)).
13211         (h8300_expand_branch): Emit compare here.  Adjust for new arguments.
13212         (h8300_expand_store): New.
13213         * config/h8300/h8300.md (btst combine patterns): Wrap with COMPARE
13214         or do not try to produce (set (cc0) REG).
13215         (peepholes): Wrap arguments with COMPARE.  Add a peephole to
13216         change a compare into a move to a scratch register.  Disable some
13217         peepholes when comparing with zero.
13218         (tstsi, tsthi, tstsi, cmpqi): Make private.
13219         (cmphi): Delete.
13220         (bCC, sCC): Delete.
13221         (cbranchqi4, cbranchhi4, cbranchsi4, cstoreqi4, cstorehi4,
13222         cstoresi4): New.
13224         * config/i386/i386.c (ix86_expand_int_movcc, ix86_expand_int_addcc,
13225         ix86_expand_fp_movcc): Set ix86_compare_op0 and ix86_compare_op1.
13226         (ix86_emit_i387_log1p): Use gen_cbranchxf4.
13227         (ix86_emit_i387_log1p): Use cbranchxf2.
13228         (ix86_expand_setcc): Return void.
13229         * config/i386/i386-protos.h (ix86_expand_setcc): Return void.
13230         * config/i386/i386.md (cmpti, cmpdi, cmpsi, cmphi, cmpqi, cmpxf,
13231         cmp<MODEF>, cmpcc): Remove.
13232         (cbranchti4, cbranchdi4, cbranchsi4, cbranchhi4, cbranchqi4,
13233         cbranchxf4, cbranch<MODEF>4, cbranchcc4, cstoredi4, cstoresi4,
13234         cstorehi4, cstoreqi4, cstorexf4, cstore<MODEF>4, cstorecc): New.
13235         (sCC and bCC expanders): Remove.
13236         (stack_protect_test): Use cbranchcc4.
13238         * config/ia64/ia64-protos.h (ia64_compare_op0, ia64_compare_op1):
13239         Delete.
13240         (ia64_expand_compare): Accept three rtx by reference and return void.
13241         * config/ia64/ia64.c (ia64_compare_op0, ia64_compare_op1): Delete.
13242         (ia64_expand_compare): Replace op0/op1 with *op0/*op1.  Get code
13243         from *expr.  Update *expr with the BImode comparison to do.
13244         * config/ia64/ia64.md (cmpbi, cmpsi, cmpdi, cmpsf, cmpdf, cmpxf,
13245         cmptf, bCC, sCC, conditional_trap): Delete.
13246         (cbranchbi4, cbranchsi4, cbranchdi4, cbranchsf4, cbranchdf4,
13247         cbranchxf4, cbranchtf4, cstorebi4, cstoresi4, cstoredi4, cstoresf4,
13248         cstoredf4, cstorexf4, cstoretf4, ctrapbi4, ctrapsi4, ctrapdi4,
13249         ctrapsf4, ctrapdf4, ctrapxf4, ctraptf4): New.
13250         * config/ia64/predicates.md (ia64_cbranch_operator): New.
13252         * config/iq2000/iq2000-protos.h (gen_conditional_branch): Change
13253         type of last argument.
13254         * config/iq2000/iq2000.c (branch_cmp, branch_type): Remove.
13255         (gen_conditional_branch): Get code/cmp0/cmp1 from operands,
13256         use machine mode argument instead of branch_type.  Remove dead
13257         code for floating-point comparisons.
13258         * config/iq2000/iq2000.h (branch_cmp, branch_type): Remove.
13259         * config/iq2000/iq2000.md (cmpsi, cmpdi, cmpsf, cmpdf, tstsi, bCC):
13260         Remove.
13261         (cbranchsi4, cstoresi4): New.
13262         * config/iq2000/predicates.md (reg_or_const_operand): New.
13264         * config/m32c/m32c.md (cbranch splitter): Use match_op_dup.
13265         * config/m32c/m32c.md (any_cond, gl_cond): Delete.
13266         (b<code>_op): Rewrite to...
13267         (bcc_op): ... this, using match_operator.
13268         (s<code>_op): Rewrite to...
13269         (scc_op): ... this, using match_operator.
13270         (s<code>_24_op): Rewrite to...
13271         (scc_op_24): ... this, using match_operator.
13272         (s<code>_<mode>): Rewrite to...
13273         (cstore<mode>4): ... this, using match_operator.
13274         (s<code>_<mode>_24): Rewrite to...
13275         (cstore<mode>4_24): ... this, using match_operator.
13276         * config/m32c/m32c-protos.h (m32c_cmp_flg_0, m32c_pend_compare,
13277         m32c_unpend_compare, m32c_expand_scc): Delete.
13278         * config/m32c/m32c.c (compare_op0, compare_op1, m32c_cmp_flg_0,
13279         m32c_pend_compare, m32c_unpend_compare, m32c_expand_scc): Delete.
13280         (m32c_expand_movcc): Change NE to EQ if necessary.
13281         (m32c_init_libfuncs): Modify cstore optab instead of setcc_gen_code.
13283         * config/m32r/m32r-protos.h (gen_cond_store): New.
13284         * config/m32r/m32r.c (m32r_compare_op0, m32r_compare_op1): Delete.
13285         (gen_cond_store): New, from sCC patterns.
13286         (m32r_expand_block_move): Use cbranchsi4.
13287         * config/m32r/m32r.h (m32r_compare_op0, m32r_compare_op1): Delete.
13288         * config/m32r/m32r.md (cmpsi, bCC, sCC): Delete.
13289         (cbranchsi4, cstoresi4): New.
13291         * config/m68hc11/m68hc11.c (m68hc11_compare_op0, m68hc11_compare_op1):
13292         Delete.
13293         (m68hc11_rtx_costs_1, m68hc11_rtx_costs): Handle ZERO_EXTRACT.
13294         (m68hc11_notice_update_cc): Look into a compare with 0.
13295         * config/m68hc11/m68hc11.h (m68hc11_compare_op0, m68hc11_compare_op1):
13296         Delete.
13297         * config/m68hc11/m68hc11.md (tstsi, tsthi, tstqi, cmpsi,
13298         cmphi, cmpqi, bCC): Delete.
13299         (cbranchsi4, cbranchhi4, cbranchqi4): New.
13300         (tstqi_1, tstqi_z_used, tstqi_1, bitcmpqi, bitcmpqi_z_used,
13301         bitcmpqi_12, bitcmphi, various splits and peephole2s): Wrap cc0<-reg
13302         sets with COMPARE.
13304         * config/m68k/predicates.md (m68k_cstore_comparison_operator,
13305         const0_operand, const1_operand, m68k_subword_comparison_operand): New.
13306         * config/m68k/constraints.md (H): New.
13307         * config/m68k/m68k.md (tstdi): Remove define_expand, use name for
13308         the define_insn below.
13309         (tstsi, tsthi, tst<FP:mode>, cmphi, cmpqi, cmp<FP:mode>): Delete.
13310         (*tstsi_internal_68020_cf, *tstsi_internal, *tsthi_internal,
13311         *tstqi_internal, tst<mode>_6881, tst<mode>_cf, many unnamed
13312         patterns): Wrap RHS with COMPARE.
13313         (tst<FP>_68881, tst<FP>_cf): Use const0_operand.
13314         (*cmpdi_internal): Name this pattern.
13315         (cmpdi): Change to define_insn.
13316         (cbranchdi4, cstoredi4, cbranchsi4, cstoresi4, cbranchhi4, cstorehi4,
13317         cbranchqi4, cstoreqi4, cbranch<FP:mode>4, cstore<FP:mode>4): New.
13318         (scc0_di, scc0_di_5200, scc_di): Use the ordered_comparison_operator
13319         predicate.
13320         (seq, sne, sgt, sgtu, slt, sltu, sge, sgeu, sle, sleu, sordered,
13321         sunordered, suneq, sunge, sungt, sunle, sunlt, sltgt): Delete
13322         (conditional_trap): Change to...
13323         (ctrapdi4, ctrapsi4, ctraphi4, ctrapqi4): ... these.
13324         (*conditional_trap): Use the ordered_comparison_operator and
13325         const1_operand predicates.
13326         * config/m68k/m68k.c (m68k_last_compare_had_fp_operands): Delete.
13327         (m68k_expand_prologue): Use ctrapsi4 instead of cmpsi+conditional_trap.
13328         (m68k_rtx_costs): Look for ZERO_EXTRACT in a COMPARE.
13329         * config/m68k/m68k.h (m68k_last_compare_had_fp_operands): Delete.
13331         * config/mcore/mcore-protos.h (arch_compare_op0, arch_compare_op1,
13332         mcore_modify_comparison, mcore_gen_compare_reg): Remove.
13333         (mcore_gen_compare): New.
13334         * config/mcore/mcore.c (arch_compare_op0, arch_compare_op1): Delete.
13335         (mcore_modify_comparison, mcore_gen_compare_reg): Fold into...
13336         (mcore_gen_compare): ... this.
13337         * config/mcore/mcore.md (cmpsi, bCC, sCC): Remove.
13338         (cbranchsi4, cstoresi4): New, using mcore_gen_compare.
13339         (stack probe pattern): Use cbranchsi4.
13341         * config/mips/predicates.md (mips_cstore_operator): New.
13342         * config/mips/mips-ps-3d.md (movv2sfcc): Do not use cmp_operands.
13343         * config/mips/mips.md (any_cond): Delete.
13344         (conditional_trap): Rename to ctrap<GPR:mode>4.  Adjust predicates,
13345         always succeed.
13346         (fixuns_truncdfsi2, fixuns_truncdfdi2, fixuns_truncsfsi2,
13347         fixuns_truncsfdi2): Use cbranch patterns.
13348         (cmp<GPR:mode>, cmp<SCALARF:mode>): Delete.
13349         (b<code>): Change to cbranch<GPR:mode>4 and cbranch<SCALARF:mode>4.
13350         Adjust call to mips_expand_conditional_branch.
13351         (seq, sne, slt<u>, sle<u>, sgt<u>, sge<u>): Change to
13352         cstore<GPR:mode>4.
13353         * config/mips/mips-protos.h (mips_expand_conditional_branch,
13354         mips_expand_scc, mips_expand_conditional_trap): Adjust prototypes.
13355         * config/mips/mips.c (cmp_operands): Delete.
13356         (mips_emit_compare): Get comparison operands from *op0/*op1.
13357         (mips_expand_scc): Get code/op0/op1/target from operands.  Assert
13358         that it succeeds.  Use op0/op1 instead of cmp_operands.
13359         (mips_expand_conditional_branch, mips_expand_conditional_move,
13360         mips_expand_conditional_trap): Likewise.
13361         (mips_block_move_loop): Use cbranch patterns.
13362         * config/mips/mips.h (cmp_operands): Delete.
13364         * config/mmix/mmix.c (mmix_valid_comparison): Delete.
13365         (mmix_gen_compare_reg): Just return a register in the right CC mode.
13366         * config/mmix/mmix.h (mmix_compare_op0, mmix_compare_op1): New.
13367         * config/mmix/mmix.md (cmpdi, cmpdf): Remove.
13368         (*cmpcc_folded): Rename to...
13369         (*cmpdi_folded): this.
13370         (*cmpcc): Rename to...
13371         (*cmps): ... this.
13372         (movdfcc, movdicc): Adjust for new semantics of mmix_gen_compare_reg.
13373         (bCC): Remove.
13374         (cbranchdi4): New.
13375         (cbranchdf4): New.  Handle invalid comparisons here.
13376         * config/mmix/predicates.md (float_comparison_operator): New.
13378         * config/mn10300/mn10300.c (mn10300_rtx_costs): Consider 0 and
13379         zero_extract to be cheap in (compare (zero_extract) (const_int 0).
13380         * config/mn10300/mn10300.md (tst): Delete.
13381         (*tst_extqisi_am33, *tst_extqisi, *tst_exthisi_am33, *tst_exthisi):
13382         Name these patterns and wrap RHS in a compare.
13383         (*cmpsi): Make this pattern private.  Include tst.
13384         (*cmpsf): Make this pattern private.
13385         (and and zero_extract cc0 set): Wrap RHS in a COMPARE.
13386         (compare with zero peepholes): Likewise.
13387         (bCC): Remove.
13388         (cbranchsi4, cbranchsf4): New.
13389         (casesi): Use cbranchsi4.
13391         * config/pa/pa.c (hppa_compare_op0, hppa_compare_op1,
13392         hppa_branch_type): Delete.
13393         (return_addr_rtx): Use cbranchsi4.
13394         (emit_bcond_fp): Accept all operands.  Replace CODE with NE.
13395         Emit CCFPmode comparison here.
13396         (gen_cmp_fp): Delete, now part of emit_bcond_fp.
13397         * config/pa/pa.h (enum cmp_type, hppa_compare_op0, hppa_compare_op1,
13398         hppa_branch_type): Delete.
13399         * config/pa/pa.md (cmpdi, cmpsi, cmpsf, cmpdf, sCC, bCC): Delete.
13400         (movsicc, movdicc): Remove references to hppa_compare_op0,
13401         hppa_compare_op1 and compare_from_rtx.
13402         (cbranchdi4, cbranchsi4, cbranchsf4, cbranchdf4, cstoresi4): New.
13403         (casesi): Use cbranchsi4.
13405         * config/pdp11/pdp11-protos.h (output_jump): Change prototype.
13406         * config/pdp11/pdp11.c (output_jump): Embed opcodes here.
13407         * config/pdp11/pdp11.md (register_or_const0_operand): New.
13408         (cmpdf, cmphi, cmpqi): Make private.  Add tst alternatives.
13409         (cmpsi, tstsi, tstdf, tsthi, tstqi): Delete.
13410         (bCC): Delete.
13411         (cbranchdf4, cbranchhi4, cbranchqi4): New.
13412         (*branch, *branch_inverted): New.
13414         * config/picochip/picochip.md (cbranchhi4): Use
13415         ordered_comparison_operator.
13416         (cmphi, bCC): Remove.
13418         * config/rs6000/predicates.md (rs6000_cbranch_operator): New.
13419         (trap_comparison_operator): Delete.
13420         * config/rs6000/rs6000-protos.h (rs6000_emit_sCOND,
13421         rs6000_emit_cbranch): Accept mode and operands.
13422         * config/rs6000/rs6000.c (rs6000_compare_op0, rs6000_compare_op1,
13423         rs6000_compare_fp_p): Delete.
13424         (rs6000_generate_compare): Accept mode and comparison.  Extract code
13425         and op0/op1 from there.  Replace references to rs6000_compare_op0
13426         and rs6000_compare_op1.
13427         (rs6000_emit_sCOND): Adjust call to rs6000_generate_compare and
13428         extract result from passed operands.
13429         (rs6000_emit_cbranch): Adjust call to rs6000_generate_compare and
13430         extract loc from passed operands.
13431         (rs6000_emit_cmove): Likewise.
13432         * config/rs6000/rs6000.h (rs6000_compare_op0, rs6000_compare_op1,
13433         rs6000_compare_fp_p): Delete.
13434         * config/rs6000/rs6000.md (cmp<GPR>, cmp<FP>, bCC, sCC): Delete.
13435         (cbranch<GPR>4, cbranch<FP>4): New.
13436         (cstore<mode>4): New.  Consolidate here all choices about when to use
13437         portable or specialized sCC sequences.
13438         (stack_protect_test): Use cbranchsi4.
13439         (conditional_trap): Replace with ctrap<GPR>4.
13440         (conditional trap insn): Replace trap_comparison_operator with
13441         ordered_comparison_operator.
13443         * config/s390/s390.c (s390_compare_op0, s390_compare_op1): Delete.
13444         (s390_emit_prologue): Use ctrap.
13445         * config/s390/s390.h (s390_compare_op0, s390_compare_op1): Delete.
13446         * config/s390/predicates.md (s390_eqne_operator, s390_scond_operator):
13447         New predicates replacing...
13448         * config/s390/s390.md (COMPARE, SCOND): ... these iterators.
13449         (cmp<GPR>, cmp<FP>, cmpcc): Delete.
13450         (trunc patterns): Use emit_cmp_and_jump_insns instead of cmp/branch.
13451         (add<mode>cc): Do not use s390_compare_op0/op1.
13452         (s<code>): Change to...
13453         (cstore<mode>4): ... this. Do not use s390_compare_op0/op1.
13454         (seq): Change to...
13455         (cstorecc4): ... this.  Handle EQ or NE equally.
13456         (*sne): Un-privatize for use in cstorecc4.
13457         (b<code>): Change to...
13458         (cbranch<GPR>4, cbranch<FP>4, cbranchcc4): ... these.
13459         (conditional_trap): Replace with...
13460         (ctrap<GPR>4, ctrap<FP>4): ... these.
13461         (stack_protect): Use cbranchcc4.
13463         * config/score/score-conv.h (cmp_op0, cmp_op1): Delete.
13464         * config/score/score-protos.h (score_gen_cmp): Delete.
13465         * config/score/score.c (cmp_op0, cmp_op1, score_gen_cmp): Delete.
13466         (score_block_move-loop): Use cbranchsi4.
13467         * config/score/score.md (cbranchsi4): New.
13468         (cmpsi, bCC): Delete.
13469         * config/score/score3.c (cmp_op0, cmp_op1, score3_gen_cmp): Delete.
13470         (score3_movsicc): Use ops[1] operands instead of cmp_op0/cmp_op1.
13471         * config/score/score7.c (cmp_op0, cmp_op1, score7_gen_cmp): Delete.
13472         (score7_movsicc): Use ops[1] operands instead of cmp_op0/cmp_op1.
13473         * config/score/score3.h (score3_gen_cmp): Delete.
13474         * config/score/score7.h (score7_gen_cmp): Delete.
13476         * config/sh/sh-protos.h (prepare_scc_operands): Rename to...
13477         (sh_emit_scc_to_t): ... this.  Return void.
13478         (from_compare): Rename to...
13479         (sh_emit_compare_and_branch): ... this.
13480         (sh_emit_compare_and_set): New.
13481         (sh_expand_t_scc): Accept operands.
13482         * config/sh/predicates.md (sh_float_comparison_operator): New.
13483         * config/sh/sh.c (sh_compare_op0, sh_compare_op1): Delete.
13484         (prepare_scc_operands): Rename to...
13485         (sh_emit_scc_to_t): ... this.  Return void.  Get op0/op1 from
13486         arguments.
13487         (sh_emit_cheap_store_flag): New.
13488         (sh_emit_set_t_insn): New.
13489         (from_compare): Rename to...
13490         (sh_emit_compare_and_branch): ... this.  Accept mode.  Rewrite
13491         handling of TARGET_SH2E floating point to avoid recursive call.
13492         Generate branch here.
13493         (sh_emit_compare_and_set): New.
13494         (sh_expand_t_scc): Get op0/op1 from arguments.
13495         (sh_emit_cheap_store_flag): New.
13496         * config/sh/sh.md (cbranchdi4, cbranchsi4): Include -mno-cbranchdi
13497         cases.
13498         (cbranchdi4_i): Use an "I08" constraint instead of an "i" constraint.
13499         (cmpsi, cmpdi, cmpsf, cmpdf): Delete.
13500         (movsicc, movdicc): Do nothing when it recreated operands from
13501         sh_compare_*. Use sh_emit_cheap_store_flag.  Adjust call to
13502         prepare_scc_operands (now sh_emit_scc_to_t).
13503         (udivdi3): Use cstoresi4.
13504         (beq_media, bne_media, bge_media, bgtu_media, bgeu_media, beq,
13505         bne, bgt, blt, ble, bge, bgtu, bltu, bgeu, bleu, bunordered): Delete.
13506         (cbranchint4_media, cbranchfp4_media): New.
13507         (casesi): Use cbranchdi4.
13508         (seq, slt, sle, sgt, sge, sgtu, sltu, sgeu, sne, sleu, sunordered):
13509         Delete.
13510         (cstore4_media, cstoresi4, cstoredi4, cstoresf4, cstoredf4): New.
13511         (movnegt): Remove second operand.
13512         (cbranchsf4, cbranchdf4): New.
13513         (stack_protect): Use cbranchdi4/cbranchsi4.
13515         * config/sparc/sparc.c (sparc_compare_op0, sparc_compare_op1): Delete.
13516         (gen_compare_reg): Accept comparison, extract part of it to...
13517         (gen_compare_reg_1): ... this.
13518         (gen_compare_operator): Delete.
13519         (gen_v9_scc): Accept separate destination, comparison code and arms.
13520         Do not use sparc_compare_op0/sparc_compare_op1.
13521         (emit_scc_insn, emit_conditional_branch_insn): New.
13522         (emit_v9_brxx): Make static.  Remove useless assertion.
13523         (sparc_emit_float_lib_cmp): Return RTL instead of calling
13524         emit_cmp_insn.
13525         (sparc_expand_compare_and_swap_12): Use gen_compare_reg_1+cbranchcc4.
13526         * config/sparc/sparc-protos.h (gen_compare_reg,
13527         sparc_emit_float_lib_cmp): Adjust prototype.
13528         (emit_scc_insn, emit_conditional_branch_insn): New.
13529         (gen_v9_scc, emit_v9_brxx_insn, gen_compare_operator): Delete.
13530         * config/sparc/sparc.h (sparc_compare_op0, sparc_compare_op1): Delete.
13531         * config/sparc/sparc.md (P, I, F, V32, V32I, V64, V64I): Move all
13532         iterators to the top.
13533         (cmpsi, cmpdi, cmpsf, cmpdf, cmptf, seqsi_special_extend,
13534         snesi_special_extend, sCC, bCC, seqdi_special_trunc,
13535         snedi_special_trunc): Delete.
13536         (seqdi_special, snedi_special): Use expansion of seqdi_special_trunc
13537         and snedi_special_trunc.
13538         (cstoresi4, cstoredi4, cstore<F:mode>4, cbranchcc4, cbranchsi4,
13539         cbranchdi4, cbranch<F:mode>4): New.
13540         (mov<I:mode>cc, mov<F:mode>cc): Handle sparc_emit_float_lib_cmp
13541         here.  Use gen_compare_reg instead of gen_compare_operator.
13542         (conditional_trap): Replace with...
13543         (ctrapsi4, ctrapdi4): ... this.
13544         (stack_protect_test): Use cbranchcc4.
13546         * config/spu/spu-protos.h (spu_emit_branch_or_set): Change second
13547         argument to rtx.
13548         * config/spu/spu.c (spu_compare_op0, spu_compare_op1): Remove.
13549         (spu_emit_branch_or_set): Get code/op0/op1 from second argument.
13550         Change spu_compare_op0/op1 to op0/op1 throughout.  Get target
13551         from operands[0] or operands[3] depending on is_set.
13552         * config/spu/spu.h (spu_compare_op0, spu_compare_op1): Remove.
13553         * config/spu/spu.md (cmp<mode:VQHSI>, cmp<mode:DTI>, cmp<mode:VSF>,
13554         cmpdf, bCC), sCC: Remove.
13555         (cbranch<mode:VQHSI>4, cbranch<mode:DTI>, cbranch<mode:VSF>4,
13556         cbranchdf4, cstore<mode:VQHSI>4, cstore<mode:DTI>, cstore<mode:VSF>4,
13557         cstoredf4): New.
13558         (mov<mode>cc): Accept ordered_comparison_operator, adjust call to
13559         spu_emit_branch_or_set.
13561         * config/stormy16/stormy16-protos.h (xstormy16_emit_cbranch):
13562         Add two arguments.
13563         * config/stormy16/stormy16.h (xstormy16_compare_op0,
13564         xstormy16_compare_op1): Delete.
13565         * config/stormy16/stormy16.c (xstormy16_compare_op0,
13566         xstormy16_compare_op1): Delete.
13567         (xstormy16_emit_cbranch): Get op0/op1 from the new arguments.
13568         Adjust calls.
13569         * config/stormy16/stormy16.md (cbranchsi4, cbranchhi4): New.
13570         (cmphi, cmpsi, bCC): Remove.
13572         * config/v850/v850.md (tstsi, cmpsi): Fold into...
13573         (*cmpsi): ... this one.
13574         (cbranchsi4, cstoresi4): New.
13575         (bCC expanders): Delete.
13576         (sCC insns): Fold into...
13577         (*setcc): ... this one.
13578         (casesi): Do not use gen_cmpsi and gen_bgtu.
13579         (various splits): Wrap "naked" RHS of a cc0 set with COMPARE.
13580         (movsicc): Simplify.
13581         * config/v850/v850.c (v850_rtx_costs): Handle ZERO_EXTRACT in COMPARE.
13583         * config/vax/vax-protos.h (cond_name): New.
13584         (vax_output_conditional_branch): Remove.
13585         * config/vax/vax.c (cond_name): New.
13586         (vax_output_conditional_branch): Remove.
13587         * config/vax/vax.h (PRINT_OPERAND): Dispatch %c to cond_name.
13588         * config/vax/vax.md (tst<VAXint>, tst<VAXfp>): Remove.
13589         (cmp<VAXint>, cmp<VAXfp>): Privatize.  Add constraints for tst.
13590         (bit<VAXint>): Wrap source with (compare).
13591         (b<code> and following unnamed pattern): Rename to *branch and
13592         *branch_reversed.  Change macroization to match_operator.
13593         (cbranch<VAXint>4, cbranch<VAXfp>4): New.
13595         * config/xtensa/predicates.md (xtensa_cstoresi_operator): New.
13596         * config/xtensa/xtensa-protos.h (xtensa_expand_conditional_branch):
13597         Change last argument to machine_mode.
13598         (xtensa_expand_scc): Add machine_mode argument.
13599         * config/xtensa/xtensa.c (branch_cmp, branch_type): Remove.
13600         (gen_conditional_move, xtensa_expand_conditional_branch,
13601         xtensa_expand_scc, xtensa_expand_conditional_move): Use mode
13602         instead of branch_type, fetch cmp0/cmp1/test_code from operands[].
13603         Adjust operand numbers.
13604         * config/xtensa/xtensa.h (enum cmp_type, branch_cmp, branch_type):
13605         Delete.
13606         * config/xtensa/xtensa.md (any_cond, any_scc): Delete.
13607         (cmpsi, cmpsf, b<code>, s<code>): Delete.
13608         (cbranchsi4, cbranchsf4, cstoresi4, cstoresf4): New.
13610 2009-05-12  Paolo Bonzini  <bonzini@gnu.org>
13612         * optabs.c (prepare_cmp_insn): Temporarily disable test that
13613         causes spurious differences between trunk and cond-optab branch.
13615 2009-05-12  Alexandre Oliva  <aoliva@redhat.com>
13617         PR target/37137
13618         * doc/install.texi (STAGE1_TFLAGS, BUILD_CONFIG): Document.
13620 2009-05-12  Alexandre Oliva  <aoliva@redhat.com>
13622         * tree.c (iterative_hash_pointer): Delete.
13623         (iterative_hash_expr): Short-circuit handling of NULL pointer.
13624         Hash UIDs and versions of SSA names.  Don't special-case built-in
13625         function declarations.
13627 2009-05-11  Ian Lance Taylor  <iant@google.com>
13629         PR bootstrap/40103
13630         * graphite.c: Force -Wc++-compat to only be a warning before
13631         #including "cloog/cloog.h".
13633 2009-05-11  Martin Jambor  <mjambor@suse.cz>
13635         * ipa-cp.c (ipcp_cloning_candidate_p): Add missing return false.
13637 2009-05-11  Jan Hubicka  <jh@suse.cz>
13639         * tree-ssa-loop-ivcanon.c: Include target.h
13640         (struct loop_size): new structure.
13641         (constant_after_peeling): New predicate.
13642         (tree_estimate_loop_size): New function.
13643         (estimated_unrolled_size): Rewrite for new estimates.
13644         (try_unroll_loop_completely): Use new estimates.
13645         * Makefile.in (tree-ssa-loop-ivcanon.o): Add dependenc on target.h
13647 2009-05-11  Andrew Pinski  <andrew_pinski@playstation.sony.com>
13649         * config/spu/spu-c.c (spu_categorize_keyword): Update for recent
13650         libcpp interface change.
13651         (spu_macro_to_expand): Likewise.
13653 2009-05-11  Paolo Bonzini  <bonzini@gnu.org>
13655         PR tree-optimization/40026
13656         * gimplify.c (gimplify_init_constructor): Change initial conditional
13657         to assertion.  Rewrite TREE_OPERAND (*expr_p, 1) after
13658         optimize_compound_literals_in_ctor.
13660 2009-05-11  Nathan Sidwell  <nathan@codesourcery.com>
13662         * config/m68k/m68k-devices.def (52274, 52277, 5301x, 5225x, 51xx):
13663         New devices.
13664         * doc/invoke.texi (M680x0 Options): Document new coldfire cpus.
13666 2009-05-11  H.J. Lu  <hongjiu.lu@intel.com>
13668         * tree-vect-data-refs.c (vect_analyze_group_access): Use
13669         HOST_WIDE_INT for gap.
13671 2009-05-11  Ira Rosen  <irar@il.ibm.com>
13673         PR tree-optimization/40074
13674         * tree-vect-data-refs.c (vect_analyze_group_access): Take gaps into
13675         account in group size and step comparison.
13677 2009-05-11  Richard Guenther  <rguenther@suse.de>
13679         * passes.c (init_optimization_passes): Strip now incorrect comment.
13680         (execute_function_todo): Do not set PROP_alias.
13681         * tree-pass.h (PROP_alias): Remove.
13682         * tree-ssa-structalias.c (pass_build_alias): Do not provide PROP_alias.
13683         * tree-if-conv.c (pass_if_conversion): Do not require PROP_alias.
13684         * tree-nrv.c (pass_return_slot): Likewise.
13685         * tree-object-size.c (pass_object_sizes): Likewise.
13686         * tree-ssa-dom.c (pass_dominator): Likewise.
13687         (pass_phi_only_cprop): Likewise.
13688         * tree-ssa-dse.c (pass_dse): Likewise.
13689         * tree-ssa-phiopt.c (pass_phiopt): Likewise.
13690         (pass_cselim): Likewise.
13691         * tree-ssa-pre.c (pass_pre): Likewise.
13692         (pass_fre): Likewise.
13693         * tree-ssa-reassoc.c (pass_reassoc): Likewise.
13694         * tree-ssa-sink.c (pass_sink_code): Likewise.
13695         * tree-stdarg.c (pass_stdarg): Likewise.
13696         * tree-tailcall.c (pass_tail_calls): Likewise.
13697         * tree-vrp.c (pass_vrp): Likewise.
13699 2009-05-10  Ian Lance Taylor  <iant@google.com>
13701         * basic-block.h (enum profile_status): Break out of struct
13702         control_flow_graph.
13703         * cgraph.h (struct inline_summary): Break out of struct
13704         cgraph_local_info.
13705         * cgraphunit.c (enum cgraph_order_sort_kind): New enum, broken out
13706         of struct cgraph_order_sort.
13707         * combine.c (enum undo_kind): New enum, broken out of struct undo.
13708         * cse.c (struct branch_path): Break out of struct
13709         cse_basic_block_data.
13710         * except.h (enum eh_region_type): Break out of struct eh_region.
13711         * gcc.c (enum add_del): Break out of struct modify_target.
13712         * genrecog.c (enum decision_type): Break out of struct decision_test.
13713         * ggc-page.c (struct ggc_pch_ondisk): Break out of struct
13714         ggc_pch_data.
13715         * matrix-reorg.c (struct free_info): Break out of struct matrix_info.
13716         * regmove.c (enum match_use): New enum, broken out of struct match.
13717         * sched-int.h (enum post_call_group): New enum, broken out of
13718         struct deps.
13719         (struct deps_reg): Break out of struct deps.
13720         * target.h (struct asm_int_op): Break out of struct gcc_target.
13721         * tree-eh.c (struct goto_queue_node): Break out of struct
13722         leh_tf_state.
13723         * tree-inline.h (enum copy_body_cge_which): Break out of
13724         copy_body_data.
13725         * tree-pass.h (enum opt_pass_type): Break out of struct opt_pass.
13727         * c-decl.c (in_struct, struct_types): New static variables.
13728         (pushtag): Add loc parameter.  Change all callers.
13729         (lookup_tag): Add ploc parameter.  Change all callers.
13730         (check_compound_literal_type): New function.
13731         (parser_xref_tag): Add loc parameter.  Change all callers.  If
13732         -Wc++-compat, warn about struct/union/enum types defined within a
13733         struct or union.
13734         (start_struct): Add enclosing_in_struct, enclosing_struct_types,
13735         and loc parameters.  Change all callers.  Change error calls to
13736         error_at, using loc.  For a redefinition, if the location of the
13737         original definition is known, report it.  Set in_struct and
13738         struct_types.  If -Wc++-compat warn if in sizeof, typeof, or alignof.
13739         (finish_struct): Add new parameters enclosing_in_struct and
13740         enclosing_struct_types.  Change all callers.  Set
13741         C_TYPE_DEFINED_IN_STRUCT for all struct/union/enum types defined
13742         in the struct.  If in a struct, add this struct to struct_types.
13743         (start_enum): Add loc parameter.  Change all callers.  Use
13744         error_at for errors, using loc.  For a redefinition, if the
13745         location of the original definition is known, report it.  If in a
13746         struct, add this enum type to struct_types.  If -Wc++-compat warn
13747         if in sizeof, typeof, or alignof.
13748         * c-parser.c (disable_extension_diagnostics): Disable -Wc++-compat.
13749         (enable_extension_diagnostics): Reenable -Wc++-compat if appropriate.
13750         (c_parser_enum_specifier): Get enum location for start_enum.
13751         (c_parser_struct_or_union_specifier): Get struct location for
13752         start_struct.  Save in_struct and struct_types status between
13753         start_struct and finish_struct.
13754         (c_parser_cast_expression): Get location of cast.
13755         (c_parser_alignof_expression): Get location of type.
13756         (c_parser_postfix_expression): Likewise.
13757         (c_parser_postfix_expression_after_paren_type): Add type_loc
13758         parameter.  Change all callers.  Call check_compound_literal_type.
13759         Use type_loc for error about variable size type.
13760         * c-typeck.c (build_external_ref): If -Wc++-compat, warn about a use
13761         of an enum constant from an enum type defined in a struct or union.
13762         (c_cast_expr): Add loc parameter.  Change all callers.  If
13763         -Wc++-compat, warn about defining a type in a cast.
13764         * c-tree.h (C_TYPE_DEFINED_IN_STRUCT): Define.
13765         (start_enum, start_struct, finish_struct): Update declarations.
13766         (parser_xref_tag, c_cast_expr): Update declarations.
13767         (check_compound_literal_type): Declare.
13769 2009-05-11  Ben Elliston  <bje@au.ibm.com>
13771         * config/rs6000/rs6000-c.c (altivec_categorize_keyword): Update
13772         for recent libcpp interface change.
13773         (rs6000_macro_to_expand): Likewise.
13775 2009-05-10  Michael Matz  <matz@suse.de>
13777         PR target/40031
13778         * config/arm/arm.c (require_pic_register): Emit on entry edge,
13779         not at entry of function.
13781 2009-05-10  Richard Guenther  <rguenther@suse.de>
13783         PR tree-optimization/40081
13784         Revert
13785         * tree-sra.c (instantiate_element): Instantiate scalar replacements
13786         using the main variant of the element type.  Do not fiddle with
13787         TREE_THIS_VOLATILE or TREE_SIDE_EFFECTS.
13789         * tree-sra.c (sra_type_can_be_decomposed_p): Do not decompose
13790         structs with volatile fields.
13792 2009-05-10  Jan Hubicka  <jh@suse.cz>
13794         * tree-inline.c (delete_unreachable_blocks_update_callgraph): Declare.
13795         (estimate_move_cost): Assert that it does not get called for
13796         VOID_TYPE_P.
13797         (estimate_num_insns): Skip VOID types in argument handling.
13798         (optimize_inline_calls): Delete unreachable blocks and verify that
13799         callgraph is valid.
13801 2009-05-10  Jan Hubicka  <jh@suse.cz>
13803         * cgraphbuild.c (record_reference): Use cgraph_mark_address_taken_node.
13804         * cgraph.c (cgraph_mark_address_taken_node): New function.
13805         (dump_cgraph_node): Dump new flag.
13806         * cgraph.h (struct cgraph_node): Add address_taken.
13807         (cgraph_mark_address_taken_node): New function.
13808         * ipa.c (cgraph_postorder): Prioritize functions with address taken
13809         since new direct calls can be born.
13811 2009-05-10  Joseph Myers  <joseph@codesourcery.com>
13813         * c-lex.c (c_lex_with_flags): Expect cpp_hashnode in
13814         tok->val.node.node.
13816 2009-05-10  Jan Hubicka  <jh@suse.cz>
13818         PR middle-end/40084
13819         * cgraph.c (cgraph_update_edges_for_call_stmt_node): Take old_call
13820         argument; rewrite.
13821         (cgraph_update_edges_for_call_stmt): Take old_decl argument.
13822         * cgraph.h (cgraph_update_edges_for_call_stmt): Update prototype.
13823         * tree-inline.c (copy_bb): Set frequency correctly.
13824         (fold_marked_statements): Update call to
13825         cgraph_update_edges_for_call_stmt.
13827 2009-05-10  Joseph Myers  <joseph@codesourcery.com>
13829         * config/arc/arc.c (arc_handle_interrupt_attribute): Use %qE for
13830         identifiers in diagnostics.
13831         * config/arm/arm.c (arm_handle_fndecl_attribute,
13832         arm_handle_isr_attribute): Likewise.
13833         * config/avr/avr.c (avr_handle_progmem_attribute,
13834         avr_handle_fndecl_attribute, avr_handle_fntype_attribute): Likewise.
13835         * config/bfin/bfin.c (handle_int_attribute,
13836         bfin_handle_longcall_attribute, bfin_handle_l1_text_attribute,
13837         bfin_handle_l1_data_attribute, bfin_handle_longcall_attribute,
13838         bfin_handle_l1_text_attribute, bfin_handle_l1_data_attribute):
13839         Likewise.
13840         * config/darwin.c (darwin_handle_kext_attribute,
13841         darwin_handle_weak_import_attribute): Likewise.
13842         * config/h8300/h8300.c (h8300_handle_fndecl_attribute,
13843         h8300_handle_eightbit_data_attribute,
13844         h8300_handle_tiny_data_attribute): Likewise.
13845         * config/i386/i386.c (ix86_handle_cconv_attribute,
13846         ix86_handle_abi_attribute, ix86_handle_struct_attribute): Likewise.
13847         * config/i386/winnt.c (ix86_handle_shared_attribute,
13848         ix86_handle_selectany_attribute): Likewise.
13849         * config/ia64/ia64.c (ia64_handle_model_attribute): Likewise.
13850         * config/m32c/m32c.c (function_vector_handler): Likewise.
13851         * config/m68hc11/m68hc11.c (m68hc11_handle_page0_attribute,
13852         m68hc11_handle_fntype_attribute): Likewise.
13853         * config/m68k/m68k.c (m68k_handle_fndecl_attribute): Likewise.
13854         * config/mcore/mcore.c (mcore_handle_naked_attribute): Likewise.
13855         * config/mips/mips.c (mips_insert_attributes,
13856         mips_merge_decl_attributes, mips_expand_builtin): Likewise.
13857         * config/rs6000/rs6000.c (rs6000_handle_longcall_attribute,
13858         rs6000_handle_struct_attribute): Likewise.
13859         * config/sh/sh.c (sh_insert_attributes,
13860         sh_handle_resbank_handler_attribute,
13861         sh_handle_interrupt_handler_attribute,
13862         sh2a_handle_function_vector_handler_attribute,
13863         sh_handle_sp_switch_attribute, sh_handle_trap_exit_attribute):
13864         Likewise.
13865         * config/sh/symbian.c (sh_symbian_mark_dllimport): Likewise.
13866         * config/spu/spu.c (spu_handle_fndecl_attribute,
13867         spu_handle_vector_attribute): Likewise.
13868         * config/stormy16/stormy16.c
13869         (xstormy16_handle_interrupt_attribute): Likewise.
13870         * config/v850/v850-c.c (ghs_pragma_section): Likewise.
13871         * config/v850/v850.c (v850_handle_interrupt_attribute): Likewise.
13873 2009-05-10  Joseph Myers  <joseph@codesourcery.com>
13875         * pretty-print.h (struct pretty_print_info): Add translate_identifiers.
13876         (pp_translate_identifiers): New.
13877         (pp_identifier): Only conditionally translate identifier to locale
13878         character set.
13879         * pretty-print.c (pp_construct): Set pp_translate_identifiers.
13880         (pp_base_tree_identifier): Only conditionally translate identifier
13881         to locale character set.
13882         * c-pretty-print.c (M_): Define.
13883         (pp_c_type_specifier, pp_c_primary_expression): Mark English
13884         fragments for conditional translation with M_.
13885         * tree-pretty-print.c (maybe_init_pretty_print): Disable
13886         identifier translation.
13888 2009-05-10  Richard Guenther  <rguenther@suse.de>
13890         PR tree-optimization/40081
13891         * tree-sra.c (instantiate_element): Instantiate scalar replacements
13892         using the main variant of the element type.  Do not fiddle with
13893         TREE_THIS_VOLATILE or TREE_SIDE_EFFECTS.
13895 2009-05-09  Jan Hubicka  <jh@suse.cz>
13897         PR middle-end/40080
13898         * cgraphunit.c (cgraph_materialize_all_clones): Do not redirect
13899         indirect calls; verify cgraph afterwards.
13901 2009-05-09  Jan Hubicka  <jh@suse.cz>
13903         PR bootstrap/40082
13904         * ipa.c (update_inlined_to_pointer): New function.
13905         (cgraph_remove_unreachable_nodes): Use it.
13907 2009-05-09  Jan Hubicka  <jh@suse.cz>
13909         * tree-eh.c (struct leh_state): Remove prev_try.
13910         (lower_try_finally, lower_catch, lower_eh_filter, lower_cleanup): Do
13911         not track prev_try.
13912         * except.c (gen_eh_region_cleanup, duplicate_eh_regions,
13913         copy_eh_region_1, copy_eh_region, redirect_eh_edge_to_label,
13914         remove_eh_handler_and_replace, foreach_reachable_handler,
13915         verify_eh_region, verify_eh_tree): Remove tracking of prev_try pointer.
13916         * except.h (struct eh_region): Remove eh_region_u_cleanup.
13917         (gen_eh_region_cleanup): Update prototype.
13919 2009-05-09  Jan Hubicka  <jh@suse.cz>
13921         PR middle-end/40043
13922         * except.c (copy_eh_region): Always set prev_try.
13923         (redirect_eh_edge_to_label): Find outer try.
13924         (foreach_reachable_handler): When looking for prev try
13925         handle case where previous try is not going to be taken.
13927 2009-05-07  Michael Meissner  <meissner@linux.vnet.ibm.com>
13929         PR tree-optimization/40049
13930         * tree-vect-stmts.c (vectorizable_operation): If the machine has
13931         only vector/vector shifts, convert the type of the constant to the
13932         appropriate type to avoid building incorrect trees, which
13933         eventually have problems with garbage collection.
13935 2009-05-08  Joseph Myers  <joseph@codesourcery.com>
13937         * fold-const.c (fold_binary): Do not fold multiplication by 1 or
13938         -1 for complex floating-point types if honoring signed zeros.
13940 2009-05-08  Jan Hubicka  <jh@suse.cz>
13942         * cgraphbuild.c (compute_call_stmt_bb_frequency): Accept function
13943         argument; handle correctly when profile is absent.
13944         (build_cgraph_edges): Update.
13945         (rebuild_cgraph_edges): Update.
13946         * cgraph.c: Do not include varray.h.
13947         (cgraph_set_call_stmt_including_clones): New function.
13948         (cgraph_create_edge_including_clones): Likewise
13949         (cgraph_update_edges_for_call_stmt_node): New static cfunction.
13950         (cgraph_update_edges_for_call_stmt): Handle clones.
13951         (cgraph_remove_node): Handle clone tree.
13952         (cgraph_remove_node_and_inline_clones): New function.
13953         (dump_cgraph_node): Dump clone tree.
13954         (cgraph_clone_node): Handle clone tree.
13955         (clone_function_name): Bring here from tree-inline.c.
13956         (cgraph_create_virtual_clone): New function.
13957         * cgraph.h (ipa_replace_map): Move here from ipa.h.
13958         (cgraph_clone_info): New function.
13959         (strut cgraph_node): Add clone_info and new clone tree pointers.
13960         (cgraph_remove_node_and_inline_clones,
13961         cgraph_set_call_stmt_including_clones,
13962         cgraph_create_edge_including_clones,
13963         cgraph_create_virtual_clone): Declare.
13964         (cgraph_function_versioning): Use VEC argument.
13965         (compute_call_stmt_bb_frequency): Update prototype.
13966         (cgraph_materialize_all_clones): New function.
13967         * ipa-cp.c (ipcp_update_cloned_node): Remove.
13968         (ipcp_create_replace_map): Update to VECtors.
13969         (ipcp_update_callgraph): Use virtual clones.
13970         (ipcp_update_bb_counts, ipcp_update_edges_counts): Remove.
13971         (ipcp_update_profiling): Do not update local profiling.
13972         (ipcp_insert_stage): Use VECtors and virtual clones.
13973         * cgraphunit.c (verify_cgraph_node): Verify clone tree.
13974         (clone_of_p): New function.
13975         (cgraph_preserve_function_body_p): Use clone tree.
13976         (cgraph_optimize): Materialize clones.
13977         (cgraph_function_versioning): Update for VECtors.
13978         (save_inline_function_body): Use clone tree.
13979         (cgraph_materialize_clone): New function.
13980         (cgraph_materialize_all_clones): Likewise.
13981         * ipa-inline.c (cgraph_default_inline_p): Use analyzed flags.
13982         * ipa.c: Include gimple.h.
13983         (cgraph_remove_unreachable_nodes): Use clone tree.
13984         * ipa-prop.c (ipa_note_param_call): Update call to
13985         compute_call_stmt_bb_frequencycall.
13986         * ipa-prop.h (ipa_replace_map): Move to cgraph.h.
13987         * tree-inline.c: Do not include varray.h or gt-tree-inline.h.
13988         (copy_bb): Handle updating of clone tree; add new edge when new call
13989         appears.
13990         (expand_call_inline): Be strict about every call having edge.
13991         (clone_fn_id_num, clone_function_name): Move to cgraph.c.
13992         (delete_unreachable_blocks_update_callgraph): New function.
13993         (tree_function_versioning): Use VECtors; always remove unreachable
13994         blocks and fold conditionals.
13995         * tree-inline.h: Do not include varray.h.
13996         (tree_function_versioning): Remove.
13997         * Makefile.in (GTFILES): Remove tree-inline.c
13998         * passes.c (do_per_function): Do only functions having body.
13999         * ipa-struct-reorg.c (do_reorg_1, collect_data_accesses): Handle clone
14000         tree.
14002 2009-05-08  H.J. Lu  <hongjiu.lu@intel.com>
14003             Andrew Morrow  <acm@google.com>
14005         PR c/36892
14006         * c-common.c (c_common_attribute_table): Permit deprecated
14007         attribute to take an optional argument.
14008         (handle_deprecated_attribute): If the optional argument to
14009         __attribute__((deprecated)) is not a string ignore the attribute
14010         and emit a warning.
14012         * c-decl.c (grokdeclarator): Updated warn_deprecated_use call.
14013         * c-typeck.c (build_component_ref): Likewise.
14014         (build_external_ref): Likewise.
14016         * toplev.c (warn_deprecated_use): Add an attribute argument.
14017         Emit the message associated with __attribute__((deprecated)).
14019         * toplev.h (warn_deprecated_use): Updated.
14021         * doc/extend.texi: Document new optional parameter to
14022         __attribute__((deprecated))
14024 2009-05-08  Michael Eager <eager@eagercon.com>
14026         * config/rs6000/rs6000.md (*movdf_softfloat32): replace
14027         !TARGET_DOUBLE_FLOAT with TARGET_SINGLE_FLOAT.
14029 2009-05-08  Richard Guenther  <rguenther@suse.de>
14031         PR tree-optimization/40062
14032         * tree-scalar-evolution.c (follow_ssa_edge_in_condition_phi):
14033         Avoid exponential behavior.
14035 2009-05-08  Paolo Bonzini  <bonzini@gnu.org>
14037         PR rtl-optimization/33928
14038         PR 26854
14039         * fwprop.c (use_def_ref, get_def_for_use, bitmap_only_bit_bitween,
14040         process_uses, build_single_def_use_links): New.
14041         (update_df): Update use_def_ref.
14042         (forward_propagate_into): Use get_def_for_use instead of use-def
14043         chains.
14044         (fwprop_init): Call build_single_def_use_links and let it initialize
14045         dataflow.
14046         (fwprop_done): Free use_def_ref.
14047         (fwprop_addr): Eliminate duplicate call to df_set_flags.
14048         * df-problems.c (df_rd_simulate_artificial_defs_at_top,
14049         df_rd_simulate_one_insn): New.
14050         (df_rd_bb_local_compute_process_def): Update head comment.
14051         (df_chain_create_bb): Use the new RD simulation functions.
14052         * df.h (df_rd_simulate_artificial_defs_at_top,
14053         df_rd_simulate_one_insn): New.
14054         * opts.c (decode_options): Enable fwprop at -O1.
14055         * doc/invoke.texi (-fforward-propagate): Document this.
14057 2009-05-08  Joseph Myers  <joseph@codesourcery.com>
14059         PR c/24581
14060         * c-typeck.c (build_binary_op): Handle arithmetic between one real
14061         and one complex operand specially.
14062         * tree-complex.c (some_nonzerop): Do not identify a real value as
14063         zero if flag_signed_zeros.
14065 2009-05-08  Paolo Bonzini  <bonzini@gnu.org>
14067         PR rtl-optimization/33928
14068         * loop-invariant.c (record_use): Fix && vs. || mishap.
14070 2009-05-08  Paolo Bonzini  <bonzini@gnu.org>
14072         PR rtl-optimization/33928
14073         * loop-invariant.c (struct use): Add addr_use_p.
14074         (struct def): Add n_addr_uses.
14075         (struct invariant): Add cheap_address.
14076         (create_new_invariant): Set cheap_address.
14077         (record_use): Accept df_ref.  Set addr_use_p and update n_addr_uses.
14078         (record_uses): Pass df_ref to record_use.
14079         (get_inv_cost): Do not add inv->cost to comp_cost for cheap addresses
14080         used only as such.
14082 2009-05-08  Kaz Kojima  <kkojima@gcc.gnu.org>
14084         * config/sh/sh.c: Do not include c-pragma.h.
14086 2009-05-07  Andrew Pinski  <andrew_pinski@playstation.sony.com>
14088         * config/spu/spu.c: Remove include of c-common.h.
14090 2009-05-07  Janis Johnson  <janis187@us.ibm.com>
14092         PR c/39037
14093         * c-common.h (mark_valid_location_for_stdc_pragma,
14094         valid_location_for_stdc_pragma_p, set_float_const_decimal64,
14095         clear_float_const_decimal64, float_const_decimal64_p): New.
14096         * c.opt (Wunsuffixed-float-constants): New.
14097         * c-lex.c (interpret_float): Use pragma FLOAT_CONST_DECIMAL64 for
14098         unsuffixed float constant, handle new warning.
14099         * c-cppbuiltin.c (c_cpp_builtins): Use cast for double constants.
14100         * c-decl.c (c_scope): New flag float_const_decimal64.
14101         (set_float_const_decimal64, clear_float_const_decimal64,
14102         float_const_decimal64_p): New.
14103         (push_scope): Set new flag.
14104         * c-parser.c (c_parser_translation_unit): Mark when it's valid
14105         to use STDC pragmas.
14106         (c_parser_external_declaration): Ditto.
14107         (c_parser_compound_statement_nostart): Ditto.
14108         * c-pragma.c (valid_location_for_stdc_pragma,
14109         mark_valid_location_for_stdc_pragma,
14110         valid_location_for_stdc_pragma_p, handle_stdc_pragma,
14111         handle_pragma_float_const_decimal64): New.
14112         (init_pragma): Register new pragma FLOAT_CONST_DECIMAL64.
14113         * cp/semantics.c (valid_location_for_stdc_pragma_p,
14114         set_float_const_decimal64, clear_float_const_decimal64,
14115         float_const_decimal64_p): New dummy functions.
14116         * doc/extend.texi (Decimal Float): Remove statement that the
14117         pragma, and suffix for double constants, are not supported.
14118         * doc/invoke.texi (Warning Options): List new option.
14119         (-Wunsuffixed-float-constants): New.
14121 2009-05-08  Steven Bosscher  <steven@gcc.gnu.org>
14123         * config/i386/i386.c: Do not include c-common.h.
14125 2009-05-07  Mark Heffernan  <meheff@google.com>
14127         * doc/invoke.texi (Debugging Options): Document change of debugging
14128         dump location.
14129         * opts.c (decode_options): Make dump_base_name relative to
14130         aux_base_name directory.
14132 2009-05-07  Hariharan Sandanagobalane <hariharan@picochip.com>
14134         * config/picochip/picochip.h (NO_DOLLAR_IN_LABEL): Added.
14135         * config/picochip/libgccExtras/divmod15.asm : Removed redefiniton.
14137 2009-05-07  Rafael Avila de Espindola  <espindola@google.com>
14139         * Makefile.in (install-plugin): Simplify a bit.
14141 2009-05-07  Paolo Bonzini  <bonzini@gnu.org>
14143         * Makefile.in (OBJS-common): Add regcprop.o.
14144         (regcprop.o): New.
14145         * timevar.def (TV_CPROP_REGISTERS): New.
14146         * regrename.c (regrename_optimize): Return 0.
14147         (rest_of_handle_regrename): Delete.
14148         (pass_rename_registers): Point to regrename_optimize.
14149         (struct value_data_entry, struct value_data,
14150         kill_value_one_regno, kill_value_regno, kill_value,
14151         set_value_regno, init_value_data, kill_clobbered_value,
14152         kill_set_value, kill_autoinc_value, copy_value,
14153         mode_change_ok, maybe_mode_change, find_oldest_value_reg,
14154         replace_oldest_value_reg, replace_oldest_value_addr,
14155         replace_oldest_value_mem, copyprop_hardreg_forward_1,
14156         debug_value_data, validate_value_data): Move...
14157         * regcprop.c: ... here.
14158         (rest_of_handle_cprop): Delete.
14159         (pass_cprop_hardreg): Point to copyprop_hardreg_forward.
14161 2009-05-07  Jakub Jelinek  <jakub@redhat.com>
14163         PR middle-end/40057
14164         * dojump.c (prefer_and_bit_test): Use immed_double_const instead of
14165         GEN_INT for 1 << bitnum.
14166         (do_jump) <case BIT_AND_EXPR>: Use build_int_cst_wide_type instead of
14167         build_int_cst_type.
14169 2009-05-07  Uros Bizjak  <ubizjak@gmail.com>
14171         * doc/md.texi (Standard Pattern Names For Generation) [sync_nand]:
14172         Remove wrong description of "nand" operation.
14174 2009-05-06  Richard Guenther  <rguenther@suse.de>
14175             Adam Nemet  <anemet@caviumnetworks.com>
14177         * gimple.def (GIMPLE_ASSIGN): Fix incorrect information in the
14178         comment.  Add that if LHS is not a gimple register, then RHS1 has
14179         to be a single object (GIMPLE_SINGLE_RHS).
14181 2009-05-06  Adam Nemet  <anemet@caviumnetworks.com>
14183         * expr.c (get_def_for_expr): Move it up in the file.
14184         (store_field): When expanding a bit-field store, look at the
14185         defining gimple stmt for the masking conversion.
14187 2009-05-06  Janis Johnson  <janis187@us.ibm.com>
14189         PR middle-end/39986
14190         * dfp.c (encode_decimal32, decode_decimal32, encode_decimal64,
14191         decode_decimal64, encode_decimal128, decode_decimal128): Avoid
14192         32-bit memcpy into long.
14194 2009-05-06  Jakub Jelinek  <jakub@redhat.com>
14196         * dwarf2out.c (new_reg_loc_descr): Don't ever create DW_OP_regX.
14197         (one_reg_loc_descriptor): Create DW_OP_regX here instead of calling
14198         new_reg_loc_descr.
14199         (loc_by_reference): If loc is DW_OP_regX, change it into DW_OP_bregX 0
14200         instead of appending DW_OP_deref*.
14202 2009-05-06  Michael Matz  <matz@suse.de>
14204         PR middle-end/40021
14205         * cfgexpand.c (maybe_cleanup_end_of_block): New static function.
14206         (expand_gimple_cond): Use it to cleanup CFG and superfluous jumps.
14208 2009-05-06  Rafael Avila de Espindola  <espindola@google.com>
14210         * Makefile.in (install-plugin): Fix srcdir handling.
14212 2009-05-06  Andrey Belevantsev  <abel@ispras.ru>
14214         * tree-ssa.c (execute_update_address_taken): Handle TARGET_MEM_REF
14215         when processing for not_regs_needed bitmap.
14216         * gimple.c (walk_stmt_load_store_addr_ops): When visiting address,
14217         handle TARGET_MEM_REF in lhs.  Check TMR_BASE for NULL while
14218         handling it for rhs.
14220 2009-05-06  H.J. Lu  <hongjiu.lu@intel.com>
14222         * config/i386/i386.md (unnamed inc/dec peephole): Use
14223         optimize_insn_for_size_p instead of optimize_size.
14224         * config/i386/predicates.md (incdec_operand): Likewise.
14225         (aligned_operand): Likewise.
14226         * config/i386/sse.md (divv8sf3): Likewise.
14227         (sqrtv8sf2): Likewise.
14229 2009-05-06  H.J. Lu  <hongjiu.lu@intel.com>
14231         * config/i386/i386.c (ix86_build_signbit_mask): Make it static.
14233         * config/i386/i386-protos.h (ix86_build_signbit_mask): Removed.
14235 2009-05-06  H.J. Lu  <hongjiu.lu@intel.com>
14237         * config/i386/i386.md (*avx_<code><mode>3_finite): Replace
14238         ssemodesuffixf2c with avxmodesuffixf2c.
14240 2009-05-06  Joseph Myers  <joseph@codesourcery.com>
14242         PR c/40032
14243         * c-decl.c (grokdeclarator): Handle incomplete type of unnamed field.
14245 2009-05-05  Jakub Jelinek  <jakub@redhat.com>
14247         * tree.h: Remove DECL_BY_REFERENCE from private_flag comment.
14248         (struct tree_base): Adjust spacing for 8 bit boundaries.
14249         (struct tree_decl_common): Add decl_by_reference_flag bit.
14250         (DECL_BY_REFERENCE): Adjust.
14251         * print-tree.c (print_node): For VAR_DECL, PARM_DECL or RESULT_DECL,
14252         print DECL_BY_REFERENCE bit.
14253         * dbxout.c (DECL_ACCESSIBILITY_CHAR): Revert last change.
14254         * dwarf2out.c (loc_by_reference, gen_decl_die): Check
14255         DECL_BY_REFERENCE for all VAR_DECLs, not just non-static ones.
14256         (gen_variable_die): Likewise.  Check TREE_PRIVATE/TREE_PROTECTED
14257         unconditionally.
14259         PR middle-end/39666
14260         * gimplify.c (gimplify_switch_expr): If case labels cover the whole
14261         range of the type, but default label is missing, add it with one
14262         of the existing labels instead of adding a new label for it.
14264 2009-05-05  Joseph Myers  <joseph@codesourcery.com>
14266         * dwarf.h: Remove.
14268 2009-05-05  Rafael Avila de Espindola  <espindola@google.com>
14270         * Makefile.in (enable_plugin, plugin_includedir): New.
14271         (install): Depend on install-plugin.
14272         (PLUGIN_HEADERS): New.
14273         (install-plugin): New.
14274         * config.gcc: Add vxworks-dummy.h to tm_file for x86 and x86-64.
14276 2009-05-05  Richard Guenther  <rguenther@suse.de>
14278         PR tree-optimization/40022
14279         * tree-ssa-phiprop.c (struct phiprop_d): Exchange vop_stmt for
14280         the only vuse.
14281         (phivn_valid_p): Fix tuplification error, simplify.
14282         (phiprop_insert_phi): Add dumps.
14283         (propagate_with_phi): Simplify.
14285 2009-05-05  Richard Guenther  <rguenther@suse.de>
14287         PR middle-end/40023
14288         * builtins.c (gimplify_va_arg_expr): Properly build the address.
14290 2009-05-05  Shujing Zhao  <pearly.zhao@oracle.com>
14292         * tree.h (strip_float_extensions): Remove duplicate declaration.
14293         (build_low_bits_mask, debug_fold_checksum, expand_function_end,
14294         expand_function_start, stack_protect_prologue, stack_protect_epilogue,
14295         block_ultimate_origin): Rearrange the declarations line to match the
14296         comment that indicates the .c file which the functions are defined.
14297         (dwarf2out_*, set_decl_rtl): Add comment.
14298         (get_base_address): Adjust comment.
14299         (change_decl_assembler_name, maybe_fold_*, build_addr): Rearrange the
14300         declarations line and add comment.
14301         (is_builtin_name): Add blank after function name, for clarity.
14303 2009-05-04  Joseph Myers  <joseph@codesourcery.com>
14305         * attribs.c (decl_attributes): Use %qE for identifiers in
14306         diagnostics.
14307         * cgraphunit.c (verify_cgraph_node): Translate function names to
14308         locale character set in diagnostics.
14309         * coverage.c (get_coverage_counts): Use %qE for identifiers in
14310         diagnostics.
14311         * doc/invoke.texi (-finstrument-functions-exclude-function-list):
14312         Document that functions are named in UTF-8.
14313         * expr.c (expand_expr_real_1): Translate function names to locale
14314         character set in diagnostics.
14315         * gimplify.c (omp_notice_variable, omp_is_private,
14316         gimplify_scan_omp_clauses): Use %qE for identifiers in
14317         diagnostics.
14318         * langhooks.c (lhd_print_error_function): Translate function names
14319         to locale character set.
14320         * langhooks.h (decl_printable_name): Document that return value is
14321         in internal character set.
14322         * stmt.c: Include pretty-print.h
14323         (tree_conflicts_with_clobbers_p): Use %qE for identifiers in
14324         diagnostics.
14325         (resolve_operand_name_1): Translate named operand name to locale
14326         character set.
14327         * stor-layout.c (finalize_record_size): Use %qE for identifiers in
14328         diagnostics.
14329         * toplev.c (announce_function): Translate function names to locale
14330         character set.
14331         (warn_deprecated_use): Use %qE for identifiers in diagnostics.
14332         (default_tree_printer): Use pp_identifier or translate identifiers
14333         to locale character set.  Mark "<anonymous>" for translation.
14334         * tree-mudflap.c (mx_register_decls, mudflap_finish_file): Use %qE
14335         for identifiers in diagnostics.
14336         * tree.c (handle_dll_attribute): Use %qE for identifiers in
14337         diagnostics.
14338         * varasm.c (output_constructor): Use %qE for identifiers in
14339         diagnostics.
14341 2009-05-04  Rafael Avila de Espindola  <espindola@google.com>
14343         * configure.ac: use ` ` instead of $()
14344         * configure: Regenerate.
14346 2009-05-05  Ben Elliston  <bje@au.ibm.com>
14348         * config/pa/linux-atomic.c: Eliminate conditional include of
14349         errno.h on non-LP64 systems to simplify build requirements.
14351 2009-05-04  Joseph Myers  <joseph@codesourcery.com>
14353         * c-common.c (handle_mode_attribute): Use %qE for identifiers in
14354         diagnostics.
14355         * c-decl.c (check_bitfield_type_and_width): Make orig_name a tree
14356         and pass value to identifier_to_locale.
14357         (warn_variable_length_array): Make name a tree.
14358         (grokdeclarator): Separate diagnostic texts for named and unnamed
14359         declarators.  Use %qE for named declarators.
14360         * c-parser.c (c_lex_one_token): Use %qE for identifiers in
14361         diagnostics.
14362         * c-pragma.c (pop_alignment, handle_pragma_pack): Use %qE for
14363         identifiers in diagnostics.
14364         * c-typeck.c (push_member_name, start_init): Pass identifiers to
14365         identifier_to_locale.  Mark "anonymous" strings for translation.
14367 2009-05-04  Michael Eager <eager@eagercon.com>
14369         * config/rs6000/rs6000.c (rs6000_legitimate_address): Allow
14370         address for DImode/DFmode only if double-precision FP regs.
14372 2009-05-04  Michael Eager <eager@eagercon.com>
14374         * config/rs6000/rs6000.c (rs6000_libcall_value): Add
14375         TARGET_SINGLE_FLOAT check.
14377 2009-05-04  Michael Eager <eager@eagercon.com>
14379         * config/rs6000/xilinx.h: Add CPP_SPEC for -mxilinx-fpu options.
14381 2009-05-04  Michael Eager <eager@eagercon.com>
14383         * gcc/config.gcc: (powerpc-xilinx-eabi*): Add tm t-xilinx
14384         * config/rs6000/t-xilinx: New
14386 2009-05-04  Paolo Bonzini  <bonzini@gnu.org>
14388         * doc/tm.texi (LEGITIMIZE_ADDRESS): Revise documentation.
14389         * gcc/defaults.h (LEGITIMIZE_ADDRESS): Delete.
14390         * gcc/explow.c (memory_address): Use target hook.
14391         * gcc/targhooks.c (default_legitimize_address): New.
14392         * gcc/targhooks.h (default_legitimize_address): New.
14393         * gcc/target.h (legitimize_address): New.
14394         * gcc/target-def.h (TARGET_LEGITIMIZE_ADDRESS): New.
14395         (TARGET_INITIALIZER): Include it.
14396         * gcc/system.h (LEGITIMIZE_ADDRESS): Poison.
14398         * config/bfin/bfin-protos.h (legitimize_address): Remove.
14399         * config/bfin/bfin.c (legitimize_address): Remove.
14400         * config/bfin/bfin.h (LEGITIMIZE_ADDRESS): Remove.
14401         * config/m68hc11/m68hc11-protos.h (m68hc11_legitimize_address):
14402         Remove.
14403         * config/m68hc11/m68hc11.c (m68hc11_legitimize_address): Remove.
14404         * config/m68hc11/m68hc11.h (LEGITIMIZE_ADDRESS): Remove.
14406         * gcc/config/arm/arm.h (LEGITIMIZE_ADDRESS, ARM_LEGITIMIZE_ADDRESS,
14407         THUMB_LEGITIMIZE_ADDRESS, THUMB2_LEGITIMIZE_ADDRESS): Delete.
14408         * gcc/config/s390/s390.h (LEGITIMIZE_ADDRESS): Delete.
14409         * gcc/config/m32c/m32c.h (LEGITIMIZE_ADDRESS): Delete.
14410         * gcc/config/sparc/sparc.h (LEGITIMIZE_ADDRESS): Delete.
14411         * gcc/config/m32r/m32r.h (LEGITIMIZE_ADDRESS): Delete.
14412         * gcc/config/i386/i386.h (LEGITIMIZE_ADDRESS): Delete.
14413         * gcc/config/sh/sh.h (LEGITIMIZE_ADDRESS): Delete.
14414         * gcc/config/avr/avr.h (LEGITIMIZE_ADDRESS): Delete.
14415         * gcc/config/m68hc11/m68hc11.h (LEGITIMIZE_ADDRESS): Delete.
14416         * gcc/config/iq2000/iq2000.h (LEGITIMIZE_ADDRESS): Delete.
14417         * gcc/config/mn10300/mn10300.h (LEGITIMIZE_ADDRESS): Delete.
14418         * gcc/config/m68k/m68k.h (LEGITIMIZE_ADDRESS): Delete.
14419         * gcc/config/score/score.h (LEGITIMIZE_ADDRESS): Delete.
14420         * gcc/config/pa/pa.h (LEGITIMIZE_ADDRESS): Delete.
14421         * gcc/config/mips/mips.h (LEGITIMIZE_ADDRESS): Delete.
14422         * gcc/config/alpha/alpha.h (LEGITIMIZE_ADDRESS): Delete.
14423         * gcc/config/frv/frv.h (LEGITIMIZE_ADDRESS): Delete.
14424         * gcc/config/spu/spu.h (LEGITIMIZE_ADDRESS): Delete.
14425         * gcc/config/xtensa/xtensa.h (LEGITIMIZE_ADDRESS): Delete.
14426         * gcc/config/cris/cris.h (LEGITIMIZE_ADDRESS): Delete.
14427         * gcc/config/rs6000/rs6000.h (LEGITIMIZE_ADDRESS): Delete.
14428         * gcc/config/picochip/picochip.h (LEGITIMIZE_ADDRESS): Delete.
14430         * gcc/config/s390/s390-protos.h (legitimize_address): Delete.
14431         * gcc/config/m32c/m32c-protos.h (m32c_legitimize_address): Delete.
14432         * gcc/config/sparc/sparc-protos.h (legitimize_address): Delete.
14433         * gcc/config/i386/i386-protos.h (legitimize_address): Delete.
14434         * gcc/config/avr/avr-protos.h (legitimize_address): Delete.
14435         * gcc/config/mn10300/mn10300-protos.h (legitimize_address): Delete.
14436         * gcc/config/score/score-protos.h (score_legitimize_address): Delete.
14437         * gcc/config/arm/arm-protos.h (arm_legitimize_address,
14438         (thumb_legitimize_address): Delete.
14439         * gcc/config/pa/pa-protos.h (hppa_legitimize_address): Delete.
14440         * gcc/config/mips/mips-protos.h (mips_legitimize_address): Delete.
14441         * gcc/config/alpha/alpha-protos.h (alpha_legitimize_address): Delete.
14442         * gcc/config/frv/frv-protos.h (frv_legitimize_address): Delete.
14443         * gcc/config/spu/spu-protos.h (spu_legitimize_address): Delete.
14444         * gcc/config/xtensa/xtensa-protos.h (xtensa_legitimize_address):
14445         Delete.
14446         * gcc/config/rs6000/rs6000-protos.h (rs6000_legitimize_address):
14447         Delete.
14449         * config/arm/arm.c (arm_legitimize_address): Maybe call Thumb version.
14450         * config/m32c/m32c.c (m32c_legitimize_address): Standardize.
14451         * config/m32r/m32r.c (m32r_legitimize_address): New.
14452         * config/m68k/m68k.c (m68k_legitimize_address): New.
14453         * config/score/score.c (score_legitimize_address): Standardize.
14454         * config/score/score3.c (score3_legitimize_address): Standardize.
14455         * config/score/score3.h (score3_legitimize_address): Adjust.
14456         * config/score/score7.c (score7_legitimize_address): Standardize.
14457         * config/score/score7.h (score7_legitimize_address): Adjust.
14458         * config/sh/sh.c (sh_legitimize_address): New.
14459         * config/iq2000/iq2000.c (iq2000_legitimize_address): New.
14461         * gcc/config/s390/s390.c (legitimize_address): Rename to...
14462         (s390_legitimize_address): ... this.
14463         * gcc/config/sparc/sparc.c (legitimize_address): Rename to...
14464         (sparc_legitimize_address): ... this.
14465         * gcc/config/i386/i386.c (legitimize_address): Rename to...
14466         (ix86_legitimize_address): ... this.
14467         * gcc/config/avr/avr.c (legitimize_address): Rename to...
14468         (avr_legitimize_address): ... this.
14469         * gcc/config/mn10300/mn10300.c (legitimize_address): Rename to...
14470         (mn10300_legitimize_address): ... this.
14471         * config/alpha/alpha.c (alpha_legitimize_address): Wrap...
14472         (alpha_legitimize_address_1): ... the old alpha_legitimize_address.
14473         (alpha_expand_mov): Adjust call.
14475         * config/frv/frv.c (frv_legitimize_address): Return x on failure.
14476         * config/spu/spu.c (spu_legitimize_address): Likewise.
14477         * config/xtensa/xtensa.c (xtensa_legitimize_address): Likewise.
14478         * config/rs6000/rs6000.c (rs6000_legitimize_address): Likewise.
14480 2009-05-04  Joseph Myers  <joseph@codesourcery.com>
14482         * intl.c (locale_encoding, locale_utf8): New.
14483         (gcc_init_libintl): Initialize locale_encoding and locale_utf8.
14484         * intl.h (locale_encoding, locale_utf8): Declare.
14485         * pretty-print.c: Include ggc.h.  Include iconv.h if HAVE_ICONV.
14486         (pp_base_tree_identifier, decode_utf8_char, identifier_to_locale):
14487         New.
14488         * pretty-print.h (pp_identifier): Call identifier_to_locale on ID
14489         argument.
14490         (pp_tree_identifier): Define to call pp_base_tree_identifier.
14491         (pp_base_tree_identifier): Declare as function.
14492         (identifier_to_locale): Declare.
14493         * Makefile.in (pretty-print.o): Update dependencies.
14494         * varasm.c (finish_aliases_1): Use %qE for identifiers in diagnostics.
14496 2009-05-04  Richard Guenther  <rguenther@suse.de>
14498         PR middle-end/40015
14499         * builtins.c (fold_builtin_memory_op): Do not decay to element
14500         type if the size matches the whole array.
14502 2009-05-04  Kazu Hirata  <kazu@codesourcery.com>
14504         * expmed.c (synth_mult): When trying out a shift, pass the result
14505         of a signed shift.
14507 2009-05-04  Kazu Hirata  <kazu@codesourcery.com>
14509         * expmed.c (shiftsub_cost): Rename to shiftsub0_cost.
14510         (shiftsub1_cost): New.
14511         (init_expmed): Compute shiftsub1_cost.
14512         (synth_mult): Optimize multiplications by constants of the form
14513         -(2^^m-1) for some constant positive integer m.
14515 2009-05-03  Richard Guenther  <rguenther@suse.de>
14517         PR c/39983
14518         * c-typeck.c (array_to_pointer_conversion): Do not built
14519         ADDR_EXPRs of arrays of pointer-to-element type.
14520         * c-gimplify.c (c_gimplify_expr): Revert change fixing
14521         up wrong ADDR_EXPRs after-the-fact.
14522         * c-common.c (strict_aliasing_warning): Strip pointer
14523         conversions for obtaining the original type.
14524         * builtins.c (fold_builtin_memset): Handle array types.
14525         (fold_builtin_memory_op): Handle folded POINTER_PLUS_EXPRs
14526         and array types
14528 2009-05-03  Richard Guenther  <rguenther@suse.de>
14530         PR middle-end/23329
14531         * tree-ssa.c (useless_type_conversion_p_1): Use get_deref_alias_set.
14532         Do not lose casts from array types with unknown extent to array
14533         types with known extent.
14534         * tree-ssa-copy.c (may_propagate_copy): Remove hack checking for
14535         alias set compatibility.
14537 2009-05-03  Manuel López-Ibáñez  <manu@gcc.gnu.org>
14539         * flags.h (extra_warnings): Delete.
14540         * toplev.c (process_options): Handle Wuninitialized here.
14541         * opts.c (extra_warnings): Delete.
14542         (set_Wextra): Delete.
14543         (common_handle_option): -Wextra can be handled automatically.
14544         * c-opts.c (c_common_handle_option): Delete obsolete code.
14545         (c_common_post_options): Simplify comment.
14546         * common.opt (W): Add Var.
14547         (Wextra): Add Var.
14548         (Wuninitialized): Initialize to -1.
14550 2009-05-03  Adam Nemet  <anemet@caviumnetworks.com>
14551             Richard Guenther  <rguenther@suse.de>
14553         * expr.c (get_def_for_expr): New function.
14554         (expand_expr_real_1) <PLUS_EXPR, MINUS_EXPR>: Adjust to work with
14555         SSA rather than trees.
14556         <MULT_EXPR>: Likewise.  Use subexp0 and subexp1 instead of
14557         TREE_OPERAND (exp, 0) and TREE_OPERAND (exp, 1).
14559 2009-05-03  Joseph Myers  <joseph@codesourcery.com>
14561         * c-common.c (reswords): Add _Imaginary.
14562         * c-common.c (enum rid): Add RID_IMAGINARY.
14564 2009-05-03  Paolo Bonzini  <bonzini@gnu.org>
14566         * tree.h (TYPE_VECTOR_OPAQUE): Fix documentation.
14567         Patch by Richard Guenther.
14569 2009-05-03  Anatoly Sokolov  <aesok@post.ru>
14571         * defaults.h (FRAME_POINTER_REQUIRED): Provide default.
14572         * doc/tm.texi (FRAME_POINTER_REQUIRED): Revise documentation.
14573         * config/alpha/alpha.h (FRAME_POINTER_REQUIRED): Delete.
14574         * config/s390/s390.h (FRAME_POINTER_REQUIRED): Delete.
14575         * config/spu/spu.h (FRAME_POINTER_REQUIRED): Delete.
14576         * config/sh/sh.h (FRAME_POINTER_REQUIRED): Delete.
14577         * config/pdp11/pdp11.h (FRAME_POINTER_REQUIRED): Delete.
14578         * config/stormy16/stormy16.h (FRAME_POINTER_REQUIRED): Delete.
14579         * config/m68hc11/m68hc11.h (FRAME_POINTER_REQUIRED): Delete.
14580         * config/iq2000/iq2000.h (FRAME_POINTER_REQUIRED): Delete.
14581         * config/mn10300/mn10300.h (FRAME_POINTER_REQUIRED): Delete.
14582         * config/ia64/ia64.h (FRAME_POINTER_REQUIRED): Delete.
14583         * config/m68k/m68k.h (FRAME_POINTER_REQUIRED): Delete.
14584         * config/rs6000/rs6000.h (FRAME_POINTER_REQUIRED): Delete.
14585         * config/picochip/picochip.h (FRAME_POINTER_REQUIRED): Delete.
14586         * config/mcore/mcore.h (FRAME_POINTER_REQUIRED): Delete.
14587         * config/h8300/h8300.h (FRAME_POINTER_REQUIRED): Delete.
14588         * config/v850/v850.h (FRAME_POINTER_REQUIRED): Delete.
14590 2009-05-02  Richard Guenther  <rguenther@suse.de>
14592         PR tree-optimization/39940
14593         * tree-ssa-pre.c (eliminate): Make sure we may propagate before
14594         doing so.
14596 2009-05-02  Richard Guenther  <rguenther@suse.de>
14598         PR middle-end/40001
14599         * tree-ssa.c (execute_update_addresses_taken): Properly check
14600         if we can mark a variable DECL_GIMPLE_REG_P.
14601         * gimple.c (is_gimple_reg): Re-order check for DECL_GIMPLE_REG_P
14602         back to the end of the function.
14603         (is_gimple_reg_type): Remove complex type special casing.
14604         * gimplify.c (gimplify_bind_expr): Do not set DECL_GIMPLE_REG_P
14605         if not optimizing.
14607 2009-05-02  Ben Elliston  <bje@au.ibm.com>
14609         * doc/collect2.texi (Collect2): Document search path behaviour
14610         when configured with --with-ld.
14612 2009-05-02  Jan Hubicka  <jh@suse.cz>
14614         * tree-ssa-coalesce.c (coalesce_cost): Do not take ciritical
14615         parameter; update callers.
14616         (coalesce_cost_edge): EH edges are costier because they needs
14617         splitting even if not critical and even more costier when there are
14618         multiple EH predecestors.
14620 2009-05-02  Jan Hubicka  <jh@suse.cz>
14622         * except.c (remove_eh_handler_and_replace): Handle updating after
14623         removing TRY blocks.
14625 2009-05-02  Eric Botcazou  <ebotcazou@adacore.com>
14627         * store-motion.c (compute_store_table): Add ENABLE_CHECKING guard.
14629 2009-05-02  Steven Bosscher  <steven@gcc.gnu.org>
14631         * varasm.c: Do not include c-pragma.h.
14632         * attribs.c: Do not incude c-common.h.
14634 2009-05-01  Michael Matz  <matz@suse.de>
14636         * calls.c (initialize_argument_information): Handle SSA names like
14637         decls with a non MEM_P DECL_RTL.
14639 2009-05-01  Steven Bosscher  <steven@gcc.gnu.org>
14641         * ipa-reference.c: Do not include c-common.h, include splay-tree.h.
14642         * ipa-utils.c: Likewise.
14643         * ipa-type-escape.c: Likewise.
14644         * cgraphunit.c Do not include c-common.h.
14645         * ipa-pure-const.c: Likewise.
14646         * tree-if-conv.c: Likewise.
14647         * matrix-reorg.c: Do not include c-common.h and c-tree.h.
14648         * ipa-struct-reorg.c: Likewise.
14649         * tree-nomudflap.c: Likewise.
14650         * tree-ssa-structalias.c: Likewise.
14652 2009-05-01  Steven Bosscher  <steven@gcc.gnu.org>
14654         * store-motion.c: Many cleanups to make this pass a first-class
14655         citizen instead of an appendix to gcse load motion.  Add TODO list
14656         to make this pass faster/cleaner/better.
14658         (struct ls_expr): Post gcse.c-split cleanups.
14659         Rename to st_expr.  Rename "loads" field to "antic_stores".  Rename
14660         "stores" field to "avail_stores".
14661         (pre_ldst_mems): Rename to store_motion_mems.
14662         (pre_ldst_table): Rename to store_motion_mems_table.
14663         (pre_ldst_expr_hash): Rename to pre_st_expr_hash, update users.
14664         (pre_ldst_expr_eq): Rename to pre_st_expr_eq, update users.
14665         (ldst_entry): Rename to st_expr_entry, update users.
14666         (free_ldst_entry): Rename to free_st_expr_entry, update users.
14667         (free_ldst_mems): Rename to free_store_motion_mems, update users.
14668         (enumerate_ldsts): Rename to enumerate_store_motion_mems,
14669         update caller.
14670         (first_ls_expr): Rename to first_st_expr, update users.
14671         (next_ls_expr): Rename to next_st_expr, update users.
14672         (print_ldst_list): Rename to print_store_motion_mems.  Print names of
14673         fields properly for store motion instead of names inherited from load
14674         motion in gcse.c.
14675         (ANTIC_STORE_LIST, AVAIL_STORE_LIST): Remove.
14676         (LAST_AVAIL_CHECK_FAILURE): Explain what this is.  Undefine when we
14677         are done with it.
14679         (ae_kill): Rename to st_kill, update users.
14680         (ae_gen): Rename to st_avloc, update users.
14681         (transp): Rename to st_transp, update users.
14682         (pre_insert_map): Rename to st_insert_map, update users.
14683         (pre_delete_map): Rename to st_delete_map, update users.
14684         (insert_store, build_store_vectors, free_store_memory,
14685         one_store_motion_pass): Update for abovementioned changes.
14687         (gcse_subst_count, gcse_create_count): Remove.
14688         (one_store_motion_pass): New statistics counters "n_stores_deleted"
14689         and "n_stores_created", local variables.
14691         (extract_mentioned_regs, extract_mentioned_regs_1): Rewrite to
14692         use for_each_rtx.
14694         (regvec, compute_store_table_current_insn): Remove.
14695         (reg_set_info, reg_clear_last_set): Remove.
14696         (compute_store_table): Use DF caches instead of local dataflow
14697         solvers.
14699 2009-05-01  Joseph Myers  <joseph@codesourcery.com>
14701         * c-objc-common.c (c_tree_printer): Print identifiers with
14702         pp_identifier, not pp_string.  Mark "({anonymous})" for
14703         translation.
14704         * c-pretty-print.c (pp_c_ws_string): New.
14705         (pp_c_cv_qualifier, pp_c_type_specifier,
14706         pp_c_specifier_qualifier_list, pp_c_parameter_type_list,
14707         pp_c_storage_class_specifier, pp_c_function_specifier,
14708         pp_c_attributes, pp_c_bool_constant, pp_c_constant,
14709         pp_c_primary_expression, pp_c_postfix_expression,
14710         pp_c_unary_expression, pp_c_shift_expression,
14711         pp_c_relational_expression, pp_c_equality_expression,
14712         pp_c_logical_and_expression, pp_c_logical_or_expression): Mostly
14713         use pp_string and pp_c_ws_string in place of pp_identifier and
14714         pp_c_identifier for non-identifiers.  Mark English strings for
14715         translation.
14716         * c-pretty-print.h (pp_c_ws_string): Declare.
14718 2009-04-30  Paul Pluzhnikov  <ppluzhnikov@google.com>
14719             Roland McGrath <roland@redhat.com>
14721         * configure.ac (HAVE_LD_BUILDID): New check for ld --build-id support.
14722         (ENABLE_LD_BUILDID): New configuration option.
14723         * gcc.c [HAVE_LD_BUILDID and ENABLE_LD_BUILDID]
14724         (LINK_BUILDID_SPEC): New macro.
14725         (init_spec): If defined, prepend it between LINK_EH_SPEC and
14726         link_spec.
14727         * doc/install.texi: Document --enable-linker-build-id option.
14728         * configure: Rebuild.
14729         * config.in: Rebuild.
14731 2009-04-30  Adam Nemet  <anemet@caviumnetworks.com>
14733         * config/mips/mips.h (FRAME_GROWS_DOWNWARD,
14734         MIPS_GP_SAVE_AREA_SIZE): Define new macros.
14735         (STARTING_FRAME_OFFSET): Return 0 if FRAME_GROWS_DOWNWARD.  Use
14736         MIPS_GP_SAVE_AREA_SIZE.
14737         * config/mips/mips.c (struct mips_frame_info): Update comment
14738         before arg_pointer_offset and hard_frame_pointer_offset.
14739         (mips_compute_frame_info): Update diagram before function: to
14740         correctly use stack_pointer_rtx for fp_sp_offset and gp_sp_offset, to
14741         indicate the position of frame_pointer_rtx with -fstack-protector and
14742         to show args_size.  Don't allocate cprestore area for leaf functions
14743         if FRAME_GROWS_DOWNWARD.  Use MIPS_GP_SAVE_AREA_SIZE to set
14744         cprestore_size.
14745         (mips_initial_elimination_offset): Update for FRAME_GROWS_DOWNWARD.
14747 2009-04-30  Michael Matz  <matz@suse.de>
14749         PR tree-optimization/39955
14750         * config/rs6000/rs6000.c (rs6000_check_sdmode): Also check SSA_NAMEs.
14752 2009-04-30  Dave Korn  <dave.korn.cygwin@gmail.com>
14754         * ira.c (setup_cover_and_important_classes):  Use safe macro
14755         REG_CLASS_FOR_CONSTRAINT instead of calling regclass_for_constraint
14756         directly.
14757         * genpreds.c (write_tm_preds_h):  Output suitable definition of
14758         REG_CLASS_FOR_CONSTRAINT.
14760 2009-04-30  Rafael Avila de Espindola  <espindola@google.com>
14762         * alloc-pool.c (alloc_pool_descriptor): Use an insert_opion value
14763         instead of an int.
14764         * bitmap.c (bitmap_descriptor): Likewise.
14765         * ggc-common.c (loc_descriptor): Likewise.
14766         * varray.c (varray_descriptor): Likewise.
14767         * vec.c (vec_descriptor): Likewise.
14769 2009-04-30  Eric Botcazou  <ebotcazou@adacore.com>
14771         * Makefile.in (dce.o): Add $(EXCEPT_H).
14772         * dce.c: Include except.h and delete redundant vector definitions.
14773         (deletable_insn_p): Return false for non-call insns that can throw
14774         if DF is running.
14776 2009-04-30  Steven Bosscher  <steven@gcc.gnu.org>
14778         * gcse.c (ae_gen): Remove.
14779         (can_assign_to_reg_p): Rename to can_assign_to_reg_without_clobbers_p
14780         and make non-static function to make it available in store-motion.c.
14781         Update call sites with search-and-replace.
14782         (enumerate_ldsts, reg_set_info, reg_clear_last_set, store_ops_ok,
14783         extract_mentioned_regs, extract_mentioned_regs_helper,
14784         find_moveable_store, compute_store_table, load_kills_store, find_loads,
14785         store_killed_in_insn, store_killed_after, store_killed_before,
14786         build_store_vectors, insert_insn_start_basic_block, insert-store,
14787         remove_reachable_equiv_notes, replace_store_insn, delete_store,
14788         free_store_memory, one_store_motion_pass, gate_rtl_store_motion,
14789         execute_rtl_store_motion, pass_rtl_store_motion): Move to...
14790         * store-motion.c: ...new file.  Also copy data structures from gcse.c
14791         and clean up to remove parts not used by store motion.
14792         * rtl.h (can_assign_to_reg_without_clobbers_p): Add prototype.
14793         * Makefile.in (store-motion.o): New rule. Add to OBJS-common.
14795 2009-04-30  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
14797         PR target/38571
14798         * config/arm/arm.h (FUNCTION_BOUNDARY): Set to 16 for thumb
14799         when optimizing for size.
14801 2009-04-30  Hans-Peter Nilsson  <hp@axis.com>
14803         * gcse.c (gcse_constant_p): Fix typo in last change.
14805 2009-04-30  Rafael Avila de Espindola  <espindola@google.com>
14807         * plugin.c: Include plugin-version.h only if ENABLE_PLUGIN is defined.
14809 2009-04-30  Andreas Krebbel  <krebbel1@de.ibm.com>
14811         * gcse.c (gcse_constant_p): Make sure the constant is sharable.
14813 2009-04-29  James E. Wilson  <wilson@codesourcery.com>
14815         * config/mips/mips.c (mips_add_offset): Use gen_int_mode for
14816         CONST_HIGH_PART result.
14818 2009-04-29  Anatoly Sokolov  <aesok@post.ru>
14820         * config/avr/avr.c (initial_elimination_offset): Rename to
14821         avr_initial_elimination_offset.
14822         (frame_pointer_required_p): Rename to avr_frame_pointer_required_p,
14823         change return type to bool.
14824         (avr_can_eliminate): New function.
14825         * config/avr/avr.h (CAN_ELIMINATE): Use avr_can_eliminate.
14826         (FRAME_POINTER_REQUIRED): Use avr_frame_pointer_required_p.
14827         (INITIAL_ELIMINATION_OFFSET): Use avr_initial_elimination_offset.
14828         * config/avr/avr-protos.h (initial_elimination_offset): Rename to
14829         avr_initial_elimination_offset.
14830         (frame_pointer_required_p): Rename to avr_frame_pointer_required_p.
14831         (avr_initial_elimination_offset): Define.
14833 2009-04-29  Eric Botcazou  <ebotcazou@adacore.com>
14834             Steven Bosscher  <steven@gcc.gnu.org>
14836         PR rtl-optimization/39938
14837         * Makefile.in (cfgrtl.o): Add $(INSN_ATTR_H).
14838         * cfgrtl.c: Include insn-attr.h.
14839         (rest_of_pass_free_cfg): New function.
14840         (pass_free_cfg): Use rest_of_pass_free_cfg as execute function.
14841         * resource.c (init_resource_info): Remove call to df_analyze.
14843 2009-04-29  Richard Guenther  <rguenther@suse.de>
14845         PR target/39943
14846         * config/i386/i386.c (ix86_vectorize_builtin_conversion): Only
14847         allow conversion to signed integers.
14849 2009-04-29  Richard Guenther  <rguenther@suse.de>
14851         * tree-cfg.c (verify_gimple_assign_binary): Allow vector
14852         shifts of floating point vectors if the shift amount is
14853         a constant multiple of the element size.
14855 2009-04-29  Andreas Krebbel  <krebbel1@de.ibm.com>
14856             Michael Matz  <matz@suse.de>
14858         PR middle-end/39927
14859         PR bootstrap/39929
14860         * tree-outof-ssa.c (emit_partition_copy): New function.
14861         (insert_partition_copy_on_edge, insert_rtx_to_part_on_edge,
14862         insert_part_to_rtx_on_edge): Perform the partition base var
14863         copy using emit_partition_copy.
14864         (insert_value_copy_on_edge): Convert constants to the right mode.
14865         (insert_rtx_to_part_on_edge): Add UNSIGNEDSRCP parameter.
14866         (elim_create): Pass the sign of the src to insert_rtx_to_part_on_edge.
14868 2009-04-29  Bernd Schmidt  <bernd.schmidt@analog.com>
14870         * config/bfin/bfin.c (bfin_optimize_loop): If we need a scratch reg,
14871         scan backwards to try to find a constant to initialize it.
14873         * config/bfin/bfin.c (bfin_optimize_loop): When looking for the last
14874         insn before the loop_end instruction, don't look past labels.
14876 2009-04-29  Richard Guenther  <rguenther@suse.de>
14878         PR middle-end/39937
14879         * tree-ssa-forwprop.c (forward_propagate_addr_expr_1): Do not
14880         loose type conversions.
14881         (forward_propagate_addr_expr): Fix tuplification bug.  Remove
14882         stmts only if there are no uses of its definition.
14884 2009-04-29  Bernd Schmidt  <bernd.schmidt@analog.com>
14886         * config/bfin/bfin.h (splitting_loops): Declare.
14887         * config/bfin/bfin-protos.h (WA_05000257, WA_05000283, WA_05000315):
14888         Reorder bit definitions to be ascending.
14889         (WA_LOAD_LCREGS, ENABLE_WA_LOAD_LCREGS): New macros.
14890         * config/bfin/bfin.c (splitting_loops): New variable.
14891         (bfin_cpus): Add WA_LOAD_LCREGS as needed.
14892         (struct loop_info): Remove members INIT and LOOP_INIT.
14893         (bfin_optimize_loop): Don't set them.  Reorder the code that generates
14894         the LSETUP sequence.  Allow LC to be loaded from any register, but
14895         also add a case to push/pop a PREG scratch if ENABLE_WA_LOAD_LCREGS.
14896         (bfin_reorg_loops): When done, split all BB_ENDs with splitting_loops
14897         set to 1.
14898         * config/bfin/bfin.md (loop_end splitter): Use splitting_loops instead
14899         of reload_completed.
14901         From Jie Zhang:
14902         * config/bfin/bfin.md (movsi_insn): Refine constraints.
14904 2009-04-29  Rafael Avila de Espindola  <espindola@google.com>
14906         * Makefile.in (PLUGIN_VERSION_H): New.
14907         (OBJS-common): Remove plugin-version.o.
14908         (plugin.o): Depend on (PLUGIN_VERSION_H).
14909         (plugin-version.o): Remove.
14910         * configure: Regenerate
14911         * configure.ac: Create plugin-version.h.
14912         * gcc-plugin.h (plugin_gcc_version): Remove.
14913         (plugin_default_version_check): Change signature.
14914         * plugin-version.c: Remove.
14915         * plugin.c: Include plugin-version.h.
14916         (str_plugin_gcc_version_name): Remove.
14917         (try_init_one_plugin): Pass gcc version to plugin_init.
14918         (plugin_default_version_check): Both gcc and plugin versions are now
14919         arguments.
14921 2009-04-29  Bernd Schmidt  <bernd.schmidt@analog.com>
14923         * config/bfin/bfin.c (bfin_optimize_loop): Unify handling of
14924         problematic last insns.  Test for TYPE_CALL rather than CALL_P.
14925         Remove special case testing for last insn of inner loops. Don't fail
14926         if the loop ends with a jump, emit an extra nop instead.
14928         * config/bfin/bfin.c (bfin_register_move_cost): Test for subsets of
14929         DREGS rather than comparing directly.  Remove code that tries to
14930         account for latencies.
14932 2009-04-29  Richard Guenther  <rguenther@suse.de>
14934         PR tree-optimization/39941
14935         * tree-ssa-pre.c (eliminate): Schedule update-ssa after
14936         eliminating an indirect call.
14938 2009-04-29  Richard Guenther  <rguenther@suse.de>
14940         * tree-cfg.c (verify_types_in_gimple_reference): Add require_lvalue
14941         parameter.  Allow invariants as base if !require_lvalue.
14942         (verify_gimple_assign_single): Adjust.
14944 2009-04-29  Bernd Schmidt  <bernd.schmidt@analog.com>
14946         * config/bfin/bfin.md (sp_or_sm, spm_string, spm_name): New macro.
14947         (ss<spm_name>hi3, ss<spm_name>hi3_parts, ss<spm_name>hi3_low_parts,
14948         ss<spm_name_hi3_high_parts): New patterns, replacing ssaddhi3,
14949         ssubhi3, ssaddhi3_parts and sssubhi3_parts.
14950         (flag_mulhi3_parts): Produce a HImode output rather than trying to set
14951         a VEC_SELECT.
14952         * config/bfin/bfin.c (bfin_expand_builtin,
14953         case BFIN_BUILTIN_CPLX_SQU): Adjust accordingly.
14955 2009-04-28  Richard Guenther  <rguenther@suse.de>
14957         * tree-vect-loop.c (get_initial_def_for_induction): Use
14958         correct types for pointer increment.
14960 2009-04-29  Kaveh R. Ghazi  <ghazi@caip.rutgers.edu>
14962         * toplev.c (print_version): Update GMP version string calculation.
14964 2009-04-28  Eric Botcazou  <ebotcazou@adacore.com>
14966         PR rtl-optimization/39938
14967         * resource.c (init_resource_info): Add call to df_analyze.
14969 2009-04-28  Uros Bizjak  <ubizjak@gmail.com>
14971         * config/alpha/alpha.md (usegp): Cast the result of
14972         alpha_find_lo_sum_using_gp to enum attr_usegp.
14973         * config/alpha/alpha.c (override_options): Remove end-of-structure
14974         marker element from cpu_table.  Use array size of cpu_table to handle
14975         -mcpu and -mtune options.
14976         (tls_symbolic_operand_type): Change 0 to TLS_MODEL_NONE.
14978 2009-04-28  Joseph Myers  <joseph@codesourcery.com>
14980         * config.gcc (powerpc*-*-* | rs6000-*-*): Add
14981         rs6000/option-defaults.h to tm_file.  Support cpu_32, cpu_64,
14982         tune_32 and tune_64.
14983         * doc/install.texi (--with-cpu-32, --with-cpu-64): Document
14984         support on PowerPC.
14985         * config/rs6000/rs6000.h (OPTION_DEFAULT_SPECS): Move to ...
14986         * config/rs6000/option-defaults.h: ... here.  New file.
14987         (OPT_64, OPT_32): Define.
14988         (MASK_64BIT): Define to 0 if not already defined.
14989         (OPT_ARCH64, OPT_ARCH32): Define.
14990         (OPTION_DEFAULT_SPECS): Add entries for cpu_32, cpu_64, tune_32
14991         and tune_64.
14993 2009-04-28  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
14995         * config/arm/arm.c (arm_override_options): Emit error on using
14996         fpa with AAPCS.
14998 2009-04-28  Uros Bizjak  <ubizjak@gmail.com>
15000         PR rtl-optimization/39914
15001         * ira-conflicts.c (ira_build_conflicts): Prohibit call used
15002         registers for allocnos created from user-defined variables only
15003         when not optimizing.
15005 2009-04-28  Richard Guenther  <rguenther@suse.de>
15007         PR middle-end/39937
15008         * fold-const.c (fold_binary): Use distribute_real_division only
15009         on float types.
15011 2009-04-28  Steve Ellcey  <sje@cup.hp.com>
15013         * config.gcc (hppa*64*-*-hpux11*): Set use_gcc_stdint and
15014         add hpux-stdint.h to tm_file.
15015         (hppa[12]*-*-hpux11*): Ditto.
15016         (ia64*-*-hpux*): Ditto.
15017         * config/hpux-stdint.h: New.
15018         * config/ia64/hpux.h (TARGET_OS_CPP_BUILTINS): Set
15019         __STDC_EXT__ for all compiles.
15020         * config/pa/pa-hpux.h: Ditto.
15021         * config/pa/pa-hpux10.h: Ditto.
15022         * config/pa/pa-hpux11.h: Ditto.
15024 2009-04-28  Catherine Moore  <clm@codesourcery.com>
15026         * debug.h (set_name): Add comment.
15028 2009-04-28  Andrew Pinski  <pinskia@gmail.com>
15030         PR target/39929
15031         * config/darwin.c (machopic_gen_offset): Check
15032         currently_expanding_to_rtl if current_ir_type returns IR_GIMPLE.
15033         * config/arm/arm.c (require_pic_register): Likewise.
15035 2009-04-28  Paolo Bonzini  <bonzini@gnu.org>
15037         * config/m32c/m32c.c (TARGET_PROMOTE_FUNCTION_RETURN,
15038         m32c_promote_function_return, TARGET_PROMOTE_PROTOTYPES,
15039         m32c_promote_prototypes): Delete.
15041 2009-04-28  Michael Matz  <matz@suse.de>
15043         PR middle-end/39922
15044         * tree-outof-ssa.c (insert_value_copy_on_edge): Don't convert
15045         constants.
15047 2009-04-28  Richard Guenther  <rguenther@suse.de>
15049         * tree-vect-stmts.c (vect_get_vec_def_for_operand): Fix type error.
15051 2009-04-28  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
15053         * config/arm/arm-cores.def: Add support for arm1156t2f-s.
15054         * doc/invoke.texi (ARM Options): Document support for arm1156t2f-s.
15055         * config/arm/arm-tune.md: Regenerate.
15057 2009-04-28  Alexander Monakov  <amonakov@ispras.ru>
15059         * sel-sched-ir.c (maybe_tidy_empty_bb): Do not attempt to delete a
15060         block if there are complex incoming edges.
15061         (sel_merge_blocks): Remove useless assert.
15062         (sel_redirect_edge_and_branch): Check that edge was redirected.
15063         * sel-sched-ir.h (_eligible_successor_edge_p): Remove assert.
15064         (sel_find_rgns): Delete declaration.
15065         * sel-sched.c (purge_empty_blocks): Attempt to remove first block of
15066         the region when it is not a preheader.
15068 2009-04-28  Uros Bizjak  <ubizjak@gmail.com>
15070         PR c/39323
15071         * config/alpha/elf.h (MAX_OFILE_ALIGNMENT): Sync with elfos.h
15073 2009-04-28  Richard Guenther  <rguenther@suse.de>
15075         * tree.h (SSA_NAME_VALUE): Remove.
15076         (struct tree_ssa_name): Remove value_handle member.
15077         * tree-vrp.c (execute_vrp): Initialize/free the value-handle
15078         array for jump threading.
15079         * tree-ssa-propagate.c (ssa_prop_init): Do not initialize
15080         SSA_NAME_VALUEs.
15081         * print-tree.c (print_node): Do not dump SSA_NAME_VALUEs.
15082         * tree-flow.h (threadedge_initialize_values): Declare.
15083         (threadedge_finalize_values): Likewise.
15084         * tree-ssa-threadedge.c (ssa_name_values): New global variable.
15085         (SSA_NAME_VALUE): Define.
15086         (threadedge_initialize_values): New function.
15087         (threadedge_finalize_values): Likewise.
15088         * tree-ssa-dom.c (ssa_name_values): New global variable.
15089         (SSA_NAME_VALUE): Define.
15090         (tree_ssa_dominator_optimize): Initialize/free the value-handle array.
15092 2009-04-28  Ira Rosen  <irar@il.ibm.com>
15094         * tree-vect-loop-manip.c (vect_create_cond_for_alias_checks):
15095         Use REPORT_VECTORIZED_LOCATIONS instead
15096         REPORT_VECTORIZED_LOOPS.
15097         * tree-vectorizer.c (vect_verbosity_level): Make static.
15098         (vect_loop_location): Rename to vect_location.
15099         (vect_set_verbosity_level): Update comment.
15100         (vect_set_dump_settings): Use REPORT_VECTORIZED_LOCATIONS
15101         and vect_location.
15102         (vectorize_loops): Fix comment. Use REPORT_VECTORIZED_LOCATIONS
15103         and vect_location. Use REPORT_UNVECTORIZED_LOCATIONS
15104         instead REPORT_UNVECTORIZED_LOOPS.
15105         * tree-vectorizer.h (enum vect_def_type): Rename vect_invariant_def
15106         and vect_loop_def to vect_external_def and vect_internal_def.
15107         (enum verbosity_levels): Rename REPORT_VECTORIZED_LOOPS
15108         and REPORT_UNVECTORIZED_LOOPS to REPORT_VECTORIZED_LOCATIONS and
15109         REPORT_UNVECTORIZED_LOCATIONS.
15110         (enum vect_relevant): Update comment. Rename vect_unused_in_loop
15111         and vect_used_in_loop and to vect_unused_in_scope and
15112         vect_used_in_scope.
15113         (STMT_VINFO_RELEVANT_P): Use vect_unused_in_scope.
15114         (vect_verbosity_level): Remove declaration.
15115         (vect_analyze_operations): Likewise.
15116         (vect_analyze_stmt): Declare.
15117         * tree-vect-loop.c (vect_determine_vectorization_factor): Use
15118         REPORT_UNVECTORIZED_LOCATIONS.
15119         (vect_get_loop_niters): Fix indentation.
15120         (vect_analyze_loop_form): Use REPORT_UNVECTORIZED_LOCATIONS.
15121         (vect_analyze_loop_operations): New function.
15122         (vect_analyze_loop): Call vect_analyze_loop_operations instead of
15123         vect_analyze_operations.
15124         (vect_is_simple_reduction): Use new names.
15125         (vectorizable_live_operation, vect_transform_loop): Likewise.
15126         * tree-vect-data-refs.c (vect_check_interleaving): Add a return value
15127         to specify whether the data references can be a part of interleaving
15128         chain.
15129         (vect_analyze_data_ref_dependence): Use new names.
15130         (vect_analyze_data_refs_alignment, vect_analyze_data_refs): Likewise.
15131         (vect_create_addr_base_for_vector_ref): Remove redundant code.
15132         * tree-vect-patterns.c (widened_name_p): Use new names.
15133         (vect_recog_dot_prod_pattern): Likewise.
15134         * tree-vect-stmts.c (vect_stmt_relevant_p): Use new names.
15135         (process_use, vect_mark_stmts_to_be_vectorized,
15136         vect_model_simple_cost, vect_model_store_cost,
15137         vect_get_vec_def_for_operand, vect_get_vec_def_for_stmt_copy,
15138         vectorizable_call, vectorizable_conversion, vectorizable_assignment,
15139         vectorizable_operation, vectorizable_type_demotion,
15140         vectorizable_type_promotion, vectorizable_store, vectorizable_load,
15141         vectorizable_condition): Likewise.
15142         (vect_analyze_operations): Split into vect_analyze_loop_operations
15143         and ...
15144         (vect_analyze_stmt): ... new function.
15145         (new_stmt_vec_info): Use new names.
15146         (vect_is_simple_use): Use new names and fix comment.
15147         * tree-vect-slp.c (vect_get_and_check_slp_defs): Use new names.
15148         (vect_build_slp_tree, vect_analyze_slp, vect_schedule_slp): Likewise.
15150 2009-04-28  Uros Bizjak  <ubizjak@gmail.com>
15152         PR target/39911
15153         * config/i386/i386.c (print_operand) ['Z']: Handle floating point
15154         and integer modes for x87 operands.  Do not ICE for unsupported size,
15155         generate error instead.  Generate error for unsupported operand types.
15156         ['z']: Do not handle HImode memory operands specially.  Warning
15157         for floating-point operands.  Fallthru to 'Z' for unsupported operand
15158         types.  Do not ICE for unsupported size, generate error instead.
15159         (output_387_binary_op): Use %Z to output operands.
15160         (output_fp_compare): Ditto.
15161         (output_387_reg_move): Ditto.
15163 2009-04-28  Ben Elliston  <bje@au.ibm.com>
15165         PR c++/35652
15166         Revert:
15168         2009-03-27  Manuel Lopez-Ibanez  <manu@gcc.gnu.org>
15170         * builtins.c (c_strlen): Do not warn here.
15171         * c-typeck.c (build_binary_op): Adjust calls to pointer_int_sum.
15172         * c-common.c (pointer_int_sum): Take an explicit location.
15173         Warn about offsets out of bounds.
15174         * c-common.h (pointer_int_sum): Adjust declaration.
15176 2009-04-27  Ian Lance Taylor  <iant@google.com>
15178         * collect2.c (is_ctor_dtor): Change type of ret field in struct
15179         names to symkind.
15180         * dce.c (run_fast_df_dce): Change type of old_flags to int.
15181         * df-core.c (df_set_flags): Change return type to int.  Change
15182         type of old_flags to int.
15183         (df_clear_flags): Likewise.
15184         * df-scan.c (df_def_record_1): Change 0 to VOIDmode.
15185         (df_get_conditional_uses): Likewise.
15186         * df.h (df_set_flags, df_clear_flags): Update declarations.
15187         * dwarf2out.c (struct indirect_string_node): Change type of form
15188         field to enum dwarf_form.
15189         (AT_string_form): Change return type to enum dwarf_form.
15190         * fixed-value.c (fixed_compare): Add cast to enum type.
15191         * fwprop.c (update_df): Change 0 to VOIDmode.
15192         * gensupport.c: Change 0 to UNKNOWN.
15193         * gimple.h (gimple_cond_code): Add cast to enum type.
15194         * haifa-sched.c (reemit_notes): Add cast to enum type.
15195         * hooks.c (hook_int_void_no_regs): Remove function.
15196         * hooks.h (hook_int_void_no_regs): Remove declaration.
15197         * optabs.c (expand_widen_pattern_expr): Change 0 to VOIDmode.
15198         * predict.c (combine_predictions_for_insn): Add casts to enum type.
15199         * real.c (real_arithmetic): Add cast to enum type.
15200         (real_compare): Likewise.
15201         * target.h (struct gcc_target): Change return type of
15202         branch_target_register_class to enum reg_class.
15203         * target-def.h (TARGET_BRANCH_TARGET_REGISTER_CLASS): Define as
15204         default_branch_target_register_class.
15205         * targhooks.c (default_branch_target_register_class): New function.
15206         * targhooks.h (default_branch_target_register_class): Declare.
15207         * tree-data-ref.c (print_direction_vector): Add cast to enum type.
15208         * tree-vect-data-refs.c (vect_supportable_dr_alignment): Remove
15209         cast to int.
15210         * tree-vect-loop.c (vect_create_epilog_for_reduction): Change 0 to
15211         ERROR_MARK.
15212         * tree-vect-slp.c (vect_build_slp_tree): Change 0 to
15213         vect_uninitialized_def.  Change 0 to ERROR_MARK.
15214         * tree-vect-stmts.c (supportable_widening_operation): Don't
15215         initialize icode1 and icode2.
15216         * tree-vectorizer.h (enum vect_def_type): Add vect_uninitialized_def.
15217         * config/sol2-c.c (cmn_err_length_specs): Change 0 to FMT_LEN_none
15218         and to STD_C89.
15219         (cmn_err_flag_specs): Change 0 to STD_C89.
15220         (cmn_err_char_table): Likewise.
15221         * config/arm/arm.c (get_arm_condition_code): Change type of code
15222         to enum arm_cond_code.
15223         (IWMMXT_BUILTIN): Change 0 to UNKNOWN.
15224         (IWMMXT_BUILTIN2): Likewise.
15225         (neon_builtin_type_bits): Don't define typedef.
15226         (neon_builtin_datum): Change type of bits field to int.
15227         (arm_expand_neon_args): Add cast to enum type.
15228         * config/ia64/ia64.c (tls_symbolic_operand_type): Change 0 to
15229         TLS_MODEL_NONE.
15230         * config/i386/i386.c (bdesc_multi_arg): Change 0 to UNKNOWN.  Add
15231         casts to enum type.
15232         * config/mips/mips.c (LOONGSON_BUILTIN_ALIAS): Change 0 to
15233         MIPS_FP_COND_f.
15234         * config/mips/mips.md (jal_macro): Return enum constant.
15235         (single_insn): Likewise.
15236         * config/rs6000/rs6000.c (bdesc_altivec_preds): Change 0 to
15237         CODE_FOR_nothing.
15238         * config/rs6000/rs6000-c.c (altivec_overloaded_builtins): Add
15239         casts to enum type.
15240         * config/s390/s390.c (s390_tune_flags): Change type to int.
15241         (s390_arch_flags): Likewise.
15242         (s390_handle_arch_option): Change flags field of struct pta to int.
15243         * config/s390/s390.h (s390_tune_flags): Update declaration.
15244         (s390_arch_flags): Likewise.
15245         * config/sh/sh.c (prepare_move_operands): Compare
15246         tls_symbolic_operand result with enum constant.
15247         (sh_reorg): Change PUT_MODE to PUT_REG_NOTE_KIND.
15248         (sh_expand_prologue): Add cast to enum type.
15249         (sh_expand_epilogue): Likewise.
15250         (tls_symbolic_operand): Change return type to enum tls_model.
15251         (fpscr_set_from_mem): Add cast to enum type.
15252         (legitimize_pic_address): Compare tls_symbolic_operand result with
15253         enum constant.
15254         (sh_target_reg_class): Change return type to enum reg_class.
15255         * config/sh/sh.h (OVERRIDE_OPTIONS): Change CPU_xxx to
15256         PROCESSOR_xxx.
15257         * config/sh/sh-protos.h (tls_symbolic_operand): Update declaration.
15258         * config/sparc/sparc.c (sparc_override_options): Add cast to enum type.
15259         * config/sparc/sparc.md (empty_delay_slot): Return enum constant.
15260         (pic, calls_alloca, calls_eh_return, leaf_function): Likewise.
15261         (delayed_branch, tls_call_delay): Likewise.
15262         (eligible_for_sibcall_delay): Likewise.
15263         (eligible_for_return_delay): Likewise.
15264         * config/spu/spu.c (expand_builtin_args): Add cast to enum type.
15265         (spu_expand_builtin_1): Likewise.
15267         * c-typeck.c (convert_for_assignment): Issue -Wc++-compat warnings
15268         for all types of conversions.
15269         (output_init_element): Issue -Wc++-compat warning if needed when
15270         initializing a bitfield with enum type.
15271         * c-parser.c (c_parser_expression): Set original_type to
15272         original_type of right hand operand of comma operator.
15274 2009-04-27  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
15276         * doc/c-tree.texi (Types, Functions, Expression trees): Fix
15277         grammar nits.
15278         * doc/cfg.texi (Maintaining the CFG, Liveness information): Likewise.
15279         * doc/cpp.texi (Standard Predefined Macros)
15280         (Implementation-defined behavior): Likewise.
15281         * doc/extend.texi (Function Attributes, Type Attributes): Likewise.
15282         * doc/gimple.texi (GIMPLE Exception Handling)
15283         (@code{GIMPLE_ASSIGN}): Likewise.
15284         * doc/install.texi (Prerequisites, Configuration, Specific): Likewise.
15285         * doc/invoke.texi (Warning Options, Optimize Options)
15286         (AVR Options, Darwin Options): Likewise.
15287         (Optimize Options): Reformulate -fwhole-program description.
15288         * doc/loop.texi (Lambda): Likewise.
15289         * doc/md.texi (Output Template, Define Constraints)
15290         (Standard Names, Insn Splitting): Likewise.
15291         * doc/options.texi (Option properties): Likewise.
15292         * doc/passes.texi (Tree-SSA passes): Likewise.
15293         * doc/rtl.texi (Side Effects, Assembler, Insns): Likewise.
15294         * doc/tm.texi (Register Classes, Old Constraints, Scalar Return)
15295         (File Names and DBX): Likewise.
15296         * doc/trouble.texi (Incompatibilities): Likewise.
15298 2009-04-27  Trevor Smigiel  <trevor_smigiel@playstation.sony.com>
15300         * spu.c (spu_machine_dependent_reorg): Make sure branch label on hint
15301         instruction is correct.
15303 2009-04-27  Trevor Smigiel  <trevor_smigiel@playstation.sony.com>
15305         Allow non-constant arguments to conversion intrinsics.
15306         * spu-protos.h (exp2_immediate_p, spu_gen_exp2): Declare.
15307         * predicates.md (spu_inv_exp2_operand, spu_exp2_operand): New.
15308         * spu.c (print_operand): Handle 'v' and 'w'.
15309         (exp2_immediate_p, spu_gen_exp2): Define.
15310         * spu-builtins.def (spu_convts, spu_convtu, spu_convtf_0,
15311         spu_convtf_1): Update parameter descriptions.
15312         * spu-builtins.md (spu_csflt, spu_cuflt, spu_cflts, spu_cfltu): Update.
15313         * constraints.md ('v', 'w'): New.
15314         * spu.md (UNSPEC_CSFLT, UNSPEC_CFLTS, UNSPEC_CUFLT, UNSPEC_CFLTU):
15315         Remove.
15316         (i2f, I2F): New define_mode_attr.
15317         (floatsisf2, floatv4siv4sf2, fix_truncsfsi2, fix_truncv4sfv4si2,
15318         floatunssisf2, floatunsv4siv4sf2, fixuns_truncsfsi2,
15319         fixuns_truncv4sfv4si2):  Update to use mode attribute.
15320         (float<mode><i2f>2_mul, float<mode><i2f>2_div,
15321         fix_trunc<mode><f2i>2_mul, floatuns<mode><i2f>2_mul,
15322         floatuns<mode><i2f>2_div, fixuns_trunc<mode><f2i>2_mul): New
15323         patterns for combine.
15325 2009-04-27  Steven Bosscher  <steven@gcc.gnu.org>
15327         * dbgcnt.def (cprop1, cprop2, gcse, jump_bypass): Remove
15328         (cprop, hoist, pre, store_motion): New debug counters.
15329         * tree-pass.h (pass_tracer): Move to list of gimple passes, it
15330         is not an RTL pass anymore.
15331         (pass_profiling): Remove extern decl for pass removed in 2005.
15332         (pass_gcse, pass_jump_bypass): Remove.
15333         * final.c (rest_of_clean_state): Set flag_rerun_cse_after_global_opts
15334         to 0 for clean state.
15335         * toplev.h (flag_rerun_cse_after_global_opts): Add extern declaration.
15336         * cse.c (gate_handle_cse_after_global_opts,
15337         rest_of_handle_cse_after_global_opts): New functions.
15338         (pass_cse_after_global_opts): New pass, does local CSE.
15339         * timevar.def (TV_GCSE, TV_CPROP1, TV_CPROP2, TV_BYPASS): Remove.
15340         (TV_CPROP): New timevar.
15341         * gcse.c (flag_rerun_cse_after_global_opts): New global variable.
15342         (run_jump_opt_after_gcse, max_gcse_regno): Remove global vars.
15343         (gcse_main, recompute_all_luids): Remove.
15344         (compute_hash_table_work): Call max_reg_num instead of reading
15345         max_gcse_regno.
15346         (cprop_jump): Don't set run_jump_opt_after_gcse.
15347         (constprop_register): Always allow to alter jumps.
15348         (cprop_insn): Likewise.
15349         (do_local_cprop): Likewise.
15350         (local_cprop_pass): Likewise.  Return non-zero if something changed.
15351         (cprop): Remove function, fold interesting bits into one_cprop_pass.
15352         (find_implicit_sets): Add note about missed optimization opportunity.
15353         (one_cprop_pass): Rewrite to be "the" CPROP pass, called from the
15354         pass_rtl_cprop execute function.
15355         Don't bother tracking the pass number, each pass gets its own dumpfile
15356         now anyway.
15357         Always allow to alter jumpsand bypass jumps.
15358         (bypass_block): Don't ignore regno >= max_gcse_regno, find_bypass_set
15359         will just find no suitable set.
15360         (pre_edge_insert): Fix dumping, this function is for PRE only.
15361         (one_pre_gcse_pass): Rewrite to be "the" PRE pass, called from the
15362         pass_rtl_pre execute function.
15363         (hoist_code): Return non-zero if something changed.  Keep track of
15364         substitutions and insertions for statistics gathering similar to PRE.
15365         (one_code_hoisting_pass): Rewrite to be "the" code hoisting pass,
15366         called from the pass_rtl_hoist execute function.  Show pass statistics.
15367         (compute_store_table): Use max_reg_num directly instead of using the
15368         formerly global max_gcse_regno.
15369         (build_store_vectors): Likewise.
15370         (replace_store_insn): Fix dumping.
15371         (store_motion): Rename to ...
15372         (one_store_motion_pass): ... this.  Rewrite to be "the" STORE_MOTION
15373         pass, called from the pass_rtl_store_motion execute function.  Keep
15374         track of substitutions and insertions for statistics gathering similar
15375         to PRE.
15376         (bypass_jumps): Remove, fold interesting bits into ...
15377         (one_cprop_pass): ... this.  Rewrite to be "the" CPROP pass, called
15378         from the pass_rtl_cprop execute function.
15379         (gate_handle_jump_bypass, rest_of_handle_jump_bypass,
15380         pass_jump_bypass): Remove.
15381         (gate_handle_gcse, rest_of_handle_gcse): Remove.
15382         (gate_rtl_cprop, execute_rtl_cprop, pass_rtl_cprop): New.
15383         (gate_rtl_pre, execute_rtl_pre, pass_rtl_pre): New.
15384         (gate_rtl_hoist, execute_rtl_hoist, pass_rtl_hoist): New.
15385         (gate_rtl_store_motion, execute_rtl_store_motion,
15386         pass_rtl_store_motion): New.
15387         * common.opt: Remove flag_cse_skip_blocks, adjust documentation to
15388         make it clear that -fcse-skip-blocks is a no-op for backward compat.
15389         * passes.c (init_optimization_passes): Remove pass_gcse and
15390         pass_jump_bypass.  Schedule cprop, pre, hoist, cprop, store_motion,
15391         and cse_after_global_opts in place of pass_gcse.  Schedule cprop
15392         instead of pass_jump_bypass.
15394 2009-04-27  Richard Guenther  <rguenther@suse.de>
15396         PR middle-end/39928
15397         * gimplify.c (gimplify_expr): If we are required to create
15398         a temporary make sure it ends up as register.
15400 2009-04-27  H.J. Lu  <hongjiu.lu@intel.com>
15402         PR target/39903
15403         * config/i386/i386.c (construct_container): Don't call
15404         gen_reg_or_parallel with BLKmode on X86_64_SSE_CLASS,
15405         X86_64_SSESF_CLASS and X86_64_SSEDF_CLASS.
15407 2009-04-27  Michael Matz  <matz@suse.de>
15409         * ssaexpand.h (struct ssaexpand): Member 'values' is a bitmap.
15410         (get_gimple_for_ssa_name): Adjust, lookup using SSA_NAME_DEF_STMT.
15411         * tree-ssa-live.h: (find_replaceable_exprs): Return a bitmap.
15412         (dump_replaceable_exprs): Take a bitmap.
15413         * cfgexpand.c (gimple_cond_pred_to_tree): Handle bitmap instead of
15414         array.
15415         (expand_gimple_basic_block): Likewise.
15416         * tree-ssa-ter.c (struct temp_expr_table_d): Make
15417         replaceable_expressions member a bitmap.
15418         (free_temp_expr_table): Pass back and deal with bitmap, not gimple*.
15419         (mark_replaceable): Likewise.
15420         (find_replaceable_in_bb, dump_replaceable_exprs): Likewise.
15421         * tree-outof-ssa.c (remove_ssa_form): 'values' is a bitmap.
15423 2009-04-27  Richard Guenther  <rguenther@suse.de>
15425         * tree-cfg.c (remove_useless_stmts): Verify stmts afterwards.
15426         (verify_stmts): Dispatch to gimple/type verification code.
15427         * tree-inline.c (remap_gimple_op_r): Work around C++ FE
15428         issue with call argument types.
15430 2009-04-27  Michael Matz  <matz@suse.de>
15432         * tree-into-ssa.c (regs_to_rename, mem_syms_to_rename): Remove.
15433         (init_update_ssa, delete_update_ssa, update_ssa): Remove references
15434         to above.
15436 2009-04-27  Richard Sandiford  <rdsandiford@googlemail.com>
15437             Eric Botcazou  <ebotcazou@adacore.com>
15439         * resource.c (find_basic_block): Use BLOCK_FOR_INSN to look up
15440         a label's basic block.
15441         (mark_target_live_regs): Tidy and rework obsolete comments.
15442         Change back DF problem to LIVE.  If a label starts a basic block,
15443         assume that all registers that used to be live then still are.
15444         (init_resource_info): If a label starts a basic block, set its
15445         BLOCK_FOR_INSN accordingly.
15446         (fini_resource_info): Undo the setting of BLOCK_FOR_INSN.
15448 2009-04-27  Richard Guenther  <rguenther@suse.de>
15450         * tree-flow-inline.h (function_ann): Remove.
15451         (get_function_ann): Likewise.
15452         * tree-dfa.c (create_function_ann): Remove.
15453         * tree-flow.h (struct static_var_ann_d): Remove.
15454         (struct function_ann_d): Likewise.
15455         (union tree_ann_d): Remove fdecl member.
15456         (function_ann_t): Remove.
15457         (function_ann, get_function_ann, create_function_ann): Remove
15458         declarations.
15460 2009-04-27  Uros Bizjak  <ubizjak@gmail.com>
15462         * config/alpha/alpha.c (code_for_builtin): Declare as enum insn_code.
15464 2009-04-27  Jan Hubicka  <jh@suse.cz>
15466         * ipa-pure-const.c (struct funct_state_d): New fields
15467         state_previously_known, looping_previously_known; remove
15468         state_set_in_source.
15469         (analyze_function): Use new fields.
15470         (propagate): Avoid assumption that state_set_in_source imply
15471         nonlooping.
15473         * tree-ssa-loop-niter.c (finite_loop_p): New function.
15474         * tree-ssa-loop-ivcanon.c (empty_loop_p): Use it.
15475         * cfgloop.h (finite_loop_p): Declare.
15477 2009-04-26  Michael Matz  <matz@suse.de>
15479         * tree-flow.h (tree_ann_common_d): Remove aux and value_handle members.
15481 2009-04-26  Michael Matz  <matz@suse.de>
15483         * tree-pass.h (pass_del_ssa, pass_mark_used_blocks,
15484         pass_free_cfg_annotations, pass_free_datastructures): Remove decls.
15485         * gimple-low.c (mark_blocks_with_used_vars, mark_used_blocks,
15486         pass_mark_used_blocks): Remove.
15487         * tree-optimize.c (pass_free_datastructures,
15488         execute_free_cfg_annotations, pass_free_cfg_annotations): Remove.
15489         * passes.c (init_optimization_passes): Don't call
15490         pass_mark_used_blocks, remove dead code.
15492 2009-04-26  H.J. Lu  <hongjiu.lu@intel.com>
15494         * tree-outof-ssa.c (rewrite_trees): Add ATTRIBUTE_UNUSED.
15495         * tree-ssa-live.h (register_ssa_partition): Likewise.
15497 2009-04-26  Michael Matz  <matz@suse.de>
15499         Expand from SSA.
15500         * builtins.c (fold_builtin_next_arg): Handle SSA names.
15501         * tree-ssa-copyrename.c (rename_ssa_copies): Use ssa_name() directly.
15502         * tree-ssa-coalesce.c (create_outofssa_var_map): Mark only useful
15503         SSA names.
15504         (compare_pairs): Swap cost comparison.
15505         (coalesce_ssa_name): Don't use change_partition_var.
15506         * tree-nrv.c (struct nrv_data): Add modified member.
15507         (finalize_nrv_r): Set it.
15508         (tree_nrv): Use it to update statements.
15509         (pass_nrv): Require PROP_ssa.
15510         * tree-mudflap.c (mf_decl_cache_locals,
15511         mf_build_check_statement_for): Use make_rename_temp.
15512         (pass_mudflap_2): Require PROP_ssa, run ssa update at finish.
15513         * alias.c (find_base_decl): Handle SSA names.
15514         * emit-rtl (set_reg_attrs_for_parm): Make non-static.
15515         (component_ref_for_mem_expr): Don't leak SSA names into RTL.
15516         * rtl.h (set_reg_attrs_for_parm): Declare.
15517         * tree-optimize.c (pass_cleanup_cfg_post_optimizing): Rename
15518         to "optimized", remove unused locals at finish.
15519         (execute_free_datastructures): Make global, call
15520         delete_tree_cfg_annotations.
15521         (execute_free_cfg_annotations): Don't call
15522         delete_tree_cfg_annotations.
15524         * ssaexpand.h: New file.
15525         * expr.c (toplevel): Include ssaexpand.h.
15526         (expand_assignment): Handle SSA names the same as register variables.
15527         (expand_expr_real_1): Expand SSA names.
15528         * cfgexpand.c (toplevel): Include ssaexpand.h.
15529         (SA): New global variable.
15530         (gimple_cond_pred_to_tree): Fold TERed comparisons into predicates.
15531         (SSAVAR): New macro.
15532         (set_rtl): New helper function.
15533         (add_stack_var): Deal with SSA names, use set_rtl.
15534         (expand_one_stack_var_at): Likewise.
15535         (expand_one_stack_var): Deal with SSA names.
15536         (stack_var_size_cmp): Use code (SSA_NAME / DECL) as tie breaker
15537         before unique numbers.
15538         (expand_stack_vars): Use set_rtl.
15539         (expand_one_var): Accept SSA names, add asserts for them, feed them
15540         to above subroutines.
15541         (expand_used_vars): Expand all partitions (without default defs),
15542         then only the local decls (ignoring those expanded already).
15543         (expand_gimple_cond): Remove edges when jumpif() expands an
15544         unconditional jump.
15545         (expand_gimple_basic_block): Don't clear EDGE_EXECUTABLE here,
15546         or remove abnormal edges.  Ignore insns setting the LHS of a TERed
15547         SSA name.
15548         (gimple_expand_cfg): Call into rewrite_out_of_ssa, initialize
15549         members of SA; deal with PARM_DECL partitions here; expand
15550         all PHI nodes, free tree datastructures and SA.  Commit instructions
15551         on edges, clear EDGE_EXECUTABLE and remove abnormal edges here.
15552         (pass_expand): Require and destroy PROP_ssa, verify SSA form, flow
15553         info and statements at start, collect garbage at finish.
15554         * tree-ssa-live.h (struct _var_map): Remove partition_to_var member.
15555         (VAR_ANN_PARTITION) Remove.
15556         (change_partition_var): Don't declare.
15557         (partition_to_var): Always return SSA names.
15558         (var_to_partition): Only accept SSA names.
15559         (register_ssa_partition): Only check argument.
15560         * tree-ssa-live.c (init_var_map): Don't allocate partition_to_var
15561         member.
15562         (delete_var_map): Don't free it.
15563         (var_union): Only accept SSA names, simplify.
15564         (partition_view_init): Mark only useful SSA names as used.
15565         (partition_view_fini): Only deal with SSA names.
15566         (change_partition_var): Remove.
15567         (dump_var_map): Use ssa_name instead of partition_to_var member.
15568         * tree-ssa.c (delete_tree_ssa): Don't remove PHI nodes on RTL
15569         basic blocks.
15570         * tree-outof-ssa.c (toplevel): Include ssaexpand.h and expr.h.
15571         (struct _elim_graph): New member const_dests; nodes member vector of
15572         ints.
15573         (set_location_for_edge): New static helper.
15574         (create_temp): Remove.
15575         (insert_partition_copy_on_edge, insert_part_to_rtx_on_edge,
15576         insert_value_copy_on_edge, insert_rtx_to_part_on_edge): New functions.
15577         (new_elim_graph): Allocate const_dests member.
15578         (clean_elim_graph): Truncate const_dests member.
15579         (delete_elim_graph): Free const_dests member.
15580         (elim_graph_size): Adapt to new type of nodes member.
15581         (elim_graph_add_node): Likewise.
15582         (eliminate_name): Likewise.
15583         (eliminate_build): Don't take basic block argument, deal only with
15584         partition numbers, not variables.
15585         (get_temp_reg): New static helper.
15586         (elim_create): Use it, deal with RTL temporaries instead of trees.
15587         (eliminate_phi): Adjust all calls to new signature.
15588         (assign_vars, replace_use_variable, replace_def_variable): Remove.
15589         (rewrite_trees): Only do checking.
15590         (edge_leader, stmt_list, leader_has_match, leader_match): Remove.
15591         (same_stmt_list_p, identical_copies_p, identical_stmt_lists_p,
15592         init_analyze_edges_for_bb, fini_analyze_edges_for_bb,
15593         contains_tree_r, MAX_STMTS_IN_LATCH,
15594         process_single_block_loop_latch, analyze_edges_for_bb,
15595         perform_edge_inserts): Remove.
15596         (expand_phi_nodes): New global function.
15597         (remove_ssa_form): Take ssaexpand parameter.  Don't call removed
15598         functions, initialize new parameter, remember partitions having a
15599         default def.
15600         (finish_out_of_ssa): New global function.
15601         (rewrite_out_of_ssa): Make global.  Adjust call to remove_ssa_form,
15602         don't reset in_ssa_p here, don't disable TER when mudflap.
15603         (pass_del_ssa): Remove.
15604         * tree-flow.h (struct var_ann_d): Remove out_of_ssa_tag and
15605         partition members.
15606         (execute_free_datastructures): Declare.
15607         * Makefile.in (SSAEXPAND_H): New variable.
15608         (tree-outof-ssa.o, expr.o, cfgexpand.o): Depend on SSAEXPAND_H.
15609         * basic-block.h (commit_one_edge_insertion): Declare.
15610         * passes.c (init_optimization_passes): Move pass_nrv and
15611         pass_mudflap2 before pass_cleanup_cfg_post_optimizing, remove
15612         pass_del_ssa, pass_free_datastructures, pass_free_cfg_annotations.
15613         * cfgrtl.c (commit_one_edge_insertion): Make global, don't declare.
15614         (redirect_branch_edge): Deal with super block when expanding, split
15615         out jump patching itself into ...
15616         (patch_jump_insn): ... here, new static helper.
15618 2009-04-26  Michael Matz  <matz@suse.de>
15620         * tree-ssa-copyrename.c (rename_ssa_copies): Don't iterate
15621         beyond num_ssa_names.
15622         * tree-ssa-ter.c (free_temp_expr_table): Likewise.
15623         * tree-ssa-coalesce.c (create_outofssa_var_map): Likewise.
15625 2009-04-26  Jakub Jelinek  <jakub@redhat.com>
15627         PR inline-asm/39543
15628         * fwprop.c (forward_propagate_asm): New function.
15629         (forward_propagate_and_simplify): Propagate also into __asm, if it
15630         doesn't increase the number of referenced registers.
15632         PR c/39889
15633         * stmt.c (warn_if_unused_value): Look through NON_LVALUE_EXPR.
15635 2009-04-26  Jakub Jelinek  <jakub@redhat.com>
15637         * tree-nested.c (get_nonlocal_vla_type): If not optimizing, call
15638         note_nonlocal_vla_type for nonlocal VLAs.
15639         (note_nonlocal_vla_type, note_nonlocal_block_vlas,
15640         contains_remapped_vars, remap_vla_decls): New functions.
15641         (convert_nonlocal_reference_stmt): If not optimizing, call
15642         note_nonlocal_block_vlas on GIMPLE_BIND block vars.
15643         (nesting_copy_decl): Return {VAR,PARM,RESULT}_DECL unmodified
15644         if it wasn't found in var_map.
15645         (finalize_nesting_tree_1): Call remap_vla_decls.  If outermost
15646         GIMPLE_BIND doesn't have gimple_bind_block, chain debug_var_chain
15647         to BLOCK_VARS (DECL_INITIAL (root->context)) instead of calling
15648         declare_vars.
15649         * gimplify.c (nonlocal_vlas): New variable.
15650         (gimplify_var_or_parm_decl): Add debug VAR_DECLs for non-local
15651         referenced VLAs.
15652         (gimplify_body): Create and destroy nonlocal_vlas.
15654         * dwarf2out.c (loc_descr_plus_const): New function.
15655         (build_cfa_aligned_loc, tls_mem_loc_descriptor,
15656         mem_loc_descriptor, loc_descriptor_from_tree_1,
15657         descr_info_loc, gen_variable_die): Use it.
15659         * tree.h (DECL_BY_REFERENCE): Note that it is also valid for
15660         !TREE_STATIC VAR_DECLs.
15661         * dwarf2out.c (loc_by_reference, gen_decl_die): Handle
15662         DECL_BY_REFERENCE on !TREE_STATIC VAR_DECLs.
15663         (gen_variable_die): Likewise.  Don't look at TREE_PRIVATE if
15664         DECL_BY_REFERENCE is valid.
15665         * dbxout.c (DECL_ACCESSIBILITY_CHAR): Don't look at TREE_PRIVATE
15666         for PARM_DECLs, RESULT_DECLs or !TREE_STATIC VAR_DECLs.
15667         * tree-nested.c (get_nonlocal_debug_decl, get_local_debug_decl):
15668         Copy DECL_BY_REFERENCE.
15669         (struct nesting_copy_body_data): New type.
15670         (nesting_copy_decl): New function.
15671         (finalize_nesting_tree_1): Remap types of debug_var_chain variables,
15672         if they have variable length.
15674 2009-04-26  Michael Matz  <matz@suse.de>
15676         * tree-sra.c (sra_build_assignment): Don't use into_ssa mode,
15677         mark new temporaries for renaming.
15679 2009-04-26  Joseph Myers  <joseph@codesourcery.com>
15681         PR c/39581
15682         * c-decl.c (global_bindings_p): Return negative value.
15683         (c_variable_size): New.  Based on variable_size from
15684         stor-layout.c.
15685         (grokdeclarator): Call c_variable_size not variable_size.
15687 2009-04-26  Uros Bizjak  <ubizjak@gmail.com>
15689         * config/i386/i386.c (print_operand) ['z']: Fix typo.
15691 2009-04-26  Kai Tietz  <kai.tietz@onevision.com>
15693         * config/i386/mingw-w64.h (STANDARD_INCLUDE_DIR):
15694         Redefine it to just use mingw/include.
15695         (ASM_SPEC): Rules for -m32 and -m64.
15696         (LINK_SPEC): Use Likewise.
15697         (SPEC_32): New define.
15698         (SPEC_64): Likewise.
15699         (SUB_LINK_SPEC): Likewise.
15700         (MULTILIB_DEFAULTS): New define.
15701         * config/i386/t-mingw-w64 (MULTILIB_OPTIONS):
15702         Add multilib options.
15703         (MULTILIB_DIRNAMES): Likewise.
15704         (MULTILIB_OSDIRNAMES): Likewise.
15705         (LIBGCC): Likewise.
15706         (INSTALL_LIBGCC): Likewise.
15708 2009-04-26  Joseph Myers  <joseph@codesourcery.com>
15710         PR c/39556
15711         * c-tree.h (enum c_inline_static_type): New.
15712         (record_inline_static): Declare.
15713         * c-decl.c (struct c_inline_static, c_inline_statics,
15714         record_inline_static, check_inline_statics): New.
15715         (pop_file_scope): Call check_inline_statics.
15716         (start_decl): Call record_inline_static instead of pedwarning
15717         directly for static in inline function.
15718         * c-typeck.c (build_external_ref): Call record_inline_static
15719         instead of pedwarning directly for static referenced in inline
15720         function.
15722 2009-04-26  Steven Bosscher  <steven@gcc.gnu.org>
15724         * df-scan.c (df_insn_rescan): Salvage insn's LUID if the insn is
15725         not new but only being rescanned.
15726         * gcse.c (uid_cuid, max_uid, INSN_CUID, max_cuid, struct reg_set,
15727         reg_set_table, REG_SET_TABLE_SLOP, reg_set_in_block,
15728         alloc_reg_set_mem, free_reg_set_mem, record_one_set,
15729         record_set_info, compute_set, grealloc): Remove.
15730         (recompute_all_luids): New function.
15731         (gcse_main): Don't compute sets, and don't do related memory
15732         allocations/free-ing.  If something changed before the end of the
15733         pass, update LUIDs using recompute_all_luids.
15734         (alloc_gcse_mem): Don't compute LUIDs.  Don't allocate reg_set memory.
15735         (free_gcse_mem): Don't free it either.
15736         (oprs_unchanged_p, load_killed_in_block, record_last_reg_set_info):
15737         Use the df insn LUIDs.
15738         (load_killed_in_block): Likewise.
15739         (compute_hash_table_work): Don't compute reg_set_in_block.
15740         (compute_transp): Use DF_REG_DEF_CHAINs.
15741         (local_cprop_pass): Don't use compute_sets and related functions.
15742         (one_cprop_pass, pre_gcse, one_pre_gcse_pass, one_code_hoisting_pass):
15743         Use get_max_uid() instead of max_cuid.
15744         (insert_insn_end_basic_block, pre_insert_copy_insn,
15745         update_ld_motion_stores): Don't try to
15746         keep reg_set tables up to date.
15747         (pre_insert_copies): Use df insn LUIDs.
15748         (sbitmap pre_redundant_insns): Replace with uses of INSN_DELETED_P.
15749         (reg_set_info): Don't use extra bitmap argument.
15750         (compute_store_table): Don't compute reg_set_in_block.  Use DF scan
15751         information to compute regs_set_in_block.
15752         (free_store_memory, store_motion): Don't nullify reg_set_in_block.
15753         (bypass_jumps): Don't use compute_sets and friends.
15755 2009-04-26  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
15757         PR testsuite/39710
15758         * opts.c (undocumented_msg): Do not leave blank even with
15759         ENABLE_CHECKING.
15761 2009-04-25  Joseph Myers  <joseph@codesourcery.com>
15763         * c-decl.c (build_enumerator): Allow values folding to integer
15764         constants but not integer constant expressions with a pedwarn if
15765         pedantic.
15767 2009-04-25  Joseph Myers  <joseph@codesourcery.com>
15769         PR c/39582
15770         * c-typeck.c (c_expr_sizeof_type): Create a C_MAYBE_CONST_EXPR
15771         with non-null C_MAYBE_CONST_EXPR_PRE if size of a variable-length
15772         type is an integer constant.
15774 2009-04-25  Uros Bizjak  <ubizjak@gmail.com>
15776         PR target/39897
15777         * config/i386/i386.c (print_operand) ['z']: Revert handling of
15778         HImode operands.
15780 2009-04-25  Joseph Myers  <joseph@codesourcery.com>
15782         PR c/39564
15783         * c-decl.c (grokdeclarator): Diagnose declarations of functions
15784         with variably modified return type and no storage class
15785         specifiers, except for the case of nested functions.  Distinguish
15786         extern declarations of functions with variably modified return
15787         types from those of objects with variably modified types.
15789 2009-04-25  Jan Hubicka  <jh@suse.cz>
15791         * tree.c (list_equal_p): New function.
15792         * tree.h (list_equal_p): Declare.
15793         * coretypes.h (edge_def, edge, const_edge, basic_block_def
15794         basic_block_def, basic_block, const_basic_block): New.
15795         * tree-eh.c (make_eh_edge): EH edges are not abnormal.
15796         (redirect_eh_edge): New function.
15797         (make_eh_edge_update_phi): EH edges are not abnormal.
15798         * except.c: Include tree-flow.h.
15799         (list_match): New function.
15800         (eh_region_replaceable_by_p): New function.
15801         (replace_region): New function.
15802         (hash_type_list): New function.
15803         (hash_eh_region): New function.
15804         (eh_regions_equal_p): New function.
15805         (merge_peers): New function.
15806         (remove_unreachable_regions): Verify EH tree when checking;
15807         merge peers.
15808         (copy_eh_region_1): New function.
15809         (copy_eh_region): New function.
15810         (push_reachable_handler): New function.
15811         (build_post_landing_pads, dw2_build_landing_pads): Be ready for
15812         regions without label but with live RESX.
15813         * except.h (redirect_eh_edge_to_label): New.
15814         * tree-flow.h (redirect_eh_edge): New.
15815         * coretypes.h (edge_def, edge, const_edge, basic_block_def
15816         basic_block_def, basic_block, const_basic_block): Remove.
15817         * Makefile.in (except.o): Add dependency on tree-flow.h
15818         * tree-cfg.c (gimple_redirect_edge_and_branch): Handle EH edges.
15819         * basic-block.h (edge, const_edge, basic_block, const_basic_block):
15820         Remove.
15822 2009-04-25  Eric Botcazou  <ebotcazou@adacore.com>
15824         PR bootstrap/39645
15825         * config/sparc/sparc.c (sparc_gimplify_va_arg): Set TREE_ADDRESSABLE
15826         on the destination of memcpy.
15828 2009-04-25  Paolo Bonzini  <bonzini@gnu.org>
15830         * doc/tm.texi (REGNO_OK_FOR_BASE_P, REGNO_MODE_OK_FOR_BASE_P,
15831         REGNO_MODE_OK_FOR_REG_BASE_P, REGNO_MODE_CODE_OK_FOR_BASE_P,
15832         REGNO_OK_FOR_INDEX_P): Mention strict/nonstrict difference.
15834 2009-04-25  Jan Hubicka  <jh@suse.cz>
15836         * tree-eh.c (tree_remove_unreachable_handlers): Handle shared labels.
15837         (tree_empty_eh_handler_p): Allow non-EH predecestors; allow region
15838         to be reached by different label than left.
15839         (update_eh_edges): Update comment; remove edge_to_remove if possible
15840         and return true if suceeded.
15841         (cleanup_empty_eh): Accept sharing map; handle shared regions.
15842         (cleanup_eh): Compute sharing map.
15843         * except.c (remove_eh_handler_and_replace): Add argument if we should
15844         update regions.
15845         (remove_unreachable_regions): Update for label sharing.
15846         (label_to_region_map): Likewise.
15847         (get_next_region_sharing_label): New function.
15848         (remove_eh_handler_and_replace): Add update_catch_try parameter; update
15849         prev_try pointers.
15850         (remove_eh_handler): Update.
15851         (remove_eh_region_and_replace_by_outer_of): New function.
15852         * except.h (struct eh_region): Add next_region_sharing_label.
15853         (remove_eh_region_and_replace_by_outer_of,
15854         get_next_region_sharing_label): Declare.
15855         * tree-cfgcleanup.c (tree_forwarder_block_p): Simplify.
15857 2009-04-25  Jan Hubicka  <jh@suse.cz>
15859         * tree-cfg.c (split_critical_edges): Split also edges where we can't
15860         insert code even if they are not critical.
15862 2009-04-25  Jan Hubicka  <jh@suse.cz>
15864         * tree-cfg.c (gimple_can_merge_blocks_p): EH edges are unmergable.
15865         (gimple_can_remove_branch_p): EH edges won't remove branch by
15866         redirection.
15867         * tree-inline.c (update_ssa_across_abnormal_edges): Do handle
15868         updating of non-abnormal EH edges.
15869         * tree-cfg.c (gimple_can_merge_blocks_p): EH edges are unmergable.
15870         (gimple_can_remove_branch_p): EH edges are unremovable by redirection.
15871         (split_critical_edges): Split also edges where emitting code on them
15872         will lead to splitting later.
15874 2009-04-25  Uros Bizjak  <ubizjak@gmail.com>
15875             H.J. Lu  <hongjiu.lu@intel.com>
15877         PR target/39590
15878         * configure.ac (HAVE_AS_IX86_FILDQ): On x86 targets check whether
15879         the configured assembler supports fildq and fistpq mnemonics.
15880         (HAVE_AS_IX86_FILDS): Rename from HAVE_GAS_FILDS_FISTS.
15881         * configure: Regenerated.
15882         * config.in: Ditto.
15884         * config/i386/i386.c (print_operand): Handle 'Z'.
15885         ['z']: Remove handling of special fild/fist suffixes.
15886         (output_fix_trunc): Use '%Z' to output suffix of fist{,p,tp} insn.
15887         * config/i386/i386.md (*floathi<mode>2_i387): Use '%Z' to output
15888         suffix of fild insn.
15889         (*floatsi<mode>2_vector_mixed): Ditto.
15890         (*float<SSEMODEI24:mode><MODEF:mode>2_mixed_interunit): Ditto.
15891         (*float<SSEMODEI24:mode><MODEF:mode>2_mixed_nointerunit): Ditto.
15892         (*float<SSEMODEI24:mode><X87MODEF:mode>2_i387_with_temp): Ditto.
15893         (*float<SSEMODEI24:mode><X87MODEF:mode>2_i387): Ditto.
15894         * config/i386/gas.h (GAS_MNEMONICS): Remove.
15896 2009-04-25  Ben Elliston  <bje@au.ibm.com>
15898         * genrecog.c (validate_pattern): Do not warn for VOIDmode CALLs as
15899         the source of a set operation.
15901 2009-04-25  Anatoly Sokolov  <aesok@post.ru>
15903         * target.h (struct gcc_target): Add case_values_threshold field.
15904         * target-def.h (TARGET_CASE_VALUES_THRESHOLD): New.
15905         (TARGET_INITIALIZER): Use TARGET_CASE_VALUES_THRESHOLD.
15906         * targhooks.c (default_case_values_threshold): New function.
15907         * targhooks.h (default_case_values_threshold): Declare function.
15908         * stmt.c (expand_case): Use case_values_threshold target hook.
15909         * expr.h (case_values_threshold): Remove declartation.
15910         * expr.c (case_values_threshold): Remove function.
15911         * doc/tm.texi (CASE_VALUES_THRESHOLD): Revise documentation.
15913         * config/avr/avr.h (CASE_VALUES_THRESHOLD): Remove macro.
15914         * config/avr/avr.c (TARGET_CASE_VALUES_THRESHOLD): Define macro.
15915         (avr_case_values_threshold): Declare as static.
15916         * config/avr/avr-protos.h (avr_case_values_threshold): Remove.
15918         * config/avr/mn10300.h (CASE_VALUES_THRESHOLD): Remove macro.
15919         * config/avr/mn10300.c (TARGET_CASE_VALUES_THRESHOLD): Define macro.
15920         (mn10300_case_values_threshold): New function.
15922 2009-04-24  H.J. Lu  <hongjiu.lu@intel.com>
15924         * ira.c (setup_cover_and_important_classes): Add enum cast.
15926 2009-04-24  Vladimir Makarov  <vmakarov@redhat.com>
15928         * genpreds.c (write_enum_constraint_num): Output definition of
15929         CONSTRAINT_NUM_DEFINED_P macro.
15930         * ira.c (setup_cover_and_important_classes): Use
15931         CONSTRAINT_NUM_DEFINED_P instead of CONSTRAINT__LIMIT in #ifdef.
15933 2009-04-24  DJ Delorie  <dj@redhat.com>
15935         * config/sh/sh.h (LIBGCC2_DOUBLE_TYPE_SIZE): Test
15936         __SH2A_SINGLE_ONLY__ also.
15938 2009-04-24  Steve Ellcey  <sje@cup.hp.com>
15940         * config/ia64/ia64.md (movfs_internal): Allow flt constants.
15941         (movdf_internal): Ditto.
15942         * config/ia64/ia64.c (ia64_legitimate_constant_p): Allow
15943         SFmode and DFmode constants.
15944         (ia64_print_operand): Add 'G' format for printing
15945         floating point constants.
15947 2009-04-24  Richard Guenther  <rguenther@suse.de>
15949         * tree-vrp.c (extract_range_from_binary_expr): Handle overflow
15950         from unsigned additions.
15952 2009-04-24  Joseph Myers  <joseph@codesourcery.com>
15954         * c-typeck.c (set_init_index): Allow array designators that are
15955         not integer constant expressions with a pedwarn if pedantic.
15957 2009-04-24  Bernd Schmidt  <bernd.schmidt@analog.com>
15959         * simplify-rtx.c (simplify_binary_operation_1, case AND): Result is
15960         zero if no overlap in nonzero bits between the operands.
15962 2009-04-24  Ian Lance Taylor  <iant@google.com>
15964         * combine.c (record_value_for_reg): Change 0 to VOIDmode, twice.
15965         (record_dead_and_set_regs): Likewise.
15966         * df.h (struct df_mw_hardreg): Change flags field to int.
15967         (struct df_base_ref): Likewise.
15968         (struct df): Change changeable_flags field to int.
15969         * df-scan.c (df_defs_record): Change clobber_flags to int.
15970         * dwarf2.h (enum dwarf_tag): Make lo_user and hi_user values enum
15971         constants rather than #define macros.
15972         (enum dwarf_attribute, enum dwarf_location_atom): Likewise.
15973         (enum dwarf_type, enum dwarf_endianity_encoding): Likewise.
15974         (enum dwarf_calling_convention): Likewise.
15975         (enum dwarf_line_number_x_ops): Likewise.
15976         (enum dwarf_call_frame_info): Likewise.
15977         (enum dwarf_source_language): Likewise.
15978         * dwarf2out.c (int_loc_descriptor): Add cast to enum type.
15979         (add_calling_convention_attribute): Likewise.
15980         * fold-const.c (fold_undefer_overflow_warnings): Add cast to enum type.
15981         (combine_comparisons): Change compcode to int.  Add cast to enum type.
15982         * genrecog.c (maybe_both_true_2): Change c to int.
15983         (write_switch): Likewise.  Add cast to enum type.
15984         * gimplify.c (gimplify_omp_for): Handle return values from
15985         gimplify_expr using MIN rather than bitwise or.
15986         (gimplify_expr): Add cast to enum type.
15987         * ipa-prop.c (update_jump_functions_after_inlining): Change
15988         IPA_BOTTOM to IPA_JF_UNKNOWN.
15989         * ira.c (setup_class_subset_and_memory_move_costs): Change mode to int.
15990         Add casts to enum type.
15991         (setup_cover_and_important_classes): Change cl to int.  Add casts
15992         to enum type.
15993         (setup_class_translate): Change cl and mode to int.
15994         (ira_init_once): Change mode to int.
15995         (free_register_move_costs): Likewise.
15996         (setup_prohibited_mode_move_regs): Add casts to enum type.
15997         * langhooks.c (add_builtin_function_common): Rework assertion that
15998         value fits bitfield.
15999         * mcf.c (add_fixup_edge): Change type parameter to edge_type.
16000         * omega.c (omega_do_elimination): Avoid math on enum types.
16001         * optabs.c (expand_vec_shift_expr): Remove casts to int.
16002         * opts.c (set_debug_level): Change 2 to enum constant.  Use new
16003         int local to handle integral_argment value.
16004         * regmove.c (try_auto_increment): Change PUT_MODE to
16005         PUT_REG_NOTE_KIND.
16006         * reload.c (push_secondary_reload): Add casts to enum type.
16007         (secondary_reload_class, find_valid_class): Likewise.
16008         * reload1.c (emit_input_reload_insns): Likewise.
16009         * rtl.h (NOTE_VAR_LOCATION_STATUS): Likewise.
16010         * sel-sched.c (init_hard_regs_data): Change cur_mode to int.
16011         * sel-sched-ir.c (hash_with_unspec_callback): Change 0 to enum
16012         constant.
16013         * tree.c (build_common_builtin_nodes): Add casts to enum type.
16014         * tree-complex.c (complex_lattice_t): Typedef to int rather than
16015         enum type.
16016         (expand_complex_libcall): Add casts to enum type.
16017         * tree-into-ssa.c (get_ssa_name_ann): Change 0 to enum constant.
16018         * tree-vect-loop.c (vect_model_reduction_cost): Compare reduc_code
16019         with ERROR_MARK, not NUM_TREE_CODES.
16020         (vect_create_epilog_for_reduction): Likewise.
16021         (vectorizable_reduction): Don't initialize epiloc_reduc_code.
16022         When not using it, set it to ERROR_MARK rather than NUM_TREE_CODES.
16023         * tree-vect-patterns.c (vect_pattern_recog_1): Change vec_mode to
16024         enum machine_mode.
16025         * tree-vect-stmts.c (new_stmt_vec_info): Change 0 to
16026         vect_unused_in_loop.  Change 0 to loop_vect.
16027         * tree-vectorizer.c (vect_set_verbosity_level): Add casts to enum type.
16028         * var-tracking.c (get_init_value): Change return type to enum
16029         var_init_status.
16030         * vec.h (DEF_VEC_FUNC_P) [iterate]: Cast 0 to type T.
16031         * config/arm/arm.c (fp_model_for_fpu): Change to array to enum
16032         arm_fp_model.
16033         (arm_override_options): Add casts to enum type.
16034         (arm_emit_tls_decoration): Likewise.
16035         * config/i386/i386.c (ix86_function_specific_restore): Add casts
16036         to enum type.
16037         * config/i386/i386-c.c (ix86_pragma_target_parse): Likewise.
16038         * config/ia64/ia64.c (ia64_expand_compare): Change magic to int.
16039         * config/rs6000/rs6000.c (rs6000_override_options): Add casts to
16040         enum type.
16041         * config/s390/s390.c (code_for_builtin_64): Change to array of
16042         enum insn_code.
16043         (code_for_builtin_31): Likewise.
16044         (s390_expand_builtin): Change code_for_builtin to enum insn_code
16045         const *.
16046         * config/sparc/sparc.c (sparc_override_options): Change value
16047         field in struct code_model to enum cmodel.  In initializer change
16048         0 to NULL and add cast to enum type.
16050         * c-typeck.c (build_modify_expr): Add lhs_origtype parameter.
16051         Change all callers.  Issue a -Wc++-compat warning using
16052         lhs_origtype if necessary.
16053         (convert_for_assignment): Issue -Wc++-compat warnings about
16054         invalid conversions to enum type on assignment.
16055         * c-common.h (build_modify_expr): Update declaration.
16057 2009-04-24  Nick Clifton  <nickc@redhat.com>
16059         * config/iq2000/iq2000.c (function_arg): Handle TImode values.
16060         (function_arg_advance): Likewise.
16061         * config/iq2000/iq2000.md (movsi_internal2): Fix the length of the
16062         5th alternative.
16064 2009-04-24  Andreas Krebbel  <krebbel1@de.ibm.com>
16066         * config/s390/constraints.md ('I', 'J'): Fix condition.
16068 2009-04-24  Diego Novillo  <dnovillo@google.com>
16070         * gengtype-parse.c (parse_error): Add newline after message.
16072 2009-04-24  H.J. Lu  <hongjiu.lu@intel.com>
16074         * config/i386/sse.md (avxmodesuffixs): Removed.
16075         (*avx_pinsr<avxmodesuffixs>): Renamed to ...
16076         (*avx_pinsr<ssevecsize>): This.
16078 2009-04-24  Bernd Schmidt  <bernd.schmidt@analog.com>
16080         * loop-iv.c (replace_single_def_regs): Look for REG_EQUAL notes;
16081         follow chains of regs with a single definition, and allow expressions
16082         that are function_invariant_p.
16083         (simple_rhs_p): Allow expressions that are function_invariant_p.
16085 2009-04-24  Paolo Bonzini  <bonzini@gnu.org>
16087         PR middle-end/39867
16088         * fold-const.c (fold_cond_expr_with_comparison): When folding
16089         > and >= to MAX, make sure the MAX uses the same type as the
16090         comparison's operands.
16092 2009-04-24  Nick Clifton  <nickc@redhat.com>
16094         * config/frv/frv.c (frv_frame_access): Do not use reg+reg
16095         addressing for DImode accesses.
16096         (frv_print_operand_address): Handle PLUS case.
16097         * config/frv/frv.h (FIXED_REGISTERS): Mark link register as fixed.
16099 2009-04-24  Jakub Jelinek  <jakub@redhat.com>
16101         PR rtl-optimization/39794
16102         * alias.c (canon_true_dependence): Add x_addr argument.
16103         * rtl.h (canon_true_dependence): Adjust prototype.
16104         * cse.c (check_dependence): Adjust canon_true_dependence callers.
16105         * cselib.c (cselib_invalidate_mem): Likewise.
16106         * gcse.c (compute_transp): Likewise.
16107         * dse.c (scan_reads_nospill): Likewise.
16108         (record_store, check_mem_read_rtx): Likewise.  For non-const-or-frame
16109         addresses pass base->val_rtx as mem_addr, for const-or-frame addresses
16110         canon_base_addr of the group, plus optional offset.
16111         (struct group_info): Rename canon_base_mem to
16112         canon_base_addr.
16113         (get_group_info): Set canon_base_addr to canon_rtx of base, not
16114         canon_rtx of base_mem.
16116 2009-04-23  Paolo Bonzini  <bonzini@gnu.org>
16118         * config/sh/sh.c (sh_expand_prologue, sh_expand_epilogue):
16119         Use memory_address_p instead of GO_IF_LEGITIMATE_ADDRESS.
16121 2009-04-23  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
16123         * config/spu/spu-builtins.h: Delete file.
16125         * config/spu/spu.h (enum spu_builtin_type): Move here from
16126         spu-builtins.h.
16127         (struct spu_builtin_description): Likewise.  Add GTY marker.
16128         Do not use enum spu_function_code or enum insn_code.
16129         (spu_builtins): Add extern declaration.
16131         * config/spu/spu.c: Do not include "spu-builtins.h".
16132         (enum spu_function_code, enum spu_builtin_type_index,
16133         V16QI_type_node, V8HI_type_node, V4SI_type_node, V2DI_type_node,
16134         V4SF_type_node, V2DF_type_node, unsigned_V16QI_type_node,
16135         unsigned_V8HI_type_node, unsigned_V4SI_type_node,
16136         unsigned_V2DI_type_node): Move here from spu-builtins.h.
16137         (spu_builtin_types): Make static.  Add GTY marker.
16138         (spu_builtins): Add extern declaration with GTY marker.
16139         Include "gt-spu.h".
16141         * config/spu/spu-c.c: Do not include "spu-builtins.h".
16142         (spu_resolve_overloaded_builtin): Do not use spu_function_code.
16143         Check programmatically whether all parameters are scalar.
16145         * config/spu/t-spu-elf (spu.o, spu-c.o): Update dependencies.
16147 2009-04-23  Eric Botcazou  <ebotcazou@adacore.com>
16149         * gimplify.c (gimplify_modify_expr_rhs) <VAR_DECL>: Do not do a direct
16150         assignment from the constructor either if the target is volatile.
16152 2009-04-23  Daniel Jacobowitz  <dan@codesourcery.com>
16154         * config/arm/arm.md (insv): Do not share operands[0].
16156 2009-04-23  Nathan Sidwell  <nathan@codesourcery.com>
16158         * config/vxlib-tls.c (active_tls_threads): Delete.
16159         (delete_hook_installed): New.
16160         (tls_delete_hook): Don't delete the delete hook.
16161         (tls_destructor): Delete it here.
16162         (__gthread_set_specific): Adjust installing the delete hook.
16163         (tls_delete_hook): Use __gthread_enter_tsd_dtor_context and
16164         __gthread_leave_tsd_dtor_context.
16166 2009-04-23  Rafael Avila de Espindola  <espindola@google.com>
16168         * c-format.c (gcc_tdiag_char_table): Add support for %E.
16170 2009-04-23  Uros Bizjak  <ubizjak@gmail.com>
16172         * config/alpha/alpha.c (alpha_legitimize_reload_address): Add cast to
16173         enum type.
16174         (alpha_rtx_costs): Ditto.
16175         (emit_unlikely_jump): Use add_reg_note.
16176         (emit_frame_store_1): Ditto.
16177         (alpha_expand_prologue): Ditto.
16178         (alpha_expand_builtin): Change 0 to EXPAND_NORMAL in function call.
16179         * config/alpha/alpha.c (Unicos/Mk address splitter): Use add_reg_note.
16181 2009-04-23  Nick Clifton  <nickc@redhat.com>
16183         * config/v850/v850.md (epilogue): Remove suppressed code.
16184         (return): Rename to return_simple and remove test of frame size.
16185         * config/v850/v850.c (expand_epilogue): Rename call to gen_return
16186         to gen_return_simple.
16188 2009-04-22  Jing Yu  <jingyu@google.com>
16190         PR testsuite/39781
16191         * config/arm/arm.h: Define HANDLE_PRAGMA_PACK_PUSH_POP.
16193 2009-04-22  Andrew Pinski  <andrew_pinski@playstation.sony.com>
16195         PR C/31499
16196         * c-typeck.c (process_init_element): Treat VECTOR_TYPE like ARRAY_TYPE
16197         and RECORD_TYPE/UNION_TYPE.  When outputing the actual element and the
16198         value is a VECTOR_CST, the element type is the element type of the
16199         vector.
16201 2009-04-22  DJ Delorie  <dj@redhat.com>
16203         * config/m32c/m32c.h: Update GTY annotations to new syntax.
16205 2009-04-22  Jakub Jelinek  <jakub@redhat.com>
16207         * alias.c (find_base_term): Move around LO_SUM case, so that
16208         CONST falls through into PLUS/MINUS handling.
16210         PR c/39855
16211         * fold-const.c (fold_binary) <case LSHIFT_EXPR>: When optimizing
16212         into 0, use omit_one_operand.
16214 2009-04-23  Ben Elliston  <bje@au.ibm.com>
16216         * config/rs6000/linux-unwind.h (get_regs): Remove type
16217         puns. Change the type of `pc' to an array of unsigned ints and
16218         update all users.  Constify frame24.
16220 2009-04-22  DJ Delorie  <dj@redhat.com>
16222         * config/m32c/m32c.c (m32c_special_page_vector_p): Move
16223         declarations before code.
16224         (current_function_special_page_vector): Likewise.
16225         (m32c_expand_insv): Silence a warning.
16227 2009-04-21  Taras Glek  <tglek@mozilla.com>
16229         * alias.c: Update GTY annotations to new syntax.
16230         * basic-block.h: Likewise.
16231         * bitmap.h: Likewise.
16232         * c-common.h: Likewise.
16233         * c-decl.c: Likewise.
16234         * c-parser.c: Likewise.
16235         * c-pragma.c: Likewise.
16236         * c-tree.h: Likewise.
16237         * cfgloop.h: Likewise.
16238         * cgraph.h: Likewise.
16239         * config/alpha/alpha.c: Likewise.
16240         * config/arm/arm.h: Likewise.
16241         * config/avr/avr.h: Likewise.
16242         * config/bfin/bfin.c: Likewise.
16243         * config/cris/cris.c: Likewise.
16244         * config/darwin.c: Likewise.
16245         * config/frv/frv.c: Likewise.
16246         * config/i386/i386.c: Likewise.
16247         * config/i386/i386.h: Likewise.
16248         * config/i386/winnt.c: Likewise.
16249         * config/ia64/ia64.h: Likewise.
16250         * config/iq2000/iq2000.c: Likewise.
16251         * config/mips/mips.c: Likewise.
16252         * config/mmix/mmix.h: Likewise.
16253         * config/pa/pa.c: Likewise.
16254         * config/pa/pa.h: Likewise.
16255         * config/rs6000/rs6000.c: Likewise.
16256         * config/s390/s390.c: Likewise.
16257         * config/sparc/sparc.c: Likewise.
16258         * config/xtensa/xtensa.c: Likewise.
16259         * cselib.h: Likewise.
16260         * dbxout.c: Likewise.
16261         * dwarf2out.c: Likewise.
16262         * except.c: Likewise.
16263         * except.h: Likewise.
16264         * fixed-value.h: Likewise.
16265         * function.c: Likewise.
16266         * function.h: Likewise.
16267         * gimple.h: Likewise.
16268         * integrate.c: Likewise.
16269         * optabs.c: Likewise.
16270         * output.h: Likewise.
16271         * real.h: Likewise.
16272         * rtl.h: Likewise.
16273         * stringpool.c: Likewise.
16274         * tree-data-ref.c: Likewise.
16275         * tree-flow.h: Likewise.
16276         * tree-scalar-evolution.c: Likewise.
16277         * tree-ssa-address.c: Likewise.
16278         * tree-ssa-alias.h: Likewise.
16279         * tree-ssa-operands.h: Likewise.
16280         * tree.c: Likewise.
16281         * tree.h: Likewise.
16282         * varasm.c: Likewise.
16283         * varray.h: Likewise.
16284         * vec.h: Likewise.
16285         * coretypes.h: Do not define GTY macro if it is already defined.
16286         * doc/gty.texi: Update GTY documentation to new syntax.
16287         * gengtype-lex.l: Enforce attribute-like syntax for GTY
16288         annotations on structs.
16289         * gengtype-parse.c: Likewise.
16291 2009-04-22  Mark Heffernan  <meheff@google.com>
16293         * gcc.c (LINK_COMMAND_SPEC): Link with gcov with -fprofile-generate=.
16295 2009-04-22  Kazu Hirata  <kazu@codesourcery.com>
16297         * config/arm/arm.c (arm_rtx_costs_1): Use power_of_two_operand
16298         where appropriate.
16300 2009-04-22  Kazu Hirata  <kazu@codesourcery.com>
16302         * config/arm/arm.c (arm_size_rtx_costs): Treat a PLUS with a shift
16303         the same as a PLUS without a shift.  Increase the cost of a
16304         CONST_INT in MULT.
16306 2009-04-22  Manuel Lopez-Ibanez  <manu@gcc.gnu.org>
16308         * Makefile.in: Update dependencies.
16309         * errors.c (warning): Remove unused parameter 'opt'. Returns 'void'.
16310         * errors.h: Remove bogus comment about compatibility.
16311         (warning): Update declaration.
16312         * genautomata.c: Update all calls to warning.
16313         * gimple.c: Do not include errors.h. Include toplev.h.
16314         * tree-ssa-structalias.c: Do not include errors.h.
16315         * omega.c: Likewise.
16316         * tree-ssa-reassoc.c: Likewise.
16317         * config/spu/spu-c.c: Likewise.
16318         * config/spu/t-spu-elf: Update dependencies.
16320 2009-04-22  Richard Guenther  <rguenther@suse.de>
16322         PR tree-optimization/39824
16323         * tree-ssa-ccp.c (fold_const_aggregate_ref): For INDIRECT_REFs
16324         make sure the types are compatible.
16326 2009-04-22  Manuel Lopez-Ibanez  <manu@gcc.gnu.org>
16328         PR c++/14875
16329         * c-common.c (c_parse_error): Take a token_flags parameter.
16330         Use token_type for the token type instead.
16331         Pass token_flags to cpp_type2name.
16332         * c-common.h (c_parse_error): Update declaration.
16333         * c-parser.c (c_parser_error): Pass 0 as token flags.
16335 2009-04-22  Andrey Belevantsev  <abel@ispras.ru>
16337         PR rtl-optimization/39580
16338         * sel-sched-ir.c (insert_in_history_vect): Remove incorrect gcc_assert.
16340 2009-04-22  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
16342         * function.c (expand_function_end): Do not emit a jump to the "naked"
16343         return label for fall-through returns.
16344         * except.c (sjlj_emit_function_exit): Always place the call to the
16345         unregister function at the location installed by expand_function_end.
16347 2009-04-22  Richard Guenther  <rguenther@suse.de>
16349         PR tree-optimization/39845
16350         * tree-switch-conversion.c (build_arrays): Add new referenced vars.
16351         (gen_inbound_check): Likewise.
16353 2009-04-22  Nathan Sidwell  <nathan@codesourcery.com>
16355         * gthr-vxworks.h (struct __gthread_once_t): Add alignment and
16356         padding for PPC.
16357         (__GTHREAD_ONCE_INIT): Adjust ppc initializer.
16358         * config/vxlib.c (__gthread_once): Add race guard for PPC.
16360 2009-04-22  Paolo Bonzini  <bonzini@gnu.org>
16362         * config/sh/sh.c (shift_insns_rtx, shiftcosts, gen_shifty_op,
16363         sh_dynamicalize_shift_p, shl_and_scr_length): Truncate
16364         shift counts to avoid out-of-bounds array accesses.
16366 2009-04-22  Paolo Bonzini  <bonzini@gnu.org>
16368         * config/sparc/sparc.h (POINTER_SIZE): Fix comment.
16369         (Pmode): Move above.
16371 2009-04-22  Uros Bizjak  <ubizjak@gmail.com>
16373         * config/alpha/alpha.c: Use REG_P, MEM_P, CONST_INT_P, JUMP_P,
16374         NONJUMP_INSN_P, CALL_P, LABEL_P and NOTE_P predicates instead of
16375         GET_CODE macro.  Use IN_RANGE macro where appropriate.
16376         * config/alpha/alpha.h: Ditto.
16377         * config/alpha/alpha.md: Ditto.
16378         * config/alpha/constraints.md: Ditto.
16379         * config/alpha/predicates.md: Ditto.
16381 2009-04-22  Paolo Bonzini  <bonzini@gnu.org>
16383         * defaults.h (GO_IF_MODE_DEPENDENT_ADDRESS): Provide empty default.
16384         * config/frv/frv.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
16385         * config/s390/s390.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
16386         * config/m32c/m32c.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
16387         * config/spu/spu.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
16388         * config/i386/i386.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
16389         * config/sh/sh.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
16390         * config/pdp11/pdp11.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
16391         * config/avr/avr.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
16392         * config/crx/crx.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
16393         * config/fr30/fr30.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
16394         * config/m68hc11/m68hc11.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
16395         * config/cris/cris.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
16396         * config/iq2000/iq2000.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
16397         * config/mn10300/mn10300.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
16398         * config/ia64/ia64.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
16399         * config/m68k/m68k.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
16400         * config/picochip/picochip.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
16401         * config/arc/arc.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
16402         * config/mcore/mcore.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
16403         * config/score/score.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
16404         * config/arm/arm.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
16405         * config/pa/pa.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
16406         * config/mips/mips.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
16407         * config/v850/v850.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
16408         * config/mmix/mmix.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
16409         * config/bfin/bfin.h (GO_IF_MODE_DEPENDENT_ADDRESS): Delete.
16411 2009-04-22  Laurynas Biveinis  <laurynas.biveinis@gmail.com>
16413         * cfghooks.c (tidy_fallthru_edges): Remove find_basic_blocks
16414         references from comments.
16415         * cfgbuild.c: (count_basic_blocks): Delete.
16416         (find_basic_blocks_1): Delete.
16417         (find_basic_blocks): Delete.
16418         * except.c (finish_eh_generation): Make static.  Move comment from
16419         except.h here.  Remove find_basic_blocks references from comments.
16420         * except.h (finish_eh_generation): Delete.
16421         * basic-block.h (find_basic_blocks): Delete.
16422         * config/sh/sh.c (sh_output_mi_thunk): Delete a "#if 0" block.
16424 2009-04-22  Dave Korn  <dave.korn.cygwin@gmail.com>
16426         * sdbout.c (sdbout_symbol):  Pass VOIDmode to eliminate_regs.
16427         (sdbout_parms):  Likewise.
16429 2009-04-21  Kaz Kojima  <kkojima@gcc.gnu.org>
16431         * config/sh/sh.c (prepare_cbranch_operands): Use
16432         LAST_AND_UNUSED_RTX_CODE instead of CODE_FOR_nothing.
16433         (expand_cbranchdi4): Likewise.
16434         (from_compare): Add cast to enum type.
16435         (expand_cbranchsi4): Use add_reg_note.
16436         (output_stack_adjust, push, pop, sh_expand_prologue): Likewise.
16437         (sh_insn_length_adjustment): Use sh_cpu_attr instead of sh_cpu.
16438         (sh_initialize_trampoline): Change 0 to LCT_NORMAL in function call.
16439         (sh_expand_builtin): Change 0 to EXPAND_NORMAL in function call.
16440         * config/sh/sh.md (cbranchsi4): Use LAST_AND_UNUSED_RTX_CODE
16441         instead of CODE_FOR_nothing.
16442         (cbranchdi4): Likewise.  Fix the order of arguments for
16443         gen_rtx_fmt_ee.
16444         (push_fpscr): Use add_reg_note.
16445         (pop_fpscr, movdf_i4+1, reload_outdf__RnFRm+3, reload_outdf__RnFRm+4,
16446         reload_outdf__RnFRm+5, fpu_switch+1, fpu_switch+2): Likewise.
16448 2009-04-21  Joseph Myers  <joseph@codesourcery.com>
16450         * ABOUT-GCC-NLS, ChangeLog, ChangeLog-1997, ChangeLog-1998,
16451         ChangeLog-1999, ChangeLog-2000, ChangeLog-2001, ChangeLog-2002,
16452         ChangeLog-2003, ChangeLog-2004, ChangeLog-2005, ChangeLog-2006,
16453         ChangeLog-2007, ChangeLog-2008, ChangeLog.dataflow, ChangeLog.lib,
16454         ChangeLog.ptr, ChangeLog.tree-ssa, ChangeLog.tuples, FSFChangeLog,
16455         FSFChangeLog.10, FSFChangeLog.11, LANGUAGES, ONEWS, acinclude.m4,
16456         config/alpha/gnu.h, config/alpha/libgcc-alpha-ldbl.ver,
16457         config/alpha/t-osf4, config/alpha/t-vms, config/alpha/va_list.h,
16458         config/alpha/x-vms, config/arc/t-arc,
16459         config/arm/README-interworking, config/arm/arm-c.c,
16460         config/arm/gentune.sh, config/arm/libgcc-bpabi.ver,
16461         config/arm/t-arm, config/arm/t-arm-elf, config/arm/t-arm-softfp,
16462         config/arm/t-bpabi, config/arm/t-linux, config/arm/t-linux-eabi,
16463         config/arm/t-netbsd, config/arm/t-pe, config/arm/t-strongarm-elf,
16464         config/arm/t-symbian, config/arm/t-vxworks, config/arm/t-wince-pe,
16465         config/avr/t-avr, config/bfin/elf.h, config/bfin/libgcc-bfin.ver,
16466         config/bfin/linux.h, config/bfin/t-bfin, config/bfin/t-bfin-elf,
16467         config/bfin/t-bfin-linux, config/bfin/t-bfin-uclinux,
16468         config/bfin/uclinux.h, config/cris/mulsi3.asm, config/cris/t-cris,
16469         config/cris/t-elfmulti, config/crx/t-crx,
16470         config/darwin-ppc-ldouble-patch.def, config/darwin-sections.def,
16471         config/divmod.c, config/fr30/t-fr30, config/frv/libgcc-frv.ver,
16472         config/frv/t-frv, config/frv/t-linux, config/h8300/genmova.sh,
16473         config/h8300/t-h8300, config/i386/athlon.md,
16474         config/i386/darwin-libgcc.10.4.ver,
16475         config/i386/darwin-libgcc.10.5.ver, config/i386/libgcc-glibc.ver,
16476         config/i386/mach.h, config/i386/netbsd.h, config/i386/t-crtpc,
16477         config/i386/t-cygming, config/i386/t-cygwin, config/i386/t-i386,
16478         config/i386/t-linux64, config/i386/t-nwld,
16479         config/i386/t-rtems-i386, config/i386/t-sol2-10,
16480         config/i386/x-mingw32, config/ia64/div.md, config/ia64/elf.h,
16481         config/ia64/ia64.opt, config/ia64/libgcc-glibc.ver,
16482         config/ia64/libgcc-ia64.ver, config/ia64/linux.h,
16483         config/ia64/sysv4.h, config/ia64/t-hpux, config/ia64/t-ia64,
16484         config/iq2000/abi, config/iq2000/lib2extra-funcs.c,
16485         config/iq2000/t-iq2000, config/libgcc-glibc.ver,
16486         config/m32r/libgcc-glibc.ver, config/m32r/t-linux,
16487         config/m32r/t-m32r, config/m68hc11/t-m68hc11,
16488         config/m68k/t-floatlib, config/m68k/t-linux, config/m68k/t-mlibs,
16489         config/m68k/t-uclinux, config/mcore/t-mcore,
16490         config/mcore/t-mcore-pe, config/mips/20kc.md, config/mips/4130.md,
16491         config/mips/5400.md, config/mips/5500.md, config/mips/crti.asm,
16492         config/mips/crtn.asm, config/mips/irix-crti.asm,
16493         config/mips/irix-crtn.asm, config/mips/libgcc-mips16.ver,
16494         config/mips/mips-dsp.md, config/mips/mips-dspr2.md,
16495         config/mips/mips-fixed.md, config/mips/sb1.md,
16496         config/mips/sr71k.md, config/mips/t-elf, config/mips/t-gofast,
16497         config/mips/t-iris6, config/mips/t-isa3264,
16498         config/mips/t-libgcc-mips16, config/mips/t-linux64,
16499         config/mips/t-mips, config/mips/t-r3900, config/mips/t-rtems,
16500         config/mips/t-sb1, config/mips/t-sde, config/mips/t-sdemtk,
16501         config/mips/t-slibgcc-irix, config/mips/t-sr71k, config/mips/t-st,
16502         config/mips/t-vr, config/mips/t-vxworks, config/mmix/t-mmix,
16503         config/mn10300/t-linux, config/mn10300/t-mn10300,
16504         config/pa/pa32-regs.h, config/pa/t-hpux-shlib, config/pa/t-linux,
16505         config/pa/t-linux64, config/pa/t-pa64, config/pdp11/t-pdp11,
16506         config/picochip/libgccExtras/clzsi2.asm,
16507         config/picochip/t-picochip, config/rs6000/darwin-ldouble-format,
16508         config/rs6000/darwin-libgcc.10.4.ver,
16509         config/rs6000/darwin-libgcc.10.5.ver,
16510         config/rs6000/libgcc-ppc-glibc.ver, config/rs6000/ppc-asm.h,
16511         config/rs6000/t-aix43, config/rs6000/t-aix52,
16512         config/rs6000/t-darwin, config/rs6000/t-fprules,
16513         config/rs6000/t-fprules-fpbit, config/rs6000/t-linux64,
16514         config/rs6000/t-lynx, config/rs6000/t-netbsd,
16515         config/rs6000/t-ppccomm, config/rs6000/t-ppcendian,
16516         config/rs6000/t-ppcgas, config/rs6000/t-rs6000,
16517         config/rs6000/t-rtems, config/rs6000/t-spe,
16518         config/rs6000/t-vxworks, config/s390/libgcc-glibc.ver,
16519         config/score/t-score-elf, config/sh/divcost-analysis,
16520         config/sh/libgcc-glibc.ver, config/sh/t-netbsd, config/sh/t-sh,
16521         config/sh/t-sh64, config/sh/t-superh, config/sh/t-symbian,
16522         config/sparc/libgcc-sparc-glibc.ver, config/sparc/sol2-bi.h,
16523         config/sparc/sol2-gas.h, config/sparc/sol2-gld-bi.h,
16524         config/sparc/t-elf, config/sparc/t-linux64, config/sparc/t-sol2,
16525         config/stormy16/stormy-abi, config/stormy16/t-stormy16,
16526         config/t-darwin, config/t-libunwind, config/t-libunwind-elf,
16527         config/t-linux, config/t-lynx, config/t-slibgcc-elf-ver,
16528         config/t-slibgcc-sld, config/t-sol2, config/t-vxworks,
16529         config/udivmod.c, config/udivmodsi4.c, config/v850/t-v850,
16530         config/v850/t-v850e, config/xtensa/t-xtensa, diagnostic.def,
16531         gdbinit.in, glimits.h, gstab.h, gsyms.h, java/ChangeLog,
16532         java/ChangeLog.ptr, java/ChangeLog.tree-ssa, libgcc-std.ver,
16533         limitx.h, version.c, xcoff.h: Add copyright and license notices.
16534         * config/h8300/genmova.sh: Include copyright and license notices
16535         in generated output.
16536         * config/h8300/mova.md: Regenerate.
16537         * doc/install.texi2html: Include word "Copyright" in copyright
16538         notice and use name "Free Software Foundation, Inc.".
16539         * ChangeLog, ChangeLog-2000, ChangeLog-2001, ChangeLog-2002,
16540         ChangeLog-2003, ChangeLog-2004, ChangeLog-2005, ChangeLog-2006,
16541         ChangeLog-2007, ChangeLog-2008: Correct dates.
16543 2009-04-21  Eric Botcazou  <ebotcazou@adacore.com>
16545         * c-common.c (c_common_truthvalue_conversion): Use LOCATION to build
16546         NE_EXPR operations as well.
16547         * c-parser.c (c_parser_condition): Do not set location information on
16548         the condition.
16549         (c_parser_conditional_expression): Likewise.
16550         (c_parser_binary_expression): Set location information on operators.
16551         * c-typeck.c (build_unary_op) <TRUTH_NOT_EXPR>: Reset the location if
16552         TRUTH_NOT_EXPR has been folded.
16553         * fold-const.c (fold_truth_not_expr): Copy location information from
16554         the incoming expression to the outgoing one.
16555         * gimplify.c (shortcut_cond_r): Add locus parameter.  Pass it to
16556         recursive calls on the LHS of the operator but pass that of the
16557         operator to recursive calls on the RHS of the operator.  Set it
16558         on the COND_EXPR.
16559         (shortcut_cond_expr): Set the locus of the operator on the second
16560         COND_EXPR and that of the expression on the first in degenerate cases.
16561         Pass the locus of the expression to calls to shortcut_cond_r.
16562         Set the locus of the 'then' block on the associated jump, if any.
16563         (gimplify_boolean_expr): Add locus parameter.  Set it on the COND_EXPR.
16564         (gimplify_expr) <TRUTH_ANDIF_EXPR>: Pass the locus of the outer
16565         expression to call to gimplify_boolean_expr.
16567 2009-04-21  Kai Tietz  <kai.tietz@onevision.com>
16569         * config.gcc: Add additional configuration for
16570         i686-w64-mingw* and x86_64-w64-mingw* triplet.
16571         * config/i386/mingw-w64.h: New mingw-w64 specific header.
16572         (CPP_SPEC): Redefine for allowing -municode option.
16573         (STARTFILE_SPEC): Likewise.
16574         * config/i386/t-mingw-w64: New.
16575         * config/i386/mingw-w64.opt: New.
16576         (municode): Add new target option.
16577         * doc/invoke.texi (municode): Add documentation for new option.
16579 2009-04-21  Ian Lance Taylor  <iant@google.com>
16581         * config/rs6000/rs6000-c.c (altivec_resolve_overloaded_builtin):
16582         Correct test for number of arguments.
16583         * config/spu/spu-c.c (spu_resolve_overloaded_builtin): Likewise.
16585 2009-04-21  Andreas Schwab  <schwab@linux-m68k.org>
16587         * config/m68k/linux.h (FINALIZE_TRAMPOLINE): Use enum for second
16588         argument of emit_library_call.
16590 2009-04-21  Richard Guenther  <rguenther@suse.de>
16592         PR middle-end/39829
16593         * gimple.c (walk_stmt_load_store_addr_ops): Catch addresses
16594         inside VIEW_CONVERT_EXPRs.
16596 2009-04-21  Martin Jambor  <mjambor@suse.cz>
16598         * tree-switch-conversion.c (build_constructors): Split a long line.
16599         (constructor_contains_same_values_p): New function.
16600         (build_one_array): Create assigns of constants if possible, do not
16601         call mark_sym_for_renaming, call update_stmt.
16602         (build_arrays): Call make_ssa_name (create_tmp_var ()) instead of
16603         make_rename_temp.  Do not call mark_symbols_for_renaming, call
16604         update_stmt.
16605         (gen_def_assigns): Do not call mark_symbols_for_renaming or
16606         find_new_referenced_vars, call update_stmt.
16607         (gen_inbound_check): Use create_tmp_var and create ssa names manually
16608         instead of calling make_rename_temp.  Do not call
16609         find_new_referenced_vars or mark_symbols_for_renaming, call
16610         update_stmt.
16612 2009-04-21  Richard Guenther  <rguenther@suse.de>
16614         PR tree-optimization/39827
16615         * tree-ssa-phiprop.c (propagate_with_phi): Check SSA_NAME is in range.
16616         (tree_ssa_phiprop): Pass the correct array size.
16618 2009-04-21  Uros Bizjak  <ubizjak@gmail.com>
16620         * config/alpha/alpha.md (tune): Add cast to enum attr_tune.
16622 2009-04-21  Manuel López-Ibáñez  <manu@gcc.gnu.org>
16624         PR 16202
16625         * c-typeck.c (lvalue_p): Move declaration ...
16626         * c-common.h (lvalue_p): ... to here.
16627         * c-common.c (candidate_equal_p): New.
16628         (add_tlist): Use it.
16629         (merge_tlist): Use it.
16630         (warn_for_collisions_1): Likewise.
16631         (warning_candidate_p): Accept more candidates.
16632         (verify_tree): A warning candidate can be an expression. Use
16633         candidate_equal_p.
16635 2009-04-21  Ben Elliston  <bje@au.ibm.com>
16637         PR target/5267
16638         * doc/invoke.texi (RS/6000 and PowerPC Options): Add documentation
16639         for -mcall-eabi, -mcall-aixdesc, -mcall-freebsd and -mcall-openbsd
16640         options.  Remove -mcall-solaris documentation.
16642 2009-04-21  Manuel Lopez-Ibanez  <manu@gcc.gnu.org>
16644         PR c++/13358
16645         * doc/invoke.texi (-Wlong-long): Update description.
16646         * c-lex (interpret_integer): Only warn if there was no previous
16647         overflow and -Wlong-long is enabled.
16648         * c-decl.c (declspecs_add_type): Drop redundant flags.
16649         * c.opt (Wlong-long): Init to -1.
16650         * c-opts.c (sanitize_cpp_opts): Synchronize cpp's warn_long_long
16651         and front-end warn_long_long. Wlong-long only depends on other
16652         flags if it is uninitialized.
16653         * c-parser.c (disable_extension_diagnostics): warn_long_long is
16654         the same for CPP and FE.
16655         (restore_extension_diagnostics): Likewise.
16657 2009-04-20  Ian Lance Taylor  <iant@google.com>
16659         Fix enum conversions which are invalid in C++:
16660         * auto-inc-dec.c (attempt_change): Change 0 to SET in function call.
16661         * calls.c (store_one_arg): Change 0 to EXPAND_NORMAL in function call.
16662         * cse.c (hash_rtx_cb): Change 0 to VOIDmode in function call.
16663         * dbgcnt.c (dbg_cnt_set_limit_by_name): Add cast to enum type.
16664         * dbxout.c (dbxout_symbol): Change 0 to VOIDmode in function call.
16665         (dbxout_parms): Likewise.
16666         * df-core.c (df_set_flags): Change changeable_flags parameter to int.
16667         (df_clear_flags): Likewise.
16668         * df-problems.c (df_rd_bb_local_compute_process_def): Change
16669         top_flag parameter to int.
16670         (df_chain_create_bb_process_use): Likewise.
16671         (df_chain_add_problem): Change chain_flags parameter to unsigned int.
16672         Remove cast.
16673         * df-scan.c (df_ref_create): Change ref_flags parameter to int.
16674         (df_ref_create_structure, df_def_record_1): Likewise.
16675         (df_defs_record, df_uses_record, df_get_call_refs): Likewise.
16676         (df_notes_rescan): Change 0 to VOIDmode in function call.
16677         (df_get_call_refs, df_insn_refs_collect): Likewise.
16678         (df_bb_regs_collect): Likewise.
16679         (df_entry_block_defs_collect): Likewise.
16680         (df_exit_block_uses_collect): Likewise.
16681         * df.h: Update declarations.
16682         * double-int.c (double_int_divmod): Add cast to enum type.
16683         * dse.c (replace_inc_dec): Reverse parameters to gen_int_mode.
16684         * dwarf2out.c (new_reg_loc_descr): Add casts to enum type.
16685         (based_loc_descr): Likewise.
16686         (loc_descriptor_from_tree_1): Change first_op and second_op to
16687         enum dwarf_location_atom.  Add cast to enum type.
16688         * expmed.c (init_expmed): Change 0 to SET in function call.
16689         * expr.c (init_expr_target): Change 0 to VOIDmode in function call.
16690         (expand_expr_real_1): Change 0 to EXPAND_NORMAL in function call.
16691         (do_store_flag): Likewise.
16692         * fixed-value.h (struct fixed_value): Change mode to enum
16693         machine_mode.
16694         * function.c (assign_parms): Change 0 to VOIDmode in function call.
16695         * genautomata.c (insert_automaton_decl): Change 1 to INSERT in
16696         function call.
16697         (insert_insn_decl, insert_decl, insert_state): Likewise.
16698         (automata_list_finish): Likewise.
16699         * genrecog.c (process_define_predicate): Add cast to enum type.
16700         * gensupport.c (init_predicate_table): Add cast to enum type.
16701         * gimple.c (gimple_build_return): Change 0 to ERROR_MARK in
16702         function call.
16703         (gimple_build_call_1, gimple_build_label): Likewise.
16704         (gimple_build_goto, gimple_build_asm_1): Likewise.
16705         (gimple_build_switch_1, gimple_build_cdt): Likewise.
16706         * gimple.h (GIMPLE_CHECK): Change 0 to ERROR_MARK in function call.
16707         (enum fallback): Rename from enum fallback_t.
16708         (fallback_t): Typedef as int.
16709         * gimple-low.c (lower_builtin_setjmp): Change TSI_SAME_STMT to
16710         GSI_SAME_STMT in function call.
16711         * ira.c (setup_class_subset_and_memory_move_costs): Add casts to
16712         enum type.
16713         (setup_reg_class_relations): Likewise.
16714         (setup_reg_class_nregs): Change cl to int.  Add casts to enum type.
16715         (setup_prohibited_class_mode_regs): Add cast to enum type.
16716         (setup_prohibited_mode_move_regs): Likewise.
16717         * ira-costs.c (record_reg_classes): Change rclass to enum reg_class.
16718         (record_address_regs): Change i to enum reg_class.
16719         * lists.c (alloc_EXPR_LIST): Add cast to enum type.
16720         * machmode.h (GET_MODE_CLASS): Cast value to enum mode_class.
16721         (GET_MODE_WIDER_MODE): Cast value to enum machine_mode.
16722         (GET_MODE_2XWIDER_MODE): Likewise.
16723         (GET_CLASS_NARROWEST_MODE): Likewise.
16724         * omp-low.c (expand_omp_for): Add cast to enum type.
16725         * optabs.c (debug_optab_libfuncs): Add casts to enum type.
16726         * opts.c (enable_warning_as_error): Change kind to diagostic_t.
16727         * postreload.c (reload_cse_simplify_operands): Change rclass local
16728         to enum reg_class.
16729         * predict.c (combine_predictions_for_insn): Change best_predictor
16730         and predictor to enum br_predictor.
16731         (combine_predictions_for_bb): Likewise.
16732         (build_predict_expr): Change assignment to PREDICT_EXPR_OUTCOME to
16733         use SET_PREDICT_EXPR_OUTCOME.
16734         * real.c (real_arithmetic): Change icode to code in function call.
16735         * reginfo.c (init_move_cost): Add casts to enum type.
16736         (init_reg_sets_1, init_fake_stack_mems): Likewise.
16737         * regmove.c (regclass_compatible_p): Change class0 and class1 to
16738         enum reg_class.
16739         * reload.c (find_valid_class): Add casts to enum type.
16740         (push_reload): Change 0 to NO_REGS in function call.
16741         (find_reloads): Change this_alternative to array of enum
16742         reg_class.  Remove some now-unnecessary casts.
16743         (make_memloc): Change 0 to VOIDmode in function call.
16744         * reload1.c (reload): Change 0 to VOIDmode in function call.
16745         (eliminate_regs_1, elimination_effects): Likewise.
16746         (eliminate_regs_in_insn): Likewise.
16747         (emit_input_reload_insns): Add cast to enum type.
16748         (delete_output_reload): Change 0 to VOIDmode in function call.
16749         * reorg.c (insn_sets_resource_p): Convert include_delayed_effects
16750         to enum type in function call.
16751         * tree.h (PREDICT_EXPR_OUTCOME): Add cast to enum type.
16752         (SET_PREDICT_EXPR_OUTCOME): Define.
16753         * tree-dump.c (get_dump_file_info): Change phase parameter to int.
16754         (get_dump_file_name, dump_begin, dump_enabled_p): Likewise.
16755         (dump_initialized_p, dump_flag_name, dump_end): Likewise.
16756         (dump_function): Likewise.
16757         * tree-dump.h: Update declarations.
16758         * tree-pass.h: Update declarations.
16759         * varasm.c (assemble_integer): Change mclass to enum mode_class.
16760         * config/arm/arm.c (thumb_legitimize_reload_address): Add cast to
16761         enum type.
16762         (arm_rtx_costs_1): Correct parenthesization.
16763         (arm_rtx_costs): Add casts to enum type.
16764         (adjacent_mem_locations): Reverse arguments to const_ok_for_op.
16765         (vfp_emit_fstmd): Use add_rg_note.
16766         (emit_multi_reg_push, emit_sfm): Likewise.
16767         (thumb_set_frame_pointer): Likewise.
16768         (arm_expand_prologue): Likewise.
16769         (arm_regno_class): Change return type to enum reg_class.
16770         (thumb1_expand_prologue): Use add_reg_note.
16771         * config/arm/arm-protos.h (arm_regno_class): Update declaration.
16772         * config/arm/arm.h (INITIALIZE_TRAMPOLINE): Change 0 to LCT_NORMAL
16773         in function call.
16774         * config/arm/gentune.sh: Add cast to enum type.
16775         * config/arm/arm-tune.md: Rebuild.
16776         * config/i386/i386.c (ix86_expand_prologue): Use add_reg_note.
16777         (ix86_split_fp_branch, predict_jump): Likewise.
16778         (ix86_expand_multi_arg_builtin): Change sub_code from enum
16779         insn_code to enum rtx_code.
16780         (ix86_builtin_vectorized_function): Add cast to enum type.
16781         * config/i386/i386.md (truncdfsf2): Change slot to enum
16782         ix86_stack_slot.
16783         (truncxf<mode>2, isinf<mode>2): Likewise.
16784         * config/i386/i386-c.c (ix86_pragma_target_parse): Add cast to
16785         enum type.
16786         * config/ia64/ia64.c (ia64_split_tmode_move): Use add_reg_note.
16787         (spill_restore_mem, do_spill, ia64_expand_prologue): Likewise.
16788         (insert_bundle_state): Change 1 to INSERT in function call.
16789         (ia64_add_bundle_selector_before): Likewise.
16790         * config/ia64/ia64.md (cpu attr): Add cast to enum type.
16791         (save_stack_nonlocal): Change 0 to LCT_NORMAL in function call.
16792         (restore_stack_nonlocal): Likewise.
16793         * config/mips/mips.h (MIPS_ICACHE_SYNC): Change 0 to LCT_NORMAL in
16794         function call.
16795         * config/mips/mips.c (mips_binary_cost): Change 0 to SET in
16796         function call.
16797         (mips_rtx_costs): Likewise.
16798         (mips_override_options): Add casts to enum type.
16799         * config/mips/sdemtk.h (MIPS_ICACHE_SYNC): Change 0 to LCT_NORMAL
16800         in function call.
16801         * config/pa/pa.c (legitimize_pic_address): Use add_reg_note.
16802         (store_reg, set_reg_plus_d): Likewise.
16803         (hppa_expand_prologue, hppa_profile_hook): Likewise.
16804         * config/rs6000/rs6000.c (rs6000_init_hard_regno_mode_ok): Add
16805         cast to enum type.
16806         (altivec_expand_vec_set_builtin): Change 0 to EXPAND_NORMAL in
16807         function call.
16808         (emit_unlikely_jump): Use add_reg_note.
16809         (rs6000_emit_allocate_stack): Likewise.
16810         (rs6000_frame_related, rs6000_emit_prologue): Likewise.
16811         (output_toc): Change 1 to INSERT in function call.
16812         (output_profile_hook): Change 0 to LCT_NORMAL in function call.
16813         (rs6000_initialize_trampoline): Likewise.
16814         (rs6000_init_dwarf_reg_sizes_extra): Change 0 to EXPAND_NORMAL in
16815         function call.
16816         * config/s390/s390.c (s390_rtx_costs): Add cast to enum type.
16817         (s390_expand_movmem): Change 0 to OPTAB_DIRECT in function call.
16818         (s390_expand_setmem, s390_expand_cmpmem): Likewise.
16819         (save_gprs): Use add_reg_note.
16820         (s390_emit_prologue): Likewise.
16821         (s390_expand_builtin): Change 0 to EXPAND_NORMAL in function call.
16822         * config/sparc/sparc.c (sparc_expand_prologue): Use add_reg_note.
16823         (sparc_fold_builtin): Add cast to enum type.
16824         * config/spu/spu.c (spu_emit_branch_or_set): Change ior_code to
16825         enum insn_code.
16826         (spu_expand_prologue): Use add_reg_note.
16827         (expand_builtin_args): Change 0 to EXPAND_NORMAL in function call.
16829 2009-04-20  Ian Lance Taylor  <iant@google.com>
16831         * c-parser.c (c_parser_attributes): Change VEC back to tree list.
16832         (c_parser_postfix_expression_after_primary): Get VEC for list of
16833         arguments.  Get original types of arguments.  Call
16834         build_function_call_vec.
16835         (cached_expr_list_1, cached_expr_list_2): New static variables.
16836         (c_parser_expr_list): Change return type to VEC *.  Add
16837         p_orig_types parameter.  Change all callers.
16838         (c_parser_release_expr): New static function.
16839         (c_parser_vec_to_tree_list): New static function.
16840         * c-typeck.c (build_function_call): Rewrite to build a VEC and
16841         call build_function_call_vec.
16842         (build_function_call_vec): New function, based on old
16843         build_function_call.
16844         (convert_arguments): Remove nargs and argarray parameters.  Change
16845         values to a VEC.  Add origtypes parameter.
16846         (build_modify_expr): Add rhs_origtype parameter.  Change all callers.
16847         (convert_for_assignment): Add origtype parameter.  Change all
16848         callers.  If warn_cxx_compat, check for conversion to an enum
16849         type when calling a function.
16850         (store_init_value): Add origtype parameter.  Change all callers.
16851         (digest_init): Likewise.
16852         (struct init_node): Add origtype field.
16853         (add_pending_init): Add origtype parameter.  Change all callers.
16854         (output_init_element): Likewise.
16855         (output_pending_init_elements): Pass origtype from init_node to
16856         output_init_element.
16857         (process_init_element): Pass origtype from c_expr to
16858         output_init_element.
16859         (c_finish_return): Add origtype parameter.  Change all callers.
16860         * c-common.c (sync_resolve_size): Change params to VEC *.  Change
16861         caller.
16862         (sync_resolve_params): Likewise.
16863         (sync_resolve_return): Change params to first_param.  Change caller.
16864         (resolve_overloaded_builtins): Change params to VEC *.  Change
16865         callers.  Save first parameter around call to build_function_call_vec.
16866         * c-decl.c (finish_decl): Add origtype parameter.  Change all
16867         callers.  Call build_function_call_vec rather than
16868         build_function_call for cleanup.
16869         * c-tree.h: Update declarations.
16870         * c-common.h: Update declarations.
16871         * stub-objc.c (objc_rewrite_function_call): Change parameter from
16872         params to first_param.
16873         * target.h (struct gcc_target): Change resolve_overloaded_builtin
16874         params parameter from tree to void *.
16875         * config/rs6000/rs6000-c.c (altivec_resolve_overloaded_builtin):
16876         Change arglist parameter to have type void *, and to be a pointer
16877         to a VEC.
16878         * config/rs6000/rs6000-protos.h
16879         (altivec_resolve_overloaded_builtin): Update declaration.
16880         * config/spu/spu-c.c (spu_resolved_overloaded_builtin): Change
16881         fnargs parameter to have type void *, and to be a pointer to a
16882         VEC.  Call build_function_call_vec instead of
16883         build_function_call.
16884         * config/spu/spu-protos.h (spu_expand_builtin): Update declaration.
16886 2009-04-20  Joey Ye  <joey.ye@intel.com>
16887             Xuepeng Guo  <xuepeng.guo@intel.com>
16888             H.J. Lu  <hongjiu.lu@intel.com>
16890         * config/i386/atom.md: Add bypasses with ix86_dep_by_shift_count.
16892         * config/i386/i386.c (LEA_SEARCH_THRESHOLD): New macro.
16893         (IX86_LEA_PRIORITY): Likewise.
16894         (distance_non_agu_define): New function.
16895         (distance_agu_use): Likewise.
16896         (ix86_lea_for_add_ok): Likewise.
16897         (ix86_dep_by_shift_count): Likewise.
16899         * config/i386/i386.md: Call ix86_lea_for_add_ok to decide we
16900         should split for LEA.
16902         * config/i386/i386-protos.h (ix86_lea_for_add_ok): Declare new
16903         function.
16904         (ix86_dep_by_shift_count): Likewise.
16906 2009-04-20  Richard Guenther  <rguenther@suse.de>
16908         * expr.c (handled_component_p): Move ...
16909         * tree.h (handled_component_p): ... here.
16910         * tree.def: Re-order BIT_FIELD_REF, COMPONENT_REF,
16911         ARRAY_REF, ARRAY_RANGE_REF, VIEW_CONVERT_EXPR, IMAGPART_EXPR
16912         and REALPART_EXPR to be in one group.
16914 2009-04-20  Richard Guenther  <rguenther@suse.de>
16916         * basic-block.h (get_all_dominated_blocks): Declare.
16917         * dominance.c (get_all_dominated_blocks): New function.
16918         * tree-cfg.c (get_all_dominated_blocks): Remove.
16919         (remove_edge_and_dominated_blocks): Adjust.
16920         * tree-ssa-phiprop.c (tree_ssa_phiprop_1): Fold in ...
16921         (tree_ssa_phiprop): ... here.  Use get_all_dominated_blocks
16922         instead of recursing.
16924 2009-04-20  Doug Kwan  <dougkwan@google.com>
16926         * cgraph.h (cgraph_node_ptr): New type for vector functions.
16927         (struct cgraph_node_set_def): New type.
16928         (cgraph_node_set) New type. Also declare vector functions.
16929         (struct cgraph_node_set_element_def): New type.
16930         (cgraph_node_set_element): Ditto.
16931         (cgraph_node_set_iterator): New iterator type.
16932         (cgraph_node_set_new, cgraph_node_set_find, cgraph_node_set_add,
16933         cgraph_node_set_remove, dump_cgraph_node_set,
16934         debug_cgraph_node_set): New prototypes.
16935         (csi_end_p, csi_next, csi_node, csi_start, cgraph_node_in_set_p,
16936         cgraph_node_set_size): New inlines.
16937         * tree-pass.h (struct cgraph_node_set_def): New decl to avoid
16938         including cgraph.h.
16939         (struct ipa_opt_pass): Add struct cgraph_node_set_def
16940         argument to function 'write_summary'.
16941         * ipa.c: Include ggc.h.
16942         (hash_cgraph_node_set_element,
16943         eq_cgraph_node_set_element, cgraph_node_set_new,
16944         cgraph_node_set_add, cgraph_node_set_remove,
16945         cgraph_node_set_find, dump_cgraph_node_set,
16946         debug_cgraph_node_set): New functions.
16947         * Makefile.in (ipa.o): Add dependency on GGC_H.
16949 2009-04-20  Ira Rosen  <irar@il.ibm.com>
16951         PR tree-optimization/39675
16952         * tree-vect-loop.c (vect_transform_loop): Remove currently redundant
16953         check of the return code of vect_schedule_slp. Check that
16954         stmt_vec_info still exists for the statement, before checking its
16955         vectorization type.
16957 2009-04-20  Michael Matz  <matz@suse.de>
16959         * Makefile.in (generated_files): Take out $(simple_generated_c).
16961 2009-04-19  Dave Korn  <dave.korn.cygwin@gmail.com>
16963         * config/i386/cygwin-stdint.h (INTPTR_TYPE):  Remove "long".
16964         (UINTPTR_TYPE):  Likewise.
16966 2009-04-19  Joseph Myers  <joseph@codesourcery.com>
16968         PR c/37481
16969         * c-typeck.c (digest_init): Check for initializing an array with a
16970         string literal.
16972 2009-04-19  Joseph Myers  <joseph@codesourcery.com>
16974         PR c/19771
16975         * c-semantics.c (pop_stmt_list): Propagate
16976         STATEMENT_LIST_HAS_LABEL to parent statement list.
16978 2009-04-19  Adam Nemet  <anemet@caviumnetworks.com>
16980         * config/mips/mips.h (mips_tune_attr): New macro.
16981         * config/mips/mips.md (cpu): Use it.
16983 2009-04-19  Joseph Myers  <joseph@codesourcery.com>
16985         PR c/38243
16986         * c-decl.c (shadow_tag_warned): Diagnose use of restrict when
16987         declaring a tag.
16989 2009-04-19  Diego Novillo  <dnovillo@google.com>
16991         * toplev.c (compile_file): Move call to coverage_finish ...
16992         * cgraphunit.c (ipa_passes): ... here.
16993         Call cgraph_process_new_functions.
16994         * ipa-utils.c (get_base_var): Handle CONSTRUCTOR.
16995         * Makefile.in (cgraphunit.o): Add dependency on COVERAGE_H.
16997 2009-04-19  Jan Hubicka  <jh@suse.cz>
16999         * cgraph.c (cgraph_create_edge, cgraph_set_call_stmt): Set proper
17000         cfun.
17001         (dump_cgraph_node): Dump can throw external flag.
17002         * ipa-pure-const.c (propagate): Fix propagation of nothrow flags.
17004 2009-04-19  Manuel López-Ibáñez  <manu@gcc.gnu.org>
17006         PR c/32061
17007         PR c++/36954
17008         * doc/invoke.texi: Add -Wlogical-op to -Wextra.
17009         * common.opt (Wlogical-op): Move from here...
17010         * c.opt (Wlogical-op): ... to here.
17011         * c-typeck.c (parser_build_binary_op): Update call to
17012         warn_logical_operator.
17013         * c-opts.c (c_common_post_options): Enable warn_logical_op with
17014         extra_warnings.
17015         * c-common.c (warn_logical_op): Update.
17016         * c-common.h (warn_logical_op): Update declaration.
17018 2009-04-19  Eric Botcazou  <ebotcazou@adacore.com>
17020         * tree.c (protected_set_expr_location): Fix formatting.
17022 2009-04-18  Joseph Myers  <joseph@codesourcery.com>
17024         PR c/27676
17025         * c-typeck.c (readonly_warning): new.
17026         (build_unary_op, build_modify_expr): Use readonly_warning for
17027         storing into something readonly but not const-qualified.
17029 2009-04-18  Joseph Myers  <joseph@codesourcery.com>
17031         PR c/22367
17032         * c-typeck.c (build_unary_op): Check for taking address of
17033         expression of type void.
17035 2009-04-18  Joseph Myers  <joseph@codesourcery.com>
17037         PR c/35210
17038         * c-typeck.c (build_function_call): Check for calling a function
17039         with qualified void return types.  Call require_complete_type when
17040         generating a trap.
17042 2009-04-18  Jan Hubicka  <jh@suse.cz>
17044         * cgraph.c (cgraph_make_edge, dump_cgraph_node, cgraph_set_call_stmt):
17045         Set nothrow flag.
17046         * cgraph.h (struct function): Reduce loop_nest to 30 bits; add
17047         can_throw_external flag.
17048         * ipa-reference.c (ipa_utils_reduced_inorder): Update call.
17049         * ipa-pure-const.c (ignore_edge): New function.
17050         (propagate): Compute order for NOTHROW computation; set NOTHROWs
17051         only over can_throw_external edges.
17052         (local_pure_const): Add nothrow flag.
17053         * ipa-utils.c (searchc): Add ignore_edge callback.
17054         (ipa_utils_reduced_inorder): Add ignore_edge callback.
17055         * ipa-utils.h (ipa_utils_reduced_inorder): Update prototype.
17056         (set_nothrow_function_flags): Update cgraph.
17057         * tree-cfg.c (verify_stmt): Relax nothrow checking when in IPA mode.
17059 2009-04-18  Richard Guenther  <rguenther@suse.de>
17061         PR middle-end/39804
17062         * tree-ssa-ccp.c (fold_stmt_1): New function factored from ...
17063         (fold_stmt): ... this and ...
17064         (fold_stmt_inplace): ... this.
17065         (fold_stmt_1): Fold references in calls and asms.
17066         * tree-cfg.c (remove_useless_stmts_cond): Use fold_stmt.
17068 2009-04-18  Kazu Hirata  <kazu@codesourcery.com>
17070         * tree-vrp.c (ssa_name_nonzero_p): Remove.
17071         * tree.h: Remove the prototype for ssa_name_nonzero_p.
17073 2009-04-18  Kazu Hirata  <kazu@codesourcery.com>
17075         * tree.c (function_args_count): Remove.
17076         * tree.h: Remove the prototype for function_args_count.
17078 2009-04-18  Kazu Hirata  <kazu@codesourcery.com>
17080         * tree-iterator.c (expr_only): Remove.
17081         * tree.h: Remove the prototype for expr_only.
17083 2009-04-18  Kazu Hirata  <kazu@codesourcery.com>
17085         * reginfo.c (cannot_change_mode_set_regs): Remove.
17086         * rtl.h: Remove the prototype for cannot_change_mode_set_regs.
17088 2009-04-08  Anatoly Sokolov  <aesok@post.ru>
17090         * config/avr/avr.md (*rotlsi3_8, *rotlsi3_16, *rotlsi3_24 ): Check
17091         whether operands 0 and 1 overlaps.
17093 2009-04-18  Manuel López-Ibáñez  <manu@gcc.gnu.org>
17095         PR middle-end/36902
17096         * tree-vrp.c (check_array_ref): Pass a location_t instead of a
17097         pointer. Use warning_at instead of warning.
17098         (search_for_addr_array): Likewise.
17099         (check_array_bounds): Likewise.
17100         (check_all_array_refs): Check that the incoming edge is not in the
17101         list of edges to be removed.
17102         (check_all_array_refs): Avoid the temporal pointer.
17103         (vrp_visit_cond_stmt): Fix typo.
17104         (simplify_switch_using_ranges): Handle the case where the switch
17105         index is an integer constant.
17107 2009-04-18  Adam Nemet  <anemet@caviumnetworks.com>
17109         * config/mips/mips.c (mips_final_postscan_insn): Make it static.
17111 2009-04-18  Kazu Hirata  <kazu@codesourcery.com>
17113         * doc/extend.texi, doc/invoke.texi: Fix typos.
17115 2009-04-17  Cary Coutant  <ccoutant@google.com>
17117         * tree-flow-inline.h (get_lineno): Fix inverted test.
17119 2009-04-17  Diego Novillo  <dnovillo@google.com>
17121         * tree-ssa-pre.c (create_expression_by_pieces): Remove
17122         assertion for AVAIL_OUT.
17124 2009-04-17  Mike Frysinger  <vapier@gentoo.org>
17126         PR target/38627
17127         * config/sh/lib1funcs.asm [__ELF__ && __linux__]: Add .note.GNU-stack.
17128         * config/sh/linux-atomic.asm: Likewise.
17130 2009-04-17  Diego Novillo  <dnovillo@google.com>
17132         * except.c (debug_eh_tree): New.
17133         (struct eh_region, struct eh_status): Move ...
17134         * except.h: ... here.
17135         (add_type_for_runtime): Declare extern.
17136         (lookup_type_for_runtime): Likewise.
17137         (debug_eh_tree): Declare.
17138         * Makefile.in (GTFILES): List except.h before except.c
17140 2009-04-17  Diego Novillo  <dnovillo@google.com>
17142         * omp-low.c (create_omp_child_function): Set DECL_CONTEXT for DECL.
17143         * cgraphunit.c (cgraph_build_static_cdtor): Likewise.
17144         * tree-dfa.c (find_referenced_vars_in): Factor out of ...
17145         (find_vars_r): ... here.
17146         * tree-flow.h (find_referenced_vars_in): Declare.
17147         * tree-ssa-pre.c (create_expression_by_pieces): Assert
17148         that AVAIL_OUT exists for BLOCK.
17149         * Makefile.in (CGRAPH_H): Add dependency on cif-code.def
17150         (tree-loop-distribution.o): Fix dependency on TREE_VECTORIZER_H.
17151         (tree-parloops.o): Likewise.
17153 2009-04-17  Simon Baldwin  <simonb@google.com>
17155         * toplev.c (default_tree_printer): Add handling for %E format.
17157 2009-04-17  Diego Novillo  <dnovillo@google.com>
17159         * tree-pretty-print.c (dump_generic_node): Add break after
17160         TREE_BINFO handler.  Handle COMPLEX_TYPE, REAL_TYPE and
17161         FIXED_POINT_TYPE.  Handle NULL TREE_TYPEs.  Handle METHOD_TYPE and
17162         FUNCTION_TYPE together.  Call print_struct_decl when printing
17163         structures and TDF_SLIM is not given.
17164         (print_struct_decl): Fix logic for detecting recursion.
17166 2009-04-17  Rafael Avila de Espindola  <espindola@google.com>
17168         PR 31567
17169         * gcc.c (create_at_file): New.
17170         (compile_input_file_p): New.
17171         (do_spec_1): Use @args files for %i. Use create_at_file for %o.
17172         * main.c (main): Update call to toplev_main.
17173         * toplev.c (toplev_main): Change signature. Call expandargv.
17174         * toplev.h (toplev_main): Change signature.
17176 2009-04-17  Eric Botcazou  <ebotcazou@adacore.com>
17178         * dwarf2out.c (field_byte_offset): Use the type size as the field size
17179         if the latter is not constant.
17181 2009-04-17  David Edelsohn  <edelsohn@gnu.org>
17183         * dbxout.c (xcoff_debug_hooks): Add set_name_debug_nothing.
17185 2009-04-17  Eric Botcazou  <ebotcazou@adacore.com>
17187         * dbxout.c (dbxout_block): Reinstate test on TREE_USED.
17188         * tree-ssa-live.c (remove_unused_scope_block_p): Update TREE_USED bit.
17190 2009-04-17  Richard Guenther  <rguenther@suse.de>
17192         * tree-ssa-structalias.c (get_constraint_for_component_ref):
17193         Handle component references view-converting an invariant address.
17195 2009-04-17  Adam Nemet  <anemet@caviumnetworks.com>
17197         * doc/tm.texi (TARGET_DEFAULT_TARGET_FLAGS,
17198         TARGET_MIN_ANCHOR_OFFSET, TARGET_MAX_ANCHOR_OFFSET,
17199         TARGET_HAVE_SRODATA_SECTION, TARGET_HAVE_TLS,
17200         TARGET_UNWIND_TABLES_DEFAULT, TARGET_TERMINATE_DW2_EH_FRAME_INFO):
17201         Use @deftypevr rather than @deftypevar.
17203 2009-04-17  Richard Guenther  <rguenther@suse.de>
17205         * tree-ssa-forwprop.c (get_prop_dest_stmt): Clean up tuplification.
17206         (get_prop_source_stmt): Likewise.
17207         (can_propagate_from): Likewise.
17209 2009-04-17  Andrew Stubbs  <ams@codesourcery.com>
17211         * configure.ac: Add new AC_SUBST for TM_ENDIAN_CONFIG,
17212         TM_MULTILIB_CONFIG and TM_MULTILIB_EXCEPTIONS_CONFIG.
17213         (--with-multilib-list): Add default value.
17214         * configure: Regenerate.
17215         * Makefile.in (TM_ENDIAN_CONFIG): Define.
17216         (TM_MULTILIB_CONFIG, TM_MULTILIB_EXCEPTIONS_CONFIG): Define.
17217         * config.gcc (sh-*-*): Switch to using TM_ENDIAN_CONFIG,
17218         TM_MULTILIB_CONFIG, and TM_MULTILIB_EXCEPTIONS_CONFIG.
17219         Don't add default cpu to multilib list unnecessarily, but do enable
17220         the relevant compiler option..
17221         Add support for --with-multilib-list=<blank> and
17222         --with-multilib-list=!<somelib> to supress unwanted multilibs.
17223         * config/sh/t-sh (DEFAULT_ENDIAN, OTHER_ENDIAN): New variables.
17224         (MULTILIB_ENDIAN, MULTILIB_CPUS): Delete variables.
17225         (MULTILIB_OPTIONS): Redefine using OTHER_ENDIAN and
17226         TM_MULTILIB_CONFIG.
17227         (MULTILIB_EXCEPTIONS): Add TM_MULTILIB_EXCEPTIONS_CONFIG.
17228         (MULTILIB_OSDIRNAMES): New variable.
17229         * config/sh/t-1e: Delete file.
17230         * config/sh/t-mlib-sh1: Delete file.
17231         * config/sh/t-mlib-sh2: Delete file.
17232         * config/sh/t-mlib-sh2a: Delete file.
17233         * config/sh/t-mlib-sh2a-nofpu: Delete file.
17234         * config/sh/t-mlib-sh2a-single: Delete file.
17235         * config/sh/t-mlib-sh2a-single-only: Delete file.
17236         * config/sh/t-mlib-sh2e: Delete file.
17237         * config/sh/t-mlib-sh3e: Delete file.
17238         * config/sh/t-mlib-sh4: Delete file.
17239         * config/sh/t-mlib-sh4-nofpu: Delete file.
17240         * config/sh/t-mlib-sh4-single: Delete file.
17241         * config/sh/t-mlib-sh4-single-only: Delete file.
17242         * config/sh/t-mlib-sh4a: Delete file.
17243         * config/sh/t-mlib-sh4a-nofpu: Delete file.
17244         * config/sh/t-mlib-sh4a-single: Delete file.
17245         * config/sh/t-mlib-sh4a-single-only: Delete file.
17246         * config/sh/t-mlib-sh4al: Delete file.
17247         * config/sh/t-mlib-sh5-32media: Delete file.
17248         * config/sh/t-mlib-sh5-32media-nofpu: Delete file.
17249         * config/sh/t-mlib-sh5-64media: Delete file.
17250         * config/sh/t-mlib-sh5-64media-nofpu: Delete file.
17251         * config/sh/t-mlib-sh5-compact: Delete file.
17252         * config/sh/t-mlib-sh5-compact-nofpu: Delete file.
17253         * config/sh/t-linux: Don't override MULTILIB_EXCEPTIONS.
17254         * doc/install.texi (Options specification): Add
17255         --with-multilib-list and --with-endian.
17257 2009-04-17  Rafael Avila de Espindola  <espindola@google.com>
17259         * Makefile.in (REVISION_s): Always include quotes. Change ifdef to use
17260         REVISION_c.
17261         (OBJS-common): Add plugin-version.o.
17262         (plugin-version.o): New.
17263         * gcc-plugin.h (plugin_gcc_version): New.
17264         (plugin_default_version_check): New.
17265         (plugin_init_func, plugin_init): Add version argument.
17266         * plugin-version.c: New.
17267         * plugin.c (str_plugin_gcc_version_name): New.
17268         (try_init_one_plugin): Read plugin_gcc_version from the plugin and
17269         pass it to the init function.
17270         (plugin_default_version_check): New.
17272 2009-04-17  Richard Guenther  <rguenther@suse.de>
17274         * tree-ssa-alias.c (refs_may_alias_p_1): Do not use TBAA
17275         for decl-vs-decl disambiguation.
17277 2009-04-17  Andreas Krebbel  <krebbel1@de.ibm.com>
17279         * config/s390/s390.h (s390_tune_attr): New macro definition.
17280         * config/s390/s390.md (cpu attribute): Map to s390_tune_attr.
17282 2009-04-17  Richard Guenther  <rguenther@suse.de>
17284         * tree-ssa-ccp.c (struct fold_stmt_r_data): Remove.
17285         (fold_stmt_r): Likewise.
17286         (maybe_fold_reference): New function.
17287         (fold_gimple_assign): Handle cases fold_stmt_r did.
17288         (fold_stmt): Do not use fold_stmt_r.
17289         (fold_stmt_inplace): Likewise.
17291 2009-04-17  Richard Guenther  <rguenther@suse.de>
17293         * tree-ssa-dom.c (gimple_assign_unary_useless_conversion_p): Remove.
17294         (record_equivalences_from_stmt): Remove useless checks and
17295         simplifications.
17296         * tree-ssa-pre.c (eliminate): Avoid converting a constant if
17297         the type is already suitable.
17299 2009-04-17  Paolo Bonzini  <bonzini@gnu.org>
17301         * config/sh/sh.h (FUNCTION_VALUE): Fix call to sh_promote_prototypes.
17303 2009-04-17  Uros Bizjak  <ubizjak@gmail.com>
17305         * config/arm/sfp-machine.h (__gcc_CMPtype): New typedef.
17306         (CMPtype): Define as __gcc_CMPtype.
17308 2009-04-17  Aurelien Jarno  <aurelien@aurel32.net>
17310         * config.gcc: Add soft-fp/t-softfp and i386/t-linux to tmake_file
17311         for i[34567]86-*-kfreebsd*-gnu*, x86_64-*-kfreebsd*-gnu*.
17313 2009-04-17  Richard Guenther  <rguenther@suse.de>
17315         PR tree-optimization/39746
17316         * tree-ssa-alias.c (ref_maybe_used_by_call_p_1): Remove
17317         special-casing for builtins and static variable use/def.
17318         (call_may_clobber_ref_p_1): Likewise.
17320 2009-04-16  Ian Lance Taylor  <iant@google.com>
17322         * df.h: Include "timevar.h".
17323         (struct df_problem): Change tv_id field to timevar_id_t.
17324         * tree-pass.h: Include "timevar.h".
17325         (struct opt_pass): Change tv_id field to timevar_id_t.
17326         * timevar.h (timevar_id_t): Define TV_NONE.
17327         * passes.c (execute_one_ipa_transform_pass): Check for tv_id !=
17328         TV_NONE rather than tv_id != 0.
17329         (execute_one_pass): Likewise.
17330         * Makefile.in (DF_H): Add $(TIMEVAR_H).
17331         (TREE_PASS_H): Define.  Change all instances of tree-pass.h in
17332         dependencies to $(TREE_PASS_H).
17333         * bt-load.c (pass_branch_target_load_optimize1): Set tv_id field
17334         to TV_NONE.
17335         (pass_branch_target_load_optimize2): Likewise.
17336         * cfglayout.c (pass_into_cfg_layout_mode): Likewise.
17337         (pass_outof_cfg_layout_mode): Likewise.
17338         * cgraphbuild.c (pass_remove_cgraph_callee_edges): Likewise.
17339         (pass_rebuild_cgraph_edges): Likewise.
17340         (pass_remove_cgraph_callee_edges): Likewise.
17341         * df-core.c (pass_df_initialize_opt): Likewise.
17342         (pass_df_initialize_no_opt): Likewise.
17343         (pass_df_finish): Likewise.
17344         * emit-rtl.c (pass_unshare_all_rtl): Likewise.
17345         * except.c (pass_set_nothrow_function_flags): Likewise.
17346         (pass_convert_to_eh_region_ranges): Likewise.
17347         * final.c (pass_compute_alignments): Likewise.
17348         * function.c (pass_instantiate_virtual_regs): Likewise.
17349         (pass_init_function): Likewise.
17350         (pass_leaf_regs): Likewise.
17351         (pass_match_asm_constraints): Likewise.
17352         * gimple-low.c (pass_lower_cf): Likewise.
17353         (pass_mark_used_blocks): Likewise.
17354         * init-regs.c (pass_initialize_regs): Likewise.
17355         * integrate.c (pass_initial_value_sets): Likewise.
17356         * ira.c (pass_ira): Likewise.
17357         * jump.c (pass_cleanup_barriers): Likewise.
17358         * omp-low.c (pass_expand_omp): Likewise.
17359         (pass_lower_omp): Likewise.
17360         * matrix-reorg.c (pass_ipa_matrix_reorg): Likewise.
17361         * recog.c (pass_split_all_insns): Likewise.
17362         (pass_split_after_reload): Likewise.
17363         (pass_split_before_regstack): Likewise.
17364         (pass_split_before_sched2): Likewise.
17365         (pass_split_for_shorten_branches): Likewise.
17366         * reginfo.c (pass_reginfo_init): Likewise.
17367         (pass_subregs_of_mode_init): Likewise.
17368         (pass_subregs_of_mode_finish): Likewise.
17369         * passes.c (pass_postreload): Likewise.
17370         * stack-ptr-mod.c (pass_stack_ptr_mod): Likewise.
17371         * tree-cfg.c (pass_remove_useless_stmts): Likewise.
17372         (pass_warn_function_return): Likewise.
17373         (pass_warn_function_noreturn): Likewise.
17374         * tree-complex.c (pass_lower_complex): Likewise.
17375         (pass_lower_complex_O0): Likewise.
17376         * tree-if-conv.c (pass_if_conversion): Likewise.
17377         * tree-into-ssa.c (pass_build_ssa): Likewise.
17378         * tree-mudflap.c (pass_mudflap_1): Likewise.
17379         (pass_mudflap_2): Likewise.
17380         * tree-nomudflap.c (pass_mudflap_1): Likewise.
17381         (pass_mudflap_2): Likewise.
17382         * tree-nrv.c (pass_return_slot): Likewise.
17383         * tree-object-size.c (pass_object_sizes): Likewise.
17384         * tree-optimize.c (pass_all_optimizations): Likewise.
17385         (pass_early_local_passes): Likewise.
17386         (pass_all_early_optimizations): Likewise.
17387         (pass_cleanup_cfg): Likewise.
17388         (pass_cleanup_cfg_post_optimizing): Likewise.
17389         (pass_free_datastructures): Likewise.
17390         (pass_free_cfg_annotations): Likewise.
17391         (pass_fixup_cfg): Likewise.
17392         (pass_init_datastructures): Likewise.
17393         * tree-ssa.c (pass_early_warn_uninitialized): Likewise.
17394         (pass_late_warn_uninitialized): Likewise.
17395         (pass_update_address_taken): Likewise.
17396         * tree-ssa-ccp.c (pass_fold_builtins): Likewise.
17397         * tree-ssa-math-opts.c (pass_cse_reciprocals): Likewise.
17398         (pass_cse_sincos): Likewise.
17399         (pass_convert_to_rsqrt): Likewise.
17400         * tree-ssa-structalias.c (pass_build_alias): Likewise.
17401         * tree-stdarg.c (pass_stdarg): Likewise.
17402         * tree-tailcall.c (pass_tail_recursion): Likewise.
17403         (pass_tail_calls): Likewise.
17404         * tree-vect-generic.c (pass_lower_vector): Likewise.
17405         (pass_lower_vector_ssa): Likewise.
17406         * tree-vectorizer.c (pass_ipa_increase_alignment): Likewise.
17408 2009-04-16  Joseph Myers  <joseph@codesourcery.com>
17410         * config/mips/mips.c (mips_rtx_cost_data): Use SOFT_FP_COSTS in
17411         XLR entry.
17412         * config/mips/mips.h (MIPS_ISA_LEVEL_SPEC, MIPS_ARCH_FLOAT_SPEC):
17413         Handle -march=xlr.
17414         * config/mips/xlr.md (ir_xlr_alu): Also accept insn types move,
17415         logical and signext.
17417 2009-04-16  Kaz Kojima  <kkojima@gcc.gnu.org>
17419         PR target/39767
17420         * config/sh/predicates.md (arith_operand): Check if the operand
17421         of TRUNCATE is a REG.
17423 2009-04-16  Kazu Hirata  <kazu@codesourcery.com>
17425         * cfgrtl.c (delete_insn_chain_and_edges): Remove.
17426         * rtl.h: Remove the prototype for delete_insn_chain_and_edges.
17428 2009-04-16  Kazu Hirata  <kazu@codesourcery.com>
17430         * tree-iterator.c (tsi_split_statement_list_after,
17431         tsi_split_statement_list_before): Remove.
17432         * tree-iterator.h: Remove the prototypes for
17433         tsi_split_statement_list_after and tsi_split_statement_list_before.
17435 2009-04-16  Kazu Hirata  <kazu@codesourcery.com>
17437         * tree-ssa-propagate.c (stmt_makes_single_load): Remove.
17438         * tree-ssa-propagate.h: Remove the prototype for
17439         stmt_makes_single_load.
17441 2009-04-16  Kazu Hirata  <kazu@codesourcery.com>
17443         * emit-rtl.c (set_mem_attrs_from_reg): Remove.
17444         * rtl.h: Remove the prototype for set_mem_attrs_from_reg.
17446 2009-04-16  Kazu Hirata  <kazu@codesourcery.com>
17448         * tree-iterator.c (EXPR_LAST_BODY): Remove.
17450 2009-04-16  Kazu Hirata  <kazu@codesourcery.com>
17452         * except.c (eh_region_outer_p): Remove.
17453         * except.h: Remove the prototype for eh_region_outer_p.
17455 2009-04-16  Kazu Hirata  <kazu@codesourcery.com>
17457         * function.c (current_function_assembler_name): Remove.
17458         * function.h: Remove the prototype for
17459         current_function_assembler_name.
17461 2009-04-16  Ian Lance Taylor  <iant@google.com>
17463         * rtlanal.c (alloc_reg_note): New function, broken out of add_reg_note.
17464         (add_reg_note): Call alloc_reg_note.
17465         * rtl.h (alloc_reg_note): Declare.
17466         * combine.c (try_combine): Use alloc_reg_note.
17467         (recog_for_combine, move_deaths): Likewise.
17468         (distribute_notes): Use alloc_reg_note and add_reg_note.
17469         * haifa-sched.c (sched_create_recovery_edges): Use add_reg_note.
17470         * combine-stack-adj.c (adjust_frame_related_expr): Likewise.
17471         * reload1.c (eliminate_regs_1): Use alloc_reg_note.
17473 2009-04-16  Vladimir Makarov  <vmakarov@redhat.com>
17475         PR rtl-optimization/39762
17476         * ira-int.h (ira_register_move_cost, ira_may_move_in_cost,
17477         ira_may_move_out_cost): Add comments about way of their usage.
17478         (ira_get_register_move_cost, ira_get_may_move_cost): New functions.
17480         * ira-conflicts.c (process_regs_for_copy): Use function
17481         ira_get_register_move_cost instead of global
17482         ira_register_move_cost.
17484         * ira-color.c (update_copy_costs, calculate_allocno_spill_cost,
17485         color_pass, move_spill_restore, update_curr_costs): Ditto.
17487         * ira-lives.c (process_single_reg_class_operands): Ditto.
17489         * ira-emit.c (emit_move_list): Ditto.
17491         * ira-costs.c (copy_cost): Don't call ira_init_register_move_cost.
17492         (record_reg_classes): Ditto.  Use functions
17493         ira_get_register_move_cost and ira_get_may_move_cost instead of
17494         global vars ira_register_move_cost, ira_may_move_out_cost and
17495         ira_may_move_in_cost.
17496         (record_address_regs): Don't call ira_init_register_move_cost.
17497         Use function ira_get_may_move_cost instead of global
17498         ira_may_move_in_cost.
17499         (process_bb_node_for_hard_reg_moves): Use function
17500         ira_get_register_move_cost instead of global ira_register_move_cost.
17501         (ira_costs): Don't call ira_init_register_move_cost.
17503 2009-04-16  Richard Guenther  <rguenther@suse.de>
17505         * tree-cfg.c (verify_gimple_assign_binary):
17506         Allow POINTER_PLUS_EXPR-like PLUS_EXPR for vectors.
17507         * ipa-struct-reorg.c (gen_size): Fold the built expressions.
17508         (create_general_new_stmt): Note that this function is broken.
17510 2009-04-16  Rafael Avila de Espindola  <espindola@google.com>
17512         * common.opt (fhelp): Add Var(help_flag).
17513         * gcc-plugin.h (plugin_info): Add help.
17514         * plugin.c (plugin_name_args): Add help.
17515         (register_plugin_info): Set plugin->help.
17516         (print_help_one_plugin): New.
17517         (print_plugins_help): New.
17518         * plugin.h (print_plugins_help): New.
17519         * toplev.c (toplev_main): Call print_plugins_help if needed.
17521 2009-04-16  Richard Guenther  <rguenther@suse.de>
17523         * gimple.c (gimple_copy): Do not clear addresses_taken bitmap.
17524         (gimple_ior_addresses_taken_1): New function.
17525         (gimple_ior_addresses_taken): Likewise.
17526         * gimple.h (struct gimple_statement_with_ops_base): Remove
17527         addresses_taken member.
17528         (gimple_ior_addresses_taken): Declare.
17529         (gimple_addresses_taken, gimple_addresses_taken_ptr,
17530         gimple_set_addresses_taken): Remove.
17531         * ipa-reference.c (mark_address): New function.
17532         (scan_stmt_for_static_refs): Use it for marking addresses taken.
17533         * tree-ssa-operands.c (add_to_addressable_set): Rename to ...
17534         (mark_address_taken): ... this.  Just set TREE_ADDRESSABLE.
17535         (gimple_add_to_addresses_taken): Remove.
17536         (get_tmr_operands): Call mark_address_taken.
17537         (get_asm_expr_operands): Likewise.
17538         (get_expr_operands): Likewise.
17539         (build_ssa_operands): Do not clear the addresses_taken bitmap.
17540         (free_stmt_operands): Do not free it.
17541         * tree-ssa.c (delete_tree_ssa): Likewise.
17542         (execute_update_addresses_taken): Use gimple_ior_addresses_taken.
17544 2009-04-16  Richard Guenther  <rguenther@suse.de>
17546         * gimple.h (walk_stmt_load_store_addr_ops): Declare.
17547         (walk_stmt_load_store_ops): Likewise.
17548         * gimple.c (get_base_loadstore): New function.
17549         (walk_stmt_load_store_addr_ops): Likewise.
17550         (walk_stmt_load_store_ops): Likewise.
17551         * ipa-pure-const.c (check_op): Simplify.
17552         (check_load, check_store): New functions.
17553         (check_stmt): Use walk_stmt_load_store_ops.
17554         * ipa-reference.c (mark_load): Adjust signature.
17555         (mark_store): Likewise.
17556         (scan_stmt_for_static_refs): Use walk_stmt_load_store_addr_ops.
17558 2009-04-16  Rafael Avila de Espindola  <espindola@google.com>
17560         * gcc-plugin.h (plugin_event): Add PLUGIN_INFO.
17561         (plugin_info): New.
17562         * opts.c (common_handle_option): Don't call print_version.
17563         * plugin.c (plugin_name_args): Add version.
17564         (register_plugin_info): New.
17565         (register_callback): Handle PLUGIN_INFO.
17566         (try_init_one_plugin): New.
17567         (init_one_plugin): Use try_init_one_plugin. Only free plugin_name_args
17568         if failed to init.
17569         (finalize_one_plugin): New.
17570         (finalize_plugins): New.
17571         (print_one_plugin): New.
17572         (print_plugins_versions): New.
17573         * plugin.h (print_plugins_versions): New.
17574         (finalize_plugins): New.
17575         * toplev.c (compile_file): Don't call initialize_plugins.
17576         (print_version): Call print_plugins_versions.
17577         (toplev_main): Call initialize_plugins. Print version if needed.
17578         Call finalize_plugins.
17580 2009-04-16  Rafael Avila de Espindola  <espindola@google.com>
17582         * common.opt (fversion): New.
17583         * gcc.c (print_version): New.
17584         (process_command): Don't print the version. Just set print_version.
17585         (main): Print version. Call subprocesses if print_version and
17586         verbose_flag are set.
17587         * opts.c (common_handle_option): Handle OPT_fversion.
17589 2009-04-16  Richard Guenther  <rguenther@suse.de>
17590             Ira Rosen  <irar@il.ibm.com>
17592         PR tree-optimization/39698
17593         * tree-vect-loop.c (get_initial_def_for_reduction): Use the
17594         type of the reduction variable.  Only generate the def if
17595         it is needed.
17597         * omp-low.c (expand_omp_for_generic): When converting to a pointer
17598         make sure to first convert to an integer of the same precision.
17599         * tree-vect-loop-manip.c (vect_update_ivs_after_vectorizer): Retain
17600         the type of the evolution correctly in computing the new
17601         induction variable base.
17603 2009-04-16  Richard Guenther  <rguenther@suse.de>
17605         PR middle-end/39625
17606         * tree-cfg.c (make_blocks): Split statements with to-be
17607         abnormal SSA names on the lhs.
17609 2009-04-16  Paolo Bonzini  <bonzini@gnu.org>
17611         * c-common.c (vector_targets_convertible_p, vector_types_convertible_p):
17612         Use TYPE_VECTOR_OPAQUE instead of targetm.vector_opaque_p.
17613         * c-typeck.c (really_start_incremental_init): Likewise.
17614         * target-def.h (TARGET_VECTOR_OPAQUE_P): Remove.
17615         (TARGET_INITIALIZER): Remove it.
17616         * target.h (struct target): Remove vector_opaque_p.
17617         * tree.c (build_opaque_vector_type): New.
17618         * tree.h (TYPE_VECTOR_OPAQUE): New.
17619         (build_opaque_vector_type): Declare.
17620         * doc/tm.texi (TARGET_VECTOR_OPAQUE_P): Remove.
17621         * config/rs6000/rs6000.c (build_opaque_vector_type,
17622         rs6000_is_vector_type, TARGET_VECTOR_OPAQUE_P): Remove.
17623         (rs6000_init_builtins): Use build_opaque_vector_type for
17624         opaque_V4SI_type_node.
17626 2009-04-15  Catherine Moore  <clm@codesourcery.com>
17628         * debug.h (set_name):  Declare.
17629         * dwarf2out.c (dwarf2out_set_name): Declare.
17630         (dwarf2_debug_hooks): Add set_name.
17631         (find_AT_string): New.
17632         (add_AT_string): Call find_AT_string.
17633         (dwarf2out_set_name): New.
17634         * cp/decl.c (grokdeclarator): Call set_name.
17635         * vmsdbgout.c (vmsdbg_debug_hooks): Add set_name_debug_nothing.
17636         * debug.c (do_nothing_debug_hooks):  Likewise.
17637         * dbxout.c (dbx_debug_hooks): Likewise.
17638         * sdbout.c (sdb_debug_hooks): Likewise.
17640 2009-04-15  Michael Eager  <eager@eagercon.com>
17642         * config/rs6000/rs6000.c (rs6000_function_value): Set function return
17643         reg for single-precision FPU.
17644         * config/rs6000/rs6000.md (movsi_internal1): Only for
17645         !TARGET_SINGLE_FPU.
17646         (movsi_internal1_single): New. Add pattern to move SI values to/from
17647         single-precision FP regs.
17649 2009-04-15  Richard Guenther  <rguenther@suse.de>
17651         * omp-low.c (lower_rec_input_clauses): Build correct address
17652         expressions.
17653         (expand_omp_for_generic): Fix multiplication type.
17654         * tree-loop-distribution.c (build_size_arg): Build a size_t argument.
17655         (generate_memset_zero): Fix types.
17656         * tree-profile.c (prepare_instrumented_value): Correctly
17657         widen a pointer.
17659 2009-04-15  Ian Lance Taylor  <iant@google.com>
17661         * c.opt (Wenum-compare): Enable for C and Objc.  Initialize to -1.
17662         * c-opts.c (c_common_handle_option): For C, set warn_enum_compare
17663         for -Wall and for -Wc++-compat.
17664         (c_common_post_options): For C++, set warn_enum_compare if not
17665         already set.
17666         * c-tree.h (struct c_expr): Add field original_type.
17667         (build_external_ref): Update declaration.
17668         * c-parser.c (c_parser_braced_init): Set original_type.
17669         (c_parser_initelt): Likewise.
17670         (c_parser_expr_no_commas): Likewise.
17671         (c_parser_conditional_expression): Likewise.
17672         (c_parser_cast_expression): Likewise.
17673         (c_parser_unary_expression): Likewise.  Pull setting of
17674         original_code to top of function.
17675         (c_parser_sizeof_expression): Set original_type.
17676         (c_parser_alignof_expression): Likewise.
17677         (c_parser_postfix_expression): Likewise.  Pull setting of
17678         original_code to top of function.
17679         (c_parser_postfix_expression_after_paren_type): Set original_type.
17680         (c_parser_postfix_expression_after_primary): Likewise.
17681         (c_parser_expression): Likewise.
17682         * c-typeck.c (build_external_ref): Add type parameter.  Change all
17683         callers.
17684         (c_expr_sizeof_expr): Set original_type field.
17685         (parser_build_unary_op): Likewise.
17686         (parser_build_binary_op): Likewise.  Optionally warn about
17687         comparisons of enums of different types.
17688         (digest_init): Set original_type field.
17689         (really_start_incremental_init): Likewise.
17690         (push_init_level, pop_init_level): Likewise.
17691         * doc/invoke.texi (Warning Options): -Wenum-compare now
17692         supported in C.
17694 2009-04-15  Richard Guenther  <rguenther@suse.de>
17696         * tree-ssa-pre.c (eliminate): When replacing a PHI node carry
17697         out a necessary conversion.
17698         * tree-ssa-sccvn.c (run_scc_vn): Also assign value-ids to
17699         names we didn't value number.
17700         * tree-mudflap.c (mf_build_check_statement_for): Use correct types.
17702 2009-04-15  Richard Guenther  <rguenther@suse.de>
17704         PR tree-optimization/39764
17705         * tree-ssa-ccp.c (get_value): Canonicalize value with
17706         canonicalize_float_value.
17708 2009-04-15  Jan Hubicka  <jh@suse.cz>
17710         * builtins.def (va_start, va_end, va_copy): Fix my previous commit.
17711         Wrong version of patch.
17713 2009-04-15  Jan Hubicka  <jh@suse.cz>
17715         * builtins.def (va_start, va_end, va_copy): Mark nothrow.
17717 2009-04-15  Nathan Sidwell  <nathan@codesourcery.com>
17719         * config/rs6000/rs6000.c (rs6000_init_builtins): Set TYPE_NAME of
17720         our distinct integral and vector types.
17722 2009-04-15  Rafael Avila de Espindola  <espindola@google.com>
17724         * class.c (build_vtbl_ref_1): Remove call to assemble_external.
17725         * init.c (build_vtbl_address): Remove call to assemble_external.
17727 2009-04-14  Daniel Jacobowitz  <dan@codesourcery.com>
17729         * config/rs6000/rs6000.c (rs6000_dwarf_register_span): Fix debug
17730         output for other floating point modes.
17732 2009-04-14  Diego Novillo  <dnovillo@google.com>
17734         * diagnostic.c (diagnostic_report_diagnostic): Do not
17735         warn about loaded plugins for DK_ERROR and DK_WARNING.
17736         * c-decl.c (declspecs_add_type): Move call to
17737         invoke_plugin_callbacks ...
17738         * c-parser.c (c_parser_declspecs): ... here.
17739         * plugin.c (dump_active_plugins): Tidy output.
17741 2009-04-14  Diego Novillo  <dnovillo@google.com>
17742             Le-Chun Wu  <lcwu@google.com>
17744         * configure.ac: Add --enable-plugin support.
17745         Define ENABLE_PLUGIN and PLUGINLIBS when specified.
17746         * Makefile.in (PLUGIN_H): Define.
17747         Export ENABLE_PLUGIN and GMPINC to site.exp.
17748         Add PLUGINLIBS to link command.
17749         Add/modify dependencies for plugin.o and files including plugin.h.
17750         (plugin.o): New.
17751         * config.in: Regenerate.
17753         * opts.c (common_handle_option): Handle OPT_fplugin_ and
17754         OPT_fplugin_arg_.
17756 2009-04-14  Le-Chun Wu  <lcwu@google.com>
17758         * tree-pass.h (register_one_dump_file): Add a prototype for
17759         register_one_dump_file.
17760         * toplev.c (compile_file): Call initialize_plugins.
17761         (do_compile): Call invoke_plugin_callbacks.
17762         (toplev_main): Call invoke_plugin_callbacks.
17763         * common.opt: Add -fplugin= and -fplugin-arg-.
17764         * gcc-plugin.h: New public header file for plugins to include.
17765         * plugin.c: New source file.
17766         * plugin.h: New internal header file.
17767         * passes.c (register_one_dump_file): Make it external.
17769         * c-parser.c (c_parser_declspecs): Call invoke_plugin_callbacks.
17771 2009-04-14  Diego Novillo  <dnovillo@google.com>
17773         * doc/plugins.texi: New.
17774         * doc/gccint.texi: Add reference to Plugins chapter.
17775         * doc/invoke.texi: Document -fplugin and -fplugin-arg
17776         * diagnostic.c (diagnostic_report_diagnostic): Warn about
17777         loaded plugins, if any.
17778         * timevar.def (TV_PLUGIN_INIT): Define.
17779         (TV_PLUGIN_RUN): Define.
17780         * plugin.c: Include timevar.h
17781         (plugins_active_p): New.
17782         (dump_active_plugins): New.
17783         (debug_active_plugins): New.
17785 2009-04-14  Joseph Myers  <joseph@codesourcery.com>
17787         * config/sol2.h (LINK_ARCH32_SPEC_BASE): Use %R with absolute
17788         library paths.
17789         * config/sparc/sol2-bi.h (LINK_ARCH64_SPEC_BASE): Likewise.
17791 2009-04-14  Kazu Hirata  <kazu@codesourcery.com>
17793         * config/arm/arm.c (arm_rtx_costs_1): Treat a minus with a shift
17794         the same as a minus without a shift.
17796 2009-04-14  Nick Clifton  <nickc@redhat.com>
17798         * config/stormy16/stormy16.md (ineqbranch_1): Do not assume that
17799         comparisons with small integers will always produce a short
17800         branch.
17802 2009-04-14  Rafael Avila de Espindola  <espindola@google.com>
17804         Merge:
17805         2008-12-19  Diego Novillo  <dnovillo@google.com>
17807         * cgraph.c (dump_cgraph_node): Show memory address of NODE.
17809 2009-04-14  Richard Guenther  <rguenther@suse.de>
17811         * tree-cfg.c (verify_gimple_assign_unary): Adjust vector code
17812         verification.
17813         (verify_gimple_assign_binary): Likewise.  Handle shifts and
17814         rotates correctly.
17815         (verify_gimple_phi): Print the mismatched argument position.
17816         * tree-vect-loop-manip.c (vect_update_ivs_after_vectorizer):
17817         Fix types.
17818         (vect_update_init_of_dr): Likewise.
17819         * matrix-reorg.c (transform_access_sites): Do what the
17820         comment suggests.
17821         * omp-low.c (expand_omp_atomic_pipeline): Use the correct types.
17823 2009-04-13  Michael Eager  <eager@eagercon.com>
17825         * config/rs6000/rs6000-c.c: generate defines if rs6000_xilinx_fpu:
17826         _XFPU, _XFPU_SP_LITE, _XFPU_SP_FULL, _XFPU_DP_LITE, _XFPU_DP_FULL
17827         * config/rs6000/xilinx.h: New.  Spec for powerpc-xilinx-eabi
17828         * config.gcc (powerpc-xilinx-eabi): add xilinx.h to tm_file,
17829         remove duplicate config
17831 2009-04-13  Dwarakanath Rajagopal  <dwarak.rajagopal@amd.com>
17833         * ipa-inline.c (cgraph_decide_inlining_of_small_function): Dump
17834         file_name:line_number type locator of the call site.
17836 2009-04-13  Vladimir Makarov  <vmakarov@redhat.com>
17838         * genautomata.c: Put blank after comma.
17839         (automaton_decls): New.
17840         (struct unit_usage): Add comments to member next.
17841         (store_alt_unit_usage): Keep the list ordered.
17842         (unit_present_on_list_p, equal_alternatives_p): New.
17843         (check_regexp_units_distribution): Check units distribution
17844         correctness correctly.
17845         (main): Don't write automata if error is found.  Return correct
17846         exit code.
17848         * config/m68k/cf.md (cfv4_ds): Remove.
17849         (cfv4_pOEP1, cfv4_sOEP1, cfv4_pOEP2,cfv4_sOEP2, cfv4_pOEP3,
17850         cfv4_sOEP3): Assign to cfv4_oep instead of cfv4_ds.
17852         * config/rs6000/power4.md (lsuq_power4, iq_power4, fpq_power4,
17853         power4-load-ext, power4-store, power4-store-update,
17854         power4-fpstore, power4-fpstore-update, power4-two, power4-three,
17855         power4-insert, power4-compare, power4-lmul-cmp, power4-imul-cmp,
17856         power4-lmul, , power4-imul, power4-imul3, power4-sdiv,
17857         power4-sqrt, power4-isync): Modify reservation to make correct
17858         unit distribution to automata.
17860         * config/rs6000/power5.md (iq_power5, fpq_power5, power5-store,
17861         power5-store-update, power5-two, power5-three, power5-lmul,
17862         power5-imul, power5-imul3, power5-sdiv, power5-sqrt): Ditto.
17864 2009-04-13  Adam Nemet  <anemet@caviumnetworks.com>
17866         * except.c (pass_set_nothrow_function_flags): Set name and add
17867         TODO_dump_func.
17868         (set_nothrow_function_flags): Mention in the dump file when
17869         changing a function to nothrow.
17871 2009-04-13  Ozkan Sezer  <sezeroz@gmail.com>
17873         PR/39066
17874         * gbl-ctors.h (DO_GLOBAL_CTORS_BODY): Use __SIZE_TYPE__
17875         instead of unsigned long.
17877 2009-04-13  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
17879         * config/arm/arm.c (return_used_this_function): Remove.
17880         (arm_output_function_prologue): Remove use of
17881         return_used_this_function.
17882         (output_return_instruction): Replace use of
17883         return_used_this_function
17884         by cfun->machine->return_used_this_function.
17885         (arm_output_epilogue): Likewise.
17886         (arm_output_function_epilogue): Likewise.
17887         (thumb_unexpanded_epilogue): Likewise.
17888         * config/arm/arm.h (struct machine_function):
17889         New member return_used_this_function.
17891 2009-04-12  Mark Mitchell  <mark@codesourcery.com>
17893         * doc/install.texi: Correct description of default directory for
17894         --with-gxx-include-dir.
17896 2009-04-12  Eric Botcazou  <ebotcazou@adacore.com>
17898         * fold-const.c (build_range_check): Properly deal with enumeral and
17899         boolean base types.
17901 2009-04-12  Steven Bosscher  <steven@gcc.gnu.org>
17903         * doc/invoke.texi (max_gcse_passes): Remove documentation.
17904         * params.def (PARAM_MAX_GCSE_PASSES): Remove.
17905         * params.h (MAX_GCSE_PASSES): Remove.
17906         * gcse.c (gcse_main): Run CPROP1, PRE or HOIST, and CPROP2
17907         in sequence.  Remove ability to run multiple passes.
17908         (bypass_jumps): Report run as third CPROP pass.
17910 2009-04-12  Adam Nemet  <anemet@caviumnetworks.com>
17912         PR middle-end/39651
17913         * except.c (can_throw_external): Look at each insn in a SEQUENCE
17914         when deciding whether the whole SEQUENCE can throw.
17916 2009-04-12  Uros Bizjak  <ubizjak@gmail.com>
17918         PR target/39740
17919         * config/alpha/predicates.md (local_symbolic_operand): Return 1 for
17920         offseted label references.
17922 2009-04-11  Jan Hubicka  <jh@suse.cz>
17924         * tree-ssa-pre.c (eliminate): Fix call of update_stmt.
17926 2009-04-11  Richard Guenther  <rguenther@suse.de>
17928         PR middle-end/39732
17929         * tree-inline.c (declare_return_variable): Mark DECL_BY_REFERENCE
17930         return variables as TREE_ADDRESSABLE.
17932 2009-04-11  Richard Guenther  <rguenther@suse.de>
17934         PR tree-optimization/39713
17935         * tree-ssa-sccvn.c (vn_get_expr_for): Make sure built
17936         reference trees have SSA_NAME operands.
17938 2009-04-11  Richard Guenther  <rguenther@suse.de>
17940         PR c/39712
17941         * c-gimplify.c (c_gimplify_expr): Adjust check for mismatched
17942         address expressions.
17944 2009-04-11  Dave Korn  <dave.korn.cygwin@gmail.com>
17946         * config/i386/cygwin-stdint.h (INT_LEAST32_TYPE):  Update to
17947         match changes in Cygwin 1.7
17948         (UINT_LEAST32_TYPE, INT_FAST16_TYPE, INT_FAST32_TYPE,
17949         UINT_FAST16_TYPE, UINT_FAST32_TYPE):  Likewise.
17951 2009-04-10  Paolo Bonzini  <bonzini@gnu.org>
17953         PR tree-optimization/39701
17954         * doc/invoke.texi (Optimization Options): Document change in
17955         meaning and initialization of -fdelete-null-pointer-checks.
17957 2009-04-10  H.J. Lu  <hongjiu.lu@intel.com>
17959         PR middle-end/39701
17960         * common.opt (-fdelete-null-pointer-checks): Initialize to 1.
17962         * opts.c (decode_options): Don't set flag_delete_null_pointer_checks
17963         here.
17965         * doc/invoke.texi: Update -fdelete-null-pointer-checks.
17967 2009-04-10  Chao-ying Fu  <fu@mips.com>
17969         * doc/tm.texi (Instruction Output): Document
17970         TARGET_ASM_FINAL_POSTSCAN_INSN.
17971         * target.h (final_postscan_insn): New field in asm_out.
17972         * target-def.h (TARGET_ASM_FINAL_POSTSCAN_INSN): New define.
17973         (TARGET_ASM_OUT): Add TARGET_ASM_FINAL_POSTSCAN_INSN.
17974         * final.c (final_scan_insn): Call
17975         targetm.asm_out.final_postscan_insn after outputting
17976         an asm macro and a normal instruction.
17978         * config/mips/mips.h (FINAL_PRESCAN_INSN): New define.
17979         * config/mips/mips-protos.h (mips_final_prescan_insn): Declare.
17980         * config/mips/mips.c (mips_at_reg_p): New for_each_rtx callback.
17981         (mips_final_prescan_insn, mips_final_postscan_insn): New functions.
17982         (TARGET_ASM_FINAL_POSTSCAN_INSN): New define.
17984 2009-04-10  Paolo Bonzini  <bonzini@gnu.org>
17986         PR middle-end/39701
17987         * fold-const.c (tree_single_nonzero_warnv_p): Pass non-static
17988         variables as non-NULL even with -fdelete-null-pointer-checks.
17990 2009-04-10  H.J. Lu  <hongjiu.lu@intel.com>
17992         * config/rs6000/darwin-vecsave.asm: Remove extra "*/".
17994 2009-04-09  H.J. Lu  <hongjiu.lu@intel.com>
17996         PR target/39678
17997         * config/i386/i386.c (classify_argument): Handle SCmode with
17998         (bit_offset % 64) != 0.
18000 2009-04-09  Sandra Loosemore  <sandra@codesourcery.com>
18002         * doc/invoke.texi (Optimize Options): Add cross-reference to
18003         -Q --help=optimizers examples.
18005 2009-04-10  Ben Elliston  <bje@au.ibm.com>
18007         PR target/36800
18008         * config/rs6000/rs6000.c (rs6000_gimplify_va_arg): Do not set
18009         regalign for the reg == fpr and TDmode case.
18011 2009-04-09  David Ayers  <ayers@fsfe.org>
18013         PR objc/29200
18014         * objc/objc-act.c (warn_with_method): Remove helper function.
18015         (check_duplicates): Call warning and inform directly.
18016         (really_start_method): Likewise.
18018 2009-04-09  Paolo Bonzini  <bonzini@gnu.org>
18020         * expmed.c (expand_divmod): Always use a comparison for a division
18021         by a large unsigned integer.
18023         * fold-const.c (tree_single_nonzero_warnv_p): Always treat decls
18024         for things others than variables or functions as nonzero.
18026 2009-04-09  Nick Clifton  <nickc@redhat.com>
18028         * unwind-compat.c: Change copyright header to refer to version
18029         3 of the GNU General Public License with version 3.1 of the
18030         GCC Runtime Library Exception and to point readers at the
18031         COPYING3 and COPYING3.RUNTIME files and the FSF's license web page.
18032         * config/alpha/crtfastmath.c: Likewise.
18033         * config/alpha/linux-unwind.h: Likewise.
18034         * config/alpha/qrnnd.asm: Likewise.
18035         * config/alpha/vms-crt0-64.c: Likewise.
18036         * config/alpha/vms-crt0.c: Likewise.
18037         * config/alpha/vms-dwarf2.asm: Likewise.
18038         * config/alpha/vms-dwarf2eh.asm: Likewise.
18039         * config/alpha/vms-psxcrt0-64.c: Likewise.
18040         * config/alpha/vms-psxcrt0.c: Likewise.
18041         * config/alpha/vms_tramp.asm: Likewise.
18042         * config/arc/initfini.c: Likewise.
18043         * config/arc/lib1funcs.asm: Likewise.
18044         * config/arm/bpabi-v6m.S: Likewise.
18045         * config/arm/bpabi.S: Likewise.
18046         * config/arm/bpabi.c: Likewise.
18047         * config/arm/crti.asm: Likewise.
18048         * config/arm/crtn.asm: Likewise.
18049         * config/arm/ieee754-df.S: Likewise.
18050         * config/arm/ieee754-sf.S: Likewise.
18051         * config/arm/lib1funcs.asm: Likewise.
18052         * config/arm/libunwind.S: Likewise.
18053         * config/arm/linux-atomic.c: Likewise.
18054         * config/arm/mmintrin.h: Likewise.
18055         * config/arm/pr-support.c: Likewise.
18056         * config/arm/unaligned-funcs.c: Likewise.
18057         * config/arm/unwind-arm.c: Likewise.
18058         * config/arm/unwind-arm.h: Likewise.
18059         * config/avr/libgcc.S: Likewise.
18060         * config/bfin/crti.s: Likewise.
18061         * config/bfin/crtlibid.s: Likewise.
18062         * config/bfin/crtn.s: Likewise.
18063         * config/bfin/lib1funcs.asm: Likewise.
18064         * config/bfin/linux-unwind.h: Likewise.
18065         * config/cris/arit.c: Likewise.
18066         * config/cris/cris_abi_symbol.c: Likewise.
18067         * config/darwin-64.c: Likewise.
18068         * config/darwin-crt2.c: Likewise.
18069         * config/darwin-crt3.c: Likewise.
18070         * config/darwin.h: Likewise.
18071         * config/dbxelf.h: Likewise.
18072         * config/dfp-bit.c: Likewise.
18073         * config/dfp-bit.h: Likewise.
18074         * config/elfos.h: Likewise.
18075         * config/fixed-bit.c: Likewise.
18076         * config/fixed-bit.h: Likewise.
18077         * config/fp-bit.c: Likewise.
18078         * config/fp-bit.h: Likewise.
18079         * config/fr30/crti.asm: Likewise.
18080         * config/fr30/crtn.asm: Likewise.
18081         * config/fr30/lib1funcs.asm: Likewise.
18082         * config/freebsd-spec.h: Likewise.
18083         * config/frv/cmovd.c: Likewise.
18084         * config/frv/cmovh.c: Likewise.
18085         * config/frv/cmovw.c: Likewise.
18086         * config/frv/frvbegin.c: Likewise.
18087         * config/frv/frvend.c: Likewise.
18088         * config/frv/lib1funcs.asm: Likewise.
18089         * config/glibc-stdint.h: Likewise.
18090         * config/h8300/clzhi2.c: Likewise.
18091         * config/h8300/crti.asm: Likewise.
18092         * config/h8300/crtn.asm: Likewise.
18093         * config/h8300/ctzhi2.c: Likewise.
18094         * config/h8300/fixunssfsi.c: Likewise.
18095         * config/h8300/lib1funcs.asm: Likewise.
18096         * config/h8300/parityhi2.c: Likewise.
18097         * config/h8300/popcounthi2.c: Likewise.
18098         * config/i386/ammintrin.h: Likewise.
18099         * config/i386/att.h: Likewise.
18100         * config/i386/avxintrin.h: Likewise.
18101         * config/i386/biarch64.h: Likewise.
18102         * config/i386/bmmintrin.h: Likewise.
18103         * config/i386/cpuid.h: Likewise.
18104         * config/i386/cross-stdarg.h: Likewise.
18105         * config/i386/crtfastmath.c: Likewise.
18106         * config/i386/crtprec.c: Likewise.
18107         * config/i386/cygming-crtbegin.c: Likewise.
18108         * config/i386/cygming-crtend.c: Likewise.
18109         * config/i386/cygwin.asm: Likewise.
18110         * config/i386/emmintrin.h: Likewise.
18111         * config/i386/gmm_malloc.h: Likewise.
18112         * config/i386/gthr-win32.c: Likewise.
18113         * config/i386/i386.h: Likewise.
18114         * config/i386/immintrin.h: Likewise.
18115         * config/i386/linux-unwind.h: Likewise.
18116         * config/i386/linux64.h: Likewise.
18117         * config/i386/mm3dnow.h: Likewise.
18118         * config/i386/mmintrin-common.h: Likewise.
18119         * config/i386/mmintrin.h: Likewise.
18120         * config/i386/nmmintrin.h: Likewise.
18121         * config/i386/pmm_malloc.h: Likewise.
18122         * config/i386/pmmintrin.h: Likewise.
18123         * config/i386/smmintrin.h: Likewise.
18124         * config/i386/sol2-c1.asm: Likewise.
18125         * config/i386/sol2-ci.asm: Likewise.
18126         * config/i386/sol2-cn.asm: Likewise.
18127         * config/i386/sol2-gc1.asm: Likewise.
18128         * config/i386/tmmintrin.h: Likewise.
18129         * config/i386/unix.h: Likewise.
18130         * config/i386/w32-unwind.h: Likewise.
18131         * config/i386/wmmintrin.h: Likewise.
18132         * config/i386/x86-64.h: Likewise.
18133         * config/i386/x86intrin.h: Likewise.
18134         * config/i386/xmmintrin.h: Likewise.
18135         * config/ia64/crtbegin.asm: Likewise.
18136         * config/ia64/crtend.asm: Likewise.
18137         * config/ia64/crtfastmath.c: Likewise.
18138         * config/ia64/crti.asm: Likewise.
18139         * config/ia64/crtn.asm: Likewise.
18140         * config/ia64/fde-glibc.c: Likewise.
18141         * config/ia64/lib1funcs.asm: Likewise.
18142         * config/ia64/linux-unwind.h: Likewise.
18143         * config/ia64/quadlib.c: Likewise.
18144         * config/ia64/unwind-ia64.c: Likewise.
18145         * config/linux.h: Likewise.
18146         * config/m32c/m32c-lib1.S: Likewise.
18147         * config/m32c/m32c-lib2-trapv.c: Likewise.
18148         * config/m32c/m32c-lib2.c: Likewise.
18149         * config/m32r/initfini.c: Likewise.
18150         * config/m68hc11/larith.asm: Likewise.
18151         * config/m68hc11/m68hc11-crt0.S: Likewise.
18152         * config/m68k/cf.md: Likewise.
18153         * config/m68k/crti.s: Likewise.
18154         * config/m68k/crtn.s: Likewise.
18155         * config/m68k/lb1sf68.asm: Likewise.
18156         * config/m68k/linux-unwind.h: Likewise.
18157         * config/mcore/crti.asm: Likewise.
18158         * config/mcore/crtn.asm: Likewise.
18159         * config/mcore/lib1.asm: Likewise.
18160         * config/mips/linux-unwind.h: Likewise.
18161         * config/mips/loongson.h: Likewise.
18162         * config/mips/mips16.S: Likewise.
18163         * config/mmix/crti.asm: Likewise.
18164         * config/mmix/crtn.asm: Likewise.
18165         * config/pa/fptr.c: Likewise.
18166         * config/pa/hpux-unwind.h: Likewise.
18167         * config/pa/lib2funcs.asm: Likewise.
18168         * config/pa/linux-atomic.c: Likewise.
18169         * config/pa/linux-unwind.h: Likewise.
18170         * config/pa/milli64.S: Likewise.
18171         * config/pa/quadlib.c: Likewise.
18172         * config/pa/stublib.c: Likewise.
18173         * config/picochip/libgccExtras/adddi3.asm: Likewise.
18174         * config/picochip/libgccExtras/ashlsi3.asm: Likewise.
18175         * config/picochip/libgccExtras/ashlsi3.c: Likewise.
18176         * config/picochip/libgccExtras/ashrsi3.asm: Likewise.
18177         * config/picochip/libgccExtras/ashrsi3.c: Likewise.
18178         * config/picochip/libgccExtras/cmpsi2.asm: Likewise.
18179         * config/picochip/libgccExtras/divmod15.asm: Likewise.
18180         * config/picochip/libgccExtras/divmodhi4.asm: Likewise.
18181         * config/picochip/libgccExtras/divmodsi4.asm: Likewise.
18182         * config/picochip/libgccExtras/longjmp.asm: Likewise.
18183         * config/picochip/libgccExtras/lshrsi3.asm: Likewise.
18184         * config/picochip/libgccExtras/lshrsi3.c: Likewise.
18185         * config/picochip/libgccExtras/parityhi2.asm: Likewise.
18186         * config/picochip/libgccExtras/popcounthi2.asm: Likewise.
18187         * config/picochip/libgccExtras/setjmp.asm: Likewise.
18188         * config/picochip/libgccExtras/subdi3.asm: Likewise.
18189         * config/picochip/libgccExtras/ucmpsi2.asm: Likewise.
18190         * config/picochip/libgccExtras/udivmodhi4.asm: Likewise.
18191         * config/picochip/libgccExtras/udivmodsi4.asm: Likewise.
18192         * config/rs6000/750cl.h: Likewise.
18193         * config/rs6000/altivec.h: Likewise.
18194         * config/rs6000/biarch64.h: Likewise.
18195         * config/rs6000/crtresfpr.asm: Likewise.
18196         * config/rs6000/crtresgpr.asm: Likewise.
18197         * config/rs6000/crtresxfpr.asm: Likewise.
18198         * config/rs6000/crtresxgpr.asm: Likewise.
18199         * config/rs6000/crtsavfpr.asm: Likewise.
18200         * config/rs6000/crtsavgpr.asm: Likewise.
18201         * config/rs6000/darwin-asm.h: Likewise.
18202         * config/rs6000/darwin-fallback.c: Likewise.
18203         * config/rs6000/darwin-fpsave.asm: Likewise.
18204         * config/rs6000/darwin-ldouble.c: Likewise.
18205         * config/rs6000/darwin-tramp.asm: Likewise.
18206         * config/rs6000/darwin-unwind.h: Likewise.
18207         * config/rs6000/darwin-vecsave.asm: Likewise.
18208         * config/rs6000/darwin-world.asm: Likewise.
18209         * config/rs6000/e500crtres32gpr.asm: Likewise.
18210         * config/rs6000/e500crtres64gpr.asm: Likewise.
18211         * config/rs6000/e500crtres64gprctr.asm: Likewise.
18212         * config/rs6000/e500crtrest32gpr.asm: Likewise.
18213         * config/rs6000/e500crtrest64gpr.asm: Likewise.
18214         * config/rs6000/e500crtresx32gpr.asm: Likewise.
18215         * config/rs6000/e500crtresx64gpr.asm: Likewise.
18216         * config/rs6000/e500crtsav32gpr.asm: Likewise.
18217         * config/rs6000/e500crtsav64gpr.asm: Likewise.
18218         * config/rs6000/e500crtsav64gprctr.asm: Likewise.
18219         * config/rs6000/e500crtsavg32gpr.asm: Likewise.
18220         * config/rs6000/e500crtsavg64gpr.asm: Likewise.
18221         * config/rs6000/e500crtsavg64gprctr.asm: Likewise.
18222         * config/rs6000/eabi-ci.asm: Likewise.
18223         * config/rs6000/eabi-cn.asm: Likewise.
18224         * config/rs6000/eabi.asm: Likewise.
18225         * config/rs6000/linux-unwind.h: Likewise.
18226         * config/rs6000/linux64.h: Likewise.
18227         * config/rs6000/paired.h: Likewise.
18228         * config/rs6000/paired.md: Likewise.
18229         * config/rs6000/ppc64-fp.c: Likewise.
18230         * config/rs6000/ppu_intrinsics.h: Likewise.
18231         * config/rs6000/rs6000.h: Likewise.
18232         * config/rs6000/si2vmx.h: Likewise.
18233         * config/rs6000/sol-ci.asm: Likewise.
18234         * config/rs6000/sol-cn.asm: Likewise.
18235         * config/rs6000/spe.h: Likewise.
18236         * config/rs6000/spu2vmx.h: Likewise.
18237         * config/rs6000/sysv4.h: Likewise.
18238         * config/rs6000/tramp.asm: Likewise.
18239         * config/rs6000/vec_types.h: Likewise.
18240         * config/s390/linux-unwind.h: Likewise.
18241         * config/s390/tpf-unwind.h: Likewise.
18242         * config/score/crti.asm: Likewise.
18243         * config/score/crtn.asm: Likewise.
18244         * config/sh/crt1.asm: Likewise.
18245         * config/sh/crti.asm: Likewise.
18246         * config/sh/crtn.asm: Likewise.
18247         * config/sh/divtab-sh4-300.c: Likewise.
18248         * config/sh/divtab-sh4.c: Likewise.
18249         * config/sh/divtab.c: Likewise.
18250         * config/sh/lib1funcs-4-300.asm: Likewise.
18251         * config/sh/lib1funcs-Os-4-200.asm: Likewise.
18252         * config/sh/lib1funcs.asm: Likewise.
18253         * config/sh/lib1funcs.h: Likewise.
18254         * config/sh/linux-atomic.asm: Likewise.
18255         * config/sh/linux-unwind.h: Likewise.
18256         * config/sh/shmedia.h: Likewise.
18257         * config/sh/sshmedia.h: Likewise.
18258         * config/sh/ushmedia.h: Likewise.
18259         * config/sparc/crtfastmath.c: Likewise.
18260         * config/sparc/linux-unwind.h: Likewise.
18261         * config/sparc/sol2-c1.asm: Likewise.
18262         * config/sparc/sol2-ci.asm: Likewise.
18263         * config/sparc/sol2-cn.asm: Likewise.
18264         * config/spu/divmodti4.c: Likewise.
18265         * config/spu/divv2df3.c: Likewise.
18266         * config/spu/float_disf.c: Likewise.
18267         * config/spu/float_unsdidf.c: Likewise.
18268         * config/spu/float_unsdisf.c: Likewise.
18269         * config/spu/float_unssidf.c: Likewise.
18270         * config/spu/mfc_multi_tag_release.c: Likewise.
18271         * config/spu/mfc_multi_tag_reserve.c: Likewise.
18272         * config/spu/mfc_tag_release.c: Likewise.
18273         * config/spu/mfc_tag_reserve.c: Likewise.
18274         * config/spu/mfc_tag_table.c: Likewise.
18275         * config/spu/multi3.c: Likewise.
18276         * config/spu/spu_internals.h: Likewise.
18277         * config/spu/spu_intrinsics.h: Likewise.
18278         * config/spu/spu_mfcio.h: Likewise.
18279         * config/spu/vec_types.h: Likewise.
18280         * config/spu/vmx2spu.h: Likewise.
18281         * config/stormy16/stormy16-lib2.c: Likewise.
18282         * config/svr4.h: Likewise.
18283         * config/sync.c: Likewise.
18284         * config/v850/lib1funcs.asm: Likewise.
18285         * config/vxlib-tls.c: Likewise.
18286         * config/vxlib.c: Likewise.
18287         * config/vxworks-dummy.h: Likewise.
18288         * config/xtensa/crti.asm: Likewise.
18289         * config/xtensa/crtn.asm: Likewise.
18290         * config/xtensa/ieee754-df.S: Likewise.
18291         * config/xtensa/ieee754-sf.S: Likewise.
18292         * config/xtensa/lib1funcs.asm: Likewise.
18293         * config/xtensa/lib2funcs.S: Likewise.
18294         * config/xtensa/linux-unwind.h: Likewise.
18295         * config/xtensa/unwind-dw2-xtensa.c: Likewise.
18296         * config/xtensa/unwind-dw2-xtensa.h: Likewise.
18297         * coretypes.h: Likewise.
18298         * crtstuff.c: Likewise.
18299         * defaults.h: Likewise.
18300         * dwarf2.h: Likewise.
18301         * emutls.c: Likewise.
18302         * gbl-ctors.h: Likewise.
18303         * gcov-io.h: Likewise.
18304         * ginclude/float.h: Likewise.
18305         * ginclude/iso646.h: Likewise.
18306         * ginclude/stdarg.h: Likewise.
18307         * ginclude/stdbool.h: Likewise.
18308         * ginclude/stddef.h: Likewise.
18309         * ginclude/stdfix.h: Likewise.
18310         * ginclude/stdint-gcc.h: Likewise.
18311         * ginclude/tgmath.h: Likewise.
18312         * gthr-aix.h: Likewise.
18313         * gthr-dce.h: Likewise.
18314         * gthr-gnat.c: Likewise.
18315         * gthr-gnat.h: Likewise.
18316         * gthr-lynx.h: Likewise.
18317         * gthr-mipssde.h: Likewise.
18318         * gthr-nks.h: Likewise.
18319         * gthr-posix.c: Likewise.
18320         * gthr-posix.h: Likewise.
18321         * gthr-posix95.h: Likewise.
18322         * gthr-rtems.h: Likewise.
18323         * gthr-single.h: Likewise.
18324         * gthr-solaris.h: Likewise.
18325         * gthr-tpf.h: Likewise.
18326         * gthr-vxworks.h: Likewise.
18327         * gthr-win32.h: Likewise.
18328         * gthr.h: Likewise.
18329         * libgcc2.c: Likewise.
18330         * libgcc2.h: Likewise.
18331         * libgcov.c: Likewise.
18332         * tsystem.h: Likewise.
18333         * typeclass.h: Likewise.
18334         * unwind-c.c: Likewise.
18335         * unwind-compat.h: Likewise.
18336         * unwind-dw2-fde-compat.c: Likewise.
18337         * unwind-dw2-fde-darwin.c: Likewise.
18338         * unwind-dw2-fde-glibc.c: Likewise.
18339         * unwind-dw2-fde.c: Likewise.
18340         * unwind-dw2-fde.h: Likewise.
18341         * unwind-dw2.c: Likewise.
18342         * unwind-dw2.h: Likewise.
18343         * unwind-generic.h: Likewise.
18344         * unwind-pe.h: Likewise.
18345         * unwind-sjlj.c: Likewise.
18346         * unwind.inc: Likewise.
18347         * config/arm/neon-gen.ml: Change generated copyright header to
18348         refer to version 3 of the GNU General Public License with
18349         version 3.1 of the GCC Runtime Library Exception and to point
18350         readers at the COPYING3 and COPYING3.RUNTIME files and the
18351         FSF's license web page.
18352         * config/arm/arm_neon.h: Regenerate.
18354 2009-04-09  Jakub Jelinek  <jakub@redhat.com>
18356         * config/cris/cris.md: Change copyright header to refer to version
18357         3 of the GNU General Public License.
18358         * doc/install.texi2html: Change copyright header to refer to version
18359         3 of the GNU General Public License and to point readers at the
18360         COPYING3 file and the FSF's license web page.
18361         * config/vax/linux.h: Likewise.
18363 2009-04-09  Paolo Bonzini  <bonzini@gnu.org>
18365         * config/i386/i386.md (cmpcc): New.
18366         * config/i386/sync.md (sync_compare_and_swap*): Set FLAGS_REG.
18367         (sync_compare_and_swap_cc*): Delete.
18369         * config/s390/s390.c (s390_compare_emitted): Remove.
18370         (s390_emit_compare): Handle MODE_CC s390_compare_op0 like
18371         s390_compare_emitted used to be handled.  Assert that modes match.
18372         (s390_emit_compare_and_swap): Use s390_emit_compare, do not
18373         refer to sync_compare_and_swap_ccsi.
18374         * config/s390/s390.h (s390_compare_emitted): Remove.
18375         * config/s390/s390.md (seq): Look for MODE_CC s390_compare_op0
18376         instead of s390_compare_emitted.
18377         (stack_protect_test, sync_compare_and_swap_cc): Set s390_compare_op0
18378         instead of s390_compare_emitted.
18379         * config/s390/s390.md (cmpcc): New.
18380         (sync_compare_and_swapqi, sync_compare_and_swaphi): Clobber
18381         CC_REGNUM, do not pretend it's set.
18382         (sync_compare_and_swap_cc*): Delete.
18383         * config/s390/predicates.md (cc_reg_operand): New.
18385         * expr.c (sync_compare_and_swap_cc): Delete.
18386         * optabs.h (sync_compare_and_swap_cc): Delete.
18387         * optabs.c (prepare_cmp_insn): Ignore which specific CCmode
18388         is being used with can_compare_p.
18389         (emit_cmp_and_jump_insn_1): Likewise when looking in the optab.
18390         (find_cc_set): New.
18391         (expand_bool_compare_and_swap): Do not use sync_compare_and_swap_cc,
18392         look for a MODE_CC set instead.  Use emit_store_flag.
18393         (expand_compare_and_swap_loop): Likewise, with some additional
18394         complication to avoid a force_reg when useless.  Use
18395         emit_cmp_and_jump_insns.
18396         * genopinit.c (optabs): Delete sync_compare_and_swap_cc.
18397         * doc/md.texi (sync_compare_and_swap_cc): Merge with
18398         sync_compare_and_swap documentation.
18400 2009-04-09  Jan Hubicka  <jh@suse.cz>
18402         * except.c (find_prev_try): Break out from ....
18403         (duplicate_eh_regions): ... here; properly update prev_try pointers
18404         when duplication part of tree.
18405         (dump_eh_tree): Improve dumping.
18406         (verify_eh_region): New.
18407         (verify_eh_tree): Use it.
18409 2009-04-06  Richard Guenther  <rguenther@suse.de>
18411         * c-gimplify.c (c_gimplify_expr): Fix the invalid GENERIC
18412         &ARRAY addresses by adjusting their types and prepending
18413         a conversion.
18414         * tree-cfg.c (verify_gimple_assign_single): Verify that
18415         addresses are correct.
18417 2009-04-09  Richard Guenther  <rguenther@suse.de>
18419         * tree-ssa-ccp.c (maybe_fold_stmt_addition): Move non-constant
18420         indices into an array reference if possible.
18421         * tree-ssa-forwprop.c (tree_ssa_forward_propagate_single_use_vars):
18422         Fold POINTER_PLUS_EXPR statements with invariant address.
18424 2009-04-09  Alan Modra  <amodra@bigpond.net.au>
18426         PR target/39634
18427         * config.gcc (powerpc64-*-linux*): Always build biarch.
18429 2009-04-09  Joseph Myers  <joseph@codesourcery.com>
18431         PR c/39613
18432         * c-typeck.c (do_case): If case label is not an INTEGER_CST, fold
18433         it and pedwarn if this results in an INTEGER_CST.
18435 2009-04-08  Kaveh R. Ghazi  <ghazi@caip.rutgers.edu>
18437         * doc/install.texi: Update minimum GMP version.  Remove obsolete
18438         text in MPFR section.
18440 2009-04-08  Jakub Jelinek  <jakub@redhat.com>
18442         * dwarf2out.c (class_scope_p): New static inline.
18443         (class_or_namespace_scope_p): Use it.
18444         (gen_variable_die): Use DW_TAG_member tag for static data member
18445         declarations instead of DW_TAG_variable.
18447         PR middle-end/39573
18448         * omp-low.c (expand_omp_taskreg): Finalize taskreg static local_decls
18449         variables.
18451 2009-04-08  Richard Guenther  <rguenther@suse.de>
18453         * tree-ssa-sccvn.c (valueize_refs): Do not continue to
18454         valueize random data.
18456 2009-04-08  David Edelsohn  <edelsohn@gnu.org>
18458         * config.gcc (aix tm_file):  Add aix-stdint.h.
18459         (aix tm clause use_gcc_stdint):  Set to wrap.
18460         * config/rs6000/aix-stdint.h:  New file.
18462 2009-04-08  Richard Guenther  <rguenther@suse.de>
18464         PR middle-end/36291
18465         * tree-dfa.c (add_referenced_var): Do not recurse into
18466         global initializers.
18467         * tree-ssa-ccp.c (get_symbol_constant_value): Add newly
18468         exposed variables.
18469         (fold_const_aggregate_ref): Likewise.
18471 2009-04-08  Paolo Bonzini  <bonzini@gnu.org>
18473         * recog.c (ordered_comparison_operator): New.
18474         * gensupport.c (std_preds): Add it.
18475         * doc/md.texi (Machine-Independent Predicates): Document it.
18477 2009-04-08  Jan Hubicka  <jh@suse.cz>
18479         * tree-eh.c (cleanup_eh): When not optimizing, do not try EH merging.
18480         * function.h (rtl_eh): Remove exception_handler_label_map.
18481         * except.c (ehl_hash, ehl_eq, add_ehl_entry,
18482         remove_exception_handler_label, for_each_eh_label_1): Remove.
18483         (rtl_remove_unreachable_regions): Remove.
18484         (convert_from_eh_region_ranges): Do not remove unreachable regions.
18485         (find_exception_handler_labels): Don't build the hashtable.
18486         (maybe_remove_eh_handler): Remove.
18487         (for_each_eh_label): Rewrite to walk the tree.
18488         (rest_of_handle_eh): Do not cleanup cfg prior EH construction.
18489         * except.h (maybe_remove_eh_handler): Remove.
18490         * passes.c (init_optimization_passes): Schedule second EH cleanup
18491         before out-of-ssa.
18492         * cfgrtl.c (rtl_delete_block, rtl_merge_blocks,
18493         cfg_layout_merge_blocks): Do not call maybe_remove_eh_handler.
18495 2009-04-08  Paolo Bonzini  <bonzini@gnu.org>
18497         * genoutput.c (validate_optab_operands): New.
18498         (gen_insn, gen_expand): Call it.
18500         * genflags.c (gen_insn): Detect misused iterators.
18501         (main): Pass line_no to gen_insn, exit with status 1 on error.
18503         * genextract.c (line_no): Make global.
18504         (VEC_safe_set_locstr): Change assertion to error message.
18505         (main): Exit with status 1 on error.
18507 2009-04-08  Joseph Myers  <joseph@codesourcery.com>
18509         PR c/39614
18510         PR c/39673
18511         * c-common.h (C_MAYBE_CONST_EXPR_PRE, C_MAYBE_CONST_EXPR_EXPR,
18512         C_MAYBE_CONST_EXPR_INT_OPERANDS, C_MAYBE_CONST_EXPR_NON_CONST,
18513         EXPR_INT_CONST_OPERANDS): Remove duplicate definitions.
18514         * c-convert.c (convert): Do not call fold on results of conversion
18515         functions when the result is a C_MAYBE_CONST_EXPR.
18516         * c-parser.c (c_parser_postfix_expression): Do not fold condition
18517         of __builtin_choose_expr.
18518         * c-typeck.c (remove_c_maybe_const_expr): New.
18519         (build_unary_op, build_conditional_expr, build_compound_expr,
18520         build_binary_op, c_objc_common_truthvalue_conversion): Call
18521         remove_c_maybe_const_expr on any input C_MAYBE_CONST_EXPR with
18522         integer operands.
18524 2009-04-08  Bingfeng Mei  <bmei@broadcom.com>
18526         * fold-const.c (const_binop): Combine two VECTOR_CST under operation
18527         CODE to produce a new one. Add a prototype to use fold_convert_const
18529 2009-04-08  Danny Smith  <dannysmith@users.sourceforge.net>
18531         PR bootstrap/39660
18532         * config/i386/host-mingw32.c (mingw32_gt_pch_use_address): Don't
18533         mix declarations and code.
18535 2009-04-08  Ben Elliston  <bje@au.ibm.com>
18537         * gcc.c: Replace `CC' with `GCC' throughout.
18539 2009-04-07  H.J. Lu  <hongjiu.lu@intel.com>
18541         * doc/invoke.texi: Document Atom support.
18543 2009-04-07  Jason Merrill  <jason@redhat.com>
18545         PR c++/25185
18546         * c-common.h, c-common.c: Add flag_pretty_templates.
18547         * c-opts.c (c_common_handle_option): Set it.
18548         * c.opt: Add -fno-pretty-templates.
18549         * doc/invoke.texi (C++ Dialect Options): Likewise.
18551 2009-04-07  Uros Bizjak  <ubizjak@gmail.com>
18553         * config/ia64/ia64.c (ia64_builtins): Add IA64_BUILTIN_HUGE_VALQ.
18554         (ia64_init_builtins): Handle IA64_BUILTIN_HUGE_VALQ.
18555         (ia64_expand_builtin): Likewise.
18557 2009-04-07  Martin Jambor  <mjambor@suse.cz>
18559         * tree-ssa-alias.c (refs_may_alias_p_1): Check for
18560         is_gimple_min_invariant rather than CONSTANT_CLASS_P so that invariant
18561         ADDR_EXPRS are include too.
18563 2009-04-07  Richard Guenther  <rguenther@suse.de>
18565         * tree-ssa-alias.c (ref_maybe_used_by_call_p_1): Non-aliased
18566         decls are only used if passes as parameters or if they are
18567         local statics and the call is not to a builtin.
18568         (call_may_clobber_ref_p_1): Likewise.
18570 2009-04-07  Paolo Bonzini  <bonzini@gnu.org>
18572         * expr.c (do_store_flag): Remove last argument.  Simplify code
18573         to avoid duplication of tests already done by can_compare_p.
18574         (expand_expr_real_1): Adjust caller.
18576 2009-04-07  Paolo Bonzini  <bonzini@gnu.org>
18578         * optabs.c (can_compare_p): Test the predicate of a
18579         cbranch and cstore pattern.
18581 2009-04-07  Paolo Bonzini  <bonzini@gnu.org>
18583         * expr.c (convert_move): Use emit_store_flag instead of
18584         "emulating" it.
18586 2009-04-07  Paolo Bonzini  <bonzini@gnu.org>
18588         * config/i386/i386.c (ix86_compare_emitted): Remove.
18589         (ix86_expand_compare, ix86_expand_branch): Handle MODE_CC
18590         ix86_compare_op0 like ix86_compare_emitted used to be handled.
18591         * config/i386/i386.h (ix86_compare_emitted): Remove.
18592         * config/i386/i386.md (stack_protect_test): Set ix86_compare_op0
18593         instead of ix86_compare_emitted.
18594         * config/i386/sync.md (sync_compare_and_swap_cc): Likewise.
18596 2009-04-07  Andrew Stubbs  <ams@codesourcery.com>
18598         * config.gcc (sh-*-*): Add sysroot-suffix.h to tm_file.
18599         Add t-sysroot-suffix to tmake_file.
18600         * config/print-sysroot-suffix.sh: New file.
18601         * config/t-sysroot-suffix: New file.
18603 2009-04-07  Ben Elliston  <bje@au.ibm.com>
18605         * libgcc2.c (INFINITY): Use __builtin_huge_val, not __builtin_inf,
18606         as the latter produces a warning when the target does not support
18607         infinity.
18609 2009-04-07  Ben Elliston  <bje@au.ibm.com>
18611         * dfp.c: Replace type punning assignments with memcpy throughout.
18612         * Makefile.in (dfp.o-warn): Remove.
18614 2009-04-07  Alan Modra  <amodra@bigpond.net.au>
18616         PR target/39634
18617         * config.gcc: Merge powerpc-*-linux* and powerpc64-*-linux*.
18618         Include soft-fp/t-softfp after rs6000/t-linux64.
18620 2009-04-06  Eric Botcazou  <ebotcazou@adacore.com>
18622         * stor-layout.c (set_sizetype): Use the full precision of their
18623         machine mode for bitsize types.
18625 2009-04-06  H.J. Lu  <hongjiu.lu@intel.com>
18627         * config/i386/i386.md: Revert 2 accidental checkins.
18629 2009-04-06  Joey Ye  <joey.ye@intel.com>
18630             Xuepeng Guo  <xuepeng.guo@intel.com>
18631             H.J. Lu  <hongjiu.lu@intel.com>
18633         Atom pipeline model, tuning and insn selection.
18634         * config.gcc (atom): Add atom config options and target.
18636         * config/i386/atom.md: New.
18638         * config/i386/i386.c (atom_cost): New cost.
18639         (m_ATOM): New macro flag.
18640         (initial_ix86_tune_features): Set m_ATOM.
18641         (x86_accumulate_outgoing_args): Likewise.
18642         (x86_arch_always_fancy_math_387): Likewise.
18643         (processor_target): Add Atom cost.
18644         (cpu_names): Add Atom cpu name.
18645         (override_options): Set Atom ISA.
18646         (ix86_issue_rate): New case PROCESSOR_ATOM.
18647         (ix86_adjust_cost): Likewise.
18649         * config/i386/i386.h (TARGET_ATOM): New target macro.
18650         (ix86_tune_indices): Add X86_TUNE_OPT_AGU.
18651         (TARGET_OPT_AGU): New target option.
18652         (target_cpu_default): Add TARGET_CPU_DEFAULT_atom.
18653         (processor_type): Add PROCESSOR_ATOM.
18655         * config/i386/i386.md (cpu): Add new value "atom".
18656         (use_carry, movu): New attr.
18657         (atom.md): Include atom.md.
18658         (adddi3_carry_rex64): Set attr "use_carry".
18659         (addqi3_carry): Likewise.
18660         (addhi3_carry): Likewise.
18661         (addsi3_carry): Likewise.
18662         (*addsi3_carry_zext): Likewise.
18663         (subdi3_carry_rex64): Likewise.
18664         (subqi3_carry): Likewise.
18665         (subhi3_carry): Likewise.
18666         (subsi3_carry): Likewise.
18667         (x86_movdicc_0_m1_rex64): Likewise.
18668         (*x86_movdicc_0_m1_se): Likewise.
18669         (x86_movsicc_0_m1): Likewise.
18670         (*x86_movsicc_0_m1_se): Likewise.
18671         (*adddi_1_rex64): Emit add insn as much as possible.
18672         (*addsi_1): Likewise.
18673         (return_internal): Set atom_unit.
18674         (return_internal_long): Likewise.
18675         (return_pop_internal): Likewise.
18676         (*rcpsf2_sse): Set atom_sse_attr attr.
18677         (*qrt<mode>2_sse): Likewise.
18678         (*prefetch_sse): Likewise.
18680         * config/i386/i386-c.c (ix86_target_macros_internal): New case
18681         PROCESSOR_ATOM.
18682         (ix86_target_macros_internal): Likewise.
18684         * config/i386/sse.md (cpu): Set attr "atom_sse_attr".
18685         (*prefetch_sse_rex): Likewise.
18686         (sse_rcpv4sf2): Likewise.
18687         (sse_vmrcpv4sf2): Likewise.
18688         (sse_sqrtv4sf2): Likewise.
18689         (<sse>_vmsqrt<mode>2): Likewise.
18690         (sse_ldmxcsr): Likewise.
18691         (sse_stmxcsr): Likewise.
18692         (*sse_sfence): Likewise.
18693         (sse2_clflush): Likewise.
18694         (*sse2_mfence): Likewise.
18695         (*sse2_lfence): Likewise.
18696         (avx_movup<avxmodesuffixf2c><avxmodesuffix>): Set attr "movu".
18697         (<sse>_movup<ssemodesuffixf2c>): Likewise.
18698         (avx_movdqu<avxmodesuffix>): Likewise.
18699         (avx_lddqu<avxmodesuffix>): Likewise.
18700         (sse2_movntv2di): Change attr "type" to "ssemov".
18701         (sse2_movntsi): Likewise.
18702         (rsqrtv8sf2): Change attr "type" to "sseadd".
18703         (sse3_addsubv2df3): Set attr "atom_unit".
18704         (sse3_h<plusminus_insn>v4sf3): Likewise.
18705         (*sse2_pmaddwd): Likewise.
18706         (*vec_extractv2di_1_rex64): Likewise.
18707         (*vec_extractv2di_1_avx): Likewise.
18708         (sse2_psadbw): Likewise.
18709         (ssse3_phaddwv8hi3): Likewise.
18710         (ssse3_phaddwv4hi3): Likewise.
18711         (ssse3_phadddv4si3): Likewise.
18712         (ssse3_phadddv2si3): Likewise.
18713         (ssse3_phaddswv8hi3): Likewise.
18714         (ssse3_phaddswv4hi3): Likewise.
18715         (ssse3_phsubwv8hi3): Likewise.
18716         (ssse3_phsubwv4hi3): Likewise.
18717         (ssse3_phsubdv4si3): Likewise.
18718         (ssse3_phsubdv2si3): Likewise.
18719         (ssse3_phsubswv8hi3): Likewise.
18720         (ssse3_phsubswv4hi3): Likewise.
18721         (ssse3_pmaddubsw128): Likewise.
18722         (sse3_pmaddubsw: Likewise.
18723         (ssse3_palignrti): Likewise.
18724         (ssse3_palignrdi): Likewise.
18726 2009-04-06  Gerald Pfeifer  <gerald@pfeifer.com>
18728         * doc/install.texi (Specific): Fix two cross-references to MinGW.
18730 2009-04-06  Richard Guenther  <rguenther@suse.de>
18732         PR tree-optimization/28868
18733         * tree-ssa-pre.c (inserted_phi_names): New bitmap to keep track
18734         of which PHI results we inserted.
18735         (insert_into_preds_of_block): Record inserted PHIs.
18736         (eliminate): Eliminate redundant PHI nodes.
18737         (init_pre): Init inserted_phi_names.
18739 2009-04-06  Richard Guenther  <rguenther@suse.de>
18741         PR tree-optimization/39643
18742         * tree-ssa-ccp.c (ccp_fold): Fold REALPART_EXPRs and
18743         IMAGPART_EXPRs of complex constants.
18744         (execute_fold_all_builtins): If we folded a call queue
18745         TODO_update_address_taken.
18747 2009-04-06  Jan Hubicka  <jh@suse.cz>
18749         PR middle-end/39659
18750         * except.c (remove_unreachable_regions): Propagate may_contain_throw
18751         flag.
18753 2009-04-06  Andrew Stubbs  <ams@codesourcery.com>
18755         * config/sh/lib1funcs.asm (ic_invalidate): Move ICBI out of the
18756         delay slot.
18757         (ic_invalidate_array): Likewise.
18759 2009-04-06  Hariharan Sandanagobalane  <hariharan@picochip.com>
18761         * calls.c (emit_library_call_value_1): Fix a problem with parameter
18762         alignment for library calls.
18764 2009-04-06  Danny Smith  <dannysmith@users.sourceforge.net>
18766         * config.gcc (mingw32 tm_file):  Add mingw-stdint.h.
18767         (mingw32 tm clause use_gcc_stdint):  Set to wrap.
18768         * config/i386/mingw-stdint.h:  New file.
18770 2009-04-05  Richard Guenther  <rguenther@suse.de>
18772         PR tree-optimization/39648
18773         * tree-ssa-sccvn.c (vn_reference_fold_indirect): Work around
18774         our &A vs. &A[0] IL deficiencies.
18776 2009-04-04  Jan Hubicka  <jh@suse.cz>
18778         * except.c (sjlj_find_directly_reachable_regions): Be ready for
18779         removed toplevel regions.
18780         (sjlj_mark_call_sites): Likewise.
18782 2009-04-04  Dave Korn  <dave.korn.cygwin@gmail.com>
18784         * config.gcc (cygwin tm_file):  Add cygwin-stdint.h.
18785         (cygwin tm clause use_gcc_stdint):  Set to wrap.
18786         * config/i386/cygwin-stdint.h:  New file.
18788 2009-04-04  Richard Guenther  <rguenther@suse.de>
18790         * Makefile.in (tree-ssa-copy.o): Add $(CFGLOOP_H) dependency.
18791         * tree-ssa-copy.c (init_copy_prop): Do not propagate through
18792         single-argument PHIs if we are in loop-closed SSA form.
18793         * tree-vect-loop-manip.c (slpeel_add_loop_guard): Pass extra guards
18794         for the pre-condition.
18795         (slpeel_tree_peel_loop_to_edge): Likewise.
18796         (vect_build_loop_niters): Take an optional sequence to append stmts.
18797         (vect_generate_tmps_on_preheader): Likewise.
18798         (vect_do_peeling_for_loop_bound): Take extra guards for the
18799         pre-condition.
18800         (vect_do_peeling_for_alignment): Adjust.  Unconditionally apply
18801         the cost model check.
18802         (vect_loop_versioning): Take stmt and stmt list to put pre-condition
18803         guards if we are going to peel.  Do not apply versioning in that case.
18804         * tree-vectorizer.h (vect_loop_versioning): Adjust declaration.
18805         (vect_do_peeling_for_loop_bound): Likewise.
18806         * tree-vect-loop.c (vect_transform_loop): If we are peeling for
18807         loop bound only record extra pre-conditions, do not apply loop
18808         versioning.
18810 2009-04-04  Richard Guenther  <rguenther@suse.de>
18812         * tree-ssa-operands.c (pop_stmt_changes): Remove automatic
18813         renaming code.
18815 2009-04-04  Jan Hubicka  <jh@suse.cz>
18817         * tree-ssa-uncprop.c (associate_equivalences_with_edges): Use
18818         last_basic_block for size of bb->index indexed array.
18819         * bt-load.c (compute_defs_uses_and_gen, compute_kill,
18820         compute_out, link_btr_uses, build_btr_def_use_webs,
18821         build_btr_def_use_webs, migrate_btr_defs): Likewise.
18823 2009-04-04  Jan Hubicka  <jh@suse.cz>
18825         * except.c (remove_eh_handler_and_replace): Break out from ...
18826         (remove_eh_handler): ... here.
18827         (bring_to_root): New function.
18828         (remove_unreachable_regions): Collect MUST_NOT_THROW, unify runtime
18829         handled ones, bring others to root of tree.
18831 2009-04-04  Jan Hubicka  <jh@suse.cz>
18833         * tree-eh.c (tree_empty_eh_handler_p): Pattern match more curefully.
18834         (all_phis_safe_to_merge): New function.
18835         (update_info): New structure.
18836         (make_eh_edge_and_update_phi, update_eh_edges): New functions.
18837         (cleanup_empty_eh): Update SSA if possible.
18839 2009-04-04  Richard Guenther  <rguenther@suse.de>
18841         * tree-ssa.c (verify_ssa): With -O0 we do not need VOPs.
18842         * tree-ssa-operands.c (append_vdef): Do not append VOPs at -O0.
18843         (append_vuse): Likewise.
18845 2009-04-04  Jakub Jelinek  <jakub@redhat.com>
18847         * unwind-dw2.h (_Unwind_FrameState): Add REG_UNDEFINED enum value.
18848         * unwind-dw2.c (execute_cfa_program): Set how to REG_UNDEFINED
18849         instead of REG_UNSAVED for DW_CFA_undefined.
18850         (uw_update_context_1): Handle REG_UNDEFINED the same as REG_UNSAVED.
18851         (uw_update_context): If RA column is REG_UNDEFINED, mark it as
18852         outermost frame.
18854 2009-04-04  Richard Earnshaw  <rearnsha@arm.com>
18856         PR target/39501
18857         * arm.md (movsfcc): Disable if not TARGET_HARD_FLOAT.
18858         * testsuite/gcc.c-torture/execute/pr39501.c: New file.
18859         * testsuite/gcc.c-torture/execute/pr39501.x: New file.
18861 2009-04-04  Richard Guenther  <rguenther@suse.de>
18863         PR tree-optimization/8781
18864         PR tree-optimization/37892
18865         * tree-ssa-sccvn.h (vn_reference_fold_indirect): Declare.
18866         * tree-ssa-sccvn.c (vn_reference_fold_indirect): New function.
18867         (valueize_refs): Call it for *& valueizations.
18868         (shared_reference_ops_from_ref): Rename to ...
18869         (valueize_shared_reference_ops_from_ref): ... this and valueize.
18870         (shared_reference_ops_from_call): Rename to ...
18871         (valueize_shared_reference_ops_from_call): ... this and valueize.
18872         (vn_reference_lookup): Update.
18873         (visit_reference_op_call): Likewise.
18874         * tree-ssa-pre.c (phi_translate_1): Fold *&.
18875         (eliminate): Value-replace the call address in call statements.
18877 2009-04-04  Richard Guenther  <rguenther@suse.de>
18879         PR tree-optimization/39636
18880         * tree-ssa-forwprop.c
18881         (forward_propagate_addr_into_variable_array_index): Check for
18882         GIMPLE_ASSIGN before accessing the rhs code.
18884 2009-04-03  Jason Merrill  <jason@redhat.com>
18886         * stor-layout.c (set_sizetype): Set TYPE_CANONICAL.
18888 2009-04-03  Steve Ellcey  <sje@cup.hp.com>
18890         * config/ia64/ia64.md (extendsfdf2, extendsfxf2, extenddfxf2,
18891         truncdfsf2, truncxfsf2, truncxfdf2, floatdixf2, fix_truncsfdi2,
18892         fix_truncdfdi2, fix_truncxfdi2, fix_truncxfdi2_alts, floatunsdisf2,
18893         floatunsdidf2, floatunsdixf2, fixuns_truncsfdi2, fixuns_truncdfdi2,
18894         fixuns_truncxfdi2, fixuns_truncxfdi2_alts, divsi3_internal,
18895         smuldi3_highpart, umuldi3_highpart, ctzdi2, *getf_exp_xf,
18896         divdi3_internal_lat, divdi3_internal_thr, mulditi3, *mulditi3_internal,
18897         umulditi3, *umulditi3_internal, addsf3, mulsf3, abssf2, negsf2,
18898         *nabssf2, sminsf3, smaxsf3, *maddsf4, *msubsf4, *nmulsf3, *nmaddsf4,
18899         *nmaddsf4_alts, divsf3, *sqrt_approx, sqrtsf2, sqrtsf2_internal_thr,
18900         adddf3, *adddf3_trunc, muldf3, *muldf3_trunc, absdf2, negdf2, *nabsdf2,
18901         smindf3, smaxdf3, *madddf4, *madddf4_trunc, *msubdf4, *msubdf4_trunc,
18902         *nmuldf3, *nmuldf3_trunc, *nmadddf4, *nmadddf4_alts, *nmadddf4_truncsf,
18903         *nmadddf4_truncsf_alts, divdf3, sqrtdf2, sqrtdf2_internal_thr, divxf3,
18904         sqrtxf2, sqrtxf2_internal_thr, *recip_approx):
18905         Use fr_reg_or_fp01_operand instead of fr_register_operand
18907         * config/ia64/div.md (extend<mode>rf2, truncrf<mode>2,
18908         recip_approx_rf, divsf3_internal_thr, divsf3_internal_lat,
18909         divdf3_internal_thr, divdf3_internal_lat divxf3_internal): Ditto.
18911 2009-04-03  Vladimir Makarov  <vmakarov@redhat.com>
18913         PR rtl-optimization/39607
18914         PR rtl-optimization/39631
18916         Revert:
18918         2009-03-30  Vladimir Makarov  <vmakarov@redhat.com>
18919         * reload.c (push_reload, find_dummy_reload): Use df_get_live_out
18920         instead of DF_LR_OUT.
18921         * ira-lives.c (process_bb_node_lives): Ditto.
18922         * ira-color.c (ira_loop_edge_freq): Use df_get_live_{out,in}
18923         instead of DF_LR_{OUT,IN}.
18924         * ira-emit.c (generate_edge_moves, add_ranges_and_copies): Ditto.
18925         * ira-build.c (create_bb_allocnos, create_loop_allocnos): Ditto.
18927 2009-04-03  Steven Bosscher  <steven@gcc.gnu.org>
18929         * omp-low.c (pass_expand_omp): Don't claim to provide PROP_gimple_lomp.
18930         (execute_lower_omp): Always run but take the short way out if -fopenmp
18931         is not given.
18932         (gate_lower_omp): Remove, forcing the pass manager to always run the
18933         pass and always set PROP_gimple_lomp.
18934         (pass_lower_omp): Remove gate function.
18935         * matrix-reorg.c (pass_ipa_matrix_reorg): Don't claim to provide
18936         PROP_trees.  Instead, require it.
18937         * ipa-cp.c (pass_ipa_cp): Likewise.
18938         * ipa-inline.c (pass_early_inline): Don't claim to provide PROP_cfg.
18939         (pass_ipa_early_inline, pass_inline_parameters, pass_ipa_inline): Idem.
18940         * tree-profile.c (pass_tree_profile): Don't claim to provide PROP_cfg
18941         and PROP_gimple_leh.
18943 2009-04-03  Richard Guenther  <rguenther@suse.de>
18945         PR middle-end/13146
18946         PR tree-optimization/23940
18947         PR tree-optimization/33237
18948         PR middle-end/33974
18949         PR middle-end/34093
18950         PR tree-optimization/36201
18951         PR tree-optimization/36230
18952         PR tree-optimization/38049
18953         PR tree-optimization/38207
18954         PR tree-optimization/38230
18955         PR tree-optimization/38301
18956         PR tree-optimization/38585
18957         PR middle-end/38895
18958         PR tree-optimization/38985
18959         PR tree-optimization/39299
18960         * tree-ssa-structalias.h: Remove.
18961         * tree-ssa-operands.h (NULL_USE_OPERAND_P): Make of type use_operand_p.
18962         (NULL_DEF_OPERAND_P): Make of type def_operand_p.
18963         (struct vuse_element_d): Remove.
18964         (struct vuse_vec_d): Likewise.
18965         (VUSE_VECT_NUM_ELEM, VUSE_VECT_ELEMENT_NC, VUSE_ELEMENT_PTR_NC,
18966         VUSE_ELEMENT_VAR_NC, VUSE_VECT_ELEMENT, VUSE_ELEMENT_PTR,
18967         SET_VUSE_VECT_ELEMENT, SET_VUSE_ELEMENT_VAR, SET_VUSE_ELEMENT_PTR,
18968         VUSE_ELEMENT_VAR): Likewise.
18969         (struct voptype_d): Likewise.
18970         (NUM_VOP_FREE_BUCKETS): Likewise.
18971         (struct ssa_operands): Remove vop_free_buckets and mpt_table fields.
18972         (struct stmt_operands_d): Remove.
18973         (VUSE_OP_PTR, VUSE_OP, SET_VUSE_OP, VUSE_NUM, VUSE_VECT,
18974         VDEF_RESULT_PTR, VDEF_RESULT, VDEF_OP_PTR, VDEF_OP, SET_VDEF_OP,
18975         VDEF_NUM, VDEF_VECT): Likewise.
18976         (copy_virtual_operands): Remove.
18977         (operand_build_cmp): Likewise.
18978         (create_ssa_artificial_load_stmt): Likewise.
18979         (enum ssa_op_iter_type): Remove ssa_op_iter_vdef.
18980         (struct ssa_operand_iterator_d): Remove vuses, vdefs, mayusesm
18981         vuse_index and mayuse_index members.  Pack and move done and iter_type
18982         members to the front.
18983         (SSA_OP_VMAYUSE): Remove.
18984         (SSA_OP_VIRTUAL_USES): Adjust.
18985         (FOR_EACH_SSA_VDEF_OPERAND): Remove.
18986         (unlink_stmt_vdef): Declare.
18987         (add_to_addressable_set): Remove.
18988         * tree-vrp.c (stmt_interesting_for_vrp): Adjust.
18989         (vrp_visit_stmt): Likewise.
18990         * doc/tree-ssa.texi (Alias analysis): Update.
18991         * doc/invoke.texi (max-aliased-vops): Remove docs.
18992         (avg-aliased-vops): Likewise.
18993         * tree-into-ssa.c (syms_to_rename): Remove.
18994         (need_to_update_vops_p): Likewise.
18995         (need_to_initialize_update_ssa_p): Rename to ...
18996         (update_ssa_initialized_fn): ... this.  Track function we are
18997         initialized for.
18998         (symbol_marked_for_renaming): Simplify.
18999         (add_new_name_mapping): Do not set need_to_update_vops_p.
19000         (dump_currdefs): Use SYMS_TO_RENAME.
19001         (rewrite_update_stmt): Always walk all uses/defs.
19002         (dump_update_ssa): Adjust.
19003         (init_update_ssa): Take function argument.  Track what we are
19004         initialized for.
19005         (delete_update_ssa): Reset SYMS_TO_RENAME and update_ssa_initialized_fn.
19006         (create_new_def_for): Initialize for cfun, assert we are initialized
19007         for cfun.
19008         (mark_sym_for_renaming): Simplify.
19009         (mark_set_for_renaming): Do not initialize update-ssa.
19010         (need_ssa_update_p): Simplify.  Take function argument.
19011         (name_mappings_registered_p): Assert we ask for the correct function.
19012         (name_registered_for_update_p): Likewise.
19013         (ssa_names_to_replace): Likewise.
19014         (release_ssa_name_after_update_ssa): Likewise.
19015         (update_ssa): Likewise.  Use SYMS_TO_RENAME.
19016         (dump_decl_set): Do not print a newline.
19017         (debug_decl_set): Do it here.
19018         (dump_update_ssa): And here.
19019         * tree-ssa-loop-im.c (move_computations): Adjust.
19020         (movement_possibility): Likewise.
19021         (determine_max_movement): Likewise.
19022         (gather_mem_refs_stmt): Likewise.
19023         * tree-dump.c (dequeue_and_dump): Do not handle SYMBOL_MEMORY_TAG
19024         or NAME_MEMORY_TAG.
19025         * tree-complex.c (update_all_vops): Remove.
19026         (expand_complex_move): Adjust.
19027         * tree-ssa-loop-niter.c (chain_of_csts_start): Use NULL_TREE.
19028         Simplify test for memory referencing statement.  Exclude
19029         non-invariant ADDR_EXPRs.
19030         * tree-pretty-print.c (dump_generic_node): Do not handle memory tags.
19031         * tree-loop-distribution.c (generate_memset_zero): Adjust.
19032         (rdg_flag_uses): Likewise.
19033         * tree-tailcall.c (suitable_for_tail_opt_p): Remove memory-tag
19034         related code.
19035         (tree_optimize_tail_calls_1): Also split the
19036         edge from the entry block if we have degenerate PHI nodes in
19037         the first basic block.
19038         * tree.c (init_ttree): Remove memory-tag related code.
19039         (tree_code_size): Likewise.
19040         (tree_node_structure): Likewise.
19041         (build7_stat): Re-write to be build6_stat.
19042         * tree.h (MTAG_P, TREE_MEMORY_TAG_CHECK, TMR_TAG): Remove.
19043         (SSA_VAR_P): Adjust.
19044         (struct tree_memory_tag): Remove.
19045         (struct tree_memory_partition_tag): Likewise.
19046         (union tree_node): Adjust.
19047         (build7): Re-write to be build6.
19048         * tree-pass.h (pass_reset_cc_flags): Remove.
19049         (TODO_update_address_taken): New flag.
19050         (pass_simple_dse): Remove.
19051         * ipa-cp.c (ipcp_update_callgraph): Update SSA form.
19052         * params.h (MAX_ALIASED_VOPS): Remove.
19053         (AVG_ALIASED_VOPS): Likewise.
19054         * omp-low.c (expand_omp_taskreg): Update SSA form.
19055         * tree-ssa-dse.c (dse_optimize_stmt): Properly query if the rhs
19056         aliases the lhs in a copy stmt.
19057         * tree-ssa-dse.c (struct address_walk_data): Remove.
19058         (memory_ssa_name_same): Likewise.
19059         (memory_address_same): Likewise.
19060         (get_kill_of_stmt_lhs): Likewise.
19061         (dse_possible_dead_store_p): Simplify, use the oracle.  Handle
19062         unused stores.  Look through PHI nodes into post-dominated regions.
19063         (dse_optimize_stmt): Simplify.  Properly remove stores.
19064         (tree_ssa_dse): Compute dominators.
19065         (execute_simple_dse): Remove.
19066         (pass_simple_dse): Likewise.
19067         * ipa-reference.c (scan_stmt_for_static_refs): Open-code
19068         gimple_loaded_syms and gimple_stored_syms computation.
19069         * toplev.c (dump_memory_report): Dump alias and pta stats.
19070         * tree-ssa-sccvn.c (vn_reference_compute_hash): Simplify.
19071         (vn_reference_eq): Likewise.
19072         (vuses_to_vec, copy_vuses_from_stmt, vdefs_to_vec,
19073         copy_vdefs_from_stmt, shared_lookup_vops, shared_vuses_from_stmt,
19074         valueize_vuses): Remove.
19075         (get_def_ref_stmt_vuses): Simplify.  Rename to ...
19076         (get_def_ref_stmt_vuse): ... this.
19077         (vn_reference_lookup_2): New function.
19078         (vn_reference_lookup_pieces): Use walk_non_aliased_vuses for
19079         walking equivalent vuses.  Simplify.
19080         (vn_reference_lookup): Likewise.
19081         (vn_reference_insert): Likewise.
19082         (vn_reference_insert_pieces): Likewise.
19083         (visit_reference_op_call): Simplify.
19084         (visit_reference_op_load): Likewise.
19085         (visit_reference_op_store): Likewise.
19086         (init_scc_vn): Remove shared_lookup_vuses initialization.
19087         (free_scc_vn): Remove shared_lookup_vuses freeing.
19088         (sort_vuses, sort_vuses_heap): Remove.
19089         (get_ref_from_reference_ops): Export.
19090         * tree-ssa-sccvn.h (struct vn_reference_s): Replace vuses
19091         vector with single vuse pointer.
19092         (vn_reference_lookup_pieces, vn_reference_lookup,
19093         vn_reference_insert, vn_reference_insert_pieces): Adjust prototypes.
19094         (shared_vuses_from_stmt): Remove.
19095         (get_ref_from_reference_ops): Declare.
19096         * tree-ssa-loop-manip.c (slpeel_can_duplicate_loop_p): Adjust.
19097         * tree-ssa-copyrename.c (copy_rename_partition_coalesce): Remove
19098         memory-tag related code.
19099         * tree-ssa-ccp.c (get_symbol_constant_value): Remove memory-tag code.
19100         (likely_value): Add comment, skip static-chain of call statements.
19101         (surely_varying_stmt_p): Adjust.
19102         (gimplify_and_update_call_from_tree): Likewise.
19103         (execute_fold_all_builtins): Do not rebuild alias info.
19104         (gimplify_and_update_call_from_tree): Properly update VOPs.
19105         * tree-ssa-loop-ivopts.c (get_ref_tag): Remove.
19106         (copy_ref_info): Remove memory-tag related code.
19107         * tree-call-cdce.c (tree_call_cdce): Rename the VOP.
19108         * ipa-pure-const.c (check_decl): Remove memory-tag related code.
19109         (check_stmt): Open-code gimple_loaded_syms and gimple_stored_syms
19110         computation.
19111         * tree-ssa-dom.c (gimple_p): Remove typedef.
19112         (eliminate_redundant_computations): Adjust.
19113         (record_equivalences_from_stmt): Likewise.
19114         (avail_expr_hash): Likewise.
19115         (avail_expr_eq): Likewise.
19116         * tree-ssa-propagate.c (update_call_from_tree): Properly update VOPs.
19117         (stmt_makes_single_load): Likewise.
19118         (stmt_makes_single_store): Likewise.
19119         * tree-ssa-alias.c: Rewrite completely.
19120         (debug_memory_partitions, dump_mem_ref_stats, debug_mem_ref_stats,
19121         debug_mem_sym_stats, dump_mem_sym_stats_for_var,
19122         debug_all_mem_sym_stats, debug_mp_info, update_mem_sym_stats_from_stmt,
19123         delete_mem_ref_stats, create_tag_raw, dump_points_to_info,
19124         dump_may_aliases_for, debug_may_aliases_for, new_type_alias):
19125         Remove public functions.
19126         (pass_reset_cc_flags): Remove.
19127         (pass_build_alias): Move ...
19128         * tree-ssa-structalias.c (pass_build_alias): ... here.
19129         * tree-ssa-alias.c (may_be_aliased): Move ...
19130         * tree-flow-inline.h (may_be_aliased): ... here.
19131         tree-ssa-alias.c (struct count_ptr_d, count_ptr_derefs,
19132         count_uses_and_derefs): Move ...
19133         * gimple.c: ... here.
19134         * gimple.h (count_uses_and_derefs): Declare.
19135         * tree-ssa-alias.c (dump_alias_stats, ptr_deref_may_alias_global_p,
19136         ptr_deref_may_alias_decl_p, ptr_derefs_may_alias_p,
19137         same_type_for_tbaa, nonaliasing_component_refs_p, decl_refs_may_alias_p,
19138         indirect_ref_may_alias_decl_p, indirect_refs_may_alias_p,
19139         ref_maybe_used_by_call_p, ref_maybe_used_by_stmt_p,
19140         call_may_clobber_ref_p, stmt_may_clobber_ref_p, maybe_skip_until,
19141         get_continuation_for_phi, walk_non_aliased_vuses, walk_aliased_vdefs):
19142         New functions.
19143         * tree-dfa.c (refs_may_alias_p): Move ...
19144         * tree-ssa-alias.c (refs_may_alias_p): ... here.  Extend.
19145         * tree-ssa-alias.h: New file.
19146         * tree-ssa-sink.c (is_hidden_global_store): Adjust.
19147         (statement_sink_location): Likewise.
19148         * opts.c (decode_options): Do not adjust max-aliased-vops or
19149         avg-aliased-vops values.
19150         * timevar.def (TV_TREE_MAY_ALIAS): Remove.
19151         (TV_CALL_CLOBBER): Likewise.
19152         (TV_FLOW_SENSITIVE): Likewise.
19153         (TV_FLOW_INSENSITIVE): Likewise.
19154         (TV_MEMORY_PARTITIONING): Likewise.
19155         (TV_ALIAS_STMT_WALK): New timevar.
19156         * tree-ssa-loop-ivcanon.c (empty_loop_p): Adjust.
19157         * tree-ssa-address.c (create_mem_ref_raw): Use build6.
19158         (get_address_description): Remove memory-tag related code.
19159         * tree-ssa-ifcombine.c (bb_no_side_effects_p): Adjust.
19160         * treestruct.def (TS_MEMORY_TAG, TS_MEMORY_PARTITION_TAG): Remove.
19161         * tree-eh.c (cleanup_empty_eh): Do not leave stale SSA_NAMEs
19162         and immediate uses in statements.  Document.
19163         * gimple-pretty-print.c (dump_gimple_mem_ops): Adjust.
19164         (dump_symbols): Remove.
19165         (dump_gimple_mem_ops): Do not dump loaded or stored syms.
19166         * alias.c (get_deref_alias_set): New function split out from ...
19167         (get_alias_set): ... here.
19168         * alias.h (get_deref_alias_set): Declare.
19169         * tree-vect-data-refs.c (vect_create_data_ref_ptr): Remove unused
19170         type parameter.  Remove restrict pointer handling.  Create a
19171         ref-all pointer in case type-based alias sets do not conflict.
19172         (vect_analyze_data_refs): Remove SMT related code.
19173         * tree-vect-stmts.c (vectorizable_store): Re-instantiate TBAA assert.
19174         (vectorizable_load): Likewise.
19175         * tree-data-ref.h (struct dr_alias): Remove symbol_tag field.
19176         (DR_SYMBOL_TAG, DR_VOPS): Remove.
19177         * tree-data-ref.c (dr_may_alias_p): Use the alias-oracle.
19178         Ignore vops and SMTs.
19179         (dr_analyze_alias): Likewise..
19180         (free_data_ref): Likewise.
19181         (create_data_ref): Likewise.
19182         (analyze_all_data_dependences): Likewise.
19183         (get_references_in_stmt): Adjust.
19184         * tree-flow-inline.h (gimple_aliases_computed_p,
19185         gimple_addressable_vars, gimple_call_clobbered_vars,
19186         gimple_call_used_vars, gimple_global_var, may_aliases, memory_partition,
19187         factoring_name_p, mark_call_clobbered, clear_call_clobbered,
19188         compare_ssa_operands_equal, symbol_mem_tag, set_symbol_mem_tag,
19189         gimple_mem_ref_stats): Remove.
19190         (gimple_vop): New function.
19191         (op_iter_next_use): Remove vuses and mayuses cases.
19192         (op_iter_next_def): Remove vdefs case.
19193         (op_iter_next_tree): Remove vuses, mayuses and vdefs cases.
19194         (clear_and_done_ssa_iter): Do not set removed fields.
19195         (op_iter_init): Likewise.  Skip vuse and/or vdef if requested.
19196         Assert we are not iterating over vuses or vdefs if not also
19197         iterating over uses or defs.
19198         (op_iter_init_use): Likewise.
19199         (op_iter_init_def): Likewise.
19200         (op_iter_next_vdef): Remove.
19201         (op_iter_next_mustdef): Likewise.
19202         (op_iter_init_vdef): Likewise.
19203         (compare_ssa_operands_equal): Likewise.
19204         (link_use_stmts_after): Handle vuse operand.
19205         (is_call_used): Use is_call_clobbered.
19206         (is_call_clobbered): Global variables are always call clobbered,
19207         query the call-clobbers bitmap.
19208         (mark_call_clobbered): Ignore global variables.
19209         (clear_call_clobbered): Likewise.
19210         * tree-ssa-coalesce.c (create_outofssa_var_map): Adjust
19211         virtual operands sanity check.
19212         * tree.def (NAME_MEMORY_TAG, SYMBOL_MEMORY_TAG, MEMORY_PARTITION_TAG):
19213         Remove.
19214         (TARGET_MEM_REF): Remove TMR_TAG operand.
19215         * tree-dfa.c (add_referenced_var): Initialize call-clobber state.
19216         Remove call-clobber related code.
19217         (remove_referenced_var): Likewise.  Do not clear mpt or symbol_mem_tag.
19218         (dump_variable): Do not dump SMTs, memory stats, may-aliases or
19219         partitions or escape reason.
19220         (get_single_def_stmt, get_single_def_stmt_from_phi,
19221         get_single_def_stmt_with_phi): Remove.
19222         (dump_referenced_vars): Tidy.
19223         (get_ref_base_and_extent): Allow bare decls.
19224         (collect_dfa_stats): Adjust.
19225         * graphite.c (rename_variables_in_stmt): Adjust.
19226         (graphite_copy_stmts_from_block): Likewise.
19227         (translate_clast): Likewise.
19228         * tree-ssa-pre.c (struct bb_bitmap_sets): Add expr_dies bitmap.
19229         (EXPR_DIES): New.
19230         (translate_vuse_through_block): Use the oracle.
19231         (phi_translate_1): Adjust.
19232         (value_dies_in_block_x): Use the oracle.  Cache the outcome
19233         in EXPR_DIES.
19234         (valid_in_sets): Check if the VUSE for
19235         a REFERENCE is available.
19236         (eliminate): Do not remove stmts during elimination,
19237         instead queue and remove them afterwards.
19238         (do_pre): Do not rebuild alias info.
19239         (pass_pre): Run TODO_rebuild_alias before PRE.
19240         * tree-ssa-live.c (remove_unused_locals): Remove memory-tag code.
19241         * tree-sra.c (sra_walk_function): Use gimple_references_memory_p.
19242         (mark_all_v_defs_stmt): Remove.
19243         (mark_all_v_defs_seq): Adjust.
19244         (sra_replace): Likewise.
19245         (scalarize_use): Likewise.
19246         (scalarize_copy): Likewise.
19247         (scalarize_init): Likewise.
19248         (scalarize_ldst): Likewise.
19249         (todoflags): Remove.
19250         (tree_sra): Do not rebuild alias info.
19251         (tree_sra_early): Adjust.
19252         (pass_sra): Run TODO_update_address_taken before SRA.
19253         * tree-predcom.c (set_alias_info): Remove.
19254         (prepare_initializers_chain): Do not call it.
19255         (mark_virtual_ops_for_renaming): Adjust.
19256         (mark_virtual_ops_for_renaming_list): Remove.
19257         (initialize_root_vars): Adjust.
19258         (initialize_root_vars_lm): Likewise.
19259         (prepare_initializers_chain): Likewise.
19260         * tree-ssa-copy.c (may_propagate_copy): Remove memory-tag related code.
19261         (may_propagate_copy_into_stmt): Likewise.
19262         (merge_alias_info): Do nothing for now.
19263         (propagate_tree_value_into_stmt): Adjust.
19264         (stmt_may_generate_copy): Likewise.
19265         * tree-ssa-forwprop.c (tidy_after_forward_propagate_addr): Do
19266         not mark symbols for renaming.
19267         (forward_propagate_addr_expr): Match up push/pop_stmt_changes
19268         with the same statement, make sure to update the new pointed-to one.
19269         * tree-ssa-dce.c (eliminate_unnecessary_stmts): Do not copy
19270         call statements, do not mark symbols for renaming.
19271         (mark_operand_necessary): Dump something.
19272         (ref_may_be_aliased): New function.
19273         (mark_aliased_reaching_defs_necessary_1): New helper function.
19274         (mark_aliased_reaching_defs_necessary): Likewise.
19275         (mark_all_reaching_defs_necessary_1): Likewise.
19276         (mark_all_reaching_defs_necessary): Likewise.
19277         (propagate_necessity): Do not process virtual PHIs.  For
19278         non-aliased loads mark all reaching definitions as necessary.
19279         For aliased loads and stores mark the immediate dominating
19280         aliased clobbers as necessary.
19281         (visited): New global static.
19282         (perform_tree_ssa_dce): Free visited bitmap after propagating
19283         necessity.
19284         (remove_dead_phis): Perform simple dead virtual PHI removal.
19285         (remove_dead_stmt): Properly unlink virtual operands when
19286         removing stores.
19287         (eliminate_unnecessary_stmts): Schedule PHI removal after
19288         stmt removal.
19289         * tree-ssa-ter.c (is_replaceable_p): Adjust.
19290         (process_replaceable): Likewise.
19291         (find_replaceable_in_bb): Likewise.
19292         * tree-ssa.c (verify_ssa_name): Verify all VOPs are
19293         based on the single gimple vop.
19294         (verify_flow_insensitive_alias_info): Remove.
19295         (verify_flow_sensitive_alias_info): Likewise.
19296         (verify_call_clobbering): Likewise.
19297         (verify_memory_partitions): Likewise.
19298         (verify_alias_info): Likewise.
19299         (verify_ssa): Adjust..
19300         (execute_update_addresses_taken): Export.  Update SSA
19301         manually.  Optimize only when optimizing.  Use a local bitmap.
19302         (pass_update_address_taken): Remove TODO_update_ssa, add
19303         TODO_dump_func.
19304         (pass_update_address_taken): Just use TODO_update_address_taken.
19305         (init_tree_ssa): Do not initialize addressable_vars.
19306         (verify_ssa): Verify new VUSE / VDEF properties.
19307         Verify that all stmts definitions have the stmt as SSA_NAME_DEF_STMT.
19308         Do not call verify_alias_info.
19309         (delete_tree_ssa): Clear the VUSE, VDEF operands.
19310         Do not free the loaded and stored syms bitmaps.  Reset the escaped
19311         and callused solutions.  Do not free addressable_vars.
19312         Remove memory-tag related code.
19313         (warn_uninitialized_var): Aliases are always available.
19314         * tree-ssa-loop-prefetch.c (gather_memory_references): Adjust.
19315         * lambda-code.c (can_put_in_inner_loop): Adjust.
19316         (can_put_after_inner_loop): Likewise.
19317         (perfect_nestify): Likewise.
19318         * tree-vect-stmts.c (vect_stmt_relevant_p): Adjust.
19319         (vect_gen_widened_results_half): Remove CALL_EXPR handling.
19320         (vectorizable_conversion): Do not mark symbols for renaming.
19321         * tree-inline.c (remap_gimple_stmt): Clear VUSE/VDEF.
19322         (expand_call_inline): Unlink the calls virtual operands before
19323         replacing it.
19324         (tree_function_versioning): Do not call update_ssa if we are not
19325         updating clones.  Simplify.
19326         * tree-ssa-phiprop.c (phivn_valid_p): Adjust.
19327         (propagate_with_phi): Likewise..
19328         * tree-outof-ssa.c (create_temp): Remove memory tag and call
19329         clobber code.  Assert we are not aliased or global.
19330         * tree-flow.h: Include tree-ssa-alias.h
19331         (enum escape_type): Remove.
19332         (struct mem_sym_stats_d): Likewise.
19333         (struct mem_ref_stats_d): Likewise.
19334         (struct gimple_df): Add vop member.  Remove global_var,
19335         call_clobbered_vars, call_used_vars, addressable_vars,
19336         aliases_compted_p and mem_ref_stats members.  Add syms_to_rename,
19337         escaped and callused members.
19338         (struct ptr_info_def): Remove all members, add points-to solution
19339         member pt.
19340         (struct var_ann_d): Remove in_vuse_list, in_vdef_list,
19341         call_clobbered, escape_mask, mpt and symbol_mem_tag members.
19342         * Makefile.in (TREE_FLOW_H): Add tree-ssa-alias.h.
19343         (tree-ssa-structalias.o): Remove tree-ssa-structalias.h.
19344         (tree-ssa-alias.o): Likewise.
19345         (toplev.o): Add tree-ssa-alias.h
19346         (GTFILES): Remove tree-ssa-structalias.h, add tree-ssa-alias.h.
19347         * gimple.c (gimple_set_bb): Fix off-by-one error.
19348         (is_gimple_reg): Do not handle memory tags.
19349         (gimple_copy): Also copy virtual operands.
19350         Delay updating the statement.  Do not reset loaded and stored syms.
19351         (gimple_set_stored_syms): Remove.
19352         (gimple_set_loaded_syms): Likewise.
19353         (gimple_call_copy_skip_args): Copy the virtual operands
19354         and mark the new statement modified.
19355         * tree-ssa-structalias.c (may_alias_p): Remove.
19356         (set_uids_in_ptset): Take the alias set to prune with as
19357         parameter.  Fold in the alias test of may_alias_p.
19358         (compute_points_to_sets): Compute whether a ptr is dereferenced
19359         in a local sbitmap.
19360         (process_constraint): Deal with &ANYTHING on the lhs, reject all
19361         other ADDRESSOF constraints on the lhs.
19362         (get_constraint_for_component_ref): Assert that we don't get
19363         ADDRESSOF constraints from the base of the reference.
19364         Properly generate UNKNOWN_OFFSET for DEREF if needed.
19365         (struct variable_info): Remove collapsed_to member.
19366         (get_varinfo_fc): Remove.
19367         (new_var_info): Do not set collapsed_to.
19368         (dump_constraint): Do not follow cycles.
19369         (dump_constraint_graph): Likewise.
19370         (build_pred_graph): Likewise.
19371         (build_succ_graph): Likewise.
19372         (rewrite_constraints): Likewise.
19373         (do_simple_structure_copy): Remove.
19374         (do_rhs_deref_structure_copy): Remove.
19375         (do_lhs_deref_structure_copy): Remove.
19376         (collapse_rest_of_var): Remove.
19377         (do_structure_copy): Re-implement.
19378         (pta_stats): New global variable.
19379         (dump_pta_stats): New function.
19380         (struct constraint_expr): Make offset signed.
19381         (UNKNOWN_OFFSET): Define special value.
19382         (dump_constraint): Dump UNKNOWN_OFFSET as UNKNOWN.
19383         (solution_set_expand): New helper function split out from ...
19384         (do_sd_constraint): ... here.
19385         (solution_set_add): Handle UNKNOWN_OFFSET.  Handle negative offsets.
19386         (do_ds_constraint): Likewise.
19387         (do_sd_constraint): Likewise.  Do not special-case ESCAPED = *ESCAPED
19388         and CALLUSED = *CALLUSED.
19389         (set_union_with_increment): Make inc argument signed.
19390         (type_safe): Remove.
19391         (get_constraint_for_ptr_offset): Handle unknown and negative
19392         constant offsets.
19393         (first_vi_for_offset): Handle offsets before start.  Bail
19394         out early for offsets beyond the variable extent.
19395         (first_or_preceding_vi_for_offset): New function.
19396         (init_base_vars): Add ESCAPED = ESCAPED + UNKNOWN_OFFSET constraint.
19397         Together with ESCAPED = *ESCAPED this properly computes reachability.
19398         (find_what_var_points_to): New function.
19399         (find_what_p_points_to): Implement in terms of find_what_var_points_to.
19400         (pt_solution_reset, pt_solution_empty_p, pt_solution_includes_global,
19401         pt_solution_includes_1, pt_solution_includes, pt_solutions_intersect_1,
19402         pt_solutions_intersect): New functions.
19403         (compute_call_used_vars): Remove.
19404         (compute_may_aliases): New main entry into PTA computation.
19405         * gimple.h (gimple_p): New typedef.
19406         (struct gimple_statement_base): Remove references_memory_p.
19407         (struct gimple_statement_with_memory_ops_base): Remove
19408         vdef_ops, vuse_ops, stores and loads members.  Add vdef and vuse
19409         members.
19410         (gimple_vuse_ops, gimple_set_vuse_ops, gimple_vdef_ops,
19411         gimple_set_vdef_ops, gimple_loaded_syms, gimple_stored_syms,
19412         gimple_set_references_memory): Remove.
19413         (gimple_vuse_op, gimple_vdef_op, gimple_vuse, gimple_vdef,
19414         gimple_vuse_ptr, gimple_vdef_ptri, gimple_set_vuse, gimple_set_vdef):
19415         New functions.
19416         * tree-cfg.c (move_block_to_fn): Fix off-by-one error.
19417         (verify_expr): Allow RESULT_DECL.
19418         (gimple_duplicate_bb): Do not copy virtual operands.
19419         (gimple_duplicate_sese_region): Adjust.
19420         (gimple_duplicate_sese_tail): Likewise.
19421         (mark_virtual_ops_in_region): Remove.
19422         (move_sese_region_to_fn): Do not call it.
19423         * passes.c (init_optimization_passes): Remove pass_reset_cc_flags
19424         and pass_simple_dse.
19425         (execute_function_todo): Handle TODO_update_address_taken,
19426         call execute_update_addresses_taken for TODO_rebuild_alias.
19427         (execute_todo): Adjust.
19428         (execute_one_pass): Init dump files early.
19429         * ipa-struct-reorg.c (finalize_var_creation): Do not mark vars
19430         call-clobbered.
19431         (create_general_new_stmt): Clear vops.
19432         * tree-ssa-reassoc.c (get_rank): Adjust.
19433         * tree-vect-slp.c (vect_create_mask_and_perm): Do not mark
19434         symbols for renaming.
19435         * params.def (PARAM_MAX_ALIASED_VOPS): Remove.
19436         (PARAM_AVG_ALIASED_VOPS): Likewise.
19437         * tree-ssanames.c (init_ssanames): Allocate SYMS_TO_RENAME.
19438         (duplicate_ssa_name_ptr_info): No need to copy the shared bitmaps.
19439         * tree-ssa-operands.c: Simplify for new virtual operand representation.
19440         (operand_build_cmp, copy_virtual_operands,
19441         create_ssa_artificial_load_stmt, add_to_addressable_set,
19442         gimple_add_to_addresses_taken): Remove public functions.
19443         (unlink_stmt_vdef): New function.
19445 2009-04-03  Alan Modra  <amodra@bigpond.net.au>
19447         * config.gcc (powerpc-*-linux*): Merge variants.
19449 2009-04-02  Chao-ying Fu  <fu@mips.com>
19450             James Grosbach  <james.grosbach@microchip.com>
19452         * config/mips/mips.c (mips_frame_info): Add acc_mask, num_acc,
19453         num_cop0_regs, acc_save_offset, cop0_save_offset, acc_sp_offset,
19454         cop0_sp_offset.
19455         (machine_function): Add interrupt_handler_p, use_shadow_register_set_p,
19456         keep_interrupts_masked_p, use_debug_exception_return_p.
19457         (mips_attribute_table): Add interrupt, use_shadow_register_set,
19458         keep_interrupts_masked, use_debug_exception_return.
19459         (mips_interrupt_type_p, mips_use_shadow_register_set_p,
19460         mips_keep_interrupts_masked_p, mips_use_debug_exception_return_p):
19461         New functions.
19462         (mips_function_ok_for_sibcall): Return false for interrupt handlers.
19463         (mips_print_operand): Process COP0 registers to print $0 .. $31
19464         correctly for GAS to process.
19465         (mips_interrupt_extra_call_saved_reg_p): New function.
19466         (mips_cfun_call_saved_reg_p): For interrupt handlers, we need to check
19467         extra registers.
19468         (mips_cfun_might_clobber_call_saved_reg_p): Likewise.
19469         (mips_compute_frame_info): Add supports for interrupt context that
19470         includes doubleword accumulators and COP0 registers.
19471         (mips_for_each_saved_acc): New function.
19472         (mips_for_each_saved_gpr_and_fpr): Change the function name from
19473         mips_for_each_saved_reg.
19474         (mips_save_reg): Save accumulators.
19475         (mips_kernel_reg_p): A new for_each_rtx callback.
19476         (mips_expand_prologue): Support interrupt handlers.
19477         (mips_restore_reg): Restore accumulators.
19478         (mips_expand_epilogue): Support interrupt handlers.
19479         (mips_can_use_return_insn): Return false for interrupt handlers.
19480         (mips_epilogue_uses): New function.
19481         * config/mips/mips.md (UNSPEC_ERET, UNSPEC_DERET, UNSPEC_DI,
19482         UNSPEC_EHB, UNSPEC_RDPGPR, UNSPEC_COP0): New UNSPEC.
19483         (mips_eret, mips_deret, mips_di, mips_ehb, mips_rdpgpr,
19484         cop0_move): New instructions.
19485         * config/mips/mips-protos.h (mips_epilogue_uses): Declare.
19486         * config/mips/mips.h (K0_REG_NUM, K1_REG_NUM, KERNEL_REG_P): New
19487         defines.
19488         (COP0_STATUS_REG_NUM, COP0_CAUSE_REG_NUM, COP0_EPC_REG_NUM):
19489         New defines.
19490         (CAUSE_IPL, SR_IPL, SR_EXL, SR_IE): New defines.
19491         (MIPS_PROLOGUE_TEMP_REGNUM, MIPS_EPILOGUE_TEMP_REGNUM): For
19492         interrupt handlers, we use K0 as the temporary register.
19493         (EPILOGUE_USES): Change to a function call.
19494         * config/mips/sde.h (MIPS_EPILOGUE_TEMP_REGNUM): For interrupt
19495         handlers, we use K0 as the temporary register.
19497         * doc/extend.texi (Function Attributes): Document interrupt,
19498         use_shadow_register_set, keep_interrupts_masked,
19499         use_debug_exception_return for MIPS attributes.
19501 2009-04-03  Alan Modra  <amodra@bigpond.net.au>
19503         * config.gcc (powerpc64-*-gnu*): Add rs6000/default64.h to tm_file.
19504         Remove a number of t-files from tmake_file.
19505         * config/rs6000/sysv4.opt (mprototype): Name variable target_prototype.
19506         * config/rs6000/sysv4.h (TARGET_PROTOTYPE): Define.
19507         * config/rs6000/linux64.h (SUBSUBTARGET_OVERRIDE_OPTIONS): Set
19508         target_prototype, not TARGET_PROTOTYPE.
19509         (LINK_OS_GNU_SPEC): Define.
19510         * config/rs6000/t-linux64 (LIB2FUNCS_EXTRA): Delete tramp.S
19511         and darwin-ldoubdle.c.
19513 2009-04-02  Michael Meissner  <meissner@linux.vnet.ibm.com>
19515         PR driver/39293
19516         * gcc.c (save_temps_flag): Add support for -save-temps=obj.
19517         (cpp_options): Ditto.
19518         (default_compilers): Ditto.
19519         (display_help): Ditto.
19520         (process_command): Ditto.
19521         (do_spec_1): Ditto.
19522         (set_input): Use lbasename instead of duplicate code.
19523         (save_temps_prefix): New static for -save-temps=obj.
19524         (save_temps_length): Ditto.
19526         * doc/invoke.texi (-save-temps=obj): Document new variant to
19527         -save-temps switch.
19529 2009-04-02  Jeff Law  <law@redhat.com>
19531         * reload1.c (fixup_eh_region_notes): Remove write-only "trap_count"
19532         variable.
19534 2009-04-02  H.J. Lu  <hongjiu.lu@intel.com>
19536         * configure.ac: Support -Bstatic/-Bdynamic for linker version > 2.
19537         * configure: Regenerated.
19539 2009-04-02  Rafael Avila de Espindola  <espindola@google.com>
19541         * c-decl.c (merge_decls): Make sure newdecl and olddecl don't
19542         share the argument list.
19544 2009-04-02  Rafael Avila de Espindola  <espindola@google.com>
19546         Merge
19548         2009-02-12  Diego Novillo  <dnovillo@google.com>
19550         * varpool.c (debug_varpool): New.
19551         * cgraph.h (debug_varpool): Declare.
19553 2009-04-02  Jan Hubicka  <jh@suse.cz>
19555         * passes.c (init_optimization_passes): Remove two copies of ehcleanup
19556         pass.
19558 2009-04-02  H.J. Lu  <hongjiu.lu@intel.com>
19560         * config/i386/i386.c (ix86_abi): Move initialization to ...
19561         (override_options): Here.
19563 2009-04-02  Christian Bruel  <christian.bruel@st.com>
19565         * config/sh/sh.c (sh_dwarf_register_span): New function.
19566         (TARGET_DWARF_REGISTER_SPAN): Define.
19567         * config/sh/sh-protos.h (sh_dwarf_register_span): Declare.
19569 2009-04-02  Ira Rosen  <irar@il.ibm.com>
19571         PR tree-optimization/39595
19572         * tree-vect-slp.c (vect_build_slp_tree): Check that the size of
19573         interleaved loads group is not  greater than the SLP group size.
19575 2009-04-02  Rafael Avila de Espindola  <espindola@google.com>
19577         * builtins.c (is_builtin_name): New.
19578         (called_as_built_in): Use is_builtin_name.
19579         * tree.h (is_builtin_name): New.
19580         * varasm.c (incorporeal_function_p): Use is_builtin_name
19582 2009-04-02  Andrew Stubbs  <ams@codesourcery.com>
19584         * config/sh/linux-unwind.h: Disable when inhibit_libc is defined.
19586 2009-04-02  Dodji Seketeli  <dodji@redhat.com>
19588         PR c++/26693
19589         * c-decl.c (clone_underlying_type): Move this ...
19590         * c-common.c (set_underlying_type): ... here.
19591         Also, make sure the function properly sets TYPE_STUB_DECL() on
19592         the newly created typedef variant type.
19593         * c-common.h (is_typedef_decl, set_underlying_type): Declare ...
19594         * c-common.c (is_typedef_decl, set_underlying_type): ... new entry
19595         points.
19597 2009-04-02  Richard Guenther  <rguenther@suse.de>
19599         PR tree-optimization/37221
19600         * tree-flow.h (degenerate_phi_result): Declare.
19601         * tree-ssa-dom.c (degenerate_phi_result): Export.
19602         * tree-scalar-evolution.c (analyze_initial_condition): If
19603         the initial condition is defined by a degenerate PHI node
19604         use the degenerate value.
19606 2009-04-01  Eric Botcazou  <ebotcazou@adacore.com>
19608         PR rtl-optimization/39588
19609         * combine.c (merge_outer_ops): Do not set the constant when this
19610         is not necessary.
19611         (simplify_shift_const_1): Do not modify it either in this case.
19613 2009-04-01  Steven Bosscher  <steven@gcc.gnu.org>
19615         * config/ia64/ia64.c (ia64_handle_option): Inform user that Itanium1
19616         tuning is deprecated if -mtune value is set to an Itanium1 variant.
19618 2009-04-01  Janis Johnson  <janis187@us.ibm.com>
19620         PR c/29027
19621         * c-lex.c (interpret_float): Default (no suffix) is double.
19623 2009-04-1  Xinliang David Li  <davidxl@google.com>
19625         * config/i386/i386.c (legitimate_constant_p): Recognize
19626         all one vector constant.
19628 2009-04-01  Jan-Benedict Glaw  <jbglaw@jbglaw-dev.homezone.telefonica.de>
19630         * config/vax/vax.c: Add #includes to silence warnings.
19631         Change #include order to silence two warnings.
19633 2009-04-01  Jan-Benedict Glaw  <jbglaw@jbglaw-dev.homezone.telefonica.de>
19635         * config/vax/linux.h (TARGET_DEFAULT): Add the MASK_QMATH flag bit.
19636         (ASM_SPEC): Pass -k to the assembler for PIC code.
19638 2009-04-01  Jan-Benedict Glaw  <jbglaw@jbglaw-dev.homezone.telefonica.de>
19640         * config.gcc: Add vax-*-linux* to the switch.
19641         * config/vax/linux.h: New file. (TARGET_VERSION,
19642         TARGET_OS_CPP_BUILTINS, TARGET_DEFAULT, CPP_SPEC, LINK_SPEC): Define.
19644 2009-04-01  Jan-Benedict Glaw  <jbglaw@jbglaw-dev.homezone.telefonica.de>
19646         * config/vax/vax.c (vax_output_int_move, adjacent_operands_p):
19647         Use predicate macros instead of GET_CODE() == foo.
19648         * config/vax/vax.md (movsi_2, movstrictqi, and<mode>3, ashrsi3,
19649         ashlsi3, rotrsi3, <unnamed>): Likewise.
19651 2009-04-01  Jan-Benedict Glaw  <jbglaw@jbglaw-dev.homezone.telefonica.de>
19653         * config/vax/builtins.md (jbbssiqi, jbbssihi, jbbssisi, jbbcciqi,
19654         jbbccihi, jbbccisi): Remova trailing whitespace.
19655         * config/vax/constraints.md: Likewise.
19656         * config/vax/elf.h: (ASM_PREFERRED_EH_DATA_FORMAT): Likewise.
19657         * config/vax/openbsd1.h (OBSD_OLD_GAS): Likewise.
19658         * config/vax/predicates.md: Likewise.
19659         * config/vax/vax.c (print_operand_address, vax_output_int_move,
19660         vax_expand_addsub_di_operands, adjacent_operands_p): Likewise.
19661         * config/vax/vax.h: Likewise.
19662         * config/vax/vax.md (nonlocal_goto): Likewise.
19664 2009-04-01  Jan-Benedict Glaw  <jbglaw@jbglaw-dev.homezone.telefonica.de>
19666         * config/vax/vax.c (vax_float_literal, vax_output_int_move)
19667         (indirectable_address_p, adjacent_operands_p): Add spaces around
19668         braces.
19669         * config/vax/vax-protos.h (adjacent_operands_p): Likewise.
19671 2009-04-01  Jan-Benedict Glaw  <jbglaw@jbglaw-dev.homezone.telefonica.de>
19673         * config/vax/vax.c (legitimate_constant_address_p,
19674         legitimate_constant_p, indirectable_address_p, nonindexed_address_p,
19675         index_term_p, reg_plus_index_p, legitimate_address_p,
19676         vax_mode_dependent_address_p): Update comments to match functions
19677         modified by the recent int->bool conversion.
19679 2009-04-01  Jan-Benedict Glaw  <jbglaw@jbglaw-dev.homezone.telefonica.de>
19681         * config/vax/builtins.md: Update copyright message.
19682         * config/vax/constraints.md: Likewise.
19683         * config/vax/netbsd-elf.h: Likewise.
19684         * config/vax/predicates.md: Likewise.
19685         * config/vax/vax-protos.h: Likewise.
19686         * config/vax/vax.c: Likewise.
19687         * config/vax/vax.h: Likewise.
19688         * config/vax/vax.md: Likewise.
19689         * config/vax/vax.opt: Likewise.
19691 2009-04-01  Jan-Benedict Glaw  <jbglaw@jbglaw-dev.homezone.telefonica.de>
19693         * config/vax/builtins.md (ffssi2, ffssi2_internal,
19694         sync_lock_test_and_set<mode>, sync_lock_release<mode>): Fix indention.
19695         * config/vax/constraints.md (B, R): Likewise.
19696         * config/vax/predicates.md (external_memory_operand,
19697         nonimmediate_addsub_di_operand): Likewise.
19698         * config/vax/vax.c (vax_output_int_add): Likewise.
19699         * config/vax/vax.md (movsi, movsi_2, mov<mode>, call_value,
19700         untyped_call): Likewise.
19702 2009-04-01  Matt Thomas  <matt@3am-software.com>
19704         * config/vax/predicates.md: New file.
19705         (symbolic_operand, local_symbolic_operand, external_symbolic_operand,
19706         external_const_operand, nonsymbolic_operand, external_memory_operand,
19707         indirect_memory_operand, indexed_memory_operand,
19708         illegal_blk_memory_operand, illegal_addsub_di_memory_operand,
19709         nonimmediate_addsub_di_operand, general_addsub_di_operand): New
19710         predicate.
19711         * config/vax/constraints.md: New file.
19712         (Z0, U06,  U08, U16, CN6, S08, S16, I, J, K, L, M, N, O, G, Q, B, R, T):
19713         New constraint.
19714         * config/vax/builtins.md: New file.
19715         (ffssi2, ffssi2_internal, sync_lock_test_and_set<mode>, jbbssiqi,
19716         jbbssihi, jbbssisi, sync_lock_release<mode>, jbbcciqi, jbbccihi,
19717         jbbccisi): Define.
19718         * config/vax/vax.opt (mqmath): Add option.
19719         * config/vax/vax.md (isfx): Extend with DI.
19720         (VAXintQH, VAXintQHSD): Define.
19721         (tst<mode>, cmp<mode>, *bit<mode>, movmemhi1, truncsiqi2, truncsihi2,
19722         mulsidi3, add<mode>3, sub<mode>, mul<mode>3, div<mode>3, and<mode>,
19723         and<mode>_const_int, ior<mode>3, xor<mode>3, neg<mode>2,
19724         one_cmpl<mode>2, ashlsi3, lshrsi3, rotlsi3): Update constraints.
19725         (movdi): Update constraints and use vax_output_int_move().
19726         (movsi, movsi_2, pushlclsymreg, pushextsymreg, movlclsymreg,
19727         movextsymreg, adddi3, adcdi3, subdi3, sbcdi3, pushextsym, movextsym,
19728         pushlclsym, movlclsym, movaddr<mode>, pushaddr<mode>,
19729         nonlocal_goto): New.
19730         (mov<mode>): Extend accepted operand types.
19731         (subdi3_old): Rename from subdi3, change update constraints and use
19732         a new implementation.
19733         * config/vax/vax.h (PCC_BITFIELD_TYPE_MATTERS): Add space.
19734         (FRAME_POINTER_CFA_OFFSET, IRA_COVER_CLASSES, CLASS_MAX_NREGS,
19735         MOVE_RATIO, CLEAR_RATIO): Define.
19736         (REG_CLASS_FROM_LETTER, CONST_OK_FOR_LETTER_P,
19737         CONST_DOUBLE_OK_FOR_LETTER_P, EXTRA_CONSTRAINT): Delete.
19738         (PRINT_OPERAND): Redefine using a function instead of inlined code.
19739         * config/vax/vax.c (TARGET_BUILTIN_SETJMP_FRAME_VALUE): Define.
19740         (split_quadword_operands): Make static and really allow variable
19741         splitting.
19742         (print_operand_address): Update for PIC generation.
19743         (print_operand, vax_builtin_setjmp_frame_value, vax_output_int_subtract,
19744         indexable_address_p, fixup_mathdi_operand,
19745         vax_expand_addsub_di_operands, adjacent_operands_p): New.
19746         (vax_float_literal, legitimate_constant_p,
19747         indirectable_constant_address_p, index_term_p,
19748         reg_plus_index_p): Return bool instead of int.
19749         (vax_rtx_costs): Fix cost for CONST_INT, indent and use HOST_WIDE_INT
19750         where needed.
19751         (vax_output_int_move, vax_output_int_add): Extend to allow PIC
19752         generation.
19753         (vax_output_conditional_branch): Indent.
19754         (legitimate_constant_address_p, indirectable_constant_address_p,
19755         indirectable_address_p, nonindexed_address_p, legitimate_address_p,
19756         vax_mode_dependent_address_p): Return bool instead of int, update for
19757         PIC generation.
19758         * config/vax/vax-protos.h (legitimate_constant_address_p,
19759         legitimate_constant_p, legitimate_address_p,
19760         vax_mode_dependent_address_p): Change declaration to bool.
19761         (legitimate_pic_operand_p, adjacent_operands_p, print_operand,
19762         vax_expand_addsub_di_operands, vax_output_int_subtract,
19763         vax_output_movmemsi): Declare.
19764         (split_quadword_operands, vax_float_literal): Delete declaration.
19765         * config/vax/netbsd-elf.h (CC1_SPEC, CC1PLUS_SPEC) Define.
19766         * config/vax/elf.h (NO_EXTERNAL_INDIRECT_ADDRESS,
19767         VAX_CC1_AND_CC1PLUS_SPEC, ASM_PREFERRED_EH_DATA_FORMAT,
19768         ASM_OUTPUT_DWARF_PCREL): Define.
19769         (ASM_SPEC): Change definition to allow PIC generation.
19771 2009-04-01  Steve Ellcey  <sje@cup.hp.com>
19773         * doc/sourcebuild.texi: Update front-end requirements.
19775 2009-04-01  Jakub Jelinek  <jakub@redhat.com>
19777         PR target/39226
19778         * config/rs6000/rs6000.md (andsi3_internal5_nomc,
19779         anddi3_internal2_nomc, anddi3_internal3_nomc): Removed.
19780         (booldi3_internal3): Use boolean_or_operator instead of
19781         boolean_operator.
19783 2009-04-01  Joseph Myers  <joseph@codesourcery.com>
19785         PR c/39605
19786         * c-decl.c (grokdeclarator): Pedwarn for file-scope array
19787         declarator whose size is not an integer constant expression but
19788         folds to an integer constant, then treat it as a constant
19789         subsequently.
19791 2009-04-01  Richard Guenther  <rguenther@suse.de>
19793         * fold-const.c (fold_plusminus_mult_expr): Do not fold
19794         i * 4 + 2 to (i * 2 + 1) * 2.
19796 2009-04-01  Jakub Jelinek  <jakub@redhat.com>
19798         PR c/37772
19799         * c-parser.c (c_parser_asm_statement): Skip until close paren and
19800         return if c_parser_asm_string_literal returned NULL.
19802 2009-04-01  Nick Clifton  <nickc@redhat.com>
19804         * config/m32c/m32c.h (LIBGCC2_UNITS_PER_WORD): Define if not
19805         already defined.
19806         * config/m32c/t-m32c (LIB2FUNCS_EXTRA): Add m32c-lib2-trapv.c.
19807         * config/m32c/m32c-lib2.c: Remove unused typedefs.  Rename the
19808         other typedefs to avoid conflicts with libgcc2.c.  Define labels
19809         to gain 16-bit bit-manipulation functions from libgcc2.c and then
19810         include it.
19811         * config/m32c/m32c-lib2-trapv.c: New file.  Define labels
19812         to gain 16-bit trapping arithmetic functions from libgcc2.c and
19813         then include it.
19815 2009-04-01  Rafael Avila de Espindola  <espindola@google.com>
19817         * varasm.c (default_function_rodata_section): Declare DOT as
19818         const char*.
19820 2009-04-01  Kai Tietz  <kai.tietz@onevision.com>
19821             Andrey Galkin  <agalkin@hypercom.com>
19823         PR/39492
19824         * config/i386/host-mingw32.c (mingw32_gt_pch_use_address):
19825         Make object_name unique for each process.
19827 2009-04-01  Jakub Jelinek  <jakub@redhat.com>
19829         PR other/39591
19830         * omp-low.c (remove_exit_barrier): Don't optimize if there are any
19831         addressable variables in the parallel that could go out of scope while
19832         running queued tasks.
19834 2009-04-01  Anatoly Sokolov  <aesok@post.ru>
19836         * config/avr/avr.h (avr_case_values_threshold): Remove declaration.
19837         (CASE_VALUES_THRESHOLD): Redefine.
19838         * config/avr/avr.c (avr_override_options): Remove initialization of
19839         avr_case_values_threshold variable.
19840         (avr_case_values_threshold): Remove variable. Add new function.
19841         * config/avr/avr-protos.h (avr_case_values_threshold): Declare.
19842         * config/avr/avr.opt (mno-tablejump): Remove option.
19843         * doc/invoke.texi (AVR Options): Remove -mno-tablejump.
19845 2009-04-01  DJ Delorie  <dj@redhat.com>
19847         * varasm.c (default_function_rodata_section): Don't assume
19848         anything about where the first '.' in the section name is.
19850 2009-04-01  Alan Modra  <amodra@bigpond.net.au>
19852         * config/rs6000/rs6000.c (rs6000_emit_stack_reset): Delete redundant
19853         rs6000_emit_stack_tie.
19855 2009-03-31  Ian Lance Taylor  <iant@google.com>
19857         * tree-eh.c (tree_remove_unreachable_handlers): Compare
19858         gimple_code with GIMPLE_RESX, not RESX.
19860 2009-03-31  Joseph Myers  <joseph@codesourcery.com>
19862         * c-common.c (c_get_ident): New.
19863         (c_common_nodes_and_builtins): Call it for type names that may be NULL.
19865 2009-04-01  Ben Elliston  <bje@au.ibm.com>
19867         * config/rs6000/sysv4.opt (msdata): Improve option description.
19869 2009-03-31  Steve Ellcey  <sje@cup.hp.com>
19871         * config/ia64/ia64.md (divsf3_internal_lat): Remove.
19872         (divdf3_internal_lat): Remove.
19873         (divxf3_internal_lat): Remove.
19874         (divxf3_internal_thr): Remove.
19875         (divxf): Use divxf3_internal.
19876         * config/ia64/div.md (divsf3_internal_lat): New.
19877         (divdf3_internal_lat): New.
19878         (divxf3_internal): New.
19880 2009-03-31  Joseph Myers  <joseph@codesourcery.com>
19882         PR c/448
19883         * Makefile.in (USE_GCC_STDINT): Define.
19884         (stmp-int-hdrs): Install stdint.h if applicable.
19885         * c-common.c (CHAR16_TYPE): Define in terms of UINT_LEAST16_TYPE
19886         if known.
19887         (CHAR32_TYPE): Define in terms of UINT_LEAST32_TYPE if known.
19888         (SIG_ATOMIC_TYPE, INT8_TYPE, INT16_TYPE, INT32_TYPE, INT64_TYPE,
19889         UINT8_TYPE, UINT16_TYPE, UINT32_TYPE, UINT64_TYPE,
19890         INT_LEAST8_TYPE, INT_LEAST16_TYPE, INT_LEAST32_TYPE,
19891         INT_LEAST64_TYPE, UINT_LEAST8_TYPE, UINT_LEAST16_TYPE,
19892         UINT_LEAST32_TYPE, UINT_LEAST64_TYPE, INT_FAST8_TYPE,
19893         INT_FAST16_TYPE, INT_FAST32_TYPE, INT_FAST64_TYPE,
19894         UINT_FAST8_TYPE, UINT_FAST16_TYPE, UINT_FAST32_TYPE,
19895         UINT_FAST64_TYPE, INTPTR_TYPE, UINTPTR_TYPE): Define.
19896         (c_common_nodes_and_builtins): Initialize
19897         underlying_wchar_type_node.  Do not initialize
19898         signed_wchar_type_node or unsigned_wchar_type_node.  Initialize
19899         nodes for new types.
19900         (c_stddef_cpp_builtins): Define macros for new types.
19901         * c-common.h (CTI_SIGNED_WCHAR_TYPE, CTI_UNSIGNED_WCHAR_TYPE):
19902         Remove.
19903         (CTI_UNDERLYING_WCHAR_TYPE, CTI_SIG_ATOMIC_TYPE, CTI_INT8_TYPE,
19904         CTI_INT16_TYPE, CTI_INT32_TYPE, CTI_INT64_TYPE, CTI_UINT8_TYPE,
19905         CTI_UINT16_TYPE, CTI_UINT32_TYPE, CTI_UINT64_TYPE,
19906         CTI_INT_LEAST8_TYPE, CTI_INT_LEAST16_TYPE, CTI_INT_LEAST32_TYPE,
19907         CTI_INT_LEAST64_TYPE, CTI_UINT_LEAST8_TYPE, CTI_UINT_LEAST16_TYPE,
19908         CTI_UINT_LEAST32_TYPE, CTI_UINT_LEAST64_TYPE, CTI_INT_FAST8_TYPE,
19909         CTI_INT_FAST16_TYPE, CTI_INT_FAST32_TYPE, CTI_INT_FAST64_TYPE,
19910         CTI_UINT_FAST8_TYPE, CTI_UINT_FAST16_TYPE, CTI_UINT_FAST32_TYPE,
19911         CTI_UINT_FAST64_TYPE, CTI_INTPTR_TYPE, CTI_UINTPTR_TYPE): Define.
19912         (signed_wchar_type_node, unsigned_wchar_type_node): Remove.
19913         (underlying_wchar_type_node, sig_atomic_type_node, int8_type_node,
19914         int16_type_node, int32_type_node, int64_type_node,
19915         uint8_type_node, uint16_type_node, c_uint32_type_node,
19916         c_uint64_type_node, int_least8_type_node, int_least16_type_node,
19917         int_least32_type_node, int_least64_type_node,
19918         uint_least8_type_node, uint_least16_type_node,
19919         uint_least32_type_node, uint_least64_type_node,
19920         int_fast8_type_node, int_fast16_type_node, int_fast32_type_node,
19921         int_fast64_type_node, uint_fast8_type_node, uint_fast16_type_node,
19922         uint_fast32_type_node, uint_fast64_type_node, intptr_type_node,
19923         uintptr_type_node): Define.
19924         * c-cppbuiltin.c (builtin_define_constants,
19925         builtin_define_type_minmax): New.
19926         (builtin_define_stdint_macros): Define more macros.
19927         (c_cpp_builtins): Define more limit macros.
19928         (type_suffix): New.
19929         (builtin_define_type_max): Define in terms of
19930         builtin_define_type_minmax.  Remove is_long parameter.  All
19931         callers changed.
19932         * config.gcc (use_gcc_stdint): Define.
19933         (tm_file): Add glibc-stdint.h for targets using glibc or uClibc.
19934         Add newlib-stdint.h for generic targets.
19935         * config/glibc-stdint.h, config/newlib-stdint.h,
19936         ginclude/stdint-gcc.h, ginclude/stdint-wrap.h: New.
19937         * config/m32c/m32c.h (UINTPTR_TYPE): Define.
19938         * config/score/score.h (UINTPTR_TYPE): Define.
19939         * config/sol2.h (SIG_ATOMIC_TYPE, INT8_TYPE, INT16_TYPE,
19940         INT32_TYPE, INT64_TYPE, UINT8_TYPE, UINT16_TYPE, UINT32_TYPE,
19941         UINT64_TYPE, INT_LEAST8_TYPE, INT_LEAST16_TYPE, INT_LEAST32_TYPE,
19942         INT_LEAST64_TYPE, UINT_LEAST8_TYPE, UINT_LEAST16_TYPE,
19943         UINT_LEAST32_TYPE, UINT_LEAST64_TYPE, INT_FAST8_TYPE,
19944         INT_FAST16_TYPE, INT_FAST32_TYPE, INT_FAST64_TYPE,
19945         UINT_FAST8_TYPE, UINT_FAST16_TYPE, UINT_FAST32_TYPE,
19946         UINT_FAST64_TYPE, INTPTR_TYPE, UINTPTR_TYPE): Define.
19947         * config/spu/spu.h (STDINT_LONG32): Define.
19948         * configure.ac (use_gcc_stdint): Substitute.
19949         * configure: Regenerate.
19950         * doc/cpp.texi (__SIG_ATOMIC_TYPE__, __INT8_TYPE__,
19951         __INT16_TYPE__, __INT32_TYPE__, __INT64_TYPE__, __UINT8_TYPE__,
19952         __UINT16_TYPE__, __UINT32_TYPE__, __UINT64_TYPE__,
19953         __INT_LEAST8_TYPE__, __INT_LEAST16_TYPE__, __INT_LEAST32_TYPE__,
19954         __INT_LEAST64_TYPE__, __UINT_LEAST8_TYPE__, __UINT_LEAST16_TYPE__,
19955         __UINT_LEAST32_TYPE_, __UINT_LEAST64_TYPE__, __INT_FAST8_TYPE__,
19956         __INT_FAST16_TYPE__, __INT_FAST32_TYPE__, __INT_FAST64_TYPE__,
19957         __UINT_FAST8_TYPE__, __UINT_FAST16_TYPE__, __UINT_FAST32_TYPE__,
19958         __UINT_FAST64_TYPE__, __INTPTR_TYPE__, __UINTPTR_TYPE__,
19959         __WINT_MAX__, __SIZE_MAX__, __PTRDIFF_MAX__, __UINTMAX_MAX__,
19960         __SIG_ATOMIC_MAX__, __INT8_MAX__, __INT16_MAX__, __INT32_MAX__,
19961         __INT64_MAX__, __UINT8_MAX__, __UINT16_MAX__, __UINT32_MAX__,
19962         __UINT64_MAX__, __INT_LEAST8_MAX__, __INT_LEAST16_MAX__,
19963         __INT_LEAST32_MAX__, __INT_LEAST64_MAX__, __UINT_LEAST8_MAX__,
19964         __UINT_LEAST16_MAX__, __UINT_LEAST32_MAX__, __UINT_LEAST64_MAX__,
19965         __INT_FAST8_MAX__, __INT_FAST16_MAX__, __INT_FAST32_MAX__,
19966         __INT_FAST64_MAX__, __UINT_FAST8_MAX__, __UINT_FAST16_MAX__,
19967         __UINT_FAST32_MAX__, __UINT_FAST64_MAX__, __INTPTR_MAX__,
19968         __UINTPTR_MAX__, __WCHAR_MIN__, __WINT_MIN__, __SIG_ATOMIC_MIN__,
19969         __INT8_C, __INT16_C, __INT32_C, __INT64_C, __UINT8_C, __UINT16_C,
19970         __UINT32_C, __UINT64_C, __INTMAX_C, __UINTMAX_C): Document.
19971         * doc/tm.texi (SIG_ATOMIC_TYPE, INT8_TYPE, INT16_TYPE, INT32_TYPE,
19972         INT64_TYPE, UINT8_TYPE, UINT16_TYPE, UINT32_TYPE, UINT64_TYPE,
19973         INT_LEAST8_TYPE, INT_LEAST16_TYPE, INT_LEAST32_TYPE,
19974         INT_LEAST64_TYPE, UINT_LEAST8_TYPE, UINT_LEAST16_TYPE,
19975         UINT_LEAST32_TYPE, UINT_LEAST64_TYPE, INT_FAST8_TYPE,
19976         INT_FAST16_TYPE, INT_FAST32_TYPE, INT_FAST64_TYPE,
19977         UINT_FAST8_TYPE, UINT_FAST16_TYPE, UINT_FAST32_TYPE,
19978         UINT_FAST64_TYPE, INTPTR_TYPE, UINTPTR_TYPE): Document.
19980 2009-03-31  Bernd Schmidt  <bernd.schmidt@analog.com>
19982         * loop-iv.c (suitable_set_for_replacement): Renamed from
19983         simplify_using_assignment; changed to return bool and to accept new
19984         args DEST and SRC.  Return true iff we find a source/destination pair
19985         that can be used to make a replacement, and fill SRC and DEST if so.
19986         Remove arg ALTERED.  Don't deal with altered regs here.  All callers
19987         changed.
19988         (simplify_using_initial_values): Deal with altered regs here and track
19989         more precisely the effect they have on the validity of our expression.
19991         * loop-iv.c (simplify_using_condition): A condition of the form
19992         (EQ REG CONST) can be used to simply make a substitution.
19993         (simplify_using_initial_values): Keep track of conditions we have seen
19994         and keep using them to simplify new expressions, while applying the
19995         same substitutions to them as to the expression.
19997         * simplify-rtx.c (simplify_relational_operation_1): Simplify
19998         (LTU (PLUS a C) C) or (LTU (PLUS a C) a) to (GEU a -C); likewise with
19999         GEU/LTU reversed.
20001         * loop-iv.c (determine_max_iter): New arg OLD_NITER.  All callers
20002         changed.  Use this when trying to improve the upper bound.
20003         Generate the comparison by using simplify_gen_relational.
20005         * loop-iv.c (simple_rhs_p): Allow more kinds of expressions.
20007         * loop-iv.c (replace_single_def_regs, replace_in_expr): New static
20008         functions.
20009         (simplify_using_assignment, simplify_using_initial_values): Call
20010         replace_in_expr to make replacements.  Call replace_single_def_regs
20011         once on the initial version of the expression.
20013 2009-03-31  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
20015         PR target/27237
20016         * doc/invoke.texi (ARM Options): Update documentation for -mthumb.
20018 2009-03-31  Richard Guenther  <rguenther@suse.de>
20020         PR middle-end/31029
20021         * fold-const.c (fold_binary): Fold X +- Y CMP X to Y CMP 0 for
20022         equality comparisons.  Fold C - X CMP X if C % 2 == 1.
20024 2009-03-31  Richard Guenther  <rguenther@suse.de>
20026         * tree.h (div_if_zero_remainder): Declare.
20027         * fold-const.c (div_if_zero_remainder): Export.
20028         * tree-ssa-forwprop.c
20029         (forward_propagate_addr_into_variable_array_index): Handle
20030         constant array index addition outside of the variable index.
20032 2009-03-31  Joseph Myers  <joseph@codesourcery.com>
20034         PR target/39592
20035         * config/i386/i386.md (*floatunssi<mode>2_1, two unnamed
20036         define_splits, floatunssi<mode>2): Require x87 conversions from
20037         DImode to be permitted.
20039 2009-03-31  Joseph Myers  <joseph@codesourcery.com>
20041         PR preprocessor/15638
20042         * c-common.c (c_cpp_error): Handle CPP_DL_FATAL.
20044 2009-03-31  Richard Guenther  <rguenther@suse.de>
20046         PR middle-end/23401
20047         PR middle-end/27810
20048         * tree.h (DECL_GIMPLE_FORMAL_TEMP_P): Remove.
20049         (struct tree_decl_with_vis): Remove gimple_formal_temp member.
20050         * tree-eh.c (lower_eh_constructs_2): Move LHS assignment to
20051         a separate statement.
20052         * gimplify.c (pop_gimplify_context): Remove formal temp handling.
20053         (lookup_tmp_var): Likewise.
20054         (is_gimple_formal_tmp_or_call_rhs): Remove.
20055         (is_gimple_reg_or_call_rhs): Rename to ...
20056         (is_gimple_reg_rhs_or_call): ... this.
20057         (is_gimple_mem_or_call_rhs): Rename to ...
20058         (is_gimple_mem_rhs_or_call): ... this.
20059         (internal_get_tmp_var): Use is_gimple_reg_rhs_or_call.  Set
20060         DECL_GIMPLE_REG_P only if is_formal is true.
20061         (gimplify_compound_lval): Use is_gimple_reg.  Remove workaround
20062         for non-proper post-modify expression gimplification.
20063         (gimplify_self_mod_expr): For post-modify expressions gimplify
20064         the lvalue to a minimal lvalue.
20065         (rhs_predicate_for): Remove formal temp case.
20066         (gimplify_modify_expr_rhs): Likewise.
20067         (gimplify_addr_expr): Use is_gimple_reg.
20068         (gimplify_expr): Remove formal temp cases.
20069         (gimple_regimplify_operands): Likewise.
20070         * tree-ssa-pre.c (get_or_alloc_expr_for): Treat EXC_PTR_EXPR
20071         and FILTER_EXPR like constants.
20072         * gimple.c (walk_gimple_op): Fix val_only initialization, use
20073         is_gimple_reg.
20074         (is_gimple_formal_tmp_rhs): Remove.
20075         (is_gimple_reg_rhs): Remove special casing.
20076         (is_gimple_mem_rhs): Fix.
20077         (is_gimple_reg): Move DECL_GIMPLE_REG_P handling earlier.
20078         (is_gimple_formal_tmp_var): Remove.
20079         (is_gimple_formal_tmp_reg): Likewise.
20080         (is_gimple_min_lval): Allow invariant component ref parts.
20081         * gimple.h (is_gimple_formal_tmp_rhs, is_gimple_formal_tmp_var,
20082         is_gimple_formal_tmp_reg): Remove declarations.
20083         * tree-cfg.c (verify_expr): Verify that variables with address
20084         taken do not have DECL_GIMPLE_REG_P set.
20085         * tree-mudflap.c (mf_build_check_statement_for): Use
20086         force_gimple_operand instead of gimplify_expr.
20088 2009-03-31  Ayal Zaks  <zaks@il.ibm.com>
20090         * modulo-sched.c (sms_schedule_by_order): Pass the actual
20091         schedulable rows to compute_split_row.
20093 2009-03-31  Ben Elliston  <bje@au.ibm.com>
20095         PR target/31635
20096         * config/rs6000/rs6000.c (rs6000_handle_option): Handle
20097         OPT_mvrsave.
20099 2009-03-31  Alan Modra  <amodra@bigpond.net.au>
20101         * doc/invoke.texi (RS/6000 and PowerPC Options):Document mtls-markers.
20102         * configure.ac (HAVE_AS_TLS_MARKERS): New gas feature check.
20103         * configure: Regenerate.
20104         * config.in: Regenerate.
20105         * config/rs6000/rs6000.opt (mtls-markers): Add.
20106         * config/rs6000/rs6000.h (TARGET_TLS_MARKERS): Define.
20107         * config/rs6000/rs6000.md (tls_gd_aix, tls_gd_sysv): Add splitter.
20108         (tls_ld_aix, tls_ld_sysv): Likewise.
20109         (tls_gd, tls_gd_call_aix, tls_gd_call_sysv): New insns.
20110         (tls_ld, tls_ld_call_aix, tls_ld_call_sysv): Likewise.
20112 2009-03-31  Alan Modra  <amodra@bigpond.net.au>
20114         * config/spu/spu.c (spu_expand_prologue): Delete redundant code.
20116 2009-03-30  Jan Hubicka  <jh@suse.cz>
20118         * tree-eh.c (make_eh_edges): Set probability 100% to first edge
20119         out of RESX.
20120         (tree_remove_unreachable_handlers): Cleanup EH predecestor
20121         detection and label handling.
20123 2009-03-30  Vladimir Makarov  <vmakarov@redhat.com>
20125         * ira-int.h (ira_allocno): Rename left_conflicts_num to
20126         left_conflicts_size.
20127         (ALLOCNO_LEFT_CONFLICTS_NUM): Rename to
20128         ALLOCNO_LEFT_CONFLICTS_SIZE.
20130         * ira-color.c (allocno_spill_priority, push_allocno_to_stack,
20131         remove_allocno_from_bucket_and_push,
20132         allocno_spill_priority_compare, push_allocnos_to_stack,
20133         setup_allocno_available_regs_num): Use ALLOCNO_LEFT_CONFLICTS_SIZE
20134         instead of ALLOCNO_LEFT_CONFLICTS_NUM.
20135         (setup_allocno_left_conflicts_num): Ditto.  Rename to
20136         setup_allocno_left_conflicts_size.
20137         (put_allocno_into_bucket): Use ALLOCNO_LEFT_CONFLICTS_SIZE
20138         instead of ALLOCNO_LEFT_CONFLICTS_NUM and
20139         setup_allocno_left_conflicts_size instead of
20140         setup_allocno_left_conflicts_num.
20142         * ira-build.c (ira_create_allocno): Use
20143         ALLOCNO_LEFT_CONFLICTS_SIZE instead of
20144         ALLOCNO_LEFT_CONFLICTS_NUM.
20146 2009-03-30  Vladimir Makarov  <vmakarov@redhat.com>
20148         * reload.c (push_reload, find_dummy_reload): Use df_get_live_out
20149         instead of DF_LR_OUT.
20151         * ira-lives.c (process_bb_node_lives): Ditto.
20153         * ira-color.c (ira_loop_edge_freq): Use df_get_live_{out,in}
20154         instead of DF_LR_{OUT,IN}.
20156         * ira-emit.c (generate_edge_moves, add_ranges_and_copies): Ditto.
20158         * ira-build.c (create_bb_allocnos, create_loop_allocnos): Ditto.
20160 2009-03-30  Jan Hubicka  <jh@suse.cz>
20162         * except.c (label_to_region_map): Fix thinko.
20164 2009-03-30  Steve Ellcey  <sje@cup.hp.com>
20166         PR middle-end/38237
20167         * tree.h (tree_find_value): New declaration.
20168         * tree.c (tree_find_value): New function.
20169         * varasm.c (assemble_external): Avoid duplicate entries on lists.
20171 2009-03-30  Jakub Jelinek  <jakub@redhat.com>
20173         PR debug/39563
20174         * c-decl.c (struct c_binding): Add locus field.
20175         (bind): Add locus argument, set locus field from it.
20176         (pop_scope): For b->nested VAR_DECL or FUNCTION_DECL,
20177         add a DECL_EXTERNAL copy of b->decl to current BLOCK_VARS.
20178         (push_file_scope, pushtag, pushdecl, pushdecl_top_level,
20179         implicitly_declare, undeclared_variable, lookup_label,
20180         declare_label, c_make_fname_decl, c_builtin_function,
20181         c_builtin_function_ext_scope, store_parm_decls_newstyle): Adjust
20182         bind callers.
20184 2009-03-30  H.J. Lu  <hongjiu.lu@intel.com>
20186         PR target/38781
20187         * config/i386/i386.c (classify_argument): Check total size of
20188         structure.
20190 2009-03-30  Martin Jambor  <mjambor@suse.cz>
20192         * ipa-prop.h (jump_func_type): Rename IPA_UNKNOWN, IPA_CONST,
20193         IPA_CONST_MEMBER_PTR, and IPA_PASS_THROUGH to IPA_JF_UNKNOWN,
20194         IPA_JF_CONST, IPA_JF_CONST_MEMBER_PTR, and IPA_JF_PASS_THROUGH
20195         respectively.
20197         * tree-dfa.c (get_ref_base_and_extent): Return -1 maxsize if
20198         seen_variable_array_ref while also traversing a union.
20200         * tree-inline.c (optimize_inline_calls): Do not call
20201         cgraph_node_remove_callees.
20202         * cgraphbuild.c (remove_cgraph_callee_edges): New function.
20203         (pass_remove_cgraph_callee_edges): New variable.
20204         * passes.c (init_optimization_passes): Add
20205         pass_remove_cgraph_callee_edges after early inlining and before all
20206         late intraprocedural passes.
20208         * omp-low.c (expand_omp_taskreg): Always set current_function_decl.
20210 2009-03-30  Paolo Bonzini  <bonzini@gnu.org>
20212         * config/sparc/sparc.md (*nand<V64mode>_vis, *nand<V32mode>_vis):
20213         Fix typos in names.
20215 2009-03-30  Paolo Bonzini  <bonzini@gnu.org>
20217         * combine.c (simplify_comparison): Use have_insn_for.
20218         * dojump.c (do_jump): Likewise.
20220 2009-03-30  Paolo Bonzini  <bonzini@gnu.org>
20222         * config/sparc/sparc.c (sparc_compare_emitted): Remove.
20223         (gen_compare_reg, emit_v9_brxx_insn): Handle MODE_CC
20224         sparc_compare_op0 like sparc_compare_emitted used to be handled.
20225         (sparc_expand_compare_and_swap_12): Set sparc_compare_op0
20226         instead of sparc_compare_emitted.
20227         * config/sparc/sparc.h (sparc_compare_emitted): Remove.
20228         * config/sparc/sparc.md (stack_protect_test): Set sparc_compare_op0
20229         instead of sparc_compare_emitted.
20231 2009-03-30  Paolo Bonzini  <bonzini@gnu.org>
20233         * bb-reorder.c (partition_hot_cold_basic_blocks): Do not
20234         enter/exit cfglayout mode.
20235         (pass_partition_block): Require it.
20236         * combine.c (find_single_use, reg_dead_at_p): Use CFG.
20237         (combine_instructions): Track basic blocks instead of labels.
20238         (update_cfg_for_uncondjump): New.
20239         (try_combine): Use it.  Update jumps after rescanning.
20240         (pass_combine): Require PROP_cfglayout.
20241         * passes.c (pass_outof_cfg_layout_mode): Move after regmove.
20243 2009-03-30  Paolo Bonzini  <bonzini@gnu.org>
20245         * cfglayout.c (pass_into_cfg_layout_mode, pass_outof_cfg_layout_mode):
20246         Provide/destroy PROP_cfglayout respectively.
20247         * gcse.c (pass_jump_bypass, pass_gcse): Require it.
20248         * tree-pass.h (PROP_cfglayout): New.
20250 2009-03-30  Paolo Bonzini  <bonzini@gnu.org>
20252         * fold-const.c (const_binop, fold_convert_const_real_from_fixed,
20253         fold_convert_const_fixed_from_fixed,
20254         fold_convert_const_fixed_from_int,
20255         fold_convert_const_fixed_from_real, fold_negate_const): Do not
20256         set TREE_CONSTANT_OVERFLOW.
20257         * tree.def: Remove mention of TREE_CONSTANT_OVERFLOW.
20258         * tree.h (TREE_CONSTANT_OVERFLOW): Delete.
20260 2009-03-30  Ira Rosen  <irar@il.ibm.com>
20262         * tree-vect-loop-manip.c: New file.
20263         * tree-vectorizer.c: Update documentation and included files.
20264         (vect_loop_location): Make extern.
20265         (rename_use_op): Move to tree-vect-loop-manip.c
20266         (rename_variables_in_bb, rename_variables_in_loop,
20267         slpeel_update_phis_for_duplicate_loop,
20268         slpeel_update_phi_nodes_for_guard1,
20269         slpeel_update_phi_nodes_for_guard2, slpeel_make_loop_iterate_ntimes,
20270         slpeel_tree_duplicate_loop_to_edge_cfg, slpeel_add_loop_guard,
20271         slpeel_can_duplicate_loop_p, slpeel_verify_cfg_after_peeling,
20272         set_prologue_iterations, slpeel_tree_peel_loop_to_edge,
20273         find_loop_location): Likewise.
20274         (new_stmt_vec_info): Move to tree-vect-stmts.c.
20275         (init_stmt_vec_info_vec, free_stmt_vec_info_vec, free_stmt_vec_info,
20276         get_vectype_for_scalar_type, vect_is_simple_use,
20277         supportable_widening_operation, supportable_narrowing_operation):
20278         Likewise.
20279         (bb_in_loop_p): Move to tree-vect-loop.c.
20280         (new_loop_vec_info, destroy_loop_vec_info,
20281         reduction_code_for_scalar_code, report_vect_op,
20282         vect_is_simple_reduction, vect_is_simple_iv_evolution): Likewise.
20283         (vect_can_force_dr_alignment_p): Move to tree-vect-data-refs.c.
20284         (vect_supportable_dr_alignment): Likewise.
20285         * tree-vectorizer.h (tree-data-ref.h): Include.
20286         (vect_loop_location): Declare.
20287         Reorganize function declarations according to the new file structure.
20288         * tree-vect-loop.c: New file.
20289         * tree-vect-analyze.c: Remove. Move functions to tree-vect-data-refs.c,
20290         tree-vect-stmts.c, tree-vect-slp.c, tree-vect-loop.c.
20291         * tree-vect-data-refs.c: New file.
20292         * tree-vect-patterns.c (timevar.h): Don't include.
20293         * tree-vect-stmts.c: New file.
20294         * tree-vect-transform.c: Remove. Move functions to tree-vect-stmts.c,
20295         tree-vect-slp.c, tree-vect-loop.c.
20296         * Makefile.in (OBJS-common): Remove tree-vect-analyze.o and
20297         tree-vect-transform.o. Add tree-vect-data-refs.o, tree-vect-stmts.o,
20298         tree-vect-loop.o, tree-vect-loop-manip.o, tree-vect-slp.o.
20299         (tree-vect-analyze.o): Remove.
20300         (tree-vect-transform.o): Likewise.
20301         (tree-vect-data-refs.o): Add rule.
20302         (tree-vect-stmts.o, tree-vect-loop.o, tree-vect-loop-manip.o,
20303         tree-vect-slp.o): Likewise.
20304         (tree-vect-patterns.o): Remove redundant dependencies.
20305         (tree-vectorizer.o): Likewise.
20306         * tree-vect-slp.c: New file.
20308 2009-03-30  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
20310         * optc-gen.awk: Warn if an option flag has multiple different
20311         help strings.
20313 2009-03-30  Sebastian Pop  <sebastian.pop@amd.com>
20315         * doc/invoke.texi (-floop-interchange, -floop-strip-mine,
20316         -floop-block): Document dependences on PPL, CLooG and Graphite.
20318 2009-03-30  Joseph Myers  <joseph@codesourcery.com>
20320         PR rtl-optimization/323
20321         * c-common.c (c_fully_fold, convert_and_check,
20322         c_common_truthvalue_conversion): Handle EXCESS_PRECISION_EXPR.
20323         (c_fully_fold_internal): Disallow EXCESS_PRECISION_EXPR.
20324         * c-common.def (EXCESS_PRECISION_EXPR): New.
20325         * c-cppbuiltin.c (builtin_define_float_constants): Define
20326         constants with enough digits for long double.
20327         * c-lex.c (interpret_float): Interpret constant with excess
20328         precision where appropriate.
20329         * c-opts.c (c_common_post_options): Set
20330         flag_excess_precision_cmdline.  Give an error for
20331         -fexcess-precision=standard for C++ for processors where the
20332         option is significant.
20333         * c-parser.c (c_parser_conditional_expression): Handle excess
20334         precision in condition.
20335         * c-typeck.c (convert_arguments): Handle arguments with excess
20336         precision.
20337         (build_unary_op): Move excess precision outside operation.
20338         (build_conditional_expr): Likewise.
20339         (build_compound_expr): Likewise.
20340         (build_c_cast): Do cast on operand of EXCESS_PRECISION_EXPR.
20341         (build_modify_expr): Handle excess precision in RHS.
20342         (convert_for_assignment): Handle excess precision in converted
20343         value.
20344         (digest_init, output_init_element, process_init_element): Handle
20345         excess precision in initializer.
20346         (c_finish_return): Handle excess precision in return value.
20347         (build_binary_op): Handle excess precision in operands and add
20348         excess precision as needed for operation.
20349         * common.opt (-fexcess-precision=): New option.
20350         * config/i386/i386.h (X87_ENABLE_ARITH, X87_ENABLE_FLOAT): New.
20351         * config/i386/i386.md (float<SSEMODEI24:mode><X87MODEF:mode>2):
20352         For standard excess precision, output explicit conversion to and
20353         truncation from XFmode.
20354         (*float<SSEMODEI24:mode><X87MODEF:mode>2_1,
20355         *float<SSEMODEI24:mode><X87MODEF:mode>2_i387_with_temp,
20356         *float<SSEMODEI24:mode><X87MODEF:mode>2_i387, two unnamed
20357         define_splits, floatdi<X87MODEF:mode>2_i387_with_xmm, two unnamed
20358         define_splits, *floatunssi<mode>2_1, two unnamed define_splits,
20359         floatunssi<mode>2, add<mode>3, sub<mode>3, mul<mode>3, divdf3,
20360         divsf3, *fop_<mode>_comm_i387, *fop_<mode>_1_i387,
20361         *fop_<MODEF:mode>_2_i387, *fop_<MODEF:mode>_3_i387,
20362         *fop_df_4_i387, *fop_df_5_i387, *fop_df_6_i387, two unnamed
20363         define_splits, sqrt<mode>2): Disable where appropriate for
20364         standard excess precision.
20365         * convert.c (convert_to_real): Do not shorten arithmetic to type
20366         for which excess precision would be used.
20367         * defaults.h (TARGET_FLT_EVAL_METHOD_NON_DEFAULT): Define.
20368         * doc/invoke.texi (-fexcess-precision=): Document option.
20369         (-mfpmath=): Correct index entry.
20370         * flags.h (enum excess_precision, flag_excess_precision_cmdline,
20371         flag_excess_precision): New.
20372         * langhooks.c (lhd_post_options): Set
20373         flag_excess_precision_cmdline.
20374         * opts.c (common_handle_option): Handle -fexcess-precision=.
20375         * toplev.c (flag_excess_precision_cmdline, flag_excess_precision,
20376         init_excess_precision): New.
20377         (lang_dependent_init_target): Call init_excess_precision.
20378         * tree.c (excess_precision_type): New.
20379         * tree.h (excess_precision_type): Declare.
20381 2009-03-30  Joseph Myers  <joseph@codesourcery.com>
20383         PR c/35235
20384         * c-typeck.c (build_component_ref): Do not copy qualifiers from
20385         non-lvalue to component.
20387 2009-03-29  Joseph Myers  <joseph@codesourcery.com>
20389         PR preprocessor/34695
20390         * Makefile.in (c-opts.o): Depend on c-tree.h.
20391         * c-common.c: Move down include of diagnostic.h.
20392         (done_lexing, c_cpp_error): New.
20393         * c-common.h (done_lexing): Declare.
20394         * c-decl.c (c_write_global_declarations): Don't check cpp_errors
20395         (parse_in).
20396         * c-opts.c: Include c-tree.h.
20397         (c_common_init_options): Set preprocessor error callback.
20398         (c_common_handle_option): Do not set preprocessor
20399         inhibit_warnings, warnings_are_errors, warn_system_headers,
20400         pedantic_errors or inhibit_warnings flags.
20401         (c_common_post_options): Do not check cpp_errors (parse_in).
20402         (c_common_finish): Do not output dependencies if there were
20403         errors.  Do not check return value of cpp_finish.
20404         * c-ppoutput.c (pp_file_change): Set input_location.
20405         * c-tree.h (c_cpp_error): Declare.
20406         * diagnostic.c (diagnostic_set_info_translated): Also initialize
20407         override_column.
20408         (diagnostic_build_prefix): Check override_column.
20409         * diagnostic.h (diagnostic_info): Add override_column field.
20410         (diagnostic_override_column): Define.
20412 2009-03-28  Paolo Bonzini  <bonzini@gnu.org>
20414         * c-common.c (c_expand_expr, c_staticp): Remove.
20415         * c-common.def (COMPOUND_LITERAL_EXPR): Delete.
20416         * c-common.h (emit_local_var, c_staticp, COMPOUND_LITERAL_EXPR_DECL,
20417         COMPOUND_LITERAL_EXPR_DECL_EXPR): Remove.
20418         * c-gimplify.c (gimplify_compound_literal_expr,
20419         optimize_compound_literals_in_ctor): Remove.
20420         (c_gimplify_expr): Remove COMPOUND_LITERAL_EXPR handling.
20421         * c-objc-common.h (LANG_HOOKS_STATICP): Remove.
20422         * c-semantics.c (emit_local_var): Remove.
20424         * langhooks-def.h (lhd_expand_expr): Remove.
20425         * langhooks.c (lhd_expand_expr): Remove.
20426         * langhooks.h (LANG_HOOKS_DEF): Remove LANG_HOOKS_EXPAND_EXPR.
20428         * expr.c (expand_expr_real_1): Move COMPOUND_LITERAL_EXPR
20429         handling from c-semantics.c; don't call into langhook.
20430         (expand_expr_addr_expr_1): Check that we don't get non-GENERIC trees.
20431         * gimplify.c (gimplify_compound_literal_expr,
20432         optimize_compound_literals_in_ctor): Move from c-gimplify.c.
20433         (gimplify_init_constructor): Call optimize_compound_literals_in_ctor.
20434         (gimplify_modify_expr_rhs, gimplify_expr): Handle COMPOUND_LITERAL_EXPR
20435         as was done in c-gimplify.c.
20436         * tree.c (staticp): Move COMPOUND_LITERAL_EXPR handling from c_staticp.
20437         * tree.h (COMPOUND_LITERAL_EXPR_DECL, COMPOUND_LITERAL_EXPR_DECL_EXPR):
20438         Move from c-common.h.
20439         * tree.def (COMPOUND_LITERAL_EXPR): Move from c-common.def.
20441         * tree.c (staticp): Do not call langhook.
20442         * langhooks.c (lhd_staticp): Delete.
20443         * langhooks-def.h (lhd_staticp): Delete prototype.
20444         (LANG_HOOKS_STATICP): Delete.
20445         (LANG_HOOKS_INITIALIZER): Delete LANG_HOOKS_STATICP.
20447         * doc/c-tree.texi (Expression nodes): Refer to DECL_EXPRs
20448         instead of DECL_STMTs.
20450 2009-03-29  Joseph Myers  <joseph@codesourcery.com>
20452         PR c/456
20453         PR c/5675
20454         PR c/19976
20455         PR c/29116
20456         PR c/31871
20457         PR c/35198
20458         * builtins.c (fold_builtin_sincos): Build COMPOUND_EXPR in
20459         void_type_node.
20460         (fold_call_expr): Return a NOP_EXPR from folding rather than the
20461         contained expression.
20462         * c-common.c (c_fully_fold, c_fully_fold_internal, c_save_expr): New.
20463         (c_common_truthvalue_conversion): Use c_save_expr.  Do not fold
20464         conditional expressions for C.
20465         (decl_constant_value_for_optimization): Move from
20466         decl_constant_value_for_broken_optimization in c-typeck.c.  Check
20467         whether optimizing and that the expression is a VAR_DECL not of
20468         array type instead of doing such checks in the caller.  Do not
20469         check pedantic.  Call gcc_unreachable for C++.
20470         * c-common.def (C_MAYBE_CONST_EXPR): New.
20471         * c-common.h (c_fully_fold, c_save_expr,
20472         decl_constant_value_for_optimization): New prototypes.
20473         (C_MAYBE_CONST_EXPR_PRE, C_MAYBE_CONST_EXPR_EXPR,
20474         C_MAYBE_CONST_EXPR_INT_OPERANDS, C_MAYBE_CONST_EXPR_NON_CONST,
20475         EXPR_INT_CONST_OPERANDS): Define.
20476         * c-convert.c (convert): Strip nops from expression.
20477         * c-decl.c (groktypename): Take extra parameters expr and
20478         expr_const_operands.  Update call to grokdeclarator.
20479         (start_decl): Update call to grokdeclarator.  Add statement for
20480         expressions used in type of decl.
20481         (grokparm): Update call to grokdeclarator.
20482         (push_parm_decl): Update call to grokdeclarator.
20483         (build_compound_literal): Add parameter non_const and build a
20484         C_MAYBE_COSNT_EXPR if applicable.
20485         (grokdeclarator): Take extra parameters expr and
20486         expr_const_operands.  Track expressions used in declaration
20487         specifiers and declarators.  Fold array sizes and track whether
20488         they are constant expressions and whether they are integer
20489         constant expressions.
20490         (parser_xref_tag): Set expr and expr_const_operands fields in
20491         return value.
20492         (grokfield): Update call to grokdeclarator.
20493         (start_function): Update call to grokdeclarator.
20494         (build_null_declspecs): Set expr and expr_const_operands fields in
20495         return value.
20496         (declspecs_add_type): Handle expressions in typeof specifiers.
20497         * c-parser.c (c_parser_declspecs): Set expr and
20498         expr_const_operands fields for declaration specifiers.
20499         (c_parser_enum_specifier): Likewise.
20500         (c_parser_struct_or_union_specifier): Likewise.
20501         (c_parser_typeof_specifier): Likewise.  Update call to
20502         groktypename.  Fold expression as needed.  Return expressions with
20503         type instead of adding statements.
20504         (c_parser_attributes): Update calls to c_parser_expr_list.
20505         (c_parser_statement_after_labels): Fold expression before passing
20506         to objc_build_throw_stmt.
20507         (c_parser_condition): Fold expression.
20508         (c_parser_asm_operands): Fold expression.
20509         (c_parser_conditional_expression): Use c_save_expr.  Update call
20510         to build_conditional_expr.
20511         (c_parser_alignof_expression): Update call to groktypename.
20512         (c_parser_postfix_expression): Preserve C_MAYBE_CONST_EXPR as
20513         original_code.  Fold expression argument of va_arg.  Create
20514         C_MAYBE_CONST_EXPR to preserve side effects of expressions in type
20515         argument to va_arg.  Update calls to groktypename.  Fold array
20516         index for offsetof.  Verify that first argument to
20517         __builtin_choose_expr has integer type.
20518         (c_parser_postfix_expression_after_paren_type): Update calls to
20519         groktypename and build_compound_literal.  Handle expressions with
20520         side effects in type name.
20521         (c_parser_postfix_expression_after_primary): Update call to
20522         c_parser_expr_list.  Set original_code for calls to
20523         __builtin_constant_p.
20524         (c_parser_expr_list): Take extra parameter fold_p.  Fold
20525         expressions if requested.
20526         (c_parser_objc_type_name): Update call to groktypename.
20527         (c_parser_objc_synchronized_statement): Fold expression.
20528         (c_parser_objc_receiver): Fold expression.
20529         (c_parser_objc_keywordexpr): Update call to c_parser_expr_list.
20530         (c_parser_omp_clause_num_threads, c_parser_omp_clause_schedule,
20531         c_parser_omp_atomic, c_parser_omp_for_loop): Fold expressions.
20532         * c-tree.h (CONSTRUCTOR_NON_CONST): Define.
20533         (struct c_typespec): Add elements expr and expr_const_operands.
20534         (struct c_declspecs): Add elements expr and expr_const_operands.
20535         (groktypename, build_conditional_expr, build_compound_literal):
20536         Update prototypes.
20537         (in_late_binary_op): Declare.
20538         * c-typeck.c (note_integer_operands): New function.
20539         (in_late_binary_op): New variable.
20540         (decl_constant_value_for_broken_optimization): Move to c-common.c
20541         and rename to decl_constant_value_for_optimization.
20542         (default_function_array_conversion): Do not strip nops.
20543         (default_conversion): Do not call
20544         decl_constant_value_for_broken_optimization.
20545         (build_array_ref): Do not fold result.
20546         (c_expr_sizeof_expr): Fold operand.  Use C_MAYBE_CONST_EXPR for
20547         result when operand is a VLA.
20548         (c_expr_sizeof_type): Update call to groktypename.  Handle
20549         expressions included in type name.  Use C_MAYBE_CONST_EXPR for
20550         result when operand names a VLA type.
20551         (build_function_call): Update call to build_compound_literal.
20552         Only fold result for calls to __builtin_* functions.  Strip
20553         NOP_EXPR from INTEGER_CST returned from such functions.  Fold
20554         the function designator.
20555         (convert_arguments): Fold arguments.  Update call to
20556         convert_for_assignment.
20557         (build_unary_op): Handle increment and decrement of
20558         C_MAYBE_CONST_EXPR.  Move lvalue checks for increment and
20559         decrement earlier.  Fold operand of increment and decrement.
20560         Handle address of C_MAYBE_CONST_EXPR.  Only fold expression being
20561         built for integer operand.  Wrap returns that are INTEGER_CSTs
20562         without being integer constant expressions or that have integer
20563         constant operands without being INTEGER_CSTs.
20564         (lvalue_p): Handle C_MAYBE_CONST_EXPR.
20565         (build_conditional_expr): Add operand ifexp_bcp.  Track whether
20566         result is an integer constant expression or can be used in
20567         unevaluated parts of one and avoid folding and wrap as
20568         appropriate.  Fold operands before possibly doing -Wsign-compare
20569         warnings.
20570         (build_compound_expr): Wrap result for C99 if operands can be used
20571         in integer constant expressions.
20572         (build_c_cast): Update call to digest_init.  Do not ignore
20573         overflow from casting floating-point constants to integers.  Wrap
20574         results that could be confused with integer constant expressions,
20575         null pointer constants or floating-point constants.
20576         (c_cast_expr): Update call to groktypename.  Handle expressions
20577         included in type name.
20578         (build_modify_expr): Handle modifying a C_MAYBE_CONST_EXPR.  Fold
20579         lhs inside possible SAVE_EXPR.  Fold RHS before assignment.
20580         Update calls to convert_for_assignment.
20581         (convert_for_assignment): Take new parameter
20582         null_pointer_constant.  Do not strip nops or call
20583         decl_constant_value_for_broken_optimization.  Set
20584         in_late_binary_op for conversions to boolean.
20585         (store_init_value): Update call to digest_init.
20586         (digest_init): Take new parameter null_pointer_constant.  Do not
20587         call decl_constant_value_for_broken_optimization.  pedwarn for
20588         initializers not constant expressions.  Update calls to
20589         convert_for_assignment.
20590         (constructor_nonconst): New.
20591         (struct constructor_stack): Add nonconst element.
20592         (really_start_incremental_init, push_init_level, pop_init_level):
20593         Handle constructor_nonconst and nonconst element.
20594         (set_init_index): Call constant_expression_warning for array
20595         designators.
20596         (output_init_element): Fold value.  Set constructor_nonconst as
20597         applicable.  pedwarn for initializers not constant expressions.
20598         Update call to digest_init.  Call constant_expression_warning
20599         where constant initializers are required.
20600         (process_init_element): Use c_save_expr.
20601         (c_finish_goto_ptr): Fold expression.
20602         (c_finish_return): Fold return value.  Update call to
20603         convert_for_assignment.
20604         (c_start_case): Fold switch expression.
20605         (c_process_expr_stmt): Fold expression.
20606         (c_finish_stmt_expr): Create C_MAYBE_CONST_EXPR as needed to
20607         ensure statement expression is not evaluated in constant expression.
20608         (build_binary_op): Track whether results are integer constant
20609         expressions or may occur in such, disable folding and wrap results
20610         as applicable.  Fold operands for -Wsign-compare warnings unless
20611         in_late_binary_op.
20612         (c_objc_common_truthvalue_conversion): Handle results folded to
20613         integer constants that are not integer constant expressions.
20614         * doc/extend.texi: Document when typeof operands are evaluated,
20615         that condition of __builtin_choose_expr is an integer constant
20616         expression, and more about use of __builtin_constant_p in
20617         initializers.
20619 2009-03-29  Richard Guenther  <rguenther@suse.de>
20621         * tree-ssa-forwprop.c (forward_propagate_addr_expr_1): Properly
20622         propagate addresses of array references.
20624 2009-03-29  Steven Bosscher  <steven@gcc.gnu.org>
20626         * regmove.c (perhaps_ends_bb_p): Remove.
20627         (optimize_reg_copy_1): Don't call perhaps_ends_bb_p.  Get basic block
20628         from INSN and check that the main loop stays within that basic block.
20629         (optimize_reg_copy_1, optimize_reg_copy_3, fixup_match_2): Likewise.
20630         (regmove_forward_pass): Split out from regmove_optimize.  Use
20631         FOR_EACH_BB and FOR_BB_INSNS instead of traversing the insns stream.
20632         (regmove_backward_pass): Split out from regmove_optimize.  Use
20633         FOR_EACH_BB_REVERSE and FOR_BB_INSNS_REVERS_SAFE.
20634         (regmove_optimize): Simplify.
20636 2009-03-29  H.J. Lu  <hongjiu.lu@intel.com>
20638         PR target/39545
20639         * config/i386/i386.c (classify_argument): Ignore flexible array
20640         member in struct and warn ABI change.
20642 2009-03-29  H.J. Lu  <hongjiu.lu@intel.com>
20644         * config/i386/i386-protos.h (ix86_agi_dependent): New.
20646         * config/i386/i386.c (ix86_agi_dependent): Rewrite.
20647         (ix86_adjust_cost): Updated.
20649 2009-03-29  Jan Hubicka  <jh@suse.cz>
20651         PR middle-end/28850
20652         * tree-pass.h (pass_cleanup_eh): New function.
20653         (remove_unreachable_regions): Break code handling RTL
20654         to rtl_remove_unreachable_regions; remove ERT_MUST_NOT_THROW
20655         that can not be reached by runtime.
20656         (can_be_reached_by_runtime): New function.
20657         (label_to_region_map): New function.
20658         (num_eh_regions): New function.
20659         (rtl_remove_unreachable_regions): New function.
20660         (convert_from_eh_region_ranges): Call rtl_remove_unreachable_regions.
20661         (remove_eh_region): New function.
20662         * except.h: Include sbitmap and vecprim.
20663         (remove_eh_region, remove_unreachable_regions, label_to_region_map,
20664         num_eh_regions): Declare.
20665         * passes.c (init_optimization_passes): Schedule cleanup_eh.
20666         * Makefile.in (EXCEPT_H): New; replace all uses of except.h by it.
20667         * tree-eh.c (tree_remove_unreachable_handlers): New function.
20668         (tree_empty_eh_handler_p): New function.
20669         (cleanup_empty_eh): New function.
20670         (cleanup_eh): New function.
20671         (pass_cleanup_eh): New function.
20673 2009-03-29  Jan Hubicka  <jh@suse.cz>
20675         * except.c (verify_eh_tree): Fix handling of fun!=cfun; be ready
20676         for removed regions.
20678 2009-03-29  Jan Hubicka  <jh@suse.cz>
20680         * except.c (dump_eh_tree): Dump all datastructures.
20682 2009-03-29  Jan Hubicka  <jh@suse.cz>
20684         * except.c (duplicate_eh_regions_0): Handle AKA bitmap.
20685         (duplicate_eh_regions_1): Likewise.
20686         (duplicate_eh_regions): Likewise; cleanup code gorwing the region
20687         vector; call EH verification.
20688         (foreach_reachable_handler, can_throw_internal_1, can_throw_external_1):
20689         Be ready for region being removed.
20691 2009-03-29  Jan Hubicka  <jh@suse.cz>
20693         * bitmap.c (bitmap_last_set_bit): New function.
20694         * bitmap.h (bitmap_last_set_bit): Declare.
20696 2009-03-29  David Ayers  <ayers@fsfe.org>
20698         PR objc/27377
20699         * c-typeck.c (build_conditional_expr): Emit ObjC warnings
20700         by calling objc_compare_types and surpress warnings about
20701         incompatible C pointers that are compatible ObjC pointers.
20703 2009-03-29  Adam Nemet  <anemet@caviumnetworks.com>
20705         * cgraphbuild.c (build_cgraph_edges, rebuild_cgraph_edges): Don't
20706         call initialize_inline_failed.
20707         (initialize_inline_failed): Move it from here ...
20708         * cgraph.c (initialize_inline_failed): ... to here.
20709         (cgraph_create_edge): Call initialize_inline_failed rather than
20710         setting inline_failed directly.
20712 2009-03-29  Ben Elliston  <bje@au.ibm.com>
20714         PR target/32542
20715         * sysv4.opt (msdata): Improve comment.
20716         * linux64.h (ASM_SPEC32): Do not pass -memb when -msdata is given.
20717         * sysv4.h (SVR4_ASM_SPEC): Likewise.
20719 2009-03-29  Ben Elliston  <bje@au.ibm.com>
20721         PR target/30451
20722         * config/rs6000/rs6000.md (*movti_ppc64): Correct the order of
20723         load and store attributes.
20725 2009-03-29  Ben Elliston  <bje@au.ibm.com>
20727         * config/i386/i386.c (enum ix86_builtins): Add IX86_BUILTIN_HUGE_VALQ.
20728         (ix86_init_builtins): Add built-in function __builtin_huge_valq.
20729         (ix86_expand_builtin): Handle IX86_BUILTIN_HUGE_VALQ.
20730         * doc/extend.texi (X86 Built-in Functions): Add index entries for
20731         __builtin_infq and __builtin_huge_valq.
20733 2009-03-28  Anatoly Sokolov  <aesok@post.ru>
20735         * config/avr/avr.c (avr_mcu_t): Add atmega8c1, atmega16c1 and
20736         atmega8m1 devices.
20737         * config/avr/avr.h (LINK_SPEC, CRT_BINUTILS_SPECS): (Ditto.).
20738         * config/avr/t-avr (MULTILIB_MATCHES): (Ditto.)
20740 2009-03-28  Xinliang David Li  <davidxl@google.com>
20742         * tree-ssa-ccp.c (ccp_finalize): Add dbg_count support.
20743         (do_dbg_cnt): New function.
20745 2009-03-28  Jan Hubicka  <jh@suse.cz>
20747         Merge from pretty-ipa:
20749         2009-03-27  Jan Hubicka  <jh@suse.cz>
20751         * cgraph.c (dump_cgraph_node): Add replace output flag by process.
20752         * tree-pass.h (function_called_by_processed_nodes_p): Declare.
20753         * passes.c (function_called_by_processed_nodes_p): New.
20754         * ipa-pure-const.c (check_call): Fix handling of operands.
20755         (analyze_function): Dump debug output for skipped bodies.
20756         (local_pure_const): Use function_called_by_processed_nodes_p.
20757         * dwarf2out.c (reference_to_unused): Use output.
20758         * passes.c (do_per_function_toporder): Likewise.
20760         2008-11-12  Jan Hubicka  <jh@suse.cz>
20762         * tree-pass.h (pass_fixup_cfg, pass_local_pure_const): Declare.
20763         * ipa-pure-const.c (funct_state_d): Add can throw field; make
20764         state_set_in_source enum
20765         (check_decl): Ignore memory tags; do not set fake looping flags;
20766         dump diagnostics.
20767         (check_operand, check_tree, check_rhs_var, check_lhs_var,
20768         get_asm_expr_operands, scan_function_op, scan_function_stmt): Remove.
20769         (check_call, analyze_function): Rewrite.
20770         (check_stmt): New.
20771         (add_new_function): Update call of analyze_function.
20772         (generate_summary): Add call of analyze_function.
20773         (propagate): Propagate can_throw; handle state_set_in_source correctly.
20774         (local_pure_const): New function.
20775         (pass_local_pure_const): New pass.
20776         * ipa-inline.c (inline_transform): Set after_inlining.
20777         * tree-eh.c (stmt_can_throw_external): New.
20778         * tree-optimize.c (execute_fixup_cfg): Do not set after_inlining;
20779         work with aliasing built.
20780         * tree-flow.h (stmt_can_throw_external): New.
20781         * passes.c (init_optimization_passes): Schedule fixup_cfg pass early;
20782         and local pure/const pass in early and late optimization queue.
20784 2009-03-28  Martin Jambor  <mjambor@suse.cz>
20786         * fold-const.c (get_pointer_modulus_and_residue): New parameter
20787         allow_func_align.
20788         (fold_binary): Allow function decl aligment consideration is the
20789         second argument is integer constant one.
20790         * tree-ssa-forwprop.c (simplify_bitwise_and): New function.
20791         (tree_ssa_forward_propagate_single_use_vars): Handle assing statements
20792         with BIT_AND_EXPR on the RHS by calling simplify_bitwise_and.
20794 2009-03-28  Jan Hubicka  <jh@suse.cz>
20796         * dwarf2out.c (dwarf2out_begin_prologue): Use crtl->nothrow
20797         * tree-eh.c (stmt_could_throw_p): Remove check for WEAK decls.
20798         * function.h (rtl_data): Add nothrow flag.
20799         * except.c (set_nothrow_function_flags): Use crtl->nothrow;
20800         set DECL_NOTHROW for AVAILABLE functions.
20802 2009-03-28  Jakub Jelinek  <jakub@redhat.com>
20804         * config/rs6000/rs6000-c.c (rs6000_macro_to_expand): If macro
20805         following vector keyword has expansion starting with pixel or bool
20806         keyword, expand vector to __vector and pixel or bool to __pixel or
20807         __bool.
20809         PR c++/39554
20810         * opts.c (warning_disallowed_functions, warn_disallowed_functions,
20811         warn_if_disallowed_function_p): Removed.
20812         (common_handle_option): Don't handle OPT_Wdisallowed_function_list_.
20813         * c-parser.c (c_parser_postfix_expression_after_primary): Don't call
20814         warning_if_disallowed_function_p.
20815         * flags.h (warn_if_disallowed_function_p,
20816         warn_disallowed_functions): Removed.
20817         * common.opt (Wdisallowed-function-list=): Removed.
20818         * doc/invoke.texi (-Wdisallowed-function-list=): Removed.
20820 2009-03-28  Richard Guenther  <rguenther@suse.de>
20822         PR tree-optimization/38723
20823         * tree-ssa-pre.c (compute_avail): Add all default definitions to
20824         the entry block.
20826 2009-03-28  Jan Hubicka  <jh@suse.cz>
20828         * tree-ssa-structalias.c (ipa_pta_execute): Fix bogus node->analyzed
20829         test introduced by my previous patch.
20831 2009-03-28  Richard Guenther  <rguenther@suse.de>
20833         * tree-ssa-copy.c (copy_prop_visit_phi_node): Do not leave
20834         the PHIs value undefined.
20836 2009-03-28  Jan Hubicka  <jh@suse.cz>
20838         * tree-pass.h (pass_fixup_cfg): New pass.
20839         * ipa-inline.c (inline_transform): Set
20840         always_inline_functions_inlined/after_inlining.
20841         * tree-optimize.c (execute_fixup_cfg): Do not set them here.
20842         (pass_fixup_cfg): New pass.
20843         * passes.c (init_optimization_passes): Add fixup_cfg.
20845 2009-03-28  Richard Guenther  <rguenther@suse.de>
20847         PR tree-optimization/38458
20848         * tree-ssa-copy.c (copy_prop_visit_phi_node): For the first
20849         argument use the arguments copy-of value.
20851 2009-03-28  Richard Guenther  <rguenther@suse.de>
20853         PR tree-optimization/38180
20854         * tree-ssa-ccp.c (get_default_value): Simplify.
20855         (likely_value): Likewise.
20856         (surely_varying_stmt_p): Properly handle VOP case.
20857         (ccp_initialize): Likewise.
20858         (ccp_fold): Handle propagating through *&.
20859         (fold_const_aggregate_ref): Also handle decls.
20861 2009-03-28  Jan Hubicka  <jh@suse.cz>
20863         * cgraph.c (dump_cgraph_node): Add replace output flag by process.
20864         * cgraph.h (cgraph_node): Likewise.
20865         * cgraphunit.c (cgraph_process_new_functions): Set process flag.
20866         (cgraph_reset_node): Use process flag.
20867         (cgraph_mark_functions_to_output): Likewise.
20868         (cgraph_expand_function): Likewise.
20869         (cgraph_expand_all_functions): Likewise.
20870         (cgraph_output_in_order): Likewise.
20871         * dwarf2out.c (reference_to_unused): Likewise.
20872         * passes.c do_per_function_toporder): Likewise.
20874 2009-03-28  Jan Hubicka  <jh@suse.cz>
20876         Bring from lto-branch:
20878         2008-09-03  Doug Kwan  <dougkwan@google.com>
20880         * cgraphbuild.c (initialize_inline_failed): Use cgraph_inline_failed_t
20881         enums instead of reason strings.
20882         * cgraph.c (cgraph_create_edge): Same.
20883         (cgraph_inline_failed_string): New function.
20884         * cgraph.h (cgraph_inline_failed_t): New enum type.
20885         (cgraph_inline_failed_string): New prototype.
20886         (struct cgraph_edge): Change type of INLINED_FAILED from constant
20887         char pointer to cgraph_inline_failed_t.
20888         (cgraph_inline_p): Adjust prototype to use cgraph_inline_failed_t.
20889         (cgraph_default_inline_p): Ditto.
20890         * cgraphunit.c (cgraph_inline_p): Change type of parameter REASON
20891         to cgraph_inline_failed_t pointer.
20892         * cif-code.def: New file.
20893         * ipa-inline.c (cgraph_mark_inline_edge): Use an enum instead of a
20894         reason string.
20895         (cgraph_check_inline_limits): Change type of REASON to pointer to
20896         cgraph_inline_failed_t.  Replace reason strings with enums.
20897         (cgraph_default_inline_p): Ditto.
20898         (cgraph_recursive_inlining_p): Ditto.
20899         (update_caller_keys): Change type of FAILED_REASON to
20900         cgraph_inline_failed_t.
20901         (cgraph_set_inline_failed): Change type of REASON to pointer to
20902         cgraph_inline_failed_t.  Call cgraph_inline_failed_string to
20903         convert enums to strings for text output.
20904         (cgraph_decide_inlining_of_small_function): Change FAILED_REASON
20905         to be of type cgraph_inline_failed_t.  Replace reason strings with
20906         enums.  Call cgraph_inline_failed_string to covert enums
20907         to strings for text output.
20908         (cgraph_decide_inlining): Replace reason strings with enums.
20909         (cgraph_decide_inlining_incrementally): Change type of FAILED_REASON
20910         to cgraph_inline_failed_t type.  Call cgraph_inline_failed_string
20911         for text output.
20912         * tree-inline.c (expand_call_inline): Change type of REASON
20913         to cgraph_inline_failed_t.  Replace reason strings with enums.
20914         Call cgraph_inline_failed_string for text output.
20915         * Makefile.in (CGRAPH_H): Add cif-code.def to dependencies.
20916         (cgraph.o): Ditto.
20918 2009-03-28  Jan Hubicka  <jh@suse.cz>
20920         * cgraph.c (cgraph_node, cgraph_remove_node, dump_cgraph_node,
20921         cgraph_clone_node): Remove master clone handling.
20922         (cgraph_is_master_clone, cgraph_master_clone): Remove.
20923         * cgraph.h (master_clone): Remove.
20924         (cgraph_is_master_clone, cgraph_master_clone): Remove.
20925         * ipa-type-escape.c (type_escape_execute): Remove use of master clone.
20926         (tree-ssa-structalias.c (ipa_pta_execute): Likewise.
20928 2009-03-28  Jan Hubicka  <jh@suse.cz>
20930         * cgraph.c (cgraph_function_body_availability): Functions declared
20931         inline are always safe to assume that it is not going to be replaced.
20933 2009-03-28  Richard Guenther  <rguenther@suse.de>
20935         PR tree-optimization/38513
20936         * tree-ssa-pre.c (eliminate): Remove redundant stores.
20937         * tree-ssa-sccvn.c (copy_reference_ops_from_ref): Handle
20938         EXC_PTR_EXPR and FILTER_EXPR.
20939         (get_ref_from_reference_ops): Likewise.
20941 2009-03-28  Richard Guenther  <rguenther@suse.de>
20943         PR tree-optimization/38968
20944         * tree-vect-analyze.c (vect_compute_data_ref_alignment):
20945         Use FLOOR_MOD_EXPR to compute misalignment.
20947 2009-03-28  Richard Guenther  <rguenther@suse.de>
20949         PR tree-optimization/37795
20950         * tree.h (combine_comparisons): Declare.
20951         * fold-const.c (combine_comparisons): Export.
20952         * tree-ssa-ifcombine.c (ifcombine_ifandif): Optimize two successive
20953         comparisons.
20954         (ifcombine_iforif): Use combine_comparisons.
20956 2009-03-28  Jan Hubicka  <jh@suse.cz>
20958         * tree-eh.c (inlinable_call_p): New function.
20959         (make_eh_edges): Use it.
20960         (verify_eh_edges): Use it.
20961         (stmt_can_throw_external, stmt_can_throw_internal): Use it.
20962         * except.c (reachable_next_level): Add inlinable_function argument
20963         (sjlj_find_directly_reachable_regions): Update.
20964         (add_reachable_handler): Do not set saw_any_handlers.
20965         (reachable_next_level): Handle MUST_NOT_THROW more curefully.
20966         (foreach_reachable_handler, can_throw_internal_1, can_throw_external_1):
20967         Add new inlinable call parameter.
20968         (can_throw_internal, can_throw_external): Update.
20969         * except.h (can_throw_internal_1, can_throw_external_1,
20970         foreach_reachable_handler): Update declaration.
20972 2009-03-28  Joseph Myers  <joseph@codesourcery.com>
20974         * config/arm/t-arm-coff, config/h8300/coff.h,
20975         config/i386/i386-aout.h, config/i386/i386-coff.h,
20976         config/libgloss.h, config/m68k/coff.h, config/m68k/m68k-aout.h,
20977         config/pdp11/2bsd.h, config/rs6000/aix41.h,
20978         config/rs6000/aix41.opt, config/rs6000/t-newas, config/sh/coff.h,
20979         fix-header.c, fixproto, gen-protos.c, protoize.c, scan-decls.c,
20980         scan-types.sh, scan.c, scan.h, sort-protos, sys-protos.h,
20981         sys-types.h: Remove.
20982         * Makefile.in: Remove protoize and fixproto support and references
20983         in comments.
20984         (SYSCALLS.c.X-warn, TARGET_GETGROUPS_T, STMP_FIXPROTO,
20985         PROTOIZE_INSTALL_NAME, UNPROTOIZE_INSTALL_NAME, FIXPROTO_DEFINES):
20986         Remove.
20987         (ALL_HOST_OBJS): Remove $(PROTO_OBJS).
20988         (MOSTLYCLEANFILES): Remove protoize$(exeext) and
20989         unprotoize$(exeext).
20990         (rest.encap): Don't depend on $(STMP_FIXPROTO)
20991         (.PHONY): Don't depend on proto.
20992         (libgcc-support): Don't depend on $(STMP_FIXPROTO).
20993         (proto, PROTO_OBJS, protoize$(exeext), unprotoize$(exeext),
20994         protoize.o, unprotoize.o, SYSCALLS.c.X, test-protoize-simple,
20995         deduced.h, GEN_PROTOS_OBJS, build/gen-protos$(build_exeext),
20996         build/gen-protos.o, build/scan.o, xsys-protos.h,
20997         build/fix-header$(build_exeext), build/fix-header.o,
20998         build/scan-decls.o, fixhdr.ready, stmp-fixproto,
20999         stmp-install-fixproto): Remove.
21000         (mostlyclean): Don't remove xsys-protos.hT, SYSCALLS.c.X,
21001         SYSCALLS.c or fixproto files.
21002         (install-common): Don't install protoize.
21003         (install-headers-tar, install-headers-cpio, install-headers-cp):
21004         Don't depend on $(STMP_FIXPROTO).
21005         (install-mkheaders): Don't depend on $(STMP_FIXPROTO).  Don't
21006         install fixproto files or write out fixproto settings.
21007         (uninstall): Don't uninstall protoize.
21008         * config.gcc (use_fixproto): Remove.
21009         (arm-*-coff*, armel-*-coff*, h8300-*-*, i[34567]86-*-aout*,
21010         i[34567]86-*-coff*, m68k-*-aout*, m68k-*-coff*, pdp11-*-bsd,
21011         rs6000-ibm-aix4.[12]*, powerpc-ibm-aix4.[12]*, sh-*-*): Remove.
21012         * config/m32r/t-linux (STMP_FIXPROTO): Remove.
21013         * config/m68k/m68k.c: Remove M68K_TARGET_COFF-conditional code.
21014         * config/mips/t-iris (FIXPROTO_DEFINES): Remove.
21015         * config/pa/t-pa-hpux (FIXPROTO_DEFINES): Remove.
21016         * config/pdp11/pdp11.c: Remove TWO_BSD-conditional code.
21017         * config/t-svr4 (FIXPROTO_DEFINES): Remove.
21018         * config/t-vxworks (STMP_FIXPROTO): Remove.
21019         * configure.ac (AC_TYPE_GETGROUPS, TARGET_GETGROUPS_T,
21020         STMP_FIXPROTO): Remove.
21021         * config.in, configure: Regenerate.
21022         * crtstuff.c (gid_t, uid_t): Don't undefine.
21023         * doc/install.texi: Change m68k-coff to m68k-elf in example.
21024         (arm-*-coff, arm-*-aout: Remove target entries.
21025         (*-ibm-aix*): Mention removal of support for AIX 4.2 and older.
21026         Remove mention of AIX 4.1.
21027         (m68k-*-*): Remove mention of m68k-*-aout and m68k-*-coff*.
21028         * doc/invoke.texi (Running Protoize): Remove.
21029         * doc/trouble.texi (Actual Bugs): Remove mention of fixproto.
21030         (Protoize Caveats): Remove.
21031         * tsystem.h: Update comments on headers assumed to exist.
21033 2009-03-27  Vladimir Makarov  <vmakarov@redhat.com>
21035         * genautomata.c: Add a new year to the copyright.  Add a new
21036         reference.
21037         (struct insn_reserv_decl): Add comments for member bypass_list.
21038         (find_bypass): Remove.
21039         (insert_bypass): New.
21040         (process_decls): Use insert_bypass.
21041         (output_internal_insn_latency_func): Output all bypasses with the
21042         same input insn in one switch case.
21044         * rtl.def (define_bypass): Describe bypass choice.
21045         * doc/md.texi (define_bypass): Ditto.
21047 2009-03-27  Richard Guenther  <rguenther@suse.de>
21049         * gimplify.c (mark_addressable): Export.
21050         * tree-flow.h (mark_addressable): Declare.
21051         * tree-ssa-loop-manip.c (create_iv): Mark the base addressable.
21052         * tree-ssa.c (verify_phi_args): Verify that address taken
21053         variables have TREE_ADDRESSABLE set.
21055 2009-03-27  Richard Guenther  <rguenther@suse.de>
21057         * fold-const.c (build_fold_addr_expr_with_type_1): Rename back to ...
21058         (build_fold_addr_expr_with_type): ... this.  Remove in_fold handling.
21059         Do not mark decls TREE_ADDRESSABLE.
21060         (build_fold_addr_expr): Adjust.
21061         (fold_addr_expr): Remove.
21062         (fold_unary): Use build_fold_addr_expr.
21063         (fold_comparison): Likewise.
21064         (split_address_to_core_and_offset): Likewise.
21065         * coverage.c (tree_coverage_counter_addr): Mark the array decl
21066         TREE_ADDRESSABLE.
21067         * gimplify.c (mark_addressable): Do not exclude RESULT_DECLs.
21068         (gimplify_modify_expr_to_memcpy): Mark source and destination
21069         addressable.
21070         * omp-low.c (create_omp_child_function): Mark the object decl
21071         TREE_ADDRESSABLE.
21072         (lower_rec_input_clauses): Mark the var we take the address of
21073         TREE_ADDRESSABLE.
21074         (lower_omp_taskreg): Mark the sender decl TREE_ADDRESSABLE.
21076 2009-03-27  H.J. Lu  <hongjiu.lu@intel.com>
21078         PR middle-end/39315
21079         * cfgexpand.c (expand_one_stack_var_at): Change alignment
21080         limit to MAX_SUPPORTED_STACK_ALIGNMENT.
21082 2009-03-27  Richard Guenther  <rguenther@suse.de>
21084         PR tree-optimization/39120
21085         * tree-ssa-structalias.c (handle_rhs_call): Fill out return
21086         constraints.
21087         (handle_lhs_call): Process return constraints.  Add escape
21088         constraints if necessary.
21089         (handle_const_call): Fill out return constraints.  Make nested
21090         case more precise.  Avoid consttmp if possible.
21091         (handle_pure_call): Fill out return constraints.  Avoid
21092         callused if possible.
21093         (find_func_aliases): Simplify call handling.
21095 2009-03-27  Richard Guenther  <rguenther@suse.de>
21097         PR tree-optimization/39120
21098         * tree-ssa-structalias.c (do_sd_constraint): Do not use CALLUSED
21099         as a representative.
21100         (solve_graph): Do propagate CALLUSED.
21101         (handle_pure_call): Use a scalar constraint from CALLUSED for
21102         the return value.
21103         (find_what_p_points_to): CALLUSED shall not appear in poins-to
21104         solutions.
21106 2009-03-27  H.J. Lu  <hongjiu.lu@intel.com>
21108         PR c/39323
21109         * c-common.c (handle_aligned_attribute): Properly check alignment
21110         overflow.  Use (1U << i) instead of (1 << i).
21112         * emit-rtl.c (get_mem_align_offset): Use "unsigned int" for align.
21114         * expr.h (get_mem_align_offset): Updated.
21116         * tree.h (tree_decl_common): Change align to "unsigned int" and
21117         move it before pointer_alias_set.
21119 2009-03-27  H.J. Lu  <hongjiu.lu@intel.com>
21120             Jakub Jelinek  <jakub@redhat.com>
21122         PR target/38034
21123         * config/ia64/sync.md (cmpxchg_rel_<mode>): Replace input
21124         gr_register_operand with gr_reg_or_0_operand.
21125         (cmpxchg_rel_di): Likewise.
21126         (sync_lock_test_and_set<mode>): Likewise.
21128 2009-03-27  H.J. Lu  <hongjiu.lu@intel.com>
21130         * jump.c (rtx_renumbered_equal_p): Use subreg_get_info.
21131         (true_regnum): Likewise.
21133         * rtlanal.c (subreg_info): Moved to ...
21134         * rtl.h (subreg_info): Here.  New.
21135         (subreg_get_info): New.
21137         * rtlanal.c (subreg_get_info): Make it extern.
21139 2009-03-27  H.J. Lu  <hongjiu.lu@intel.com>
21141         PR target/39472
21142         * config/i386/i386.c (ix86_abi): New.
21143         (override_options): Handle -mabi=.
21144         (ix86_function_arg_regno_p): Replace DEFAULT_ABI with ix86_abi.
21145         (ix86_call_abi_override): Likewise.
21146         (init_cumulative_args): Likewise.
21147         (function_arg_advance): Likewise.
21148         (function_arg_64): Likewise.
21149         (function_arg): Likewise.
21150         (ix86_pass_by_reference): Likewise.
21151         (ix86_function_value_regno_p): Likewise.
21152         (ix86_build_builtin_va_list_abi): Likewise.
21153         (setup_incoming_varargs_64): Likewise.
21154         (is_va_list_char_pointer): Likewise.
21155         (ix86_init_machine_status): Likewise.
21156         (ix86_reg_parm_stack_space): Use enum calling_abi on call_abi.
21157         (ix86_function_type_abi): Return enum calling_abi.  Rewrite
21158         for 64bit.  Replace DEFAULT_ABI with ix86_abi.
21159         (ix86_function_abi): Make it static and return enum calling_abi.
21160         (ix86_cfun_abi): Return enum calling_abi.  Replace DEFAULT_ABI
21161         with ix86_abi.
21162         (ix86_fn_abi_va_list): Updated.
21164         * config/i386/i386.h (ix86_abi): New.
21165         (STACK_BOUNDARY): Replace DEFAULT_ABI with ix86_abi.
21166         (CONDITIONAL_REGISTER_USAGE): Likewise.
21167         (CUMULATIVE_ARGS): Change call_abi type to enum calling_abi.
21168         (machine_function): Likewise.
21170         * config/i386/i386.md (untyped_call): Replace DEFAULT_ABI
21171         with ix86_abi.
21172         * config/i386/cygming.h (TARGET_64BIT_MS_ABI): Likewise.
21173         (STACK_BOUNDARY): Likewise.
21174         * config/i386/mingw32.h (EXTRA_OS_CPP_BUILTINS): Likewise.
21176         * config/i386/i386.opt (mabi=): New.
21178         * config/i386/i386-protos.h (ix86_cfun_abi): Changed to
21179         return enum calling_abi.
21180         (ix86_function_type_abi): Likewise.
21181         (ix86_function_abi): Removed.
21183         * doc/invoke.texi: Document -mabi= option for x86.
21185 2009-03-27  Kaveh R. Ghazi  <ghazi@caip.rutgers.edu>
21187         * builtins.c (real_dconstp): Delete.
21188         (fold_builtin_logarithm): Remove inaccurate log(e) special case.
21190 2009-03-27  Dodji Seketeli  <dodji@redhat.com>
21191             Jakub Jelinek  <jakub@redhat.com>
21193         PR debug/37959
21194         * dwarf2out.c (dwarf_attr_name): Handle DW_AT_explicit attribute.
21195         (gen_subprogram_die): When a function is explicit, generate the
21196         DW_AT_explicit attribute.
21197         * langhooks.h (struct lang_hooks_for_decls): Add
21198         function_decl_explicit_p langhook.
21199         * langhooks-def.h (LANG_HOOKS_FUNCTION_DECL_EXPLICIT_P): Define.
21200         (LANG_HOOKS_DECLS): Add LANG_HOOKS_FUNCTION_DECL_EXPLICIT_P.
21202 2009-03-27  Jakub Jelinek  <jakub@redhat.com>
21204         * builtins.c (fold_builtin_memory_op): Optimize memmove
21205         into memcpy if we can prove source and destination don't overlap.
21207         * tree-inline.c: Include gt-tree-inline.h.
21208         (clone_fn_id_num): New variable.
21209         (clone_function_name): New function.
21210         (tree_function_versioning): Use it.
21211         * Makefile.in (GTFILES): Add tree-inline.c.
21213 2009-03-27  Mark Mitchell  <mark@codesourcery.com>
21215         * BASE-VER: Change to 4.5.0.
21217 2009-03-27  Xinliang David Li  <davidxl@google.com>
21219         PR tree-optimization/39557
21220         * tree-ssa.c (warn_uninitialized_vars): free postdom info.
21222 2009-03-27  Xinliang David Li  <davidxl@google.com>
21224         PR tree-optimization/39548
21225         * tree-ssa-copy.c (copy_prop_visit_phi_node): Add copy
21226         candidate check.
21228 2009-03-27  H.J. Lu  <hongjiu.lu@intel.com>
21230         * c-common.c (pointer_int_sum): Use %wd on return from
21231         tree_low_cst.
21233 2009-03-27  H.J. Lu  <hongjiu.lu@intel.com>
21235         * c-common.c (pointer_int_sum): Use HOST_WIDE_INT_PRINT_DEC
21236         on return from tree_low_cst.
21238 2009-03-27  Andrew Pinski  <andrew_pinski@playstation.sony.com>
21240         PR c++/36799
21241         * ginclude/stdarg.h (va_copy): Define also for
21242         __GXX_EXPERIMENTAL_CXX0X__.
21244 2009-03-27  Manuel Lopez-Ibanez  <manu@gcc.gnu.org>
21246         PR c++/35652
21247         * builtins.h (c_strlen): Do not warn here.
21248         * c-typeck.c (build_binary_op): Adjust calls to pointer_int_sum.
21249         * c-common.c (pointer_int_sum): Take an explicit location.
21250         Warn about offsets out of bounds.
21251         * c-common.h (pointer_int_sum): Adjust declaration.
21253 2009-03-26  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
21255         * doc/invoke.texi (i386 and x86-64 Windows Options): Fix texinfo
21256         markup glitch.
21258 2009-03-26  Jakub Jelinek  <jakub@redhat.com>
21260         PR c++/39554
21261         * opts.c (warn_if_disallowed_function_p): Don't assume
21262         get_callee_fndecl must return non-NULL.
21264 2009-03-26  Vladimir Makarov  <vmakarov@redhat.com>
21266         PR rtl-optimization/39522
21267         * reload1.c (reload_as_needed): Invalidate reg_last_reload_reg too
21268         when reg_reloaded_valid is set.
21270 2009-03-26  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
21272         * config/spu/divv2df3.c: New file.
21273         * config/spu/t-spu-elf (LIB2FUNCS_STATIC_EXTRA): Add it.
21274         (DPBIT_FUNCS): Filter out _div_df.
21276 2009-03-26  Bernd Schmidt  <bernd.schmidt@analog.com>
21278         * config/bfin/bfin.c (bfin_optimize_loop): If the LSETUP goes before
21279         a jump insn, count that jump in the distance to the loop start.
21281 2009-03-25  Kaz Kojima  <kkojima@gcc.gnu.org>
21283         PR target/39523
21284         * config/sh/sh.c (calc_live_regs): Fix condition for global
21285         registers except PIC_OFFSET_TABLE_REGNUM.
21287 2009-03-25  Kai Tietz  <kai.tietz@onevision.com>
21289         PR/39518
21290         * doc/invoke.texi (-mconsole): New.
21291         (-mcygwin): New.
21292         (-mno-cygwin): New.
21293         (-mdll): New.
21294         (-mnop-fun-dllimport): New.
21295         (-mthread): New.
21296         (-mwin32): New.
21297         (-mwindows): New.
21298         (sub section "i386 and x86-64 Windows Options"): New.
21300 2009-03-25  Ralf Corsépius  <ralf.corsepius@rtems.org>
21302         * config/arm/rtems-elf.h: Remove LINK_GCC_C_SEQUENCE_SPEC.
21303         * config/rs6000/t-rtems: Remove MULTILIB_EXTRA_OPTS.
21305 2009-03-25  Richard Guenther  <rguenther@suse.de>
21307         PR middle-end/39497
21308         * Makefile.in (dfp.o-warn): Use -fno-strict-aliasing instead
21309         of -Wno-error.
21311 2009-03-25  Andrey Belevantsev  <abel@ispras.ru>
21313         * config/ia64/ia64.c (ia64_set_sched_flags): Zero spec_info->mask when
21314         neither of haifa/selective schedulers are working.
21316 2009-03-25  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
21318         * doc/invoke.texi (Debugging Options): Fix description of
21319         -fno-merge-debug-strings.
21321 2009-03-24  Hans-Peter Nilsson  <hp@axis.com>
21323         * config/cris/libgcc.ver: New version-script.
21324         * config/cris/t-linux (SHLIB_MAPFILES): Use it.
21326         * configure.ac <GAS features, nop mnemonic>: Add pattern
21327         crisv32-*-* for "nop".
21328         <GAS features, Thread-local storage>: Add item for CRIS and CRIS v32.
21329         * configure: Regenerate.
21331 2009-03-24  Ira Rosen  <irar@il.ibm.com>
21333         PR tree-optimization/39529
21334         * tree-vect-transform.c (vect_create_data_ref_ptr): Call
21335         mark_sym_for_renaming for the tag copied to the new vector
21336         pointer.
21338 2009-03-24  Arthur Loiret  <aloiret@debian.org>
21340         * config.host (alpha*-*-linux*): Use driver-alpha.o and alpha/x-alpha.
21341         * config/alpha/linux.h (host_detect_local_cpu): Declare, add to
21342         EXTRA_SPEC_FUNCTIONS.
21343         (MCPU_MTUNE_NATIVE_SPECS, DRIVER_SELF_SPECS): New macros.
21344         * config/alpha/driver-alpha.c, config/alpha/x-alpha: New.
21345         * doc/invoke.texi (DEC Alpha Options): Document 'native' value for
21346         -march and -mtune options.
21348 2009-03-24  Ralf Corsépius  <ralf.corsepius@rtems.org>
21350         * config/m68k/t-rtems: Add m5329 multilib.
21352 2009-03-24  Dodji Seketeli  <dodji@redhat.com>
21353             Jakub Jelinek  <jakub@redhat.com>
21355         PR debug/39524
21356         * dwarf2out.c (gen_variable_die): Avoid adding duplicate declaration
21357         nodes.
21359 2009-03-23  Jakub Jelinek  <jakub@redhat.com>
21361         PR c/39495
21362         * c-parser.c (c_parser_omp_for_loop): Call c_parser_binary_expression
21363         instead of c_parser_expression_conv, if original_code isn't one of the
21364         4 allowed comparison codes, fail.
21366 2009-03-23  Richard Guenther  <rguenther@suse.de>
21368         * cgraph.h (struct cgraph_node): Reorder fields for 64-bit hosts.
21369         * tree.h (struct tree_type): Likewise.
21370         * reload.h (struct insn_chain): Likewise.
21371         * dwarf2out.c (struct dw_loc_descr_struct): Likewise.
21372         * function.h (struct function): Likewise.
21373         * tree-ssa-structalias.c (struct equiv_class_label): Likewise.
21375 2009-03-23  Jakub Jelinek  <jakub@redhat.com>
21377         PR tree-optimization/39516
21378         * lambda-code.c (perfect_nestify): Fix type of the uboundvar variable.
21380 2009-03-23  Bingfeng Mei  <bmei@broadcom.com>
21382         * config.gcc (need_64bit_hwint): Make clear that need_64bit_hwint
21383         should be set true if BITS_PER_WORD of target is bigger than 32
21385 2009-03-22  Hans-Peter Nilsson  <hp@axis.com>
21387         * config/cris/linux.h (CRIS_LINK_SUBTARGET_SPEC):
21388         Translate -B-options to -rpath-link.  Correct existing
21389         rpath-link and conditionalize on !nostdlib.
21391 2009-03-22  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
21393         * doc/extend.texi (Function Attributes, Variable Attributes):
21394         Fix typos.
21395         * doc/invoke.texi (Debugging Options, Optimize Options)
21396         (i386 and x86-64 Options, MCore Options): Likewise.
21398 2009-03-20  Jakub Jelinek  <jakub@redhat.com>
21400         PR debug/37890
21401         * dwarf2out.c (gen_namespace_die): Add context_die argument and use
21402         it for block local namespace aliases.
21403         (gen_decl_die): Pass context_die to gen_namespace_die.
21405 2009-03-19  Jakub Jelinek  <jakub@redhat.com>
21407         PR c/39495
21408         * c-omp.c (c_finish_omp_for): Allow NE_EXPR with TREE_TYPE (decl)'s
21409         minimum or maximum value.
21411 2009-03-19  Alexandre Oliva  <aoliva@redhat.com>
21413         * reginfo.c (globalize_reg): Recompute derived reg sets.
21415 2009-03-19  Ozkan Sezer  <sezeroz@gmail.com>
21417         PR target/39063
21418         * libgcc2.c (mprotect): Do not use signed arguments for
21419         VirtualProtect, use DWORD arguments.  Also fix the 'may
21420         be used uninitialized' warning for the np variable.
21422 2009-03-19  Jakub Jelinek  <jakub@redhat.com>
21424         PR target/39496
21425         * config/i386/i386.c (ix86_function_regparm): Don't optimize local
21426         functions using regparm calling conventions when not optimizing.
21427         (ix86_function_sseregparm): Similarly for sseregparm calling
21428         conventions.
21430 2009-03-19  Li Feng  <nemokingdom@gmail.com>
21432         PR middle-end/39500
21433         * tree-data-ref.c (analyze_subscript_affine_affine): There is no
21434         dependence if the first conflict is after niter iterations.
21436 2009-03-19  Hans-Peter Nilsson  <hp@axis.com>
21438         PR middle-end/38609
21439         * config/cris/cris.h (FRAME_POINTER_REQUIRED): Force for all
21440         functions with dynamic stack-pointer adjustments.
21442 2009-03-19  Ben Elliston  <bje@au.ibm.com>
21444         * doc/invoke.texi (RS/6000 and PowerPC Options): Fix -msdata-data
21445         option; change to -msdata=data.
21447 2009-03-18  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
21449         * c.opt: Unify help texts for -Wdeprecated, -Wsystem-headers,
21450         and -fopenmp.
21452 2009-03-18  Eric Botcazou  <ebotcazou@adacore.com>
21454         PR target/35180
21455         * config/sparc/sparc.md (do_builtin_setjmp_setup): Prettify asm output.
21457 2009-03-18  Sandra Loosemore  <sandra@codesourcery.com>
21459         * doc/invoke.texi (Code Gen Options): Expand discussion of
21460         -fno-common.
21462 2009-03-18  Jakub Jelinek  <jakub@redhat.com>
21464         * dse.c (struct group_info): Reorder fields for 64-bit hosts.
21465         * matrix-reorg.c (struct matrix_info): Likewise.
21466         * tree-ssa-loop-ivopts.c (struct ivopts_data): Likewise.
21467         * rtl.h (struct mem_attrs): Likewise.
21468         * df.h (struct df): Likewise.
21469         * tree-data-ref.h (struct data_dependence_relation): Likewise.
21470         * ira-int.h (struct ira_allocno): Likewise.
21471         * df-scan.c (struct df_collection_rec): Likewise.
21472         * ira.c (struct equivalence): Likewise.
21473         * function.c (struct temp_slot): Likewise.
21474         * cfgloop.h (struct loop): Likewise.
21476         PR debug/39485
21477         * function.c (use_register_for_decl): When not optimizing, disregard
21478         register keyword for variables with types containing methods.
21480 2009-03-18  Sebastian Pop  <sebastian.pop@amd.com>
21482         PR middle-end/39447
21483         * graphite.c (exclude_component_ref): Renamed contains_component_ref_p.
21484         (is_simple_operand): Call contains_component_ref_p before calling data
21485         reference analysis that would fail on COMPONENT_REFs.
21487         * tree-vrp.c (search_for_addr_array): Fix formatting.
21489 2009-03-18  Richard Guenther  <rguenther@suse.de>
21491         * tree-vect-transform.c (vect_loop_versioning): Fold the
21492         generated comparisons.
21493         * tree-vectorizer.c (set_prologue_iterations): Likewise.
21494         (slpeel_tree_peel_loop_to_edge): Likewise.
21496 2009-03-17  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
21498         PR middle-end/37805
21499         * opts.c (print_specific_help): In addition to `undocumented',
21500         accept `separate' and `joined' flags if passed alone.  Describe
21501         output by the first matched one of those.
21502         (common_handle_option): Skip over empty strings.
21503         * gcc.c (display_help): Fix help string for `--help='.
21504         * doc/invoke.texi (Option Summary, Overall Options): With
21505         `--help=', classes and qualifiers can both be repeated, but
21506         only the latter can be negated.  One should not pass only
21507         negated qualifiers.  Fix markup and examples.
21509         Revert
21510         2008-10-14  Jakub Jelinek  <jakub@redhat.com>
21511         PR middle-end/37805
21512         * opts.c (common_handle_option): Don't ICE on -fhelp=joined
21513         and -fhelp=separate.
21515 2009-03-17  Jing Yu  <jingyu@google.com>
21517         PR middle-end/39378
21518         * function.h (struct rtl_data): Move is_thunk from here...
21519         (struct function): ...to here.
21520         * cp/method.c (use_thunk): Change is_thunk from crtl to cfun.
21521         * varasm.c (assemble_start_function): Change is_thunk from crtl to
21522         cfun.
21523         * config/alpha/alpha.c (alpha_sa_mask): Change is_thunk from crtl to
21524         cfun.
21525         (alpha_does_function_need_gp, alpha_start_function): Likewise.
21526         (alpha_output_function_end_prologue): Likewise.
21527         (alpha_end_function, alpha_output_mi_thunk_osf): Likewise.
21528         * config/rs6000/rs6000.c (rs6000_ra_ever_killed): Likewise.
21529         (rs6000_output_function_epilogue): Likewise.
21530         * config/arm/arm.h (ARM_DECLARE_FUNCTION_NAME): Likewise.
21532 2009-03-17  Uros Bizjak  <ubizjak@gmail.com>
21534         PR target/39482
21535         * config/i386/i386.md (*truncdfsf_mixed): Avoid combining registers
21536         from different units in a single alternative.
21537         (*truncdfsf_i387): Ditto.
21538         (*truncxfsf2_mixed): Ditto.
21539         (*truncxfdf2_mixed): Ditto.
21541 2009-03-17  Jakub Jelinek  <jakub@redhat.com>
21543         * dwarf2out.c (dwarf2out_imported_module_or_decl_1): Allow
21544         non-NAMESPACE_DECL IMPORTED_DECL_ASSOCIATED_DECL.
21546         PR debug/39474
21547         * tree-ssa-live.c (remove_unused_locals): Don't remove local
21548         unused non-artificial variables when not optimizing.
21550         PR debug/39471
21551         * dwarf2out.c (dwarf2out_imported_module_or_decl_1): Emit
21552         DW_TAG_imported_module even if decl is IMPORTED_DECL with
21553         NAMESPACE_DECL in its DECL_INITIAL.
21555         PR middle-end/39443
21556         * optabs.c (set_user_assembler_libfunc): New function.
21557         * expr.h (set_user_assembler_libfunc): New prototype.
21558         * c-common.c: Include libfuncs.h.
21559         (set_builtin_user_assembler_name): Call set_user_assembler_libfunc
21560         for memcmp, memset, memcpy, memmove and abort.
21561         * Makefile.in (c-common.o): Depend on libfuncs.h.
21563         PR debug/39412
21564         * dwarf2out.c (gen_inlined_enumeration_type_die,
21565         gen_inlined_structure_type_die, gen_inlined_union_type_die,
21566         gen_tagged_type_instantiation_die): Removed.
21567         (gen_decl_die): For TYPE_DECL_IS_STUB with non-NULL decl_origin
21568         do nothing.
21570 2009-03-17  Janis Johnson  <janis187@us.ibm.com>
21572         PR testsuite/38526
21573         * Makefile.in (site.exp): Rename TEST_GCC_EXEC_PREFIX and comment
21574         its use.
21575         (check-%): Don't set GCC_EXEC_PREFIX when invoking runtest.
21576         (check-parallel-%): Ditto.
21577         (check-consistency): Ditto.
21579 2009-03-17  Kai Tietz  <kai.tietz@onevision.com>
21581         * ipa-struct-reorg.c (create_general_new_stmt): Initialize
21582         local variable rhs by NULL_TREE.
21584 2009-03-17  H.J. Lu  <hongjiu.lu@intel.com>
21586         PR target/39477
21587         * doc/extend.texi: Correct register behavior for regparm on Intel 386.
21589 2009-03-17  H.J. Lu  <hongjiu.lu@intel.com>
21591         PR target/39476
21592         * config/i386/i386.c (ix86_function_regparm): Rewrite for 64bit.
21594 2009-03-17  H.J. Lu  <hongjiu.lu@intel.com>
21596         PR target/39473
21597         * config/i386/i386.c (ix86_expand_call): Check extra clobbers
21598         for ms->sysv ABI calls only in 64bit mode.
21600         * config/i386/i386.md (untyped_call): Support 32bit.
21602 2009-03-16  H.J. Lu  <hongjiu.lu@intel.com>
21604         * doc/extend.texi: Replace x86_65 with x86_64.
21606 2009-03-16  Jakub Jelinek  <jakub@redhat.com>
21608         PR tree-optimization/39455
21609         * tree-ssa-loop-niter.c (number_of_iterations_lt_to_ne): Fix types
21610         mismatches for POINTER_TYPE_P (type).
21611         (number_of_iterations_le): Likewise.
21613 2009-03-16  Hariharan Sandanagobalane  <hariharan@picochip.com>
21615         * config/picochip/picochip.c: Removed profiling support.
21616         * config/picochip/picochip.md: Removed profiling instruction.
21617         * config/picochip/picochip.h: Removed profiling builtin.
21619 2009-03-16  Joseph Myers  <joseph@codesourcery.com>
21621         * doc/install.texi (--with-host-libstdcxx): Document.
21623 2009-03-14  Anatoly Sokolov  <aesok@post.ru>
21625         PR target/34299
21626         * config/avr/avr.c (avr_handle_fndecl_attribute): Move code for
21627         generate a warning if the function name does not begin with
21628         "__vector" and the function has either the 'signal' or 'interrupt'
21629         attribute, from here to ...
21630         (avr_declare_function_name): ...here. New function.
21631         * config/avr/avr.h (ASM_DECLARE_FUNCTION_NAME): Redefine.
21632         * config/avr/avr-protos.h (avr_declare_function_name): Declare.
21634 2009-03-14  Jakub Jelinek  <jakub@redhat.com>
21636         PR bootstrap/39454
21637         * cse.c (fold_rtx): Don't modify original const_arg1 when
21638         canonicalizing SHIFT_COUNT_TRUNCATED shift count, do it on a
21639         separate variable instead.
21640         * rtlanal.c (nonzero_bits1) <case ASHIFTRT>: Don't assume anything
21641         from out of range shift counts.
21642         (num_sign_bit_copies1) <case ASHIFTRT, case ASHIFT>: Similarly.
21644 2009-03-13  Catherine Moore  <clm@codesourcery.com>
21646         * config/i386/x-mingw32 (host-mingw32.o): Replace
21647         diagnostic.h with $(DIAGNOSTIC_H).
21649 2009-03-12  Jakub Jelinek  <jakub@redhat.com>
21651         PR target/39431
21652         * config/i386/predicates.md (cmpxchg8b_pic_memory_operand): New
21653         predicate.
21654         * config/i386/sync.md (sync_compare_and_swap<mode>,
21655         sync_compare_and_swap_cc<mode>): For DImode with -m32 -fpic check
21656         if operands[1] is cmpxchg8b_pic_memory_operand, if not force address
21657         into a register.
21658         (sync_double_compare_and_swapdi_pic,
21659         sync_double_compare_and_swap_ccdi_pic): Require operand 1 to be
21660         cmpxchg8b_pic_memory_operand instead of just memory_operand.
21662 2009-03-12  H.J. Lu  <hongjiu.lu@intel.com>
21664         PR target/39445
21665         * config/i386/i386.c (ix86_expand_push): Don't set memory alignment.
21667 2009-03-12  H.J. Lu  <hongjiu.lu@intel.com>
21669         PR target/39327
21670         * config/i386/sse.md (avx_addsubv8sf3): Correct item bits.
21671         (avx_addsubv4df3): Likewise.
21672         (*avx_addsubv4sf3): Likewise.
21673         (sse3_addsubv4sf3): Likewise.
21675 2009-03-12  H.J. Lu  <hongjiu.lu@intel.com>
21677         PR target/38824
21678         * config/i386/i386.md: Compare REGNO on the new peephole2 patterns.
21680 2009-03-12  Vladimir Makarov  <vmakarov@redhat.com>
21682         PR debug/39432
21683         * ira-int.h (struct allocno): Fix comment for calls_crossed_num.
21684         * ira-conflicts.c (ira_build_conflicts): Prohibit call used
21685         registers for allocnos created from user-defined variables.
21687 2009-03-11  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
21689         PR target/39181
21690         * config/spu/spu.c (spu_expand_mov): Handle invalid subregs
21691         of non-integer mode as well.
21693 2009-03-11  Adam Nemet  <anemet@caviumnetworks.com>
21695         * gimplify.c (gimplify_call_expr): Don't set CALL_CANNOT_INLINE_P
21696         for functions for which the parameter types are unknown.
21698 2009-03-11  Jakub Jelinek  <jakub@redhat.com>
21700         PR target/39137
21701         * cfgexpand.c (get_decl_align_unit): Use LOCAL_DECL_ALIGNMENT macro.
21702         * defaults.h (LOCAL_DECL_ALIGNMENT): Define if not yet defined.
21703         * config/i386/i386.h (LOCAL_DECL_ALIGNMENT): Define.
21704         * config/i386/i386.c (ix86_local_alignment): For
21705         -m32 -mpreferred-stack-boundary=2 use 32-bit alignment for
21706         long long variables on the stack to avoid dynamic realignment.
21707         Allow the first argument to be a decl rather than type.
21708         * doc/tm.texi (LOCAL_DECL_ALIGNMENT): Document.
21710 2009-03-11  Nick Clifton  <nickc@redhat.com>
21712         PR target/5362
21713         * config/mcore/mcore.opt: Remove deprecated m4align and m8align
21714         options.
21715         Add description to mno-lsim option.
21716         * config/mcore/mcore.h: Remove comment about deprecated m4align
21717         option.
21718         (TARGET_DEFAULT): Remove deprecated MASK_M8ALIGN.
21719         * doc/invoke.texi: Add description of mno-lsim and
21720         mstack-increment options.
21722         * config/fr30/fr30.opt: Document the -mno-lsim option.
21723         * doc/invoke.texi: Add descriptions of the FR30's -msmall-model
21724         and -mno-lsim options.
21726 2009-03-11  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
21728         * fold-const.c (fold_comparison): Only call fold_inf_compare
21729         if the mode supports infinities.
21731 2009-03-11  Jason Merrill  <jason@redhat.com>
21733         PR debug/39086
21734         * tree-nrv.c (tree_nrv): Don't do this optimization if the front
21735         end already did.  Notice GIMPLE_CALL modifications of the result.
21736         Don't copy debug information from an ignored decl or a decl from
21737         another function.
21739 2009-03-10  Richard Guenther  <rguenther@suse.de>
21740             Nathan Froyd  <froydnj@codesourcery.com>
21742         PR middle-end/37850
21743         * libgcc2.c (__mulMODE3): Use explicit assignments to form the result.
21744         (__divMODE3): Likewise.
21746 2009-03-09  Jakub Jelinek  <jakub@redhat.com>
21748         PR tree-optimization/39394
21749         * gimplify.c (gimplify_type_sizes): Gimplify DECL_SIZE and
21750         DECL_SIZE_UNIT of variable length FIELD_DECLs.
21752 2009-03-09  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
21754         * recog.c (verfiy_changes): Disallow renaming of hard regs in
21755         inline asms for register asm ("") declarations.
21757 2009-03-09  Eric Botcazou  <ebotcazou@adacore.com>
21759         * fold-const.c (fold_unary): Fix comment.
21761 2009-03-07  Jan Hubicka  <jh@suse.cz>
21763         PR target/39361
21764         * tree-inline.c (setup_one_parameter): Do replacement of const
21765         argument by constant in SSA form.
21767 2009-03-07  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
21769         PR middle-end/38028
21770         * function.c (assign_parm_setup_stack): Use STACK_SLOT_ALIGNMENT to
21771         determine alignment passed to assign_stack_local.
21772         (assign_parms_unsplit_complex): Likewise.
21773         * except.c (sjlj_build_landing_pads): Likewise.
21775 2009-03-06  Jakub Jelinek  <jakub@redhat.com>
21777         PR middle-end/39360
21778         * tree-flow.h (add_referenced_var): Return bool instead of void.
21779         * tree-dfa.c (add_referenced_var): Return result of
21780         referenced_var_check_and_insert call.
21781         * tree-inline.c (expand_call_inline): Call add_referenced_var instead
21782         of referenced_var_check_and_insert.
21784         PR debug/39372
21785         * dwarf2out.c (add_abstract_origin_attribute): Return origin_die.
21786         (gen_variable_die): Emit DW_AT_location on abstract static variable's
21787         DIE, don't emit it if abstract origin already has it.
21788         * tree-cfg.c (remove_useless_stmts_bind): GIMPLE_BINDs with any
21789         BLOCK_NONLOCALIZED_VARS in its gimple_bind_block aren't useless.
21791 2009-03-06  Jan-Benedict Glaw  <jbglaw@lug-owl.de>
21793         * genpreds.c (needs_variable): Fix parentheses at variable name
21794         detection.
21795         (write_tm_constrs_h): Indent generated code.
21797 2009-03-06  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
21799         * doc/extend.texi (Function Attributes): Add documentation
21800         for isr attributes.
21802 2009-03-06  Jakub Jelinek  <jakub@redhat.com>
21804         PR debug/39387
21805         * dwarf2out.c (dwarf2out_imported_module_or_decl_1): For IMPORTED_DECL
21806         take locus from its DECL_SOURCE_LOCATION instead of input_location.
21808 2009-03-05  Bernd Schmidt  <bernd.schmidt@analog.com>
21810         * config/bfin/bfin.c (bfin_discover_loop): When retrying fails, mark
21811         the loop as bad.
21813 2009-03-05  Jakub Jelinek  <jakub@redhat.com>
21815         PR debug/39379
21816         * tree-cfg.c (remove_useless_stmts_bind): Don't remove GIMPLE_BINDs
21817         with blocks containing IMPORTED_DECLs in BLOCK_VARS.
21819 2009-03-05  Uros Bizjak  <ubizjak@gmail.com>
21821         * config/i386/i386.md (R8_REG, R9_REG): New constants.
21822         * config/i386/i386.h (CONDITIONAL_REGISTER_USAGE): Use named
21823         constants instead of magic numbers.
21824         (HARD_REGNO_CALLER_SAVE_MODE): Ditto.
21825         (QI_REG_P): Ditto.
21826         * config/i386/i386.c (x86_64_int_parameter_registers): Ditto.
21827         (x86_64_ms_abi_int_parameter_registers): Ditto.
21828         (x86_64_int_return_registers): Ditto.
21829         (ix86_maybe_switch_abi): Ditto.
21830         (ix86_expand_call): Ditto for clobbered_registers array.
21831         (ix86_hard_regno_mode_ok): Ditto.
21832         (x86_extended_QIreg_mentioned_p): Ditto.
21834 2009-03-05  J"orn Rennecke  <joern.rennecke@arc.com>
21836         PR tree-optimization/39349
21837         * cse.c (cse_insn): Fix loop to stop at VOIDmode.
21839         * combine.c (gen_lowpart_for_combine): Use omode when generating
21840         clobber.
21842 2009-03-04  J"orn Rennecke  <joern.rennecke@arc.com>
21844         PR rtl-optimization/39235
21845         * loop-iv.c (get_simple_loop_desc): Use XCNEW.
21847 2009-03-04  Zdenek Dvorak  <ook@ucw.cz>
21849         * graphite.c (nb_reductions_in_loop): Update simple_iv arguments.
21851 2009-03-04  Richard Guenther  <rguenther@suse.de>
21853         PR tree-optimization/39362
21854         * tree-ssa-sccvn.c (visit_use): Stores and copies from SSA_NAMEs
21855         that occur in abnormal PHIs should be varying.
21857 2009-03-04  Zdenek Dvorak  <ook@ucw.cz>
21859         * tree-scalar-evolution.c (analyze_scalar_evolution_in_loop):
21860         Extend comments.
21861         (simple_iv):  Take loop as an argument instead of statement.
21862         * tree-scalar-evolution.h (simple_iv): Declaration changed.
21863         * tree-ssa-loop-niter.c (number_of_iterations_exit): Update calls
21864         to simple_iv.
21865         * tree-ssa-loop-ivopts.c (determine_biv_step, find_givs_in_stmt_scev):
21866         Ditto.
21867         * tree-parloops.c (loop_parallel_p, canonicalize_loop_ivs): Ditto.
21868         * matrix-reorg.c (analyze_transpose): Ditto.
21869         * tree-data-ref.c (dr_analyze_innermost): Ditto.
21870         * tree-vect-analyze.c (vect_analyze_data_refs): Ditto.
21871         * tree-predcom.c (ref_at_iteration): Ditto.
21872         * tree-ssa-loop-prefetch.c (idx_analyze_ref): Ditto.
21874 2009-03-04  Richard Guenther  <rguenther@suse.de>
21876         PR tree-optimization/39358
21877         * tree-ssa-structalias.c (do_sd_constraint): Fix check for
21878         escaped_id and callused_id.
21879         (solve_graph): Likewise.
21881 2009-03-04  Richard Guenther  <rguenther@suse.de>
21883         PR tree-optimization/39339
21884         * tree-sra.c (try_instantiate_multiple_fields): Make it
21885         no longer ICE on the above.
21887 2009-03-03  Joseph Myers  <joseph@codesourcery.com>
21889         * emit-rtl.c (adjust_address_1): Reduce offset to a signed value
21890         that fits within Pmode.
21892 2009-03-03  Steve Ellcey  <sje@cup.hp.com>
21894         PR middle-end/10109
21895         * tm.texi (LIBCALL_VALUE): Update description.
21897 2009-03-03  Steve Ellcey  <sje@cup.hp.com>
21899         PR middle-end/34443
21900         * doc/extend.texi (section): Update description.
21902 2009-03-03  H.J. Lu  <hongjiu.lu@intel.com>
21904         PR middle-end/39345
21905         * tree-inline.c (remapped_type): New.
21906         (can_be_nonlocal): Call remapped_type instead of remap_type.
21908 2009-03-03  Jakub Jelinek  <jakub@redhat.com>
21910         PR fortran/39354
21911         * gimplify.c (goa_stabilize_expr): Handle tcc_comparison,
21912         TRUTH_ANDIF_EXPR and TRUTH_ORIF_EXPR.
21914 2009-03-03  Richard Guenther  <rguenther@suse.de>
21916         PR middle-end/39272
21917         * tree.c (tree_nonartificial_location): New function.
21918         * tree.h (tree_nonartificial_location): Declare.
21919         * builtins.c (expand_builtin_memory_chk): Provide location
21920         of the call location for artificial function pieces.
21921         (maybe_emit_chk_warning): Likewise.
21922         (maybe_emit_sprintf_chk_warning): Likewise.
21923         (maybe_emit_free_warning): Likewise.
21924         * expr.c (expand_expr_real_1): Likewise.
21926 2009-03-03  Jakub Jelinek  <jakub@redhat.com>
21928         PR tree-optimization/39343
21929         * tree-ssa-ccp.c (maybe_fold_offset_to_address): Don't check if
21930         COMPONENT_REF t has ARRAY_TYPE.
21932 2009-03-02  Sebastian Pop  <sebastian.pop@amd.com>
21934         PR middle-end/39335
21935         * tree-parloops.c (canonicalize_loop_ivs): Call fold_convert
21936         when the type precision of the induction variable should be
21937         larger than the type precision of nit.
21938         (gen_parallel_loop): Update use of canonicalize_loop_ivs.
21939         * graphite.c (graphite_loop_normal_form): Same.
21940         * tree-flow.h (canonicalize_loop_ivs): Update declaration.
21942 2009-03-02  Uros Bizjak  <ubizjak@gmail.com>
21944         * config/i386/i386.md (ST?_REG, MM?_REG): New constants.
21945         (*call_1_rex64_ms_sysv): Use named constants instead of magic
21946         numbers to describe clobbered registers.
21947         (*call_value_0_rex64_ms_sysv): Ditto.
21948         * config/i386/mmx.md (mmx_emms): Ditto.
21949         (mmx_femms): Ditto.
21951 2009-03-02  Richard Sandiford  <rdsandiford@googlemail.com>
21953         * config/mips/mips.c (mips_mdebug_abi_name): Fix the handling
21954         of ABI_64.
21956 2009-03-02  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
21958         * config/spu/spu.c (TARGET_SECTION_TYPE_FLAGS): Define.
21959         (spu_section_type_flags): New function.
21961 2009-03-02  Uros Bizjak  <ubizjak@gmail.com>
21963         * config/i386/i386.h (CONDITIONAL_REGISTER_USAGE): Do not copy
21964         reg_class_contents of FLOAT_REGS into a temporary.
21966 2009-03-02  Richard Guenther  <rguenther@suse.de>
21967             Ira Rosen  <irar@il.ibm.com>
21969         PR tree-optimization/39318
21970         * tree-vect-transform.c (vectorizable_call): Transfer the EH region
21971         information to the vectorized statement.
21973 2009-03-01  Uros Bizjak  <ubizjak@gmail.com>
21975         * config/i386/i386.h (CONDITIONAL_REGISTER_USAGE): Do not shadow "i"
21976         variable.  Use defined names instead of magic constants for REX SSE
21977         registers.
21979 2009-03-01  Richard Guenther  <rguenther@suse.de>
21981         PR tree-optimization/39331
21982         * omp-low.c (lower_send_shared_vars): Do not receive new
21983         values for the reference of DECL_BY_REFERENCE parms or results.
21985 2009-03-01  Jan Hubicka  <jh@suse.cz>
21987         PR debug/39267
21988         * tree.h (BLOCK_NONLOCALIZED_VARS, BLOCK_NUM_NONLOCALIZED_VARS,
21989         BLOCK_NONLOCALIZED_VAR): New macros.
21990         (tree_block): Add nonlocalized_vars.
21991         * dwarf2out.c (gen_formal_parameter_die, gen_variable_die,
21992         gen_decl_die): Add origin argument.  Allow generation of die with
21993         origin at hand only.
21994         (gen_member_die, gen_type_die_with_usage, force_decl_die,
21995         declare_in_namespace, gen_namescpace_die, dwarf2out_decl): Update use
21996         of gen_*.
21997         (gen_block_die): Fix checking for unused blocks.
21998         (process_scope_var): Break out from .... ; work with origins only.
21999         (decls_for_scope) ... here; process nonlocalized list.
22000         (dwarf2out_ignore_block): Look for nonlocalized vars.
22001         * tree-ssa-live.c (remove_unused_scope_block_p): Look for nonlocalized
22002         vars.
22003         (dump_scope_block): Dump them.
22004         * tree-inline.c (remap_decls): Handle nonlocalized vars.
22005         (remap_block): Likewise.
22006         (can_be_nonlocal): New predicate.
22007         (copy_bind_expr, copy_gimple_bind): Update use of remap_block.
22009 2009-03-01  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
22011         * configure: Regenerate.
22013 2009-03-01  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
22015         * optc-gen.awk: No need to duplicate option flags twice.
22016         Reuse help texts for duplicate options which do not have any.
22018         * gcc.c (display_help): Document --version.
22020         * gcc.c (main): If print_help_list and verbose_flag, ensure
22021         driver output comes before subprocess output.
22023         * optc-gen.awk: Assign all remaining fields to help string,
22024         space-separated, for multi-line help in *.opt.
22026         * doc/invoke.texi (Warning Options): -Wsync-nand is C/C++ only.
22027         -Wno-pedantic-ms-format is for MinGW targets only.
22029         * doc/options.texi (Option file format): Fix bad indentation,
22030         restoring dropped sentence.
22032 2009-02-28  Jan Hubicka  <jh@suse.cz>
22034         * tree-inline.c (tree_function_versioning): Output debug info.
22036 2009-02-28  Jan Hubicka  <jh@suse.cz>
22038         PR debug/39267
22039         * tree-inline.c (setup_one_parameter): Do not copy propagate
22040         arguments when not optimizing.
22042 2009-02-28  H.J. Lu  <hongjiu.lu@intel.com>
22044         PR target/39327
22045         * config/i386/sse.md (avx_addsubv8sf3): Correct item bits.
22046         (avx_addsubv4df3): Likewise.
22047         (*avx_addsubv4sf3): Likewise.
22048         (sse3_addsubv4sf3): Likewise.
22049         (*avx_addsubv2df3): Likewise.
22050         (sse3_addsubv2df3): Likewise.
22051         (avx_unpckhps256): Correct item selectors.
22052         (avx_unpcklps256): Likewise.
22053         (avx_unpckhpd256): Likewise.
22054         (avx_unpcklpd256): Likewise.
22056 2009-02-28  Jan Hubicka  <jh@suse.cz>
22058         * tree-inline.c (expand_call_inline): Avoid duplicate declarations of
22059         static vars.
22060         (copy_arguments_for_versioning): If var is declared don't declare it.
22061         (tree_function_versioning): First setup substitutions and then copy
22062         args.
22064 2009-02-27  Jan Hubicka  <jh@suse.cz>
22066         PR debug/39267
22067         * cgraph.h (varpool_output_debug_info): Remove.
22068         * cgraphunit.c (varpool_output_debug_info): Remove.
22069         * dwarf2out.c (deferred_locations_struct): New struct
22070         (deferred_locations): New type.
22071         (deferred_locations_list): New static var.
22072         (deffer_location): New function.
22073         (gen_variable_die): Use it.
22074         (decls_for_scope): Output info on local static vars.
22075         (dwarf2out_finish): Process deferred locations.
22076         * varpool.c (varpool_output_debug_info): Remove.
22078 2009-02-27  Jan Hubicka  <jh@suse.cz>
22080         PR debug/39267
22081         * tree.h (TREE_PROTECTED): Fix comment.
22082         (BLOCK_HANDLER_BLOCK): Remove.
22083         (struct tree_block): Remove handler_block add body_block.
22084         (inlined_function_outer_scope_p): New.
22085         (is_body_block): Remove.
22086         * dbxout.c (dbxout_block): Remove BLOCK_HANDLER_BLOCK.
22087         * dwarf2out.c (is_inlined_entry_point): Remove.
22088         (add_high_low_attributes): Use inlined_function_outer_scope_p.
22089         (gen_block_die): Use is_inlined_entry_point check.  Remove body block
22090         code.
22091         * langhooks.h (struct lang_hooks): Remove no_bodu_blocks.
22092         * gimplify.c (gimplify_expr): Gimplify body blocks.
22093         * tree-ssa-live.c (remove_unused_scope_block_p): Allow removing wrapper
22094         block with multiple subblocks.
22095         (dump_scope_block): Prettier output; dump more flags and info.
22096         (dump_scope_blocks): New.
22097         (remove_unused_locals): Use dump_scope_blocks.
22098         * tree-flow.h (dump_scope_blocks): Declare.
22099         * tree-cfg.c (execute_build_cfg): Dump scope blocks.
22100         * stmt.c (is_body_block): Remove.
22101         * tree-inline.c (remap_block): Copy BODY_BLOCK info.
22102         * langhooks-def.h (LANG_HOOKS_NO_BODY_BLOCKS): Remove.
22104 2009-02-27  Sebastian Pop  <sebastian.pop@amd.com>
22106         PR middle-end/39308
22107         * graphite.c (graphite_loop_normal_form): Do not call
22108         number_of_iterations_exit from a gcc_assert.
22110 2009-02-27  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
22112         * config/s390/s390.c (s390_swap_cmp): Look for conditional
22113         jumps if COND is NULL.
22114         (find_cond_jump): New function.
22115         (s390_z10_optimize_cmp): Handling for reg-reg compares added.
22116         * config/s390/s390.md: Remove z10_cobra attribute value.
22118 2009-02-26  Uros Bizjak  <ubizjak@gmail.com>
22120         * config/alpha/alpha.h (alpha_expand_mov): Return false if
22121         force_const_mem returns NULL_RTX.
22123 2009-02-26  Jan Hubicka  <jh@suse.cz>
22125         PR debug/39267
22126         * cgraph.h (varpool_output_debug_info): Remove.
22127         * cgraphunit.c (varpool_output_debug_info): Remove.
22128         * dwarf2out.c (deferred_locations_struct): New struct
22129         (deferred_locations): New type.
22130         (deferred_locations_list): New static var.
22131         (deffer_location): New function.
22132         (gen_variable_die): Use it.
22133         (decls_for_scope): Output info on local static vars.
22134         (dwarf2out_finish): Process deferred locations.
22135         * varpool.c (varpool_output_debug_info): Remove.
22137 2009-02-25  H.J. Lu  <hongjiu.lu@intel.com>
22139         PR rtl-optimization/39241
22140         * jump.c (rtx_renumbered_equal_p): Remove 2 superfluous calls
22141         to subreg_offset_representable_p.
22143 2009-02-25  Paolo Bonzini  <bonzini@gnu.org>
22145         * regmove.c (regmove_optimize): Conform to struct rtl_opt_pass
22146         execute function prototype.  Get f and nregs from max_reg_num
22147         and get_insns.  Remove the first backward pass as it's dead,
22148         guard the forward pass by flag_expensive_optimizations.
22149         (rest_of_handle_regmove): Delete.
22150         (pass_regmove): Replace it with regmove_optimize.
22152 2009-02-25  Martin Jambor  <mjambor@suse.cz>
22154         PR tree-optimization/39259
22155         * tree-inline.c (initialize_cfun): Remove asserts for calls_setjmp and
22156         calls_alloca function flags.
22157         (copy_bb): Set calls_setjmp and alls_alloca function flags if such
22158         calls are detected.
22160 2009-02-25  Paolo Bonzini  <bonzini@gnu.org>
22162         * regmove.c (discover_flags_reg, flags_set_1, mark_flags_life_zones,
22163         flags_set_1_rtx, flags_set_1_set): Delete.
22164         (regmove_optimize): Do not call mark_flags_life_zones.
22166 2009-02-24  Julian Brown  <julian@codesourcery.com>
22168         PR target/35965
22169         * config/arm/arm.c (require_pic_register): Only set
22170         cfun->machine->pic_reg once per function.
22172 2009-02-24  Sandra Loosemore  <sandra@codesourcery.com>
22174         * doc/invoke.texi (Link Options): Document an easier way to pass
22175         options that take arguments to the GNU linker using -Xlinker and -Wl.
22177 2009-02-24  Steve Ellcey  <sje@cup.hp.com>
22179         PR target/33785
22180         * doc/tm.texi (TARGET_C99_FUNCTIONS): Fix description.
22182 2009-02-24  Richard Guenther  <rguenther@suse.de>
22184         PR debug/39285
22185         * dwarf2out.c (gen_enumeration_type_die): Handle CONST_DECLs.
22187 2009-02-24  Richard Guenther  <rguenther@suse.de>
22188             Zdenek Dvorak  <ook@ucw.cz>
22190         PR tree-optimization/39233
22191         * tree-ssa-loop-ivopts.c (add_candidate_1): Do not except pointers
22192         from converting them to a generic type.
22194 2009-02-23  Sebastian Pop  <sebastian.pop@amd.com>
22196         PR tree-optimization/39260
22197         * graphite.c (harmful_stmt_in_bb): Stop a SCoP when the basic block
22198         contains a condition with a real type.
22199         (build_scop_conditions_1): Conditions are always last_stmt of a bb.
22201 2009-02-23  Jason Merrill  <jason@redhat.com>
22203         PR c++/38880
22204         * varasm.c (initializer_constant_valid_p) [PLUS_EXPR]: Check
22205         narrowing_initializer_constant_valid_p.
22206         (narrowing_initializer_constant_valid_p): Don't return
22207         null_pointer_node for adding a pointer to itself.
22209 2009-02-23  Jan Hubicka  <jh@suse.cz>
22211         PR c/12245
22212         * ggc.h (htab_create_ggc): Use ggc_free to free hashtable when
22213         resizing.
22215 2009-02-23  Jan Hubicka  <jh@suse.cz>
22217         PR tree-optimization/37709
22218         * tree.c (block_ultimate_origin): Move here from dwarf2out.
22219         * tree.h (block_ultimate_origin): Declare.
22220         * dwarf2out.c (block_ultimate_origin): Move to tree.c
22221         * tree-ssa-live.c (remove_unused_scope_block_p):
22222         Eliminate blocks containig no instructions nor live variables nor
22223         nested blocks.
22224         (dump_scope_block): New function.
22225         (remove_unused_locals): Enable removal of dead blocks by default;
22226         enable dumping at TDF_DETAILS.
22228 2009-02-21  H.J. Lu  <hongjiu.lu@intel.com>
22230         * config/i386/i386.c (classify_argument): Don't allow COImode
22231         and OImode.
22232         (function_arg_advance_32): Don't allow OImode.
22233         (function_arg_32): Likewise.
22234         (function_value_32): Likewise.
22235         (return_in_memory_32): Likewise.
22236         (function_arg_64): Remove OImode comment.
22238 2009-02-21  H.J. Lu  <hongjiu.lu@intel.com>
22240         PR target/39261
22241         * config/i386/i386.c (ix86_expand_vector_init_one_nonzero): Use
22242         ix86_expand_vector_set for V4DImode in 64bit mode only.
22243         (ix86_expand_vector_init_one_var): Likewise.
22245 2009-02-21  Sebastian Pop  <sebastian.pop@amd.com>
22247         * graphite.c (graphite_trans_loop_block): Adjust tile size to 51.
22249 2009-02-21  Richard Sandiford  <rdsandiford@googlemail.com>
22251         PR bootstrap/39257
22252         * loop-iv.c: Revert last change.
22253         * emit-rtl.c: Likewise.
22255 2009-02-21  H.J. Lu  <hongjiu.lu@intel.com>
22257         PR target/39256
22258         * config/i386/i386.c (type_natural_mode): Remove an extra
22259         space in the warning message.
22260         (function_value_32): Handle 32-byte vector modes.
22261         (return_in_memory_32): Likewise.
22263 2009-02-21  Richard Sandiford  <rdsandiford@googlemail.com>
22265         * loop-iv.c (truncate_value): New function.
22266         (iv_subreg, get_iv_value, iv_number_of_iterations): Use it instead
22267         of lowpart_subreg.
22268         (lowpart_subreg): Move to...
22269         * emit-rtl.c: ...here.
22271 2009-02-21  Danny Smith  <dannysmith@users.sourceforge.net>
22273         * config/i386/winnt.c (i386_pe_asm_output_aligned_decl_common): Revert
22274         accidental and undocumented change at revision 140860.
22276 2009-02-21  Joseph Myers  <joseph@codesourcery.com>
22278         * config/arm/arm.c (arm_gimplify_va_arg_expr): Update prototype to
22279         take gimple_seq * arguments.
22280         (arm_mangle_type): Use CONST_CAST_TREE on type argument passed to
22281         types_compatible_p langhook.
22283 2009-02-20  Mark Mitchell  <mark@codesourcery.com>
22284             Joseph Myers  <joseph@codesourcery.com>
22286         * config/arm/arm.c (arm_builtin_va_list): New function.
22287         (arm_expand_builtin_va_start): Likewise.
22288         (arm_gimplify_va_arg_expr): Likewise.
22289         (TARGET_BUILD_BUILTIN_VA_LIST): Define.
22290         (TARGET_BUILD_BUILTIN_VA_START): Likewise.
22291         (TARGET_BUILD_BUILTIN_VA_ARG_EXPR): Likewise.
22292         (va_list_type): New variable.
22293         (arm_mangle_type): Mangle va_list_type appropriately.
22295 2009-02-20  Jakub Jelinek  <jakub@redhat.com>
22297         PR middle-end/39157
22298         * Makefile.in (loop-invariant.o): Depend on $(PARAMS_H).
22299         * params.h (LOOP_INVARIANT_MAX_BBS_IN_LOOP): Define.
22300         * params.def (loop-invariant-max-bbs-in-loop): New parameter.
22301         * opts.c (decode_options): Set loop-invariant-max-bbs-in-loop
22302         parameter to 1000 for -O1 by default.
22303         * doc/invoke.texi (loop-invariant-max-bbs-in-loop): Document new
22304         parameter.
22305         * loop-invariant.c: Include params.h.
22306         (move_loop_invariants): Don't call move_single_loop_invariants on
22307         very large loops.
22309 2009-02-20  Jaka Mocnik  <jaka@xlab.si>
22311         * calls.c (emit_library_call_value_1): Use slot_offset instead of
22312         offset when calculating bounds for indexing stack_usage_map.  Fixes
22313         a buffer overflow with certain target setups.
22315 2009-02-20  Jakub Jelinek  <jakub@redhat.com>
22317         PR target/39240
22318         * calls.c (expand_call): Clear try_tail_call if caller and callee
22319         disagree in promotion of function return value.
22321 2009-02-19  Jakub Jelinek  <jakub@redhat.com>
22323         PR target/39175
22324         * c-common.c (c_determine_visibility): If visibility changed and
22325         DECL_RTL has been already set, call make_decl_rtl to update symbol
22326         flags.
22328 2009-02-19  H.J. Lu  <hongjiu.lu@intel.com>
22330         PR c++/39188
22331         * varasm.c (assemble_variable): Don't check DECL_NAME when
22332         globalizing a variable.
22334 2009-02-19  Joseph Myers  <joseph@codesourcery.com>
22336         PR c/38483
22337         * builtins.c (gimplify_va_arg_expr): Evaluate the va_list
22338         expression before any __builtin_trap call.
22339         * c-typeck.c (build_function_call): Convert and check function
22340         arguments before generating a call to a trap.  Evaluate the
22341         function arguments before the trap.
22343 2009-02-19  Uros Bizjak  <ubizjak@gmail.com>
22345         PR target/39228
22346         * config/i386/i386.md (isinfxf2): Split from isinf<mode>2.
22347         (UNSPEC_FXAM_MEM): New unspec.
22348         (fxam<mode>2_i387_with_temp): New insn and split pattern.
22349         (isinf<mode>2): Use MODEF mode iterator.  Force operand[1] through
22350         memory using fxam<mode>2_i387_with_temp to remove excess precision.
22352 2009-02-19  Richard Guenther  <rguenther@suse.de>
22354         PR tree-optimization/39207
22355         PR tree-optimization/39074
22356         * tree-ssa-structalias.c (storedanything_id, var_storedanything,
22357         storedanything_tree): New.
22358         (do_ds_constraint): Simplify ANYTHING shortcutting.  Update
22359         the STOREDANYTHING solution if the lhs solution contains ANYTHING.
22360         (build_succ_graph): Add edges from STOREDANYTHING to all
22361         non-direct nodes.
22362         (init_base_vars): Initialize STOREDANYTHING.
22363         (compute_points_to_sets): Free substitution info after
22364         building the succ graph.
22365         (ipa_pta_execute): Likewise.
22367         * tree-ssa-structalias.c (struct variable_info): Add may_have_pointers
22368         field.
22369         (do_ds_constraint): Do not add to special var or non-pointer
22370         field solutions.
22371         (type_could_have_pointers): Split out from ...
22372         (could_have_pointers): ... here.  For arrays use the element type.
22373         (create_variable_info_for): Initialize may_have_pointers.
22374         (new_var_info): Likewise.
22375         (handle_lhs_call): Make the HEAP variable unknown-sized.
22376         (intra_create_variable_infos): Use a type with pointers for
22377         PARM_NOALIAS, make it unknown-sized.
22379 2009-02-18  H.J. Lu  <hongjiu.lu@intel.com>
22381         PR target/39224
22382         * config/i386/i386.c (ix86_return_in_memory): Properly check ABI.
22384 2009-02-18  Jason Merrill  <jason@redhat.com>
22386         PR target/39179
22387         * tree-ssa-ccp.c (get_symbol_constant_value): Don't assume zero
22388         value if DECL_EXTERNAL.
22389         * tree-sra.c (sra_walk_gimple_assign): Likewise.
22390         * target.h (gcc_target::binds_local_p): Clarify "module".
22391         * tree.h (TREE_PUBLIC): Clarify "module".
22393 2009-02-17  Xuepeng Guo  <xuepeng.guo@intel.com>
22395         PR target/38891
22396         * config/i386/i386.h (CONDITIONAL_REGISTER_USAGE): Move the hunk of
22397         initialization for MS_ABI prior to the hunk of !TARGET_MMX.
22399 2009-02-17  H.J. Lu  <hongjiu.lu@intel.com>
22401         PR target/39082
22402         * c.opt (Wabi): Support C and ObjC.
22403         (Wpsabi): New.
22405         * c-opts.c (c_common_handle_option): Handle OPT_Wabi.
22407         * config/i386/i386.c (classify_argument): Warn once about the ABI
22408         change when passing union with long double.
22410         * doc/invoke.texi: Update -Wabi for warning psABI changes.
22412 2009-02-18  Joseph Myers  <joseph@codesourcery.com>
22414         PR c/35447
22415         * c-parser.c (c_parser_compound_statement): Always enter and leave
22416         a scope.
22418 2009-02-17  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
22420         PR target/34587
22421         * config/darwin.h (SUPPORTS_INIT_PRIORITY): Define.
22423 2009-02-18  Jakub Jelinek  <jakub@redhat.com>
22425         PR tree-optimization/36922
22426         * tree-data-ref.c (initialize_matrix_A): Handle BIT_NOT_EXPR.
22427         * tree-scalar-evolution.c (interpret_rhs_expr, instantiate_scev_1):
22428         Likewise.
22430 2009-02-17  Richard Sandiford  <rdsandiford@googlemail.com>
22432         * config/mips/mips.c (mips_override_options): Set flag_dwarf2_cfi_asm
22433         to 0 for EABI64.
22435 2009-02-17  Richard Sandiford  <rdsandiford@googlemail.com>
22437         * config/mips/mips.md (type): Reclassify lui_movf as "unknown".
22439 2009-02-17  Richard Sandiford  <rdsandiford@googlemail.com>
22441         * config/mips/mips.c (mips_gimplify_va_arg_expr): Fix invalid
22442         tree sharing.
22444 2009-02-17  Ruan Beihong  <ruanbeihong@gmail.com>
22445             Richard Sandiford  <rdsandiford@googlemail.com>
22447         * config/mips/mips.c (CODE_FOR_loongson_biadd): Delete.
22448         * config/mips/loongson.md (reduc_uplus_<mode>): Rename to...
22449         (loongson_biadd): ...this.
22451 2009-02-17  Richard Guenther  <rguenther@suse.de>
22453         PR tree-optimization/39202
22454         * tree-ssa-structalias.c (do_structure_copy): Before collapsing
22455         a var make sure to follow existing collapses.
22457 2009-02-17  Richard Guenther  <rguenther@suse.de>
22459         PR middle-end/39214
22460         * langhooks.c (lhd_print_error_function): Check for NULL block.
22462 2009-02-17  Richard Guenther  <rguenther@suse.de>
22464         PR tree-optimization/39204
22465         * tree-ssa-pre.c (phi_translate_1): Lookup the value-number
22466         of the PHI arg.
22468 2009-02-17  Uros Bizjak  <ubizjak@gmail.com>
22470         * config/soft-fp/double.h: Update from glibc CVS.
22472 2009-02-17  Richard Guenther  <rguenther@suse.de>
22474         PR tree-optimization/39207
22475         * tree-ssa-structalias.c (find_what_p_points_to): Do not emit
22476         strict-aliasing warnings for pointers pointing to NULL.
22478 2009-02-16  Joseph Myers  <joseph@codesourcery.com>
22480         PR c/35446
22481         * c-parser.c (c_parser_braced_init): Call pop_init_level when
22482         skipping until next close brace.
22484 2009-02-16  H.J. Lu  <hongjiu.lu@intel.com>
22486         PR target/37049
22487         * config/i386/i386.c (ix86_expand_push): Set memory alignment
22488         to function argument boundary.
22490 2009-02-16  Hariharan Sandanagobalane  <hariharan@picochip.com>
22492         * config/picochip/picochip.md (lea_add): Allow any nonimmediate
22493         in the lea_add. Reload eventually constraints it properly.
22494         * config/picochip/constraints.md: Remove the target constraint
22495         "b", since it is not needed anymore.
22497 2009-02-16  Jakub Jelinek  <jakub@redhat.com>
22499         * gthr-dce.h: Uglify function parameter and local variable names.
22500         * gthr-gnat.h: Likewise.
22501         * gthr-mipssde.h: Likewise.
22502         * gthr-nks.h: Likewise.
22503         * gthr-posix95.h: Likewise.
22504         * gthr-posix.h: Likewise.
22505         * gthr-rtems.h: Likewise.
22506         * gthr-single.h: Likewise.
22507         * gthr-solaris.h: Likewise.
22508         * gthr-tpf.h: Likewise.
22509         * gthr-vxworks.h: Likewise.
22510         * gthr-win32.h: Likewise.
22512 2009-02-15  H.J. Lu  <hongjiu.lu@intel.com>
22514         PR target/39196
22515         * config/i386/i386.md: Restrict the new peephole2 to move
22516         between MMX/SSE registers.
22518 2009-02-15  Richard Guenther  <rguenther@suse.de>
22520         Revert
22521         2009-02-13  Richard Guenther  <rguenther@suse.de>
22523         * configure.ac: Enable LFS.
22524         * configure: Re-generate.
22525         * config.in: Likewise.
22527 2009-02-13  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
22529         * config/spu/spu_internals.h (spu_sr, spu_sra, spu_srqw,
22530         spu_srqwbyte, spu_srqwbytebc): Define.
22531         * config/spu/spu-builtins.def (spu_sr, spu_sra, spu_srqw,
22532         spu_srqwbyte, spu_srqwbytebc): New overloaded builtins.
22533         * config/spu/spu.md ("shrqbybi_<mode>", "shrqbi_<mode>",
22534         "shrqby_<mode>"): New insn-and-split patterns.
22535         * config/spu/spu.c (expand_builtin_args): Determine and return
22536         number of operands using spu_builtin_description data.
22537         (spu_expand_builtin_1): Use it.
22539 2009-02-13  Steve Ellcey  <sje@cup.hp.com>
22541         PR target/38056
22542         * config/ia64/ia64.c (ia64_function_ok_for_sibcall): Check
22543         TARGET_CONST_GP.
22545 2009-02-13  H.J. Lu  <hongjiu.lu@intel.com>
22547         PR target/39149
22548         * config/i386/i386.c (override_options): Correct warning
22549         messages for -malign-loops, -malign-jumps and -malign-functions.
22551 2009-02-13  H.J. Lu  <hongjiu.lu@intel.com>
22553         PR target/39152
22554         * config/i386/i386.md: Restrict the new peephole2 to move
22555         between the general purpose registers.
22557 2009-02-13  H.J. Lu  <hongjiu.lu@intel.com>
22559         PR target/39162
22560         * config/i386/i386.c (type_natural_mode): Add a new argument.
22561         Return the original mode and warn ABI change if vector size is 32byte.
22562         (function_arg_advance): Updated.
22563         (function_arg): Likewise.
22564         (ix86_function_value): Likewise.
22565         (ix86_return_in_memory): Likewise.
22566         (ix86_sol10_return_in_memory): Likewise.
22567         (ix86_gimplify_va_arg): Likewise.
22568         (function_arg_32): Don't warn ABX ABI change here.
22569         (function_arg_64): Likewise.
22571 2009-02-13  Bernd Schmidt  <bernd.schmidt@analog.com>
22573         * loop-iv.c (implies_p): In the final case, test that operands 0
22574         of the two comparisons match.
22576         * config/bfin/bfin.c (find_prev_insn_start): New function.
22577         (bfin_optimize_loop): Use it in some cases instead of PREV_INSN.
22578         (find_next_insn_start): Move.
22580 2009-02-13  Richard Guenther  <rguenther@suse.de>
22582         * configure.ac: Enable LFS.
22583         * configure: Re-generate.
22584         * config.in: Likewise.
22586 2009-02-13  Joseph Myers  <joseph@codesourcery.com>
22588         PR c/35444
22589         * c-parser.c (c_parser_parms_list_declarator): Discard pending
22590         sizes on syntax error after some arguments have been parsed.
22592 2009-02-12  Jakub Jelinek  <jakub@redhat.com>
22594         * doc/invoke.texi (-fira): Remove.
22596 2009-02-12  H.J. Lu  <hongjiu.lu@intel.com>
22598         * caller-save.c: Replace regclass.c with reginfo.c in comments.
22599         * recog.c: Likewise.
22600         * rtl.h: Likewise.
22602 2009-02-12  Uros Bizjak  <ubizjak@gmail.com>
22604         * longlong.h (sub_ddmmss): New for ia64. Ported from GMP 4.2.
22605         (umul_ppmm): Likewise.
22606         (count_leading_zeros): Likewise.
22607         (count_trailing_zeros): Likewise.
22608         (UMUL_TIME): Likewise.
22610 2009-02-12  H.J. Lu  <hongjiu.lu@intel.com>
22612         * config.gcc (ia64*-*-linux*): Add ia64/t-fprules-softfp and
22613         soft-fp/t-softfp to tmake_file.
22615         * config/ia64/ia64.c (ia64_soft_fp_init_libfuncs): New.
22616         (ia64_expand_compare): Use HPUX library for TFmode only for HPUX.
22617         (ia64_builtins) [IA64_BUILTIN_COPYSIGNQ, IA64_BUILTIN_FABSQ,
22618         IA64_BUILTIN_INFQ]: New.
22619         (ia64_init_builtins): Initialize __builtin_infq,
22620         __builtin_fabsq and __builtin_copysignq if not HPUX.
22621         (ia64_expand_builtin): Handle IA64_BUILTIN_COPYSIGNQ,
22622         IA64_BUILTIN_FABSQ and IA64_BUILTIN_INFQ.
22624         * config/ia64/lib1funcs.asm (__divtf3): Define only if
22625         SHARED is defined.
22626         (__fixtfti): Likewise.
22627         (__fixunstfti): Likewise.
22628         (__floattitf): Likewise.
22630         * config/ia64/libgcc-glibc.ver: New.
22631         * config/ia64/t-fprules-softfp: Likewise.
22632         * config/ia64/sfp-machine.h: Likewise.
22634         * config/ia64/linux.h (LIBGCC2_HAS_TF_MODE): New.
22635         (LIBGCC2_TF_CEXT): Likewise.
22636         (TF_SIZE): Likewise.
22637         (TARGET_INIT_LIBFUNCS): Likewise.
22639         * config/ia64/t-glibc (SHLINB_MAPFILES):
22640         Add $(srcdir)/config/ia64/libgcc-glibc.ver.
22642 2009-02-12  H.J. Lu  <hongjiu.lu@intel.com>
22644         * config/i386/i386.c (construct_container): Rewrite processing
22645         BLKmode with X86_64_SSE_CLASS.
22647 2009-02-12  Paolo Bonzini  <bonzini@gnu.org>
22649         PR target/39152
22650         * config/i386/i386.md: Replace simplify_replace_rtx with
22651         replace_rtx in the new peephole2.
22653 2009-02-12  Nathan Sidwell  <nathan@codesourcery.com>
22655         * doc/invoke.texi (Optimize Options): Stop claiming inlining and
22656         loop unrolling do not happen at -O2.
22658 2009-02-12  Michael Matz  <matz@suse.de>
22660         * gcc.c (ASM_DEBUG_SPEC): Check for -g0.
22662 2009-02-12  Jakub Jelinek  <jakub@redhat.com>
22664         * dwarf2out.c (dwarf2out_finish): Force output of comp_unit_die
22665         for -g3.
22667 2009-02-12  Ben Elliston  <bje@au.ibm.com>
22669         * config/rs6000/rs6000.md (allocate_stack): Use _stack form of
22670         patterns when updating the back chain.  Missed in the 2009-02-10
22671         change.
22673 2009-02-11  Janis Johnson  <janis187@us.ibm.com>
22675         * doc/extend.texi (Decimal Floating Types): Update identifier of
22676         draft TR and list of missing support.
22678 2009-02-11  Jakub Jelinek  <jakub@redhat.com>
22680         PR middle-end/39154
22681         * gimplify.c (omp_notice_variable): If adding GOVD_SEEN
22682         bit to variable length decl's flags, add it also to its
22683         pointer replacement variable.
22685 2009-02-11  Uros Bizjak  <ubizjak@gmail.com>
22686             Jakub Jelinek  <jakub@redhat.com>
22688         PR target/39118
22689         * config/i386/i386.md (UNSPEC_MEMORY_BLOCKAGE): New constant.
22690         (memory_blockage): New expander.
22691         (*memory_blockage): New insn pattern.
22692         * config/i386/i386.c (ix86_expand_prologue): Use memory_blockage
22693         instead of general blockage at the end of function prologue when
22694         frame pointer is used to access red zone area.  Do not emit blockage
22695         when profiling, it is emitted in generic code.
22696         (ix86_expand_epilogue): Emit memory_blockage at the beginning of
22697         function epilogue when frame pointer is used to access red zone area.
22699 2009-02-11  Paolo Bonzini  <bonzini@gnu.org>
22701         PR target/38824
22702         * config/i386/i386.md: Add two new peephole2 to avoid mov followed
22703         by arithmetic with memory operands.
22704         * config/i386/predicates.md (commutative_operator): New.
22706 2009-02-10  Janis Johnson  <janis187@us.ibm.com>
22708         * doc/extend.texi (Fixed-Point Types): Break long paragraphs into
22709         bulleted lists.
22711 2009-02-10  Eric Botcazou  <ebotcazou@adacore.com>
22713         * alias.h (record_alias_subset): Declare.
22714         * alias.c (record_alias_subset): Make global.
22716 2009-02-10  Nick Clifton  <nickc@redhat.com>
22718         * tree-parloops.c: Change license to GPLv3.
22719         * ipa-struct-reorg.c: Change license to GPLv3.
22720         * ipa-struct-reorg.h: Change license to GPLv3.
22722 2009-02-10  Steve Ellcey  <sje@cup.hp.com>
22724         PR c/39084
22725         * c-decl.c (start_struct): Return NULL on error.
22727 2009-02-10  Jakub Jelinek  <jakub@redhat.com>
22729         PR middle-end/39124
22730         * cfgloopmanip.c (remove_path): Call remove_bbs after
22731         cancel_loop_tree, not before it.
22733         PR target/39139
22734         * function.h (struct function): Add has_local_explicit_reg_vars bit.
22735         * gimplify.c (gimplify_bind_expr): Set it if local DECL_HARD_REGISTER
22736         VAR_DECLs were seen.
22737         * tree-ssa-live.c (remove_unused_locals): Recompute
22738         cfun->has_local_explicit_reg_vars.
22739         * tree-ssa-sink.c (statement_sink_location): Don't sink BLKmode
22740         copies or clearings if cfun->has_local_explicit_reg_vars.
22742 2009-02-10  Uros Bizjak  <ubizjak@gmail.com>
22744         PR target/39118
22745         * config/i386/i386.c (expand_prologue): Emit blockage at the end
22746         of function prologue when frame pointer is used to access
22747         red zone area.
22749 2009-02-10  Richard Guenther  <rguenther@suse.de>
22751         PR middle-end/39127
22752         * gimplify.c (gimple_regimplify_operands): Always look if
22753         we need to create a temporary.
22755 2009-02-10  Richard Guenther  <rguenther@suse.de>
22757         PR tree-optimization/39132
22758         * tree-loop-distribution.c (todo): New global var.
22759         (generate_memset_zero): Trigger TODO_rebuild_alias.
22760         (tree_loop_distribution): Return todo.
22762 2009-02-10  H.J. Lu  <hongjiu.lu@intel.com>
22764         PR target/39119
22765         * config/i386/i386.c (x86_64_reg_class): Remove X86_64_AVX_CLASS.
22766         (x86_64_reg_class_name): Removed.
22767         (classify_argument): Return 0 if bytes > 32.  Return 0 if the
22768         first one isn't X86_64_SSE_CLASS or any other ones aren't
22769         X86_64_SSEUP_CLASS when size > 16bytes.  Don't turn
22770         X86_64_SSEUP_CLASS into X86_64_SSE_CLASS if the preceded one
22771         is X86_64_SSEUP_CLASS.  Set AVX modes to 1 X86_64_SSE_CLASS
22772         and 3 X86_64_SSEUP_CLASS.
22773         (construct_container): Remove X86_64_AVX_CLASS.  Handle 4
22774         registers with 1 X86_64_SSE_CLASS and 3 X86_64_SSEUP_CLASS.
22776 2009-02-10  Ben Elliston  <bje@au.ibm.com>
22778         * config/rs6000/rs6000.md (allocate_stack): Always use an update
22779         form instruction to update the stack back chain word, even if the
22780         user has disabled the generation of update instructions.
22781         (movdi_<mode>_update_stack): New.
22782         (movsi_update_stack): Likewise.
22783         * config/rs6000/rs6000.c (rs6000_emit_allocate_stack): Likewise,
22784         always use an update form instruction to update the stack back
22785         chain word.
22787 2009-02-09  Sebastian Pop  <sebastian.pop@amd.com>
22789         PR middle-end/38953
22790         * graphite.c (if_region_set_false_region): After moving a region in
22791         the false branch of a condition, remove the empty dummy basic block.
22792         (gloog): Remove wrong fix for PR38953.
22794 2009-02-09  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
22796         * config/spu/spu.c (array_to_constant): Fix (latent) wrong-code
22797         generation due to implicit sign extension.
22799 2009-02-09  Eric Botcazou  <ebotcazou@adacore.com>
22801         PR middle-end/38981
22802         * tree-ssa-coalesce.c (add_coalesce): Cap the costs of coalesce pairs
22803         at MUST_COALESCE_COST-1 instead of MUST_COALESCE_COST.
22805 2009-02-09  Richard Guenther  <rguenther@suse.de>
22807         PR middle-end/35202
22808         * convert.c (convert_to_real): Disable (float)fn((double)x)
22809         to fnf(x) conversion if errno differences may occur and
22810         -fmath-errno is set.
22812 2009-02-07  Anatoly Sokolov  <aesok@post.ru>
22814         * config/avr/avr.c (avr_mcu_t): Add ata6289 device.
22815         * config/avr/avr.h (LINK_SPEC, CRT_BINUTILS_SPECS): (Ditto.).
22816         * config/avr/t-avr (MULTILIB_MATCHES): (Ditto.).
22818 2009-02-06  Joseph Myers  <joseph@codesourcery.com>
22820         PR c/35434
22821         * c-common.c (handle_alias_attribute): Disallow attribute for
22822         anything not a FUNCTION_DECL or VAR_DECL.
22824 2009-02-06  Janis Johnson  <janis187@us.ibm.com>
22826         PR c/39035
22827         * real.c (do_compare): Special-case compare of zero against
22828         decimal float value.
22830 2009-02-06  Joseph Myers  <joseph@codesourcery.com>
22832         PR c/36432
22833         * c-decl.c (grokdeclarator): Don't treat [] declarators in fields
22834         as indicating flexible array members unless the field itself is
22835         being declarared as the incomplete array.
22837 2009-02-06  Jan Hubicka  <jh@suse.cz>
22839         PR tree-optimization/38844
22840         * ipa-inline.c (try_inline): Stop inlining recursion when edge
22841         is already inlined.
22843 2009-02-06  Richard Guenther  <rguenther@suse.de>
22845         PR middle-end/38977
22846         * tree-cfg.c (need_fake_edge_p): Force a fake edge for
22847         fork because we may expand it as __gcov_fork.
22849 2009-02-06  Nick Clifton  <nickc@redhat.com>
22851         * config/m32c/m32c.h (PCC_BITFIELD_TYPE_MATTERS): Define to zero.
22853 2009-02-06  Paolo Bonzini  <bonzini@gnu.org>
22855         PR tree-optimization/35659
22856         * tree-ssa-sccvn.c (vn_constant_eq, vn_reference_eq, vn_nary_op_eq
22857         vn_phi_eq): Shortcut if hashcode does not match.
22858         (vn_reference_op_compute_hash): Do not call iterative_hash_expr for
22859         NULL operands.
22860         * tree-ssa-pre.c (pre_expr_hash): Look at hashcode if available,
22861         and avoid iterative_hash_expr.
22862         (FOR_EACH_VALUE_ID_IN_SET): New.
22863         (value_id_compare): Remove.
22864         (sorted_array_from_bitmap_set): Use FOR_EACH_VALUE_ID_IN_SET to
22865         sort expressions by value id.
22867 2009-02-05  Kaz Kojima  <kkojima@gcc.gnu.org>
22869         PR target/38991
22870         * config/sh/predicates.md (general_movsrc_operand): Don't check
22871         the subreg of system registers here.
22873 2009-02-05  Jakub Jelinek  <jakub@redhat.com>
22875         PR c++/39106
22876         * cgraphunit.c (cgraph_function_versioning): Clear also DECL_VIRTUAL_P
22877         on the copied decl.
22879 2009-02-05  Paolo Bonzini  <bonzini@gnu.org>
22881         PR rtl-optimization/39110
22882         * rtlanal.c (rtx_addr_can_trap_p_1): Shortcut unaligned
22883         addresses, not aligned ones.
22885 2009-02-05  Daniel Berlin  <dberlin@dberlin.org>
22886             Richard Guenther  <rguenther@suse.de>
22888         PR tree-optimization/39100
22889         * tree-ssa-structalias.c (do_ds_constraint): Actually do what the
22890         comment says and add edges.
22892 2009-02-05  Joseph Myers  <joseph@codesourcery.com>
22894         PR c/35435
22895         * c-common.c (handle_tls_model_attribute): Ignore attribute for
22896         non-VAR_DECLs without checking DECL_THREAD_LOCAL_P.
22898 2009-02-04  Tobias Grosser  <grosser@fim.uni-passau.de>
22900         * graphite.c (bb_in_sese_p, sese_build_livein_liveouts_use,
22901         sese_build_livein_liveouts_bb, sese_build_livein_liveouts,
22902         register_bb_in_sese, new_sese, free_sese): Moved.
22903         (dot_scop_1, build_scop_loop_nests, build_loop_iteration_domains,
22904         outermost_loop_in_scop, build_scop_iteration_domain,
22905         expand_scalar_variables_ssa_name, get_vdef_before_scop,
22906         limit_scops): Use bb_in_sese_p instead of bb_in_scop_p.
22907         Use loop_in_sese_p instead of loop_in_scop_p.
22908         (new_graphite_bb, gloog): Do not initialize SCOP_BBS_B.
22909         (new_scop, free_scop): Remove SCOP_LOOP2CLOOG_LOOP and SCOP_BBS_B.
22910         (scopdet_basic_block_info): Fix bug in scop detection.
22911         (new_loop_to_cloog_loop_str, hash_loop_to_cloog_loop,
22912         eq_loop_to_cloog_loop): Remove.
22913         (nb_loops_around_loop_in_scop, nb_loop
22914         ref_nb_loops): Moved here...
22915         * graphite.h (ref_nb_loops): ... from here.
22916         (struct scop): Remove bbs_b bitmap and loop2cloog_loop.
22917         (loop_domain_dim, loop_iteration_vector_dim): Remove.
22918         (SCOP_BBS_B, bb_in_scop_p, loop_in_scop_p): Removed.
22919         * testsuite/gcc.dg/graphite/scop-19.c: New
22921 2009-02-04  Paolo Bonzini  <bonzini@gnu.org>
22922             Hans-Peter Nilsson  <hp@axis.com>
22924         PR rtl-optimization/37889
22925         * rtlanal.c (rtx_addr_can_trap_p_1): Add offset and size arguments.
22926         Move offset handling from PLUS to before the switch.  Use new
22927         arguments when considering SYMBOL_REFs too.
22928         (rtx_addr_can_trap_p): Pass dummy offset and size.
22929         (enum may_trap_p_flags): Remove.
22930         (may_trap_p_1): Pass size from MEM_SIZE.
22932         PR rtl-optimization/38921
22933         * loop-invariant.c (find_invariant_insn): Use may_trap_or_fault_p.
22934         * rtl.h (may_trap_after_code_motion_p): Delete prototype.
22935         * rtlanal.c (may_trap_after_code_motion_p): Delete.
22936         (may_trap_p, may_trap_or_fault_p): Pass 0/1 as flags.
22938 2009-02-04  H.J. Lu  <hongjiu.lu@intel.com>
22940         AVX Programming Reference (January, 2009)
22941         * config/i386/sse.md (*vpclmulqdq): New.
22943 2009-02-04  Jakub Jelinek  <jakub@redhat.com>
22945         PR tree-optimization/38977
22946         PR gcov-profile/38292
22947         * calls.c (special_function_p): Disregard __builtin_ prefix.
22949 2009-02-04  Hariharan Sandanagobalane  <hariharan@picochip.com>
22951         * config/picochip/picochip.c (GO_IF_LEGITIMATE_ADDRESS): Disallow
22952         non-indexable addresses even before reload.
22954 2009-02-03  Joseph Myers  <joseph@codesourcery.com>
22956         PR c/29129
22957         * c-decl.c (grokdeclarator): Mark [*] arrays in field declarators
22958         as having variable size.  Do not give an error for unnamed
22959         parameters with [*] declarators.  Give a warning for type names
22960         with [*] declarators and mark them as variable size.
22961         * c-parser.c (c_parser_sizeof_expression): Do not give an error
22962         for sizeof applied to [*] type names.
22964 2009-02-03  Andrew Pinski  <andrew_pinski@playstation.sony.com>
22966         PR C++/36607
22967         * convert.c (convert_to_integer): Treat OFFSET_TYPE like INTEGER_TYPE.
22969 2009-02-03  Jakub Jelinek  <jakub@redhat.com>
22971         * gcc.c (process_command): Update copyright notice dates.
22972         * gcov.c (print_version): Likewise.
22973         * gcov-dump.c (print_version): Likewise.
22974         * mips-tfile.c (main): Likewise.
22975         * mips-tdump.c (main): Likewise.
22977 2009-02-03  Joseph Myers  <joseph@codesourcery.com>
22979         PR c/35433
22980         * c-typeck.c (composite_type): Set TYPE_SIZE and TYPE_SIZE_UNIT
22981         for composite type involving a zero-length array type.
22983 2009-02-03  Jakub Jelinek  <jakub@redhat.com>
22985         PR target/35318
22986         * function.c (match_asm_constraints_1): Skip over
22987         initial optional % in the constraint.
22989         PR inline-asm/39059
22990         * c-parser.c (c_parser_postfix_expression): If fixed point is not
22991         supported, don't accept FIXED_CSTs.
22992         * c-decl.c (finish_declspecs): Error if fixed point is not supported
22993         and _Sat is used without _Fract/_Accum.  Set specs->type to
22994         integer_type_node for cts_fract/cts_accum if fixed point is not
22995         supported.
22997 2009-02-02  Catherine Moore  <clm@codesourcery.com>
22999         * sde.h (SUBTARGET_ARM_SPEC): Don't assemble -fpic code as -mabicalls.
23001 2009-02-02  Richard Sandiford  <rdsandiford@googlemail.com>
23003         * config/mips/mips.h (FILE_HAS_64BIT_SYMBOLS): New macro.
23004         (ABI_HAS_64BIT_SYMBOLS): Use it.
23005         (DWARF2_ADDR_SIZE): Use it instead of ABI_HAS_64BIT_SYMBOLS.
23007 2009-02-02  Paul Brook  <paul@codesourcery.com>
23009         * config/arm/arm.md (arm_addsi3): Add r/r/k alternative.
23011 2009-02-02  Jakub Jelinek  <jakub@redhat.com>
23013         PR inline-asm/39058
23014         * recog.h (asm_operand_ok): Add constraints argument.
23015         * recog.c (asm_operand_ok): Likewise.  If it is set, for digits
23016         recurse on matching constraint.
23017         (check_asm_operands): Pass constraints as 3rd argument to
23018         asm_operand_ok.  Don't look up matching constraint here.
23019         * stmt.c (expand_asm_operands): Pass NULL as 3rd argument
23020         to asm_operand_ok.
23022 2009-02-02  Ben Elliston  <bje@au.ibm.com>
23024         * doc/tm.texi (Storage Layout): Fix TARGET_ALIGN_ANON_BITFIELD and
23025         TARGET_NARROW_VOLATILE_BITFIELD macro names.
23027 2009-01-31  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
23029         * doc/install.texi (hppa*-hp-hpux*): Update binutils and linker
23030         information.  Remove some obsolete information.  Reorganize.
23032         * config/pa/fptr.c: Revert license to GPL 2.
23033         * config/pa/milli64.S: Likewise.
23035 2009-01-31  Dave Korn  <dave.korn.cygwin@gmail.com>
23037         PR target/38904
23038         * mkmap-flat.awk (END):  Use pe_dll command-line arg to pass
23039         LIBRARY name in, instead of hard-coding it.
23040         * config.gcc (i[34567]86-*-pe | i[34567]86-*-cygwin*):  Add an
23041         extra target make frag to tmake_files according to EH model.
23042         (i[34567]86-*-mingw* | x86_64-*-mingw*):  Likewise.
23043         * config/i386/t-dw2-eh, config/i386/t-sjlj-eh:  Add new target
23044         frags that define makefile variable EH_MODEL appropriately.
23045         * config/i386/cygming.h (DWARF2_UNWIND_INFO):  Add comment.
23046         * config/i386/cygwin.h (LIBGCC_EH_EXTN):  Define to nothing or
23047         to "-sjlj" according to type of EH configured.
23048         (LIBGCC_SONAME):  Concatenate it to shared library base name.
23049         * config/i386/mingw32.h (LIBGCC_EH_EXTN):  Define to "_dw2" or
23050         to "_sjlj" according to type of EH configured.
23051         (LIBGCC_SONAME):  Concatenate it to shared library base name.
23052         * config/i386/t-cygming (SHLIB_SONAME):  Use EH_MODEL.
23053         (SHLIB_LINK):  Add missing semicolon to if-else construct.
23054         (SHLIB_MKMAP_OPTS):  Pass library name to mkmap-flat.awk as
23055         string value of "pe_dll" command-line option.
23056         * config/i386/t-cygwin (SHLIB_EH_EXTENSION):  New helper.
23057         (SHLIB_SONAME):  Use it when overriding t-cygming default.
23058         (SHLIB_IMPLIB):  Override t-cygming default.
23059         (SHLIB_MKMAP_OPTS):  Pass library name to mkmap-flat.awk as
23060         string value of "pe_dll" command-line option.
23062 2009-01-31  Dave Korn  <dave.korn.cygwin@gmail.com>
23064         PR target/38952
23065         * config/i386/i386.c (ix86_builtin_setjmp_frame_value): New.
23066         (TARGET_BUILTIN_SETJMP_FRAME_VALUE): Override default to point at it.
23068 2009-01-31  Richard Guenther  <rguenther@suse.de>
23070         PR tree-optimization/38937
23071         * tree-ssa-structalias.c (do_sd_constraint): Do not shortcut
23072         computing the transitive closure.
23074 2009-01-30  Richard Guenther  <rguenther@suse.de>
23076         PR tree-optimization/39041
23077         * tree-ssa-forwprop.c (forward_propagate_addr_expr_1):
23078         Propagate variable indices only if the types match for this stmt.
23080 2009-01-30  Jakub Jelinek  <jakub@redhat.com>
23082         PR target/39013
23083         * c-decl.c (pop_scope): Set DECL_EXTERNAL for functions declared
23084         inline but never defined.
23086 2009-01-30  Wolfgang Gellerich  <gellerich@de.ibm.com>
23088         * config/s390/s390.md (*insv<mode>_reg_extimm): Removed.
23089         (*insv_h_di_reg_extimm): New insn.
23090         (*insv_l<mode>_reg_extimm): New insn.
23092 2009-01-30  Hariharan Sandanagobalane  <hariharan@picochip.com>
23094         * config/picochip/picochip.c (flag_conserve_stack): set
23095         PARAM_LARGE_STACK_FRAME and PARAM_STACK_FRAME_GROWTH to zero under
23096         fconserve-stack. Reduce call-overhead used by inliner.
23098 2009-01-30  Hariharan Sandanagobalane  <hariharan@picochip.com>
23100         PR/38157
23101         * common.opt (flag_conserve_stack): Initialised to zero.
23103 2009-01-30  Kai Tietz  <kai.tietz@onevision.com>
23105         PR/39002
23106         * config/i386/i386.c (ix86_can_use_return_insn_p): Check for nsseregs.
23107         (ix86_expand_epilogue): Take nsseregs in account to use proper restore
23108         method.
23110 2009-01-29  H.J. Lu  <hongjiu.lu@intel.com>
23112         * ira-color.c (allocno_reload_assign): Update comments.
23113         * regmove.c (regmove_optimize): Likewise.
23115         * ra.h: Removed.
23117 2009-01-29  Robert Millan  <rmh@aybabtu.com>
23119         * config.gcc: Recognize GNU/kOpenSolaris (*-*-kopensolaris*-gnu).
23120         * config/i386/kopensolaris-gnu.h: New file.  Undefine
23121         `MD_UNWIND_SUPPORT'.
23122         * config/kopensolaris-gnu.h: New file (based on kfreebsd-gnu.h).
23124 2009-01-29  Kazu Hirata  <kazu@codesourcery.com>
23126         PR tree-optimization/39007
23127         * tree-loop-distribution.c (generate_builtin): Use
23128         recompute_dominator to compute the immediate dominator of the
23129         basic block just after the loop.
23131 2009-01-29  Rainer Orth  <ro@TechFak.Uni-Bielefeld.DE>
23133         * config/i386/sol2-10.h [!HAVE_AS_IX86_DIFF_SECT_DELTA]
23134         (ASM_OUTPUT_DWARF_PCREL): Define.
23136 2009-01-29  Vladimir Makarov  <vmakarov@redhat.com>
23138         * doc/tm.texi (TARGET_IRA_COVER_CLASSES): Modify description.
23139         * doc/passes.texi: Remove entries about regclass, local-alloc, and
23140         global.  Modify entries about regmove and IRA.
23142         * ra-conflict.c: Remove the file.
23144         * reload.c (push_reload, find_dummy_reload): Remove flag_ira.
23146         * tree-pass.h (pass_local_alloc, pass_global_alloc): Remove.
23147         (pass_regclass_init): Rename to pass_reginfo_init.
23149         * cfgloopanal.c (estimate_reg_pressure_cost): Remove flag_ira.
23151         * toplev.h (flag_ira): Remove.
23153         * caller-save.c (setup_save_areas): Remove flag_ira.
23155         * ira-color.c (ira_reuse_stack_slot, ira_mark_new_stack_slot): Ditto.
23157         * global.c: Remove the file.
23159         * opts.c (decode_options): Remove flag_ira.
23161         * hard-reg-set.h (losing_caller_save_reg_set): Remove.
23163         * regmove.c: Modify file description.
23164         (find_use_as_address, try_auto_increment): Define them only if
23165         AUTO_INC_DEC is defined.
23166         (replacement_quality, replace_in_call_usage, fixup_match_1,
23167         stable_and_no_regs_but_for_p): Remove.
23168         (reg_set_in_bb): Make it static.
23169         (regmove_optimize): Remove flag_ira and code which worked for
23170         !flag_ira.
23172         * local-alloc.c: Remove the file.
23174         * common.opt (fira): Remove.
23176         * ira.c: Include except.h.
23177         (eliminable_regset): Move from global.c.
23178         (mark_elimination): Ditto.  Remove flag_ira.
23179         (reg_renumber, struct equivalence, reg_equiv, equiv_mem,
23180         equiv_mem_modified, validate_equiv_mem_from_store,
23181         validate_equiv_mem, equiv_init_varies_p, equiv_init_movable_p,
23182         contains_replace_regs, memref_referenced_p, memref_used_between_p,
23183         no_equiv, recorded_label_ref): Move from local-alloc.c.
23184         (update_equiv_regs): Ditto.  Make it static.
23185         (print_insn_chain, print_insn_chains): Move it from global.c.
23186         (pseudo_for_reload_consideration_p): Ditto.  Remove flag_ira.
23187         (build_insn_chain): Ditto.  Make it static.
23188         (ra_init_live_subregs): Move from ra-conflict.c.  Make it static.
23189         Rename to init_live_subregs.
23190         (gate_ira): Remove flag_ira.
23192         * regclass.c: Rename reginfo.c.  Change file description.
23193         (FORBIDDEN_INC_DEC_CLASSES): Remove.
23194         (reg_class_superclasses, forbidden_inc_dec_class, in_inc_dec): Remove.
23195         (init_reg_sets_1): Remove code for evaluation of
23196         reg_class_superclasses and losing_caller_save_reg_set.
23197         (init_regs): Remove init_reg_autoinc.
23198         (struct costs, costs, init_cost, ok_for_index_p_nonstrict,
23199         ok_for_base_p_nonstrict): Remove.
23200         (regclass_init): Rename to reginfo_init.  Don't initialize init_cost.
23201         (pass_regclass_init): Rename to pass_reginfo_init.  Modify
23202         corresponding entries.
23203         (dump_regclass, record_operand_costs, scan_one_insn,
23204         init_reg_autoinc, regclass, record_reg_classes, copy_cost,
23205         record_address_regs, auto_inc_dec_reg_p): Remove.
23206         (gt-regclass.h): Rename to gt-reginfo.h.
23208         * rtl.h (dump_global_regs, retry_global_alloc,
23209         build_insn_chain, dump_local_alloc, update_equiv_regs): Remove.
23211         * Makefile.in (RA_H): Remove.
23212         (OBJS-common): Remove global.o, local-alloc.o, and ra-conflict.o.
23213         Rename regclass.o to reginfo.o.
23214         (regclass.o): Rename to reginfo.o.  Rename gt-regclass.h to
23215         gt-reginfo.h.
23216         (global.o, local-alloc.o, ra-conflict.o): Remove entries.
23217         (GTFILES): Rename regclass.c to reginfo.c.
23219         * passes.c (init_optimization_passes): Remove pass_local_alloc and
23220         pass_global_alloc.  Rename pass_regclass_init to pass_reginfo_init.
23222         * reload1.c (compute_use_by_pseudos, reload, count_pseudo,
23223         count_spilled_pseudo, find_reg, alter_reg, delete_output_reload):
23224         Remove flag_ira.
23225         (finish_spills): Ditto.  Remove code for !flag_ira.
23227 2009-01-29  Kenneth Zadeck  <zadeck@naturalbridge.com>
23229         PR middle-end/35854
23230         * doc/invoke.texi (rtl debug options): Complete rewrite.
23231         * auto-inc-dec.c (pass_inc_dec): Rename pass from "auto-inc-dec"
23232         to auto_inc_dec".
23233         * mode-switching.c (pass_mode_switching): Rename pass from
23234         "mode-sw" to "mode_sw".
23235         * except.c (pass_convert_to_eh_ranges): Rename pass from
23236         "eh-ranges" to "eh_ranges".
23237         * lower-subreg.c (pass_lower_subreg): Renamed pass from "subreg"
23238         to "subreg1".
23241 2009-01-29  Andrey Belevantsev  <abel@ispras.ru>
23242             Alexander Monakov  <amonakov@ispras.ru>
23244         PR middle-end/38857
23245         * sel-sched.c (count_occurrences_1): Check that *cur_rtx is a hard
23246         register.
23247         (move_exprs_to_boundary): Change return type and pass through
23248         should_move from move_op.  Relax assert.  Update usage ...
23249         (schedule_expr_on_boundary): ... here.  Use should_move instead of
23250         cant_move.
23251         (move_op_orig_expr_found): Indicate that insn was disconnected from
23252         stream.
23253         (code_motion_process_successors): Do not call after_merge_succs
23254         callback if original expression was not found when traversing any of
23255         the branches.
23256         (code_motion_path_driver): Change return type.  Update prototype.
23257         (move_op): Update comment.  Add a new parameter (should_move).  Update
23258         prototype.  Set *should_move based on indication provided by
23259         move_op_orig_expr_found.
23261 2009-01-28  Pat Haugen  <pthaugen@us.ibm.com>
23263         * doc/invoke.texi (avoid-indexed-addresses): Document new option.
23264         * config/rs6000/rs6000-protos.h (avoiding_indexed_address_p): Declare.
23265         * config/rs6000/rs6000.opt (avoid-indexed-addresses): New option.
23266         * config/rs6000/rs6000.c (rs6000_override_options): Default
23267         avoid-indexed-addresses on for Power6, off for everything else.
23268         (avoiding_indexed_address_p): New function.
23269         (rs6000_legitimize_address): Use it.
23270         (rs6000_legitimate_address): Likewise.
23271         * config/rs6000/rs6000.md (movXX_updateX): Likewise
23273 2009-01-28  Kazu Hirata  <kazu@codesourcery.com>
23275         PR tree-optimization/38997
23276         * tree-loop-distribution.c (generate_memset_zero): Use
23277         POINTER_PLUS_EXPR for a pointer addition.
23279 2009-01-28  Andreas Krebbel  <krebbel1@de.ibm.com>
23281         * config/s390/s390.md (bswap<mode>2): New pattern added.
23283 2009-01-28  Wolfgang Gellerich  <gellerich@de.ibm.com>
23285         * config/s390/s390.md (*tls_load_31): Added type attribute.
23287 2009-01-28  Wolfgang Gellerich  <gellerich@de.ibm.com>
23289         * config/s390/s390.md: Fix a few comments.
23291 2009-01-28  Wolfgang Gellerich  <gellerich@de.ibm.com>
23293         * config/s390/s390.md (*tmsi_reg): Fixed z10prop attribute.
23294         (*tm<mode>_full): Fixed z10prop attribute.
23295         (*tst<mode>_extimm): Fixed z10prop attribute.
23296         (*tst<mode>_cconly_extimm): Fixed z10prop attribute.
23297         (*tstqiCCT_cconly): Fixed z10prop attribute.
23298         (*cmpsi_ccu_zerohi_rlsi): Fixed z10prop attribute.
23299         (*movsi_larl): Fixed z10prop attribute.
23300         (*movsi_zarch): Fixed z10prop attribute.
23301         (*movsi_eas): Fixed z10prop attribute.
23302         (*movhi): Fixed z10prop attribute.
23303         (*movqi): Fixed z10prop attribute.
23304         (*movstrictqi): Fixed z10prop attribute.
23305         (*mov<mode>): Fixed z10prop attribute.
23306         (*movcc): Fixed z10prop attribute.
23307         (*sethighpartdi_64): Fixed z10prop attribute.
23308         (*zero_extendhi<mode>2_z10): Fixed z10prop attribute.
23309         (*negdi2_sign_cc): Fixed z10prop attribute.
23310         (*negdi2_sign): Fixed z10prop attribute.
23311         (*absdi2_sign_cc): Fixed z10prop attribute.
23312         (*absdi2_sign): Fixed z10prop attribute.
23313         (*negabsdi2_sign_cc): Fixed z10prop attribute.
23314         (*negabsdi2_sign): Fixed z10prop attribute.
23315         (*cmp_and_trap_signed_int<mode>): Fixed z10prop attribute.
23316         (*cmp_and_trap_unsigned_int<mode>): Fixed z10prop attribute.
23317         (doloop_si64): Fixed z10prop attribute.
23318         (doloop_si31): Fixed z10prop attribute.
23319         (doloop_long): Fixed z10prop attribute.
23320         (indirect_jump): Fixed z10prop attribute.
23321         (nop): Fixed z10prop attribute.
23322         (main_base_64): Fixed z10prop attribute.
23323         (reload_base_64): Fixed z10prop attribute.
23325 2009-01-28  Jakub Jelinek  <jakub@redhat.com>
23327         PR rtl-optimization/38740
23328         * reorg.c (gate_handle_delay_slots): Avoid dbr scheduling
23329         if !optimize.
23330         * config/mips/mips.c (mips_reorg): Likewise.
23332 2009-01-28  Richard Guenther  <rguenther@suse.de>
23334         PR tree-optimization/38926
23335         * tree-ssa-pre.c (add_to_value): Assert we add only expressions
23336         with the correct value id to a value.
23337         (do_regular_insertion): Use the value number of edoubleprime
23338         for the value number of the expr.
23340         Revert
23341         2008-08-21  Richard Guenther  <rguenther@suse.de>
23343         * tree-ssa-pre.c (insert_into_preds_of_block): Before inserting
23344         a PHI ask VN if it is already available.
23345         * tree-ssa-sccvn.h (vn_phi_lookup): Declare.
23346         * tree-ssa-sccvn.c (vn_phi_lookup): Export.
23348 2009-01-28  Jakub Jelinek  <jakub@redhat.com>
23350         PR middle-end/38934
23351         * tree-vrp.c (extract_range_from_assert): For LE_EXPR and LT_EXPR
23352         set to varying whenever max has TREE_OVERFLOW set, similarly
23353         for GE_EXPR and GT_EXPR and TREE_OVERFLOW min.
23355 2009-01-28  Richard Guenther  <rguenther@suse.de>
23357         PR middle-end/38908
23358         * tree-ssa.c (warn_uninitialized_var): Do not warn for seemingly
23359         uninitialized aggregate uses in call arguments.
23361 2009-01-28  Paolo Bonzini  <bonzini@gnu.org>
23363         PR tree-optimization/38984
23364         * tree-ssa-structalias.c (get_constraints_for_1): Do not use
23365         the nothing_id variable if -fno-delete-null-pointer-checks.
23367 2009-01-28  Uros Bizjak  <ubizjak@gmail.com>
23369         PR target/38988
23370         * config/i386/i386.md (set_rip_rex64): Wrap operand 1 in label_ref.
23371         (set_got_offset_rex64): Ditto.
23373 2009-01-27  H.J. Lu  <hongjiu.lu@intel.com>
23375         PR target/38941
23376         * doc/extend.texi: Improve local variable with asm reg.
23378 2009-01-27  Adam Nemet  <anemet@caviumnetworks.com>
23380         * c.opt (Wpacked-bitfield-compat): Change init value to -1.
23381         * c-opts.c (c_common_post_options): If -W*packed-bitfield-compat
23382         was not supplied then set warn_packed_bitfield_compat to the
23383         default value of 1.
23384         * stor-layout.c (place_field): Check warn_packed_bitfield_compat
23385         against 1.
23387 2009-01-27  Richard Guenther  <rguenther@suse.de>
23389         PR tree-optimization/38503
23390         * cfgexpand.c (expand_gimple_basic_block): Ignore
23391         GIMPLE_CHANGE_DYNAMIC_TYPE during expansion.
23392         * tree-ssa-structalias.c (set_uids_in_ptset): Do not prune
23393         variables that cannot have TBAA applied.
23394         (compute_points_to_sets): Do not remove GIMPLE_CHANGE_DYNAMIC_TYPE
23395         statements.
23397 2009-01-27  Uros Bizjak  <ubizjak@gmail.com>
23399         PR middle-end/38969
23400         * calls.c (initialize_argument_information): Do not wrap complex
23401         arguments in SAVE_EXPR.
23403 2009-01-26  Andreas Tobler  <a.tobler@schweiz.org>
23405         * config/t-vxworks (LIBGCC2_INCLUDES): Fix typo.
23406         (INSTALL_LIBGCC): Revert typo commit.
23408 2009-01-26  Richard Guenther  <rguenther@suse.de>
23410         PR tree-optimization/38745
23411         * tree-ssa-alias.c (update_alias_info_1): Exclude RESULT_DECL
23412         from special handling.
23414 2009-01-26  Richard Guenther  <rguenther@suse.de>
23416         PR tree-optimization/38745
23417         * tree-ssa.c (execute_update_addresses_taken): Do not include
23418         variables that cannot possibly be a register in not_reg_needs.
23419         Do not clear TREE_ADDRESSABLE on vars that may not become
23420         registers.
23421         * tree-ssa.c (update_alias_info_1): Include those in the set
23422         of addressable vars.
23424 2009-01-26  Richard Guenther  <rguenther@suse.de>
23426         PR middle-end/38851
23427         * Makefile.in (tree-ssa-dse.o): Add langhooks.h.
23428         * tree-ssa-dse.c: Include langhooks.h
23429         (execute_simple_dse): Remove stores with zero size.
23431 2009-01-24  Jakub Jelinek  <jakub@redhat.com>
23433         PR c/38957
23434         * c-typeck.c (c_finish_return): Handle POINTER_PLUS_EXPR the same way
23435         as PLUS_EXPR.
23437 2009-01-24  Julian Brown  <julian@codesourcery.com>
23439         * config/arm/t-linux-eabi (LIB2FUNCS_STATIC_EXTRA): Add
23440         config/arm/linux-atomic.c.
23441         * config/arm/linux-atomic.c: New.
23443 2009-01-24  Eric Botcazou  <ebotcazou@adacore.com>
23445         * config/sparc/linux.h (DBX_REGISTER_NUMBER): Delete.
23446         * config/sparc/linux64.h (DBX_REGISTER_NUMBER): Likewise.
23447         * config/sparc/sysv4.h (DBX_REGISTER_NUMBER): Likewise.
23449 2009-01-24  H.J. Lu  <hongjiu.lu@intel.com>
23451         PR c/38938
23452         * c-opts.c (c_common_handle_option): Update warn_pointer_sign
23453         properly.
23455 2009-01-24  Sebastian Pop  <sebastian.pop@amd.com>
23457         PR tree-optimization/38953
23458         * graphite.c (graphite_verify): Add a call to verify_loop_closed_ssa.
23459         (scop_adjust_phis_for_liveouts): Initialize false_i to zero.
23460         (gloog): Split the exit of the scop when the scop exit is a loop exit.
23461         (graphite_transform_loops): Only call cleanup_tree_cfg if gloog
23462         changed the CFG.
23464 2009-01-24  Paul Brook  <paul@codesourcery.com>
23466         * config/arm/neon.md (neon_type): Move to arm.md.
23467         (neon_mov<VSTRUCT>): Add neon_type attribute.
23468         * config/arm/arm.md (neon_type): Move to here.
23469         (conds): Add "unconditioal" and use as default for NEON insns.
23471 2009-01-24  Ben Elliston  <bje@au.ibm.com>
23473         * bitmap.h (BITMAP_FREE): Eliminate `implicit conversion from
23474         void *' warning from -Wc++-compat.
23475         * Makefile.in (dominance.o-warn): Remove.
23477 2009-01-23  Paolo Bonzini  <bonzini@gnu.org>
23479         PR tree-optimization/38932
23480         * fold-const.c (fold_unary_ignore_overflow): New.
23481         * tree.h (fold_unary_ignore_overflow): Declare.
23482         * tree-ssa-ccp.c (ccp_fold): Use fold_unary_ignore_overflow.
23483         * tree-ssa-sccvn.c (visit_reference_op_load,
23484         simplify_unary_expression): Likewise.
23486 2009-01-22  Adam Nemet  <anemet@caviumnetworks.com>
23488         * c-decl.c (finish_struct): Move code to set DECL_PACKED after
23489         DECL_BIT_FIELD is alreay known.  Also inherit packed for bitfields
23490         regardless of their type.
23491         * c-common.c (handle_packed_attribute): Don't ignore packed on
23492         bitfields.
23493         * c.opt (Wpacked-bitfield-compat): New warning option.
23494         * stor-layout.c (place_field): Warn if offset of a field changed.
23495         * doc/extend.texi (packed): Mention the ABI change.
23496         * doc/invoke.texi (-Wpacked-bitfield-compat): Document.
23497         (Warning Options): Add it to the list.
23499 2009-01-22  H.J. Lu  <hongjiu.lu@intel.com>
23501         * c-opts.c (c_common_post_options): Fix a typo in comments.
23503 2009-01-22  Steve Ellcey  <sje@cup.hp.com>
23505         PR middle-end/38615
23506         * gimplify.c (gimplify_init_constructor): Fix promotion of const
23507         variables to static.
23508         * doc/invoke.texi (-fmerge-all-constants): Update description.
23510 2009-01-22  Uros Bizjak  <ubizjak@gmail.com>
23512         PR target/38931
23513         * config/i386/i386.md (*movsi_1): Use type "mmx" for alternative 2.
23514         (*movdi_1_rex64): Use type "mmx" for alternative 5.
23516 2009-01-22  Richard Earnshaw  <rearnsha@arm.com>
23518         * arm.h (DATA_ALIGNMENT): Align structures, unions and arrays to
23519         a word boundary.
23520         (LOCAL_ALIGNMENT): Similarly.
23522 2009-01-22  Mark Shinwell  <shinwell@codesourcery.com>
23523             Joseph Myers  <joseph@codesourcery.com>
23525         * config/arm/arm.c (all_architectures): Add iWMMXt2 entry.
23526         * config/arm/arm-cores.def: New ARM_CORE entry for iWMMXt2.
23527         * config/arm/arm-tune.md: Regenerate.
23528         * doc/invoke.texi (ARM Options): Document -mcpu=iwmmxt2 and
23529         -march=iwmmxt2.
23531 2009-01-22  Mark Shinwell  <shinwell@codesourcery.com>
23533         * config/arm/bpabi.h (SUBTARGET_EXTRA_ASM_SPEC): Bump EABI
23534         version number to five.
23536 2009-01-22  Dodji Seketeli  <dodji@redhat.com>
23538         PR c++/38930
23539         * c-decl.c (clone_underlying_type): Revert PR c++/26693 changes.
23540         * c-common.c (set_underlying_type): Likewise.
23541         (is_typedef_decl ): Likewise
23542         * tree.h: Likewise
23543         (set_underlying_type): Likewise.
23544         (is_typedef_type): Likewise.
23546 2009-01-21  Vladimir Makarov  <vmakarov@redhat.com>
23548         PR middle-end/38587
23549         * ira-color.c (coalesce_spill_slots): Don't coalesce allocnos
23550         crossing setjmps.
23552 2009-01-21  Dave Korn  <dave.korn.cygwin@gmail.com>
23554         PR bootstrap/37660
23555         * config/i386/cygwin.h (SHARED_LIBGCC_SPEC):  New helper macro.
23556         (LIBGCC_SPEC):  Don't define.
23557         (REAL_LIBGCC_SPEC):  Define instead, using SHARED_LIBGCC_SPEC.
23559 2009-01-21  Uros Bizjak  <ubizjak@gmail.com>
23561         PR rtl-optimization/38879
23562         * alias.c (base_alias_check): Unaligned access via AND address can
23563         alias all surrounding object types except those with sizes equal
23564         or wider than the size of unaligned access.
23566 2009-01-21  Dodji Seketeli  <dodji@redhat.com>
23568         PR c++/26693
23569         * c-decl.c (clone_underlying_type): Move this ...
23570         * c-common.c (set_underlying_type): ... here.
23571         Also, make sure the function properly sets TYPE_STUB_DECL() on
23572         the newly created typedef variant type.
23573         (is_typedef_decl ): New entry point.
23574         * tree.h: Added a new member member_types_needing_access_check to
23575         struct tree_decl_non_common.
23576         (set_underlying_type): New entry point.
23577         (is_typedef_type): Likewise.
23579 2009-01-21  Bingfeng Mei  <bmei@broadcom.com>
23581         * alias.c (walk_mems_1, walk_mems_2, insn_alias_sets_conflict_p):
23582         Check whether two instructions have memory references that
23583         belong to conflicting alias sets.  walk_mems_1 and walk_mems_2
23584         are helper functions for traversing.
23585         * alias.h (insn_alias_sets_confilict_p): New prototypes.
23586         * ddg.c (add_inter_loop_mem_dep): Call insn_alias_sets_conflict_p
23587         not to draw dependency edge for instructions with non-conflicting
23588         alias sets.
23590 2009-01-20  Joseph Myers  <joseph@codesourcery.com>
23592         PR other/38758
23593         * longlong.h: Update copyright years.  Use soft-fp license notice.
23594         Sync __clz_tab declaration with glibc.
23596 2009-01-20  Steve Ellcey  <sje@cup.hp.com>
23598         PR target/30687
23599         * doc/extend.texi (syscall_linkage): New.
23600         (version_id): Modify.
23602 2009-01-20  Andrew Pinski  <andrew_pinski@playstation.sony.com>
23603             Richard Guenther  <rguenther@suse.de>
23605         PR tree-optimization/38747
23606         PR tree-optimization/38748
23607         * tree-ssa-forwprop.c (forward_propagate_addr_expr_1): Disable the VCE
23608         conversion if the base address is an indirect reference and the
23609         aliasing sets could cause issues.
23611 2009-01-20  Sebastian Pop  <sebastian.pop@amd.com>
23613         * common.opt (fgraphite, fgraphite-identity): Add comment for
23614         explaining why these options are not documented.
23616 2009-01-20  Sebastian Pop  <sebastian.pop@amd.com>
23618         * graphite.c (stmt_simple_for_scop_p): Also handle cases when
23619         gimple_call_lhs is NULL.
23621 2009-01-20  Paolo Bonzini  <bonzini@gnu.org>
23623         PR target/38868
23624         * emit-rtl.c (adjust_address_1): Make sure memref is never
23625         overwritten.
23627 2009-01-20  Ben Elliston  <bje@au.ibm.com>
23629         * libgcov.c (__gcov_execl, __gcov_execlp, __gcov_execle): Remove
23630         const qualifier from arg parameter. Remove unnecessary cast to char *.
23631         * gcov-io.h (__gcov_execl, __gcov_execlp, __gcov_execle): Remove
23632         const qualifier from arg 2.
23634 2009-01-19  Iain Sandoe  <iain.sandoe@sandoe-acoustics.co.uk>
23636         * config/darwin.h: Add static-libgfortran to LINK_SPEC.
23638 2009-01-19  Vladimir Makarov  <vmakarov@redhat.com>
23640         PR c/38869
23641         * rtl.h (reinit_regs): New prototype.
23642         * regclass.c: Include ira.h.
23643         (reinit_regs): New.
23644         * Makefile.in (regclass.o): Add ira.h.
23645         * config/i386/i386.c (ix86_maybe_switch_abi): Use reinit_regs.
23647 2009-01-18  H.J. Lu  <hongjiu.lu@intel.com>
23649         PR target/38736
23650         * c-common.c (handle_aligned_attribute): Use
23651         ATTRIBUTE_ALIGNED_VALUE instead of BIGGEST_ALIGNMENT for
23652         default alignment value.
23654         * c-cppbuiltin.c (c_cpp_builtins): Define __BIGGEST_ALIGNMENT__.
23656         * defaults.h (ATTRIBUTE_ALIGNED_VALUE): New.
23657         * config/i386/i386.h (ATTRIBUTE_ALIGNED_VALUE): Likewise.
23659         * doc/extend.texi: Update __attribute__ ((aligned)).  Document
23660         __BIGGEST_ALIGNMENT__.
23662         * doc/tm.texi: Document ATTRIBUTE_ALIGNED_VALUE.
23664 2009-01-18  Richard Guenther  <rguenther@suse.de>
23666         PR tree-optimization/38819
23667         * tree-flow.h (operation_could_trap_helper_p): Declare.
23668         * tree-eh.c (operation_could_trap_helper_p): Export.
23669         * tree-ssa-sccvn.h (vn_nary_may_trap): Declare.
23670         * tree-ssa-sccvn.c (vn_nary_may_trap): New function.
23671         * tree-ssa-pre.c (insert_into_preds_of_block): Check if we
23672         are about to insert a possibly trapping instruction and fail
23673         in this case.
23675 2009-01-18  Andreas Schwab  <schwab@suse.de>
23677         * doc/install.texi (Configuration): Remove obsolete paragraph
23678         about use of --with-gnu-ld with --with-gnu-as.
23680 2009-01-18  Kazu Hirata  <kazu@codesourcery.com>
23682         * doc/extend.texi, doc/gimple.texi, doc/invoke.texi,
23683         doc/md.texi, doc/sourcebuild.texi, doc/tm.texi: Fix typos.
23684         Follow spelling conventions.
23686 2009-01-18  Ben Elliston  <bje@au.ibm.com>
23688         * bitmap.c (bitmap_obstack_alloc_stat): Adjust cast to eliminate
23689         C++ warning about implicit conversion from void * to struct
23690         bitmap_head_def *.
23691         (bitmap_obstack_free): Likewise for bitmap_element *.
23692         * Makefile.in (bitmap.o-warn): Remove.
23694 2009-01-17  Dave Korn  <dave.korn.cygwin@gmail.com>
23696         * Makefile.in (BACKENDLIBS):  Reorder to match dependencies.
23698 2009-01-17  Sebastian Pop  <sebastian.pop@amd.com>
23699             Tobias Grosser  <tobi.grosser@amd.com>
23701         * graphite.c (graphite_trans_scop_block): Do not block single
23702         nested loops.
23704 2009-01-16  Alexandre Oliva  <aoliva@redhat.com>
23706         * ebitmap.h (ebitmap_iter_init): Initialize all fields.
23707         * ipa-struct-reorg.c (gen_struct_type): Replace known-true
23708         test with assertion.
23710 2009-01-16  Richard Guenther  <rguenther@suse.de>
23712         PR tree-optimization/38835
23713         PR middle-end/36227
23714         * fold-const.c (fold_binary): Remove PTR + INT -> (INT)(PTR p+ INT)
23715         and INT + PTR -> (INT)(PTR p+ INT) folding.
23716         * tree-ssa-address.c (create_mem_ref): Properly use POINTER_PLUS_EXPR.
23718 2009-01-16  Adam Nemet  <anemet@caviumnetworks.com>
23720         PR target/38554
23721         * expmed.c (expand_shift): With SHIFT_COUNT_TRUNCATED, don't lift
23722         the subreg from a lowpart subreg if it is also casting the value.
23724 2009-01-16  Sebastian Pop  <sebastian.pop@amd.com>
23725             Tobias Grosser  <tobi.grosser@amd.com>
23727         * graphite.c (compare_prefix_loops): New.
23728         (build_scop_canonical_schedules): Rewritten.
23729         (graphite_transform_loops): Move build_scop_canonical_schedules
23730         after build_scop_iteration_domain.
23732 2009-01-16  Sebastian Pop  <sebastian.pop@amd.com>
23733             Tobias Grosser  <tobi.grosser@amd.com>
23735         * graphite.c (add_conditions_to_domain): Add the loops to
23736         the dimension of the iteration domain.  Do copy the domain
23737         only when it exists.
23738         (build_scop_conditions_1): Do not call add_conditions_to_domain.
23739         (add_conditions_to_constraints): New.
23740         (can_generate_code_stmt, can_generate_code): Removed.
23741         (gloog): Do not call can_generate_code.
23742         (graphite_transform_loops): Call add_conditions_to_constraints
23743         after building the iteration domain.
23745 2009-01-16  Jakub Jelinek  <jakub@redhat.com>
23747         PR tree-optimization/38789
23748         * tree-ssa-threadedge.c
23749         (record_temporary_equivalences_from_stmts_at_dest): Ignore calls to
23750         __builtin_constant_p.
23752 2009-01-16  Kenneth Zadeck  <zadeck@naturalbridge.com>
23754         * dce.c (delete_unmarked_insns): Reversed the order that insns are
23755         examined before deleting them.
23757 2009-01-16  Richard Earnshaw  <rearnsha@arm.com>
23759         * function.c (aggregate_value_p): Correctly extract the function
23760         type from CALL_EXPR_FN lookup.
23762 2009-01-16  Hariharan Sandanagobalane  <hariharan@picochip.com>
23764         * config/picochip/picochip.c (picochip_override_options): Revert
23765         CFI asm flag disable commited previously.
23767 2009-01-15  Sebastian Pop  <sebastian.pop@amd.com>
23768             Tobias Grosser  <tobi.grosser@amd.com>
23769             Jan Sjodin  <jan.sjodin@amd.com>
23771         * graphite.c (scan_tree_for_params): On substractions negate
23772         all the coefficients of the term.
23773         (clast_to_gcc_expression_red): New.  Handle reduction expressions
23774         of more than two operands.
23775         (clast_to_gcc_expression): Call clast_to_gcc_expression_red.
23776         (get_vdef_before_scop): Handle also the case of default definitions.
23778 2009-01-15  Richard Sandiford  <rdsandiford@googlemail.com>
23780         * caller-save.c (add_used_regs_1, add_used_regs): New functions.
23781         (insert_one_insn): Use them instead of REG_DEAD and REG_INC notes.
23782         Also use them when walking CALL_INSN_FUNCTION_USAGE.
23784 2009-01-15  H.J. Lu  <hongjiu.lu@intel.com>
23785             Joey Ye  <joey.ye@intel.com>
23787         PR middle-end/37843
23788         * cfgexpand.c (expand_stack_alignment): Don't update stack
23789         boundary nor check incoming stack boundary here.
23790         (gimple_expand_cfg): Update stack boundary and check incoming
23791         stack boundary here.
23793 2009-01-15  Kenneth Zadeck  <zadeck@naturalbridge.com>
23795         * dce.c (find_call_stack_args, delete_unmarked_insns): Fixed comments.
23797 2009-01-14  Jakub Jelinek  <jakub@redhat.com>
23799         PR rtl-optimization/38245
23800         * calls.c (expand_call): Add stack arguments to
23801         CALL_INSN_FUNCTION_USAGE even for pure calls (when
23802         ACCUMULATE_OUTGOING_ARGS) and even for args partially passed
23803         in regs and partially in memory or BLKmode arguments.
23804         (emit_library_call_value_1): Add stack arguments to
23805         CALL_INSN_FUNCTION_USAGE even for pure calls (when
23806         ACCUMULATE_OUTGOING_ARGS).
23807         * dce.c: Include tm_p.h.
23808         (find_call_stack_args): New function.
23809         (deletable_insn_p): Call it for CALL_P insns.  Add ARG_STORES
23810         argument.
23811         (mark_insn): Call find_call_stack_args for CALL_Ps.
23812         (prescan_insns_for_dce): Walk insns backwards in bb rather than
23813         forwards.  Allocate and free arg_stores bitmap if needed, pass it
23814         down to deletable_insn_p, don't mark stores set in arg_stores
23815         bitmap, clear the bitmap at the beginning of each bb.
23816         * Makefile.in (dce.o): Depend on $(TM_P_H).
23818 2009-01-14  Michael Meissner  <gnu@the-meissners.org>
23820         PR target/22599
23821         * config/i386/i386.c (print_operand): Add tests for 'D', 'C', 'F', 'f'
23822         to make sure the insn is a conditional test (bug 22599).  Reformat a
23823         few long lines.
23825 2009-01-14  Sebastian Pop  <sebastian.pop@amd.com>
23827         PR middle-end/38431
23828         * graphite.c (get_vdef_before_scop, scop_adjust_vphi): New.
23829         (scop_adjust_phis_for_liveouts): Call scop_adjust_vphi.
23830         (gloog): Do not call cleanup_tree_cfg.
23831         (graphite_transform_loops): Call cleanup_tree_cfg after all
23832         scops have been code generated.
23834 2009-01-14  Basile Starynkevitch  <basile@starynkevitch.net>
23835         * doc/gty.texi (Invoking the garbage collector): Added new node
23836         and section documenting ggc_collect.
23838 2009-01-14  Richard Guenther  <rguenther@suse.de>
23840         PR tree-optimization/38826
23841         PR middle-end/38477
23842         * tree-ssa-structalias.c (emit_alias_warning): Emit the pointer
23843         initialization notes only if we actually emitted a warning.
23844         (intra_create_variable_infos): Add constraints for a result decl
23845         that is passed by hidden reference.
23846         (build_pred_graph): Mark all related variables non-direct on
23847         address-taking.
23849 2009-01-14  Nick Clifton  <nickc@redhat.com>
23851         * ira-conflicts.c: Include addresses.h for the definition of
23852         base_reg_class.
23853         (ira_build_conflicts): Use base_reg_class instead of BASE_REG_CLASS.
23854         * Makefile.in: Add a dependency of ira-conflicts.o on addresses.h.
23856 2009-01-13  Vladimir Makarov  <vmakarov@redhat.com>
23858         PR target/38811
23859         * Makefile.in (ira-lives.o): Add except.h.
23861         * ira-lives.c: Include except.h.
23862         (process_bb_node_lives): Process can_throw_internal.
23864 2009-01-13  Jakub Jelinek  <jakub@redhat.com>
23866         PR rtl-optimization/38774
23867         * combine.c (simplify_set): When undoing cc_use change, don't do
23868         PUT_CODE on the newly created comparison, but instead put back the
23869         old comparison.
23871 2009-01-13  Joseph Myers  <joseph@codesourcery.com>
23873         * doc/invoke.texi (ARM Options): Update lists of -mcpu and -march
23874         values.  Remove duplicate arm8 entry.
23876 2009-01-13  Sebastian Pop  <sebastian.pop@amd.com>
23878         PR tree-optimization/38786
23879         * graphite.c (expand_scalar_variables_ssa_name): New, outlined from
23880         the SSA_NAME case of expand_scalar_variables_expr.
23881         Set the type of an expression to the type of its assign statement.
23882         (expand_scalar_variables_expr): Also gather the scalar computation
23883         used to index the memory access.  Do not pass loop_p.
23884         Fix comment.  Stop recursion on tcc_constant or tcc_declaration.
23885         (expand_scalar_variables_stmt): Pass to expand_scalar_variables_expr
23886         the gimple_stmt_iterator where it inserts new code.
23887         Do not pass loop_p.
23888         (copy_bb_and_scalar_dependences): Do not pass loop_p.
23889         (translate_clast): Update call to copy_bb_and_scalar_dependences.
23891 2009-01-13  Sebastian Pop  <sebastian.pop@amd.com>
23893         * graphite.h (debug_value): Removed.
23894         * graphite.c (debug_value): Removed.
23896 2009-01-13  Richard Earnshaw  <rearnsha@arm.com>
23898         * config/arm/arm.c (output_move_double): Don't synthesize thumb-2
23899         ldrd/strd with two 32-bit instructions.
23901 2009-01-13  Richard Earnshaw  <rearnsha@arm.com>
23903         * config/arm/arm.c (struct processors): Pass for speed down into
23904         cost helper functions.
23905         (const_ok_for_op): Handle COMPARE and inequality nodes.
23906         (arm_rtx_costs_1): Rewrite.
23907         (arm_size_rtx_costs): Update prototype.
23908         (arm_rtx_costs): Pass speed down to helper functions.
23909         (arm_slowmul_rtx_costs): Rework cost calculations.
23910         (arm_fastmul_rtx_costs, arm_xscale_rtx_costs): Likewise.
23911         (arm_9e_rtx_costs): Likewise.
23913 2009-01-13  Uros Bizjak  <ubizjak@gmail.com>
23915         * config/alpha/alpha.c (alpha_legitimate_address_p): Explicit
23916         relocations of local symbols wider than UNITS_PER_WORD are not valid.
23917         (alpha_legitimize_address): Do not split local symbols wider than
23918         UNITS_PER_WORD into HIGH/LO_SUM parts.
23920 2009-01-13  Danny Smith  <dannysmith@users.sourceforge.net>
23922         PR bootstrap/38580
23923         * gcc.c (process_command): Replace call to execvp with calls
23924         to pex_one and exit.
23926 2009-01-03  Anatoly Sokolov  <aesok@post.ru>
23928         PR target/29141
23929         * config/avr/t-avr (LIB1ASMFUNCS): Add _tablejump_elpm.
23930         * config/avr/libgcc.S (__do_global_ctors, __do_global_dtors): Add
23931         variant for devices with 3-byte PC.
23932         (__tablejump_elpm__): New.
23934 2009-01-12  Jakub Jelinek  <jakub@redhat.com>
23936         PR c/32041
23937         * c-parser.c (c_parser_postfix_expression): Allow `->' in
23938         offsetof member-designator, handle it as `[0].'.
23940 2009-01-12  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
23942         * pa.c (pa_asm_output_mi_thunk): Use pc-relative branch to thunk
23943         function when not using named sections on targets with named sections
23944         if branch distance is less than 262132.
23946 2009-01-12  Richard Earnshaw  <rearnsha@arm.com>
23948         * combine.c (combine_instructions):  Recompute
23949         optimize_this_for_speed_p  for each BB in the main combine loop.
23951 2009-01-12  Tomas Bily  <tbily@suse.cz>
23953         PR middlend/38385
23954         * tree-loop-distribution.c (prop_phis): New function.
23955         (generate_builtin): Call prop_phis.
23956         * testsuite/gcc.dg/tree-ssa/pr38385.c: New file.
23958 2009-01-12  Jakub Jelinek  <jakub@redhat.com>
23960         PR tree-optimization/38807
23961         * tree-ssa-reassoc.c (remove_visited_stmt_chain): Don't look at
23962         gimple_visited_p unless stmt is GIMPLE_ASSIGN.
23964 2009-01-11  Adam Nemet  <anemet@caviumnetworks.com>
23966         * expmed.c (store_bit_field_1): Properly truncate the paradoxical
23967         subreg of op0 to the original op0.
23969 2009-01-11  Laurent GUERBY  <laurent@guerby.net>
23971         * doc/sourcebuild.texi (Source Tree): Move up intl and fixinc.
23973 2009-01-11  Markus Schoepflin  <markus.schoepflin@comsoft.de>
23975         PR debug/7055
23976         * mips-tfile.c (parse_def): Fix parsing of def strings
23977         starting with digits.
23979 2009-01-10  Jakub Jelinek  <jakub@redhat.com>
23981         PR target/38695
23982         * config/arm/arm.c (arm_is_long_call_p): Don't call
23983         arm_function_in_section_p if decl isn't a FUNCTION_DECL.
23985 2009-01-09  Steven Bosscher  <steven@gcc.gnu.org>
23987         * regrename.c (regrename_optimize): Fix dumping.
23988         (find_oldest_value_reg): Preserve REG_POINTER.
23989         (copy_hardreg_forward_1): Likewise.
23991 2009-01-09  Diego Novillo  <dnovillo@google.com>
23993         * gimple.h (struct gimple_statement_base) <uid>: Document
23994         the restrictions on its use.
23995         (gimple_uid): Tidy.
23996         (gimple_set_uid): Tidy.
23998 2009-01-09  Jakub Jelinek  <jakub@redhat.com>
24000         * config/i386/i386.c (ix86_expand_movmem, ix86_expand_setmem): Add
24001         zero guard even if align_bytes != 0 and count is smaller than
24002         size_needed.
24004 2009-01-09  Vladimir Makarov  <vmakarov@redhat.com>
24006         PR rtl-optimization/38495
24007         * ira-emit.c (print_move_list, ira_debug_move_list): New functions.
24008         (add_range_and_copies_from_move_list): Print all added ranges.
24009         Add ranges to memory optimized destination.
24011 2009-01-09  Jakub Jelinek  <jakub@redhat.com>
24013         PR target/38686
24014         PR target/38708
24015         * config/i386/i386.c (override_options): Reject
24016         -mstringop-strategy=rep_8byte with -m32.
24017         (ix86_expand_movmem): For size_needed == 1 set epilogue_size_needed
24018         to 1.  Do count comparison against epilogue_size_needed at compile
24019         time even when count_exp was constant forced into register.  For
24020         size_needed don't jump to epilogue, instead just avoid aligning
24021         and invoke the body algorithm.  If need_zero_guard, add zero guard
24022         even if count is non-zero, but smaller than size_needed + number of
24023         bytes that could be stored for alignment.
24024         (ix86_expand_setmem): For size_needed == 1 set epilogue_size_needed
24025         to 1.  If need_zero_guard, add zero guard even if count is non-zero,
24026         but smaller than size_needed + number of bytes that could be stored
24027         for alignment.  Compare size_needed with epilogue_size_needed instead
24028         of desired_align - align, don't adjust size_needed, pass
24029         epilogue_size_needed to the epilogue expanders.
24031         PR c/35742
24032         * c-pretty-print.c (pp_c_expression): Handle GOTO_EXPR like BIND_EXPR.
24034 2009-01-09  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
24036         * pa.c (last_address): Change to unsigned.
24037         (update_total_code_bytes): Change argument to unsigned.  Don't
24038         check if insn addresses are set.
24039         (pa_output_function_epilogue): Set last_address to UINT_MAX if insn
24040         addresses are not set.
24041         (pa_asm_output_mi_thunk): Handle wrap when updating last_address.
24043 2009-01-09  Nick Clifton  <nickc@redhat.com>
24045         * config/sh/symbian.c: Replace uses of DECL_INLINE with
24046         DECL_DECLARED_INLINE_P.
24048 2009-01-09  Jakub Jelinek  <jakub@redhat.com>
24050         PR middle-end/38347
24051         * dojump.c (do_jump_by_parts_zero_rtx): Use mode instead of
24052         GET_MODE (op0) in operand_subword_force calls.
24054         PR middle-end/38771
24055         * fold-const.c (fold_unary): For COMPOUND_EXPR and COND_EXPR,
24056         fold_convert arg0 operands to TREE_TYPE (op0) first.
24058 2009-01-08  Vladimir Makarov  <vmakarov@redhat.com>
24060         * params.def (ira-max-conflict-table-size): Decrease default value
24061         to 1000.
24063 2009-01-08  Jakub Jelinek  <jakub@redhat.com>
24065         PR tree-optimization/37031
24066         * lambda-code.c (lambda_collect_parameters): Call pointer_set_destroy
24067         on parameter_set.
24068         (build_access_matrix): Reserve correct size for AM_MATRIX vector,
24069         allocate it using gc instead of heap, use VEC_quick_push instead of
24070         VEC_safe_push.
24071         * graphite.c (build_access_matrix): Allocate AM_MATRIX vector using gc
24072         instead of heap, use VEC_quick_push instead of VEC_safe_push.
24073         * tree-data-ref.h (struct access_matrix): Change matrix to gc
24074         allocated vector from heap allocated.
24075         * lambda.h: Add DEF_VEC_ALLOC_P for gc allocated lambda_vector.
24076         * tree-loop-linear.c (linear_transform_loops): Allocate nest
24077         vector only after perfect_loop_nest_depth call.
24079 2009-01-08  Sebastian Pop  <sebastian.pop@amd.com>
24080             Jan Sjodin  <jan.sjodin@amd.com>
24082         PR tree-optimization/38559
24083         * graphite.c (debug_value, copy_constraint,
24084         swap_constraint_variables, scale_constraint_variable, ): New.
24085         (get_lower_bound, get_upper_bound): Removed.
24086         (graphite_trans_bb_strip_mine): Clean up this code that works
24087         only for constant number of iterations.  Fully copy upper and
24088         lower bound constraints, not only the constant part of them.
24089         * graphite.h (debug_value): Declared.
24091 2009-01-08  Ira Rosen  <irar@il.ibm.com>
24093         PR tree-optimization/37194
24094         * tree-vect-transform.c (vect_estimate_min_profitable_iters):
24095         Don't add the cost of cost model guard in prologue to scalar
24096         outside cost in case of known number of iterations.
24098 2009-01-07  Nathan Froyd  <froydnj@codesourcery.com>
24099             Alan Modra  <amodra@bigpond.net.au>
24101         * config/rs6000/rs6000.c (rs6000_legitimize_address): Check for
24102         non-word-aligned REG+CONST addressing.
24104 2009-01-07  Uros Bizjak  <ubizjak@gmail.com>
24106         PR target/38706
24107         * config/alpha/alpha.c (alpha_end_function): For TARGET_ABI_OSF, call
24108         free_after_compilation when outputting a thunk.
24109         (alpha_output_mi_thunk_osf): Assert that we are processing a thunk.
24110         Do not call free_after_compilation here.
24112 2009-01-07  Uros Bizjak  <ubizjak@gmail.com>
24114         * config/i386/i386.c (ix86_target_string): Use ARRAY_SIZE.
24115         (ix86_valid_target_attribute_inner_p): Ditto.
24117 2009-01-07  Jan Sjodin  <jan.sjodin@amd.com>
24119         PR tree-optimization/38492
24120         PR tree-optimization/38498
24121         * tree-check.c (operator_is_linear, scev_is_linear_expression): New.
24122         * tree-chrec.h (scev_is_linear_expression): Declared.
24123         * graphite.c (graphite_cannot_represent_loop_niter): New.
24124         (scopdet_basic_block_info): Call graphite_cannot_represent_loop_niter.
24125         (graphite_loop_normal_form): Use gcc_assert.
24126         (scan_tree_for_params): Use CASE_CONVERT.
24127         (phi_node_is_iv, bb_contains_non_iv_scalar_phi_nodes): New.
24128         (build_scop_conditions_1): Call bb_contains_non_iv_scalar_phi_nodes.
24129         Use gcc_assert.  Discard scops that contain unhandled cases.
24130         (build_scop_conditions): Return a boolean status for unhandled cases.
24131         (strip_mine_profitable_p): Print the loop number, not its depth.
24132         (is_interchange_valid): Pass the depth of the loop nest, don't
24133         recompute it wrongly.
24134         (graphite_trans_bb_block): Same.
24135         (graphite_trans_bb_block): Print tentative of loop blocking.
24136         (graphite_trans_scop_block): Do not print that the loop has been
24137         blocked.
24138         (graphite_transform_loops): Do not handle scops that contain condition
24139         scalar phi nodes.
24141 2009-01-07  H.J. Lu  <hongjiu.lu@intel.com>
24143         AVX Programming Reference (December, 2008)
24144         * config/i386/avxintrin.h (_mm256_stream_si256): New.
24145         (_mm256_stream_pd): Likewise.
24146         (_mm256_stream_ps): Likewise.
24148         * config/i386/i386.c (ix86_builtins): Add IX86_BUILTIN_MOVNTDQ256,
24149         IX86_BUILTIN_MOVNTPD256 and IX86_BUILTIN_MOVNTPS256.
24150         (ix86_special_builtin_type): Add VOID_FTYPE_PV4DI_V4DI.
24151         (bdesc_special_args): Add __builtin_ia32_movntdq256,
24152         __builtin_ia32_movntpd256 and __builtin_ia32_movntps256.
24153         (ix86_init_mmx_sse_builtins): Handle VOID_FTYPE_PV4DI_V4DI.
24154         (ix86_expand_special_args_builtin): Likewise.
24156         * config/i386/sse.md (AVXMODEDI): New.
24157         (avx_movnt<mode>): Likewise.
24158         (avx_movnt<mode>): Likewise.
24159         (<sse>_movnt<mode>): Remove AVX support.
24160         (sse2_movntv2di): Likewise.
24162 2009-01-07  Richard Guenther  <rguenther@suse.de>
24164         PR middle-end/38751
24165         * fold-const.c (extract_muldiv): Remove obsolete comment.
24166         (fold_plusminus_mult_expr): Undo MINUS_EXPR
24167         to PLUS_EXPR canonicalization for the canonicalization.
24169 2009-01-07  Gerald Pfeifer  <gerald@pfeifer.com>
24171         * doc/install.texi (alpha*-dec-osf*): Remove note on 32-bit
24172         hosted cross-compilers generating less efficient code.
24174 2009-01-06  Richard Sandiford  <rdsandiford@googlemail.com>
24176         * function.h (rtl_data): Add a dbr_scheduled_p field.
24177         * reorg.c (dbr_schedule): Set it.
24178         (gate_handle_delay_slots): Check it.
24179         * config/mips/mips.c (mips_base_delayed_branch): Delete.
24180         (mips_reorg): Check flag_delayed_branch instead of
24181         mips_base_delayed_branch.
24182         (mips_override_options): Don't set mips_base_delayed_branch
24183         or flag_delayed_branch.
24185 2009-01-06  Richard Sandiford  <rdsandiford@googlemail.com>
24187         PR rtl-optimization/38426.
24188         * ira.c (ira): Set current_function_is_leaf earlier.
24190 2009-01-06  Jakub Jelinek  <jakub@redhat.com>
24192         PR rtl-optimization/38722
24193         * combine.c (try_combine): Don't modify PATTERN (i3) and notes
24194         too early, only set a flag and modify after last possible
24195         undo_all point.
24197 2009-01-06  Janis Johnson  <janis187@us.ibm.com>
24199         PR c/34252
24200         * ginclude/float.h: Rename DECnn_DEN to DECnn_SUBNORMAL_MIN.
24201         * real.c (decimal_single_format): Correct values of emin and emax.
24202         (decimal_double_format): Ditto.
24203         (decimal_quad_format): Ditto.
24204         * c-cppbuiltin.c (builtin_define_decimal_float_constants): Adjust
24205         computation of DECnn_MIN and DECnn_MAX for corrected values of
24206         emin and emax.  Define __DECnn_SUBNORMAL_MIN__ instead of
24207         __DECnn_MIN__, and adjust its computation for the corrected value
24208         of emin.
24210 2009-01-06  Jan Hubicka  <jh@suse.cz>
24212         PR target/38744
24213         * config/i386/i386.c (ix86_expand_call): Use ARRAY_SIZE.
24215 2009-01-06  Gerald Pfeifer  <gerald@pfeifer.com>
24217         * doc/contrib.texi (Contributors): Slightly adjust the end note.
24218         Add Robert Clark to the list of testers.
24220 2009-01-06  Jan Hubicka  <jh@suse.cz>
24221             Kai Tietz  <kai.tietz@onevision.com>
24223         * config/i386/i386.md (*msabi_syvabi): Add SSE regs clobbers.
24224         * config/i386/i386.c (ix86_expand_call): Add clobbers.
24226 2009-01-06  Jan Hubicka  <jh@suse.cz>
24227             Kai Tietz  <kai.tietz@onevision.com>
24229         * config/i386/i386.h (CONDITIONAL_CALL_USAGE): SSE regs are not used
24230         for w64 ABI.
24231         * config/i386/i386.c (struct ix86_frame): Add padding0 and nsseregs.
24232         (ix86_nsaved_regs): Count only general purpose regs.
24233         (ix86_nsaved_sseregs): New.
24234         (ix86_compute_frame_layout): Update nsseregs; set preferred alignment
24235         to 16 for w64; compute padding and size of sse reg save area.
24236         (ix86_emit_save_regs, ix86_emit_save_regs_using_mov): Save only
24237         general purpose regs.
24238         (ix86_emit_save_sse_regs_using_mov): New.
24239         (ix86_expand_prologue): Save SSE regs if needed.
24240         (ix86_emit_restore_regs_using_mov): Use only general purpose regs.
24241         (ix86_emit_restore_sse_regs_using_mov): New.
24242         (ix86_expand_epilogue): Save SSE regs if needed.
24244 2009-01-06  Jan Hubicka  <jh@suse.cz>
24245             Kai Tietz  <kai.tietz@onevision.com>
24247         * config/i386/i386.h (ACCUMULATE_OUTGOING_ARGS): Enable for MSABI
24248         * config/i386/i386.c (init_cumulative_args): Disallow calls of MSABI
24249         functions when accumulate outgoing args is off.
24251 2009-01-06  H.J. Lu  <hongjiu.lu@intel.com>
24253         PR bootstrap/38742
24254         * ira-color.c (ira_reuse_stack_slot): Check ENABLE_IRA_CHECKING
24255         before using pseudos_have_intersected_live_ranges_p.
24257         * ira-int.h (ira_assert): Always define.
24259 2009-01-06  H.J. Lu  <hongjiu.lu@intel.com>
24261         AVX Programming Reference (December, 2008)
24262         * config/i386/avxintrin.h (_mm_permute2_pd): Removed.
24263         (_mm256_permute2_pd): Likewise.
24264         (_mm_permute2_ps): Likewise.
24265         (_mm256_permute2_ps): Likewise.
24266         * config/i386/i386.md (UNSPEC_VPERMIL2): Likewise.
24267         * config/i386/sse.md (avx_vpermil2<mode>3): Likewise.
24269         * config/i386/i386.c (ix86_builtins): Remove
24270         IX86_BUILTIN_VPERMIL2PD, IX86_BUILTIN_VPERMIL2PS,
24271         IX86_BUILTIN_VPERMIL2PD256 and IX86_BUILTIN_VPERMIL2PS256.
24272         (ix86_builtin_type): Remove V8SF_FTYPE_V8SF_V8SF_V8SI_INT,
24273         V4DF_FTYPE_V4DF_V4DF_V4DI_INT, V4SF_FTYPE_V4SF_V4SF_V4SI_INT
24274         and V2DF_FTYPE_V2DF_V2DF_V2DI_INT.
24275         (bdesc_args): Remove __builtin_ia32_vpermil2pd,
24276         __builtin_ia32_vpermil2ps, __builtin_ia32_vpermil2pd256 and
24277         __builtin_ia32_vpermil2ps256.
24278         (ix86_init_mmx_sse_builtins): Updated.
24279         (ix86_expand_args_builtin): Likewise.
24281 2009-01-05  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
24283         * pa.c (output_call): Relocate non-jump insns in the delay slot of
24284         long absolute calls when generating PA 2.0 code.
24286 2009-01-05  Vladimir Makarov  <vmakarov@redhat.com>
24288         PR rtl-optimization/38583
24289         * params.h (IRA_MAX_CONFLICT_TABLE_SIZE): New macro.
24291         * params.def (ira-max-conflict-table-size): New.
24293         * doc/invoke.texi (ira-max-conflict-table-size): Decribe.
24295         * ira.h (ira_conflicts_p): New external definition.
24297         * ira-conflicts.c (build_conflict_bit_table): Do not build too big
24298         table.  Report this.  Return result of building.
24299         (ira_build_conflicts): Use ira_conflicts_p.  Check result of
24300         building conflict table.
24302         * ira-color.c (fast_allocation): Use num instead of ira_allocnos_num.
24303         (ira_color): Use ira_conflicts_p.
24305         * global.c: Include ira.h.
24306         (pseudo_for_reload_consideration_p, build_insn_chain): Use
24307         ira_conflicts_p.
24309         * Makefile.in (global.o): Add ira.h.
24311         * ira-build.c (mark_all_loops_for_removal,
24312         propagate_some_info_from_allocno): New.
24313         (remove_unnecessary_allocnos): Call
24314         propagate_some_info_from_allocno.
24315         (remove_low_level_allocnos): New.
24316         (remove_unnecessary_regions): Add parameter.  Call
24317         mark_all_loops_for_removal and remove_low_level_allocnos.  Pass
24318         parameter to remove_unnecessary_regions.
24319         (ira_build): Remove all regions but root if the conflict table was
24320         not built.  Update conflict hard regs for allocnos crossing calls.
24322         * ira.c (ira_conflicts_p): New global.
24323         (ira): Define and use ira_conflicts_p.
24325         * reload1.c (compute_use_by_pseudos, reload, count_pseudo,
24326         count_spilled_pseudo, find_reg, alter_reg, finish_spills,
24327         emit_input_reload_insns, delete_output_reload): Use ira_conflicts_p.
24329 2009-01-06  Ben Elliston  <bje@au.ibm.com>
24331         * gengtype-lex.l (YY_NO_INPUT): Define.
24333 2009-01-05  Andrew Pinski  <andrew_pinski@playstation.sony.com>
24335         PR c/34911
24336         * c-common.c (handle_vector_size_attribute): Also reject
24337         BOOLEAN_TYPE types.
24339 2009-01-05  Sebastian Pop  <sebastian.pop@amd.com>
24341         PR tree-optimization/38492
24342         * graphite.c (rename_map_elt, debug_rename_elt,
24343         debug_rename_map_1, debug_rename_map, new_rename_map_elt,
24344         rename_map_elt_info, eq_rename_map_elts,
24345         get_new_name_from_old_name, bb_in_sese_p): Moved around.
24346         (sese_find_uses_to_rename_use): Renamed sese_build_livein_liveouts_use.
24347         (sese_find_uses_to_rename_bb): Renamed sese_build_livein_liveouts_bb.
24348         (sese_build_livein_liveouts): New.
24349         (new_sese, free_sese): New.
24350         (new_scop): Call new_sese.
24351         (free_scop): Call free_sese.
24352         (rename_variables_from_edge, rename_phis_end_scop): Removed.
24353         (register_old_new_names): Renamed register_old_and_new_names.
24354         (register_scop_liveout_renames, add_loop_exit_phis,
24355         insert_loop_close_phis, struct igp,
24356         default_liveout_before_guard, add_guard_exit_phis,
24357         insert_guard_phis, copy_renames): New.
24358         (translate_clast): Call insert_loop_close_phis and insert_guard_phis.
24359         (sese_add_exit_phis_edge): Renamed scop_add_exit_phis_edge.
24360         (rewrite_into_sese_closed_ssa): Renamed scop_insert_phis_for_liveouts.
24361         (scop_adjust_phis_for_liveouts): New.
24362         (gloog): Call scop_adjust_phis_for_liveouts.
24364         * graphite.h (struct sese): Documented.  Added fields liveout,
24365         num_ver and livein.
24366         (SESE_LIVEOUT, SESE_LIVEIN, SESE_LIVEIN_VER, SESE_NUM_VER): New.
24367         (new_sese, free_sese, sese_build_livein_liveouts): Declared.
24368         (struct scop): Added field liveout_renames.
24369         (SCOP_LIVEOUT_RENAMES): New.
24371 2009-01-05  Harsha Jagasia  <harsha.jagasia@amd.com>
24373         PR tree-optimization/38510
24374         * graphite.c (recompute_all_dominators): Call mark_irreducible_loops.
24375         (translate_clast): Call recompute_all_dominators before
24376         graphite_verify.
24377         (gloog): Call recompute_all_dominators before graphite_verify.
24379 2009-01-05  Harsha Jagasia  <harsha.jagasia@amd.com>
24380             Jan Sjodin  <jan.sjodin@amd.com>
24382         PR tree-optimization/38500
24383         * graphite.c (create_sese_edges): Call fix_loop_structure after
24384         splitting blocks.
24386 2009-01-05  Joel Sherrill  <joel.sherrill@oarcorp.com>
24388         * config.gcc: Add m32r*-*-rtems*.
24389         * config/m32r/rtems.h: New file.
24391 2009-01-05  Ben Elliston  <bje@au.ibm.com>
24393         * Makefile.in (.po.gmo): Use mkinstalldirs, not test -d || mkdir.
24394         (.po.pox): Likewise.
24395         (po/gcc.pot): Likewise.
24397 2009-01-04  David S. Miller  <davem@davemloft.net>
24399         * config/sparc/sparc.h (SECONDARY_MEMORY_NEEDED_RTX): Delete.
24400         (STARTING_FRAME_OFFSET): Always set to zero.
24402 2009-01-04  Richard Sandiford  <rdsandiford@googlemail.com>
24404         * tree.def (LSHIFT_EXPR, RSHIFT_EXPR): Add commentary.
24405         * tree-cfg.c (verify_gimple_assign_binary): Allow shifts of
24406         fixed-point types, and vectors of the same.
24408 2009-01-04  Richard Sandiford  <rdsandiford@googlemail.com>
24410         * config/mips/sync.md (*mb_barrier): Rename to...
24411         (*memory_barrier): ...this.
24413 2009-01-04  Jonathan Wakely  <jwakely.gcc@gmail.com>
24415         * doc/extend.texi (Function Attributes): Move @cindex after @item
24416         for 'artificial' and 'flatten'. Fix grammar for 'externally_visible'
24417         and put in alphabetical order. Fix 'target' name and put in order.
24418         * doc/invoke.texi (-Wstrict-null-sentinel, -fipa-matrix-reorg): Fix
24419         typos.
24421 2009-01-04  Uros Bizjak  <ubizjak@gmail.com>
24423         * config/s390/s390.md (UNSPEC_MB): Rename from UNSPECV_MB.
24424         (memory_barrier): Expand as unspec instead of unspec_volatile.
24425         Remove mem:BLK from insn operands.  Use Pmode scratch register.
24426         (*memory_barrier): Define as unspec instead of unspec_volatile.
24427         Use (match_dup 0) as input operand.
24429         * config/sparc/sparc.md (UNSPEC_MEMBAR): Rename from UNSPECV_MEMBAR.
24430         * config/sparc/sync.md (memory_barrier): Expand as unspec instead of
24431         unspec_volatile.  Remove mem:BLK from insn operands.  Use Pmode
24432         scratch register.  Remove operand 1.
24433         (*stbar): Define as unspec instead of unspec_volatile.
24434         Use (match_dup 0) as input operand, remove (const_int 8).
24435         (*membar): Define as unspec instead of unspec_volatile.
24436         Use (match_dup 0) as input operand, remove input operand 2.
24438         * config/xtensa/xtensa.md (UNSPEC_MEMW): Rename from UNSPECV_MEMW.
24439         (memory_barrier): Expand as unspec instead of unspec_volatile.
24440         Remove mem:BLK from insn operands.  Use Pmode scratch register.
24441         (*memory_barrier): Define as unspec instead of unspec_volatile.
24442         Use (match_dup 0) as input operand.
24444         * config/ia64/sync.md (memory_barrier): Redefine as expander pattern.
24445         Remove mem:BLK from insn operands.  Use Pmode scratch register.
24446         Set volatile flag on operand 0.
24447         (*memory_barrier): New insn pattern.
24449         * config/rs6000/sync.md (memory_barrier): Remove mem:BLK from
24450         insn operands.
24451         (*memory_barrier): Use (match_dup 0) as input operand.
24453         * config/mips/sync.md (memory_barrier): Redefine as expander pattern.
24454         Remove mem:BLK from insn operands.  Use Pmode scratch register.
24455         Set volatile flag on operand 0.
24456         (*mb_internal): New insn pattern.
24458         * config/alpha/sync.md (*memory_barrier): Rename from *mb_internal.
24460 2009-01-04  Steven Bosscher  <steven@gcc.gnu.org>
24462         PR middle-end/38586
24463         * function.c (struct temp_slot): Move to the section of the file
24464         that deals with temp slots.  Remove field 'address'.
24465         (temp_slot_address_table): New hash table of address -> temp slot.
24466         (struct temp_slot_address_entry): New struct, items for the table.
24467         (temp_slot_address_compute_hash, temp_slot_address_hash,
24468         temp_slot_address_eq, insert_temp_slot_address): Support functions
24469         for the new table.
24470         (find_temp_slot_from_address): Rewrite to use the new hash table.
24471         (remove_unused_temp_slot_addresses): Remove addresses of temp
24472         slots that have been made available.
24473         (remove_unused_temp_slot_addresses_1): Call-back for htab_traverse,
24474         worker function for remove_unused_temp_slot_addresses.
24475         (assign_stack_temp_for_type): Don't clear the temp slot address list.
24476         Add the temp slot address to the address -> temp slot map.
24477         (update_temp_slot_address): Update via insert_temp_slot_address.
24478         (free_temp_slots): Call remove_unused_temp_slot_addresses.
24479         (pop_temp_slots): Likewise.
24480         (init_temp_slots): Allocate the address -> temp slot map, or empty
24481         the map if it is already allocated.
24482         (prepare_function_start): Initialize temp slot processing.
24484 2009-01-04  Steven Bosscher  <steven@gcc.gnu.org>
24486         PR middle-end/38584
24487         * cfgexpand.c (estimate_stack_frame_size): Simplify the estimate:
24488         Calculate the size of all stack vars assuming no packing of stack
24489         vars will happen, replacing a quadratic algorithm with a linear one.
24491 2009-01-03  Jakub Jelinek  <jakub@redhat.com>
24493         PR target/38707
24494         * expmed.c (store_bit_field_1): Don't modify op0 if movstrict insn
24495         can't be used.
24497 2009-01-03  Diego Novillo  <dnovillo@google.com>
24499         * doc/contrib.texi: Update contributions.
24501 2009-01-03  Jakub Jelinek  <jakub@redhat.com>
24503         PR c++/38705
24504         * builtins.c (fold_builtin_memory_op): Give up if either operand
24505         is volatile.  Set srctype or desttype to non-qualified version
24506         of the other type.
24508         PR c/38700
24509         * builtins.c (fold_builtin_expect): Only check DECL_WEAK for VAR_DECLs
24510         and FUNCTION_DECLs.
24512 2009-01-02  Kenneth Zadeck  <zadeck@naturalbridge.com>
24514         PR rtl-optimization/35805
24515         * df-problems.c (df_lr_finalize): Add recursive call to resolve lr
24516         problem if fast dce is able to remove any instructions.
24517         * dce.c (dce_process_block): Fix dump message.
24519 2009-01-02  Mark Mitchell  <mark@codesourcery.com>
24521         PR 33649
24522         * tree-ssa-pre.c (compute_antic): Correct loop bounds.
24524 2009-01-02  Jakub Jelinek  <jakub@redhat.com>
24526         PR middle-end/38690
24527         * tree-flow.h (op_code_prio, op_prio): New prototypes.
24528         * tree-pretty-print.c (op_code_prio): New function.
24529         (op_prio): No longer static.  Use op_code_prio.
24530         * gimple-pretty-print.c (dump_unary_rhs, dump_binary_rhs):
24531         Use op_prio and op_code_prio to determine if () should be
24532         printed around operand(s) or not.
24534         * gimple-pretty-print.c (dump_unary_rhs, dump_binary_rhs,
24535         dump_gimple_call, dump_gimple_switch, dump_gimple_cond,
24536         dump_gimple_label, dump_gimple_try, dump_symbols, dump_gimple_phi,
24537         dump_gimple_mem_ops, dump_bb_header, dump_bb_end, pp_cfg_jump): Use
24538         pp_character instead of pp_string for single letter printing.
24540 2009-01-02  Richard Sandiford  <rdsandiford@googlemail.com>
24542         * doc/extend.texi: Fix '#pragma GCC option' typo.
24544 2009-01-02  Richard Guenther  <rguenther@suse.de>
24546         * doc/install.texi (--enable-checking): Mention different
24547         default for stage1.
24548         (--enable-stage1-checking): Document.
24550 2009-01-01  Andrew Pinski  <pinskia@gmail.com>
24552         PR middle-end/30142
24553         * tree-cfg.c (verify_expr): Add INDIRECT_REF case.  Change MODIFY_EXPR
24554         case to be an error.
24556 2009-01-02  Ben Elliston  <bje@au.ibm.com>
24558         * config/fp-bit.h (pack_d): Constify argument.
24559         * config/fp-bit.c (makenan): Constify return type. Remove casts.
24560         (isnan): Constify argument.
24561         (isinf): Likewise.
24562         (iszero): Likewise.
24563         (pack_d): Likewise.
24564         (_fpadd_parts): Constify return type.
24565         (_fpmul_parts): Likewise.
24566         (_fpdiv_parts): Likewise.
24568 2009-01-01  Jakub Jelinek  <jakub@redhat.com>
24570         PR c/36489
24571         * c-typeck.c (add_pending_init): Add IMPLICIT argument.  Only
24572         warn about overwriting initializer with side-effects or
24573         -Woverride-init if !IMPLICIT.
24574         (output_init_element): Likewise.  Pass IMPLICIT down to
24575         add_pending_init.
24576         (process_init_element): Add IMPLICIT argument.  Pass it down
24577         to output_init_element.
24578         (push_init_element, pop_init_level, set_designator): Adjust
24579         process_init_element callers.
24580         (set_nonincremental_init, set_nonincremental_init_from_string):
24581         Adjust add_pending_init callers.
24582         (output_pending_init_elements): Adjust output_init_element callers.
24583         * c-tree.h (process_init_element): Adjust prototype.
24584         * c-parser.c (c_parser_initelt, c_parser_initval): Adjust
24585         process_init_element callers.
24588 Copyright (C) 2009 Free Software Foundation, Inc.
24590 Copying and distribution of this file, with or without modification,
24591 are permitted in any medium without royalty provided the copyright
24592 notice and this notice are preserved.