* config/ia64/ia64.c (ia64_register_move_cost): Fix argument types.
[official-gcc.git] / gcc / ChangeLog
blobf7142fcbb5ea022846722b3dd88e4d271d5f9b51
1 2010-07-01  Jakub Jelinek  <jakub@redhat.com>
3         PR debug/44694
4         * dwarf2out.c (reg_loc_descriptor): For eliminated arg_pointer_rtx
5         or frame_pointer_rtx use DW_OP_fbreg offset DW_OP_stack_value.
7 2010-07-01  Richard Guenther  <rguenther@suse.de>
9         * emit-rtl.c (set_mem_attributes_minus_bitpos): Use unsigned
10         types for offsets.
12 2010-07-01  Joern Rennecke  <joern.rennecke@embecosm.com>
14         PR target/44732
15         * config/ia64/ia64.c (ia64_register_move_cost): Remove stray '{'.
17         * config/ia64/ia64.c (ia64_register_move_cost): Fix argument types.
19 2010-07-01  Bernd Schmidt  <bernds@codesourcery.com>
21         PR target/44727
22         * config/i386/i386.md (peephole2 for arithmetic ops with memory):
23         Make sure operand 0 dies.
25 2010-07-01  Richard Guenther  <rguenther@suse.de>
27         PR middle-end/42834
28         PR middle-end/44468
29         * doc/gimple.texi (is_gimple_mem_ref_addr): Document.
30         * doc/generic.texi (References to storage): Document MEM_REF.
31         * tree-pretty-print.c (dump_generic_node): Handle MEM_REF.
32         (print_call_name): Likewise.
33         * tree.c (recompute_tree_invariant_for_addr_expr): Handle MEM_REF.
34         (build_simple_mem_ref_loc): New function.
35         (mem_ref_offset): Likewise.
36         * tree.h (build_simple_mem_ref_loc): Declare.
37         (build_simple_mem_ref): Define.
38         (mem_ref_offset): Declare.
39         * fold-const.c: Include tree-flow.h.
40         (operand_equal_p): Handle MEM_REF.
41         (build_fold_addr_expr_with_type_loc): Likewise.
42         (fold_comparison): Likewise.
43         (fold_unary_loc): Fold
44         VIEW_CONVERT_EXPR <T1, MEM_REF <T2, ...>> to MEM_REF <T1, ...>.
45         (fold_binary_loc): Fold MEM[&MEM[p, CST1], CST2] to MEM[p, CST1 + CST2],
46         fold MEM[&a.b, CST2] to MEM[&a, offsetof (a, b) + CST2].
47         * tree-ssa-alias.c (ptr_deref_may_alias_decl_p): Handle MEM_REF.
48         (ptr_deref_may_alias_ref_p_1): Likewise.
49         (ao_ref_base_alias_set): Properly differentiate base object for
50         offset and TBAA.
51         (ao_ref_init_from_ptr_and_size): Use MEM_REF.
52         (indirect_ref_may_alias_decl_p): Handle MEM_REFs properly.
53         (indirect_refs_may_alias_p): Likewise.
54         (refs_may_alias_p_1): Likewise.  Remove pointer SSA name def
55         chasing code.
56         (ref_maybe_used_by_call_p_1): Handle MEM_REF.
57         (call_may_clobber_ref_p_1): Likewise.
58         * dwarf2out.c (loc_list_from_tree): Handle MEM_REF.
59         * expr.c (expand_assignment): Handle MEM_REF.
60         (store_expr): Handle MEM_REFs from STRING_CSTs.
61         (store_field): If expanding a MEM_REF of a non-addressable
62         decl use bitfield operations.
63         (get_inner_reference): Handle MEM_REF.
64         (expand_expr_addr_expr_1): Likewise.
65         (expand_expr_real_1): Likewise.
66         * tree-eh.c (tree_could_trap_p): Handle MEM_REF.
67         * alias.c (ao_ref_from_mem): Handle MEM_REF.
68         (get_alias_set): Likewise.  Properly handle VIEW_CONVERT_EXPRs.
69         * tree-data-ref.c (dr_analyze_innermost): Handle MEM_REF.
70         (dr_analyze_indices): Likewise.
71         (dr_analyze_alias): Likewise.
72         (object_address_invariant_in_loop_p): Likewise.
73         * gimplify.c (mark_addressable): Handle MEM_REF.
74         (gimplify_cond_expr): Build MEM_REFs.
75         (gimplify_modify_expr_to_memcpy): Likewise.
76         (gimplify_init_ctor_preeval_1): Handle MEM_REF.
77         (gimple_fold_indirect_ref): Adjust.
78         (gimplify_expr): Handle MEM_REF.  Gimplify INDIRECT_REF to MEM_REF.
79         * tree.def (MEM_REF): New tree code.
80         * tree-dfa.c: Include toplev.h.
81         (get_ref_base_and_extent): Handle MEM_REF.
82         (get_addr_base_and_unit_offset): New function.
83         * emit-rtl.c (set_mem_attributes_minus_bitpos): Handle MEM_REF.
84         * gimple-fold.c (may_propagate_address_into_dereference): Handle
85         MEM_REF.
86         (maybe_fold_offset_to_array_ref): Allow possibly out-of bounds
87         accesses if the array has just one dimension.  Remove always true
88         parameter.  Do not require type compatibility here.
89         (maybe_fold_offset_to_component_ref): Remove.
90         (maybe_fold_stmt_indirect): Remove.
91         (maybe_fold_reference): Remove INDIRECT_REF handling.
92         Fold back to non-MEM_REF.
93         (maybe_fold_offset_to_address): Simplify.  Deal with type
94         mismatches here.
95         (maybe_fold_reference): Likewise.
96         (maybe_fold_stmt_addition): Likewise.  Also handle
97         &ARRAY + I in addition to &ARRAY[0] + I.
98         (fold_gimple_assign): Handle ADDR_EXPR of MEM_REFs.
99         (gimple_get_relevant_ref_binfo): Handle MEM_REF.
100         * cfgexpand.c (expand_debug_expr): Handle MEM_REF.
101         * tree-ssa.c (useless_type_conversion_p): Make most pointer
102         conversions useless.
103         (warn_uninitialized_var): Handle MEM_REF.
104         (maybe_rewrite_mem_ref_base): New function.
105         (execute_update_addresses_taken): Implement re-writing of MEM_REFs
106         to SSA form.
107         * tree-inline.c (remap_gimple_op_r): Handle MEM_REF, remove
108         INDIRECT_REF handling.
109         (copy_tree_body_r): Handle MEM_REF.
110         * gimple.c (is_gimple_addressable): Adjust.
111         (is_gimple_address): Likewise.
112         (is_gimple_invariant_address): ADDR_EXPRs of MEM_REFs with
113         invariant base are invariant.
114         (is_gimple_min_lval): Adjust.
115         (is_gimple_mem_ref_addr): New function.
116         (get_base_address): Handle MEM_REF.
117         (count_ptr_derefs): Likewise.
118         (get_base_loadstore): Likewise.
119         * gimple.h (is_gimple_mem_ref_addr): Declare.
120         (gimple_call_fndecl): Handle invariant MEM_REF addresses.
121         * tree-cfg.c (verify_address): New function, split out from ...
122         (verify_expr): ... here.  Use for verifying ADDR_EXPRs and
123         the address operand of MEM_REFs.  Verify MEM_REFs.  Reject
124         INDIRECT_REFs.
125         (verify_types_in_gimple_min_lval): Handle MEM_REF.  Disallow
126         INDIRECT_REF.  Allow conversions.
127         (verify_types_in_gimple_reference): Verify VIEW_CONVERT_EXPR of
128         a register does not change its size.
129         (verify_types_in_gimple_reference): Verify MEM_REF.
130         (verify_gimple_assign_single): Disallow INDIRECT_REF.
131         Handle MEM_REF.
132         * tree-ssa-operands.c (opf_non_addressable, opf_not_non_addressable):
133         New.
134         (mark_address_taken): Handle MEM_REF.
135         (get_indirect_ref_operands): Pass through opf_not_non_addressable.
136         (get_asm_expr_operands): Pass opf_not_non_addressable.
137         (get_expr_operands): Handle opf_[not_]non_addressable.
138         Handle MEM_REF.  Remove INDIRECT_REF handling.
139         * tree-vrp.c: (check_array_ref): Handle MEM_REF.
140         (search_for_addr_array): Likewise.
141         (check_array_bounds): Likewise.
142         (vrp_stmt_computes_nonzero): Adjust for MEM_REF.
143         * tree-ssa-loop-im.c (for_each_index): Handle MEM_REF.
144         (ref_always_accessed_p): Likewise.
145         (gen_lsm_tmp_name): Likewise.  Handle ADDR_EXPR.
146         * tree-complex.c (extract_component): Do not handle INDIRECT_REF.
147         Handle MEM_REF.
148         * cgraphbuild.c (mark_load): Properly check for NULL result
149         from get_base_address.
150         (mark_store): Likewise.
151         * tree-ssa-loop-niter.c (array_at_struct_end_p): Handle MEM_REF.
152         * tree-loop-distribution.c (generate_builtin): Exchange INDIRECT_REF
153         handling for MEM_REF.
154         * tree-scalar-evolution.c (follow_ssa_edge_expr): Handle
155         &MEM[ptr + CST] similar to POINTER_PLUS_EXPR.
156         * builtins.c (stabilize_va_list_loc): Use the function ABI
157         valist type if we couldn't canonicalize the argument type.
158         Always dereference with the canonical va-list type.
159         (maybe_emit_free_warning): Handle MEM_REF.
160         (fold_builtin_memory_op): Simplify and handle MEM_REFs in folding
161         memmove to memcpy.
162         * builtins.c (fold_builtin_memory_op): Use ref-all types
163         for all memcpy foldings.
164         * omp-low.c (build_receiver_ref): Adjust for MEM_REF.
165         (build_outer_var_ref): Likewise.
166         (scan_omp_1_op): Likewise.
167         (lower_rec_input_clauses): Likewise.
168         (lower_lastprivate_clauses): Likewise.
169         (lower_reduction_clauses): Likewise.
170         (lower_copyprivate_clauses): Likewise.
171         (expand_omp_atomic_pipeline): Likewise.
172         (expand_omp_atomic_mutex): Likewise.
173         (create_task_copyfn): Likewise.
174         * tree-ssa-sccvn.c (copy_reference_ops_from_ref): Handle MEM_REF.
175         Remove old union trick.  Initialize constant offsets.
176         (ao_ref_init_from_vn_reference): Likewise.  Do not handle
177         INDIRECT_REF.  Init base_alias_set properly.
178         (vn_reference_lookup_3): Replace INDIRECT_REF handling with
179         MEM_REF.
180         (vn_reference_fold_indirect): Adjust for MEM_REFs.
181         (valueize_refs): Fold MEM_REFs.  Re-evaluate constant offset
182         for ARRAY_REFs.
183         (may_insert): Remove.
184         (visit_reference_op_load): Do not test may_insert.
185         (run_scc_vn): Remove parameter, do not fiddle with may_insert.
186         * tree-ssa-sccvn.h (struct vn_reference_op_struct): Add
187         a field to store the constant offset this op applies.
188         (run_scc_vn): Adjust prototype.
189         * cgraphunit.c (thunk_adjust): Adjust for MEM_REF.
190         * tree-ssa-ccp.c (ccp_fold): Replace INDIRECT_REF folding with
191         MEM_REF.  Propagate &foo + CST as &MEM[&foo, CST].  Do not
192         bother about volatile qualifiers on pointers.
193         (fold_const_aggregate_ref): Handle MEM_REF, do not handle INDIRECT_REF.
194         * tree-ssa-loop-ivopts.c
195         * tree-ssa-loop-ivopts.c (determine_base_object): Adjust
196         for MEM_REF.
197         (strip_offset_1): Likewise.
198         (find_interesting_uses_address): Replace INDIRECT_REF handling with
199         MEM_REF handling.
200         (get_computation_cost_at): Likewise.
201         * ipa-pure-const.c (check_op): Handle MEM_REF.
202         * tree-stdarg.c (check_all_va_list_escapes): Adjust for MEM_REF.
203         * tree-ssa-sink.c (is_hidden_global_store): Handle MEM_REF
204         and constants.
205         * ipa-inline.c (likely_eliminated_by_inlining_p): Handle MEM_REF.
206         * tree-parloops.c (take_address_of): Adjust for MEM_REF.
207         (eliminate_local_variables_1): Likewise.
208         (create_call_for_reduction_1): Likewise.
209         (create_loads_for_reductions): Likewise.
210         (create_loads_and_stores_for_name): Likewise.
211         * matrix-reorg.c (may_flatten_matrices_1): Sanitize.
212         (ssa_accessed_in_tree): Handle MEM_REF.
213         (ssa_accessed_in_assign_rhs): Likewise.
214         (update_type_size): Likewise.
215         (analyze_accesses_for_call_stmt): Likewise.
216         (analyze_accesses_for_assign_stmt): Likewise.
217         (transform_access_sites): Likewise.
218         (transform_allocation_sites): Likewise.
219         * tree-affine.c (tree_to_aff_combination): Handle MEM_REF.
220         * tree-vect-data-refs.c (vect_create_addr_base_for_vector_ref): Do
221         not handle INDIRECT_REF.
222         * tree-ssa-phiopt.c (add_or_mark_expr): Handle MEM_REF.
223         (cond_store_replacement): Likewise.
224         * tree-ssa-pre.c (create_component_ref_by_pieces_1): Handle
225         MEM_REF, no not handle INDIRECT_REFs.
226         (insert_into_preds_of_block): Properly initialize avail.
227         (phi_translate_1): Fold MEM_REFs.  Re-evaluate constant offset
228         for ARRAY_REFs.  Properly handle reference lookups that
229         require a bit re-interpretation.
230         (can_PRE_operation): Do not handle INDIRECT_REF.  Handle MEM_REF.
231         * tree-sra.c
232         * tree-sra.c (build_access_from_expr_1): Handle MEM_REF.
233         (build_ref_for_offset_1): Remove.
234         (build_ref_for_offset): Build MEM_REFs.
235         (gate_intra_sra): Disable for now.
236         (sra_ipa_modify_expr): Handle MEM_REF.
237         (ipa_early_sra_gate): Disable for now.
238         * tree-sra.c (create_access): Swap INDIRECT_REF handling for
239         MEM_REF handling.
240         (disqualify_base_of_expr): Likewise.
241         (ptr_parm_has_direct_uses): Swap INDIRECT_REF handling for
242         MEM_REF handling.
243         (sra_ipa_modify_expr): Remove INDIRECT_REF handling.
244         Use mem_ref_offset.  Remove bogus folding.
245         (build_access_from_expr_1): Properly handle MEM_REF for
246         non IPA-SRA.
247         (make_fancy_name_1): Add support for MEM_REF.
248         * tree-predcom.c (ref_at_iteration): Handle MEM_REFs.
249         * tree-mudflap.c (mf_xform_derefs_1): Adjust for MEM_REF.
250         * ipa-prop.c (compute_complex_assign_jump_func): Handle MEM_REF.
251         (compute_complex_ancestor_jump_func): Likewise.
252         (ipa_analyze_virtual_call_uses): Likewise.
253         * tree-ssa-forwprop.c (forward_propagate_addr_expr_1): Replace
254         INDIRECT_REF folding with more generalized MEM_REF folding.
255         (tree_ssa_forward_propagate_single_use_vars): Adjust accordingly.
256         (forward_propagate_addr_into_variable_array_index): Also handle
257         &ARRAY + I in addition to &ARRAY[0] + I.
258         * tree-ssa-dce.c (ref_may_be_aliased): Handle MEM_REF.
259         * tree-ssa-ter.c (find_replaceable_in_bb): Avoid TER if that
260         creates assignments with overlap.
261         * tree-nested.c (get_static_chain): Adjust for MEM_REF.
262         (get_frame_field): Likewise.
263         (get_nonlocal_debug_decl): Likewise.
264         (convert_nonlocal_reference_op): Likewise.
265         (struct nesting_info): Add mem_refs pointer-set.
266         (create_nesting_tree): Allocate it.
267         (convert_local_reference_op): Insert to be folded mem-refs.
268         (fold_mem_refs): New function.
269         (finalize_nesting_tree_1): Perform defered folding of mem-refs 
270         (free_nesting_tree): Free the pointer-set.
271         * tree-vect-stmts.c (vectorizable_store): Adjust for MEM_REF.
272         (vectorizable_load): Likewise.
273         * tree-ssa-phiprop.c (phiprop_insert_phi): Adjust for MEM_REF.
274         (propagate_with_phi): Likewise.
275         * tree-object-size.c (addr_object_size): Handle MEM_REFs
276         instead of INDIRECT_REFs.
277         (compute_object_offset): Handle MEM_REF.
278         (plus_stmt_object_size): Handle MEM_REF.
279         (collect_object_sizes_for): Dispatch to plus_stmt_object_size
280         for &MEM_REF.
281         * tree-flow.h (get_addr_base_and_unit_offset): Declare.
282         (symbol_marked_for_renaming): Likewise.
283         * Makefile.in (tree-dfa.o): Add $(TOPLEV_H).
284         (fold-const.o): Add $(TREE_FLOW_H).
285         * tree-ssa-structalias.c (get_constraint_for_1): Handle MEM_REF.
286         (find_func_clobbers): Likewise.
287         * ipa-struct-reorg.c (decompose_indirect_ref_acc): Handle MEM_REF.
288         (decompose_access): Likewise.
289         (replace_field_acc): Likewise.
290         (replace_field_access_stmt): Likewise.
291         (insert_new_var_in_stmt): Likewise.
292         (get_stmt_accesses): Likewise.
293         (reorg_structs_drive): Disable.
294         * config/i386/i386.c (ix86_va_start): Adjust for MEM_REF.
295         (ix86_canonical_va_list_type): Likewise.
297 2010-06-30  Joern Rennecke  <joern.rennecke@embecosm.com>
299         PR other/44566
300         * coretypes.h [!USED_FOR_TARGET] (reg_class_t): Define.
301         * target.def (struct gcc_target): Replace enum reg_class with
302         reg_class_t in hook argument / return types.
303         * doc/tm.texi.in (TARGET_SECONDARY_RELOAD): Likewise.
304         (TARGET_IRA_COVER_CLASSES, TARGET_MEMORY_MOVE_COST): Likewise.
305         (TARGET_BRANCH_TARGET_REGISTER_CLASS): Likewise.
306         * targhooks.h (default_branch_target_register_class): Likewise.
307         (default_ira_cover_classes, default_secondary_reload): Likewise.
308         (default_memory_move_cost, default_register_move_cost): Likewise.
309         * targhooks.c (default_branch_target_register_class): Likewise.
310         (default_ira_cover_classes, default_secondary_reload): Likewise.
311         (default_memory_move_cost, default_register_move_cost): Likewise.
312         * reload.c (push_secondary_reload, secondary_reload_class): Likewise.
313         * bt-load.c (branch_target_load_optimize): Likewise.
314         * ira.c (setup_cover_and_important_classes): Likewise.
315         * ira-costs.c (copy_cost): Likewise.
316         * reload1.c (emit_input_reload_insns): Likewise.
317         * config/alpha/alpha.c (alpha_secondary_reload): Likewise.
318         * config/frv/frv.c (frv_secondary_reload): Likewise.
319         * config/s390/s390.c (s390_secondary_reload): Likewise.
320         * config/i386/i386.c (i386_ira_cover_classes): Likewise.
321         (ix86_secondary_reload, ix86_memory_move_cost): Likewise.
322         (ix86_register_move_cost): Likewise.
323         * config/sh/sh-protos.h (sh_secondary_reload): Likewise.
324         * config/sh/sh.c (sh_target_reg_class, sh_secondary_reload): Likewise.
325         * config/xtensa/xtensa.c (xtensa_secondary_reload): Likewise.
326         * config/xtensa/xtensa-protos.h (xtensa_secondary_reload): Likewise.
327         * config/rs6000/rs6000.c (rs6000_secondary_reload): Likewise.
328         (rs6000_ira_cover_classes): Likewise.
329         * config/picochip/picochip.c (picochip_secondary_reload): Likewise.
330         * config/picochip/picochip-protos.h (picochip_secondary_reload):
331         Likewise.
332         * config/pa/pa.c (pa_secondary_reload): Likewise.
333         * config/mips/mips.c (mips_ira_cover_classes): Likewise.
334         * config/bfin/bfin.c (bfin_secondary_reload): Likewise.
335         * config/ia64/ia64.c (ia64_register_move_cost): Likewise.
336         * doc/tm.texi: Regenerate.
338 2010-06-30  Sebastian Pop  <sebastian.pop@amd.com>
340         PR bootstrrap/44726
341         * graphite-sese-to-poly.c (build_poly_dr): Avoid uninitialized
342         use.
343         (build_alias_set_optimal_p): Likewise.
344         (build_base_obj_set_for_drs): Likewise.
346 2010-06-30  Joern Rennecke  <joern.rennecke@embecosm.com>
348         * target.def: Remove comment about licensing problems of function
349         declarations.
351         * target.def (declare_constant_name): Change exp to expr.  Use DEFHOOK.
352         * doc/tm.texi.in (TARGET_ASM_DECLARE_CONSTANT_NAME): Use @hook.
353         * doc/tm.texi: Regenerate.
355         * target.def (builtin_reciprocal): Change tm_fn to md_fn.  Use DEFHOOK.
356         * doc/tm.texi.in (TARGET_BUILTIN_RECIPROCAL): Use @hook.
358         * target.def (enum_va_list_p): Use DEFHOOK.
359         * doc/tm.texi.in (TARGET_ENUM_VA_LIST_P): Use @hook.
360         Rename ptype to ptree.
361         * doc/tm.texi: Regenerate.
363         * target.def (fold_builtin): Rename nargs to n_args.  Use DEFHOOK.
364         * doc/tm.texi.in (TARGET_FOLD_BUILTIN): Use @hook.
365         * doc/tm.texi: Regenerate.
367         * target.def (memory_move_cost): Use DEFHOOK.
368         * doc/tm.texi.in (TARGET_MEMORY_MOVE_COST): Use @hook.
369         Rename regclass AKA class to rclass.
370         * doc/tm.texi: Regenerate.
372         * target.def (pragma_parse): Use DEFHOOK.
373         * doc/tm.texi.in (TARGET_OPTION_PRAGMA_PARSE): Use @hook.
374         s/TARGET_VALID_OPTION_ATTRIBUTE_P/TARGET_OPTION_VALID_ATRIBUTE_P/ .
375         * doc/tm.texi: Regenerate.
377         * target.def (pass_by_reference): Use DEFHOOK.
378         * doc/tm.texi.in (TARGET_PASS_BY_REFERENCE): Use @hook.
379         * doc/tm.texi: Regenerate.
381         * target.def (resolve_overloaded_builtin): Rename params to arglist.
382         Use DEFHOOK.
383         * doc/tm.texi.in (TARGET_RESOLVE_OVERLOADED_BUILTIN): Use @hook.
384         * doc/tm.texi: Regenerate.
386         * target.def (return_pops_args): Use DEFHOOK.
387         * doc/tm.texi.in (TARGET_RETURN_POPS_ARGS): Use @hook.
388         Rename stack-size to size.
389         * doc/tm.texi: Regenerate.
391         * target.def (dfa_new_cycle): Use DEFHOOK.  Rename dump_file to dump,
392         last-sched_cycle to last_clock, cur_cycle to clock.
393         * doc/tm.texi.in: Use @hook.
394         * doc/tm.texi: Regenerate.
396         * target.def (print_operand, print_operand_address): Update comment.
397         (print_operand_punct_valid_p): Likewise.
399 2010-06-30  Manuel López-Ibáñez  <manu@gcc.gnu.org>
401         * toplev.h (_fatal_insn_not_found, _fatal_insn): Move declarations
402         to rtl.h.
403         (error_for_asm, warning_for_asm): Move declarations to rtl-error.h.
404         * rtl.h (_fatal_insn_not_found, _fatal_insn): Move declarations
405         here.
406         * rtl-error.h: New.
407         * regrename.c: Do not include toplev.h. Include rtl-error.h.
408         * rtl-error.c: Likewise.
409         * reload.c: Likewise.
410         * recog.c:  Likewise.
411         * sel-sched.c: Likewise.
412         * function.c: Likewise.
413         * reg-stack.c: Likewise.
414         * cfgrtl.c: Likewise.
415         * reload1.c: Likewise.
416         * final.c: Include rtl-error.
417         * Makefile.in: Adjust dependencies.
419 2010-06-30  Jan Hubicka  <jh@suse.cz>
421         PR middle-end/PR44706
422         * ipa-split (split_function): Refine conditions when to use DECL_RESULT
423         to return the value.
425 2010-06-30  Michael Matz  <matz@suse.de>
427         PR bootstrap/44699
428         * tree-vrp.c (vrp_finalize): Deal with changing num_ssa_names.
429         * gimple-fold.c (gimplify_and_update_call_from_tree): If LHS is
430         a gimple reg, attach the original VDEF to the last store in the
431         sequence.
433 2010-06-30  Iain Sandoe  <iains@gcc.gnu.org>
435         PR other/44034
436         * config/darwin.c (darwin_override_options): Use renamed
437         targetm.asm_out.emit_unwind_label.
439 2010-06-30  Bernd Schmidt  <bernds@codesourcery.com>
441         PR tree-optimization/39799
442         * tree-inline.c (remap_ssa_name): Initialize variable only if
443         SSA_NAME_OCCURS_IN_ABNORMAL_PHI.
445 2010-06-30  Nathan Froyd  <froydnj@codesourcery.com>
447         * c-parser.c (c_parser_omp_for_loop): Use a VEC for for_block.
449 2010-06-30  Richard Guenther  <rguenther@suse.de>
451         PR target/44722
452         * config/i386/i386.md (peephole2 for fix:SSEMODEI24): Guard
453         against oscillation with reverse peephole2.
455 2010-06-30  H.J. Lu  <hongjiu.lu@intel.com>
457         PR target/44721
458         * config/i386/i386.md (peephole2 for arithmetic ops with memory):
459         Fix last commit.
461 2010-06-30  Nick Clifton  <nickc@redhat.com>
463         * config/rx/rx-modes.def: New file.
464         * config/rx/rx.h (FIRST_PSEUDO_REGISTER): Increase to 17.
465         (CC_REGNUM): Define.
466         (FIXED_REGISTERS, CALL_USED_REGISTERS, REGISTER_NAMES): Add cc
467         register.
468         (CC_NO_CARRY, NOTICE_UPDATE_CC): Delete.
469         (SELECT_CC_MODE): Define.
470         * config/rx/rx.md (CC_REG): Define.  Update all patterns to use
471         (reg:CC CC_REG) instead of (cc0).
472         (attr "cc"): Delete.
473         (cbranchsi4): Do not split compare and branch here. Instead move
474         it to...
475         (cbranchsi4_<code>): ... here.  New patterns.
476         (cmpsi): Call rx-compare_redundant to find out if it is necessary
477         to emit the compare instruction.
478         * config/rx/rx.c (rx_gen-cond_branch_template): Remove tests of
479         cc_status flags.
480         (rx_get_stack_layout): Iterate up to before CC_REGNUM not
481         FIRST_PSEUDO_REGNUM.
482         (rx_expand_prologue, rx_expand_epilogue): Likewise.
483         (rx_notice_update_cc): Delete.
484         (rx_cc_modes_compatible): New function.
485         (flags_needed_for_conditional): New function.
486         (flags_from_mode): New function.
487         (rx_compare_redundant): New function - scans backwards through
488         insn list to find out if condition flags are already set
489         correctly.
490         (TARGET_CC_MODES_COMPATIBLE): Define.
491         * config/rx/rx-protos.h (rx_compare_redundant): Prototype.
493         * config/rx/rx.h (BRANCH_COST): Define.
494         (REGISTER_MOVE_COST): Define.
495         * config/rx/predicates (rx_source_operand): Allow all constant
496         types.
497         * config/rx/rx.md (addsi3): Add alternative for swapped operands.
498         (tstsi4): New pattern.
499         * config/rx/rx.c (rx_memory_move_cost): Define.
500         (TARGET_MEMORY_MOVE_COST): Define.
502 2010-06-30  Manuel López-Ibáñez  <manu@gcc.gnu.org>
504         * tree.h (block_may_fallthru): Declare here.
505         * tree-flow.h (block_may_fallthru): Do not declare here.
506         * c-typeck.c: Do not include tree-flow.h. Include gimple.h and
507         bitmap.h
508         * Makefile.in (c-typeck.o): Update dependencies.
510 2010-06-30  Jakub Jelinek  <jakub@redhat.com>
512         PR debug/44694
513         * cselib.h (cselib_preserve_cfa_base_value): Add regno argument.
514         * cselib.c (cfa_base_preserved_regno): New static variable.
515         (cselib_reset_table): Don't reset cfa_base_preserved_regno instead
516         of REGNO (cfa_base_preserved_val->locs->loc).
517         (cselib_preserve_cfa_base_value): Add regno argument, set
518         cfa_base_preserved_regno to it.
519         (cselib_invalidate_regno): Allow removal of registers other than
520         cfa_base_preserved_regno from cfa_base_preserved_val.
521         (cselib_finish): Set cfa_base_preserved_regno to INVALID_REGNUM.
522         * var-tracking.c (adjust_mems): Replace sp or hfp even outside
523         of MEM addresses, if not on LHS.
524         (reverse_op): Don't add reverse ops for cfa_base_rtx.
525         (vt_init_cfa_base): Adjust cselib_preserve_cfa_base_value caller.
527 2010-06-30  Bernd Schmidt  <bernds@codesourcery.com>
529         * recog.c (peep2_do_rebuild_jump_labels, peep2_do_cleanup_cfg): New
530         static variables.
531         (peep2_buf_position): New static function.
532         (peep2_regno_dead_p, peep2_reg_dead_p, peep2_find_free_register,
533         peephole2_optimize): Use it.
534         (peep2_attempt, peep2_update_life): New static functions, broken out
535         of peephole2_optimize.
536         (peep2_fill_buffer): New static function.
537         (peephole2_optimize): Change the main loop to try to fill the buffer
538         with the maximum number of insns before matching them against
539         peepholes.  Use a forward scan.  Remove special case for targets with
540         conditional execution.
541         * genrecog.c (change_state): Delete dead code.
542         * config/i386/i386.md (peephole2 for arithmetic ops with memory):
543         Rewrite so as not to expect the second insn to have had a peephole
544         applied yet.
546 2010-06-29  Nathan Froyd  <froydnj@codesourcery.com>
548         * genhooks.c (emit_findices): Cast field precision to int.
549         (emit_documentation): Likewise.
551 2010-06-29  Jakub Jelinek  <jakub@redhat.com>
553         PR tree-optimization/43801
554         * cgraph.c (cgraph_create_virtual_clone): Clear DECL_SECTION_NAME
555         if old_decl was DECL_ONE_ONLY.
557         PR debug/44668
558         * dwarf2out.c (add_accessibility_attribute): New function.
559         (gen_subprogram_die, gen_variable_die, gen_field_die): Use it
560         instead of adding DW_AT_accessibility manually.
561         (gen_enumeration_type_die, gen_struct_or_union_type_die,
562         gen_typedef_die): Use it.
564 2010-06-29  Douglas B Rupp  <rupp@gnat.com>
566         * vmsdbgout.c (full_name): Just output the file name if not native.
568 2010-06-29  Douglas B Rupp  <rupp@gnat.com>
570         * vmsdbgout.c (func_table): Replace with VEC func{nam,num}_tables.
571         (funcnam_table): New static table.
572         (funcnum_table): New static table.
573         (write_rtnbeg): Write value saved in funcnum_table.
574         (write_rtnend): Write value saved in funcnum_table.
575         (vmsdbgout_begin_function): Save current function info in
576         (vmsdbgout_init): Initialize func{nam,num}_tables. Minor reformatting.
577         (vmsdbgout_finish): Iterate over funcnum_table.
579 2010-06-29  Douglas B Rupp  <rupp@gnat.com>
581         * vmsdbgout.c (vmsdbgout_begin_epilogue): Declare
582         (vmsdbgout_type_decl): Declare
583         (vmsdbg_debug_hooks): Add entry for type_decl and begin_epilogue.
584         (FUNC_EPILOGUE_LABEL): New macro
585         (vmsdbgout_begin_epilogue): New function.
586         (vmsdbgout_type_decl): New function.
588 2010-06-29  Douglas B Rupp  <rupp@gnat.com>
590         * vmsdbg.h: Update copyright.
592 2010-06-29  Douglas B Rupp  <rupp@gnat.com>
594         * vmsdbg.h (DST_K_TBG): New DST constant.
595         * vmsdbgout.c (addr_const_to_string): Removed, not referenced.
596         (write_modbeg): Cast module_language to avoid warning.
597         (write_rtnbeg): Use DST_K_TBG vice magic mystery number.
599 2010-06-29  Joern Rennecke  <joern.rennecke@embecosm.com>
601         PR other/44034
602         * target.def, doc/tm.texi.in, genhooks.c: New files.
603         * target.h: Instead of defining individual hook members,
604         define DEFHOOKPOD / DEFHOOK / DEFHOOK_UNDOC / HOOKSTRUCT and
605         include target.def.
606         * target-def.h: Instead of defining individual hook initializers,
607         include target-hooks-def.h.
608         * df-scan.c, haifa-sched.c, sel-sched.c: Rename targetm members:
609         targetm.live_on_entry -> targetm.extra_live_on_entry
610         targetm.sched.md_finish ->targetm.sched.finish
611         targetm.sched.md_init -> targetm.sched.init
612         targetm.sched.md_init_global -> targetm.sched.init_global
613         targetm.asm_out.unwind_label -> targetm.asm_out.emit_unwind_label
614         targetm.asm_out.except_table_label ->
615           targetm.asm_out.emit_except_table_label
616         targetm.asm_out.visibility -> targetm.asm_out.assemble_visibility
617         targetm.target_help -> targetm.help
618         targetm.vectorize.builtin_support_vector_misalignment ->
619           targetm.vectorize.support_vector_misalignment
620         targetm.file_start_app_off -> targetm.asm_file_start_app_off
621         targetm.file_start_file_directive ->
622          targetm.asm_file_start_file_directive
623         * dwarf2out.c, opts.c, tree-vect-data-refs.c, except.c: Likewise.
624         * varasm.c, config/alpha/alpha.c, config/cris/cris.c: Likewise.
625         * gcc/config/spu/spu.c, config/ia64/ia64.c: Rename target macros:
626         TARGET_VECTOR_ALIGNMENT_REACHABLE ->
627           TARGET_VECTORIZE_VECTOR_ALIGNMENT_REACHABLE
628         TARGET_SUPPORT_VECTOR_MISALIGNMENT ->
629           TARGET_VECTORIZE_SUPPORT_VECTOR_MISALIGNMENT
630         TARGET_UNWIND_EMIT -> TARGET_ASM_UNWIND_EMIT
631         * config/rs6000/rs6000.c, config/arm/arm.c: Likewise.
632         * Makefile.in (TARGET_H): Depend on target.def.
633         (TARGET_DEF_H): Depend on target-hooks-def.h.
634         (target-hooks-def.h, tm.texi, s-target-hooks-def-h): New rules.
635         (s-tm-texi, build/genhooks.o, build/genhooks): Likewise.
636         * doc/tm.texi: Regenerate.
638         * Makefile.in (s-tm-texi): Remove stray tab / rule.
640         * config/m68k/m68k.c (targetm.sched.init_global): Update comment.
641         (targetm.sched.init): Likewise.
643 2010-06-29  Nathan Froyd  <froydnj@codesourcery.com>
645         PR bootstrap/44713
646         * config/i386/i386.c (type_natural_mode): Const-ify CUM parameter.
647         (function_arg_advance_32): Const-ify TYPE parameter.
648         (function_arg_advance_64): Likewise.  Change type of NAMED to bool.
649         (ix86_function_arg_advance): Change type of NAMED to bool.
650         (function_arg_32): Const-ify CUM and TYPE parameters.
651         (function_arg_64): Likewise.  Change type of NAMED to bool.
652         (function_arg_ms_64): Const-ify CUM parameter. Change type of NAMED
653         to bool.
654         (ix86_function_arg): Change type of NAMED to bool.
655         (ix86_setup_incoming_varargs): Call ix86_function_arg_advance.  Pass
656         last argument as a bool.
658 2010-06-29  Joern Rennecke  <joern.rennecke@embecosm.com>
660         * doc/tm.texi (TARGET_OPTION_OVERRIDE): Document.
661         (OVERRIDE_OPTIONS): Add note of obsolescence.
662         Replace references with references to TARGET_OPTION_OVERRIDE.
663         (Except for C_COMMON_OVERRIDE_OPTIONS, which remains similar to
664          the macro).
665         * targhooks.c (default_target_option_override): New function.
666         * targhooks.h (default_target_option_override): Declare.
667         * target.h (struct gcc_target): Add override member to
668         target_option member.
669         * toplev.c (process_options): Replace OVERRIDE_OPTIONS use with
670         targetm.target_option.override call.
671         * target-def.h (TARGET_OPTION_OVERRIDE): Define.
672         (TARGET_OPTION_HOOKS): Add TARGET_OPTION_OVERRIDE.
674 2010-06-29  Jan Hubicka  <jh@suse.cz>
676         * tree-inline.c: Replace incomming by incomin and clonning by cloning.
678 2010-06-29  Jan Hubicka  <jh@suse.cz>
680         * predict.c (propagate_freq): Clear EXIT_BLOCK_PTR frequency if it is
681         unreachable.
682         (rebuild_frequencies): New function.
683         * predict.h (rebuild_frequencies): Declare.
684         * tree-inline.c (copy_cfg_body): Compute properly count & frequency of
685         entry block and edge reaching new_entry.
686         (tree_function_versioning): When doing partial cloning, rebuild frequencies
687         when done.
688         * passes.c (execute_function_todo): Use rebild_frequencies.
690 2010-06-29  Richard Guenther  <rguenther@suse.de>
692         * tree-dfa.c (dump_variable): Remove noalias_state dumping.
693         * tree-flow.h (enum noalias_state): Remove.
694         (struct var_ann_d): Remove noalias_state member.
696 2010-06-29  Bernd Schmidt  <bernds@codesourcery.com>
698         PR target/43902
699         * config/arm/arm.md (maddsidi4, umaddsidi4): New expanders.
700         (maddhisi4): Renamed from mulhisi3addsi.  Operands renumbered.
701         (maddhidi4): Likewise.
703         Revert parts of the change for PR25130.
704         * cse.c (exp_equiv_p): For MEMs, if for_gcse, only compare
705         MEM_ALIAS_SET.
707 2010-06-29  Nathan Froyd  <froydnj@codesourcery.com>
709         * calls.c, dse.c, expr.c, function.c: Call targetm.calls.function_arg,
710         targetm.calls.function_incoming_arg, and
711         targetm.calls.function_arg_advance instead of FUNCTION_ARG,
712         FUNCTION_INCOMING_ARG, and FUNCTION_ARG_ADVANCE, respectively.
713         * target.h (struct gcc_target): Add function_arg_advance,
714         function_arg, and function_incoming_arg fields.
715         * target-def.h (TARGET_FUNCTION_ARG_ADVANCE, TARGET_FUNCTION_ARG):
716         (TARGET_FUNCTION_INCOMING_ARG): Define.
717         (TARGET_CALLS): Add TARGET_FUNCTION_ARG_ADVANCE, TARGET_FUNCTION_ARG,
718         and TARGET_FUNCTION_INCOMING_ARG.
719         * targhooks.h (default_function_arg_advance): Declare.
720         (default_function_arg, default_function_incoming_arg): Declare.
721         * targhooks.c (default_function_arg_advance): New function.
722         (default_function_arg, default_function_incoming_arg): New function.
723         * config/i386/i386.c (function_arg_advance): Rename to...
724         (ix86_function_arg_advance): ...this.  Make static.
725         (function_arg): Rename to...
726         (ix86_function_arg): ...this.  Make static.
727         (TARGET_FUNCTION_ARG_ADVANCE): Define.
728         (TARGET_FUNCTION_ARG): Define.
729         * config/i386/i386.h (FUNCTION_ARG_ADVANCE): Delete.
730         (FUNCTION_ARG): Delete.
731         * config/i386/i386-protos.h (function_arg_advance): Delete prototype.
732         (function_arg): Delete prototype.
734 2010-06-29  Nathan Froyd  <froydnj@codesourcery.com>
736         * reginfo.c (init_reg_sets_1): Adjust comments.
737         * combine-stack-adj.c (rest_of_handle_stack_adjustments): Likewise.
738         * calls.c (prepare_call_address): Likewise.
739         (emit_call_1): Use targetm.calls.return_pops_args.
740         (expand_call): Likewise.
741         * function.c (assign_parms): Likewise.
742         * system.h (RETURN_POPS_ARGS): Add to #pragma poison list.
743         * target.h (struct gcc_target) [struct calls]: Add
744         return_pops_args field.
745         * targhooks.h (default_return_pops_args): Declare.
746         * targhooks.c (default_return_pops_args): Define.
747         * target-def.h (TARGET_RETURN_POPS_ARGS): Define.
748         (TARGET_CALLS): Add TARGET_RETURN_POPS_ARGS.
749         * doc/tm.texi (RETURN_POPS_ARGS): Rename to...
750         (TARGET_RETURN_POPS_ARGS): ...this.  Use deftypefn.  Adjust
751         documentation.
752         * config/alpha/alpha.h (RETURN_POPS_ARGS): Delete.
753         * config/arc/arc.h (RETURN_POPS_ARGS): Likewise.
754         * config/arm/arm.h (RETURN_POPS_ARGS): Likewise.
755         * config/avr/avr.h (RETURN_POPS_ARGS): Likewise.
756         * config/bfin/bfin.h (RETURN_POPS_ARGS): Likewise.
757         * config/cris/cris.h (RETURN_POPS_ARGS): Likewise.
758         * config/crx/crx.h (RETURN_POPS_ARGS): Likewise.
759         * config/fr30/fr30.h (RETURN_POPS_ARGS): Likewise.
760         * config/frv/frv.h (RETURN_POPS_ARGS): Likewise.
761         * config/h8300/h8300.h (RETURN_POPS_ARGS): Likewise.
762         * config/ia64/ia64.h (RETURN_POPS_ARGS): Likewise.
763         * config/iq2000/iq2000.h (RETURN_POPS_ARGS): Likewise.
764         * config/lm32/lm32.h (RETURN_POPS_ARGS): Likewise.
765         * config/m32c/m32c.h (RETURN_POPS_ARGS): Likewise.
766         * config/m32r/m32r.h (RETURN_POPS_ARGS): Likewise.
767         * config/m68hc11/m68hc11.h (RETURN_POPS_ARGS): Likewise.
768         * config/mcore/mcore.h (RETURN_POPS_ARGS): Likewise.
769         * config/mep/mep.h (RETURN_POPS_ARGS): Likewise.
770         * config/mips/mips.h (RETURN_POPS_ARGS): Likewise.
771         * config/mmix/mmix.h (RETURN_POPS_ARGS): Likewise.
772         * config/mn10300/mn10300.h (RETURN_POPS_ARGS): Likewise.
773         * config/moxie/moxie.h (RETURN_POPS_ARGS): Likewise.
774         * config/pa/pa.h (RETURN_POPS_ARGS): Likewise.
775         * config/pdp11/pdp11.h (RETURN_POPS_ARGS): Likewise.
776         * config/picochip/picochip.h (RETURN_POPS_ARGS): Likewise.
777         * config/rs6000/rs6000.h (RETURN_POPS_ARGS): Likewise.
778         * config/rx/rx.h (RETURN_POPS_ARGS): Likewise.
779         * config/s390/s390.h (RETURN_POPS_ARGS): Likewise.
780         * config/score/score.h (RETURN_POPS_ARGS): Likewise.
781         * config/sh/sh.h (RETURN_POPS_ARGS): Likewise.
782         * config/sparc/sparc.h (RETURN_POPS_ARGS): Likewise.
783         * config/spu/spu.h (RETURN_POPS_ARGS): Likewise.
784         * config/stormy16/stormy16.h (RETURN_POPS_ARGS): Likewise.
785         * config/v850/v850.h (RETURN_POPS_ARGS): Likewise.
786         * config/xtensa/xtensa.h (RETURN_POPS_ARGS): Likewise.
787         * config/i386/i386-protos.h (ix86_return_pops_args): Delete.
788         * config/i386/i386.h (RETURN_POPS_ARGS): Delete.
789         * config/i386/i386.c (ix86_return_pops_args): Make static.
790         Constify arguments.
791         (TARGET_RETURN_POPS_ARGS): Define.
792         * config/m68k/m68k.h (RETURN_POPS_ARGS): Move to...
793         * config/m68k/m68k.c (m68k_return_pops_args): ...here.  New function.
794         (TARGET_RETURN_POPS_ARGS): Define.
795         * config/vax/vax.h (RETURN_POPS_ARGS): Move to...
796         * config/vax/vax.c (vax_return_pops_args): ...here.  New function.
797         (TARGET_RETURN_POPS_ARGS): Define.
799 2010-06-29  Richard Guenther  <rguenther@suse.de>
801         PR middle-end/44667
802         * tree-inline.c (initialize_inlined_parameters): Make sure
803         to remap the inlined parameter variable substitutions types.
805 2010-06-29  Eric Botcazou  <ebotcazou@adacore.com>
807         PR rtl-optimization/44659
808         * combine.c (make_compound_operation) <SUBREG>: Do not return the
809         result of force_to_mode if it partially re-expanded the compound.
811 2010-06-28  Jan Hubicka  <jh@suse.cz>
813         PR middle-end/44671
814         * ipa-split.c (test_nonssa_use, mark_nonssa_use): Check also uses of
815         RESULT_DECL.
817 2010-06-28  Anatoly Sokolov  <aesok@post.ru>
819         * double-int.h (force_fit_type_double): Remove declaration.
820         * double-int.c (force_fit_type_double): Move to tree.c.
821         * tree.h (force_fit_type_double): Declare.
822         * tree.h (force_fit_type_double): Moved from double-int.c. Use
823         double_int type for 'cst' argument. Use double_int_fits_to_tree_p and
824         double_int_to_tree instead of fit_double_type and build_int_cst_wide.
825         * convert.c (convert_to_pointer): Adjust call to
826         force_fit_type_double.
827         * tree-vrp.c (extract_range_from_assert,
828         extract_range_from_unary_expr): Adjust call to force_fit_type_double.
829         * fold-const.c: Update comment.
830         (int_const_binop, fold_convert_const_int_from_int,
831         fold_convert_const_int_from_real, fold_convert_const_int_from_fixed,
832         extract_muldiv_1, fold_div_compare, fold_sign_changed_comparison,
833         fold_unary_loc, fold_negate_const, fold_abs_const, fold_not_const,
834         round_up_loc): Adjust call to force_fit_type_double.
836 2010-06-28  Philipp Tomsich  <philipp.tomsich@theobroma-systems.com>
838         * config/rs6000/rs6000.h (PROCESSOR_TITAN): Declare.
840 2010-06-28  Martin Jambor  <mjambor@suse.cz>
842         * tree-sra.c (convert_callers): New parameter, change fndecls of
843         recursive calls.
844         (modify_function): Pass the old decl to convert_callers.
846 2010-06-28  Martin Jambor  <mjambor@suse.cz>
848         * ipa-cp.c (ipcp_init_cloned_node): Replace calls to
849         ipa_check_create_node_params and ipa_initialize_node_params with
850         checking asserts they are not necessary.
852 2010-06-28  Jan Hubicka  <jh@suse.cz>
854         PR tree-optimization/44687
855         * ipa-split.c (split_function): Use DECL_RESULT to store return value.
857 2010-06-28  Martin Jambor  <mjambor@suse.cz>
859         PR c++/44535
860         * gimple-fold.c (get_first_base_binfo_with_virtuals): New function.
861         (gimple_get_relevant_ref_binfo): Use get_first_base_binfo_with_virtuals
862         instead of BINFO_BASE_BINFO.
864 2010-06-28  Michael Matz  <matz@suse.de>
866         PR middle-end/44592
867         * gimple-fold.c (gimplify_and_update_call_from_tree): Maintain
868         proper VDEF chain for intermediate stores in the sequence.
870 2010-06-28  Jan Hubicka  <jh@suse.cz>
872         PR tree-optimization/44357
873         * ipa-inline.c (add_new_edges_to_heap): Do not add edges to uninlinable
874         functions.
876 2010-06-28  Philipp Tomsich  <philipp.tomsich@theobroma-systems.com>
878         * config.gcc (powerpc*-*-*): Handle titan.
879         * config/rs6000/rs6000.c (titan_cost): New costs.
880         (rs6000_override_options): Add "titan" to processor_target_table.
881         Add Titan to branch alignment logic.
882         Correctly set rs6000_cost for titan.
883         * config/rs6000/rs6000.md (cpu): Add titan.  Include "titan.md".
884         * config/rs6000/titan.md: New file.
885         * doc/invoke.texi (RS/6000 and PowerPC Options): Document -mcpu=titan.
886         
887 2010-06-28  Nathan Froyd  <froydnj@codesourcery.com>
889         * tree-browser.c (TB_history_stack): Convert to a VEC.
890         (TB_SET_HEAD): Adjust for new type of TB_history_stack.
891         (TB_history_prev): Likewise.
893 2010-06-28  Nathan Froyd  <froydnj@codesourcery.com>
895         * vec.h (vec_heap_free): Add parentheses around free.
897 2010-06-28  Steven Bosscher  <steven@gcc.gnu.org>
899         * system.h: Poison GCC_EXCEPT_H for front-end files.
901         * langhooks.h (struct lang_hooks): Add eh_protect_cleanup_actions
902         langhook.
903         * langhooks-def.h (LANG_HOOKS_EH_PROTECT_CLEANUP_ACTIONS) New.
904         Define to NULL by default.
905         * except.h: Define GCC_EXCEPT_H.
906         (doing_eh): Remove prototype.
907         (init_eh, init_eh_for_function): Move prototypes to toplev.h.
908         (lang_protect_cleanup_actions): Remove.
909         * except.c (lang_protect_cleanup_actions): Remove.
910         (doing_eh): Remove.
911         (gen_eh_region): Don't check doing_eh here.
912         * toplev.h (init_eh, init_eh_for_function_): Moved from except.h.
913         * tree-eh.c (honor_protect_cleanup_actions): Use new langhook
914         instead of lang_protect_cleanup_actions.
915         * omp-low.c (maybe_catch_exception): Likewise.
916         * Makefile.in: Update dependencies.
918 2010-06-28  Bingfeng Mei  <bmei@broadcom.com>
920         * cgraph.h (struct varpool_node): new used_from_object_file flag.
921         (struct cgraph_local_info): new used_from_object_file flag.
922         * cgraph.c (dump_cgraph_node): dump used_from_object_file flag.
923         (cgraph_clone_node): initialize used_from_object_file.
924         (cgraph_create_virtual_clone): initialize used_from_object_file.
925         * lto-symbtab.c (lto_symtab_merge_decls_1): Set
926         used_from_object_file flags for symbols of LDPR_PREVAILING_DEF
927         when compiling with -fwhole-program.
928         (lto_symtab_resolve_symbols) Use LDPR_PREVAILING_DEF_IRONLY for
929         internal resolver.
930         * ipa.c (function_and_variable_visibility): Set externally_visible
931         flag of varpool_node if used_from_object_file flag is set.
932         (cgraph_externally_visible_p): check used_from_object_file flag.
933         * doc/invoke.texi (-fwhole-program option): Change description of
934         externally_visible attribute accordingly.
935         * doc/extend.texi (externally_visible): Ditto.
937 2010-06-27  Jan Hubicka  <jh@suse.cz>
939         * params.def (max-inline-insns-auto): Default to 40.
940         * doc/invoke.texi (max-inline-insns-auto): Document the change.
942 2010-06-27  Jan Hubicka  <jh@suse.cz>
944         PR middle-end/44671
945         PR middle-end/44686
946         * tree.c (build_function_decl_skip_args): Clear DECL_BUILT_IN on
947         signature change.
948         * ipa-split.c (split_function): Always clear DECL_BUILT_IN.
949         * ipa-prop.c (ipa_modify_formal_parameters): Likewise.
951 2010-06-27  Anatoly Sokolov  <aesok@post.ru>
953         * target.h (struct gcc_target): Add register_move_cost field.
954         * target-def.h (TARGET_REGISTER_MOVE_COST): New.
955         (TARGET_INITIALIZER): Use TARGET_REGISTER_MOVE_COST.
956         * targhooks.c (default_register_move_cost): New function.
957         * targhooks.h (default_register_move_cost): Declare function.
958         * defaults.h (REGISTER_MOVE_COST): Delete.
959         * ira-int.h (ira_register_move_cost): Update comment.
960         * ira.c: (ira_register_move_cost): Update comment.
961         * reload.h (register_move_cost): Declare.
962         * reginfo.c (register_move_cost): New function.
963         (move_cost): Update comment.
964         (init_move_cost, memory_move_secondary_cost): Replace
965         REGISTER_MOVE_COST with register_move_cost.
966         * postreload.c (reload_cse_simplify_set): (Ditto.).
967         * reload.c (find_valid_class, find_reloads): (Ditto.).
968         * reload1.c (choose_reload_regs): (Ditto.).
969         * doc/tm.texi (TARGET_REGISTER_MOVE_COST): New.
970         (REGISTER_MOVE_COST, TARGET_MEMORY_MOVE_COST): Update documentation.
971         * doc/md.texi (can_create_pseudo_p): Update documentation.
973         * config/i386/i386.h (MEMORY_MOVE_COST): Remove macro.
974         * config/i386/i386-protos.h (int ix86_memory_move_cost): Remove.
975         * config/i386/i386.h (ix86_memory_move_cost): Make static.
976         (TARGET_MEMORY_MOVE_COST): Define.
978         * config/ia64/ia64.h (MEMORY_MOVE_COST): Remove macro.
979         * config/ia64/ia64-protos.h (int ia64_memory_move_cost): Remove.
980         * config/ia64/ia64.h (ia64_memory_move_cost): Make static.
981         (TARGET_MEMORY_MOVE_COST): Define.
983 2010-06-27  Richard Guenther  <rguenther@suse.de>
985         PR tree-optimization/44683
986         * tree-ssa-dom.c (record_edge_info): Record equivalences for the
987         false edge from the inverted condition.
989 2010-06-27  Richard Guenther  <rguenther@suse.de>
991         PR middle-end/44684
992         * tree-ssa-alias.c (refs_may_alias_p_1): Allow SSA name refs.
993         (stmt_may_clobber_ref_p_1): Do not bother to call the oracle
994         for register LHS.  Or non-store assignments.
996 2010-06-26  Eric Botcazou  <ebotcazou@adacore.com>
998         * config/sparc/sparc.c (sparc_emit_set_const32): Make static.
999         (sparc_emit_set_const64): Likewise.  Remove disabled code.
1000         * config/sparc/sparc-protos.h (sparc_emit_set_const32): Delete.
1001         (sparc_emit_set_const64): Likewise.
1003 2010-06-26  Catherine Moore  <clm@codesourcery.com>
1005         * config/mips/mips.md (alu_type): New attribute.
1006         (type): Infer type from alu_type.
1007         (*add<mode>3, *add<mode>3_mips16, *addsi3_extended,
1008         *baddu_si_eb, *baddu_si_el, *baddu_di, sub<mode>3,
1009         *subsi3_extended, negsi2, negdi2, *low<mode>,
1010         *low<mode>_mips16, *ior<mode>3, *ior<mode>3_mips16,
1011         xor<mode>3, *nor<mode>3,
1012         *zero_extend<GPR:mode>_trunc<SHORT:mode>,
1013         *zero_extendhi_truncqi):  Set alu_type instead of type.
1015 2010-06-26  Douglas B Rupp  <rupp@gnat.com>
1017         * config/alpha/alpha.c (alpha_need_linkage): Adjust
1018         splay_tree_new_ggc call.
1019         (alpha_use_linkage): Likewise.
1021 2010-06-26  Joseph Myers  <joseph@codesourcery.com>
1023         * collect2.c (main): Remove SWITCHES_NEED_SPACES conditional.
1024         * doc/tm.texi (SWITCHES_NEED_SPACES): Don't document.
1025         * gcc.c (SWITCHES_NEED_SPACES, switches_need_spaces): Remove.
1026         (static_specs): Remove switches_need_spaces.
1027         (process_command, do_self_spec): Hardcode handling "-o" instead of
1028         checking switches_need_spaces.
1029         * system.h (SWITCHES_NEED_SPACES): Poison.
1031 2010-06-26  Richard Guenther  <rguenther@suse.de>
1033         PR tree-optimization/44393
1034         * tree-loop-distribution.c (generate_loops_for_partition): Fix
1035         stmt removal and VOP renaming.
1036         (generate_memset_zero): Remove redundant stmt updating.
1037         * tree-flow.h (mark_virtual_ops_in_bb): Remove.
1038         * tree-cfg.c (mark_virtual_ops_in_bb): Likewise.
1040 2010-06-26  Jan Hubicka  <jh@suse.cz>
1042         * ipa-split.c (consider_split): PHI in entry block is OK as long as all
1043         edges comming from header are equivalent.
1044         (visit_bb): Handle PHIs correctly.
1045         * tree-inline.c (copy_phis_for_bb): Be able to copy
1046         PHI from entry edge.
1047         (copy_cfg_body): Produce edge from entry BB before copying
1048         PHIs.
1050 2010-06-26  Richard Guenther  <rguenther@suse.de>
1052         PR middle-end/44674
1053         * tree-ssa-alias.c (refs_may_alias_p_1): Allow all kind of
1054         decls.  Handle LABEL_DECLs like FUNCTION_DECLs.
1056 2010-06-26  Joseph Myers  <joseph@codesourcery.com>
1058         * gcc.c (n_switches_alloc, n_infiles_alloc, alloc_infile,
1059         add_infile, alloc_switch): New.
1060         (process_command): Remove variable lang_n_infiles.  Process
1061         options in a single pass.  Use new functions for allocating
1062         infiles and switches arrays.  Properly skip operands of
1063         -Xpreprocessor and -Xassembler.
1065 2010-06-26  Jan Hubicka  <jh@suse.cz>
1067         PR middle-end/44671
1068         * cgraphunit.c (cgraph_function_versioning): Remove wrong
1069         cgraph_make_decl_local call; fix typo copying RTL data.
1071 2010-06-25  DJ Delorie  <dj@redhat.com>
1073         * config/m32c/m32c-protos.h (m32c_note_pragma_address): Declare.
1074         (m32c_output_aligned_common): Likewise.
1075         * config/m32c/m32c.h (ASM_OUTPUT_ALIGNED_DECL_COMMON): New.
1076         (ASM_OUTPUT_ALIGNED_DECL_LOCAL): New.
1077         * config/m32c/m32c-pragma.c (m32c_pragma_address): New.
1078         (m32c_register_pragmas): Register it.
1079         * config/m32c/m32c.c (m32c_get_pragma_address): New.
1080         (m32c_insert_attributes): Set #pragma address decls volatile.
1081         (pragma_entry_eq): New.
1082         (pragma_entry_hash): New.
1083         (m32c_note_pragma_address): New.
1084         (m32c_get_pragma_address): New.
1085         (m32c_output_aligned_common): New.
1086         * doc/extend.texi: Document the new pragma.
1088         * config/m32c/m32c.c (m32c_illegal_subreg_p): Reject illegal MEMs
1089         also.
1090         * config/m32c/predicates.md (m32c_any_operand): Check the code
1091         instead of memory_operand so as to allow matching volatile MEMs.
1092         (m32c_nonimmediate_operand): Likewise.
1093         (mra_operand): Allow volatiles.
1095 2010-06-25  Alexandre Oliva  <aoliva@redhat.com>
1097         PR debug/44610
1098         * simplify-rtx.c (delegitimize_mem_from_attrs): Don't use a base
1099         address if the offset is unknown.
1101 2010-06-25  Douglas B Rupp  <rupp@gnat.com>
1103         * dwarf2out.c (dwarf2out_vms_debug_main_pointer): New function.
1104         * dwarf2out.h (dwarf2out_vms_debug_main_pointer): Declare new function.
1105         * config/ia64/ia64-protos.h (ia64_start_function): Declare.
1106         * config/ia64/sysv4.h (ASM_DECLARE_FUNCTION_NAME): Move contents
1107         to ia64_start_function. Invoke it.
1108         * config/ia64/ia64.c (ia64_start_function): Call new function
1109         dwarf2out_vms_debug_main_pointer.
1111 2010-06-25  Sebastian Pop  <sebastian.pop@amd.com>
1113         * tree-if-conv.c (insert_gimplified_predicates): Do not insert
1114         statements computing the true predicate.
1116 2010-06-25  Sebastian Pop  <sebastian.pop@amd.com>
1118         * tree-if-conv.c (init_bb_predicate): Initialize the predicate
1119         to boolean_true_node.
1120         (reset_bb_predicate): New.
1121         (predicate_bbs): Call reset_bb_predicate.
1123 2010-06-25  Sebastian Pop  <sebastian.pop@amd.com>
1125         * tree-if-conv.c (combine_blocks): Remove FIXME comment.
1126         (tree_if_conversion): Returns true when something has been changed.
1127         (main_tree_if_conversion): Return TODO_cleanup_cfg when if-conversion
1128         changed something.
1130 2010-06-25  Sebastian Pop  <sebastian.pop@amd.com>
1132         * Makefile.in (tree-if-conv.o): Depends on DBGCNT_H.
1133         * dbgcnt.def (if_conversion_tree): New DEBUG_COUNTER.
1134         * tree-if-conv.c: Include dbgcnt.h.
1135         (tree_if_conversion): Use if_conversion_tree to count the number of
1136         if-convertible loops.
1138 2010-06-25  Changpeng Fang  <changpeng.fang@amd.com>
1140         * common.opt (fprefetch-loop-arrays): Re-define
1141         -fprefetch-loop-arrays as a tri-state option with the initial
1142         value of -1.
1143         * tree-ssa-loop.c (gate_tree_ssa_loop_prefetch): Invoke prefetch
1144         pass only when flag_prefetch_loop_arrays > 0.
1145         * toplev.c (process_options): Note that, with tri-states,
1146         flag_prefetch_loop_arrays>0 means prefetching is enabled.
1147         * config/i386/i386.c (override_options): Enable prefetching at -O3
1148         for a set of CPUs that sw prefetching is helpful.
1149         (software_prefetching_beneficial_p): New.  Return TRUE if software
1150         prefetching is beneficial for the given CPU.
1152 2010-06-25  H.J. Lu  <hongjiu.lu@intel.com>
1154         PR rtl-optimization/44326
1155         * implicit-zee.c (find_removable_zero_extends): Replace
1156         INSN_P with NONDEBUG_INSN_P.
1158 2010-06-25  Martin Jambor  <mjambor@suse.cz>
1160         * ipa-prop.h (struct ipa_param_descriptor): Removed the modified flag.
1161         (struct ipa_node_params): Removed the modification_analysis_done flag.
1162         (ipa_is_param_modified): Removed.
1163         (ipa_analyze_node): Declare.
1164         (ipa_compute_jump_functions): Remove declaration.
1165         (ipa_count_arguments): Likewise.
1166         (ipa_detect_param_modifications): Likewise.
1167         (ipa_analyze_params_uses): Likewise.
1168         * ipa-prop.c (struct param_analysis_info): New type.
1169         (visit_store_addr_for_mod_analysis): Removed.
1170         (visit_load_for_mod_analysis): Renamed to visit_ref_for_mod_analysis,
1171         moved down in the file.
1172         (ipa_detect_param_modifications): Merged into ipa_analyze_params_uses.
1173         (ipa_count_arguments): Made static.
1174         (mark_modified): New function.
1175         (is_parm_modified_before_call): New function.
1176         (compute_pass_through_member_ptrs): New parameter parms_info, call
1177         is_parm_modified_before_call instead of ipa_is_param_modified.
1178         (ipa_compute_jump_functions_for_edge): New parameter parms_info, pass
1179         it to compute_pass_through_member_ptrs.
1180         (ipa_compute_jump_functions): New parameter parms_info, pass it to
1181         ipa_compute_jump_functions_for_edge.  Call ipa_initialize_node_params
1182         on the callee if it is analyzed.  Made static.
1183         (ipa_analyze_indirect_call_uses): New parameter parms_info, call
1184         is_parm_modified_before_call instead of ipa_is_param_modified.
1185         (ipa_analyze_call_uses): New parameter parms_info, pass it to
1186         ipa_analyze_indirect_call_uses.
1187         (ipa_analyze_stmt_uses): New parameter parms_info, pass it to
1188         ipa_analyze_call_uses.
1189         (ipa_analyze_params_uses): New parameter parms_info, pass it to
1190         ipa_analyze_stmt_uses.  Also perform the used analysis.  Made static.
1191         (ipa_analyze_node): New function.
1192         (ipa_print_node_params): Do not dump the modified flag.
1193         (ipa_write_node_info): Assert uses_analysis_done rather than streaming
1194         it.  Do not stream the modified parameter flag.
1195         (ipa_read_node_info): Set uses_analysis_done to 1 instead of streaming
1196         it.  Do not stream the modified parameter flag.
1197         * ipa-cp.c (ipcp_analyze_node): Removed.
1198         (ipcp_init_stage): Iterate only once over the nodes, analyze each one
1199         with only a call to ipa_analyze_node.
1200         * ipa-inline.c (inline_indirect_intraprocedural_analysis): Analyze the
1201         node with only a call to ipa_analyze_node.
1203 2010-06-25  Manuel López-Ibáñez  <manu@gcc.gnu.org>
1205         * doc/invoke.texi (-Wsuggest-attribute): Add item for noreturn.
1207 2010-06-25  Jan Hubicka  <jh@suse.cz>
1209         * tree-pass.h (pass_split_functions): Declare.
1210         * opts.c (decode_options): Enable function splitting at -O2
1211         * timevar.def (TV_IPA_FNSPLIT): New macro.
1212         * ipa-split.c: New file.
1213         * common.opt (-fpartial-inlining): New flag.
1214         * Makefile.in (ipa-split.o): New object file.
1215         * passes.c (init_optimization_passes): Add ipa-split.
1216         * params.def (partial-inlining-entry-probability): New parameters.
1217         * doc/invoke.texi (-fpartial-inlining): New.
1219 2010-06-25  Manuel López-Ibáñez  <manu@gcc.gnu.org>
1221         PR 44665
1222         * tree-inline.c (gimple_expand_calls_inline): Fix typo in comment.
1223         * gimplify.c (is_gimple_reg_rhs_or_call): Likewise.
1224         (gimplify_expr): Likewise.
1226 2010-06-25  Martin Jambor  <mjambor@suse.cz>
1228         * ipa-prop.c (determine_cst_member_ptr): Ignore non-clobbering
1229         statements instead of bailing out on them.
1230         (ipa_analyze_indirect_call_uses): Do not require that loads from the
1231         parameter are in the same BB as the condition.  Update comments.
1233 2010-06-25  Jakub Jelinek  <jakub@redhat.com>
1235         PR middle-end/43866
1236         * tree-ssa-loop-unswitch.c (tree_may_unswitch_on): If stmt is always
1237         true or always false, return NULL_TREE.
1238         (tree_unswitch_single_loop): Optimize conditions even when reaching
1239         max-unswitch-level parameter.  If num > 0, optimize first all conditions
1240         using entry checks, then do still reachable block discovery and consider
1241         only conditions in still reachable basic blocks in the loop.
1243         PR tree-optimization/44539
1244         * tree-cfgcleanup.c (fixup_noreturn_call): Call update_stmt even when
1245         the call doesn't have LHS, but has VDEF.
1247 2010-06-25  Joseph Myers  <joseph@codesourcery.com>
1249         * config/pa/pa.h (MODIFY_TARGET_NAME): Remove.
1250         * doc/tm.texi (MODIFY_TARGET_NAME): Don't document.
1251         * gcc.c (enum add_del, struct modify_target, modify_target):
1252         Remove.
1253         (process_command): Remove code conditional on MODIFY_TARGET_NAME.
1254         * system.h (MODIFY_TARGET_NAME): Poison.
1256 2010-06-25  Alan Modra  <amodra@gmail.com>
1258         * doc/invoke.texi: Delete mcmodel=medium from powerpc options.
1259         * config/rs6000/rs6000.h (enum rs6000_cmodel): Delete CMODEL_MEDIUM.
1260         * config/rs6000/linux64.h (SUBSUBTARGET_OVERRIDE_OPTIONS): Set
1261         CMODEL_LARGE as default.
1262         * config/rs6000/rs6000.c (rs6000_handle_option): Remove mcmodel=medium.
1263         (offsettable_ok_by_alignment): Delete.
1264         (rs6000_emit_move): Remove mcmodel=medium optimization.
1266 2010-06-25  Bernd Schmidt  <bernds@codesourcery.com>
1268         With large parts from Jim Wilson:
1269         PR target/43902
1270         * tree-pretty-print.c (dump_generic_node, op_code_prio): Add
1271         WIDEN_MULT_PLUS_EXPR and WIDEN_MULT_MINUS_EXPR.
1272         * optabs.c (optab_for_tree_code): Likewise.
1273         (expand_widen_pattern_expr): Likewise.
1274         * tree-ssa-math-opts.c (convert_mult_to_widen): New function, broken
1275         out of execute_optimize_widening_mul.
1276         (convert_plusminus_to_widen): New function.
1277         (execute_optimize_widening_mul): Use the two new functions.
1278         * expr.c (expand_expr_real_2): Add support for GIMPLE_TERNARY_RHS.
1279         Remove code to generate widening multiply-accumulate.  Add support
1280         for WIDEN_MULT_PLUS_EXPR and WIDEN_MULT_MINUS_EXPR.
1281         * gimple-pretty-print.c (dump_ternary_rhs): New function.
1282         (dump_gimple_assign): Call it when appropriate.
1283         * tree.def (WIDEN_MULT_PLUS_EXPR, WIDEN_MULT_MINUS_EXPR): New codes.
1284         * cfgexpand.c (gimple_assign_rhs_to_tree): Likewise.
1285         (expand_gimple_stmt_1): Likewise.
1286         (expand_debug_expr): Support WIDEN_MULT_PLUS_EXPR and
1287         WIDEN_MULT_MINUS_EXPR.
1288         * tree-ssa-operands.c (get_expr_operands): Likewise.
1289         * tree-inline.c (estimate_operator_cost): Likewise.
1290         * gimple.c (extract_ops_from_tree_1): Renamed from
1291         extract_ops_from_tree.  Add new arg for a third operand; fill it.
1292         (gimple_build_assign_stat): Support operations with three operands.
1293         (gimple_build_assign_with_ops_stat): Likewise.
1294         (gimple_assign_set_rhs_from_tree): Likewise.
1295         (gimple_assign_set_rhs_with_ops_1): Renamed from
1296         gimple_assign_set_rhs_with_ops.  Add new arg for a third operand.
1297         (get_gimple_rhs_num_ops): Support GIMPLE_TERNARY_RHS.
1298         (get_gimple_rhs_num_ops): Handle WIDEN_MULT_PLUS_EXPR and
1299         WIDEN_MULT_MINUS_EXPR.
1300         * gimple.h (enum gimple_rhs_class): Add GIMPLE_TERNARY_RHS.
1301         (extract_ops_from_tree_1): Adjust declaration.
1302         (gimple_assign_set_rhs_with_ops_1): Likewise.
1303         (gimple_build_assign_with_ops): Pass NULL for last operand.
1304         (gimple_build_assign_with_ops3): New macro.
1305         (gimple_assign_rhs3, gimple_assign_rhs3_ptr, gimple_assign_set_rhs3,
1306         gimple_assign_set_rhs_with_ops, extract_ops_from_tree): New inline
1307         functions.
1308         * tree-cfg.c (verify_gimple_assign_ternary): New static function.
1309         (verify_gimple_assign): Call it.
1310         * doc/gimple.texi (Manipulating operands): Document GIMPLE_TERNARY_RHS.
1311         (Tuple specific accessors, subsection GIMPLE_ASSIGN): Document new
1312         functions for dealing with three-operand statements.
1313         * tree.c (commutative_ternary_tree_code): New function.
1314         * tree.h (commutative_ternary_tree_code): Declare it.
1315         * tree-vrp.c (gimple_assign_nonnegative_warnv_p): Return false for
1316         ternary statements.
1317         (gimple_assign_nonzero_warnv_p): Likewise.
1318         * tree-ssa-sccvn.c (stmt_has_constants): Handle GIMPLE_TERNARY_RHS.
1319         * tree-ssa-ccp.c (get_rhs_assign_op_for_ccp): New static function.
1320         (ccp_fold): Use it.  Handle GIMPLE_TERNARY_RHS.
1321         * tree-ssa-dom.c (enum expr_kind): Add EXPR_TERNARY.
1322         (struct hashtable_expr): New member ternary in the union.
1323         (initialize_hash_element): Handle GIMPLE_TERNARY_RHS.
1324         (hashable_expr_equal_p): Fix indentation.  Handle EXPR_TERNARY.
1325         (iterative_hash_hashable_expr): Likewise.
1326         (print_expr_hash_elt): Handle EXPR_TERNARY.
1327         * gimple-fold.c (fold_gimple_assign): Handle GIMPLE_TERNARY_RHS.
1328         * tree-ssa-threadedge.c (fold_assignment_stmt): Remove useless break
1329         statements.  Handle GIMPLE_TERNARY_RHS.
1331 2010-06-25  Jan Hubicka  <jh@suse.cz>
1333         * doc/invoke.texi (-Wsuggest-attribute): Add noreturn.
1335 2010-06-25  Shujing Zhao  <pearly.zhao@oracle.com>
1337         PR c/44517
1338         * c-parser.c (c_parser_parms_list_declarator): Return NULL if one of
1339         parameters are not good.
1340         (c_parser_parameter_declaration): Error unknown type name if the type
1341         name can't start declaration specifiers.
1343 2010-06-25  Joseph Myers  <joseph@codesourcery.com>
1345         * gcc.c (translate_options): Don't mention +e in comment.
1346         (process_command): Don't handle +e specially.
1348 2010-06-25  Bernd Schmidt  <bernds@codesourcery.com>
1350         * ira.c (allocno_pool, copy_pool, allocno_live_range_pool): Delete.
1352         * ira-build.c (merge_hard_reg_conflicts): New function.
1353         (create_cap_allocno, copy_info_to_removed_store_destinations,
1354         propagate_some_info_from_allocno, propagate_allocno_info): Use it.
1355         (move_allocno_live_ranges, copy_allocno_live_ranges): New functions.
1356         (remove_unnecessary_allocnos, remove_low_level_allocnos)
1357         copy_nifo_to_removed_store_destination): Use them.
1358         * ira-lives.c (make_hard_regno_born): New function, split out of
1359         make_regno_born.
1360         (make_allocno_born): Likewise.
1361         (make_hard_regno_dead): New function, split out of make_regno_dead.
1362         (make_allocno_dead): Likewise.
1363         (inc_register_pressure): New function, split out of set_allocno_live.
1364         (dec_register_pressure): New function, split out of clear_allocno_live.
1365         (mark_pseudo_regno_live): New function, split out of mark_reg_live.
1366         (mark_hard_reg_live): Likewise.  Use inc_register_pressure.
1367         (mark_pseudo_regno_dead): New function, split out of mark_reg_dead.
1368         (mark_hard_reg_dead): Likewise.  Use dec_register_pressure.
1369         (make_pseudo_conflict): Use mark_pseudo_regno_dead and
1370         mark_pseudo_regno_live.
1371         (process_bb_node_lives): Use mark_pseudo_regno_live,
1372         make_hard_regno_born and make_allocno_dead.
1373         (make_regno_born, make_regno_dead, mark_reg_live, mark_reg_dead,
1374         set_allocno_live, clear_allocno_live): Delete functions.
1376         * ira-int.h (ira_parent_allocno, ira_parent_or_cap_allocno): Declare.
1377         * ira-build.c (ira_parent_allocno, ira_parent_or_cap_allocno): New
1378         functions.
1379         (ira_flattening): Use ira_parent_allocno.
1380         * ira-conflicts.c (process_regs_for_copy, propagate_copies)
1381         build_allocno_conflicts): Use ira_parent_or_cap_allocno.
1383         * ira-color.c (assign_hard_reg): Improve formatting of multi-line for
1384         statement.
1386         * ira-int.h (SET_MINMAX_SET_BIT, CLEAR_MINMAX_SET_BIT,
1387         TEST_MINMAX_SET_BIT, minmax_set_iterator, minmax_set_iter_init,
1388         minmax_set_iter_cond, minmax_set_iter_next,
1389         FOR_EACH_BIT_IN_MINMAX_SET): Renamed from SET_ALLOCNO_SET_BIT,
1390         CLEAR_ALLOCNO_SET_BIT, TEST_ALLOCNO_SET_BIT, ira_allocno_set_iterator,
1391         ira_allocno_set_iter_init, ira_allocno_set_iter_cond,
1392         ira_allocno_set_iter_Next and FOR_EACH_ALLOCNO_IN_ALLOCNO_SET.  All
1393         uses changed.
1395         * ira-int.h (struct live_range, live_range_t): Renamed from struct
1396         ira_allocno_live_range and allocno_live_range_t; all uses changed.
1397         * ira-build.c (live_range_pool): Renamed from allocno_live_range_pool.
1398         All uses changed.
1400 2010-06-24  Richard Earnshaw  <rearnsha@arm.com>
1402         * thumb2.md (thumb2_tlobits_cbranch): Delete.
1403         (peephole2 to convert zero_extract/compare of single bit to
1404          lshift/compare): New.
1406 2010-06-24  Anatoly Sokolov  <aesok@post.ru>
1408         * fold-const.c (const_binop): Remove 'notrunc' argement. Adjust
1409         recursive call and call to 'int_const_binop'.
1410         (build_range_check, fold_cond_expr_with_comparison, unextend,
1411         fold_truthop, extract_muldiv_1, fold_comparison, fold_binary_loc,
1412         multiple_of_p): Adjust call to const_binop.
1414 2010-06-24  Uros Bizjak  <ubizjak@gmail.com>
1416         * config/i386/i386.md (XFmode push splitter): Use GET_MODE_SIZE to
1417         determine size of XFmode operand.
1418         (XFmode extended DFmode push splitter): Ditto.
1419         (XFmode extended SFmode push splitter): Ditto.
1421 2010-06-24  H.J. Lu  <hongjiu.lu@intel.com>
1423         PR target/44588
1424         * config/i386/i386.md (extract_code): New.
1425         (<u>divmodqi4): Likewise.
1426         (divmodhiqi3): Likewise.
1427         (udivmodhiqi3): Likewise.
1428         (<u>divqi3): Remvoved.
1430 2010-06-24  Jakub Jelinek  <jakub@redhat.com>
1432         PR middle-end/44492
1433         * recog.h (struct recog_data): Add is_asm field.
1434         * recog.c (asm_operand_ok, constrain_operands): If neither < nor > is
1435         present in constraints of inline-asm operand and memory operand
1436         contains {PRE,POST}_{INC,DEC,MODIFY}, return 0.
1437         (extract_insn): Initialize recog_data.is_asm.
1438         * doc/md.texi (Constraints): Document operand side-effect rules.
1440 2010-06-24  Andi Kleen  <ak@linux.intel.com>
1442         * c-parser.c (c_parser_conditional_expression): Call
1443         warn_for_omitted_condop.
1444         * doc/invoke.texi: Document omitted condop warning.
1446 2010-06-24  Nick Clifton<nickc@redhat.com>
1448         * loop-unswitch.c (compare_and_jump_seq): Assert that the last
1449         insn in the sequence is a jump insn before setting its label.
1451 2010-06-24  Alan Modra  <amodra@gmail.com>
1453         * collect2.c (main): Match exactly --version and --help.
1455 2010-06-24  DJ Delorie  <dj@redhat.com>
1457         * config/m32c/m32c-pragma.c: Don't include rtl.h.
1459 2010-06-23  Uros Bizjak  <ubizjak@gmail.com>
1461         * config/i386/i386.md (mov<mode>): Macroize expander from mov{sf,df,xf}
1462         using X87MODEF mode iterator.
1463         (pushsf splitter): Macroize splitter using P mode iterator.
1464         (*swap<mode>): Macroize insn from *swap{sf,df} using MODEF
1465         mode iterator.
1467         (*movxf_internal): Rename from *movxf_integer.
1468         (*movxf_internal_nointeger): Rename from *movxf_nointeger.
1469         (*movdf_internal_rex64): Rename from *movdf_integer_rex64.
1470         (*movdf_internal): Rename from *movdf_integer.
1471         (*movdf_internal_nointeger): Rename from *movdf_nointeger.
1472         (*movsf_internal): Rename from *movdf_1.
1474 2010-06-23  Basile Starynkevitch  <basile@starynkevitch.net>
1476         * coretypes.h: (gimple_seq_node_d, gimple_seq_node)
1477         (const_gimple_seq_node): Removed typedefs.
1479         * gimple.h: (gimple_seq_node_d, gimple_seq_node)
1480         (const_gimple_seq_node): Added typedefs moved from coretypes.h.
1482 2010-06-23  H.J. Lu  <hongjiu.lu@intel.com>
1484         * config/i386/i386.c (bdesc_args): Replace CODE_FOR_avx_si_si256,
1485         CODE_FOR_avx_ps_ps256 and CODE_FOR_avx_pd_pd256 with
1486         CODE_FOR_vec_extract_lo_v8si, CODE_FOR_vec_extract_lo_v8sf
1487         and CODE_FOR_vec_extract_lo_v4df.
1489         * config/i386/sse.md (vec_extract_lo_<AVX256MODE4P:mode>):
1490         Changed to define_insn_and_split.
1491         (vec_extract_lo_<AVX256MODE8P:mode>): Likewise.
1492         (vec_extract_lo_v16hi): Likewise.
1493         (vec_extract_lo_v32qi): Likewise.
1494         (avx_<avxmodesuffixp><avxmodesuffix>_<avxmodesuffixp>): Likewise.
1495         (avx_<avxmodesuffixp>_<avxmodesuffixp><avxmodesuffix>): Removed.
1497 2010-06-23  Joern Rennecke  <joern.rennecke@embecosm.com>
1499         PR target/44640
1500         * config/spu/spu-protos.h (spu_expand_epilogue) Use bool.
1501         * config/spu/spu.c (spu_scalar_mode_supported_p): Declare with bool.
1502         (spu_vector_mode_supported_p, spu_handle_fndecl_attribute): Likewise.
1503         (spu_handle_vector_attribute, spu_pass_by_reference): Likewise.
1504         (spu_rtx_costs, spu_function_ok_for_sibcall): Likewise.
1506         PR target/44640
1507         * config/spu/spu.c (ea_load_store_inline): Use add_reg_note.
1509         PR other/44644
1510         * df-core.c (struct df): Rename to df_d.
1511         * df.h (struct df): Likewise.
1512         * dse.h (struct df): Remove forward declaration.
1513         * recog.h (struct insn_data): Rename to:
1514         (struct_insn_data_d).  Adjusted all users.
1516 2010-06-23  Arnaud Charlet  <charlet@adacore.com
1518         PR ada/22220
1519         * doc/install.texi: Update requirements to build GNAT.
1521 2010-06-22  Andreas Schwab  <schwab@linux-m68k.org>
1523         * config/m68k/m68k.c (m68k_output_addr_const_extra): Add cast to
1524         enum type.
1525         (m68k_sched_attr_opx_type): Remove unreachable return.
1526         (m68k_sched_attr_opy_type): Likewise.
1527         (m68k_sched_attr_size): Likewise.
1528         (sched_get_opxy_mem_type): Likewise.
1529         (m68k_sched_attr_op_mem): Likewise.
1531 2010-06-22  Eric Botcazou  <ebotcazou@adacore.com>
1533         * cgraphunit.c (cgraph_redirect_edge_call_stmt_to_callee): Chain the
1534         new statement and adjust VDEF only if necessary.  Remove superfluous
1535         call to maybe_clean_or_replace_eh_stmt.
1536         * gimple.c (gimple_call_copy_skip_args): Use gimple_call_copy_flags to
1537         copy the flags.
1538         * gimple-iterator.c (gsi_replace): Clear BB of old statement here...
1539         * tree-inline.c (copy_bb): ...and not there.
1541 2010-06-22  Cary Coutant  <ccoutant@google.com>
1543         * dwarf2out.c (is_nested_in_subprogram): New function.
1544         (should_move_die_to_comdat): Use it.
1545         (copy_ancestor_tree): Don't mark DIEs here.
1546         (copy_decls_walk): Start walk from root of newly-added tree;
1547         mark DIEs here instead.
1549 2010-06-22  H.J. Lu  <hongjiu.lu@intel.com>
1551         * config/i386/i386.md (unit): Also check sseishft1.
1553 2010-06-22  Jan Hubicka  <jh@suse.cz>
1555         * gimple.h (gimple_expr_code): Do checking on when gimple checking is
1556         enabled.
1558 2010-06-22  Jan Hubicka  <jh@suse.cz>
1560         * df-problems.c (df_rd_confluence_n, df_lr_confluence_n,
1561         df_live_confluence_n, df_byte_lr_confluence_n, df_md_confluence_n):
1562         Return true if something changed.
1563         * df.h (df_confluence_function_n): Return bool.
1564         * df-core.c (df_worklist_propagate_forward,
1565         df_worklist_propagate_backward): Track changes and ages.
1566         (df_worklist_dataflow_doublequeue): Use bitmap iterator for main walk;
1567         track ages.
1568         * dse.c (dse_confluence_n): Return always true.
1570 2010-06-22  Jan Hubicka  <jh@suse.cz>
1572         * bitmap.c (bitmap_clear_bit): Micro optimize.
1574 2010-06-22  Uros Bizjak  <ubizjak@gmail.com>
1576         * config/i386/i386.md (SWI1248x): New mode iterator.
1577         (SWI48x): Ditto.
1578         (SWI12): Ditto.
1579         (SWI24): Ditto.
1581         (mov<mode>): Macroize expander from mov{qi,hi,si,di} using
1582         SWI1248x mode iterator.
1583         (*push<mode>2_rex64): Macroize insn from *push{qi,hi,si}_rex64
1584         using SWI124 mode iterator.
1585         (*push<mode>2): Macroize insn from *push{qi,hi} using SWI12
1586         mode iterator.
1587         (*push<mode>2_prologue): Macroize insn from  *pushsi2_prologue and
1588         *pushdi2_prologue_rex64 using P mode iterator.
1589         (*mov<mode>_xor): Macroize insn from *movsi_xor and *movdi_xor_rex64
1590         using SWI48 mode iterator.
1591         (*mov<mode>_or): Ditto from *movsi_or and *movdi_or_rex64.
1592         (*movabs<mode>_1): Macroize insn from *movabs{qi,hi,si,di}_1_rex64
1593         using SWI1248x mode iterator.
1594         (*movabs<mode>_2): Ditto from *movabs{qi,hi,si,di}_1_rex64.
1595         (*swap<mode>): Macroize insn from *swapsi and *swapdi_rex64 using
1596         SWI48 mode iterator.
1597         (*swap<mode>_1): Macroize insn from *swap{qi,hi}_1 using SWI12 mode
1598         iterator.
1599         (*swap<mode>_2): Ditto from *swap{qi,hi}_2.
1600         (movstrict<mode>): Macroize expander from movstrict{qi,hi} using
1601         SWI12 mode iterator.
1602         (*movstrict<mode>_1): Macroize insn from *movstrict{qi,hi}_1 using
1603         SWI12 mode iterator.
1604         (*movstrict<mode>_xor): Ditto from *movstrict{qi,hi}_xor.
1605         (*mov<mode>_extv_1): Macroize insn from *mov{hi,si}_extv_1 using
1606         SWI24 mode iterator.
1607         (*mov<mode>_extzv_1): Macroize insn from *mov{si,di}_extzv_1 using
1608         SWI48 mode iterator.
1609         (mov<mode>_insn_1): New expander.
1610         (*mov<mode>_insv_1_rex64): Macroize insn from *mov{si,di}_insv_1_rex64
1611         using SWI48x mode iterator.
1613         (*movoi_internal_avx): Rename from *movoi_internal.
1614         (*movti_internal_rex64): Rename from *movti_rex64.
1615         (*movti_internal_sse): Rename from *movti_sse.
1616         (*movdi_internal_rex64): Rename from *movdi_1_rex64.
1617         (*movdi_internal): Rename from *movdi_2.
1618         (*movsi_internal): Rename from *movsi_1.
1619         (*movhi_internal): Rename from *movhi_1.
1620         (*movqi_internal): Rename from *movqi_1.
1622         (insv): Update the call to gen_movsi_insv_1 for rename.
1623         * config/i386/i386.c (promote_duplicated_reg): Ditto.
1625 2010-06-22  Jan Hubicka  <jh@suse.cz>
1627         * passes.c (execute_function_todo): Move call of statistics_fini_pass
1628         to ...
1629         (execute_todo) ... this one.
1631 2010-06-22  Alan Modra  <amodra@gmail.com>
1633         PR target/44364
1634         * config/rs6000/e500.h (HARD_REGNO_CALLER_SAVE_MODE): Define.
1635         * caller-save.c (insert_restore, insert_save): Use non-validate
1636         form of adjust_address.
1638 2010-06-21  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
1640         PR target/39690
1641         * config/pa/pa.c (override_options): Disable
1642         -freorder-blocks-and-partition.
1644 2010-06-21  H.J. Lu  <hongjiu.lu@intel.com>
1646         PR target/44615
1647         * config/i386/atom.md (atom_sseishft_2): Also check sseishft1.
1649         * config/i386/i386.md (type): Add sseishft1
1651         * config/i386/ppro_insn (ppro_insn): Also check sseishft1.
1652         (ppro_insn_load): Likewise.
1653         (ppro_insn_store): Likewise.
1654         (ppro_insn_both): Likewise.
1656         * config/i386/sse.md (sse2_lshrv1ti3): Add atom_unit.
1657         (*vec_extractv2di_1_rex64_avx): Replace sseishft with sseishft1
1658         for type.
1659         (*vec_extractv2di_1_avx): Likewise.
1660         (*vec_extractv2di_1_rex64): Replace sseishft with sseishft1 for
1661         type.  Remove atom_unit.
1662         (*vec_extractv2di_1_sse2): Likewise.
1664 2010-06-21  DJ Delorie  <dj@redhat.com>
1666         * diagnostic.h (diagnostic_classification_change_t): New.
1667         (diagnostic_context): Add history and push/pop list.
1668         (diagnostic_push_diagnostics): Declare.
1669         (diagnostic_pop_diagnostics): Declare.
1670         * diagnostic.c (diagnostic_classify_diagnostic): Store changes
1671         from pragmas in a history chain instead of the global table.
1672         (diagnostic_push_diagnostics): New.
1673         (diagnostic_pop_diagnostics): New.
1674         (diagnostic_report_diagnostic): Scan history chain to find state
1675         of diagnostics as of the diagnostic location.
1676         * opts.c (set_option): Pass UNKNOWN_LOCATION to
1677         diagnostic_classify_diagnostic.
1678         (enable_warning_as_error): Likewise.
1679         * diagnostic-core.h (DK_POP): Add after "real" diagnostics, for
1680         use in the history chain.
1681         * c-family/c-pragma.c (handle_pragma_diagnostic): Add push/pop,
1682         allow these pragmas anywhere.
1683         * doc/extend.texi: Document pragma GCC diagnostic changes.
1685 2010-06-21  Jakub Jelinek  <jakub@redhat.com>
1687         * dwarf2out.c (add_linkage_name): New function.  Don't add
1688         anything to DW_TAG_member DIEs.
1689         (add_name_and_src_coords_attributes): Use it.
1690         (gen_variable_die): Call it for C++ static data members if
1691         specification is DW_TAG_member.
1693         * dwarf2out.c (base_type_die): Use DW_ATE_UTF for
1694         C++ char16_t and char32_t.
1696         * Makefile.in (build/genattrtab.o): Depend on vecprim.h.
1697         * genattrtab.c: Include vecprim.h.
1698         (cached_attrs, cached_attr_count, attrs_seen_once,
1699         attrs_seen_more_than_once, attrs_to_cache, attrs_cached_inside,
1700         attrs_cached_after): New variables.
1701         (find_attrs_to_cache): New function.
1702         (FLG_BITWISE, FLG_AFTER, FLG_INSIDE, FLG_OUTSIDE_AND): Define.
1703         (write_test_expr): Add attrs_cached argument, return it too,
1704         attempt to cache non-const attributes used more than once in
1705         a single case handling.
1706         (write_attr_get): Use find_attrs_to_cache, for caching candidates
1707         emit cached_* variables.  Adjust write_attr_set callers.
1708         (write_attr_set): Add attrs_cached attribute, use find_attrs_to_cache
1709         to find attributes that should be cached in this block.  Adjust
1710         write_test_expr callers.
1711         (write_attr_case): Clear attrs_to_cache.  Adjust write_attr_set
1712         callers.
1713         (make_automaton_attrs): Adjust write_test_expr caller.
1715         * Makefile.in (cfgexpand.o): Depend on $(INSN_ATTR_H).
1716         * genattrtab.c (check_tune_attr, find_tune_attr): New functions.
1717         (make_automaton_attrs): If find_tune_attr returns non-NULL,
1718         write separate internal_dfa_insn_code_* and insn_default_latency_*
1719         functions for each attribute's value and emit init_sched_attrs
1720         function and function pointers.
1721         * genattr.c (const_attrs, reservations): New variables.
1722         (gen_attr): Add const attributes to const_attrs vector.
1723         (check_tune_attr, find_tune_attr): New functions.
1724         (main): Add reservations to reservations vector.  If find_tune_attr
1725         returns true, add prototype for init_sched_attrs and make
1726         internal_dfa_insn_code and insn_default_latency function pointers,
1727         otherwise define init_sched_attrs as dummy macro.
1728         * cfgexpand.c: Include insn-attr.h.
1729         (gimple_expand_cfg): Call init_sched_attrs.
1731         * stmt.c (resolve_asm_operand_names): Fix handling of %%.
1733         PR target/44575
1734         * config/i386/i386.c (ix86_gimplify_va_arg): When copying
1735         va_arg from a set of register save slots into a temporary,
1736         if the container is bigger than type size, do the copying
1737         using smaller mode or using memcpy.
1739         PR bootstrap/44426
1740         * sel-sched-dump.h (sel_prepare_string_for_dot_label): Remove
1741         prototype.
1742         (sel_print_to_dot): Remove macro.
1743         (sel_print): Likewise.  New prototype.
1744         * sel-sched-dump.c (sel_prepare_string_for_dot_label): Make static.
1745         (sel_print): New function.
1747 2010-06-21  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
1749         * config/sol2.h (TARGET_OS_CPP_BUILTINS): Define
1750         __STDC_VERSION__=199901L, _XOPEN_SOURCE=600 for C++.
1752 2010-06-21  Nick Clifton  <nickc@redhat.com>
1754         * config/rx/rx.h (PTRDIFF_TYPE): Define.
1755         (SMALL_REGISTER_CLASS): Define (to zero).
1756         (PRINT_OPERAND): Delete.
1757         (PRINT_OPERAND_ADDRESS): Delete.
1758         * config/rx/rx-protos.h (rx_print_operand): Delete prototype.
1759         (rx_print_operand_address): Delete prototype.
1760         * config/rx/rx.c (rx_print_operand): Make static.
1761         Allow %H and %L to handle CONST_DOUBLEs.
1762         (rx_print_operand_address): Make static.
1763         (rx_gen_move_template): Rename local variable 'template' to
1764         out_template.
1765         (rx_function_arg): Do not pass unknown sized objects in registers.
1766         (TARGET_PRINT_OPERAND): Define.
1767         (TARGET_PRINT_OPERAND_ADDRESS): Define.
1769 2010-06-21  Jan Kratochvil  <jan.kratochvil@redhat.com>
1771         * Makefile.in (POD2MAN): Provide --date from $(DATESTAMP).
1773 2010-06-21  Kai Tietz  <kai.tietz@onevision.com>
1775         * config/i386/i386.c (ix86_compute_frame_layout): Avoid
1776         stack-alignment for simple leaf-functions.
1778 2010-06-20  Alexandre Oliva  <aoliva@redhat.com>
1780         * doc/install.texi: Document bootstrap-lto.
1782 2010-06-20  Alexandre Oliva  <aoliva@redhat.com>
1784         PR debug/44248
1785         * lto-streamer-in.c (input_bb): Leave debug stmts alone.
1786         (input_function): Drop them here, if VTA is disabled.
1788 2010-06-20  Uros Bizjak  <ubizjak@gmail.com>
1790         PR target/44546
1791         * config/i386/predicates.md (ix86_swapped_fp_comparsion_operator):
1792         New predicate.
1793         * config/i386/i386.md (*fp_jcc_8<mode>_387 and splitters): Use
1794         ix86_swapped_fp_comparsion_operator instead of
1795         ix86_fp_comparison_operator.
1797         (*fp_jcc_1_387): Rename from *fp_jcc_3_387.
1798         (*fp_jcc_1r_387): Rename from *fp_jcc_4_387.
1799         (*fp_jcc_2_387): Rename from *fp_jcc_5_387.
1800         (*fp_jcc_2r_387): Rename from *fp_jcc_6_387.
1801         (*fp_jcc_3_387): Rename from *fp_jcc_7_387.
1802         (*fp_jcc_4_<mode>_387): Rename from *fp_jcc_8<mode>_387.
1804 2010-06-20  Joseph Myers  <joseph@codesourcery.com>
1806         PR other/32998
1807         * opth-gen.awk: Generate definitions of OPT_SPECIAL_unknown,
1808         OPT_SPECIAL_program_name and OPT_SPECIAL_input_file.
1809         * opts-common.c (find_opt): Return OPT_SPECIAL_unknown on failure.
1810         (decode_cmdline_option): Update for this return value.  Set
1811         orig_option_with_args_text field.  Set arg field for unknown
1812         options.  Make static.
1813         (decode_cmdline_options_to_array): New.
1814         (prune_options): Update handling of find_opt return value.
1815         * opts.c (read_cmdline_option): Take decoded option.  Return void.
1816         (read_cmdline_options): Take decoded options.
1817         (decode_options): Add parameters for decoded options.  Use
1818         decode_cmdline_options_to_array.  Use decoded options for -O
1819         scan.  Use integral_argument for -O parameters.  Update call to
1820         read_cmdline_options.
1821         (enable_warning_as_error): Update handling of find_opt return value.
1822         * opts.h: Update comment on unknown options.
1823         (struct cl_decoded_option): Update comments on opt_index and arg.
1824         Add orig_option_with_args_text.
1825         (decode_cmdline_option): Remove.
1826         (decode_cmdline_options_to_array): Declare.
1827         (decode_options): Update prototype.
1828         * toplev.c (save_argv): Remove.
1829         (save_decoded_options, save_decoded_options_count): New.
1830         (read_integral_parameter): Remove.
1831         (print_switch_values): Use decoded options.
1832         (toplev_main): Don't set save_argv.  Update call to decode_options.
1833         * toplev.h (read_integral_parameter): Remove.
1834         * varasm.c (elf_record_gcc_switches): Don't handle holding back names.
1836 2010-06-19  Richard Earnshaw  <rearnsha@arm.com>
1838         PR target/44072
1839         * arm.md (cmpsi2_addneg): Prefer emitting adds to subs with a negative
1840         immediate.
1841         * constraints.md (Pw, Px): New constraints.
1842         * thumb2.md (cmpsi2_addneg peephole2): New peepholes.
1844 2010-06-19  H.J. Lu  <hongjiu.lu@intel.com>
1846         * config/i386/sse.md (fma4modesuffixf4): Removed.
1847         (ssemodesuffixf2s): Likewise.
1848         (ssemodesuffixf4): Likewise.
1849         (ssemodesuffixf2c): Likewise.
1850         (ssescalarmodesuffix2s): Likewise.
1851         (avxmodesuffixf2c): Likewise.
1852         (ssemodesuffix): New.
1853         (ssescalarmodesuffix): Likewise.
1854         Update patterns with ssemodesuffix and ssescalarmodesuffix.
1856 2010-06-19  Philip Herron  <herron.philip@googlemail.com>
1858         * c-decl.c (c_write_global_declarations): Don't check flag_syntax_only.
1860 2010-06-18  H.J. Lu  <hongjiu.lu@intel.com>
1862         * stor-layout.c (debug_rli): Remove unused local variables.
1864 2010-06-18  Eric Botcazou  <ebotcazou@adacore.com>
1866         PR rtl-optimization/40900
1867         * expr.c (expand_expr_real_1) <SSA_NAME>: Fix long line.  Save the
1868         original expression for later reuse.
1869         <expand_decl_rtl>: Use promote_function_mode to compute the signedness
1870         of the promoted RTL for a SSA_NAME on the LHS of a call statement.
1872 2010-06-18  Anatoly Sokolov  <aesok@post.ru>
1874         * double-int.h (double_int_to_shwi, double_int_to_uhwi,
1875         double_int_fits_in_uhwi_p): Implement as static inline.
1876         (double_int_xor): New inline function.
1877         (double_int_lrotate, double_int_rrotate, double_int_max,
1878         double_int_umax, double_int_smax, double_int_min, double_int_umin,
1879         double_int_smin): Declare.
1880         (lrotate_double, rrotate_double): Remove declaration.
1881         * double-int.c (double_int_fits_in_uhwi_p, double_int_to_shwi,
1882         double_int_to_uhwi, lrotate_double, rrotate_double): Remove function.
1883         (double_int_lrotate, double_int_rrotate, double_int_max,
1884         double_int_umax, double_int_smax, double_int_min, double_int_umin,
1885         double_int_smin): New function.
1886         * fold-const.c (int_const_binop): Clean up, use double_int_*
1887         functions.
1888         * simplify-rtx.c (simplify_const_binary_operation): Clean up, use
1889         double_int_* and immed_double_int_const functions.
1891 2010-06-18  Nathan Froyd  <froydnj@codesourcery.com>
1893         * function.h (types_used_by_cur_var_decl): Change type to a VEC.
1894         * function.c (types_used_by_cur_var_decl): Likewise.
1895         (used_types_insert): Adjust for new type of types_used_by_cur_var_decl.
1897 2010-06-18  Nathan Froyd  <froydnj@codesourcery.com>
1899         * tree.h (record_layout_info): Change type of pending_statics field
1900         to a VEC.
1901         * stor-layout.c (start_record_layout): Store NULL into
1902         pending_statics.
1903         (debug_rli): Call debug_vec_tree instead of debug_tree.
1904         (place_field): Likewise.
1905         (finish_record_layout): Likewise.
1907 2010-06-18  Alan Modra  <amodra@gmail.com>
1909         * config/rs6000/linux64.h (SET_CMODEL): Don't expand to empty.
1911 2010-06-17  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
1913         PR target/43740
1914         * config/pa/pa.c (emit_move_sequence): Don't infer REG_POINTER flag
1915         for SET source operand from SET destination operand.
1917 2010-06-17  Bernd Schmidt  <bernds@codesourcery.com>
1919         PR rtl-optimization/39871
1920         * reload1.c (init_eliminable_invariants): For flag_pic, disable
1921         equivalences only for constants that aren't LEGITIMATE_PIC_OPERAND_P.
1922         (function_invariant_p): Rule out a plus of frame or arg pointer with
1923         a SYMBOL_REF.
1924         * ira.c (find_reg_equiv_invariant_const): Likewise.
1926 2010-06-17  Gunther Nikl  <gnikl@users.sourceforge.net>
1928         * config/rs6000/rs6000.c (print_operand) <'K'>: Also use
1929         print_operand_address and puts to output the operand for CONST.
1931 2010-06-17  Jakub Jelinek  <jakub@redhat.com>
1933         PR debug/44572
1934         * dwarf2out.c (dwarf2out_debug_hooks): Add entry for begin_epilogue
1935         hook.
1937 2010-06-17  Nathan Froyd  <froydnj@codesourcery.com>
1939         * v850-protos.h (print_operand): Delete.
1940         (print_operand_address): Delete.
1941         * v850.h (PRINT_OPERAND): Delete.
1942         (PRINT_OPERAND_PUNCT_VALID_P): Delete.
1943         (PRINT_OPERAND_ADDRESS): Delete.
1944         * v850.c (print_operand_address): Rename to...
1945         (v850_print_operand_address): ...this.  Make static. Call
1946         v850_print_operand.
1947         (print_operand): Rename to...
1948         (v850_print_operand): ...this.  Make static.  Call
1949         v850_print_operand_address.
1950         (v850_print_operand_punct_valid_p): New function.
1951         (TARGET_PRINT_OPERAND, TARGET_PRINT_OPERAND_ADDRESS): Define.
1952         (TARGET_PRINT_OPERAND_PUNCT_VALID_P): Define.
1954 2010-06-17  Nathan Froyd  <froydnj@codesourcery.com>
1956         * config/sh/sh-protos.h (print_operand): Delete.
1957         (print_operand_address): Delete.
1958         * config/sh/sh.h (PRINT_OPERAND): Delete.
1959         (PRINT_OPERAND_PUNCT_VALID_P): Delete.
1960         (PRINT_OPERAND_ADDRESS): Delete.
1961         * config/sh/sh.c (sh_print_operand_address): Make static.
1962         (sh_print_operand): Make static.  Call sh_print_operand_address
1963         and sh_print_operand.
1964         (sh_print_operand_punct_valid_p): New function.
1965         (TARGET_PRINT_OPERAND, TARGET_PRINT_OPERAND_ADDRESS): Define.
1966         (TARGET_PRINT_OPERAND_PUNCT_VALID_P): Define.
1968 2010-06-17  Nathan Froyd  <froydnj@codesourcery.com>
1970         * config/mcore/mcore-protos.h (mcore_print_operand): Delete.
1971         (mcore_print_operand_address): Delete.
1972         * config/mcore/mcore.h (PRINT_OPERAND): Delete.
1973         (PRINT_OPERAND_PUNCT_VALID_P): Delete.
1974         (PRINT_OPERAND_ADDRESS): Delete.
1975         * config/mcore/mcore.c (mcore_print_operand_address): Make static.
1976         (mcore_print_operand): Make static.
1977         (mcore_print_operand_punct_valid_p): New function.
1978         (TARGET_PRINT_OPERAND, TARGET_PRINT_OPERAND_ADDRESS): Define
1979         (TARGET_PRINT_OPERAND_PUNCT_VALID_P): Define.
1981 2010-06-17  Nathan Froyd  <froydnj@codesourcery.com>
1983         * config/m68hc11/m68hc11-protos.h (print_operand): Delete.
1984         (print_operand_address): Delete.
1985         * config/m68hc11/m68hc11.h (PRINT_OPERAND): Delete.
1986         (PRINT_OPERAND_ADDRESS): Delete.
1987         * config/m68hc11/m68hc11.c (m68hc11_print_operand_address): Make
1988         static.
1989         (m68hc11_print_operand): Make static.
1990         (TARGET_PRINT_OPERAND, TARGET_PRINT_OPERAND_ADDRESS): Define.
1992 2010-06-17  Nathan Froyd  <froydnj@codesourcery.com>
1994         * config/m32r/m32r-protos.h (m32r_print_operand): Delete.
1995         (m32r_print_operand_address): Delete.
1996         * config/m32r/m32r.h (m32r_punct_chars): Delete.
1997         (PRINT_OPERAND): Delete.
1998         (PRINT_OPERAND_PUNCT_VALID_P): Delete.
1999         (PRINT_OPERAND_ADDRESS): Delete.
2000         * config/m32r/m32r.c (m32r_punct_chars): Make static.
2001         (m32r_print_operand_address): Make static.
2002         (m32r_print_operand): Make static.
2003         (m32r_print_operand_punct_valid_p): New function.
2004         (TARGET_PRINT_OPERAND, TARGET_PRINT_OPERAND_ADDRESS):
2005         (TARGET_PRINT_OPERAND_ADDRESS): Define.
2007 2010-06-17  Nathan Froyd  <froydnj@codesourcery.com>
2009         * config/iq2000/iq2000-protos.h (print_operand): Delete.
2010         (print_operand_address): Delete.
2011         * config/iq2000/iq2000.h (PRINT_OPERAND): Delete.
2012         (PRINT_OPERAND_PUNCT_VALID_P): Delete.
2013         (PRINT_OPERAND_ADDRESS): Delete.
2014         (iq2000_print_operand_punct): Delete.
2015         * config/iq2000/iq2000.c (iq2000_print_operand_punct): Make static.
2016         (iq2000_print_operand_address): Make static.
2017         (iq2000_print_operand): Make static.
2018         (iq2000_print_operand_punct_valid_p): New function.
2019         (TARGET_PRINT_OPERAND, TARGET_PRINT_OPERAND_ADDRESS):
2020         (TARGET_PRINT_OPERAND_ADDRESS): Define.
2022 2010-06-17  Nathan Froyd  <froydnj@codesourcery.com>
2024         * config/frv/frv-protos.h (frv_print_operand): Delete.
2025         (frv_print_operand_address): Delete.
2026         * config/frv/frv.h (PRINT_OPERAND): Delete.
2027         (PRINT_OPERAND_PUNCT_VALID_P): Delete.
2028         (PRINT_OPERAND_ADDRESS): Delete.
2029         * config/frv/frv.c (frv_print_operand_address): Make static.
2030         (frv_print_operand): Make static.
2031         (frv_print_operand_punct_valid_p): New function.
2032         (TARGET_PRINT_OPERAND, TARGET_PRINT_OPERAND_ADDRESS):
2033         (TARGET_PRINT_OPERAND_ADDRESS): Define.
2035 2010-06-17  Nathan Froyd  <froydnj@codesourcery.com>
2037         * tree.h (vec_member): Declare.
2038         * tree.c (vec_member): Define.
2040 2010-06-17  Richard Guenther  <rguenther@suse.de>
2042         * tree-flow-inline.h (array_ref_contains_indirect_ref): Remove.
2043         * tree-flow.h (array_ref_contains_indirect_ref): Likewise.
2045 2010-06-17  Richard Guenther  <rguenther@suse.de>
2047         * tree-inline.c (declare_return_variable): Remove bogus code.
2049 2010-06-17  Richard Guenther  <rguenther@suse.de>
2051         * gimplify.c (gimplify_bind_expr): Always promote complex
2052         and vector variables to registers if possible.
2054 2010-06-17  Richard Guenther  <rguenther@suse.de>
2056         * expr.c (get_inner_reference): Use double_int for bit_offset
2057         calculation.
2059 2010-06-16  DJ Delorie  <dj@redhat.com>
2061         * common.opt (-fstrict-volatile-bitfields): new.
2062         * doc/invoke.texi: Document it.
2063         * fold-const.c (optimize_bit_field_compare): For volatile
2064         bitfields, use the field's type to determine the mode, not the
2065         field's size.
2066         * expr.c (expand_assignment): Likewise.
2067         (get_inner_reference): Likewise.
2068         (expand_expr_real_1): Likewise.
2069         * expmed.c (store_fixed_bit_field): Likewise.
2070         (extract_bit_field_1): Likewise.
2071         (extract_fixed_bit_field): Likewise.
2073 2010-06-16  Richard Guenther  <rguenther@suse.de>
2075         * tree-inline.c (remap_gimple_op_r): Recurse using remap_gimple_op_r.
2077 2010-06-16  Douglas B Rupp  <rupp@gnat.com>
2079         * config/ia64/vms.h (ASM_OUTPUT_DWARF_DELTA_UNITS): Remove.
2080         (ASM_OUTPUT_DWARF_VMS_DELTA: Define new macro.
2081         * dbxout.c (gcc_debug_hooks): New entry begin_epilogue.
2082         * debug.c: Likewise.
2083         * sdbout.c: Likewise.
2084         * vmsdbgout.c: Likewise.
2085         * debug.h: Likewise. (dwarf2out_vms_{begin,end}_prologue): Declare.
2086         * doc/tm.texi (ASM_OUTPUT_DWARF_VMS_DELTA): Document.
2087         * dwarf2asm.c (dw2_asm_output_vms_delta): New function.
2088         (ASM_OUTPUT_DWARF_VMS_DELTA): Call it.
2089         * dwarf2asm.h (dw2_asm_output_vms_delta): Declare.
2090         * dwarf2out.c (dw_fde_struct): New fields
2091         dw_fde_vms_{end,begin}_prologue.
2092         (PROLOGUE_END_LABEL, EPILOGUE_BEGIN_LABEL): New macros.
2093         (dwarf2out_begin_prologue): Set dw_fde_struct defaults for above.
2094         (dwarf2out_vms_end_prologue): New function.
2095         (dwarf2out_vms_begin_epilogue): New function.
2096         (dw_val_struct): New value dw_val_class_vms_delta.
2097         (gcc_debug_hooks): New entry begin_epilogue. Set end_prologue,
2098         begin_epilogue for VMS.
2099         (AT_vms_delta1, AT_vms_delta2, add_AT_vms_delta): Declare
2100         new static functions.
2101         (dwarf_attr_name): New cases DW_AT_HP_{prologue,epilogue}.
2102         (AT_vms_delta1, AT_vms_delta2, add_AT_vms_delta): New
2103         static functions.
2104         (print_die): New case dw_val_class_vms_delta.
2105         (attr_checksum): Likewise.
2106         (same_dw_val_p: Likewise.
2107         (size_of_die): Likewise.
2108         (value_format): Likewise.
2109         (output_die): Likewise.
2110         (gen_subprogram_die): Call add_AT_vms_delta on VMS.
2111         (dwarf2out_begin_epilogue): Rename to dwarf2out_cfi_begin_epilogue
2112         * dwarf2out.h (dwarf2out_begin_epilogue): Rename to
2113         dwarf2out_cfi_begin_epilogue
2114         * final.c (final_scan_insn): Likewise. Call begin_epilogue.
2116 2010-06-16  Nathan Froyd  <froydnj@codesourcery.com>
2118         * config/cris/cris-protos.h (cris_print_operand): Delete.
2119         (cris_print_operand_address): Delete.
2120         * config/cris/cris.h (PRINT_OPERAND): Delete.
2121         (PRINT_OPERAND_PUNCT_VALID_P): Delete.
2122         (PRINT_OPERAND_ADDRESS): Delete.
2123         * config/cris/cris.c (cris_print_operand_address): Make static.
2124         (cris_print_operand): Make static.
2125         (cris_print_operand_punct_valid_p): New function.
2126         (TARGET_PRINT_OPERAND, TARGET_PRINT_OPERAND_ADDRESS):
2127         (TARGET_PRINT_OPERAND_ADDRESS): Define.
2129 2010-06-16  Nathan Froyd  <froydnj@codesourcery.com>
2131         * config/arm/arm-protos.h (arm_print_operand): Delete.
2132         (arm_print_operand_address): Delete.
2133         * config/arm/arm.h (PRINT_OPERAND): Delete.
2134         (PRINT_OPERAND_PUNCT_VALID_P): Delete.
2135         (PRINT_OPERAND_ADDRESS, ARM_PRINT_OPERAND_ADDRESS):
2136         (THUMB_PRINT_OPERAND_ADDRESS): Delete and move code to...
2137         * config/arm/arm.c (arm_print_operand_address): ...here.  New function.
2138         (arm_print_operand): Make static.
2139         (arm_print_operand_punct_valid_p): New function.
2140         (TARGET_PRINT_OPERAND, TARGET_PRINT_OPERAND_ADDRESS):
2141         (TARGET_PRINT_OPERAND_ADDRESS): Define.
2143 2010-06-16  Nick Clifton  <nickc@redhat.com>
2145         * config/rx/constraints.md (NEGint4): New constraint.
2146         * config/rx/rx.md (attr cc): Add set_zsc.
2147         (cbranchsf4): Only test for -fnon-call-exceptions if cfun has been
2148         initialised.
2149         (cmpsf): Likewise.
2150         (call_internal): Clobber the cc0 register.
2151         (call_value_internal): Likewise.
2152         (cstoresi4): Likewise.
2153         (movsieq): Likewise.
2154         (movsine): Likewise.
2155         (addsi3): Add alternative to handle small negative constants.
2156         (sunsi3): Likewise.
2157         (addsi3): Do not set the O bit in the cc0 register.
2158         (adddi3): Likewise.
2159         (subsi3): Likewise.
2160         (subdi3): Likewise.
2161         (andsi3): Reorder alternatives to prefer shorter forms.
2162         (mulsi3): Likewise.
2163         (iorsi3): Likewise.
2164         (negsi2): Note that the cc0 flags are set.
2165         (rotlsi3): Note that only the Z and S bits are set in cc0.
2166         (lshrsi3): Likewise.
2167         (ashlsi3): Likewise.
2168         (subsf3): Use %Q for the MEM operand.
2169         (fix_truncsfsi2): Likewise.
2170         (floatsisf2): Likewise.
2171         (bitset): Remove early clobber from destination.
2172         (bitset_in_memory): Likewise.
2173         (lrintsf2): Clobber the cc0 register.
2174         * config/rx/rx.c (rx_notice_update_cc): Handle CC_SET_ZSC.
2175         (rx_print_operand): Handle %N.
2177 2010-06-16  Jan Hubicka  <jh@suse.cz>
2179         * df-core.c (df_compact_blocks): Free problem_temps vector.
2181 2010-06-16  Martin Jambor  <mjambor@suse.cz>
2183         PR tree-optimization/43905
2184         * tree-sra.c: Include tree-inline.h.
2185         (create_abstract_origin): Removed.
2186         (modify_function): Version the call graph node instead of creating
2187         abstract origins and dealing with same_body aliases.
2188         * tree-sra.c (ipa_sra_preliminary_function_checks): Check whether the
2189         function is versionable.
2190         * Makefile.in (tree-sra.o): Add TREE_INLINE_H to dependencies.
2192 2010-06-16  Maxim Kuvyrkov  <maxim@codesourcery.com>
2194         * config/mips/linux64.h (BIONIC_DYNAMIC_LINKERN32): Define.
2195         (CHOOSE_DYNAMIC_LINKER): Update.
2197 2010-06-15  Uros Bizjak  <ubizjak@gmail.com>
2199         * config/i386/i386.c (*prefetch_sse_<mode>):  Macroize insn from
2200         *prefetch_sse and *prefetch_sse_rex using P mode iterator.
2201         (*prefetch_3dnow_<mode>): Ditto from *prefetch_3dnow and
2202         *prefetch_3dnow_rex.
2204 2010-06-15  Anatoly Sokolov  <aesok@post.ru>
2206         * target.h (struct asm_out):Add declare_constant_name field.
2207         * target-def.h (TARGET_ASM_DECLARE_CONSTANT_NAME): Define.
2208         (TARGET_INITIALIZER): Use TARGET_ASM_DECLARE_CONSTANT_NAME.
2209         * output.h (default_asm_declare_constant_name): Declare.
2210         (assemble_label): Update prototype.
2211         * varasm.c (assemble_constant_contents): Use
2212         targetm.asm_out.declare_constant_name target hook.
2213         (assemble_label): Add 'file' argument.
2214         (default_asm_declare_constant_name): New function.
2215         * system.h (ASM_DECLARE_CONSTANT_NAME): Poison.
2216         * doc/tm.texi (ASM_DECLARE_CONSTANT_NAME): Remove.
2217         (TARGET_ASM_DECLARE_CONSTANT_NAME): Document it.
2219         * config/darwin-protos.h (darwin_asm_declare_constant_name): Declare.
2220         * config/darwin.c (darwin_asm_declare_constant_name): New function.
2221         (machopic_output_indirection): Update assemble_label argument list.
2222         * config/darwin.h (ASM_DECLARE_CONSTANT_NAME): Remove.
2223         (TARGET_ASM_DECLARE_CONSTANT_NAME): Define.
2225 2010-06-15  Sebastian Pop  <sebastian.pop@amd.com>
2227         PR middle-end/44391
2228         * graphite-clast-to-gimple.c (graphite_create_new_loop_guard): Use
2229         size_one_node for pointer types.  Do not call gmp_cst_to_tree.
2231 2010-06-15  Richard Guenther  <rguenther@suse.de>
2233         * tree-ssa-pre.c (eliminate): Handle PHI elimination to constants.
2235 2010-06-15  Paul Brook  <paul@codesourcery.com>
2237         * config/arm/arm.c (use_vfp_abi): Add sorry() for Thumb-1
2238         hard-float ABI.
2240 2010-06-15  Alexandre Oliva  <aoliva@redhat.com>
2242         * tree-vect-patterns.c (vect_pattern_recog_1): Bail out if we
2243         don't get a vector type for output.
2245 2010-06-15  Jakub Jelinek  <jakub@redhat.com>
2247         PR fortran/44536
2248         * langhooks.h (struct lang_hooks_for_decls): Add omp_report_decl.
2249         * langhooks-def.h (LANG_HOOKS_OMP_REPORT_DECL): Define.
2250         (LANG_HOOKS_DECLS): Add it.
2251         * gimplify.c (omp_notice_variable): Call
2252         lang_hooks.decls.omp_report_decl.
2254 2010-06-15  Martin Jambor  <mjambor@suse.cz>
2256         PR lto/44464
2257         * tree-sra.c (replace_removed_params_ssa_names): Call release_ssa_name
2258         on the newly dead SSA name.
2260 2010-06-15  Alan Modra  <amodra@gmail.com>
2262         * doc/invoke.texi: Add mcmodel to powerpc options.
2263         * configure.ac: Add HAVE_LD_LARGE_TOC test.
2264         * configure: Regenerate.
2265         * config.in: Regenerate.
2266         * config/rs6000/linux64.opt (mcmodel): New.
2267         * config/rs6000/linux64.h (TARGET_USES_LINUX64_OPT): Define.
2268         (TARGET_CMODEL, SET_CMODEL): Define.
2269         (SUBSUBTARGET_OVERRIDE_OPTIONS): Check user -mcmodel choice,
2270         select CMODEL_MEDIUM default.
2271         * config/rs6000/rs6000.h (enum rs6000_cmodel): New.
2272         (TARGET_CMODEL): Define default.
2273         * config/rs6000/rs6000.c (cmodel): New variable.
2274         (rs6000_explicit_options): Add cmodel field.
2275         (rs6000_handle_option): Handle -mcmodel.
2276         (create_TOC_reference): Add largetoc_reg param.  Generate high,
2277         lo_sum rtl for CMODEL_MEDIUM and CMODEL_LARGE.  Update all callers.
2278         (rs6000_delegitimize_address): Recognise new toc reference rtl
2279         and minimal-toc rtl.
2280         (rs6000_legitimize_reload_address): Handle new toc references.
2281         (print_operand_address): Handle legitimate_constant_pool_address_p
2282         match before lo_sum.
2283         (rs6000_eliminate_indexed_memrefs): Tidy.
2284         (rs6000_emit_move): Tweak threshold for inlining constants.
2285         Keep rs6000_emit_allocate_stack large stack frame offsets
2286         loaded into r0 inline.
2287         (rs6000_generate_compare <cmptf_internal2>): One more clobber.
2288         (tocrel_base, tocrel_offset): New variables.
2289         (toc_relative_expr_p): Set them here.
2290         (print_operand_address): Skip over any offset on constant pool address.
2291         (rs6000_output_addr_const_extra): Print tocrel_offset before @toc.
2292         (rs6000_mode_dependent_address <LO_SUM>): False for new toc refs.
2293         (offsettable_ok_by_alignment): New function.
2294         (rs6000_emit_move): Address suitably aligned local symbol_refs
2295         relative to the toc pointer for -mcmodel=medium.
2296         (legitimate_constant_pool_address_p): Make param const_rtx.  Add
2297         strict param.  Allow lo_sum version of addressing.  Verify reg
2298         used for -mminimal-toc and -mcmodel != small.  Update all callers.
2299         * config/rs6000/constraints.md: Update for above change.
2300         * config/rs6000/predicates.md: Likewise.
2301         * config/rs6000/rs6000.md (tls_gd_aix): Generate -mcmodel=medium/large
2302         code.
2303         (tls_gd): Split for -mcmodel=medium/large.
2304         (tls_gd_high, tls_gd_low): New.
2305         (tls_ld_aix, tls_ld, tls_ld_high, tls_ld_low): Similarly.
2306         (tls_got_dtprel, tls_got_dtprel_high, tls_got_dtprel_low): Similarly.
2307         (tls_got_tprel, tls_got_tprel_high, tls_got_tprel_low): Similarly.
2308         (largetoc_high, largetoc_low): New.
2309         (cmptf_internal2): Add clobber.
2310         * config/rs6000/rs6000-protos.h: Update.
2312 2010-06-14  Changpeng Fang  <changpeng.fang@amd.com>
2314         * tree-ssa-loop-prefetch.c (nothing_to_prefetch_p): New.  Return
2315         true if no prefetch is going to be generated for a given group.
2316         (estimate_prefetch_count): Use prefetch_mod and unroll_factor to
2317         estimate the prefetch_count.
2318         (loop_prefetch_arrays): Call nothing_to_prefetch_p; estimate the
2319         prefetch count by considering the unroll_factor and prefetch_mod
2320         for is_loop_prefetching_profitable.
2322 2010-06-14  Andreas Schwab  <schwab@linux-m68k.org>
2324         * config/m68k/m68k.c (m68k_delegitimize_address): Don't do
2325         anything if the argument is not a MEM.
2327 2010-06-14  Alexandre Oliva  <aoliva@redhat.com>
2329         PR debug/43650
2330         PR debug/44181
2331         PR debug/44247
2332         * tree-ssa-loop-manip.c (tree_transform_and_unroll_loop): Skip
2333         debug stmts.
2334         (canonicalize_loop_ivs): Likewise.
2336 2010-06-14  Alexandre Oliva  <aoliva@redhat.com>
2338         PR debug/43656
2339         * haifa-sched.c (setup_insn_reg_pressure_info,
2340         update_register_pressure): Reject debug insns.
2341         (ready_sort): Don't setup reg pressure for debug insns.
2342         (schedule_insn): Don't update reg pressure for debug insns.
2344 2010-06-14  Richard Guenther  <rguenther@suse.de>
2346         * lto-streamer.c (cached_bp): Remove.
2347         (bitpack_delete): Likewise.
2348         (bitpack_create): Likewise.
2349         (bp_get_next_word): Likewise.
2350         (bp_pack_value, bp_unpack_value): Move ...
2351         * lto-streamer.h (bp_pack_value, bp_unpack_value): ... here.
2352         Re-implement.
2353         (struct bitpack_d): Likewise.
2354         (bitpack_create, lto_output_bitpack, lto_input_bitpack):
2355         New inline functions.
2356         * lto-streamer-out.c (lto_output_bitpack): Remove.
2357         (pack_ts_base_value_fields): Adjust.  Avoid conditional bitpacking.
2358         (pack_value_fields): Adjust.
2359         (lto_write_tree): Likewise.
2360         (output_gimple_stmt): Likewise.
2361         (output_function): Likewise.
2362         * lto-streamer-in.c (input_gimple_stmt): Adjust.
2363         (input_function): Likewise.
2364         (unpack_ts_base_value_fields): Adjust.  Avoid conditional bitpacking.
2365         (lto_input_bitpack): Remove.
2366         (lto_materialize_tree): Adjust.
2367         * Makefile.in (ipa-prop.o): Add $(LTO_STREAMER_H) dependency.
2368         * lto-cgraph.c (lto_output_edge): Adjust.
2369         (lto_output_node): Likewise.
2370         (lto_output_varpool_node): Likewise.
2371         (lto_output_ref): Likewise.
2372         (input_node): Likewise.
2373         (input_varpool_node): Likewise.
2374         (input_ref): Likewise.
2375         (input_edge): Likewise.
2376         (output_node_opt_summary): Likewise.
2377         (input_node_opt_summary): Likewise.
2378         * ipa-pure-const.c (pure_const_write_summary): Likewise.
2379         (pure_const_read_summary): Likewise.
2380         * ipa-prop.c (ipa_write_indirect_edge_info): Likewise.
2381         (ipa_read_indirect_edge_info): Likewise.
2382         (ipa_write_node_info): Likewise.
2383         (ipa_read_node_info): Likewise.
2385 2010-06-14  H.J. Lu  <hongjiu.lu@intel.com>
2387         PR target/44534
2388         * config/i386/sse.md (vec_extract_lo_<mode>): Replace 0x1 with 0x0.
2389         (vec_extract_lo_v16hi): Likewise.
2390         (vec_extract_lo_v32qi): Likewise.
2392 2010-06-14  Jakub Jelinek  <jakub@redhat.com>
2394         PR bootstrap/44426
2395         * tree.h (build_call_expr): Don't define as vararg macro, instead
2396         add a prototype.
2397         * builtins.c (build_call_nofold): Remove.
2398         (expand_builtin_int_roundingfn, expand_builtin_pow,
2399         expand_builtin_mempcpy_args, expand_builtin_stpcpy,
2400         expand_builtin_memset_args, expand_builtin_strcmp,
2401         expand_builtin_strncmp, expand_builtin_memory_chk): Use
2402         build_call_nofold_loc instead of build_call_nofold.
2403         (build_call_expr): New function.
2405         PR tree-optimization/44508
2406         * tree-ssa-propagate.h (substitute_and_fold): Add DO_DCE argument.
2407         * tree-ssa-propagate.c (substitute_and_fold): If !DO_DCE,
2408         don't eliminate trivially dead stmts.
2409         * tree-vrp.c (vrp_finalize): Pass false as last argument
2410         to substitute_and_fold.
2411         * tree-ssa-copy.c (fini_copy_prop): Pass true as last argument
2412         to substitute_and_fold.
2413         * tree-ssa-ccp.c (ccp_finalize): Likewise.
2415         PR bootstrap/44509
2416         * c-config-lang.in (gtfiles): Add c-family/c-cppbuiltin.c.
2417         * c-family/c-cppbuiltin.c: Include gt-c-family-c-cppbuiltin.h.
2418         (lazy_hex_fp_values, lazy_hex_fp_value_count): Add GTY(()) markers.
2419         (lazy_hex_fp_value, builtin_define_with_hex_fp_value): Use
2420         ggc_strdup instead of xstrdup.
2422 2010-06-14  Ira Rosen  <irar@il.ibm.com>
2424         PR tree-optimization/44507
2425         * tree-vect-loop.c (get_initial_def_for_reduction): Use -1
2426         to build initial vector for BIT_AND_EXPR.
2427         * tree-vect-slp.c (vect_get_constant_vectors): Likewise.
2429 2010-06-14  Jakub Jelinek  <jakub@redhat.com>
2431         * config/s390/s390.md (*mov<mode>_64 DD_DF, mov<mode>): Properly
2432         adjust z10prop set_attr.
2434 2010-06-13  Jan Hubicka  <jh@suse.cz>
2436         * bitmap.c (bitmap_and, bitmap_and_into, bitmap_and_compl,
2437         bitmap_and_compl_into, bitmap_compl_and_into, bitmap_ior,
2438         bitmap_ior_into, bitmap_xor, bitmap_xor_into,
2439         bitmap_ior_and_compl, bitmap_ior_and_compl): Turn internal
2440         datastructure checks into checking asserts.
2441         * rtlanal.c (find_reg_note): Use gcc_checking_assert.
2442         * tree-ssa-sccvn.c (VN_INFO): Likewise.
2443         * df-scan.c (df_reorganize_refs_by_reg_by_reg, df_install_ref,
2444         df_ref_create_structure): Likewise.
2445         * alloc-pool.c (create_alloc_pool, empty_alloc_pool, pool_alloc,
2446         pool_free): Use gcc_checking_assert.
2447         * alias.c (get_alias_set): Likewise.
2448         * var-tracking.c (variable_htab_free, shared_hash_copy,
2449         canonicalize_values_mark, variable_merge_over_cur): Likewise.
2450         * lto-streamer.c (bp_unpack_value): Likewise.
2452 2010-06-13  Richard Guenther  <rguenther@suse.de>
2454         * lto-streamer-in.c (lto_input_ts_type_tree_pointers):
2455         Do not stream but initialize TYPE_CANONICAL to NULL.
2456         (lto_output_ts_type_tree_pointers): Do not stream TYPE_CANONICAL.
2457         * gimple.c (gimple_types_compatible_p): Disregard
2458         TYPE_STRUCTURAL_EQUALITY_P.
2459         (gimple_register_type): Use TYPE_CANONICAL as cache.
2460         * lto-streamer.c (lto_record_common_node): Zero TYPE_CANONICAL
2461         before registering common types.
2462         * config/i386/i386.c (ix86_function_arg_boundary): Do not
2463         use TYPE_CANONICAL, instead use TYPE_MAIN_VARIANT.
2464         * tree.h (TYPE_CANONICAL): Clarify documentation.
2466 2010-06-13  Anatoly Sokolov  <aesok@post.ru>
2468         * config/ia64/ia64.h (FUNCTION_VALUE_REGNO_P, FUNCTION_VALUE,
2469         LIBCALL_VALUE): Remove macros.
2470         * config/ia64/ia64-protos.h (ia64_function_value): Remove.
2471         * config/ia64/ia64.c (TARGET_FUNCTION_VALUE, TARGET_LIBCALL_VALUE,
2472         TARGET_FUNCTION_VALUE_REGNO_P): Define.
2473         (ia64_libcall_value, ia64_function_value_regno_p): New functions.
2474         (ia64_function_value): Make static. Handle receiving the function
2475         type in 'fn_decl_or_type' argunent. Add 'outgoing' argument.
2477 2010-06-12  Jan Hubicka  <jh@suse.cz>
2479         * cse.c (cse_extended_basic_block): Move optimize_bb_for_speed_p
2480         at correct place.
2482 2010-06-12  Bernd Schmidt  <bernds@codesourcery.com>
2484         * config/arm/arm.c (thumb2_reorg): Fix errors in previous change.
2486 2010-06-12  Jan Hubicka  <jh@suse.cz>
2488         * df-core.c (df_clear_bb_info): New function.
2489         (df_set_blocks): bb_info is always allocated.
2490         (df_get_bb_info): Use block_info_elt_size.
2491         (df_set_bb_info): Likewise.
2492         (df_compact_blocks): Update for new block_info.
2493         (grow_bb_info): New function.
2494         * df-problems.c (df_grow_bb_info): Move to df-core.c
2495         (df_rd_set_bb_info): Remove.
2496         (df_rd_free_bb_info): Do not free block pool.
2497         (df_rd_alloc): Do not create pool, use check for
2498         obstack presence instead of NULL pointer for new blocks.
2499         (df_rd_free): DO not free alloc pool; clear block_info.
2500         (problem_RD): Add size of block info structure.
2501         (df_lr_set_bb_info): Remove.
2502         (df_lr_free_bb_info): Do not free block pool.
2503         (df_lr_alloc): Do not create pool, use check for
2504         obstack presence instead of NULL pointer for new blocks.
2505         (df_lr_free): DO not free alloc pool; clear block_info.
2506         (problem_LR): Add size of block info structure.
2507         (df_live_set_bb_info): Remove.
2508         (df_live_free_bb_info): Do not free block pool.
2509         (df_live_alloc): Do not create pool, use check for
2510         obstack presence instead of NULL pointer for new blocks.
2511         (df_live_free): DO not free alloc pool; clear block_info.
2512         (problem_LIVE): Add size of block info structure.
2513         (problem_CHAIN): Add size of block info structure.
2514         (df_byte_lr_set_bb_info): Remove.
2515         (df_byte_lr_free_bb_info): Do not free block pool.
2516         (df_byte_lr_alloc): Do not create pool, use check for
2517         obstack presence instead of NULL pointer for new blocks.
2518         (df_byte_lr_free): DO not free alloc pool; clear block_info.
2519         (problem_BYTE_LR): Add size of block info structure.
2520         (problem_NOTE): Add size of block info structure.
2521         (df_byte_MD_set_bb_info): Remove.
2522         (df_byte_MD_free_bb_info): Do not free block pool.
2523         (df_byte_MD_alloc): Do not create pool, use check for
2524         obstack presence instead of NULL pointer for new blocks.
2525         (df_byte_MD_free): DO not free alloc pool; clear block_info.
2526         (problem_BD): Add size of block info structure.
2527         * df-scan.c (df_scan_free_internal): Free block pool.
2528         (df_scan_set_bb_info): Remove.
2529         (df_scan_free_bb_info): Check for artificial_defs instead
2530         of bb_info being non-NULL.
2531         (df_scan_alloc): DO not create df_scan_block pool.
2532         (problem_SCAN): Set size of block info.
2533         (df_bb_refs_record): Do not allocate bb_info.
2534         * df.h (df_problem): Add block_info_elt_size.
2535         (struct dataflow): Change block_info to void *.
2536         (df_scan_get_bb_info, df_rd_get_bb_info, df_lr_get_bb_info,
2537         df_md_get_bb_info, df_live_get_bb_info, df_byte_lr_get_bb_info): Return
2538         in-line structures.
2540 2010-06-12  Jan Hubicka  <jh@suse.cz>
2542         PR tree-optimize/44485
2543         * tree-cfgcleanup.c (fixup_noreturn_call): Remove basic blocks
2544         containing use of return value of noreturn function.
2546 2010-06-12  Anatoly Sokolov  <aesok@post.ru>
2548         * targhooks.c (default_function_value): Don't use
2549         FUNCTION_OUTGOING_VALUE.
2550         * system.h (FUNCTION_OUTGOING_VALUE): Poison.
2551         * doc/tm.texi (FUNCTION_OUTGOING_VALUE): Removed.
2553 2010-06-12  Kazu Hirata  <kazu@codesourcery.com>
2555         * config.gcc (mips64*-*-linux*, mipsisa64*-*-linux*, mips*-*-linux*):
2556         Add crtfastmath.o to extra_parts.
2557         * config/mips/crtfastmath.c: New.
2558         * config/mips/linux.h (ENDFILE_SPEC): New.
2560 2010-06-12  Sebastian Pop  <sebastian.pop@amd.com>
2562         * graphite-clast-to-gimple.c (gcc_type_for_interval): Do not pass
2563         old_type in parameter.
2564         (gcc_type_for_value): Update call to gcc_type_for_interval.
2565         (compute_type_for_level_1): Renamed compute_type_for_level.
2566         Update call to gcc_type_for_interval.
2568 2010-06-11  Joseph Myers  <joseph@codesourcery.com>
2570         * common.opt (Wstrict-aliasing=, Wstrict-overflow=, fabi-version=,
2571         flto-compression-level=, ftree-parallelize-loops=): Add RejectNegative.
2573 2010-06-11  Joseph Myers  <joseph@codesourcery.com>
2575         * opts-common.c: Include options.h.
2576         (integral_argument): Move from opts.c.
2577         (decode_cmdline_option): New.  Based on read_cmdline_option.
2578         * opts.c (integral_argument): Move to opts-common.c.
2579         (read_cmdline_option): Move most contents to
2580         decode_cmdline_option.  Use %qs in diagnostics.
2581         * opts.h (CL_ERR_DISABLED, CL_ERR_MISSING_ARG, CL_ERR_WRONG_LANG,
2582         CL_ERR_UINT_ARG, struct cl_decoded_option, integral_argument,
2583         decode_cmdline_option): New.
2585 2010-06-11  Uros Bizjak  <ubizjak@gmail.com>
2587         PR target/44481
2588         * config/i386/i386.md (UNSPEC_PARITY): New unspec.
2589         (paritydi2_cmp): Use UNSPEC_PARITY unspec instead of parity RTX.
2590         (partiysi2_cmp): Ditto.
2591         (*partiyhi2_cmp): Ditto.
2592         (*parityqi2_cmp): Remove.
2594 2010-06-11  Jan Hubicka  <jh@suse.cz>
2596         * bitmap.h (bmp_iter_next_bit): New.
2597         (bmp_iter_set, bmp_iter_and, bmp_iter_and_compl): Use it.
2599 2010-06-11  Sandra Loosemore  <sandra@codesourcery.com>
2600             Eric Botcazou  <ebotcazou@adacore.com>
2602         * tree-ssa-loop-ivopts.c (get_computation_cost_at): Return again the
2603         computed cost.
2605 2010-06-11  Uros Bizjak  <ubizjak@gmail.com>
2607         * config/i386/i386.md (unspec): New define_c_enum.
2608         (unspecv): Ditto.
2610 2010-06-10  Jakub Jelinek  <jakub@redhat.com>
2612         * c-family/c-cppbuiltin.c: Include cpp-id-data.h.
2613         (lazy_hex_fp_values, lazy_hex_fp_value_count): New variables.
2614         (lazy_hex_fp_value): New function.
2615         (builtin_define_with_hex_fp_value): Provide definitions lazily.
2616         * Makefile.in (c-family/c-cppbuiltin.o): Depend on $(CPP_ID_DATA_H).
2618 2010-06-11  Sebastian Pop  <sebastian.pop@amd.com>
2620         PR middle-end/44483
2621         * tree-if-conv.c (bb_predicate_s): New struct.
2622         (bb_predicate_p): New.
2623         (bb_has_predicate): New.
2624         (bb_predicate): New.
2625         (set_bb_predicate): New.
2626         (bb_predicate_gimplified_stmts): New.
2627         (set_bb_predicate_gimplified_stmts): New.
2628         (add_bb_predicate_gimplified_stmts): New.
2629         (init_bb_predicate): New.
2630         (free_bb_predicate): New.
2631         (is_predicated): Use bb_predicate.
2632         (add_to_predicate_list): Use bb_predicate and set_bb_predicate.
2633         (predicate_bbs): Same.  Gimplify the condition of the basic blocks
2634         before processing their successors.
2635         (clean_predicate_lists): Removed.
2636         (find_phi_replacement_condition): Use bb_predicate.
2637         (process_phi_nodes): Renamed ifconvert_phi_nodes.  Avoid useless
2638         computations.
2639         (insert_gimplified_predicates): New.
2640         (combine_blocks): Call insert_gimplified_predicates.
2641         (tree_if_conversion): Call free_bb_predicate instead of
2642         clean_predicate_lists.
2644 2010-10-11  Paul Brook  <paul@codesourcery.com>
2646         * doc/invoke.texi: Document ARM -mcpu=cortex-m4.
2647         * config/arm/arm.c (all_architectures): Change v7e-m default to
2648         cortexm4.
2649         * config/arm/arm-cores.def: Add cortex-m4.
2650         * config/arm/arm-tune.md: Regenerate.
2652 2010-06-11  Jan Hubicka  <jh@suse.cz>
2654         * ipa-pure-const.c (special_builtlin_state): New function.
2655         (check_call): Use it instead of special casign BUILT_IN_RETURN.
2656         (propagate_pure_const): Use it.
2658 2010-06-11  Jan Hubicka  <jh@suse.cz>
2660         * df-problems.c (df_live_scratch): Convert to bitmap_head.
2661         (df_live_alloc): Initialize df_live_scratch when initializing
2662         problem_data.
2663         (df_live_transfer_function): Update uses of df_live_scratch.
2664         (df_live_free): Free problem_data; clear df_live_scratch before
2665         releasing the obstack.
2666         (df_md_free): Free problem data.
2668 2010-06-11  Jan Hubicka  <jh@suse.cz>
2670         * doc/invoke.texi (Wsuggest-attribute): Document.
2671         (Wmissing-noreturn): Remove.
2672         * ipa-pure-const.c (warn_function_noreturn): New function.
2673         * opts.c (decode_options): Set warn_suggest_attribute_noreturn on
2674         warn_missing_noreturn.
2675         * common.opt (Wsuggest-attribute=noreturn): New.
2676         * tree-flow.h (warn_function_noreturn): Declare.
2677         * tree-cfg.c (execute_warn_function_noreturn): Use
2678         warn_function_noreturn.
2679         (gate_warn_function_noreturn): New.
2680         (pass_warn_function_noreturn): Update.
2682 2010-06-11  Manuel López-Ibáñez  <manu@gcc.gnu.org>
2684         * c-typeck.c (handle_warn_cast_qual): Add loc
2685         parameter. Improve warning message.
2686         (build_c_cast): Pass location to handle_warn_cast_qual.
2688 2010-06-11  Uros Bizjak  <ubizjak@gmail.com>
2690         * config/i386/i386.md (pro_epilogue_adjust_stack_1) <TYPE_ALU>: Assert
2691         that operand 0 == operand 1.  Use x86_maybe_negate_const_int to output
2692         insn mnemonic.
2693         (pro_epilogue_adjust_stack_rex64) <TYPE_ALU>: Ditto.
2695 2010-06-10  Dodji Seketeli  <dodji@redhat.com>
2697         Fix bootstap on mips
2698         * dwarf2out.c (is_naming_typedef_dec): Built-in TYPE_DECLs cannot
2699         be naming typedefs.
2701 2010-06-11  Kai Tietz  <kai.tietz@onevision.com>
2703         * system.h (helper_const_non_const_cast): New inline for
2704         gcc version <= 4.0.
2705         (CONST_CAST2): For gcc version <= 4.0 use
2706         new helper to do const/non-const casting.
2708 2010-06-10  Richard Sandiford  <rdsandiford@googlemail.com>
2710         * doc/md.texi: Document the "unspec" and "unspecv" enum names.
2711         * Makefile.in (OBJS-common): Include insn-enums.o.
2712         (insn-enums.o): New rule.
2713         (simple_generated_c): Add insn-enums.c.
2714         (build/genenums.o): New rule.
2715         (genprogmd): Add "enums".
2716         * genconstants.c (print_enum_type): Declare a C string array
2717         for each enum.
2718         * genenums.c: New file.
2719         * print-rtl.c (print_rtx): If defined, use the "unspecv" enum
2720         for UNSPEC_VOLATILE.  If defined, use the "unspec" enum for both
2721         UNSPEC and (as a fallback) for UNSPEC_VOLATILE.
2723 2010-06-10  Richard Sandiford  <rdsandiford@googlemail.com>
2725         * doc/md.texi (define_enum_attr): Document.
2726         * rtl.def (DEFINE_ENUM_ATTR): New rtx.
2727         * read-md.h (lookup_enum_type): Declare.
2728         * read-md.c (lookup_enum_type): New function.
2729         * genattr.c (gen_attr, main): Handle DEFINE_ENUM_ATTR.
2730         * genattrtab.c (attr_desc): Add an enum_name field.
2731         (evaluate_eq_attr): Take the associated attribute as argument.
2732         Get the enum prefix from the enum_name field, if defined.
2733         Use ACONCAT rather than a fixed-length buffer.  Update recursive calls.
2734         (simplify_test_exp): Pass attr to evaluate_eq_attr.
2735         (add_attr_value): New function, split out from...
2736         (gen_attr): ...here.  Handle DEFINE_ENUM_ATTR.
2737         (write_test_expr): Pass attr to evaluate_eq_attr.
2738         (write_attr_get): Use the enum_name as the enum tag, if defined.
2739         (write_attr_valueq): Use the enum_name as a prefix, if defined.
2740         (find_attr): Initialize enum_name.
2741         (main): Handle DEFINE_ENUM_ATTR.
2742         * gensupport.c (process_rtx): Likewise.
2743         * config/mips/mips.h (mips_tune_attr): Delete.
2744         * config/mips/mips.md (cpu): Use define_attr_enum.
2746 2010-06-10  Richard Sandiford  <rdsandiford@googlemail.com>
2748         * doc/md.texi (define_c_enum, define_enum): Document.
2749         * read-md.h (md_constant): Add a parent_enum field.
2750         (enum_value, enum_type): New structures.
2751         (upcase_string, traverse_enum_types): Declare.
2752         * read-md.c (enum_types): New variable.
2753         (upcase_string, add_constant): New functions.
2754         (handle_constants): Don't create the hash table here.
2755         Use add_constant.
2756         (traverse_md_constants): Don't check for a null md_constants.
2757         (decimal_string, handle_enum, traverse_enum_types): New functions.
2758         (read_md_files): Initialize md_constants and md_enums.
2759         * genconstants.c (print_md_constant): Ignore info argument.
2760         Only print constants that belong to no enum.
2761         (print_enum_type): New function.
2762         (main): Don't pass stdout to print_md_constant.  Call print_enum_type
2763         for each defined enum type.
2764         * config/mips/mips.md (processor): New define_enum.
2765         (unspec): New define_c_enum.
2766         (UNSPEC_COMPARE_AND_SWAP, UNSPEC_COMPARE_AND_SWAP_12)
2767         (UNSPEC_SYNC_OLD_OP, UNSPEC_SYNC_NEW_OP, UNSPEC_SYNC_NEW_OP_12)
2768         (UNSPEC_SYNC_OLD_OP_12, UNSPEC_SYNC_EXCHANGE, UNSPEC_SYNC_EXCHANGE_12)
2769         (UNSPEC_MEMORY_BARRIER): Moved to sync.md.
2770         (UNSPEC_ADDQ, UNSPEC_ADDQ_S, UNSPEC_SUBQ, UNSPEC_SUBQ_S, UNSPEC_ADDSC)
2771         (UNSPEC_ADDWC, UNSPEC_MODSUB, UNSPEC_RADDU_W_QB, UNSPEC_ABSQ_S)
2772         (UNSPEC_PRECRQ_QB_PH, UNSPEC_PRECRQ_PH_W, UNSPEC_PRECRQ_RS_PH_W)
2773         (UNSPEC_PRECRQU_S_QB_PH, UNSPEC_PRECEQ_W_PHL, UNSPEC_PRECEQ_W_PHR)
2774         (UNSPEC_PRECEQU_PH_QBL, UNSPEC_PRECEQU_PH_QBR, UNSPEC_PRECEQU_PH_QBLA)
2775         (UNSPEC_PRECEQU_PH_QBRA, UNSPEC_PRECEU_PH_QBL, UNSPEC_PRECEU_PH_QBR)
2776         (UNSPEC_PRECEU_PH_QBLA, UNSPEC_PRECEU_PH_QBRA, UNSPEC_SHLL)
2777         (UNSPEC_SHLL_S, UNSPEC_SHRL_QB, UNSPEC_SHRA_PH, UNSPEC_SHRA_R)
2778         (UNSPEC_MULEU_S_PH_QBL, UNSPEC_MULEU_S_PH_QBR, UNSPEC_MULQ_RS_PH)
2779         (UNSPEC_MULEQ_S_W_PHL, UNSPEC_MULEQ_S_W_PHR, UNSPEC_DPAU_H_QBL)
2780         (UNSPEC_DPAU_H_QBR, UNSPEC_DPSU_H_QBL, UNSPEC_DPSU_H_QBR)
2781         (UNSPEC_DPAQ_S_W_PH, UNSPEC_DPSQ_S_W_PH, UNSPEC_MULSAQ_S_W_PH)
2782         (UNSPEC_DPAQ_SA_L_W, UNSPEC_DPSQ_SA_L_W, UNSPEC_MAQ_S_W_PHL)
2783         (UNSPEC_MAQ_S_W_PHR, UNSPEC_MAQ_SA_W_PHL, UNSPEC_MAQ_SA_W_PHR)
2784         (UNSPEC_BITREV, UNSPEC_INSV, UNSPEC_REPL_QB, UNSPEC_REPL_PH)
2785         (UNSPEC_CMP_EQ, UNSPEC_CMP_LT, UNSPEC_CMP_LE, UNSPEC_CMPGU_EQ_QB)
2786         (UNSPEC_CMPGU_LT_QB, UNSPEC_CMPGU_LE_QB, UNSPEC_PICK, UNSPEC_PACKRL_PH)
2787         (UNSPEC_EXTR_W, UNSPEC_EXTR_R_W, UNSPEC_EXTR_RS_W, UNSPEC_EXTR_S_H)
2788         (UNSPEC_EXTP, UNSPEC_EXTPDP, UNSPEC_SHILO, UNSPEC_MTHLIP, UNSPEC_WRDSP)
2789         (UNSPEC_RDDSP): Move to mips-dsp.md.
2790         (UNSPEC_ABSQ_S_QB, UNSPEC_ADDU_PH, UNSPEC_ADDU_S_PH, UNSPEC_ADDUH_QB)
2791         (UNSPEC_ADDUH_R_QB, UNSPEC_APPEND, UNSPEC_BALIGN, UNSPEC_CMPGDU_EQ_QB)
2792         (UNSPEC_CMPGDU_LT_QB, UNSPEC_CMPGDU_LE_QB, UNSPEC_DPA_W_PH)
2793         (UNSPEC_DPS_W_PH, UNSPEC_MADD, UNSPEC_MADDU, UNSPEC_MSUB, UNSPEC_MSUBU)
2794         (UNSPEC_MUL_PH, UNSPEC_MUL_S_PH, UNSPEC_MULQ_RS_W, UNSPEC_MULQ_S_PH)
2795         (UNSPEC_MULQ_S_W, UNSPEC_MULSA_W_PH, UNSPEC_MULT, UNSPEC_MULTU)
2796         (UNSPEC_PRECR_QB_PH, UNSPEC_PRECR_SRA_PH_W, UNSPEC_PRECR_SRA_R_PH_W)
2797         (UNSPEC_PREPEND, UNSPEC_SHRA_QB, UNSPEC_SHRA_R_QB, UNSPEC_SHRL_PH)
2798         (UNSPEC_SUBU_PH, UNSPEC_SUBU_S_PH, UNSPEC_SUBUH_QB, UNSPEC_SUBUH_R_QB)
2799         (UNSPEC_ADDQH_PH, UNSPEC_ADDQH_R_PH, UNSPEC_ADDQH_W, UNSPEC_ADDQH_R_W)
2800         (UNSPEC_SUBQH_PH, UNSPEC_SUBQH_R_PH, UNSPEC_SUBQH_W, UNSPEC_SUBQH_R_W)
2801         (UNSPEC_DPAX_W_PH, UNSPEC_DPSX_W_PH, UNSPEC_DPAQX_S_W_PH)
2802         (UNSPEC_DPAQX_SA_W_PH, UNSPEC_DPSQX_S_W_PH, UNSPEC_DPSQX_SA_W_PH):
2803         Moved to mips-dspr2.md.
2804         (UNSPEC_MOVE_TF_PS, UNSPEC_C, UNSPEC_ALNV_PS, UNSPEC_CABS)
2805         (UNSPEC_ADDR_PS, UNSPEC_CVT_PW_PS, UNSPEC_CVT_PS_PW, UNSPEC_MULR_PS)
2806         (UNSPEC_ABS_PS, UNSPEC_RSQRT1, UNSPEC_RSQRT2, UNSPEC_RECIP1)
2807         (UNSPEC_RECIP2, UNSPEC_SINGLE_CC, UNSPEC_SCC): Move from mips-ps-3d.md.
2808         (UNSPEC_LOONGSON_PAVG, UNSPEC_LOONGSON_PCMPEQ, UNSPEC_LOONGSON_PCMPGT)
2809         (UNSPEC_LOONGSON_PEXTR, UNSPEC_LOONGSON_PINSR_0)
2810         (UNSPEC_LOONGSON_PINSR_1, UNSPEC_LOONGSON_PINSR_2)
2811         (UNSPEC_LOONGSON_PINSR_3, UNSPEC_LOONGSON_PMADD)
2812         (UNSPEC_LOONGSON_PMOVMSK, UNSPEC_LOONGSON_PMULHU)
2813         (UNSPEC_LOONGSON_PMULH, UNSPEC_LOONGSON_PMULL, UNSPEC_LOONGSON_PMULU)
2814         (UNSPEC_LOONGSON_PASUBUB, UNSPEC_LOONGSON_BIADD,
2815         UNSPEC_LOONGSON_PSADBH)
2816         (UNSPEC_LOONGSON_PSHUFH, UNSPEC_LOONGSON_PUNPCKH)
2817         (UNSPEC_LOONGSON_PUNPCKL, UNSPEC_LOONGSON_PADDD)
2818         (UNSPEC_LOONGSON_PSUBD): Move to mips-loongson.md.
2819         (UNSPEC_LOONGSON_ALU1_TURN_ENABLED_INSN)
2820         (UNSPEC_LOONGSON_ALU2_TURN_ENABLED_INSN)
2821         (UNSPEC_LOONGSON_FALU1_TURN_ENABLED_INSN)
2822         (UNSPEC_LOONGSON_FALU2_TURN_ENABLED_INSN): Move to mips-loongson2ef.md.
2823         (cpu): Update comment.
2824         * config/mips/sync.md (UNSPEC_COMPARE_AND_SWAP)
2825         (UNSPEC_COMPARE_AND_SWAP_12, UNSPEC_SYNC_OLD_OP, UNSPEC_SYNC_NEW_OP)
2826         (UNSPEC_SYNC_NEW_OP_12, UNSPEC_SYNC_OLD_OP_12, UNSPEC_SYNC_EXCHANGE)
2827         (UNSPEC_SYNC_EXCHANGE_12, UNSPEC_MEMORY_BARRIER): Moved from mips.md.
2828         * config/mips/loongson.md (UNSPEC_LOONGSON_PAVG,
2829         UNSPEC_LOONGSON_PCMPEQ)
2830         (UNSPEC_LOONGSON_PCMPGT, UNSPEC_LOONGSON_PEXTR,
2831         UNSPEC_LOONGSON_PINSR_0)
2832         (UNSPEC_LOONGSON_PINSR_1, UNSPEC_LOONGSON_PINSR_2)
2833         (UNSPEC_LOONGSON_PINSR_3, UNSPEC_LOONGSON_PMADD)
2834         (UNSPEC_LOONGSON_PMOVMSK, UNSPEC_LOONGSON_PMULHU)
2835         (UNSPEC_LOONGSON_PMULH, UNSPEC_LOONGSON_PMULL, UNSPEC_LOONGSON_PMULU)
2836         (UNSPEC_LOONGSON_PASUBUB, UNSPEC_LOONGSON_BIADD,
2837         UNSPEC_LOONGSON_PSADBH)
2838         (UNSPEC_LOONGSON_PSHUFH, UNSPEC_LOONGSON_PUNPCKH)
2839         (UNSPEC_LOONGSON_PUNPCKL, UNSPEC_LOONGSON_PADDD)
2840         (UNSPEC_LOONGSON_PSUBD): Moved from mips.md
2841         * config/mips/loongson2ef.md (UNSPEC_LOONGSON_ALU1_TURN_ENABLED_INSN)
2842         (UNSPEC_LOONGSON_ALU2_TURN_ENABLED_INSN)
2843         (UNSPEC_LOONGSON_FALU1_TURN_ENABLED_INSN)
2844         (UNSPEC_LOONGSON_FALU2_TURN_ENABLED_INSN): Moved from mips.md
2845         * config/mips/mips-dsp.md (UNSPEC_ADDQ, UNSPEC_ADDQ_S, UNSPEC_SUBQ)
2846         (UNSPEC_SUBQ_S, UNSPEC_ADDSC, UNSPEC_ADDWC, UNSPEC_MODSUB)
2847         (UNSPEC_RADDU_W_QB, UNSPEC_ABSQ_S, UNSPEC_PRECRQ_QB_PH)
2848         (UNSPEC_PRECRQ_PH_W, UNSPEC_PRECRQ_RS_PH_W, UNSPEC_PRECRQU_S_QB_PH)
2849         (UNSPEC_PRECEQ_W_PHL, UNSPEC_PRECEQ_W_PHR, UNSPEC_PRECEQU_PH_QBL)
2850         (UNSPEC_PRECEQU_PH_QBR, UNSPEC_PRECEQU_PH_QBLA, UNSPEC_PRECEQU_PH_QBRA)
2851         (UNSPEC_PRECEU_PH_QBL, UNSPEC_PRECEU_PH_QBR, UNSPEC_PRECEU_PH_QBLA)
2852         (UNSPEC_PRECEU_PH_QBRA, UNSPEC_SHLL, UNSPEC_SHLL_S, UNSPEC_SHRL_QB)
2853         (UNSPEC_SHRA_PH, UNSPEC_SHRA_R, UNSPEC_MULEU_S_PH_QBL)
2854         (UNSPEC_MULEU_S_PH_QBR, UNSPEC_MULQ_RS_PH, UNSPEC_MULEQ_S_W_PHL)
2855         (UNSPEC_MULEQ_S_W_PHR, UNSPEC_DPAU_H_QBL, UNSPEC_DPAU_H_QBR)
2856         (UNSPEC_DPSU_H_QBL, UNSPEC_DPSU_H_QBR, UNSPEC_DPAQ_S_W_PH)
2857         (UNSPEC_DPSQ_S_W_PH, UNSPEC_MULSAQ_S_W_PH, UNSPEC_DPAQ_SA_L_W)
2858         (UNSPEC_DPSQ_SA_L_W, UNSPEC_MAQ_S_W_PHL, UNSPEC_MAQ_S_W_PHR)
2859         (UNSPEC_MAQ_SA_W_PHL, UNSPEC_MAQ_SA_W_PHR, UNSPEC_BITREV, UNSPEC_INSV)
2860         (UNSPEC_REPL_QB, UNSPEC_REPL_PH, UNSPEC_CMP_EQ, UNSPEC_CMP_LT)
2861         (UNSPEC_CMP_LE, UNSPEC_CMPGU_EQ_QB, UNSPEC_CMPGU_LT_QB)
2862         (UNSPEC_CMPGU_LE_QB, UNSPEC_PICK, UNSPEC_PACKRL_PH, UNSPEC_EXTR_W)
2863         (UNSPEC_EXTR_R_W, UNSPEC_EXTR_RS_W, UNSPEC_EXTR_S_H, UNSPEC_EXTP)
2864         (UNSPEC_EXTPDP, UNSPEC_SHILO, UNSPEC_MTHLIP, UNSPEC_WRDSP)
2865         (UNSPEC_RDDSP): Moved from mips.md.
2866         * config/mips/mips-dspr2.md (UNSPEC_ABSQ_S_QB, UNSPEC_ADDU_PH)
2867         (UNSPEC_ADDU_S_PH, UNSPEC_ADDUH_QB, UNSPEC_ADDUH_R_QB, UNSPEC_APPEND)
2868         (UNSPEC_BALIGN, UNSPEC_CMPGDU_EQ_QB, UNSPEC_CMPGDU_LT_QB)
2869         (UNSPEC_CMPGDU_LE_QB, UNSPEC_DPA_W_PH, UNSPEC_DPS_W_PH, UNSPEC_MADD)
2870         (UNSPEC_MADDU, UNSPEC_MSUB, UNSPEC_MSUBU, UNSPEC_MUL_PH)
2871         (UNSPEC_MUL_S_PH, UNSPEC_MULQ_RS_W, UNSPEC_MULQ_S_PH, UNSPEC_MULQ_S_W)
2872         (UNSPEC_MULSA_W_PH, UNSPEC_MULT, UNSPEC_MULTU, UNSPEC_PRECR_QB_PH)
2873         (UNSPEC_PRECR_SRA_PH_W, UNSPEC_PRECR_SRA_R_PH_W, UNSPEC_PREPEND)
2874         (UNSPEC_SHRA_QB, UNSPEC_SHRA_R_QB, UNSPEC_SHRL_PH, UNSPEC_SUBU_PH)
2875         (UNSPEC_SUBU_S_PH, UNSPEC_SUBUH_QB, UNSPEC_SUBUH_R_QB, UNSPEC_ADDQH_PH)
2876         (UNSPEC_ADDQH_R_PH, UNSPEC_ADDQH_W, UNSPEC_ADDQH_R_W, UNSPEC_SUBQH_PH)
2877         (UNSPEC_SUBQH_R_PH, UNSPEC_SUBQH_W, UNSPEC_SUBQH_R_W, UNSPEC_DPAX_W_PH)
2878         (UNSPEC_DPSX_W_PH, UNSPEC_DPAQX_S_W_PH, UNSPEC_DPAQX_SA_W_PH)
2879         (UNSPEC_DPSQX_S_W_PH, UNSPEC_DPSQX_SA_W_PH): Moved from mips.md.
2880         * config/mips/mips-ps-3d.md (UNSPEC_MOVE_TF_PS, UNSPEC_C)
2881         (UNSPEC_ALNV_PS, UNSPEC_CABS, UNSPEC_ADDR_PS, UNSPEC_CVT_PW_PS)
2882         (UNSPEC_CVT_PS_PW, UNSPEC_MULR_PS, UNSPEC_ABS_PS, UNSPEC_RSQRT1)
2883         (UNSPEC_RSQRT2, UNSPEC_RECIP1, UNSPEC_RECIP2, UNSPEC_SINGLE_CC)
2884         (UNSPEC_SCC): Moved from mips.md.
2885         * config/mips/mips.c (mips_arch, mips_tune): Change enum from
2886         "processor_type" to "processor".
2887         (mips_rtx_cost_data): Replace PROCESSOR_MAX with NUM_PROCESSOR_VALUES.
2888         * config/mips/mips.h (processor_type): Delete.
2889         (mips_cpu_info.cpu, mips_arch, mips_tune): Change enum from
2890         "processor_type" to "processor".
2892 2010-06-10  Richard Sandiford  <rdsandiford@googlemail.com>
2894         * configure.ac (tm_include_list): Add insn-constants.h.
2895         * configure: Regenerate.
2896         * Makefile.in (GTM_H): Move insn-constants.h here from...
2897         (TM_H): ...here.
2898         * mkconfig.sh: Remove special handling for insn-constants.h.
2900 2010-06-10  Richard Sandiford  <rdsandiford@googlemail.com>
2902         * Makefile.in (BUILD_RTL): Move build/read-md.o to...
2903         (BUILD_MD): ...this new variable.
2904         (simple_generated_rtl_h, simple_generated_rtl_c): New variables
2905         that include the old contents of simple_generated_h and
2906         simple_generated_c.
2907         (simple_generated_h, simple_generated_c): Include them.  Add
2908         insn-constants.h.
2909         (s-%): Make simple_generated_{h,c} stamps depend on $(MD_DEPS)
2910         and simple_generated_rtl_{h,c} stamps depend on insn-conditions.md.
2911         Remove these dependencies from the main rule and include
2912         insn-conditions.md in the command line only if it appears
2913         in the dependency list.
2914         (insn-constants.h, s-constants): Delete.
2915         (build/genconstants.o): Don't depend on $(RTL_BASE_H), $(GTM_H)
2916         or gensupport.h.
2917         (build/genmddeps.o): Likewise.
2918         (genprogrtl): New variable that contains everything from genprogmd
2919         except mddeps and constants.
2920         (genprogmd): Redefine in terms of genprogrtl.  Make these programs
2921         depend on $(BUILD_MD)
2922         (genprog): New variable.  Make these programs depend on
2923         $(BUILD_ERRORS).
2924         * genmddeps.c: Don't include tm.h, rtl.h or gensupport.h.
2925         (main): Use read_md_files instead of init_rtx_reader_args.
2926         * genconstants.c: As for genmddeps.c.
2927         * read-md.h (read_skip_construct): Declare.
2928         * read-md.c (read_skip_construct): New function.
2929         (handle_file): Allow a null handle_directive, skipping the
2930         construct if so.
2931         (parse_include): Update the comment accordingly.
2933 2010-06-10  Richard Sandiford  <rdsandiford@googlemail.com>
2935         * Makefile.in (build/genmddeps.o): Depend on $(READ_MD_H).
2936         * genmddeps.c: Include read-md.h.
2937         (main): Call init_rtx_reader_args instead of init_md_reader_args.
2938         * genattr.c (main): Likewise.
2939         * genattrtab.c (main): Likewise.
2940         * genautomata.c (main): Likewise.
2941         * gencodes.c (main): Likewise.
2942         * genconditions.c (main): Likewise.
2943         * genconfig.c (main): Likewise.
2944         * genconstants.c (main): Likewise.
2945         * genemit.c (main): Likewise.
2946         * genextract.c (main): Likewise.
2947         * genflags.c (main): Likewise.
2948         * genopinit.c (main): Likewise.
2949         * genoutput.c (main): Likewise.
2950         * genpeep.c (main): Likewise.
2951         * genrecog.c (main): Likewise.
2952         * genpreds.c (main): Likewise.
2953         * gensupport.h (in_fname): Move to read-md.h.
2954         (init_md_reader_args_cb): Rename to...
2955         (init_rtx_reader_args_cb): ...this and return a bool.
2956         (init_md_reader_args): Rename to...
2957         (init_rtx_reader_args): ...this and return a bool.
2958         (include_callback): Move to read-md.h.
2959         * gensupport.c (in_fname, include_callback, base_dir, max_include_len)
2960         (file_name_list, first_dir_md_include): Move to read-md.c
2961         (first_bracket_include): Delete unused variable.
2962         (last_dir_md_include): Move to read-md.c.
2963         (process_include): Delete, moving code to read-md.c:handle_include.
2964         (process_rtx): Don't handle INCLUDE.
2965         (save_string): Delete.
2966         (rtx_handle_directive): New function.
2967         (init_md_reader_args_cb): Rename to...
2968         (init_rtx_reader_args_cb): ...this and return a boolean success value.
2969         Use read_md_args.
2970         (init_md_reader_args): Rename to...
2971         (init_rtx_reader_args): ...this and return a boolean success value.
2972         * rtl.def (INCLUDE): Delete.
2973         * rtl.h (read_rtx): Remove "int *" argument.  Add "const char *"
2974         argument.
2975         * read-rtl.c (read_conditions): Don't gobble ')' here.
2976         (read_mapping): Likewise.
2977         (read_rtx): Remove LINENO argument.  Add RTX_NAME argument.
2978         Handle top-level non-rtx constructs here rather than in read_rtx_1.
2979         Store the whole queue in *X.  Remove call to init_md_reader.
2980         (read_rtx_1): Rename to...
2981         (read_rtx_code): ...this.  Call read_nested_rtx to read subrtxes.
2982         Don't handle top-level non-rtx constructs here.  Don't handle (nil)
2983         here.
2984         (read_nested_rtx): New function.  Handle (nil) here rather than
2985         in read_rtx_code.
2986         (read_rtx_variadic): Call read_nested_rtx to read subrtxes.  Don't
2987         gobble ')' here.
2988         * read-md.h (directive_handler_t): New type.
2989         (in_fname, include_callback): Moved from read-md.h.
2990         (read_constants, init_md_reader): Delete.
2991         (read_md_files): Declare.
2992         * read-md.c (file_name_list, in_fname, base_dir, first_dir_md_include)
2993         (last_dir_md_include_ptr, include_callback, max_include_len): Moved
2994         from gensupport.c.
2995         (read_constants): Rename to...
2996         (handle_constants): ...this.  Don't gobble ')' here.
2997         (handle_include, handle_file, handle_toplevel_file)
2998         (parse_include): New functions, mostly taken from gensupport.c.
2999         (init_md_reader): Subsume into...
3000         (read_md_files): ...this new function.
3002 2010-06-10  Richard Sandiford  <rdsandiford@googlemail.com>
3004         * read-md.h (read_char): Increment read_md_lineno after reading '\n'.
3005         (unread_char): Decrement read_md_lineno after putting back '\n'.
3006         * read-md.c (fatal_with_file_and_line): Push back any characters
3007         that we decide not to add to the context.
3008         (read_skip_spaces): Don't increment read_md_lineno here.  Avoid using
3009         fatal_expected_char in cases where '/' ends a line (for example).
3010         (read_name): Don't increment read_md_lineno here.
3011         (read_escape): Likewise.
3012         (read_quoted_string): Likewise.
3013         (read_braced_string): Likewise.
3015 2010-06-10  Richard Sandiford  <rdsandiford@googlemail.com>
3017         * Makefile.in (READ_MD_H): Add $(HASHTAB_H).
3018         (build/genconstants.o): Depend on $(READ_MD_H) gensupport.h.
3019         * genconstants.c: Include read-md.h.
3020         * read-rtl.c (md_constants): Move to read-md.c.
3021         (md_name): Move to read-md.h.
3022         (initialize_iterators): Use leading_string_hash instead of def_hash
3023         and leading_string_eq_p instead of def_name_eq_p.
3024         (read_name): Move to read-md.c.
3025         (def_hash, def_name_eq_p): Delete.
3026         (read_constants, traverse_md_constants): Move to read-md.c.
3027         * rtl.h (md_constant, traverse_md_constants): Move to read-md.h.
3028         * read-md.h: Include hashtab.h.
3029         (md_name): Moved from read-rtl.c.
3030         (md_constant): Moved from read-md.h.
3031         (leading_string_hash, leading_string_eq_p, read_name)
3032         (read_constants, traverse_md_constants): Declare.
3033         * read-md.c (md_constants): Moved from read-rtl.c.
3034         (leading_string_hash, leading_string_eq_p): New functions.
3035         (read_name, read_constants, traverse_md_constants): Moved from
3036         read-rtl.c.
3038 2010-06-10  Richard Sandiford  <rdsandiford@googlemail.com>
3040         * read-rtl.c (md_name): New structure.
3041         (read_name): Take an md_name instead of a buffer pointer.
3042         Use the "string" field instead of strcpy when expanding constants.
3043         (read_constants): Remove the tmp_char argument.  Update the calls
3044         to read_name, using two local name buffers instead of the tmp_char
3045         argument.  Merge the constant-creation code.
3046         (read_conditions): Remove the tmp_char argument.  Update the calls
3047         to read_name, using a local name buffer instead of the tmp_char
3048         argument.
3049         (read_mapping): Replace tmp_char variable with a local name buffer.
3050         Update the calls to read_name.
3051         (read_rtx_1): Likewise.  Update the calls to read_constants and
3052         read_conditions.
3054 2010-06-10  Richard Sandiford  <rdsandiford@googlemail.com>
3056         * Makefile.in (build/read-md.o): Depend on errors.h.
3057         * read-md.h (error_with_line): Declare.
3058         * read-md.c: Include errors.h.
3059         (message_with_line_1): New function, extracted from...
3060         (message_with_line): ...here.
3061         (error_with_line): New function.
3062         * genattrtab.c: If a call to message_with_line is followed by
3063         "have_error = 1;", replace both statements with a call to
3064         error_with_line.
3065         * genoutput.c: Likewise.
3066         * genpreds.c: Likewise.
3067         * genrecog.c: If a call to message_with_line is followed by
3068         "error_count++;", replace both statements with a call to
3069         error_with_line.
3070         (errorcount): Delete.
3071         (main): Don't check it.
3072         * gensupport.c: If a call to message_with_line is followed by
3073         "errors = 1;", replace both statements with a call to error_with_line.
3074         (errors): Delete.
3075         (process_define_cond_exec): Check have_error instead of errors.
3076         (init_md_reader_args_cb): Likewise.  Don't set errors.
3078 2010-06-10  Richard Sandiford  <rdsandiford@googlemail.com>
3080         * read-md.h (read_md_file): Declare.
3081         (read_char, unread_char): New functions.
3082         (fatal_with_file_and_line, fatal_expected_char, read_skip_spaces)
3083         (read_quoted_string, read_string): Remove FILE * argument.
3084         * read-md.c (read_md_file): New variable.
3085         (read_md_filename, read_md_lineno): Update comments and remove
3086         unnecessary initialization.
3087         (fatal_with_file_and_line, fatal_expected_char, read_skip_spaces)
3088         (read_escape, read_quoted_string, read_braced_string, read_string):
3089         Remove FILE * argument.  Update calls accordingly, using read_char
3090         and unread_char instead of getc and ungetc.
3091         * rtl.h (read_rtx): Remove FILE * argument.
3092         * read-rtl.c (iterator_group): Remove FILE * argument from
3093         "find_builtin".
3094         (iterator_traverse_data): Remove "infile" field.
3095         (find_mode, find_code, apply_mode_maps, apply_iterator_to_rtx)
3096         (add_mapping, read_name, read_constants, read_conditions)
3097         (validate_const_int, find_iterator, read_mapping, check_code_iterator)
3098         (read_rtx, read_rtx_1, read_rtx_variadic): Remove FILE * argument.
3099         Remove file arguments from all calls, using read_char and unread_char
3100         instead of getc and ungetc.
3101         * gensupport.c (process_include): Preserve read_md_file around
3102         the include.  Set read_md_file to the handle of the included file.
3103         Update call to read_rtx.
3104         (init_md_reader_args_cb): Set read_md_file to the handle of the file
3105         and remove local FILE *.  Update calls to read_rtx.
3107 2010-06-10  Richard Sandiford  <rdsandiford@googlemail.com>
3109         * read-md.h (read_rtx_lineno): Rename to...
3110         (read_md_lineno): ...this.
3111         (read_rtx_filename): Rename to...
3112         (read_md_filename): ...this.
3113         (copy_rtx_ptr_loc): Rename to...
3114         (copy_md_ptr_loc): ...this.
3115         (print_rtx_ptr_loc): Rename to...
3116         (print_md_ptr_loc): ...this.
3117         * read-md.c: Likewise.  Update references after renaming.
3118         (string_obstack): Replace RTL with MD in comment.
3119         (set_rtx_ptr_loc): Rename to...
3120         (set_md_ptr_loc): ...this.
3121         (get_rtx_ptr_loc): Rename to...
3122         (get_md_ptr_loc): ...this.
3123         * genconditions.c: Update references after renaming.
3124         * genemit.c: Likewise.
3125         * genoutput.c: Likewise.
3126         * genpreds.c: Likewise.
3127         * gensupport.c: Likewise.
3128         * read-rtl.c: Likewise.
3130 2010-06-10  Richard Sandiford  <rdsandiford@googlemail.com>
3132         * Makefile.in (READ_MD_H): New variable.
3133         (BUILD_RTL): Add build/read-md.o.
3134         (lto-wrapper.o): Depend on coretypes.h instead of defaults.h.
3135         (build/gensupport.o, build/read-rtl.o, build/genattr.o)
3136         (build/genattrtab.o, build/genconditions.o build/genemit.o)
3137         (build/genextract.o, build/genflags.o, build/genoutput.o)
3138         (build/genpreds.o, build/genrecog.o): Depend on $(READ_MD_H).
3139         (build/read-md.o): New rule.
3140         * defaults.h (obstack_chunk_alloc, obstack_chunk_free)
3141         (OBSTACK_CHUNK_SIZE, gcc_obstack_init): Move to...
3142         * coretypes.h: ...here.
3143         * lto-wrapper.c: Include coretypes.h instead of defaults.h.
3144         * pretty-print.c (obstack_chunk_alloc, obstack_chunk_free): Delete.
3145         * genattr.c: Include read-md.h.
3146         * genattrtab.c: Likewise.
3147         * genconditions.c: Likewise.
3148         * genemit.c: Likewise.
3149         * genextract.c: Likewise.
3150         * genflags.c: Likewise.
3151         * genoutput.c: Likewise.
3152         * genpreds.c: Likewise.
3153         * genrecog.c: Likewise.
3154         * rtl.h (read_skip_spaces, copy_rtx_ptr_loc, print_rtx_ptr_loc)
3155         (join_c_conditions, print_c_condition, read_rtx_filename)
3156         (read_rtx_lineno): Move to read-md.h.
3157         * read-rtl.c: Include read-md.h.
3158         (ptr_loc, string_obstack, ptr_locs, ptr_loc_obstack)
3159         (joined_conditions, joined_conditions_obstack, read_rtx_lineno)
3160         (read_rtx_filename, fatal_with_file_and_line, fatal_expected_char)
3161         (leading_ptr_hash, leading_ptr_eq_p, set_rtx_ptr_loc, get_rtx_ptr_loc)
3162         (copy_rtx_ptr_loc, print_rtx_ptr_loc, join_c_conditions)
3163         (print_c_condition, read_skip_spaces, read_escape, read_quoted_string)
3164         (read_braced_string, read_string): Move to read-md.c.
3165         (read_rtx): Move some initialization to init_md_reader and call
3166         init_md_reader here.
3167         * gensupport.h (message_with_line, n_comma_elts, scan_comma_elt):
3168         Move to read-md.h.
3169         * gensupport.c: Include read-md.h.
3170         (message_with_line, n_comma_elts, scan_comma_elt): Move to read-md.c.
3171         * read-md.h, read-md.c: New files.
3173 2010-06-10  Anatoly Sokolov  <aesok@post.ru>
3175         * config/moxie/moxie.h (FUNCTION_VALUE, FUNCTION_OUTGOING_VALUE,
3176         LIBCALL_VALUE, FUNCTION_VALUE_REGNO_P): Remove macros.
3177         * config/moxie/moxie-protos.h (moxie_function_value): Remove.
3178         * config/moxie/moxie.c (moxie_function_value): Make static.
3179         (moxie_libcall_value, moxie_function_value_regno_p): New functions.
3180         (TARGET_LIBCALL_VALUE, TARGET_FUNCTION_VALUE_REGNO_P): Define.
3182 2010-06-10  Martin Jambor  <mjambor@suse.cz>
3184         * Makefile.in (tree-sra.o): Add DBGCNT_H to dependencies.
3185         * dbgcnt.def (tree_sra): New counter.
3186         * tree-sra.c: Include dbgcnt.h.
3187         (gate_intra_sra): Check tree_sra debug counter.
3189 2010-06-10  Martin Jambor  <mjambor@suse.cz>
3191         PR tree-optimization/44258
3192         * tree-sra.c (build_access_subtree): Return false iff there is a
3193         partial overlap.
3194         (build_access_trees): Likewise.
3195         (analyze_all_variable_accesses): Disqualify candidates if
3196         build_access_trees returns true for them.
3198 2010-06-10  Alexandre Oliva  <aoliva@redhat.com>
3200         PR debug/41371
3201         * var-tracking.c (find_loc_in_1pdv): Remove recursion, only
3202         tail-recurse into canonical node.  Fast-forward over
3203         non-canonical VALUEs.
3205 2010-06-10  H.J. Lu  <hongjiu.lu@intel.com>
3207         PR boostrap/44470
3208         * config/i386/i386.md (*add<mode>_1): Revert revision 160394.
3209         (*addsi_1_zext) <TYPE_LEA>: Likewise.
3210         (add lea splitter): Likewise.
3211         (add_zext lea splitter): Likewise.
3213 2010-06-10  Joseph Myers  <joseph@codesourcery.com>
3215         * common.opt (fshow-column): Don't mark as C ObjC C++ ObjC++.
3217 2010-06-10  Jan Hubicka  <jh@suse.cz>
3219         * df-problems.c (df_live_problem_data): Add live_bitmaps.
3220         (df_live_alloc): Initialize problem data and live_osbtacks.
3221         (df_live_finalize): Remove obstack, problem data; do not
3222         clear all bitmaps.
3223         (df_live_top_dump, df_live_bottom_dump): Do not dump old
3224         data when not allocated.
3225         (df_live_verify_solution_start): Do not allocate problem data.
3226         (df_live_verify_solution_end): Check if out is allocated.
3227         (struct df_md_problem_data): New structure.
3228         (df_md_alloc): Allocate problem data.
3229         (df_md_free): Free problem data; do not clear bitmaps.
3231 2010-06-10  Jan Beulich  <jbeulich@novell.com>
3233         PR bootstrap/37304
3234         * configure.ac: Replace $() with ${} when intending to expand
3235         variables rather than invoking commands.
3236         * configure: Re-generate.
3238 2010-06-10  Jan Hubicka  <jh@suse.cz>
3240         PR rtl-optimization/44460
3241         * emit-rtl.c (set_mem_attributes_minus_bitpos): Remove
3242         TYPE_NEEDS_CONSTRUCTING sanity check.
3244 2010-06-10  Gerald Pfeifer  <gerald@pfeifer.com>
3246         * doc/include/fdl.texi: Move to GFDL version 1.3.
3248         * doc/cpp.texi: Move to GFDL version 1.3.
3249         * doc/gcc.texi: Move to GFDL version 1.3.  Fix copyright years.
3250         * doc/gccint.texi: Move to GFDL version 1.3.
3251         * doc/gcov.texi: Move to GFDL version 1.3.  Update copyright years.
3252         * doc/install.texi: Move to GFDL version 1.3.  Fix copyright years.
3253         * doc/invoke.texi: Move to GFDL version 1.3.
3255 2010-06-09  Jan Hubicka  <jh@suse.cz>
3257         * ipa-pure-const.c (propagate_pure_const, propagate_noreturn):
3258         Break out from ...
3259         (propagate) ... here; swap the order.
3261 2010-06-09  Jan Hubicka  <jh@suse.cz>
3263         * bitmap.c (bitmap_elt_insert_after, bitmap_first_set_bit,
3264         bitmap_first_set_bit, bitmap_last_set_bit, bitmap_last_set_bit,
3265         bitmap_and_into, bitmap_and_compl_into, bitmap_set_range,
3266         bitmap_compl_and_into, bitmap_elt_ior): Use checking asserts.
3268 2010-06-09  Changpeng Fang  <changpeng.fang@amd.com>
3270         * tree-ssa-loop-prefetch.c (gather_memory_references_ref):
3271         Do not the gather memory reference in the outer loop if the step
3272         is not a constant.
3274 2010-06-09  Changpeng Fang  <changpeng.fang@amd.com>
3276         * tree-ssa-loop-prefetch.c (PREFETCH_MOD_TO_UNROLL_FACTOR_RATIO) :
3277         Change the PREFETCH_MOD_TO_UNROLL_FACTOR_RATIO threshold value from
3278         8 to 4.  Minor change of the related comments.
3280 2010-06-09  Sebastian Pop  <sebastian.pop@amd.com>
3282         * tree-scalar-evolution.c (instantiate_scev_name): Do not fail
3283         the scev analysis when the variable is not used outside the loop
3284         in a close phi node: call compute_overall_effect_of_inner_loop.
3286 2010-06-09  Sebastian Pop  <sebastian.pop@amd.com>
3288         * graphite-sese-to-poly.c (single_pred_cond): Renamed
3289         single_pred_cond_non_loop_exit.  Return NULL for loop exit edges.
3290         (build_sese_conditions_before): Renamed call to single_pred_cond.
3291         (build_sese_conditions_after): Same.
3293 2010-06-09  Sebastian Pop  <sebastian.pop@amd.com>
3295         * graphite-poly.h: Fix comments and indentation.
3296         * graphite-sese-to-poly.c: Same.
3297         (build_sese_conditions_before): Compute stmt and gbb only when needed.
3298         * tree-chrec.c: Fix comments and indentation.
3299         (tree-ssa-loop-niter.c): Same.
3301 2010-06-09  Eric Botcazou  <ebotcazou@adacore.com>
3303         PR rtl-optimization/42461
3304         * dce.c (deletable_insn_p): Return true for const or pure calls again.
3305         * except.c (insn_could_throw_p): Return false if !flag_exceptions.
3307 2010-06-09  Jan Hubicka  <jh@suse.cz>
3309         * bitmap.c (bitmap_and): Walk array forward.
3310         (bitmap_and_compl_into): Likewise.
3311         (bitmap_xor): Likewise.
3312         (bitmap_xor_into):  Likewise.
3313         (bitmap_equal_p): Likewise.
3314         (bitmap_intersect_p): Likewise.
3315         (bitmap_intersect_compl_p): Likewise.
3316         (bitmap_ior_and_into): Likewise.
3317         (bitmap_elt_copy): Likewise.
3318         (bitmap_and_compl): Likewise.
3319         (bitmap_elt_ior): Likewise.
3321 2010-06-09  Dave Korn  <dave.korn.cygwin@gmail.com>
3323         * opts-common.c (prune_options): Ensure replacement argv array
3324         is correctly terminated by a NULL entry.
3326 2010-06-09  Jan Hubicka  <jh@suse.cz>
3328         * cgraph.h (varpool_first_static_initializer,
3329         varpool_next_static_initializer): Make checking only when
3330         checking enabled.
3331         * tree-vectorizer.h (vinfo_for_stmt): Remove check.
3332         (set_vinfo_for_stmt, get_earlier_stmt, is_loop_header_bb_p): Change
3333         gcc_assert to gcc_checking_assert.
3334         * tree-flow-inline.h (gimple_vop, get_var_ann, relink_imm_use,
3335         phi_nodes, set_phi_nodes, phi_arg_index_from_use, op_iter_next_use,
3336         op_iter_next_def, op_iter_next_tree, op_iter_init, op_iter_init_use,
3337         op_iter_init_phiuse, op_iter_init_phidef,
3338         array_ref_contains_indirect_ref, ref_contains_array_ref): Use
3339         gcc_checking_assert.
3340         * emit-rtl.h (set_first_insn, set_last_insn): Likewise.
3341         * tree-ssa-live.h (var_to_partition, var_to_partition_to_var,
3342         partition_is_global, live_on_entry, live_on_exit,
3343         live_merge_and_clear): Likewise.
3344         * system.h (gcc_checking_assert): New macro.
3345         * gimple.h (set_bb_seq): Use gcc_checking_assert.
3347 2010-06-09  Jason Merrill  <jason@redhat.com>
3349         * Makefile.in (TAGS): Collect tags info from c-family.
3351 2010-06-09  Jan Hubicka  <jh@suse.cz>
3353         * gimple.h (gcc_gimple_checking_assert): New macro.
3354         (gimple_set_def_ops, gimple_set_use_ops,
3355         gimple_set_vuse, gimple_set_vdef,
3356         gimple_omp_subcode, gimple_omp_set_subcode, gimple_ops, gimple_op,
3357         gimple_op_ptr, gimple_op_ptr, gimple_set_op, gimple_bind_set_block,
3358         gimple_asm_input_op, gimple_asm_input_op_ptr, gimple_asm_set_input_op,
3359         gimple_asm_output_op, gimple_asm_output_op_ptr,
3360         gimple_asm_set_output_op, gimple_asm_clobber_op,
3361         gimple_asm_set_clobber_op, gimple_asm_label_op,
3362         gimple_asm_set_label_op, gimple_try_set_kind,
3363         gimple_try_catch_is_cleanup, gimple_try_set_catch_is_cleanup,
3364         gimple_phi_arg, gimple_switch_num_labels, gimple_switch_set_index,
3365         gimple_switch_label, gimple_switch_set_label, gimple_omp_for_index,
3366         gimple_omp_for_index_ptr, gimple_omp_for_set_index,
3367         gimple_omp_for_initial, gimple_omp_for_initial_ptr,
3368         gimple_omp_for_set_initial, gimple_omp_for_final,
3369         gimple_omp_for_final_ptr, gimple_omp_for_set_final,
3370         gimple_omp_for_incr, gimple_omp_for_incr_ptr, gimple_omp_for_set_incr,
3371         gimple_omp_for_set_cond, gimple_omp_for_cond): Make checking
3372         conditional with ENABLE_GIMPLE_CHECKING.
3373         (gimple_phi_set_arg): Likewise; replace memcpy by assignment.
3375 2010-06-09  Sandra Loosemore  <sandra@codesourcery.com>
3377         * tree-ssa-loop-ivopts.c (adjust_setup_cost): New function.
3378         (get_computation_cost_at): Use it.
3379         (determine_use_iv_cost_condition): Likewise.
3380         (determine_iv_cost): Likewise.
3382 2010-06-09  Richard Guenther  <rguenther@suse.de>
3384         * tree-ssa-loop-niter.c (simplify_replace_tree): Do not
3385         replace constants.
3387 2010-06-09  Kai Tietz  <kai.tietz@onevision.com>
3389         * c-objc-common.c (c_tree_printer): Pre-intialize t by NULL_TREE.
3391 2010-06-09  Martin Jambor  <mjambor@suse.cz>
3393         PR tree-optimization/44423
3394         * tree-sra.c (dump_access): Dump also grp_assignment_read.
3395         (analyze_access_subtree): Pass negative allow_replacements to children
3396         if the current type is scalar.
3398 2010-06-09  Joern Rennecke  <joern.rennecke@embecosm.com>
3400         PR testsuite/42843
3401         * gcc-plugin.h (int plugin_is_GPL_compatible): Declare as extern "C".
3402         * doc/plugins.texi (Plugin license check): Update information
3403         on type of plugin_is_GPL_compatible.
3404         * Makefile.in (PLUGINCC): Define as $(COMPILER).
3405         (PLUGINCFLAGS): Define as $(COMPILER_FLAGS).
3407 2010-06-09  Bernd Schmidt  <bernds@codesourcery.com>
3409         * config/arm/arm.c (thumb2_reorg): New function.
3410         (arm_reorg): Call it.
3411         * config/arm/thumb2.md (define_peephole2 for flag clobbering
3412         arithmetic operations): Delete.
3414 2010-06-09  Edmar Wienskoski  <edmar@freescale.com>
3416         PR target/44067
3417         * config/rs6000/rs6000.md (DIFD): Do not split dpfp values for
3418         e500v2 target.
3420 2010-06-09  Joern Rennecke  <joern.rennecke@embecosm.com>
3422         PR plugins/44459
3423         * gcc-plugin.h: Encapsulate all declarations in extern "C".
3425 2010-06-08  Jan Hubicka  <jh@suse.cz>
3427         * basic-block.h (single_succ_edge, single_pred_edge, ei_container,
3428         ei_next, ei_prev): Do sanity checking with ENABLE_CHECKING only.
3430 2010-06-08  Sandra Loosemore  <sandra@codesourcery.com>
3432         PR tree-optimization/39874
3433         PR middle-end/28685
3434         * gimple.h (maybe_fold_and_comparisons, maybe_fold_or_comparisons):
3435         Declare.
3436         * gimple-fold.c (canonicalize_bool, same_bool_comparison_p,
3437         same_bool_result_p): New.
3438         (and_var_with_comparison, and_var_with_comparison_1,
3439         and_comparisons_1, and_comparisons, maybe_fold_and_comparisons): New.
3440         (or_var_with_comparison, or_var_with_comparison_1,
3441         or_comparisons_1, or_comparisons, maybe_fold_or_comparisons): New.
3442         * tree-ssa-reassoc.c (eliminate_redundant_comparison): Use
3443         maybe_fold_and_comparisons or maybe_fold_or_comparisons instead
3444         of combine_comparisons.
3445         * tree-ssa-ifcombine.c (ifcombine_ifandif, ifcombine_iforif): Likewise.
3447 2010-06-08  Anatoly Sokolov  <aesok@post.ru>
3449         * config/pdp11/pdp11.h (FUNCTION_VALUE, FUNCTION_OUTGOING_VALUE,
3450         LIBCALL_VALUE, FUNCTION_VALUE_REGNO_P): Remove macros.
3451         * config/pdp11/pdp11.c (pdp11_function_value, pdp11_libcall_value,
3452         pdp11_function_value_regno_p): New functions.
3453         (TARGET_FUNCTION_VALUE, TARGET_LIBCALL_VALUE,
3454         TARGET_FUNCTION_VALUE_REGNO_P): Define.
3456 2010-06-08  Kazu Hirata  <kazu@codesourcery.com>
3458         * config/arm/arm.c (arm_rtx_costs_1): Don't special case for
3459         Thumb-2 in the MINUS case.
3461 2010-06-08  Laurynas Biveinis  <laurynas.biveinis@gmail.com>
3463         * doc/tm.texi (Per-Function Data): Do not reference ggc_alloc.
3465         * doc/gty.texi (GTY Options): Document typed GC allocation and
3466         variable_size GTY option.
3468         * ggc-internal.h: New.
3470         * ggc.h: Update copyright year.
3471         (digit_string): Move to stringpool.c.
3472         (ggc_mark_stringpool, ggc_purge_stringpool, ggc_mark_roots)
3473         (gt_pch_save_stringpool, gt_pch_fixup_stringpool)
3474         (gt_pach_restore_stringpool, gt_pch_p_S, gt_pch_note_object)
3475         (init_ggc_pch, ggc_pch_count_object, ggc_pch_total_size)
3476         (ggc_pch_this_base, ggc_pch_alloc_object, ggc_pch_prepare_write)
3477         (ggc_pch_write_object, ggc_pch_finish, ggc_pch_read)
3478         (ggc_force_collect, ggc_get_size, ggc_statistics)
3479         (ggc_print_common_statistics): Move to ggc-internal.h.
3480         (digit_vector, new_ggc_zone, destroy_ggc_zone, ggc_alloc_stat)
3481         (ggc_alloc, ggc_alloc_cleared, ggc_realloc, ggc_calloc, GGC_NEW)
3482         (GGC_CNEW, GGC_NEWVEC, GGC_CNEWVEC, GGC_NEWVAR, ggc_alloc_rtvec)
3483         (ggc_alloc_tree, gt_pch_save, ggc_min_expand_heuristic)
3484         (ggc_min_heapsize_heuristic, ggc_alloc_zone)
3485         (ggc_alloc_zone_pass_stat): Remove.
3486         (ggc_internal_alloc_stat, ggc_internal_alloc)
3487         (ggc_internal_cleared_alloc_stat): New.
3488         (GGC_RESIZEVEC, GGC_RESIZEVAR): Redefine.
3489         (ggc_internal_vec_alloc_stat)
3490         (ggc_internal_cleared_vec_alloc_stat)
3491         (ggc_internal_vec_alloc_stat, ggc_internal_cleared_vec_alloc)
3492         (ggc_alloc_atomic_stat, ggc_alloc_atomic)
3493         (ggc_alloc_cleared_atomic, ggc_cleared_alloc_htab_ignore_args)
3494         (ggc_cleared_alloc_ptr_array_two_args): New.
3495         (htab_create_ggc, splay_tree_new_ggc): Redefine.
3496         (ggc_splay_alloc): Change the type of the first argument to
3497         enum gt_types_enum.
3498         (ggc_alloc_string): Make macro.
3499         (ggc_alloc_string_stat): New.
3500         (ggc_strdup): Redefine.
3501         (rtl_zone, tree_zone, tree_id_zone): Declare unconditionally.
3502         (ggc_alloc_rtvec_sized): New.
3503         (ggc_alloc_zone_stat): Rename to ggc_internal_alloc_zone_stat.
3504         (ggc_internal_alloc_zone_pass_stat, ggc_internal_alloc_zone_stat)
3505         (ggc_internal_cleared_alloc_zone_stat)
3506         (ggc_internal_zone_alloc_stat)
3507         (ggc_internal_zone_cleared_alloc_stat)
3508         (ggc_internal_zone_vec_alloc_stat)
3509         (ggc_alloc_zone_rtx_def_stat)
3510         (ggc_alloc_zone_tree_node_stat)
3511         (ggc_alloc_zone_cleared_tree_node_stat)
3512         (ggc_alloc_cleared_gimple_statement_d_stat): New.
3514         * ggc-common.c: Include ggc-internal.h.
3515         (ggc_internal_cleared_alloc_stat): Rename from
3516         ggc_alloc_cleared_stat.
3517         (ggc_realloc_stat): Use ggc_internal_alloc_stat.
3518         (ggc_calloc): Remove.
3519         (ggc_cleared_alloc_htab_ignore_args): New.
3520         (ggc_cleared_alloc_ptr_array_two_args): New.
3521         (ggc_splay_alloc): Add obj_type parameter.
3522         (init_ggc_heuristics): Formatting fixes.
3524         * ggc-none.c: Update copyright year.
3525         (ggc_alloc_stat): Rename to ggc_alloc_stat.
3526         (ggc_alloc_cleared_stat): Rename to
3527         ggc_internal_cleared_alloc_stat.
3528         (struct alloc_zone, rtl_zone, tree_zone, tree_id_zone): New.
3530         * ggc-page.c: Update copyright year.  Include ggc-internal.h.
3531         Remove references to ggc_alloc in comments.
3532         (ggc_alloc_typed_stat): Call ggc_internal_alloc_stat.
3533         (ggc_alloc_stat): Rename to ggc_internal_alloc_stat.
3534         (new_ggc_zone, destroy_ggc_zone): Remove.
3535         (struct alloc_zone, rtl_zone, tree_zone, tree_id_zone): New.
3537         * ggc-zone.c: Include ggc-internal.h.  Remove references to
3538         ggc_alloc in comments.
3539         (ggc_alloc_zone_stat): ggc_internal_alloc_zone_stat.
3540         (ggc_internal_alloc_zone_pass_stat): New.
3541         (ggc_internal_cleared_alloc_zone_stat): New.
3542         (ggc_alloc_typed_stat): Use ggc_internal_alloc_zone_pass_stat.
3543         (ggc_alloc_stat): Rename ggc_internal_alloc_stat.
3544         (new_ggc_zone, destroy_ggc_zone): Remove.
3546         * stringpool.c: Update copyright year.  Include ggc-internal.h
3547         (digit_vector): Make static.
3548         (digit_string): Moved from ggc.h.
3549         (stringpool_ggc_alloc): Use ggc_alloc_atomic.
3550         (ggc_alloc_string): Rename to ggc_alloc_string_stat.
3552         * Makefile.in (GGC_INTERNAL_H): New.
3553         (ggc_common.o, ggc-page.o, ggc-zone.o, stringpool.o): Add
3554         $(GGC_INTERNAL_H) to dependencies.
3556         * gentype.c: Update copyright year.
3557         (walk_type): Accept variable_size GTY option.
3558         (USED_BY_TYPED_GC_P): New macro.
3559         (write_enum_defn): Use USED_BY_TYPED_GC_P.  Do not output
3560         whitespace at the end of strings.
3561         (get_type_specifier, variable_size_p): New functions.
3562         (alloc_quantity, alloc_zone): New enums.
3563         (write_typed_alloc_def): New function.
3564         (write_typed_struct_alloc_def): Likewise.
3565         (write_typed_typed_typedef_alloc_def): Likewise.
3566         (write_typed_alloc_defns): Likewise.
3567         (output_typename, write_splay_tree_allocator_def): Likewise.
3568         (write_splay_tree_allocators): Likewise.
3569         (main): Call write_typed_alloc_defns and
3570         write_splay_tree_allocators.
3572         * lto-streamer.h (lto_file_decl_data_ptr): New.
3574         * passes.c (order): Define using cgraph_node_ptr.
3576         * strinpool.c (struct string_pool_data): Declare nested_ptr using
3577         ht_identifier_ptr.
3579         * gimple.h (union gimple_statement_d): Likewise.
3581         * rtl.h (struct rtx_def): Likewise.
3582         (struct rtvec_def): Likewise.
3584         * tree.h (union tree_node): Likewise.
3586         * tree-ssa-operands.h (struct ssa_operand_memory_d): Likewise.
3588         * cfgloop.c (record_loop_exits): Use htab_create_ggc.
3590         * tree-scalar-evolution.c (scev_initialize): Likewise.
3592         * alias.c (record_alias_subset): Update splay_tree_new_ggc call.
3594         * dwarf2asm.c (dw2_force_const_mem): Likewise.
3596         * omp-low.c (lower_omp_critical): Likewise.
3598         * bitmap.h (struct bitmap_head_def): Update comment to not
3599         reference ggc_alloc.
3601         * config/pa/pa.c (get_deferred_label): Use GGC_RESIZEVEC.
3603         * ira.c (fix_reg_equiv_init): Use GGC_RESIZEVEC.
3605         * ipa-prop.c (duplicate_ggc_array): Rename to
3606         duplicate_ipa_jump_func_array.  Use typed GC allocation.
3607         (ipa_edge_duplication_hook): Call duplicate_ipa_jump_func_array.
3609         * gimple.c (gimple_alloc_stat): Use
3610         ggc_alloc_cleared_gimple_statement_d_stat.
3612         * varasm.c (create_block_symbol): Use ggc_alloc_zone_rtx_def.
3614         * tree.c (make_node_stat): Use
3615         ggc_alloc_zone_cleared_tree_node_stat.
3616         (make_tree_vec_stat): Likewise.
3617         (build_vl_exp_stat): Likewise.
3618         (copy_node_stat): Use ggc_alloc_zone_tree_node_stat.
3619         (make_tree_binfo_stat): Likewise.
3620         (tree_cons_stat): Likewise.
3622         * rtl.c (rtx_alloc_stat): Use ggc_alloc_zone_rtx_def_stat.
3623         (shallow_copy_rtx_stat): Likewise.
3624         (make_node_stat): Likewise.
3626         * lto-symtab.c: Fix comment.
3628         * tree-cfg.c (create_bb): Update comment to not reference
3629         ggc_alloc_cleared.
3630         * tree-ssa-structalias.c (struct heapvar_for_stmt): Fix param_is value.
3632         * varpool.c (varpool_node): Use typed GC allocation.
3633         (varpool_extra_name_alias): Likewise.
3635         * varasm.c (emutls_decl): Likewise.
3636         (get_unnamed_section): Likewise.
3637         (get_noswitch_section): Likewise.
3638         (get_section): Likewise.
3639         (get_block_for_section): Likewise.
3640         (build_constant_desc): Likewise.
3641         (create_constant_pool): Likewise.
3642         (force_const_mem): Likewise.
3644         * tree.c (build_vl_exp_stat): Likewise.
3645         (build_real): Likewise.
3646         (build_string): Likewise.
3647         (decl_debug_expr_insert): Likewise.
3648         (decl_value_expr_insert): Likewise.
3649         (type_hash_add): Likewise.
3650         (build_omp_clause): Likewise.
3652         * tree-ssanames.c (duplicate_ssa_name_ptr_info): Likewise.
3654         * tree-ssa.c (init_tree_ssa): Likewise.
3656         * tree-ssa-structalias.c (heapvar_insert): Likewise.
3658         * tree-ssa-operands.c (ssa_operand_alloc): Likewise.
3660         * tree-ssa-loop-niter.c (record_estimate): Likewise.
3662         * tree-ssa-alias.c (get_ptr_info): Likewise.
3664         * tree-scalar-evolution.c (new_scev_info_str): Likewise.
3666         * tree-phinodes.c (allocate_phi_node): Likewise.
3668         * tree-iterator.c (tsi_link_before): Likewise.
3669         (tsi_link_after): Likewise.
3671         * tree-eh.c (add_stmt_to_eh_lp_fn): Likewise.
3673         * tree-dfa.c (create_var_ann): Likewise.
3675         * tree-cfg.c (create_bb): Likewise.
3677         * toplev.c (alloc_for_identifier_to_locale): Likewise.
3678         (general_init): Likewise.
3680         * stringpool.c (stringpool_ggc_alloc): Likewise.
3681         (gt_pch_save_stringpool): Likewise.
3683         * sese.c (if_region_set_false_region): Likewise.
3685         * passes.c (do_per_function_toporder): Likewise.
3687         * optabs.c (set_optab_libfunc): Likewise.
3688         (set_conv_libfunc): Likewise.
3690         * lto-symtab.c (lto_symtab_register_decl): Likewise.
3692         * lto-streamer-in.c (lto_input_eh_catch_list): Likewise.
3693         (input_eh_region): Likewise.
3694         (input_eh_lp): Likewise.
3695         (make_new_block): Likewise.
3696         (unpack_ts_real_cst_value_fields): Likewise.
3698         * lto-section-in.c (lto_new_in_decl_state): Likewise.
3700         * lto-cgraph.c (input_node_opt_summary): Likewise.
3702         * loop-init.c (loop_optimizer_init): Likewise.
3704         * lambda.h (lambda_vector_new): Likewise.
3706         * lambda-code.c (replace_uses_equiv_to_x_with_y): Likewise.
3708         * ira.c (update_equiv_regs): Likewise.
3710         * ipa.c (cgraph_node_set_new): Likewise.
3711         (cgraph_node_set_add): Likewise.
3712         (varpool_node_set_new): Likewise.
3713         (varpool_node_set_add): Likewise.
3715         * ipa-prop.c (ipa_compute_jump_functions_for_edge): Likewise.
3716         (duplicate_ipa_jump_func_array): Likewise.
3717         (ipa_read_node_info): Likewise.
3719         * ipa-cp.c (ipcp_create_replace_map): Likewise.
3721         * integrate.c (get_hard_reg_initial_val): Likewise.
3723         * gimple.c (gimple_alloc_stat): Likewise.
3724         (gimple_build_omp_for): Likewise.
3725         (gimple_seq_alloc): Likewise.
3726         (gimple_copy): Likewise.
3728         * gimple-iterator.c (gsi_insert_before_without_update): Likewise.
3729         (gsi_insert_after_without_update): Likewise.
3731         * function.c (add_frame_space): Likewise.
3732         (insert_temp_slot_address): Likewise.
3733         (assign_stack_temp_for_type): Likewise.
3734         (allocate_struct_function): Likewise.
3735         (types_used_by_var_decl_insert): Likewise.
3737         * except.c (init_eh_for_function): Likewise.
3738         (gen_eh_region): Likewise.
3739         (gen_eh_region_catch): Likewise.
3740         (gen_eh_landing_pad): Likewise.
3741         (add_call_site): Likewise.
3743         * emit-rtl.c (get_mem_attrs): Likewise.
3744         (get_reg_attrs): Likewise.
3745         (start_sequence): Likewise.
3746         (init_emit): Likewise.
3748         * dwarf2out.c (new_cfi): Likewise.
3749         (queue_reg_save): Likewise.
3750         (dwarf2out_frame_init): Likewise.
3751         (new_loc_descr): Likewise.
3752         (find_AT_string): Likewise.
3753         (new_die): Likewise.
3754         (add_var_loc_to_decl): Likewise.
3755         (clone_die): Likewise.
3756         (clone_as_declaration): Likewise.
3757         (break_out_comdat_types): Likewise.
3758         (new_loc_list): Likewise.
3759         (loc_descriptor): Likewise.
3760         (add_loc_descr_to_each): Likewise.
3761         (add_const_value_attribute): Likewise.
3762         (tree_add_const_value_attribute): Likewise.
3763         (add_comp_dir_attribute): Likewise.
3764         (add_name_and_src_coords_attributes): Likewise.
3765         (lookup_filename): Likewise.
3766         (store_vcall_insn): Likewise.
3767         (dwarf2out_init): Likewise.
3769         * dbxout.c (dbxout_init): Likewise.
3771         * config/xtensa/xtensa.c (xtensa_init_machine_status): Likewise.
3773         * config/sparc/sparc.c (sparc_init_machine_status): Likewise.
3775         * config/score/score7.c (score7_output_external): Likewise.
3777         * config/score/score3.c (score3_output_external): Likewise.
3779         * config/s390/s390.c (s390_init_machine_status): Likewise.
3781         * config/rs6000/rs6000.c (builtin_function_type): Likewise.
3782         (rs6000_init_machine_status): Likewise.
3783         (output_toc): Likewise.
3785         * config/pa/pa.c (pa_init_machine_status): Likewise.
3786         (get_deferred_plabel): Likewise.
3788         * config/moxie/moxie.c (moxie_init_machine_status): Likewise.
3790         * config/mmix/mmix.c (mmix_init_machine_status): Likewise.
3792         * config/mips/mips.c (mflip_mips16_use_mips16_p): Likewise.
3794         * config/mep/mep.c (mep_init_machine_status): Likewise.
3795         (mep_note_pragma_flag): Likewise.
3797         * config/m32c/m32c.c (m32c_init_machine_status): Likewise.
3799         * config/iq2000/iq2000.c (iq2000_init_machine_status): Likewise.
3801         * config/ia64/ia64.c (ia64_init_machine_status): Likewise.
3803         * config/i386/winnt.c (i386_pe_record_external_function): Likewise.
3804         (i386_pe_maybe_record_exported_symbol): Likewise.
3806         * config/i386/i386.c (get_dllimport_decl): Likewise.
3807         (ix86_init_machine_status): Likewise.
3808         (assign_386_stack_local): Likewise.
3810         * config/frv/frv.c (frv_init_machine_status): Likewise.
3812         * config/darwin.c (machopic_indirection_name): Likewise.
3814         * config/cris/cris.c (cris_init_machine_status): Likewise.
3816         * config/bfin/bfin.c (bfin_init_machine_status): Likewise.
3818         * config/avr/avr.c (avr_init_machine_status): Likewise.
3820         * config/arm/arm.c (arm_init_machine_status): Likewise.
3822         * config/alpha/alpha.c (alpha_init_machine_status): Likewise.
3823         (alpha_need_linkage): Likewise.
3824         (alpha_use_linkage): Likewise.
3826         * cgraph.c (cgraph_allocate_node): Likewise.
3827         (cgraph_create_edge_1): Likewise.
3828         (cgraph_create_indirect_edge): Likewise.
3829         (cgraph_add_asm_node): Likewise.
3831         * cfgrtl.c (init_rtl_bb_info): Likewise.
3833         * cfgloop.c (alloc_loop): Likewise.
3834         (rescan_loop_exit): Likewise.
3836         * cfg.c (init_flow): Likewise.
3837         (alloc_block): Likewise.
3838         (unchecked_make_edge): Likewise.
3840         * c-parser.c (c_parse_init): Likewise.
3841         (c_parse_file): Likewise.
3843         * c-decl.c (bind): Likewise.
3844         (record_inline_static): Likewise.
3845         (push_scope): Likewise.
3846         (make_label): Likewise.
3847         (lookup_label_for_goto): Likewise.
3848         (finish_struct): Likewise.
3849         (finish_enum): Likewise.
3850         (c_push_function_context): Likewise.
3852         * bitmap.c (bitmap_element_allocate): Likewise.
3853         (bitmap_gc_alloc_stat): Likewise.
3855         * alias.c (record_alias_subset): Likewise.
3856         (init_alias_analysis): Likewise.
3858 2010-06-08  Shujing Zhao  <pearly.zhao@oracle.com>
3860         * fold-const.c (fold_comparison): Remove redundant parenthesis.
3861         * tree-inline.c (expand_call_inline): Pass translated return value of
3862         cgraph_inline_failed_string to diagnostic function.
3864 2010-06-08  Andrew Pinski  <pinskia@gmail.com>
3865             Shujing Zhao  <pearly.zhao@oracle.com>
3867         PR c/37724
3868         * c-typeck.c (convert_for_assignment): Call pedwarn_init if the
3869         implicit bad conversions is initialization.
3870         (error_init): Use gmsgid instead of msgid for argument name and change
3871         the call for error.
3872         (pedwarn_init): Use gmsgid instead of msgid for argument name and
3873         change the call for pedwarn.
3874         (warning_init): Use gmsgid instead of msgid for argument name and
3875         change the call for warning.
3877 2010-06-07  Nathan Froyd  <froydnj@codesourcery.com>
3879         * config/mips/mips-protos.h (mips_print_operand): Delete.
3880         (mips_print_operand_address): Delete.
3881         * config/mips/mips.h (mips_print_operand_punct): Delete.
3882         (PRINT_OPERAND): Delete.
3883         (PRINT_OPERAND_PUNCT_VALID_P): Delete.
3884         (PRINT_OPERAND_ADDRESS): Delete.
3885         * config/mips/mips.c (mips_print_operand_punct): Make static.
3886         (mips_print_operand_address): Make static.
3887         (mips_print_operand): Make static.  Call
3888         mips_print_operand_punct_valid_p.
3889         (mips_print_operand_punct_valid_p): New function.
3890         (TARGET_PRINT_OPERAND, TARGET_PRINT_OPERAND_ADDRESS): Define.
3891         (TARGET_PRINT_OPERAND_PUNCT_VALID_P): Define.
3893 2010-06-07  Jan Hubicka  <jh@suse.cz>
3895         PR middle-end/44454
3896         (df_lr_top_dump, df_lr_bottom_dump): Check that in/out bitmaps
3897         are allocated.
3899 2010-06-07  Kaz Kojima  <kkojima@gcc.gnu.org>
3901         * config/sh/sh.c (sh_build_builtin_va_list): Set tree type
3902         name of RECORD.
3904 2010-06-07  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
3906         * doc/sourcebuild.texi (Effective-Target Keywords, Other
3907         attributes): Document gas.
3909 2010-06-07  Uros Bizjak  <ubizjak@gmail.com>
3911         * config/i386/i386.md (*add<mode>_1): Remove alternative 2.
3912         <TYPE_LEA>: Split instruction.
3913         <default>: Remove alternative 2 handling.
3914         (*addsi_1_zext) <TYPE_LEA>: Split instruction.
3915         (add lea splitter): Generate SImode lea for mode sizes <= SImode.
3916         (add_zext lea splitter): Use ix86_lea_for_add_ok in insn predicate.
3918         (*movsi_1) <TYPE_LEA>: Use %a modifier to output operand 1.
3919         (ashift_zext lea splitter): Use DImode for multiplication.
3921         * config/i386/i386.c (ix86_expand_epilogue): Do not use ix86_gen_add
3922         to generate addition.
3924 2010-06-07  Joseph Myers  <joseph@codesourcery.com>
3926         * common.opt (fira-verbose): Use Var.
3927         (fpcc-struct-return): Use Init instead of VarExists.
3928         * defaults.h (DEFAULT_PCC_STRUCT_RETURN): Move definition from
3929         toplev.c.
3930         * flags.h (flag_signed_char, flag_short_enums,
3931         flag_pcc_struct_return, flag_ira_verbose,
3932         flag_detailed_statistics, flag_remove_unreachable_functions): Remove.
3933         * toplev.c (flag_detailed_statistics, flag_signed_char,
3934         flag_short_enums, flag_pcc_struct_return, flag_ira_verbose): Remove.
3935         (DEFAULT_PCC_STRUCT_RETURN): Move definition to defaults.h.
3936         * toplev.h (flag_crossjumping, flag_if_conversion,
3937         flag_if_conversion2, flag_keep_static_consts, flag_peel_loops,
3938         flag_rerun_cse_after_loop, flag_thread_jumps, flag_tracer,
3939         flag_unroll_loops, flag_unroll_all_loops, flag_unswitch_loops,
3940         flag_cprop_registers, time_report, flag_ira_loop_pressure,
3941         flag_ira_coalesce, flag_ira_move_spills,
3942         flag_ira_share_save_slots, flag_ira_share_spill_slots): Remove.
3944 2010-06-07  Jan Hubicka  <jh@suse.cz>
3946         * df-core.c (df_analyze_problem): Do verification after allocation.
3948         * df-problems.c (df_lr_problem_data): Add lr_bitmaps.
3949         (df_lr_alloc): Initialize problem data; move bitmaps to
3950         lr_bitmaps obstack.
3951         (df_lr_finalize): Free problem data; do not bother to free bitmaps.
3952         (df_lr_verify_solution_start): Do not initialize problem data;
3953         allocate bitmaps in lr_bitmaps.
3954         (df_lr_verify_solution_end): Do not free problem data.
3956 2010-06-07  Jan Hubicka  <jh@suse.cz>
3958         * cgraph.c (cgraph_edge_cannot_lead_to_return): Also check
3959         if caller is noreturn.
3960         * ipa-reference.c (analyze_function): Use ipa_ref_cannot_lead_to_return
3961         * ipa-ref.h (ipa_ref_cannot_lead_to_return): New function.
3962         * ipa-ref.c (ipa_ref_cannot_lead_to_return): New function.
3963         * ipa-pure-const.c (check_decl): Add IPA parameter.
3964         (state_from_flags): New function.
3965         (better_state, worse_state): New functions.
3966         (check_call): When in IPA mode, do not care about callees.
3967         (check_load, check_store): Update.
3968         (check_ipa_load, check_ipa_store): New.
3969         (check_stmt): When in IPA mode, use IPA checkers.
3970         (analyze_function): Use state_from_flags.
3971         (propagate): Check indirect edges and references.
3973 2010-06-07  Kazu Hirata  <kazu@codesourcery.com>
3975         PR rtl-optimization/44404
3976         * auto-inc-dec.c (find_inc): Use reg_overlap_mentioned_p instead
3977         of count_occurrences to see if it's safe to modify mem_insn.
3979 2010-06-07  Richard Guenther  <rguenther@suse.de>
3981         * gimplify.c (gimplify_cleanup_point_expr): For empty body
3982         and EH-only cleanup drop the cleanup instead of inserting it
3983         unconditionally.
3985 2010-06-07  Ira Rosen  <irar@il.ibm.com>
3987         * doc/tm.texi (TARGET_VECTORIZE_BUILTIN_VECTORIZATION_COST): Update
3988         documentation.
3989         * targhooks.c (default_builtin_vectorization_cost): New function.
3990         * targhooks.h (default_builtin_vectorization_cost): Declare.
3991         * target.h (enum vect_cost_for_stmt): Define.
3992         (builtin_vectorization_cost): Change argument and comment.
3993         * tree-vectorizer.h: Remove cost model macros.
3994         * tree-vect-loop.c: Include target.h.
3995         (vect_get_cost): New function.
3996         (vect_estimate_min_profitable_iters): Replace cost model macros with
3997         calls to vect_get_cost.
3998         (vect_model_reduction_cost, vect_model_induction_cost): Likewise.
3999         * target-def.h (TARGET_VECTORIZE_BUILTIN_VECTORIZATION_COST): Add
4000         default implementation.
4001         * tree-vect-stmts.c (cost_for_stmt): Replace cost model macros with
4002         calls to target hook builtin_vectorization_cost.
4003         (vect_model_simple_cost, vect_model_store_cost, vect_model_load_cost):
4004         Likewise.
4005         * Makefile.in (tree-vect-loop.o): Add dependency on TARGET_H.
4006         * config/spu/spu.c (spu_builtin_vectorization_cost): Replace with new
4007         implementation to return costs.
4008         * config/i386/i386.c (ix86_builtin_vectorization_cost): Likewise.
4009         * config/spu/spu.h: Remove vectorizer cost model macros.
4010         * config/i386/i386.h: Likewise.
4011         * tree-vect-slp.c (vect_build_slp_tree): Replace cost model macro with
4012         a call to target hook builtin_vectorization_cost.
4014 2010-06-06  Sriraman Tallam  <tmsriram@google.com>
4016         PR target/44319
4017         * config/i386/i386.c (override_options): Turn zee pass on for level 2
4018         and above and defer till target is known.
4019         (optimization_options): Turn on zee pass if TARGET_64BIT is set and
4020         turn off otherwise.
4022 2010-05-25  Jan Hubicka  <jh@suse.cz>
4024         * df-core.c (df_set_blocks): Use bitmap_head instead of bitmap.
4025         (df_compact_blocks): Likewise.
4026         * df.h (struct df): Turn hardware_regs_used,
4027         regular_block_artificial_uses, eh_block_artificial_uses,
4028         insns_to_delete, insns_to_rescan, insns_to_notes_rescan into
4029         bitmap_head.
4030         * df-problems.c (df_lr_local_compute, df_lr_confluence_0,
4031         df_byte_lr_alloc, df_simulate_fixup_sets): Update.
4032         * df-scan.c (df_scan_free_internal, df_scan_alloc, df_scan_start_dump,
4033         df_scan_blocks, df_insn_delete, df_insn_rescan,
4034         df_insn_rescan_debug_internal, df_insn_rescan_all,
4035         df_process_deferred_rescans, df_process_deferred_rescans,
4036         df_notes_rescan, df_get_call_refs, df_get_call_refs,
4037         regs_invalidated_by_call_regset, df_get_call_refs, df_bb_refs_collect,
4038         df_record_entry_block_defs, df_record_exit_block_uses,
4039         df_update_exit_block_uses, df_bb_verify, df_entry_block_bitmap_verify,
4040         df_scan_verify): Update.
4042 2010-05-25  Dodji Seketeli  <dodji@redhat.com>
4044         PR c++/44188
4045         * c-common.c (is_typedef_decl): Move this definition ...
4046         * tree.c (is_typedef_decl): ... here.
4047         (typdef_variant_p): Move definition here from gcc/cp/tree.c.
4048         * c-common.h (is_typedef_decl): Move this declaration ...
4049         * tree.h (is_typedef_decl): ... here.
4050         (typedef_variant_p): Move declaration here from gcc/cp/cp-tree.h
4051         * dwarf2out.c (is_naming_typedef_decl): New function.
4052         (gen_tagged_type_die): Split out of ...
4053         (gen_type_die_with_usage): ... this function. When an anonymous
4054         tagged type is named by a typedef, make sure a DW_TAG_typedef DIE
4055         is emitted for the typedef.
4056         (gen_typedef_die): Emit DW_TAG_typedef also for typedefs naming
4057         anonymous tagged types.
4059 2010-06-06  Manuel López-Ibáñez  <manu@gcc.gnu.org>
4061         PR c/20000
4062         * c-decl.c (grokdeclarator): Delete warning.
4064 2010-06-06  Eric Botcazou  <ebotcazou@adacore.com>
4066         * stor-layout.c (self_referential_size): Set UNKNOWN_LOCATION on the
4067         newly built CALL_EXPR.
4068         * tree-profile.c (tree_profiling): Don't profile functions produced
4069         for built-in stuff.
4071 2010-06-06  Segher Boessenkool  <segher@kernel.crashing.org>
4073         PR bootstrap/44427
4074         PR bootstrap/44428
4075         * genautomata.c (SET_BIT, CLEAR_BIT, TEST_BIT): Make these macros
4076         endianness-independent.
4078 2010-06-05  Steven Bosscher  <steven@gcc.gnu.org>
4080         * c-common.c: Move to c-family/.
4081         * c-common.def: Likewise.
4082         * c-common.h: Likewise.
4083         * c-cppbuiltin.c: Likewise.
4084         * c-dump.c: Likewise.
4085         * c-format.c: Likewise.
4086         * c-format.h : Likewise.
4087         * c-gimplify.c: Likewise.
4088         * c-lex.c: Likewise.
4089         * c-omp.c: Likewise.
4090         * c.opt: Likewise.
4091         * c-opts.c: Likewise.
4092         * c-pch.c: Likewise.
4093         * c-ppoutput.c: Likewise.
4094         * c-pragma.c: Likewise.
4095         * c-pragma.h: Likewise.
4096         * c-pretty-print.c: Likewise.
4097         * c-pretty-print.h: Likewise.
4098         * c-semantics.c: Likewise.
4099         * stub-objc.c: Likewise.
4101         * gengtype.c (get_file_langdir): Special-case files in c-family/.
4102         (get_output_file_with_visibility): Fix name for c-common.h.
4103         * c-config-lang.in: Update paths in gtfiles for files in c-family/.
4105         * c-tree.h: Update include path for moved files.
4106         * c-lang.c: Likewise.
4107         * c-lang.h: Likewise.
4108         * c-parser.c: Likewise.
4109         * c-convert.c: Likewise.
4110         * c-decl.c: Likewise.
4111         * c-objc-common.c: Likewise.
4112         * configure.ac: Make sure c-family/ exists in the build directory.
4113         * configure: Regenerate.
4114         * Makefile.in: Update paths for moved files.  Regroup files per
4115         location and update dependencies.  Move generated_files down after
4116         ALL_GTFILES_H.
4118         * config/spu/spu-c.c: Update paths for moved files.
4119         * config/mep/mep-pragma.c: Likewise.
4120         * config/darwin-c.c: Likewise.
4121         * config/i386/msformat-c.c: Likewise.
4122         * config/i386/i386-c.c: Likewise.
4123         * config/avr/avr-c.c: Likewise.
4124         * config/sol2-c.c: Likewise.
4125         * config/ia64/ia64-c.c: Likewise.
4126         * config/rs6000/rs6000-c.c: Likewise.
4127         * config/arm/arm.c: Likewise.
4128         * config/arm/arm-c.c: Likewise.
4129         * config/h8300/h8300.c: Likewise.
4130         * config/v850/v850-c.c: Likewise.
4132         * config/t-darwin: Fix dependencies for moved files.
4133         * config/t-sol2: Fix dependencies for moved files.
4134         * config/mep/t-mep: Fix dependencies for moved files.
4135         * config/ia64/t-ia64: Fix dependencies for moved files.
4136         * config/rs6000/t-rs6000: Fix dependencies for moved files.
4137         * config/v850/t-v850: Fix dependencies for moved files.
4138         * config/v850/t-v850e: Fix dependencies for moved files.
4140         * config/m32c/m32c-pragma.c
4142         * po/exgettext: Look in c-family/ also.
4144 2010-06-05  Eric Botcazou  <ebotcazou@adacore.com>
4146         * tree-ssa-dce.c (mark_last_stmt_necessary): New function.
4147         (mark_control_dependent_edges_necessary): Call it instead of marking
4148         the last statement manually.
4149         (propagate_necessity): Likewise.
4151 2010-06-05  Jan Hubicka  <jh@suse.cz>
4153         * basic-block.h (compute_dominance_frontiers): Updated.
4154         (compute_idf): Likewise.
4156         * tree-into-ssa.c (insert_phi_nodes): Use bitmap heads
4157         for dominance frontiers.
4158         (rewrite_into_ssa): Update for bitmap heads in dominance frontiers.
4159         (insert_updated_phi_nodes_for): Likewise.
4160         (update_ssa): Likewise.
4161         * cfganal.c (compute_dominance_frontiers_1): Likewise.
4162         (compute_dominance_frontiers): Likewise.
4163         (compute_idf): Likewise.
4164         * df-problems.c (df_md_local_compute): Likewise.
4166 2010-06-05  Anatoly Sokolov  <aesok@post.ru>
4168         * target.h (struct gcc_target): Add memory_move_cost field.
4169         * target-def.h (TARGET_MEMORY_MOVE_COST): New.
4170         (TARGET_INITIALIZER): Use TARGET_MEMORY_MOVE_COST.
4171         * targhooks.c (default_memory_move_cost): New function.
4172         * targhooks.h (default_memory_move_cost): Declare function.
4173         * reload.h (memory_move_cost): Declare.
4174         (memory_move_secondary_cost): Change type of 'in' argument to bool.
4175         * reginfo.c (memory_move_cost): New function.
4176         (memory_move_secondary_cost): Change type of 'in' argument to bool.
4177         * ira.h (ira_memory_move_cost): Update comment.
4178         * ira.c: (ira_memory_move_cost): Update comment.
4179         (setup_class_subset_and_memory_move_costs): Replace MEMORY_MOVE_COST
4180         with memory_move_cost.
4181         * postreload.c (reload_cse_simplify_set): (Ditto.).
4182         * reload1.c (choose_reload_regs): (Ditto.).
4183         * doc/tm.texi (TARGET_MEMORY_MOVE_COST): New.
4184         (MEMORY_MOVE_COST):  Revise documentation.
4186         * config/i386/i386.h (MEMORY_MOVE_COST): Remove macro.
4187         * config/i386/i386-protos.h (int ix86_memory_move_cost): Remove.
4188         * config/i386/i386.h (ix86_memory_move_cost): Make static. Change
4189         type of 'in' argument to bool.
4190         (TARGET_MEMORY_MOVE_COST): Define.
4192 2010-06-05  Jan Hubicka  <jh@suse.cz>
4194         * ipa-pure-const.c (propagate): Fix typo in handling of functions
4195         that cannot return.  Be more careful when merging the results with
4196         previously known ones.
4198 2010-06-05  Matthias Klose  <doko@ubuntu.com>
4200         * gcc.c (cc1_options, cpp_unique_options): Use find-plugindir spec
4201         function to add the -iplugindir option.
4202         (find_plugindir_spec_function): Add new declaration and function.
4203         (static_spec_func): Use it for "find-plugindir".
4205 2010-06-05  Jakub Jelinek  <jakub@redhat.com>
4207         PR c++/44361
4208         * c-typeck.c (mark_exp_read): Handle C_MAYBE_CONST_EXPR.
4209         * c-parser.c (c_parser_postfix_expression): Call mark_exp_read on
4210         statement expression.
4212 2010-06-05  Jan Hubicka  <jh@suse.cz>
4214         * df-problems.c (seen_in_block, seen_in_insn): Convert to bitmap_head.
4215         (df_rd_problem_data): Convert sparse_invalidated_by_call,
4216         dense_invalidated_by_call to bitmap head.
4217         (df_rd_alloc, df_rd_bb_local_compute_process_def,
4218         df_rd_bb_local_compute, df_rd_confluence_n, df_rd_transfer_function,
4219         df_rd_start_dump, df_lr_verify_transfer_functions,
4220         df_live_verify_transfer_functions, df_chain_create_bb,
4221         df_chain_add_problem, df_byte_lr_check_regs, df_byte_lr_alloc,
4222         df_byte_lr_confluence_0, df_byte_lr_confluence_n, df_note_compute,
4223         df_simulate_one_insn_forwards, df_md_alloc,
4224         df_md_bb_local_compute_process_def,
4225         df_md_bb_local_compute_process_def, df_md_local_compute,
4226         df_md_transfer_function df_md_free): Update.
4228 2010-06-05  Joseph Myers  <joseph@codesourcery.com>
4230         PR c/44322
4231         * c-typeck.c (build_unary_op): Merge qualifiers into pointer
4232         target type for ADDR_EXPR; require no changes to qualifiers except
4233         for function types.
4234         * c-tree.h (c_build_type_variant): Remove.
4236 2010-06-05  Segher Boessenkool  <segher@kernel.crashing.org>
4238         * genautomata.c (get_excl_set): Do work per element, not per char.
4239         (check_presence_pattern_sets): Similar.
4240         (check_absence_pattern_sets): Similar.
4242 2010-06-05  Segher Boessenkool  <segher@kernel.crashing.org>
4244         * genautomata.c (curr_state_pass_num): Delete.
4245         (min_issue_delay_pass_states): Delete.
4246         (min_issue_delay): Delete.
4247         (initiate_min_issue_delay_pass_states): Delete.
4248         (output_min_issue_delay_table): Compute min_issue_delay_vect
4249         using a breadth-first search variant.
4250         (output_tables): Don't call initiate_min_issue_delay_pass_states.
4252 2010-06-04  H.J. Lu  <hongjiu.lu@intel.com>
4254         PR boostrap/44421
4255         * df-problems.c (df_lr_bb_local_compute): Updated for embedded bitmaps.
4256         (df_byte_lr_bb_local_compute): Likewise.
4258 2010-06-03  Jason Merrill  <jason@redhat.com>
4260         Implement noexcept operator (5.3.7)
4261         * c-common.c (c_common_reswords): Add noexcept.
4262         * c-common.h (enum rid): Add RID_NOEXCEPT.
4264 2010-06-04  Joseph Myers  <joseph@codesourcery.com>
4266         * config/darwin-driver.c (darwin_default_min_version): Use
4267         GCC-specific formats in diagnostics.
4268         * cppspec.c (lang_specific_driver): Use GCC-specific formats in
4269         diagnostics.
4270         * gcc.c (translate_options, read_specs, add_sysrooted_prefix,
4271         execute, process_command, end_going_arg, do_self_spec, do_spec_1,
4272         eval_spec_function, handle_braces, process_brace_body, main,
4273         perror_with_name, used_arg, set_multilib_dir, print_multilib_info,
4274         getenv_spec_function, compare_version_strings,
4275         version_compare_spec_function): Use GCC-specific formats in
4276         diagnostics.
4278 2010-06-04  Uros Bizjak  <ubizjak@gmail.com>
4280         * config/i386/i386.md (*addhi_1_lea) <TYPE_INCDEC, default>: Assert
4281         that operand 0 and operand 1 are equal.
4282         (*addqi_1_lea) <TYPE_INCDEC, default>: Ditto.
4283         (*add<mode>_2) <TYPE_INCDEC>: Remove assert that operand 0
4284         and operand 1 are equal.
4285         <default>: Ditto.  Remove ??? comment.
4286         (*add<mode>_3) <TYPE_INCDEC>: Remove assert that operand 0
4287         and operand 1 are equal.
4288         <default>: Ditto.  Remove ??? comment.
4289         (*adddi_4) <default>: Remove assert that operand 0 and operand 1
4290         are equal.
4291         (*add<mode>_4) <default>: Ditto.
4292         (*add<mode>_5) <TYPE_INCDEC, default>: Ditto.
4294 2010-06-04  Nathan Froyd  <froydnj@codesourcery.com>
4296         * config/i386/i386-protos.h (ix86_print_operand): Declare.
4297         * config/i386/i386.c (ix86_print_operand): Make non-static.
4298         * config/i386/sol2.h (ASM_OUTPUT_CALL): Call ix86_print_operand.
4299         * output.h (output_operand): Declare.
4300         * final.c (output_operand): Make non-static.
4302 2010-06-04  Alexandre Oliva  <aoliva@redhat.com>
4304         PR rtl-optimization/44013
4305         * sched-deps.c (add_dependence_list_and_free): Don't free lists
4306         when processing debug insns.
4308         PR debug/41371
4309         * var-tracking.c (find_loc_in_1pdv): Mark initial value before
4310         recursing.  Check that recursion is bounded.  Rename inner var
4311         to avoid hiding incoming argument.
4313 2010-06-04  Uros Bizjak  <ubizjak@gmail.com>
4315         * config/i386/i386.md (*addqi_2) <TYPE_INCDEC>: Do not assert that
4316         operands[2] == 255.
4317         (*addqi_3): Ditto.
4318         (*addqi_4): Ditto.
4319         (*addqi_5): Ditto.
4320         (*addqi_ext_1_rex64): Ditto.
4321         (*addqi_ext_1): Ditto.
4323         (*addqi_4): Check for incdec_operand in QImode.
4325         (*add<mode>_2): Macroize insn from *add<mode>_2 and *add{qi,hi}_2
4326         using SWI mode iterator.
4327         (*add<mode>_3): Ditto from *add<mode>_3 and *add{qi,hi}_3.
4328         (*add<mode>_4): Macroize insn from *add{qi,hi,si}_4 using SWI124
4329         mode iterator.
4330         (*add<mode>_5): Macroize insn from *add<mode>_5 and *add{qi,hi}_5
4331         using SWI mode iterator.
4333 2010-06-04  Manuel López-Ibáñez  <manu@gcc.gnu.org>
4335         PR c/25880
4336         * c-objc-common.c (c_tree_printer): Handle %V, %v and %#v.
4337         * c-format.c (gcc_diag_flag_specs): Add hash.
4338         (gcc_cxxdiag_flag_specs): Use gcc_diag_flag_specs directly.
4339         (gcc_tdiag_char_table,gcc_cdiag_char_table): Handle %V and %v.
4340         * c-pretty-print.c (pp_c_cv_qualifier): Rename as
4341         pp_c_cv_qualifiers. Handle qualifiers spelling here.
4342         (pp_c_type_qualifier_list): Call the function above.
4343         * c-pretty-print.h (pp_c_cv_qualifiers): Declare.
4344         * c-typeck.c (handle_warn_cast_qual): Print qualifiers.
4345         (WARN_FOR_QUALIFIERS): New macro.
4346         (convert_for_assignment): Use it.
4348 2010-06-04  Kai Tietz  <kai.tietz@onevision.com>
4350         * config/i386/cygming.h (ASM_GENERATE_INTERNAL_LABEL): Prefix by '*'.
4352 2010-06-04  Jan Hubicka  <jh@suse.cz>
4354         * df.h (df_rd_bb_info, df_md_bb_info, df_lr_bb_info, df_live_bb_info,
4355         df_byte_lr_bb_info): Embedd bitmap_head into the structure.
4356         (DF_LIVE_IN, DF_LIVE_OUT, DF_LR_IN, DF_LR_OUT, DF_BYTE_LR_IN,
4357         DF_BYTE_LR_OUT): Update for embedded bitmaps.
4358         * fwprop.c (single_def_use_enter_block): Likewise.
4359         * ddg.c (create_ddg_dep_from_intra_loop_link,
4360         add_cross_iteration_register_deps, build_inter_loop_deps): Likewise.
4361         * loop-iv.c (latch_dominating_def): Likewise.
4362         * df-problems.c (df_rd_free_bb_info, df_rd_alloc,
4363         df_rd_bb_local_compute_process_def, df_rd_bb_local_compute_process_def,
4364         df_rd_init_solution, df_rd_init_solution, df_rd_transfer_function,
4365         df_rd_transfer_function, df_rd_top_dump,
4366         df_rd_bottom_dump): Update.
4367         (df_lr_free_bb_info, df_lr_alloc, df_lr_reset, df_lr_bb_local_compute,
4368         df_lr_bb_local_compute, df_lr_bb_local_compute, df_lr_bb_local_compute,
4369         df_lr_bb_local_compute, df_lr_local_compute, df_lr_init, df_lr_init,
4370         df_lr_confluence_0, df_lr_free, df_lr_top_dump, df_lr_bottom_dump,
4371         df_lr_verify_solution_start, df_lr_verify_solution_end,
4372         df_lr_verify_transfer_functions, df_lr_verify_transfer_functions,
4373         df_live_free_bb_info, df_live_alloc, df_live_reset,
4374         df_live_bb_local_compute, df_live_init, df_live_transfer_function,
4375         df_live_finalize, df_live_free, df_live_top_dump, df_live_bottom_dump,
4376         df_live_verify_solution_start, df_live_verify_solution_end,
4377         df_live_verify_transfer_functions, df_chain_create_bb,
4378         df_byte_lr_free_bb_info, df_byte_lr_alloc, df_byte_lr_reset,
4379         df_byte_lr_bb_local_compute, df_byte_lr_bb_local_compute,
4380         df_byte_lr_bb_local_compute, df_byte_lr_bb_local_compute,
4381         df_byte_lr_bb_local_compute, df_byte_lr_local_compute, df_byte_lr_init,
4382         df_byte_lr_confluence_0, df_byte_lr_confluence_n,
4383         df_byte_lr_transfer_function, df_byte_lr_top_dump,
4384         df_byte_lr_bottom_dump, df_create_unused_note,
4385         df_note_bb_compute, df_md_free_bb_info, df_md_alloc,
4386         df_md_bb_local_compute_process_def, df_md_local_compute, df_md_reset,
4387         df_md_transfer_function, df_md_init, df_md_confluence_0,
4388         df_md_confluence_n,
4389         df_md_top_dump, df_md_bottom_dump): Update.
4390         (struct df_lr_problem_data): Embedd bitmap headers.
4392 2010-06-04  Jan Hubicka  <jh@suse.cz>
4394         * dce.c (dce_process_block): Do not re-scan already marked
4395         instructions.
4397 2010-06-04  Bernd Schmidt  <bernds@codesourcery.com>
4399         PR rtl-optimization/39871
4400         PR rtl-optimization/40615
4401         PR rtl-optimization/42500
4402         PR rtl-optimization/42502
4403         * ira.c (init_reg_equiv_memory_loc: New function.
4404         (ira): Call it twice.
4405         * reload.h (calculate_elim_costs_all_insns): Declare.
4406         * ira-costs.c: Include "reload.h".
4407         (regno_equiv_gains): New static variable.
4408         (init_costs): Allocate it.
4409         (finish_costs): Free it.
4410         (ira_costs): Call calculate_elim_costs_all_insns.
4411         (find_costs_and_classes): Take estimated elimination costs
4412         into account.
4413         (ira_adjust_equiv_reg_cost): New function.
4414         * ira.h (ira_adjust_equiv_reg_cost): Declare it.
4415         * reload1.c (init_eliminable_invariants, free_reg_equiv,
4416         elimination_costs_in_insn, note_reg_elim_costly): New static functions.
4417         (elim_bb): New static variable.
4418         (reload): Move code out of here into init_eliminable_invariants and
4419         free_reg_equiv.  Call them.
4420         (calculate_elim_costs_all_insns): New function.
4421         (eliminate_regs_1): Declare.  Add extra arg FOR_COSTS;
4422         all callers changed.  If FOR_COSTS is true, don't call alter_reg,
4423         but call note_reg_elim_costly if we turned a valid memory address
4424         into an invalid one.
4425         * Makefile.in (ira-costs.o): Depend on reload.h.
4427 2010-06-04  Julian Brown  <julian@codesourcery.com>
4429         * config/arm/thumb2.md (*thumb2_movdf_soft_insn): Fix alternatives
4430         for pool ranges.
4432 2010-06-04  Richard Guenther  <rguenther@suse.de>
4434         PR lto/41584
4435         * cgraph.h (struct varpool_node): Add lto_file_data field.
4436         * lto-cgraph.c (input_varpool_node): Initialize it.
4438 2010-06-04  Uros Bizjak  <ubizjak@gmail.com>
4440         * config/i386/predicates.md (pic_symbolic_operand): Remove predicate.
4441         * config/i386/i386.md (*add<mode>_1): Do not use pic_symbolic_operand
4442         predicate in "type" attribute calculation.
4443         (*addsi_1_zext): Ditto.
4444         (*add<mode>_2): Do not use pic_symbolic_operand in insn predicate.
4445         (*addsi_2_zext): Ditto.
4446         (*add<mode>_3): Ditto.
4447         (*addsi_3_zext): Ditto.
4448         (*add<mode>_5): Ditto.
4450 2010-06-03  Jan Hubicka  <jh@suse.cz>
4452         * tree-into-ssa.c (mark_block_for_update): Avoid redundant call
4453         of bitmap_bit_p.
4454         * cfganal.c (compute_dominance_frontiers_1): Likewise.
4456 2010-06-03  Jan Hubicka  <jh@suse.cz>
4458         * df-problems.c (df_create_unused_note, df_note_bb_compute):
4459         micro-optimize the checks when to add new note.
4461 2010-06-03  Nathan Froyd  <froydnj@codesourcery.com>
4463         * final.c (output_asm_insn): Call
4464         targetm.asm_out.print_operand_punct_valid_p.  Update comments.
4465         (output_operand): Call targetm.asm_out.print_operand.  Update comments.
4466         (output_address): Call targetm.asm_out.print_operand_address.
4467         Update comments.
4468         * target.h (struct gcc_target): Add print_operand,
4469         print_operand_address, and print_operand_punct_valid_p fields.
4470         * targhooks.h (default_print_operand): Declare.
4471         (default_print_operand_address): Declare.
4472         (default_print_operand_punct_valid_p): Declare.
4473         * targhooks.c (default_print_operand): Define.
4474         (default_print_operand_address): Define.
4475         (default_print_operand_punct_valid_p): Define.
4476         * target-def.h (TARGET_PRINT_OPERAND): Define if not defined.
4477         (TARGET_PRINT_OPERAND_ADDRESS): Likewise.
4478         (TARGET_PRINT_OPERAND_PUNCT_VALID_P): Likewise.
4479         (TARGET_ASM_OUT): Add TARGET_PRINT_OPERAND,
4480         TARGET_PRINT_OPERAND_ADDRESS, and TARGET_PRINT_OPERAND_PUNCT_VALID_P.
4481         * vmsdbgout.c (addr_const_to_string): Update comment.
4482         * config/i386/i386.c (print_operand): Rename to...
4483         (ix86_print_operand): ...this.  Make static.
4484         (print_operand_address): Rename to...
4485         (ix86_print_operand_address): ...this.  Make static.  Call
4486         ix86_print_operand instead of PRINT_OPERAND.
4487         (ix86_print_operand_punct_valid_p): New function.
4488         (TARGET_PRINT_OPERAND): Define.
4489         (TARGET_PRINT_OPERAND_ADDRESS): Define.
4490         (TARGET_PRINT_OPERAND_PUNCT_VALID_P): Define.
4491         * config/i386/i386.h (HI_REGISTER_NAMES): Update comment.
4492         (PRINT_OPERAND_PUNCT_VALID_P): Delete.
4493         (PRINT_OPERAND): Delete.
4494         (PRINT_OPERAND_ADDRESS): Delete.
4495         * config/i386/i386-protos.h (print_operand): Delete prototype.
4496         (print_operand_address): Delete prototype.
4498 2010-06-03  Richard Guenther  <rguenther@suse.de>
4500         PR tree-optimization/44403
4501         * tree-vect-data-refs.c (vect_create_addr_base_for_vector_ref):
4502         Preserve pointer qualifiers.
4503         (vect_create_data_ref_ptr): Likewise.
4505 2010-06-03  H.J. Lu  <hongjiu.lu@intel.com>
4507         PR c++/44294
4508         * defaults.h (MAX_FIXED_MODE_SIZE): New.
4510         * stor-layout.c (MAX_FIXED_MODE_SIZE): Removed.
4512 2010-06-03  Jakub Jelinek  <jakub@redhat.com>
4514         PR debug/44375
4515         * tree-cfg.c (gimple_can_merge_blocks_p): For -O0
4516         return false if merging the bbs would lead to goto_locus
4517         location being lost from the IL.
4519 2010-06-03  Jan Hubicka  <jh@suse.cz>
4520             Jakub Jelinek  <jakub@redhat.com>
4522         * var-tracking.c (dataflow_set_equiv_regs): Shortcut the loop if
4523         set->regs[i] is NULL or has just one entry.
4525 2010-06-03  Jan Hubicka  <jh@suse.cz>
4527         * lto-cgraph.c (lto_varpool_encoder_size): Remove.
4528         * lto-streamer.h (lto_varpool_encoder_size): New inline function.
4530 2010-06-03  Paul Brook  <paul@codesourcery.com>
4532         * config/arm/arm.c (FL_TUNE): Define.
4533         (arm_default_cpu, arm_cpu_select): Remove.
4534         (all_cores): Populate core field.
4535         (arm_selected_arch, arm_selected_cpu, arm_selected_tune): New.
4536         (arm_find_cpu): New function.
4537         (arm_handle_option): Lookup cpu/architecture names.
4538         (arm_override_options): Cleanup mcpu/march/mtune handling.
4539         (arm_file_start): Ditto.
4541 2010-06-03  Alan Modra  <amodra@gmail.com>
4543         PR target/44169
4544         * config/rs6000/rs6000.md (load_toc_v4_PIC_1b): Add label operand.
4545         * config/rs6000/rs6000.c (rs6000_legitimize_tls_address): Pass label
4546         rtx to gen_load_toc_v4_PIC_1b.  Tidy.
4547         (rs6000_emit_load_toc_table): Likewise.
4549 2010-06-02  Jan Hubicka  <jh@suse.cz>
4551         * passes.c (init_optimization_passes): Put ipa reference
4552         after ipa pure-const.
4554 2010-06-02  Jan Hubicka  <jh@suse.cz>
4556         * ipa-reference.c (ipa_reference_local_vars_info_d): Remove
4557         calls_read_all and calls_write_all.
4558         (get_reference_optimization_summary): Fix formatting.
4559         (is_proper_for_analysis): Check that decl is not readonly.
4560         (propagate_bits): Check CONST/PURE/noreturn flags.
4561         (ipa_init): Move all_module_statics to optimization_summary_obstack.
4562         (analyze_function): Ignore indirect edges.
4563         (copy_global_bitmap): For all module statics, do nothing.
4564         (generate_summary): Do not print calls_read_all/calls_write_all.
4565         (read_write_all_from_decl): Take node as argument; check
4566         cgraph_node_cannot_return.
4567         (propagate): Reorganize read_all/write_all computation;
4568         check indirect edges; check ecf flags; use all_module_statics
4569         in the results; do not free all_module_statics.
4570         (stream_out_bitmap): Handle all_module_statics.
4571         (ipa_reference_write_optimization_summary): Likewise; use
4572         varpool/cgraph encoders to get boundaries.
4573         (ipa_reference_read_optimization_summary): Read in all_module_statics;
4574         use it when possible.
4576 2010-06-02  Michael Meissner  <meissner@linux.vnet.ibm.com>
4578         PR target/44218
4579         * doc/invoke.texi (RS/6000 and PowerPC Options): Delete obsolete
4580         -mswdiv option.  Add -mrecip, -mrecip=<xxx>, -mrecip-precision options.
4582         * doc/extend.texi (powerpc builtins): Document vec_recip,
4583         vec_rsqrt, vec_rsqrte altivec/vsx builtins.
4585         * config/rs6000/rs60000-protos.h (rs6000_emit_swdiv): New function.
4586         (rs6000_emit_swrsqrt): Ditto.
4587         (rs6000_emit_swdivsf): Delete.
4588         (rs6000_emit_swdivdf): Ditto.
4589         (rs6000_emit_swrsqrtsf): Ditto.
4591         * config/rs6000/rs6000.c (rs6000_recip_bits): New global to
4592         describe the reciprocal estimate support for each type.
4593         (recip_options): Map -mrecip=<opt> into option bits.
4594         (gen_2arg_fn_t): New typedef for binary rtx gen function.
4595         (rs6000_debug_reg_global): If -mdebug=reg, print the state of the
4596         reciprocal estimate instructions.
4597         (rs6000_init_hard_regno_mode_ok): Key ws constraint off of the
4598         debug -mvsx-scalar-memory switch instead of -mvsx-scalar-double.
4599         Set up rs6000_recip_bits based on the -mrecip* options.  Print the
4600         cost information if -mdebug=cost or -mdebug=reg.
4601         (rs6000_override_options): Set -mrecip-precision for power6, and
4602         power7 machines.  If -mvsx or -mdfp, enable various options that
4603         came in previous instruction set ISAs, unless the option was
4604         explicitly disabled by the command line option.  Parse
4605         -mrecip=<opt> options.
4606         (rs6000_builtin_vectorized_function): Add support for vectorizing
4607         the reciprocal estimate builtins and expansions.
4608         (rs6000_handle_option): Add -mrecip, -mrecip=<opt> support.
4609         (bdesc_2arg): Add reciprocal estimate builtins.
4610         (bdesc_1arg): Add reciprocal square root estimate builtins.
4611         (rs6000_expand_builtin): Rewrite to use a switch statement,
4612         instead of multiple if/then/elses.  Add reciprocal estimate builtins.
4613         (rs6000_init_builtins): Create declarations for reciprocal
4614         estimate builtins.
4615         (rs6000_preferred_reload_class): Simplify VSX preferences, if scalar
4616         sized, prefer traditional floating point registers, if integer
4617         vector types, prefer altivec registers.  Don't actually look at
4618         the memory address any more.
4619         (rs6000_builtin_reciprocal): Add new builtin reciprocal estimate
4620         builtins.
4621         (rs6000_load_constant_and_splat): New helper function to load up
4622         the constant for reciprocal estimate instructions.
4623         (rs6000_emit_madd): New helper function for generating
4624         multiply/add type instructions, based on the current switches.
4625         (rs6000_emit_msub): Ditto.
4626         (rs6000_emit_mnsub): Ditto.
4627         (rs6000_emit_swdiv_high_precision): Replace rs6000_emit_swdivsf to
4628         replace a divide with a reciprocal estimate and fixup, adding
4629         support for machines with high precision and vectors.
4630         (rs6000_emit_swdiv_low_precision): Rewrite rs6000_emit_swdivdf for
4631         low precision machines.
4632         (rs6000_emit_swdiv): New common function to be called to replace a
4633         division with reciprocal estimate and fixup.
4634         (rs6000_emit_swrsqrt): Replace rs6000_emit_swrsqrtsf.  Add support
4635         for double and vector types.  Add support for high precision machines.
4637         * config/rs6000/rs6000.h (TARGET_FRES): New macro to say whether
4638         the reciprocal estimate instructions can be generated.
4639         (TARGET_FRE): Ditto.
4640         (TARGET_FRSQRTES): Ditto.
4641         (TARGET_FRSQRTE): Ditto.
4642         (RS6000_RECIP_*): New macros for reciprocal estimate support.
4644         * config/rs6000/vector.md (rsqrte<mode>2): New insn for reciprocal
4645         square root estimate on vectors.
4646         (re<mode>2): New insn for reciprocal division estimate on vectors.
4648         * config/rs6000/rs6000-buitlins.def (ALTIVEC_BUILTIN_VRSQRTFP):
4649         New builtin.
4650         (ALTIVEC_BUILTIN_VRECIPFP): Ditto.
4651         (ALTIVEC_BUITLIN_VEC_RE): Ditto.
4652         (ALTIVEC_BUILTIN_VEC_RSQRT): Ditto.
4653         (VSX_BUILTIN_RSQRT_V4SF): Ditto.
4654         (VSX_BUITLIN_RSQRT_V2DF): Ditto.
4655         (RS6000_BUILTIN_RSQRT): Ditto.
4656         (ALTIVEC_BUILTIN_VEC_RSQRTE): Denote that the builtin is a
4657         floating point builtin.
4659         * config/rs6000/rs6000-c.c (rs6000_cpu_cpp_builtins): Define
4660         macros __RECIP__, __RECIPF__, __RSQRTE__, __RSQRTEF__,
4661         __RECIP_PRECISION__ based on the command line switches.
4662         (altivec_overloaded_builtins): Add reciprocal estimate builtins.
4664         * config/rs6000/rs6000.opt (-mrecip): Document add support for
4665         replacing division instructions with reciprocal estimate and fixup.
4666         (-mrecip=<opt>): New option.
4667         (-mrecip-precision): Ditto.
4669         * config/rs6000/vsx.md (UNSPEC_VSX_RSQRTE): Delete.
4670         (vsx_rsqrte<mode>2): Use UNSPEC_RSQRT not UNSPEC_VSX_RSQRTE.
4671         (vsx_copysignsf3): If -mvsx, use double precision cpsign on single
4672         precision scalar.
4674         * config/rs6000/altivec.md (UNSPEC_RSQRTEFP): Delete.
4675         (UNSPEC_VREFP): Ditto.
4676         (altivec_vnmsubfp*): Make altivec nmsub mirror the scalar and VSX
4677         conterparts with regard to support of -mno-fused-madd and -ffast-math.
4678         (altivec_vrsqrtefp): Use common UNSPEC to allow scalar/vector
4679         reciprocal estimate instructions to be generated.
4680         (altivec_vrefp): Ditto.
4682         * config/rs6000/rs6000.md (RECIPF): New iterator for reciprocal
4683         estimate support.
4684         (rreg): New mode attribute for reciprocal estimate support.
4685         (recip<mode>3): New insn for division using reciprocal estimate
4686         and fixup builtins.
4687         (divide define_split): New define_split to convert floating point
4688         division to use reciprocal estimate if the user used the
4689         appropriate options and the split is run when we can add new
4690         pseudo registers for the fixup.
4691         (rsqrt<mode>2): New insn for reciprocal square root support.
4692         (recipsf3): Move into recip<mode>3.
4693         (recipdf3): Ditto.
4694         (fres): Use TARGET_FRES.
4695         (rsqrtsf2): Move into rsqrt<mode>2.
4696         (rsqrtsf_internal1): Use TARGET_FRSQRTSES.
4697         (copysignsf3): Add support for VSX.
4698         (fred): Use TARGET_FRE.
4699         (fred_fpr): Ditto.
4700         (rsqrtdf_internal1): New function for frsqrte instruciton.
4702         * config/rs6000/altivec.h (vec_recipdiv): Define new vector builtin.
4703         (vec_rsqrt): Ditto.
4705 2010-06-03  Richard Guenther  <rguenther@suse.de>
4707         PR middle-end/44291
4708         * optabs.c (init_one_libfunc): Use IDENTIFIER_HASH_VALUE.
4709         (set_user_assembler_libfunc): Likewise.
4711 2010-06-02  Steven Bosscher  <steven@gcc.gnu.org>
4713         * mkconfig.sh: Include insn-flags.h and insn-constants.h before
4714         defaults.h.
4715         * except.h: Move MUST_USE_SJLJ_EXCEPTIONS and USING_SJLJ_EXCEPTIONS
4716         to defaults.h
4717         * expr.h (BRANCH_COST, MOVE_RATIO, CLEAR_RATIO, SET_RATIO,
4718         DEFAULT_FUNCTION_ARG_PADDING, FUNCTION_ARG_PADDING,
4719         FUNCTION_ARG_BOUNDARY, STACK_SAVEAREA_MODE, STACK_SIZE_MODE,
4720         STACK_CHECK_BUILTIN, STACK_CHECK_STATIC_BUILTIN,
4721         STACK_CHECK_PROBE_INTERVAL_EXP, STACK_CHECK_MOVING_SP,
4722         STACK_OLD_CHECK_PROTECT, STACK_CHECK_PROTECT,
4723         STACK_CHECK_MAX_FRAME_SIZE, STACK_CHECK_FIXED_FRAME_SIZE,
4724         STACK_CHECK_MAX_VAR_SIZE): Move target macro defaults to defaults.h.
4725         * defaults.h: Updated for above mentioned changes.
4727 2010-06-02  Kai Tietz  <kai.tietz@onevision.com>
4729         * c-common.c: Remove header include of tm_p.h.
4730         * Makefile.in (c-common.o): Remove TM_P_H dependency.
4732 2010-06-02  Jakub Jelinek  <jakub@redhat.com>
4734         * tree.h (struct tree_decl_map): New type.
4735         (tree_decl_map_eq, tree_decl_map_marked_p): Define.
4736         (tree_decl_map_hash): New prototype.
4737         (debug_expr_for_decl, value_expr_for_decl): Change into
4738         tree_decl_map hashtab from tree_map.
4739         (init_ttree): Adjust initialization.
4740         (tree_decl_map_hash): New function.
4741         (decl_debug_expr_lookup, decl_debug_expr_insert,
4742         decl_value_expr_lookup, decl_value_expr_insert): Adjust.
4744 2010-06-02  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
4746         * configure.ac (gcc_cv_ld_sol2_emulation): Test for GNU ld *_sol2
4747         linker emulations.
4748         * configure: Regenerate.
4749         * config.in: Regenerate.
4751         * config/i386/sol2-10.h [TARGET_GNU_LD] (I386_EMULATION): Define.
4752         (X86_64_EMULATION): Define.
4753         (TARGET_LD_EMULATION): Use them.
4755         * config/sparc/sol2-gld-bi.h (SPARC32_EMULATION): Define.
4756         (SPARC64_EMULATION): Define.
4757         (LINK_ARCH_SPEC): Use them.
4759 2010-06-02  Sebastian Pop  <sebastian.pop@amd.com>
4761         * graphite-clast-to-gimple.c (gcc_type_for_interval): Use
4762         smallest_mode_for_size for computing the precision types of new
4763         graphite IVs.  Do not call lang_hooks.types.type_for_size.
4765 2010-06-02  Sebastian Pop  <sebastian.pop@amd.com>
4767         * tree-if-conv.c (predicate_bbs): Do not reset the GIMPLE_DEBUG
4768         information.
4769         (remove_conditions_and_labels): Reset the GIMPLE_DEBUG information.
4771 2010-06-02  Sebastian Pop  <sebastian.pop@amd.com>
4773         PR middle-end/44363
4774         * tree-if-conv.c (predicate_bbs): Do not call gcc_unreachable,
4775         return false instead.
4777 2010-06-02  Jan Hubicka  <jh@suse.cz>
4779         PR middle-end/44295
4780         * cgraphunit.c (cgraph_redirect_edge_call_stmt_to_callee): Do not
4781         create new cgraph node to check callee.
4783 2010-06-02  Richard Guenther  <rguenther@suse.de>
4785         * lto-streamer-in.c (input_gimple_stmt): Fix typo.
4787 2010-06-02  Richard Guenther  <rguenther@suse.de>
4789         * lto-wrapper.c (lto_wrapper_exit): Rename to ...
4790         (lto_wrapper_cleanup): ... this.  Do not exit.
4791         (fatal): Adjust.  Exit here.
4792         (fatal_perror): Likewise.
4793         (fatal_signal): New function.
4794         (main): Set up signal handlers to cleanup temporary files.
4795         * Makefile.in (lto-wrapper.o): Adjust dependencies.
4797 2010-06-02  Richard Guenther  <rguenther@suse.de>
4799         PR tree-optimization/44377
4800         * tree-ssa-structalias.c (find_func_aliases): Fix typo.
4802 2010-06-02  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
4804         * config/s390/2097.md (z10_fhex): Remove insn reservation.
4805         * config/s390/s390.md (UNSPEC_COPYSIGN): Remove unused constant.
4806         (*mov<mode>_64 TD_TF, *mov<mode>_31 TD_TF, *mov<mode>_64dfp DD_DF,
4807         *mov<mode>_64 DD_DF, *mov<mode>_31, mov<mode>): Remove load zero
4808         instruction.
4809         * config/s390/s390.c: Don't accept fp zeros as valid constants anymore.
4811 2010-06-02  Jan Hubicka  <jh@suse.cz>
4813         * bitmap.c (bitmap_descriptor): Add search_iter.
4814         (bitmap_find_bit): Increment it.
4815         (print_statistics): Print it.
4817 2010-06-02  Nathan Froyd  <froydnj@codesourcery.com>
4819         * tree-vect-slp.c (vect_create_mask_and_perm): Use gimple_build_call
4820         instead of gimple_build_call_vec.  Delete unnecessary local variable.
4822 2010-06-02  Steven Bosscher  <steven@gcc.gnu.org>
4824         * gimplify.c (gimplify_body): Revert "Do not initialize RTL profiling"
4825         change from yesterday.
4827 2010-06-02  Steven Bosscher  <steven@gcc.gnu.org>
4829         * c-ada-spec.c: Clean up redundant includes.
4831 2010-06-01  Steven Bosscher  <steven@gcc.gnu.org>
4833         * gimplify.c: Do not include except.h and optabs.h.
4834         (gimplify_body): Do not initialize RTL profiling.
4835         * gimple-low.c: Do not include rtl.h, diagnostic.h, langhooks.h,
4836         langhooks-def.h, timevar.h, except.h, hashtab.h, and expr.h.
4837         * gimple-fold.c: Do not include rtl.h, tm_p.h, ggc.h, basic-block.h,
4838         output.h, expr.h, diagnostic.h, timevar.h, value-prof.h, and
4839         langhooks.h.
4841         * tree-pretty-print.h: Include pretty-print.h.
4842         * gimple-pretty-print.h: Include pretty-print.h.
4844         * tree-pretty-print.c: Do not include diagnostic.h.
4845         * tree-vrp.c: Likewise.
4846         * tree-tailcall.c: Likewise
4847         * tree-scalar-evolution.c: Likewise
4848         * tree-ssa-dse.c: Likewise
4849         * tree-chrec.c: Likewise
4850         * tree-ssa-sccvn.c: Likewise
4851         * tree-ssa-copyrename.c: Likewise
4852         * tree-nomudflap.c: Likewise
4853         * tree-call-cdce.c: Likewise
4854         * tree-stdarg.c: Likewise
4855         * tree-ssa-math-opts.c: Likewise
4856         * tree-nrv.c: Likewise
4857         * tree-ssa-sink.c: Likewise
4858         * tree-browser.c: Likewise
4859         * tree-ssa-loop-ivcanon.c: Likewise
4860         * tree-ssa-loop.c: Likewise
4861         * tree-parloops.c: Likewise
4862         * tree-ssa-address.c: Likewise
4863         * tree-ssa-ifcombine.c: Likewise
4864         * tree-if-conv.c: Likewise
4865         * tree-data-ref.c: Likewise
4866         * tree-affine.c: Likewise
4867         * tree-ssa-phiopt.c: Likewise
4868         * tree-ssa-coalesce.c: Likewise
4869         * tree-ssa-pre.c: Likewise
4870         * tree-ssa-live.c: Likewise
4871         * tree-predcom.c: Likewise
4872         * tree-ssa-forwprop.c: Likewise
4873         * tree-ssa-dce.c: Likewise
4874         * tree-ssa-ter.c: Likewise
4875         * tree-ssa-loop-prefetch.c: Likewise
4876         * tree-optimize.c: Likewise
4877         * tree-ssa-phiprop.c: Likewise
4878         * tree-object-size.c: Likewise
4879         * tree-outof-ssa.c: Likewise
4880         * tree-ssa-structalias.c: Likewise
4881         * tree-switch-conversion.c: Likewise
4882         * tree-ssa-reassoc.c: Likewise
4883         * tree-ssa-operands.c: Likewise
4884         * tree-vectorizer.c: Likewise
4885         * tree-vect-data-refs.c: Likewise
4886         * tree-vect-generic.c: Likewise
4887         * tree-vect-stmts.c: Likewise
4888         * tree-vect-patterns.c: Likewise
4889         * tree-vect-slp.c: Likewise
4890         * tree-vect-loop.c: Likewise
4891         * tree-ssa-loop-ivopts.c: Likewise
4892         * tree-ssa-loop-im.c: Likewise
4893         * tree-ssa-loop-niter.c: Likewise
4894         * tree-ssa-loop-unswitch.c: Likewise
4895         * tree-ssa-loop-manip.c: Likewise
4896         * tree-ssa-loop-ch.c: Likewise
4897         * tree-dump.c: Likewise
4898         * tree-complex.c: Likewise
4900         * tree-into-ssa.c: Do not include diagnostic.h and expr.h.
4901         * tree-ssa-uninit.c: Likewise
4902         * tree-ssa-threadupdate.c: Likewise
4903         * tree-ssa-uncprop.c: Likewise
4904         * tree-ssa-ccp.c: Likewise
4905         * tree-ssa-dom.c: Likewise
4906         * tree-ssa-propagate.c: Likewise
4907         * tree-ssa-alias.c: Likewise
4908         * tree-dfa.c: Likewise
4909         * tree-cfgcleanup.c: Likewise
4910         * tree-sra.c: Likewise
4911         * tree-ssa-copy.c: Likewise
4912         * tree-ssa.c: Likewise
4913         * tree-profile.c: Likewise
4914         * tree-cfg.c: Likewise
4915         * tree-ssa-threadedge.c: Likewise
4916         * tree-vect-loop-manip.c: Likewise
4918         * tree-inline.c: Do not include diagnostic.h and expr.h.
4919         Include rtl.h.
4920         (copy_decl_for_dup_finish): Do not use NULL_RTX.
4922         * tree-loop-linear.c: Do not include diagnostic.h, expr.h and optabs.h.
4923         * tree-loop-distribution.c: Likewise.
4925 2010-06-01  Jan Hubicka  <jh@suse.cz>
4927         * ipa-pure-const.c (local_pure_const): Do NORETURN discovery.
4929 2010-06-01  Jan Hubicka  <jh@suse.cz>
4931         * tree-cfgcleanup.c (fixup_noreturn_call): Break out from ...;
4932         remove return value.
4933         (split_bbs_on_noreturn_calls) .... here.
4934         * tree-optimize.c (execute_fixup_cfg): Fixup noreturn calls too.
4935         * tree-flow.h (fixup_noreturn_call): New.
4937 2010-06-01  Jan Hubicka  <jh@suse.cz>
4939         * emit-rtl.c (remove_insn): Fix thinko in prevoius patch.
4941 2010-06-01  Nathan Froyd  <froydnj@codesourcery.com>
4943         * tree.h (build_nt_call_list): Delete.
4944         * tree.c (build_nt_call_list): Delete.
4946 2010-06-01  Jan Hubicka  <jh@suse.cz>
4948         * fwprop.c: Make emit-rtl.h include last.
4949         * rtlanal.c: Include emit-rtl.h.
4950         * genautomata.c: Output emit-rtl include into insn-automata.c
4951         * df-scan.c: Include emit-rtl.h.
4952         * haifa-sched.c: Indlude emit-rtl.h.
4953         * mode-switching.c: Indlude emit-rtl.h.
4954         * graph.c: Indlude emit-rtl.h.
4955         * sel-sched.c: Include emit-rtl.h.
4956         * sel-sched-ir.c: Include emit-rtl.h.
4957         * ira-build.c: Include emit-rtl.h.
4958         * emit-rtl.c: (first_insn, last_insn): Remove defines.
4959         (get_insns, set_first_insn, get_last_insn, set_last_insn, get_max_uid):
4960         Move to emit-rtl.h.
4961         (set_new_first_and_last_insn, get_last_insn_anywhere,
4962         get_first_nonnote_insn, get_last_nonnote_insn, try_split,
4963         make_call_insn_raw, add_insn_after, add_insn_before, remove_insn,
4964         delete_insns_since, reorder_insns_nobb, emit_insn_after_1,
4965         emit_debug_insn_before, emit_insn, start_sequence, push_to_sequence,
4966         push_to_sequence2, push_topmost_sequence, end_sequence, copy_insn):
4967         Use accessor functions.
4968         * emit-rtl.h (gen_blockage, gen_rtvec, copy_insn_1, copy_insn,
4969          gen_int_mode, emit_copy_of_insn_after, set_reg_attrs_from_value,
4970         set_reg_attrs_for_parm, set_reg_attrs_for_decl_rtl, adjust_reg_mode,
4971         mem_expr_equal_p): Move here from rtl.h.
4972         (get_insns, set_first-insn, get_last_insn, set_last_insn, get_max_uid):
4973         Move here from emit-rtl.c; make inline.
4974         * cfglayout.h: Include emit-rtl.h.
4975         * rtl.h (gen_blockage, gen_rtvec, copy_insn_1, copy_insn,
4976          gen_int_mode, emit_copy_of_insn_after, set_reg_attrs_from_value,
4977         set_reg_attrs_for_parm, set_reg_attrs_for_decl_rtl, adjust_reg_mode,
4978         mem_expr_equal_p, get_insns, set_first-insn,
4979         get_last_insn, set_last_insn, get_max_uid): Move to emit-rtl.h.
4980         * reg-stack.c: Include emit-rtl.h.
4981         * dce.c: Likewise.
4983 2010-06-01  Jan Hubicka  <jh@suse.cz>
4985         * cgraph.h (tree_function_versioning): Update prototype.
4986         (cgraph_function_versioning): Update prototype.
4987         * cgraphunit.c (cgraph_copy_node_for_versioning): Accept bbs_to_copy
4988         bitmap.
4989         (cgraph_function_versioning): Accept new_entry_block and bbs_to_copy.
4990         (cgraph_materialize_clone, save_inline_function_body): Update use of
4991         tree_function_versioning.
4992         * tree-inline.c (copy_bb): Look for previous copied block to link
4993         after; fix debug output.
4994         (copy_cfg_body): Accept new_entry_block and bbs_to_copy.
4995         (copy_body): Likewise.
4996         (expand_call_inline): Update use of copy_body.
4997         (tree_function_versioning): Update use of copy body; accept
4998         blocks_to_copy and new_entry.
5000 2010-06-01  Jan Hubicka  <jh@suse.cz>
5002         * gegenrtl.c: Remove unnecesary prototypes.
5003         (gendecl): Remove.
5004         (gendef): Produce static inline.
5005         (gencode): Remove.
5006         (main): Do not decode parameters; generate header only.
5007         * Makefile.in (genrtl.c): Remove.
5009 2010-06-01  Jan Hubicka  <jh@suse.cz>
5011         * tree-switch-conversion.c (build_one_array): Make it readonly.
5013 2010-06-01  Richard Guenther  <rguenther@suse.de>
5015         * optabs.c (init_optabs): Guard all accesses to reinit.
5016         * ipa-pure-const.c (propagate): Fix another typo.
5017         * opts.c (common_handle_option): Split assignment to bool.
5018         * c-opts.c (c_common_handle_option): Likewise.
5020 2010-06-01  Arnaud Charlet  <charlet@adacore.com>
5021             Matthew Gingell  <gingell@adacore.com>
5023         * doc/invoke.texi: Mention -fdump-ada-spec.
5024         * tree-dump.c (dump_files): Add ada-spec.
5025         (FIRST_AUTO_NUMBERED_DUMP): Bump to 8.
5026         * tree-pass.h (tree_dump_index): Add TDI_ada.
5027         * gcc.c: Add support for -C without -E and for -fdump-ada-spec.
5028         (cpp_unique_options): Do not reject -C or -CC when -E isn't present.
5029         (default_compilers) <@c-header>: Allow -fdump-ada-spec on header files.
5030         * c-decl.c: Include c-ada-spec.h.
5031         (collect_source_ref_cb, collect_all_refs, for_each_global_decl): New
5032         functions.
5033         (c_write_global_declarations): Add handling of -fdump-ada-spec.
5034         * c-lex.c (c_lex_with_flags): Add handling of CPP_COMMENT.
5035         * Makefile.in (C_AND_OBJC_OBJS): Add c-ada-spec.o.
5036         * c-ada-spec.h, c-ada-spec.c: New files.
5038 2010-06-01  Richard Guenther  <rguenther@suse.de>
5040         PR lto/43853
5041         * ipa-pure-const.c (get_function_state): Hand back varying state
5042         if we do not have one.
5043         (has_function_state): New function.
5044         (duplicate_node_data): Adjust.
5045         (remove_node_data): Likewise.
5046         (pure_const_write_summary): Likewise.
5047         (propagate): Likewise.  Fix typo.
5049 2010-06-01  Jan Hubicka  <jh@suse.cz>
5051         * tree-cfg.c (verify_stmt): Do not skip could_throw test.
5052         * passes.c (execute_function_todo): Do not make implicit verify_ssa.
5053         (execute_all_ipa_transforms): Do not play with the states.
5055 2010-06-01  Maxim Kuvyrkov  <maxim@codesourcery.com>
5057         * config/arm/t-linux-androideabi: New.
5058         * config.gcc (arm*-*-linux-androideabi): Include multilib config.
5060 2010-06-01  Jan Hubicka  <jh@suse.cz>
5062         * tree-inline.c (estimate_num_insns): For stdarg functions look
5063         into call statement to count cost of argument passing.
5065 2010-06-01  Kai Tietz  <kai.tietz@onevision.com>
5067         * config/i386.c (ix86_output_addr_vec_elt): Make LPREFIX
5068         argument for fprintf.
5069         (ix86_output_addr_diff_elt): Likewise.
5070         (x86_function_profiler): Likewise.
5071         * config/cygming.h (LOCAL_LABEL_PREFIX): Fix for x64 no-underscore.
5072         (LPREFIX): Likewise.
5073         (ASM_GENERATE_INTERNAL_LABEL): Likewise.
5075 2010-05-31  Jakub Jelinek  <jakub@redhat.com>
5077         PR target/44338
5078         * config/i386/sse.md (fma4i_fmadd<mode>4256, fma4i_fmsub<mode>4256,
5079         fma4i_fnmadd<mode>4256, fma4i_fnmsub<mode>4256, fma4i_fmadd<mode>4,
5080         fma4i_fmsub<mode>4, fma4i_fnmadd<mode>4, fma4i_fnmsub<mode>4,
5081         fma4i_vmfmadd<mode>4, fma4i_vmfmsub<mode>4, fma4i_vmfnmadd<mode>4,
5082         fma4i_vmfnmsub<mode>4, fma4i_fmaddsubv8sf4, fma4i_fmaddsubv4df4,
5083         fma4i_fmaddsubv4sf4, fma4i_fmaddsubv2df4, fma4i_fmsubaddv8sf4,
5084         fma4i_fmsubaddv4df4, fma4i_fmsubaddv4sf4, fma4i_fmsubaddv2df4):
5085         Guard only with TARGET_FMA4 instead of TARGET_FMA4 &&
5086         TARGET_FUSED_MADD.
5088 2010-05-31  Jan Hubicka  <jh@suse.cz>
5090         * tree.h (tree_range_check_failed): Declare noreturn.
5092 2010-05-31  Jan Hubicka  <jh@suse.cz>
5094         * gimple.c (gimple_call_builtin_p): New function.
5095         * gimple.h (gimple_call_builtin_p): Declare.
5096         * tree-cfg.c (make_edges): Produce edge from BUILT_IN_RETURN
5097         to exit.
5098         (execute_warn_function_return): BUILT_IN_RETURN is return.
5099         (split_critical_edges): Return edges are not critical.
5100         (is_ctrl_altering_stmt): Builtin_in_return is altering.
5101         (gimple_verify_flow_info): Handle built_in_return.
5102         (execute_warn_function_return): Handle built_in_return.
5103         * ipa-pure-const.c (check_call): Ignore builtin_return.
5105 2010-05-31  Jakub Jelinek  <jakub@redhat.com>
5107         PR middle-end/44337
5108         * expr.c (expand_assignment): Don't store anything for out-of-bounds
5109         array accesses with non-MEM.
5111         PR tree-optimization/44182
5112         * tree-inline.c (copy_edges_for_bb): Don't split bb if a stmt that
5113         newly needs to end a bb is followed by debug stmts, instead return
5114         true from the function at the end.
5115         (maybe_move_debug_stmts_to_successors): New function.
5116         (copy_cfg_body): Call it if copy_edges_for_bb returned true.
5118 2010-05-31  Kai Tietz  <kai.tietz@onevision.com>
5120         PR target/44161
5121         * config/i386/cygming.h (SUBTARGET_OVERRIDE_OPTIONS): Handle flag_pic.
5123 2010-05-31  Eric Botcazou  <ebotcazou@adacore.com>
5125         * cgraphunit.c (cgraph_decide_is_function_needed): Really return false
5126         for nested functions in non-optimized compilation.
5128 2010-05-31  Richard Guenther  <rguenther@suse.de>
5130         * tree-ssa-structalias.c (find_func_aliases): Handle BUILT_IN_RETURN.
5132 2010-05-30  Jan Hubicka  <jh@suse.cz>
5134         * predict.c (maybe_hot_edge_p): Calls to functions called once is cold.
5136 2010-05-30  Richard Guenther  <rguenther@suse.de>
5138         PR lto/42975
5139         * tree-eh.c (execute_cleanup_eh_1): Copy from execute_cleanup_eh.
5140         (execute_cleanup_eh): Clear DECL_FUNCTION_PERSONALITY if it is
5141         no longer needed.
5143 2010-05-30  Iain Sandoe  <iains@gcc.gnu.org>
5145         * config/darwin.c (output_objc_section_asm_op): Add comment.
5146         (name_needs_quotes): Add '_' to list of valid comment chars.
5147         (machopic_output_function_base_name): Remove unneeded quotes.
5148         (darwin_encode_section_info): Adjust asm whitespace.
5149         * config/i386/darwin.h (ASM_OUTPUT_COMMON): Adjust asm tabs.
5150         (ASM_OUTPUT_LOCAL): Ditto.
5151         * config/rs6000/darwin.h (ASM_OUTPUT_COMMON): Ditto.
5152         * config/darwin.h (GLOBAL_ASM_OP): Ditto.
5153         * config/darwin9.h (ASM_OUTPUT_ALIGNED_COMMON): Ditto.
5155 2010-05-30  Eric Botcazou  <ebotcazou@adacore.com>
5157         * config/rs6000/rs6000.c (rs6000_output_function_entry): Use
5158         RS6000_OUTPUT_BASENAME unconditionally.
5159         (rs6000_output_function_epilogue): Likewise.
5161 2010-05-30  Jan Hubicka  <jh@suse.cz>
5163         * toplev.c (wrapup_global_declaration_2): Avoid creation of new varpool
5164         nodes.
5166 2010-05-30  Richard Guenther  <rguenther@suse.de>
5168         * tree-cfg.c (verify_gimple_assign_single): Implement
5169         verification for COND_EXPR rhs.
5171 2010-05-30  Jan Hubicka  <jh@suse.cz>
5173         * cgraph.h (cgraph_dump_file): Declare.
5174         * cgraphunit.c (cgraph_dump_file): Export.
5175         * ipa.c (dump_cgraph_node_set, dump_varpool_node_set): Be less verbose.
5177 2010-05-30  Jan Hubicka  <jh@suse.cz>
5179         * dwarf2out.c (reference_to_unused,
5180         premark_types_used_by_global_vars_helper): Avoid creation of new
5181         varpool nodes.
5183 2010-05-30  Jan Hubicka  <jh@suse.cz>
5185         * cgraph.h (cgraph_node_cannot_return,
5186         cgraph_edge_cannot_lead_to_return): New functions.
5187         * cgraph.c (cgraph_node_cannot_return,
5188         cgraph_edge_cannot_lead_to_return): Use them.
5189         * ipa-pure-const.c (pure_const_names): New static var.
5190         (check_call): Handle calls not leading to return.
5191         (pure_const_read_summary): Dump info read.
5192         (propagate): Dump info about propagation process; ignore side effects
5193         of functions not leading to exit; fix handling of pure functions.
5195 2010-05-30  Jan Hubicka  <jh@suse.cz>
5197         * config/i386/i386.c (pro_epilogue_adjust_stack): Use EBP
5198         for tail call epilogues.
5200 2010-05-30  Jan Hubicka  <jh@suse.cz>
5202         * passes.c (ipa_write_optimization_summaries_1, ipa_write_summaries_2,
5203         ipa_read_summaries_1, ipa_read_optimization_summaries_1): Initialize
5204         dump files.
5206 2010-05-29  Jan Hubicka  <jh@suse.cz>
5208         * ipa.c (cgraph_remove_unreachable_node): Walk references of correct
5209         node; remove references in node we no longer keep in cgrpah but need
5210         body of.
5212 2010-05-29  Jan Hubicka  <jh@suse.cz>
5214         * cgraph.c (cgraph_mark_reachable): Relax check for analyzed nodes.
5216 2010-05-29  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
5218         PR target/44165
5219         * config/pa/pa32-linux.h (CTOR_LIST_BEGIN): Mark __CTOR_LIST__ as used.
5221 2010-05-29  Jan Hubicka  <jh@suse.cz>
5223         * tree-vrp.c (debug_value_range, debug_all_value_ranges,
5224         debug_asserts_for, debug_all_asserts): Annotate with DEBUG_FUNCTION.
5225         * tree-into-ssa.c (debug_decl_set, debug_defs_stack, debug_currdefs,
5226         debug_tree_ssa, debug_tree_ssa_stats, debug_def_blocks,
5227         debug_names_replaced_by, debug_update_ssa): Likewise.
5228         * sbitmap.c (debug_sbitmap): Likewise.
5229         * genrecog.c (debug_decision, debug_decision_list): Likewise.
5230         * tree-pretty-print.c (debug_generic_expr, debug_generic_stmt,
5231         debug_tree_chain): Likewise.
5232         * tree-loop-distribution.c (debug_rdg_partitions): Likewise.
5233         * cgraph.c (debug_cgraph_node, debug_cgraph): Likewise.
5234         * optabs.c  (debug_optab_libfuncs): Likewise.
5235         (verify_loop_closed_ssa): Likewise.
5236         * value-prof.c (verify_histograms): Likewise.
5237         * reload.c (debug_reload_to_stream, debug_reload): Likewise.
5238         * bitmap.c (debug_bitmap_file, debug_bitmap, bitmap_print): Likewise.
5239         * cfghooks.c (verify_flow_info): Likewise.
5240         * fold-const.c (debug_fold_checksum): Likewise.
5241         * omp-low.c (debug_omp_region, debug_all_omp_regions): Likewise.
5242         * cfg.c (debug_regset, debug_flow_info, debug_bb, debug_bb_n):
5243         Likewise.
5244         * omega.c (debug_omega_problem): Likewise.
5245         * cgraphunit.c (verify_cgraph_node, verify_cgraph): Likewise.
5246         * tree-ssa-ccp.c (debug_lattice_value): Likewise.
5247         * dominance.c (verify_dominators, debug_dominance_info,
5248         debug_dominance_tree): Likewise.
5249         * df-core.c (df_insn_uid_debug, df_insn_debug, df_insn_debug_regno,
5250         * df_regno_debug, df_ref_debug,
5251         debug_df_insn, debug_df_reg, debug_df_regno, debug_df_ref,
5252         debug_df_defno, debug_df_useno, debug_df_chain): Likewise.
5253         * tree-ssa-dom.c (debug_dominator_optimization_stats): Likewise.
5254         * sel-sched.c (debug_state): Likewise.
5255         * tree-ssa-alias.c (debug_alias_info, debug_points_to_info_for):
5256         Likewise.
5257         * cfganal.c (print_edge_list, verify_edge_list): Likewise.
5258         * dwarf2out.c (debug_dwarf_die, debug_dwarf): Likewise.
5259         * tree-eh.c (verify_eh_edges, verify_eh_dispatch_edge): Likewise.
5260         * gimple-pretty-print.c (debug_gimple_stmt, debug_gimple_seq):
5261         Likewise.
5262         * c-pretty-print.c (debug_c_tree): Likewise.
5263         * sel-sched-dump.c (debug_insn_rtx, debug_vinsn, debug_expr, debug_insn
5264         debug_av_set, debug_lv_set, debug_ilist, debug_blist,
5265         debug_insn_vector, debug_hard_reg_set, debug_mem_addr_value): Likewise.
5266         * ebitmap.c (debug_ebitmap): Likewise.
5267         * function.c (debug_find_var_in_block_tree): Likewise.
5268         * print-rtl.c (debug_rtx): Likewise.
5269         (debug_rtx_count): Likewise.
5270         (debug_rtx_list, debug_rtx_range, debug_rtx_find): Likewise.
5271         * stor-layout.c (debug_rli): Likewise.
5272         * ipa.c (debug_cgraph_node_set, debug_varpool_node_set): Likewise.
5273         * tree-data-ref.c (debug_data_references,
5274         debug_data_dependence_relations, debug_data_reference,
5275         debug_data_dependence_relation, debug_rdg_vertex,
5276         debug_rdg_component, debug_rdg): Likewise.
5277         * tree-affine.c (debug_aff): Likewise.
5278         * tree-dfa.c (debug_referenced_vars, debug_variable, debug_dfa_stats):
5279         Likewise.
5280         * except.c (debug_eh_tree, verify_eh_tree): Likewise.
5281         * emit-rtl.c (verify_rtl_sharing): Likewise.
5282         * tree-ssa-pre.c (debug_pre_expr, debug_bitmap_set,
5283         debug_value_expressions): Likewise.
5284         * tree-ssa-live.c (debug_scope_block, debug_scope_blocks): Likewise.
5285         * sese.c (debug_rename_map, debug_ivtype_map): Likewise.
5286         * print-tree.c (debug_tree, debug_vec_tree): Likewise.
5287         * cfglayout.c (verify_insn_chain): Likewise.
5288         * graphite-clast-to-gimple.c (debug_clast_name_indexes,
5289         debug_clast_stmt, debug_generated_program): Likewise.
5290         * ggc-page.c (debug_print_page_list): Likewise.
5291         * tree-ssa-ter.c (debug_ter): Likewise.
5292         * graphite-dependences.c (debug_pddr): Likewise.
5293         * sched-deps.c (debug_ds): Likewise.
5294         * tree-ssa.c (verify_ssa): Likewise.
5295         * graphite-poly.c (debug_scattering_function, debug_iteration_domain,
5296         debug_scattering_functions, debug_iteration_domains, debug_pdr,
5297         debug_pdrs, debug_pbb_domain, debug_pbb, debug_scop_context,
5298         debug_scop, debug_cloog, debug_scop_params, debug_lst): Likewise.
5299         * tree-inline.c (debug_find_tree): Likewise.
5300         * graphite-ppl.c (debug_ppl_linear_expr, debug_ppl_polyhedron_matrix,
5301         debug_ppl_powerset_matrix): Likewise.
5302         * var-tracking.c (debug_dv): Likewise.
5303         * system.h (DEBUG_FUNCTION, DEBUG_VARIABLE): Define.
5304         * cfgloop.c (verify_loop_structure): Likewise.
5305         * plugin.c (dump_active_plugins, debug_active_plugins): Likewise.
5306         * c-common.c (verify_sequence_points): Likewise.
5307         * sched-rgn.c (debug_regions, debug_region, debug_candidate,
5308         debug_candidates, debug_rgn_dependencies): Likewise.
5309         * tree-ssa-structalias.c (debug_constraint, debug_constraints,
5310         * debug_constraint_graph, debug_solution_for_var,
5311         debug_sa_points_to_info): Likewise.
5312         * sched-vis.c (debug_insn_slim, debug_bb_slim, debug_bb_n_slim):
5313         Likewie.
5314         * tree-cfg.c (debug_cfg_stats, verify_stmts, debug_function,
5315         debug_loops, debug_loop, debug_loop_num): Likewise.
5316         * passes.c (debug_pass): Likewise.
5317         (dump_properties): Likewise; add cfglayout property.
5318         (debug_properties): Likewise.
5319         * tree-ssa-reassoc.c (debug_ops_vector): Likewise.
5320         * varpool.c (debug_varpool): Likewise.
5321         * regcprop.c (debug_value_data): Likewise.
5322         * tree-ssa-operands.c (verify_imm_links, debug_immediate_uses,
5323         debug_immediate_uses_for): Likewise.
5325 2010-05-29  H.J. Lu  <hongjiu.lu@intel.com>
5327         PR bootstrap/44315
5328         * Makefile.in (build/gencondmd.o): Remove TM_H := $(GTM_H).
5329         Filter out insn-flags.h.
5331 2010-05-29  Jan Hubicka  <jh@suse.cz>
5333         * cgraph.h (struct varpool_node_set_def,
5334         struct cgraph_node_set_def): Remove unused AUX pointer.
5335         (cgraph_node_set_nonempty_p, varpool_node_set_nonempty_p): Use
5336         VEC_empty macro.
5338 2010-05-29  Jan Hubicka  <jh@suse.cz>
5340         PR middle-end/44324
5341         * ipa-cp.c (ipcp_insert_stage): Replace "clone" by "constprop".
5343 2010-05-29  Richard Guenther  <rguenther@suse.de>
5345         * lto-streamer.c (cached_bp): New global variable.
5346         (bitpack_create): Return the cached bitpack, if available.
5347         (bitpack_delete): Clear and cache the bitpack, if appropriate.
5348         (bp_pack_value): Remove redundant asserts.
5350 2010-05-29  Sebastian Pop  <sebastian.pop@amd.com>
5352         PR middle-end/44306
5353         * tree-if-conv.c (is_true_predicate): New.
5354         (is_predicated): Use is_true_predicate.
5355         (add_to_predicate_list): Same.  Do not use unshare_expr.
5356         (add_to_dst_predicate_list): Same.
5358 2010-05-29  Sebastian Pop  <sebastian.pop@amd.com>
5360         * tree-if-conv.c (add_to_dst_predicate_list): Do not use the ->aux
5361         field on edges.
5362         (predicate_bbs): Same.
5363         (clean_predicate_lists): Same.
5364         (find_phi_replacement_condition): Do not AND the predicate from
5365         edge->aux.
5367 2010-05-29  H.J. Lu  <hongjiu.lu@intel.com>
5369         PR bootstrap/44315
5370         * Makefile.in (build/gencondmd.o): Add a missing `\'.
5372 2010-05-29  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
5374         PR target/44261
5375         config/pa/pa.md (negdf2_slow, negsf2_slow): New patterns.
5376         (negdf2): Adjust expander pattern and use negdf2_slow.
5377         (negsf2): Likewise.
5379 2010-05-29  Nathan Froyd  <froydnj@codesourcery.com>
5381         * basic-block.h (struct control_flow_graph): Move last_label_uid field
5382         up.
5383         * df.h (struct df_base_ref): Move regno field up.
5384         * dwarf2out.c (struct dw_fde_struct): Move funcdef_number field down.
5385         * expr.h (struct separate_ops): Move location field up.
5386         * optabs.h (struct optab_d): Move libcall_basename field down.
5387         * config/i386/i386.c (struct ix86_frame): Move red_zone_size up.
5388         * config/i386/i386.h (struct machine_function): Convert call_abi field
5389         into a bitfield.  Move cfa field to the end of the structure.
5391 2010-05-29  Jan Hubicka  <jh@suse.cz>
5393         * varpool.c (varpool_get_node): Fix lookup.
5395 2010-05-29  Steven Bosscher  <steven@gcc.gnu.org>
5397         * config/spu/spu-protos.h: Do not include rtl.h.  Protect
5398         RTL specific prototypes with #ifdef RTX_CODE.
5399         * config/spu/spu-c.c: Include c-common.h instead of c-tree.h.
5400         * config/spu/t-spu-elf: Fix dependencies.
5402         * config/t-darwin (darwin-c.o): Remove C_TREE_H dependency.
5404 2010-05-29  Mike Stump  <mikestump@comcast.net>
5406         PR bootstrap/44315
5407         * Makefile.in (build/gencondmd.o): Be sure to use GTM_H instead of
5408         TM_H when building to avoid dependency loops.
5410 2010-05-29  Jan Hubicka  <jh@suse.cz>
5412         * cgraphunit.c (cgraph_materialize_clone): Only remove calles,
5413         refs and body; not the whole node for masters of materialized clones.
5415 2010-05-29  Mike Stump  <mikestump@comcast.net>
5417         * config/rs6000/rs6000-c.c: Remove c-tree.h include.
5419 2010-05-29  Jan Hubicka  <jh@suse.cz>
5421         * cgraph.c (clone_function_name): Take SUFFIX argument; export.
5422         (cgraph_create_virtual_clone): Take SUFFIX argument; udpate
5423         use of clone_function_name.
5424         * cgraph.h (cgraph_create_virtual_clone,
5425         cgraph_function_versioning): update prototypes.
5426         (clone_function_name): Declare.
5427         * ipa-cp.c (ipcp_insert_stage): Update call of
5428         cgraph_create_virtual_clone.
5429         * omp-low.c (create_omp_child_function_name): Use
5430         cgraph_create_virtual_clone.
5431         * cgraphunit.c (cgraph_copy_node_for_versioning): Fix edges updating.
5432         (cgraph_function_versioning): Take SUFFIX argument; produce new name
5433         and make decl local.
5435 2010-05-29  Steven Bosscher  <steven@gcc.gnu.org>
5437         * vec.h: Include statistics.h
5438         * Makefile.in: Introduce VEC_H.  Replace all vec.h dependencies
5439         with VEC_H.
5441 2010-05-29  Steven Bosscher  <steven@gcc.gnu.org>
5443         * c-lex.c: Do not include c-tree.h.
5444         * c-pretty-print.c: Likewise.
5445         * c-opts.c: Likewise.
5446         * c-gimplify.c: Likewise.
5447         * c-common.c: Likewise.
5448         * c-dump.c: Likewise.  Include c-common.h.
5450 2010-05-29  Steven Bosscher  <steven@gcc.gnu.org>
5452         * c-common.h (GCC_DIAG_STYLE): Define earlier in the file,
5453         before including diagnostic-core.h.
5454         (c_cpp_error): New prototype moved from c-tree.h.
5455         Use ATTRIBUTE_GCC_DIAG instead of ATTRIBUTE_GCC_CDIAG.
5456         * c-tree.h (ATTRIBUTE_GCC_CDIAG): Remove define.
5457         (pedwarn_c90, perwarn_c99): Use ATTRIBUTE_GCC_DIAG instead.
5458         (c_cpp_error): Prototype moved to c-common.h.
5459         * Makefile.in: Update dependency for C_COMMON_H.
5461 2010-05-29  Steven Bosscher  <steven@gcc.gnu.org>
5463         * c-common.h: Add FIXME for awkward split of c_register_addr_space.
5464         * c-common.c (c_register_addr_space): Remove here.
5465         * c-decl.c (c_register_addr_space): Re-add here.
5467 2010-05-28  Mike Stump  <mikestump@comcast.net>
5469         * config/darwin-c.c: Remove c-tree.h include.
5471 2010-05-28  Joseph Myers  <joseph@codesourcery.com>
5473         * gcc.c: Include diagnostic.h.
5474         (error_count): Remove.  All users changed to use errorcount.
5475         (programname): Remove.  All users changed to use progname.
5476         (fancy_abort, internal_error, fatal_error, error, warning, inform,
5477         fnotice): Remove.
5478         (execute): Don't include "Internal error" and bug reporting
5479         information in argument of internal_error call.
5480         (process_command): Don't increment error_count after calling
5481         perror_with_name.
5482         (input_filename): Rename to gcc_input_filename.  All users
5483         changed.
5484         (main): Call diagnostic_initialize.  Register delete_temp_files
5485         with atexit.  Use seen_error to test for errors.
5486         * gcc.h: Include diagnostic-core.h.
5487         (fatal_error, error, warning): Remove.
5488         * Makefile.in (GCC_H): Add $(DIAGNOSTIC_CORE_H).
5489         (GCC_OBJS): Add diagnostic.o, pretty-print.o and input.o.
5490         (gcc.o): Update dependencies.
5492 2010-05-28  Jeff Law  <law@redhat.com>
5494         * ira.c (ira_bad_reload_regno, ira_build_reload_regno_1): New
5495         functions.
5496         * ira.h (ira_bad_reload_regno): Declare
5497         * reload1.c (allocate_reload_reg): Use ira_bad_reload_regno.
5499         * ira-color.c (update_curr_costs): Free updated hard reg costs.
5500         (ira_reassign_conflict_allocnos): Remove bogus asserts.
5501         (allocno_reload_assign): Likewise.
5503 2010-05-28  Nathan Froyd  <froydnj@codesourcery.com>
5505         * tree-vect-stmts.c (vectorizable_assignment): Call build1 instead of
5506         build1_stat.
5508 2010-05-28  Richard Guenther  <rguenther@suse.de>
5510         PR lto/44312
5511         * lto-streamer-in.c (unpack_ts_fixed_cst_value_fields):
5512         Stream fixed-point constants mode.
5513         (unpack_ts_type_value_fields): Fix width of TYPE_MODE
5514         and TYPE_PRECISION.
5515         * lto-streamer-out.c (pack_ts_fixed_cst_value_fields):
5516         Stream fixed-point constants mode.
5517         (pack_ts_function_decl_value_fields): Fix width of TYPE_MODE
5518         and TYPE_PRECISION.
5520 2010-05-28  Sebastian Pop  <sebastian.pop@amd.com>
5522         * tree-scalar-evolution.c (set_nb_iterations_in_loop): Inlined in the
5523         only place it was called from.
5524         (number_of_latch_executions): Do not return chrec_dont_know when the
5525         may_be_zero is a runtime condition: instead, return a COND_EXPR
5526         including the may_be_zero condition.
5527         * cfgloop.h (struct loop): Add a note on COND_EXPRs to the comment
5528         of nb_iterations.
5529         * tree-ssa-loop-ivopts.c (contains_abnormal_ssa_name_p): Handle
5530         COND_EXPRs.
5532 2010-05-28  Sebastian Pop  <sebastian.pop@amd.com>
5534         * tree-if-conv.c (replace_phi_with_cond_gimple_assign_stmt): Don't
5535         generate COND_EXPRs for degenerate_phi_result.
5537 2010-05-28  Sebastian Pop  <sebastian.pop@amd.com>
5539         PR middle-end/44293
5540         * tree-if-conv.c (if_convertible_loop_p): Check the
5541         if-convertibility of phi nodes in non predicated BBs.
5543 2010-05-28  Joseph Myers  <joseph@codesourcery.com>
5545         * gcc.c (error, warning, inform): Remove duplicate ": " in output.
5547 2010-05-28  Joseph Myers  <joseph@codesourcery.com>
5549         PR driver/15303
5550         * gcc.c (inform, warning, inform): New functions.
5551         (fatal_ice): Rename to internal_error; change cmsgid parameter to
5552         gmsgid.  All callers changed.
5553         (notice): Rename to fnotice; add parameter fp.  All callers changed.
5554         (fatal_error): Rename to fatal_signal.  All users changed.
5555         (fatal): Rename to fatal_error; change cmsgid parameter to
5556         gmsgid.  All callers changed.
5557         (process_command): Use warning instead of error for warnings.
5558         (end_going_arg): Don't use _() around argument of error.
5559         (do_spec_1): Use inform for message from %n specs.  Use warning
5560         instead of error for warnings.
5561         (main): Use inform for comparison messages.  Use warning for
5562         message about unused linker input.
5563         (error): Increment error_count.  Print "error: ".
5564         * gcc.h (fatal): Change to fatal_error.
5565         (warning): Declare.
5566         * config/darwin-driver.c (darwin_default_min_version): Use warning
5567         instead of fprintf for warnings.
5568         * cppspec.c (lang_specific_driver): Use fatal_error instead of fatal.
5570 2010-05-28  Julian Brown  <julian@codesourcery.com>
5572         * config/arm/thumb2.md (*thumb2_addsi3_compare0): New.
5573         (*thumb2_addsi3_compare0_scratch): New.
5574         * config/arm/constraints.md (Pv): New.
5575         * config/arm/arm.md (*addsi3_compare0): Remove FIXME comment. Use
5576         for ARM mode only.
5577         (*addsi3_compare0_scratch): Likewise.
5579 2010-05-28  Jan Hubicka  <jh@suse.cz>
5581         * ipa-reference.c (add_static_var): Remove redundant all_module_statics
5582         check.
5583         (ipa_reference_write_optimization_summary): Call is_proper_for_analysis
5584         only on local statics.
5586 2010-05-28  Iain Sandoe  <iains@gcc.gnu.org>
5588         * config.gcc (*-*-darwin*): Adjust t-make fragments for Darwin.
5590 2010-05-28  Maxim Kuvyrkov  <maxim@codesourcery.com>
5592         PR bootstrap/44314
5593         * config/alpha/linux.h, config/rs6000/linux.h, config/rs6000/linux64.h
5594         (OPTION_GLIBC): Define.
5596 2010-05-28  Jakub Jelinek  <jakub@redhat.com>
5598         PR debug/41048
5599         * dwarf2out.c (double_int_type_size_in_bits): New function.
5600         (round_up_to_align): Change first argument and return value to
5601         double_int.
5602         (field_byte_offset): Work internally on double_ints.
5604         PR target/43636
5605         * builtins.c (expand_movstr): Use a temporary pseudo instead
5606         of target even when target is not NULL and not const0_rtx, but
5607         fails movstr predicate.
5608         * config/m32c/blkmov.md (movstr): Add predicate to first operand.
5610 2010-05-28  Joseph Myers  <joseph@codesourcery.com>
5612         * final.c (rest_of_clean_state): Use %m in errors instead of
5613         strerror (errno).
5614         * gengtype.c (read_input_list, close_output_files): Use xstrerror
5615         instead of strerror.
5616         * toplev.c (process_options): Use %m in errors instead of strerror
5617         (errno).
5618         * tree-dump.c (dump_begin): Use %m in errors instead of strerror
5619         (errno).
5621 2010-05-28  Uros Bizjak  <ubizjak@gmail.com>
5623         * config/i386/i386.c (ix86_fn_abi_va_list): Make static.
5624         (ix86_canonical_va_list_type): Make static.  Add declaration.
5625         (ix86_enum_va_list): Make static.  Reindent.
5626         * config/i386/i386-protos.h (ix86_fn_abi_va_list): Remove declaration.
5627         (ix86_canonical_va_list_type): Ditto.
5628         (ix86_enum_va_list): Ditto.
5630 2010-05-28  Richard Guenther  <rguenther@suse.de>
5632         * lto-wrapper.c (run_gcc): With -save-temps generate a
5633         user-visible ltrans filename.  Fixup ltrans unit numbering.
5635 2010-05-28  Kai Tietz  <kai.tietz@onevision.com>
5637         * c-common.c (c_common_nodes_and_builtins): Replace use
5638         of TARGET_ENUM_VA_LIST by target hook enum_va_list.
5639         * config/i386/i386.c (TARGET_ENUM_VA_LIST_P): Hook
5640         to ix86_enum_va_list.
5641         * config/i386/i386.h (TARGET_ENUM_VA_LIST): Removed.
5642         * doc/tm.texi (TARGET_ENUM_VA_LIST): Removed.
5643         (TARGET_ENUM_VA_LIST_P): Add hook description.
5644         * target-def.h (TARGET_ENUM_VA_LIST_P): Added.
5645         * target.h (gcc_target): Add enum_va_list hook.
5647         PR bootstrap/44299
5648         * config/i386/t-cygming: Adjust header dependencies for winnt-cxx.c.
5649         * config/i386/winnt-cxx.c (IN_GCC_FRONTEND): Remove undefine.
5650         * config/i386/winnt.c (IN_GCC_FRONTEND): Likewise.
5652 2010-05-28  Alan Modra  <amodra@gmail.com>
5654         PR target/44266
5655         * config/rs6000/rs6000.c (rs6000_legitimize_tls_address): Use
5656         emit_library_call machinery to set up __tls_get_addr calls.
5658 2010-05-28  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
5660         * config/s390/s390.md (movqi): Fix typo ('*' -> '#').
5662 2010-05-28  Dodji Seketeli  <dodji@redhat.com>
5664         Revert fix for PR c++/44188
5665         * c-common.c (is_typedef_decl): Revert the moving of  this
5666         definition ...
5667         * tree.c (is_typedef_decl): ... here.
5668         (typdef_variant_p): Revert the moving of this  definition
5669         here from gcc/cp/tree.c.
5670         * c-common.h (is_typedef_decl): Revert the moving of this
5671         declaration ...
5672         * tree.h (is_typedef_decl): ... here.
5673         (typedef_variant_p): Revert the moving of this  declaration here
5674         from gcc/cp/cp-tree.h
5675         * dwarf2out.c (is_naming_typedef_decl): Revert this new function.
5676         (gen_tagged_type_die): Revert the splitting out of ...
5677         (gen_type_die_with_usage): ... this function. Revert the anonymous
5678         tagged type handling.
5679         (gen_typedef_die): Revert emitting DW_TAG_typedef  for
5680         typedefs naming anonymous tagged types.
5682 2010-05-28  Segher Boessenkool  <segher@kernel.crashing.org>
5684         * config/rs6000/rs6000-modes.def (PSImode): Delete.
5686 2010-05-28  Segher Boessenkool  <segher@kernel.crashing.org>
5688         * config/rs6000/constraints.md ("z" constraint): Change to CA_REGS.
5689         * config/rs6000/predicates.md: Change XER_REGNO_P to CA_REGNO_P
5690         throughout.
5691         * config/rs6000/rs6000.c (rs6000_reg_names, alt_reg_names): Change
5692         "xer" to "ca".
5693         Change XER_REGNO_P to CA_REGNO_P, XER_REGNO to CA_REGNO, and
5694         XER_REGS to CA_REGS throughout.
5695         * config/rs6000/rs6000.h: Same.
5696         (ADDITIONAL_REGISTER_NAMES): Add "xer".
5697         * config/rs6000/rs6000.md: Change XER_REGNO to CA_REGNO.  Document
5698         that mode_iterator "P" is the size for arithmetic carries as well.
5699         * doc/md.texi (rs6000 section, "z" constraint): Fix documentation.
5701 2010-05-28  Jakub Jelinek  <jakub@redhat.com>
5703         PR bootstrap/44255
5704         * combine.c (struct rtx_subst_pair): Define unconditionally.
5705         (propagate_for_debug_subst): Likewise.  If not AUTO_INC_DEC,
5706         copy_rtx pair->to instead of cleanup_auto_inc_dec it.
5707         Call make_compound_operation on pair->to.
5708         (propagate_for_debug): Don't call make_compound_operation here.
5709         Always use simplify_replace_fn_rtx.
5711 2010-05-27  Sterling Augustine  <sterling@tensilica.com>
5713         * doc/invoke.texi (xtensa options): Add -mforce-no-pic.
5714         * config/xtensa/xtensa.c (override_options): Check
5715           TARGET_FORCE_NO_PIC and set flag_pic.
5716         * config/xtensa/xtensa.opt: Document -mforce-no-pic
5718 2010-05-27  Kai Tietz  <kai.tietz@onevision.com>
5720         PR bootstrap/44299
5721         * config/i386/winnt.c (IN_GCC_FRONTEND): Undefine.
5722         * config/i386/winnt-cxx.c (IN_GCC_FRONTEND): Likewise.
5724 2010-05-27  Joseph Myers  <joseph@codesourcery.com>
5726         * diagnostic-core.h: New.  Contents moved from diagnostic.h and
5727         toplev.h.
5728         * diagnostic.c: Don't include toplev.h.
5729         (progname): Define.  Moved from toplev.c.
5730         (seen_error): New function.
5731         * diagnostic.h: Include diagnostic-core.h.
5732         (diagnostic_t, emit_diagnostic): Don't declare here.
5733         * toplev.c (progname): Move to toplev.c.
5734         (emit_debug_global_declarations, compile_file, finalize,
5735         do_compile, toplev_main): Use seen_error.
5736         * toplev.h: Include diagnostic-core.h.
5737         (trim_filename, GCC_DIAG_STYLE, ATTRIBUTE_GCC_DIAG,
5738         internal_error, warning, warning_at, error, error_n, error_at,
5739         fatal_error, pedwarn, permerror, sorry, inform, inform_n,
5740         verbatim, fnotice, progname): Move to diagnostic-core.h.
5741         * builtins.c: Include diagnostic-core.h instead of diagnostic.h.
5742         (expand_builtin_expect): Use seen_error.
5743         * c-decl.c: Include diagnostic-core.h instead of diagnostic.h.
5744         (c_make_fname_decl, c_write_global_declarations): Use seen_error.
5745         * c-format.c: Include diagnostic-core.h instead of diagnostic.h.
5746         * c-gimplify.c: Include diagnostic-core.h instead of diagnostic.h.
5747         * c-lang.c: Include diagnostic-core.h instead of diagnostic.h.
5748         * c-lex.c (c_lex_with_flags, interpret_float): Don't increment
5749         errorcount for errors.
5750         * c-opts.c (c_common_finish): Use seen_error.
5751         * cgraph.c: Include diagnostic-core.h instead of diagnostic.h.
5752         * cgraphunit.c (verify_cgraph_node, verify_cgraph,
5753         cgraph_output_pending_asms, cgraph_optimize): Use seen_error.
5754         * coverage.c: Include diagnostic-core.h instead of diagnostic.h.
5755         (get_coverage_counts): Use seen_error.
5756         * dwarf2out.c (dwarf2out_finish): Use seen_error.
5757         * gimplify.c (gimplify_var_or_parm_decl, gimple_push_cleanup,
5758         gimplify_body): Use seen_error.
5759         * ipa-inline.c (cgraph_early_inlining): Use seen_error.
5760         * ipa-pure-const.c (gate_pure_const): Use seen_error.
5761         * ipa-reference.c (gate_reference): Use seen_error.
5762         * jump.c: Include diagnostic-core.h instead of diagnostic.h.
5763         * lambda-code.c: Include diagnostic-core.h instead of
5764         diagnostic.h.
5765         * lto-cgraph.c: Include diagnostic-core.h instead of diagnostic.h.
5766         * lto-compress.c: Include diagnostic-core.h instead of
5767         diagnostic.h.
5768         * lto-section-in.c: Include diagnostic-core.h instead of
5769         diagnostic.h.
5770         * lto-streamer-out.c: Include diagnostic-core.h instead of
5771         diagnostic.h.
5772         * lto-streamer.c: Include diagnostic-core.h instead of
5773         diagnostic.h.
5774         (gate_lto_out): Use seen_error.
5775         * matrix-reorg.c: Include diagnostic-core.h instead of
5776         diagnostic.h.
5777         * omega.c: Include diagnostic-core.h instead of diagnostic.h.
5778         * omp-low.c: Include diagnostic-core.h instead of diagnostic.h.
5779         (gate_expand_omp, lower_omp_1): Use seen_error.
5780         * passes.c: Include diagnostic-core.h instead of diagnostic.h.
5781         (rest_of_decl_compilation, rest_of_type_compilation,
5782         gate_rest_of_compilation, ipa_write_summaries): Use seen_error.
5783         * tree-cfg.c (label_to_block_fn): Use seen_error.
5784         * tree-inline.c (optimize_inline_calls): Use seen_error.
5785         * tree-mudflap.c (mudflap_finish_file): Use
5786         seen_error.
5787         * tree-optimize.c (gate_all_optimizations,
5788         gate_all_early_local_passes, gate_all_early_optimizations): Use
5789         seen_error.
5790         * tree-ssa-structalias.c (gate_ipa_pta): Use seen_error.
5791         * varpool.c: Include diagnostic-core.h instead of diagnostic.h.
5792         (varpool_remove_unreferenced_decls,
5793         varpool_assemble_pending_decls): Use seen_error.
5794         * Makefile.in (DIAGNOSTIC_CORE_H): Define.
5795         (TOPLEV_H, DIAGNOSTIC_H): Update.
5796         (c-decl.o, c-lang.o, c-format.o, lto-compress.o, lto-cgraph.o,
5797         lto-streamer-out.o, lto-section-in.o, lto-streamer.o,
5798         c-gimplify.o, omp-low.o, omega.o, diagnostic.o, passes.o,
5799         builtins.o, jump.o, cgraph.o, varpool.o, matrix-reorg.o,
5800         coverage.o, lambda-code.o): Update dependencies.
5802 2010-05-25  Dodji Seketeli  <dodji@redhat.com>
5804         PR c++/44188
5805         * c-common.c (is_typedef_decl): Move this definition ...
5806         * tree.c (is_typedef_decl): ... here.
5807         (typdef_variant_p): Move definition here from gcc/cp/tree.c.
5808         * c-common.h (is_typedef_decl): Move this declaration ...
5809         * tree.h (is_typedef_decl): ... here.
5810         (typedef_variant_p): Move declaration here from gcc/cp/cp-tree.h
5811         * dwarf2out.c (is_naming_typedef_decl): New function.
5812         (gen_tagged_type_die): Split out of ...
5813         (gen_type_die_with_usage): ... this function. When an anonymous
5814         tagged type is named by a typedef, make sure a DW_TAG_typedef DIE
5815         is emitted for the typedef.
5816         (gen_typedef_die): Emit DW_TAG_typedef also for typedefs naming
5817         anonymous tagged types.
5819 2010-05-27  Jason Merrill  <jason@redhat.com>
5821         * print-tree.c (debug_vec_tree): New fn.
5822         (print_vec_tree): New fn.
5823         * tree.h: Declare them.
5824         * gdbinit.in (pvt): New command.
5826         * print-tree.c (print_node) [TREE_VEC]: Print elements normally.
5828         * gdbinit.in (pdd): New command.
5830 2010-05-27  Jan Hubicka  <jh@suse.cz>
5832         * ipa-inline.c (cgraph_estimate_size_after_inlining): Make inline.
5833         (update_caller_keys): Return early if there are no callers;
5834         only update fibheap when decresing the key.
5835         (update_callee_keys): Avoid recursion.
5836         (decide_inlining_of_small_functions): When badness does not match;
5837         re-insert into fibheap.
5839 2010-05-27  Steven Bosscher  <steven@gcc.gnu.org>
5841         * Makefile.in (ALL_CFLAGS): Add file-specific CFLAGS.
5842         (ALL_HOST_FRONTEND_OBJS): New, for all front-end specific objects.
5843         (ALL_HOST_BACKEND_OBJS): New, for all backend and target objects.
5844         (ALL_HOST_OBJS): Now a union of the above two.
5845         <section "Language makefile fragments">: Add -DIN_GCC_FRONTEND for
5846         all files in ALL_HOST_FRONTEND_OBJS.
5847         * system.h: Poison GCC_RTL_H if IN_GCC_FRONTEND is defined.
5849         * c-common.c: Pretend to be a backend file by undefining
5850         IN_GCC_FRONTEND (still need rtl.h here).
5852 2010-05-27  Jan Hubicka  <jh@suse.cz>
5854         * cgraph.h (struct cgraph_node): Mark former_clone_of by GTY ((skip)).
5855         * cgraphunit.c (clone_of_p): Compile only when checking is enabled.
5857 2010-05-27  Jan Hubicka  <jh@suse.cz>
5859         * sched-ebb.c: Rename struct deps to struct deps_desc.
5860         * ddg.c: Likewise.
5861         * sel-sched-ir.c: Likewise.
5862         * sched-deps.c: Likewise.
5863         * sched-int.h: Likewise.
5864         * sched-rgn.c: Likewise.
5866 2010-05-27  Jon Beniston <jon@beniston.com>
5868         PR 43726
5869         * config/lm32/lm32.h: Remove definition of
5870         GO_IF_MODE_DEPENDENT_ADDRESS. Update copyright year.
5872 2010-05-27  Eric Botcazou  <ebotcazou@adacore.com>
5874         PR lto/44230
5875         * dwarf2out.c (dwarf2out_begin_prologue): Fix nits in sorry message.
5877 2010-05-27  Richard Guenther  <rguenther@suse.de>
5879         PR tree-optimization/44284
5880         * tree-vect-stmts.c (vectorizable_assignment): Handle
5881         sign-changing conversions as simple copy.
5883 2010-05-27  Maxim Kuvyrkov  <maxim@codesourcery.com>
5885         * gthr-posix.h (pthread_cancel): Don't declare if compiling against
5886         Bionic C library.
5887         (__gthread_active_p): Check for pthread_create if compiling against
5888         Bionic C library.
5890 2010-05-27  Maxim Kuvyrkov  <maxim@codesourcery.com>
5892         Support compilation for Android platform.  Reimplement -mandroid.
5894         * config.gcc (*linux*): Include linux-android.h and linux-android.opt.
5895         (*android*): Set ANDROID_DEFAULT.
5896         (arm*-*-linux*): Include linux-android.h.
5897         (arm*-*-eabi*): Don't include previous -mandroid implementation.
5898         * config/arm/eabi.h: Remove, move Android-specific parts ...
5899         * config/linux-android.h: ... here.  New file.
5900         * config/arm/eabi.opt: Rename to ...
5901         * config/linux-android.opt: ... this.
5902         (mandroid): Allow -mno-android option.  Initialize based on
5903         ANDROID_DEFAULT.
5904         * config/linux.h (STARTFILE_SPEC, ENDFILE_SPEC, CC1_SPEC, LIB_SPEC):
5905         Move logic to corresponding LINUX_TARGET_* macros.
5906         (TARGET_OS_CPP_BUILTINS): Define __ANDROID__, when appropriate.
5907         * config/linux-eabi.h (LINK_SPEC, CC1_SPEC, CC1PLUS_SPEC, LIB_SPEC,)
5908         (STARTFILE_SPEC, ENDFILE_SPEC): Define to choose between Linux and
5909         Android definitions.
5910         (LINUX_TARGET_OS_CPP_BUILTINS): Define __ANDROID__ if TARGET_ANDROID.
5911         * doc/invoke.texi (-mandroid, -tno-android-cc, -tno-android-ld):
5912         Document.
5914 2010-05-27  Maxim Kuvyrkov  <maxim@codesourcery.com>
5916         Add support for Bionic C library
5918         * config.gcc (LIBC_GLIBC, LIBC_BIONIC, LIBC_UCLIBC): New tm_define
5919         macro.
5920         (DEFAULT_LIBC): New tm_define macro set to one of LIBC_*.
5921         (bfin*-uclinux, moxie-*-uclinux*, m68k-*-uclinux*): Update.
5923         * config/linux.h (OPTION_GLIBC, OPTION_UCLIBC, OPTION_BIONIC): Define.
5924         (LINUX_TARGET_OS_CPP_BUILTINS): Define __gnu_linux__ only for GLIBC.
5925         (CHOOSE_DYNAMIC_LINKER1, CHOOSE_DYNAMIC_LINKER): Make it easier
5926         to support multiple C libraries.  Handle Bionic.
5927         (BIONIC_DYNAMIC_LINKER, BIONIC_DYNAMIC_LINKER32,)
5928         (BIONIC_DYNAMIC_LINKER64): Define.
5929         (LINUX_DYNAMIC_LINKER, LINUX_DYNAMIC_LINKER32, LINUX_DYNAMIC_LINKER64):
5930         Update.
5931         (TARGET_HAS_SINCOS): Enable for Bionic.
5933         * config/linux.opt: Rewrite to handle more than 2 C libraries.  Make
5934         the last option specified on command line take effect.
5935         (linux_uclibc): Rename to linux_libc, initialize using DEFAULT_LIBC.
5936         (mbionic): New.
5937         (mglibc, muclibc): Update.
5939         * config/alpha/linux-elf.h, config/rs6000/linux64.h,
5940         * config/rs6000/sysv4.h (CHOOSE_DYNAMIC_LINKER): Update to use
5941         DEFAULT_LIBC.
5943         * doc/invoke.texi (-mglibc, -muclibc): Update.
5944         (-mbionic): Document.
5946 2010-05-27  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
5948         * c-common.h (c_register_addr_space): Add prototype.
5949         (ADDR_SPACE_KEYWORD): Remove.
5950         * c-common.c (c_register_addr_space): New function.
5951         (c_addr_space_name): Reimplement.
5952         (c_common_reswords): Do not include TARGET_ADDR_SPACE_KEYWORDS.
5954         * config/spu/spu.h (TARGET_ADDR_SPACE_KEYWORDS): Remove.
5955         (REGISTER_TARGET_PRAGMAS): Call c_register_addr_space.
5957         * doc/tm.texi (Named Address Spaces): Mention c_register_addr_space.
5958         Remove TARGET_ADDR_SPACE_KEYWORDS.
5960 2010-05-27  Joseph Myers  <joseph@codesourcery.com>
5962         * input.c: New file.
5963         * input.h (main_input_filename): Move declaration to toplev.h.
5964         * toplev.c (input_location, line_table): Move to input.c
5965         * toplev.h (main_input_filename): Move declaration from input.h.
5966         * tree.c (expand_location): Move to input.c.
5967         * Makefile.in (OBJS-common): Add input.o.
5968         (input.o): Add dependencies.
5970 2010-05-27  Richard Guenther  <rguenther@suse.de>
5972         * lto-wrapper.c (maybe_unlink_file): Ignore unlink failure
5973         for non-existant files.
5974         (fork_execute): Mark args_name file as deleted.
5976 2010-05-27  Kai Tietz  <kai.tietz@onevision.com>
5978         PR bootstrp/44287
5979         * c-lex.c (narrowest_unsigned_type): Check for NULL_TREE.
5980         (narrow_signed_type): Likewise.
5982 2010-05-26  Jan Hubicka  <jh@suse.cz>
5984         * cgraphunit.c (verify_cgraph_node): Do checking that DECL match
5985         edge only when checking is enabled; check using former_clone_of;
5986         check inline clones too.
5987         (cgraph_materialize_clone): Record former_clone_of pointer.
5988         (cgraph_redirect_edge_call_stmt_to_callee): Assert that we are not
5989         combining redirections; dump args_to_skip bitmap
5990         (cgraph_materialize_all_clones): Do no redirection here.
5991         * ipa-inline.c (inline_transform): Do redirection here.
5992         * cgraph.h (struct cgraph_node): Add former_clone_of filed (enabled
5993         cheking only).
5995 2010-05-26  Steven Bosscher  <steven@gcc.gnu.org>
5997         * config/avr/avr-c.c: Do not include regs.h.
5998         Include cpplib.h for cpp_define and tree.h for c-common.h.
5999         * config/avr/avr-devices.c (avr_mcu_types): Fix initializer.
6000         * config/avr/t-avr: Fix dependencies for avr-c.o.
6002 2010-05-26  Steven Bosscher  <steven@gcc.gnu.org>
6004         * explow.c (set_stack_check_libfunc): Adjust to accept name as a
6005         string instead of SYMBOL_REF rtx.
6006         * rtl.h (set_stack_check_libfunc): Move prototype from here...
6007         * libfuncs.h: ...to here.  Adjust for explow.c change.
6009 2010-05-26  Joseph Myers  <joseph@codesourcery.com>
6011         * pretty-print.c: Don't include ggc.h.
6012         (identifier_to_locale_alloc, identifier_to_locale_free): Define.
6013         (identifier_to_locale): Use them for allocation.
6014         * pretty-print.h (identifier_to_locale_alloc,
6015         identifier_to_locale_free): Declare.
6016         * toplev.c (alloc_for_identifier_to_locale): New.
6017         (general_init): Set identifier_to_locale_alloc and
6018         identifier_to_locale_free.
6019         * Makefile.in (pretty-print.o): Update dependencies.
6021 2010-05-26  Eric Botcazou  <ebotcazou@adacore.com>
6023         * gimple.c (gimple_types_compatible_p): Return 0 for aggregate and
6024         pointer types if they have different alignment or mode.
6026 2010-05-26  Anatoly Sokolov  <aesok@post.ru>
6028         * config/sparc/sparc.h (FUNCTION_VALUE, FUNCTION_OUTGOING_VALUE,
6029         LIBCALL_VALUE, FUNCTION_VALUE_REGNO_P): Remove macros.
6030         * config/sparc/sparc-protos.h (function_value): Remove declaration.
6031         * config/sparc/sparc.c (sparc_function_value, sparc_libcall_value,
6032         sparc_function_value_regno_p): New functions.
6033         (TARGET_FUNCTION_VALUE, TARGET_LIBCALL_VALUE,
6034         TARGET_FUNCTION_VALUE_REGNO_P): Define.
6035         (function_value): Rename to...
6036         (sparc_function_value_1): ... this. Make static. Change 'incoming_p'
6037         argument to 'outgoing'.
6038         (function_arg_record_value, function_arg_union_value,
6039         function_arg_vector_value): Update comment.
6041 2010-05-26  Eric Botcazou  <ebotcazou@adacore.com>
6043         * dwarf2out.c (struct dw_fde_struct): Reorder flags.
6044         (fde_needed_for_eh_p): New predicate.
6045         (output_call_frame_info): Use it throughout to decide whether FDEs
6046         are needed for EH purpose.
6047         (dwarf2out_begin_prologue): Reorder assignments.
6049 2010-05-26  Sebastian Pop  <sebastian.pop@amd.com>
6051         * tree-if-conv.c (if_convertible_gimple_assign_stmt_p): Do not
6052         special case loop->header.
6053         (is_predicated): New.
6054         (if_convertible_loop_p): Call it.
6056 2010-05-26  Sebastian Pop  <sebastian.pop@amd.com>
6058         * tree-if-conv.c (add_to_dst_predicate_list): Do not pass a statemet
6059         iterator in parameter.  Do not generate code during the analysis.
6060         (tree_if_convert_cond_stmt): Removed.
6061         (tree_if_convert_stmt): Removed.
6062         (predicate_bbs): New.
6063         (if_convertible_loop_p): Call predicate_bbs.
6064         (tree_if_conversion): Simplify the top-level logic as predicate_bbs
6065         now contains all the analysis part.
6067 2010-05-26  Sebastian Pop  <sebastian.pop@amd.com>
6069         * tree-if-conv.c (tree_if_convert_cond_stmt): Do not remove
6070         statements in the analysis part.
6071         (tree_if_convert_stmt): Update comment.
6072         (remove_conditions_and_labels): New.
6073         (combine_blocks): Call remove_conditions_and_labels.
6074         (tree_if_conversion): Update comment.
6076 2010-05-26  Sebastian Pop  <sebastian.pop@amd.com>
6078         * tree-if-conv.c (if_convertible_bb_p): Don't handle BBs with more
6079         than 2 predecessors or more than 2 successors.
6081 2010-05-26  Sebastian Pop  <sebastian.pop@amd.com>
6083         * tree-if-conv.c (if_convertible_loop_p): Avoid if-conversion
6084         of loops in which the data dependence analysis fails.
6086 2010-05-26  Sebastian Pop  <sebastian.pop@amd.com>
6088         * tree-if-conv.c (if_convertible_loop_p): Do not compute/free
6089         CDI_POST_DOMINATORS.
6090         (tree_if_conversion): Same.
6092 2010-05-26  Sebastian Pop  <sebastian.pop@amd.com>
6094         * tree-if-conv.c (tree_if_conversion): Do not return a bool.
6096 2010-05-26  Sebastian Pop  <sebastian.pop@amd.com>
6098         * tree-if-conv.c: Update copyright years.  Fix comments.
6099         Fix indentation.
6101 2010-05-26  Kai Tietz  <kai.tietz@onevision.com>
6103         * builtin-types.def (BT_INT128): New primitive type.
6104         (BT_UINT128): Likewise.
6105         * c-common.c (c_common_r): Add __int128 keyword.
6106         (c_common_type_for_size): Handle __int128.
6107         (c_common_type_for_mode): Likewise.
6108         (c_common_signed_or_unsigned_type): Likewise.
6109         (c_common_nodes_and_builtins): Add builtin type
6110         if target supports 128-bit integer scalar.
6111         * c-common.h (enum rid): Add RID_INT128.
6112         * c-cppbuiltin.c (c_cpp_builtins): Define __SIZEOF_INT128__
6113         if target supports 128-bit integer scalar.
6114         * c-decl.c (declspecs_add_type): Handle new keyword __int128.
6115         (finish_declspecs): Likewise.
6116         * c-parser.c (c_token_starts_typename): Handle RID_INT128.
6117         (c_token_starts_declspecs): Likewise.
6118         (c_parser_declspecs): Likewise.
6119         (c_parser_attributes): Likewise.
6120         (c_parser_objc_selector): Likewise.
6121         * c-pretty-print.c (pp_c_integer_constant): Handle __int128.
6122         * c-tree.h (enum c_typespec_keyword): Add cts_int128.
6123         * gimple.c (gimple_signed_or_unsigned_type): Handle int128 types.
6124         * tree.c (make_or_reuse_type): Likewise.
6125         (make_unsigned_type): Likewise.
6126         (build_common_tree_nodes_2): Likewise.
6127         * tree.h (enum integer_type_kind): Add itk_int128 and
6128         itk_unsigned_int128.
6129         (int128_integer_type_node): New define.
6130         (int128_unsigned_type_node): New define.
6131         * doc/extend.texi: Add documentation about __int128 type.
6133 2010-05-26  Richard Guenther  <rguenther@suse.de>
6135         * tree-ssa-sccvn.c (copy_nary): Adjust.
6136         (copy_phis): Rename to ...
6137         (copy_phi): ... this.  Adjust.
6138         (copy_references): Rename to ...
6139         (copy_reference): ... this.  Adjust.
6140         (process_scc): Use HTAB_FOR_EACH_ELEMENT to insert the
6141         result into the valid table.
6143 2010-05-26  Steven Bosscher  <steven@gcc.gnu.org>
6145         * config/spu/spu-c.c: Do not include function.h, rtl.h, expr.h,
6146         insn-config.h, insn-codes.h, recog.h, and optabs.h.
6148 2010-05-26  Laurynas Biveinis  <laurynas.biveinis@gmail.com>
6150         * ggc.h (ggc_min_expand_heuristic, ggc_min_heapsize_heuristic): Remove.
6152 2010-05-26  Richard Guenther  <rguenther@suse.de>
6154         * opts.c (common_handle_option): Handle OPT_Ofast.
6156 2010-05-26  Joseph Myers  <joseph@codesourcery.com>
6158         * diagnostic.c: Don't include opts.h.
6159         (permissive_error_option): Define.
6160         (diagnostic_initialize): Take n_opts parameter.  Allocate memory
6161         for classify_diagnostic.  Don't use memset for
6162         classify_diagnostic.  Initialize new and recently added fields.
6163         (diagnostic_classify_diagnostic): Use context->n_opts instead of
6164         N_OPTS.
6165         (diagnostic_report_diagnostic): Pass context parameter to
6166         diagnostic_report_warnings_p.  Use option_enabled and option_name
6167         hooks from context.
6168         (emit_diagnostic): Use permissive_error_option.
6169         (permerror): Likewise.
6170         * diagnostic.h: Don't include options.h.
6171         (struct diagnostic_context): Add n_opts, opt_permissive,
6172         inhibit_warnings, warn_system_headers, option_enabled and
6173         option_name fields.  Change classify_diagnostic to a pointer.
6174         * opts-diagnostic.h: New file.
6175         * opts.c: Include opts-diagnostic.h.
6176         (common_handle_option): Set global_dc fields for -Wfatal-errors,
6177         -Wsystem-headers, -fshow-column, -pedantic-errors and -w.
6178         (option_name): New function.
6179         * c-opts.c (c_common_init_options): Set global_dc->opt_permissive.
6180         (c_common_handle_option): Set global_dc->permissive for
6181         -fpermissive.
6182         * c-common.c (c_cpp_error): Save and restore
6183         global_dc->warn_system_headers, not variable warn_system_headers.
6184         * toplev.c: Include opts-diagnostic.h.
6185         (general_init): Update call to diagnostic_initialize.  Set
6186         global_dc->show_column, global_dc->option_enabled and
6187         global_dc->option_name.
6188         (process_options): Don't set global_dc fields here.
6189         * Makefile.in (DIAGNOSTIC_H): Remove options.h.
6190         (diagnostic.o, opts.o, toplev.o): Update dependencies.
6192 2010-04-30  Hariharan Sandanagobalane  <hariharan@picochip.com>
6194         * config/picochip/picochip.md (movsi): Split a movsi from a
6195         const after reload.
6197 2010-05-26  Laurynas Biveinis  <laurynas.biveinis@gmail.com>
6199         * ggc-zone.c: Update copyright year.
6200         (poison_region): Mark memory for Valgrind as undefined before
6201         memset () call and inaccessible afterwards.
6202         (ggc_pch_total_size): Change type of i to int.
6204 2010-05-26  Laurynas Biveinis  <laurynas.biveinis@gmail.com>
6206         * ggc-common.c (ggc_free_overhead): Allow empty slot.
6208 2010-05-26  Laurynas Biveinis  <laurynas.biveinis@gmail.com>
6210         * ggc-common.c: Update copyright year.
6211         (ggc_rlimit_bound): Remove prototype.  Compile only if
6212         !ENABLE_GC_CHECKING && !ENABLE_GC_ALWAYS_COLLECT.
6213         (ggc_min_heapsize_heuristic): Compile only if !ENABLE_GC_CHECKING
6214         && !ENABLE_GC_ALWAYS_COLLECT.  Make static.
6215         (ggc_min_heapsize_heuristic): Likewise.
6217 2010-05-26  Richard Guenther  <rguenther@suse.de>
6219         PR rtl-optimization/44164
6220         * tree-ssa-alias.c (aliasing_component_refs_p): Fix the
6221         no-common access-path disambiguation.
6222         (indirect_ref_may_alias_decl_p): Adjust.
6223         (indirect_refs_may_alias_p): Likewise.
6224         (refs_may_alias_p_1): Likewise.
6226 2010-05-26  Steven Bosscher  <steven@gcc.gnu.org>
6228         * c-typeck.c: Do not include expr.h.
6230 2010-05-26  Steven Bosscher  <steven@gcc.gnu.org>
6232         * rtl.h (decl_default_tls_model): Move prototype from here...
6233         * output.h: ...to here.
6234         * c-decl.c: Do not include rtl.h.
6235         * c-pragma.c: Likewise.
6236         * c-parser.c: Likewise.
6237         * c-gimplify.c: Likewise.  And also not hard-reg-set.
6238         * c-common.c: Do not include rtl.h.  Include tm_p.h and add a
6239         FIXME note for it.  Add a FIXME note for expr.h.
6240         * config/i386/i386-protos.h (ix86_enum_va_list, ix86_fn_abi_va_list,
6241         ix86_canonical_va_list_type): Make visible even if RTX_CODE is not
6242         defined.
6244 2010-05-26  Jakub Jelinek  <jakub@redhat.com>
6246         PR target/44199
6247         * config/rs6000/rs6000.c (rs6000_emit_epilogue): If cfun->calls_alloca
6248         or total_size is larger than red zone size for non-V4 ABI, emit a
6249         stack_tie resp. frame_tie insn before stack pointer restore.
6250         * config/rs6000/rs6000.md (frame_tie): New insn.
6252 2010-05-25  Eric Botcazou  <ebotcazou@adacore.com>
6254         * function.h (struct function): Add can_throw_non_call_exceptions bit.
6255         * lto-streamer-in.c (input_function): Stream it in.
6256         * lto-streamer-out.c (output_function): Stream it out.
6257         * function.c (allocate_struct_function): Set it.
6258         (expand_function_end): Substitute cfun->can_throw_non_call_exceptions
6259         for flag_non_call_exceptions.
6260         * cfgbuild.c (control_flow_insn_p): Likewise.
6261         (make_edges): Likewise.
6262         * cfgexpand.c (expand_stack_alignment): Likewise.
6263         * combine.c (distribute_notes): Likewise.
6264         * cse.c (cse_extended_basic_block): Likewise.
6265         * except.c (insn_could_throw_p): Likewise.
6266         * gcse.c (simple_mem): Likewise.
6267         * ipa-pure-const.c (check_call): Likewise.
6268         (check_stmt ): Likewise.
6269         * lower-subreg.c (lower-subreg.c): Likewise.
6270         * optabs.c (emit_libcall_block): Likewise.
6271         (prepare_cmp_insn): Likewise.
6272         * postreload-gcse.c (eliminate_partially_redundant_loads): Likewise.
6273         * postreload.c (rest_of_handle_postreload): Likewise.
6274         * reload1.c (reload_as_needed): Likewise.
6275         (emit_input_reload_insns): Likewise.
6276         (emit_output_reload_insns): Likewise.
6277         (fixup_abnormal_edges): Likewise.
6278         * sel-sched-ir.c (init_global_and_expr_for_insn): Likewise.
6279         * store-motion.c (find_moveable_store): Likewise.
6280         * tree-eh.c (stmt_could_throw_p): Likewise.
6281         (tree_could_throw_p): Likewise.
6282         * tree-ssa-dce.c (mark_stmt_if_obviously_necessary): Likewise.
6283         * config/arm/arm.c (arm_expand_prologue): Likewise.
6284         (thumb1_expand_prologue): Likewise.
6285         * config/rx/rx.md (cbranchsf4): Likewise.
6286         (cmpsf): Likewise.
6287         * config/s390/s390.c (s390_emit_prologue): Likewise.
6288         * tree-inline.c (initialize_cfun): Copy can_throw_non_call_exceptions.
6289         (inline_forbidden_into_p): New predicate.
6290         (expand_call_inline): Use it to forbid inlining.
6291         (tree_can_inline_p): Likewise.
6293 2010-05-25  Steven Bosscher  <steven@gcc.gnu.org>
6295         * config/i386/i386-c.c: Do not include rtl.h.
6296         * config/i386/t-i386: Update dependencies.
6298 2010-05-25  Steven Bosscher  <steven@gcc.gnu.org>
6300         * attribs.c: Do not include rtl.h.
6301         * Makefile.in: Update dependencies.
6303 2010-05-25  Anatoly Sokolov  <aesok@post.ru>
6305         * double-int.h (double_int_and): New.
6306         * combine.c (try_combine): Clean up, use double_int_* and
6307         immed_double_int_const functions.
6309 2010-05-25  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
6311         * configure.ac (gcc_cv_as_ld_jalr_reloc): Redirect grep stdout,
6312         stderr to /dev/null instead of grep -q.
6313         * configure: Regenerate.
6315 2010-05-25  Steven Bosscher  <steven@gcc.gnu.org>
6317         * Makefile.in (EXCEPT_H): Fix typo.
6319 2010-05-25  Vladimir Makarov <vmakarov@redhat.com>
6321         * ira-build.c (update_conflict_hard_reg_costs): New.
6322         (ira_build): Call update_conflict_hard_reg_costs.
6324 2010-05-25  Jakub Jelinek  <jakub@redhat.com>
6326         PR debug/41371
6327         * var-tracking.c (find_loc_in_1pdv): Guard asserts with
6328         ENABLE_CHECKING.
6329         (intersect_loc_chains): Walk the s2var's loc_chain together
6330         with s1node chain as long as the locations are equal, don't
6331         call find_loc_in_1pdv in that case.
6333         PR debug/42801
6334         * tree-inline.c (remap_decls): Remap DECL_VALUE_EXPR here...
6335         (copy_bind_expr): ... instead of here.
6336         (copy_tree_body_r): If id->remapping_type_depth clear TREE_BLOCK
6337         if the block hasn't been remapped.
6338         * dwarf2out.c (gen_formal_parameter_die, gen_variable_die): When
6339         emitting concrete instance of abstract VLA, add DW_AT_type attribute.
6341 2010-05-25  Richard Guenther  <rguenther@suse.de>
6343         PR middle-end/44069
6344         * gimple-fold.c (maybe_fold_stmt_addition): Avoid generating
6345         out-of-bounds array accesses.
6347 2010-05-25  Richard Guenther  <rguenther@suse.de>
6349         * lto-wrapper.c (nr, input_names, output_names, makefile): Globalize.
6350         (lto_wrapper_exit): Unlink all LTRANS temporary files on error.
6351         (run_gcc): Re-organize to make cleanup easier.
6353 2010-05-25  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
6355         * config/s390/s390.c (optimization_options): Fix and move the
6356         flag_prefetch_loop_arrays override ...
6357         (override_options): ... here.
6359 2010-05-25  Joseph Myers  <joseph@codesourcery.com>
6361         * diagnostic.c: Don't include plugin.h.
6362         (diagnostic_report_diagnostic): Don't handle plugins specially
6363         here.  Pass context to internal_error callback.
6364         * diagnostic.h (struct diagnostic_context): Add context parameter
6365         to internal_error callback.
6366         * plugin.c (warn_if_plugins, plugins_internal_error_function): New.
6367         * plugin.h (struct diagnostic_context): Declare.
6368         (warn_if_plugins, plugins_internal_error_function): Declare.
6369         * toplev.c (general_init): Set global_dc->internal_error.
6370         * Makefile.in (diagnostic.o): Update dependencies.
6372 2010-05-25 Iain Sandoe  <iains@gcc.gnu.org>
6374         * config/rs6000/darwin64.h: Update DARWIN_ARCH_SPEC.
6375         * config/rs6000/t-darwin64: New.
6376         * config.gcc (powerpc64-*-darwin*): Use darwin.opts, t-darwin64,
6377         build crt2.
6379 2010-05-25  Christian Borntraeger  <borntraeger@de.ibm.com>
6381         PR 44203
6382         * tree-ssa-loop-prefetch.c: Fix logic for step calculation to
6383         match the original (and intended) behaviour before r159557.  This
6384         changeset changed a=a+b*c to a=(a+b)*b which was obviously wrong
6385         in two ways.
6387 2010-05-25  Richard Guenther  <rguenther@suse.de>
6389         * doc/invoke.texi: Document -Ofast.
6390         * target.h (struct gcc_target): Add handle_ofast.
6391         * target-def.h (TARGET_HANDLE_OFAST): Add.
6392         (TARGET_INITIALIZER): Adjust.
6393         * opts.c (decode_options): Handle -Ofast.  Enable -ffast-math with it.
6394         * common.opt (Ofast): Add.
6396 2010-05-25  Paolo Bonzini  <bonzini@gnu.org>
6398         * doc/tm.texi (STORE_FLAG_VALUE): Do not refer to sCC patterns.
6399         * doc/md.texi (cstoreXX4): Update for cond-optab changes.
6401 2010-05-25  Paolo Bonzini  <bonzini@gnu.org>
6403         PR target/43610
6404         * optabs.c (prepare_float_lib_cmp): Allow reversing the comparison
6405         even if !FLOAT_LIB_COMPARE_RETURNS_BOOL.  Always compute true_rtx and
6406         false_rtx.  Use false_rtx to compute the correct *ptest for reversed
6407         comparisons for which !FLOAT_LIB_COMPARE_RETURNS_BOOL.
6409 2010-05-25  Jakub Jelinek  <jakub@redhat.com>
6411         * dwarf2out.c (loc_descr_plus_const): When offset is negative, use
6412         DW_OP_minus with negated offset instead of DW_OP_plus.
6413         (loc_list_from_tree): Don't test whether second operand is INTEGER_CST.
6415 2010-05-25  Wei Guozhi  <carrot@google.com>
6417         * config/arm/thumb2.md (thumb2_tlobits_cbranch): Add constraint to
6418         tst instruction and a new alternative.
6419         * config/arm/constraints.md (Pu): New constraint.
6421 2010-05-24  Sebastian Pop  <sebastian.pop@amd.com>
6423         * function.c (assign_stack_local_1): Initialize variable
6424         to avoid warning when bootstrapping at -O3.
6426 2010-05-24  Steven Bosscher  <steven@gcc.gnu.org>
6428         * configure.ac (all_lang_makefiles): Remove everything related to it.
6429         * configure: Regenerate.
6430         * Makefile.in: Fix reference to ada Make-lang.in.
6431         Remove support for LANG_MAKEFILES.
6433 2010-05-24  Daniel Jacobowitz  <dan@codesourcery.com>
6434             Sandra Loosemore  <sandra@codesourcery.com>
6436         * config/arm/neon-testgen.ml: Use dg-add-options arm_neon.
6437         * doc/sourcebuild.texi (Effective-Target Keywords): Update arm_neon_ok
6438         description.  Add arm_neon_fp16_ok.
6439         (Add Options): Add arm_neon and arm_neon_fp16.
6441 2010-05-24  Joseph Myers  <joseph@codesourcery.com>
6443         * diagnostic.c: Don't include flags.h.
6444         (pedantic_warning_kind, permissive_error_kind): Take diagnostic
6445         context parameters.  Check flags in the context passed as a parameter.
6446         (diagnostic_build_prefix): Add context parameter.  Check
6447         show_column flag in context.
6448         (diagnostic_action_after_output): Check fatal_errors flag in context.
6449         (diagnostic_report_current_module): Check show_column flag in context.
6450         (default_diagnostic_starter): Update call to
6451         diagnostic_build_prefix.
6452         (diagnostic_report_diagnostic): Pass context to pedantic_warning_kind.
6453         (emit_diagnostic): Pass context to permissive_error_kind.
6454         (permerror): Pass context to permissive_error_kind.
6455         * diagnostic.h (struct diagnostic_context): Add show_column,
6456         pedantic_errors, permissive and fatal_errors fields.
6457         (diagnostic_build_prefix): Update prototype.
6458         * langhooks.c
6459         * toplev.c (process_options): Set flags in global_dc from
6460         flag_show_column, flag_pedantic_errors, flag_permissive,
6461         flag_fatal_errors.
6462         * tree-diagnostic.c (default_tree_diagnostic_starter): Update call
6463         to diagnostic_build_prefix.
6464         * Makefile.in (diagnostic.o): Update dependencies.
6466 2010-05-24  H.J. Lu  <hongjiu.lu@intel.com>
6468         * config/i386/ia32intrin.h (__crc32q): Define only if
6469         __SSE4_2__ is defined.
6471 2010-05-24  Iain Sandoe  <iains@gcc.gnu.org>
6473         PR target/44132
6474         PR middle-end/43602
6475         * varasm.c (get_emutls_init_templ_addr): Copy DECL_PRESERVE_P,
6476         DECL_VISIBILITY_SPECIFIED.
6477         (emutls_decl): Set DECL_PRESERVE_P and copy
6478         DECL_VISIBILITY_SPECIFIED, DECL_RESTRICTED_P.
6479         (emutls_finalize_control_var): New callback.
6480         (emutls_finish): Finalize emutls control variables.
6481         * toplev.c (compile_file): Move the call to emutls_finish ()
6482         before varpool_assemble_pending_decls ().
6484 2010-05-24  Daniel Gutson  <dgutson@codesourcery.com>
6486         * config/arm/lib1funcs.asm (__ARM_ARCH__): __ARM_ARCH_7EM__
6487         added to the preprocessor condition.
6489 2010-05-24  Paul Brook  <paul@codesourcery.com>
6491         * gengtype-lex.l: Add HARD_REG_SET.
6492         * expr.c (expand_expr_real_1): Record writes to hard registers.
6493         * function.c (rtl_data): Add asm_clobbers.
6494         * ira.c (compute_regs_asm_clobbered): Use crtl->asm_clobbers.
6495         (ira_setup_eliminable_regset): Remove regs_asm_clobbered.
6496         Use crtl->asm_clobbers.
6498 2010-05-24  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
6500         * doc/makefile.texi (Makefile): Mention stages 'profile'
6501         and 'feedback' for profiledbootstrap.
6503 2010-05-23  H.J. Lu  <hongjiu.lu@intel.com>
6505         PR target/44245
6506         * config/i386/i386.c (def_builtin): Properly check
6507         OPTION_MASK_ISA_64BIT.
6509 2010-05-23  Joseph Myers  <joseph@codesourcery.com>
6511         * c-decl.c (diagnose_mismatched_decls): Give error for duplicate
6512         typedefs with different but compatible types.  Allow duplicate
6513         typedefs with the same type except for pedantic non-C1X, but give
6514         warning for variably modified types.
6515         * c-typeck.c (tagged_types_tu_compatible_p,
6516         function_types_compatible_p, type_lists_compatible_p,
6517         comptypes_internal): Add parameter different_types_p; set
6518         *different_types_p for different but compatible types.  All
6519         callers changed.
6520         (comptypes_check_different_types): New.
6521         * c-tree.h (comptypes_check_different_types): Declare.
6523 2010-05-23  Steven Bosscher  <steven@gcc.gnu.org>
6525         * regs.h: Do not include obstack.h, basic-block.h.  Include machmode.h.
6526         * jump.c: Include basic-block.h.
6527         * profile.c: Likewise.
6528         * tree-profile.c: Likewise.
6529         * coverage.c: Likewise.
6530         * basic-block.h (optimize_function_for_size_p): Move to function.h.
6531         (optimize_function_for_speed_p): Likewise.
6532         * function.h (optimize_function_for_size_p,
6533         optimize_function_for_speed_p): Moved here from basic-block.h.
6534         * Makefile.in: Update dependencies.
6536 2010-05-23  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
6538         * lto-wrapper.c (run_gcc): Unset MAKEFLAGS and MFLAGS
6539         before calling make; allow override through $MAKE.
6540         * doc/invoke.texi (Optimize Options): Document override.
6542 2010-05-23  Anatoly Sokolov  <aesok@post.ru>
6544         * config/rs6000/rs6000.c (rs6000_mode_dependent_address_p): New.
6545         (TARGET_MODE_DEPENDENT_ADDRESS_P): Define.
6546         (rs6000_mode_dependent_address_ptr): Make static.
6547         * config/rs6000/rs6000.h (GO_IF_MODE_DEPENDENT_ADDRESS): Remove.
6548         * config/rs6000/rs6000-protos.h (rs6000_mode_dependent_address_ptr):
6549         Remove.
6551 2010-05-23  Maarten Lankhorst  <mlankhorst@codeweavers.com>
6553         PR target/43869
6554         * config/i386/i386.c: Make sure that the correct regparm is passed.
6556 2010-05-23  Steven Bosscher  <steven@gcc.gnu.org>
6558         * sbitmap.h (sbitmap_ptr, const_sbitmap_ptr): Move from here...
6559         * sbitmap.c: ...to here to internalize sbitmap element access.
6560         Do not include tm.h, rtl.h, flags.h, hard-reg-set.h, and obstack.h.
6561         Explain why basic-block.h is included.
6562         * function.h: Include tm.h for CUMULATIVE_ARGS.
6563         * Makefile.in: Update dependencies.
6565 2010-05-22  Steven Bosscher  <steven@gcc.gnu.org>
6567         * coretypes.h (struct simple_bitmap_def, sbitmap, const_sbitmap):
6568         New core types.
6569         * sbitmap.h (struct sbitmap_def): Do not typedef here.
6570         * sbitmap.c: Include sbitmap.h.
6571         * basic-block.h: Do not include bitmap.h, sbitmap.h, partition.h,
6572         hard-reg-set.h.  Split everything related to regsets out from here...
6573         * regset.h: ...to here.  New file.
6574         * df.h: Include regset.h and sbitmap.h.
6575         * tree-flow.h: Likewise.
6576         * cfgloop.h: Likewise.
6577         * except.h: Do not include sbitmap.h.  Include hashtab.h.
6578         * cgraph.h: Include vec.h and function.h.
6579         * reload.h (struct insn_chain): Change types of live_throughout
6580         and dead_or_set from regset_head to bitmap_head.
6581         (compute_use_by_pseudos): Be defined also if regset.h is not included.
6582         * ira-int.h (struct ira_spilled_reg_stack_slot): Change type of
6583         spilled_regs from regset_head to bitmap_head to avoid dependency
6584         in regset.h.
6585         * sel-sched-ir.h: Include regset.h.
6586         * reload.c: Include df.h before reload.h.
6587         * caller-save.c: Likewise.
6588         * reload1.c: Likewise.
6589         * ira.c: Likewise.
6590         (mark_elimination): Update type of r to bitmap, consistent with
6591         DF_LR_IN.
6592         * dominance.c: Include bitmap.h.
6593         * modulo-sched.c: Include df.h.
6594         * cfganal.c: Include bitmap.h and sbitmap.h.
6595         * cfgbuild.c: Include sbitmap.h.
6596         * lcm.c: Include sbitmap.h.
6597         * gcse.c (alloc_gcse_mem): Allocate regset with ALLOC_REG_SET.
6598         * domwalk.c: Include sbitmap.h, exclude ggc.h.
6599         * cfgexpand.c: Inlcude bitmap.h and sbitmap.h.
6600         * cselib.c: Include bitmap.h.
6601         * tree-optimize.c: Include regset.h.
6602         * stmt.c: Include bitmap.h.
6603         * Makefile.in: Update dependencies.
6605 2010-05-22  Jan Hubicka  <jh@suse.cz>
6607         * cgraph.h (struct varpool_node): Add same_comdat_group.
6608         * lto-cgrpah.c (lto_output_varpool_node): Output same_comdat_group
6609         pointer.
6610         (output_varpool): Update call of lto_output_varpool_node.
6611         (input_varpool): Read same_comdat_group pointer.
6612         (input_varpool_1): Fixup same_comdat_group pointer.
6613         * ipa.c (cgraph_remove_unreachable_nodes): WHen one of same comdat
6614         group is needed, all are.
6615         * varpool.c (varpool_remove_node): Remove node from same comdat group
6616         linklist too.
6617         (varpool_analyze_pending_decls): Walk same comdat groups.
6619 2010-05-22  Steven Bosscher  <steven@gcc.gnu.org>
6621         * rtl.h (union rtunion_def): Remove rt_bit member.
6622         (XBITMAP, X0BITMAP, XCBITMAP): Remove.
6623         * print-rtl (print_rtx): Do not print the member.
6624         * gengtype.c (adjust_field_rtx_def): Do not handle it.
6625         * gengenrtl.c (type_from_format): Likewise.
6626         (accessor_from_format): Likewise.
6628 2010-05-22  Joseph Myers  <joseph@codesourcery.com>
6630         * dbgcnt.c: Include toplev.h instead of errors.h.
6631         * ira-emit.c: Don't include errors.h.
6632         * ira.c: Include toplev.h instead of errors.h.
6633         * lto-compress.c: Include toplev.h instead of errors.h.
6634         * Makefile.in (lto-compress.o, lto-streamer-out.o, ira-emit.o,
6635         ira.o, dbgcnt.o): Update dependencies.
6637 2010-05-22  Richard Guenther  <rguenther@suse.de>
6639         * gimple.c (gimple_types_compatible_p): Check type qualifications
6640         before merging pointer to complete and pointer to incomplete type.
6641         * lto-symtab.c (lto_symtab_resolve_symbols): For commons make sure
6642         we use our own resolution algorithm.  The gold linker plugin
6643         doesn't do the job we want it to do here.
6645 2010-05-22  Anatoly Sokolov  <aesok@post.ru>
6647         * config/sparc/sparc.h (GO_IF_MODE_DEPENDENT_ADDRESS): Remove.
6648         * config/sparc/sparc.c (TARGET_MODE_DEPENDENT_ADDRESS_P): Define.
6649         (sparc_mode_dependent_address_p): New function.
6651 2010-05-21  Steven Bosscher  <steven@gcc.gnu.org>
6653         * Makefile.in: Fix c-pch.o and ggc-common.o dependencies on timevars.
6655         * timevar.c: Do not include any core headers.
6656         (timevar_print): De-i18n-ize.
6657         (print_time): Likewise.
6658         * timevar.h (timevar_push, timevar_pop): Make inline functions.
6660 2010-05-21  Joseph Myers  <joseph@codesourcery.com>
6662         * diagnostic.c: Don't include tm.h, tree.h, tm_p.h, langhooks.h or
6663         langhooks-def.h.
6664         (diagnostic_initialize): Initialize x_data not last_function.
6665         (diagnostic_report_current_function): Move to tree-diagnostic.c.
6666         (default_diagnostic_starter): Call
6667         diagnostic_report_current_module not
6668         diagnostic_report_current_function.
6669         (diagnostic_report_diagnostic): Initialize x_data not
6670         abstract_origin.
6671         (verbatim): Likewise.
6672         * diagnostic.h (struct diagnostic_info): Change abstract_origin to
6673         x_data.
6674         (struct diagnostic_context): Change last_function to x_data.
6675         (diagnostic_auxiliary_data): Replace with
6676         diagnostic_context_auxiliary_data and
6677         diagnostic_info_auxiliary_data.
6678         (diagnostic_last_function_changed, diagnostic_set_last_function,
6679         diagnostic_report_current_function): Move to tree-diagnostic.h.
6680         (print_declaration, dump_generic_node, print_generic_stmt,
6681         print_generic_stmt_indented, print_generic_expr,
6682         print_generic_decl, debug_c_tree, dump_omp_clauses,
6683         print_call_name, debug_generic_expr, debug_generic_stmt,
6684         debug_tree_chain, default_tree_printer): Move to
6685         tree-pretty-print.h.
6686         (debug_gimple_stmt, debug_gimple_seq, print_gimple_seq,
6687         print_gimple_stmt, print_gimple_expr, dump_gimple_stmt): Move to
6688         gimple-pretty-print.h.
6689         * pretty-print.c: Don't include tree.h
6690         (pp_base_format): Don't handle %K here.
6691         (pp_base_tree_identifier): Move to tree-pretty-print.c.
6692         * pretty-print.h (text_info): Change abstract_origin to x_data.
6693         (pp_tree_identifier, pp_unsupported_tree,
6694         pp_base_tree_identifier): Move to tree-pretty-print.h.
6695         * gimple-pretty-print.h, tree-diagnostic.c, tree-diagnostic.h,
6696         tree-pretty-print.h: New files.
6697         * tree-pretty-print.c: Include tree-pretty-print.h.
6698         (percent_K_format): New.  Moved from pretty-print.c.
6699         (pp_base_tree_identifier): Move from pretty-print.c.
6700         * c-objc-common.c: Include tree-pretty-print.h.
6701         (c_tree_printer): Handle %K here.
6702         * langhooks.c: Include tree-diagnostic.h.
6703         (lhd_print_error_function): Use diagnostic_abstract_origin macro.
6704         * toplev.c: Include tree-diagnostic.h and tree-pretty-print.h.
6705         (default_tree_printer): Handle %K using percent_K_format.
6706         (general_init): Use default_tree_diagnostic_starter.
6707         * tree.c: Include tree-diagnostic.h and tree-pretty-print.h.
6708         (free_lang_data): Use default_tree_diagnostic_starter.
6709         * c-pretty-print.c: Include tree-pretty-print.h.
6710         * cfgexpand.c: Include tree-pretty-print.h and gimple-pretty-print.h.
6711         * cgraphunit.c: Include tree-pretty-print.h and gimple-pretty-print.h.
6712         * dwarf2out.c: Include tree-pretty-print.h.
6713         * except.c: Include tree-pretty-print.h.
6714         * gimple-pretty-print.c: Include tree-pretty-print.h and
6715         gimple-pretty-print.h.
6716         * gimplify.c: Include tree-pretty-print.h.
6717         * graphite-poly.c: Include tree-pretty-print.h and
6718         gimple-pretty-print.h.
6719         * ipa-cp.c: Include tree-pretty-print.h.
6720         * ipa-inline.c: Include gimple-pretty-print.h.
6721         * ipa-prop.c: Include tree-pretty-print.h and gimple-pretty-print.h.
6722         * ipa-pure-const.c: Include gimple-pretty-print.h.
6723         * ipa-struct-reorg.c: Include tree-pretty-print.h and
6724         gimple-pretty-print.h.
6725         * ipa-type-escape.c: Include tree-pretty-print.h.
6726         * print-rtl.c: Include tree-pretty-print.h.
6727         * print-tree.c: Include gimple-pretty-print.h.
6728         * sese.c: Include tree-pretty-print.h.
6729         * tree-affine.c: Include tree-pretty-print.h.
6730         * tree-browser.c: Include tree-pretty-print.h.
6731         * tree-call-cdce.c: Include gimple-pretty-print.h.
6732         * tree-cfg.c: Include tree-pretty-print.h and gimple-pretty-print.h.
6733         * tree-chrec.c: Include tree-pretty-print.h.
6734         * tree-data-ref.c: Include tree-pretty-print.h and
6735         gimple-pretty-print.h.
6736         * tree-dfa.c: Include tree-pretty-print.h.
6737         * tree-if-conv.c: Include tree-pretty-print.h and
6738         gimple-pretty-print.h.
6739         * tree-inline.c: Include tree-pretty-print.h.
6740         * tree-into-ssa.c: Include tree-pretty-print.h and
6741         gimple-pretty-print.h.
6742         * tree-nrv.c: Include tree-pretty-print.h.
6743         * tree-object-size.c: Include tree-pretty-print.h and
6744         gimple-pretty-print.h.
6745         * tree-outof-ssa.c: Include tree-pretty-print.h and
6746         gimple-pretty-print.h.
6747         * tree-parloops.c: Include tree-pretty-print.h and
6748         gimple-pretty-print.h.
6749         * tree-predcom.c: Include tree-pretty-print.h and
6750         gimple-pretty-print.h.
6751         * tree-scalar-evolution.c: Include tree-pretty-print.h and
6752         gimple-pretty-print.h.
6753         * tree-sra.c: Include tree-pretty-print.h.
6754         * tree-ssa-address.c: Include tree-pretty-print.h.
6755         * tree-ssa-alias.c: Include tree-pretty-print.h.
6756         * tree-ssa-ccp.c: Include tree-pretty-print.h and
6757         gimple-pretty-print.h.
6758         * tree-ssa-coalesce.c: Include tree-pretty-print.h.
6759         * tree-ssa-copy.c: Include tree-pretty-print.h and
6760         gimple-pretty-print.h.
6761         * tree-ssa-copyrename.c: Include tree-pretty-print.h.
6762         * tree-ssa-dce.c: Include tree-pretty-print.h and
6763         gimple-pretty-print.h.
6764         * tree-ssa-dom.c: Include tree-pretty-print.h and
6765         gimple-pretty-print.h.
6766         * tree-ssa-dse.c: Include gimple-pretty-print.h.
6767         * tree-ssa-forwprop.c: Include tree-pretty-print.h.
6768         * tree-ssa-ifcombine.c: Include tree-pretty-print.h.
6769         * tree-ssa-live.c: Include tree-pretty-print.h and
6770         gimple-pretty-print.h.
6771         * tree-ssa-loop-im.c: Include tree-pretty-print.h and
6772         gimple-pretty-print.h.
6773         * tree-ssa-loop-ivcanon.c: Include tree-pretty-print.h and
6774         gimple-pretty-print.h.
6775         * tree-ssa-loop-ivopts.c: Include tree-pretty-print.h and
6776         gimple-pretty-print.h.
6777         * tree-ssa-loop-niter.c: Include tree-pretty-print.h and
6778         gimple-pretty-print.h.
6779         * tree-ssa-loop-prefetch.c: Include tree-pretty-print.h.
6780         * tree-ssa-math-opts.c: Include gimple-pretty-print.h.
6781         * tree-ssa-operands.c: Include tree-pretty-print.h and
6782         gimple-pretty-print.h.
6783         * tree-ssa-phiprop.c: Include tree-pretty-print.h and
6784         gimple-pretty-print.h.
6785         * tree-ssa-pre.c: Include tree-pretty-print.h and
6786         gimple-pretty-print.h.
6787         * tree-ssa-propagate.c: Include gimple-pretty-print.h.
6788         * tree-ssa-reassoc.c: Include tree-pretty-print.h and
6789         gimple-pretty-print.h.
6790         * tree-ssa-sccvn.c: Include tree-pretty-print.h and
6791         gimple-pretty-print.h.
6792         * tree-ssa-sink.c: Include gimple-pretty-print.h.
6793         * tree-ssa-ter.c: Include tree-pretty-print.h and
6794         gimple-pretty-print.h.
6795         * tree-ssa-uninit.c: Include gimple-pretty-print.h.
6796         * tree-ssa.c: Include tree-pretty-print.h and
6797         gimple-pretty-print.h.
6798         * tree-stdarg.c: Include gimple-pretty-print.h.
6799         * tree-switch-conversion.c: Include gimple-pretty-print.h.
6800         * tree-tailcall.c: Include tree-pretty-print.h and
6801         gimple-pretty-print.h.
6802         * tree-vect-data-refs.c: Include tree-pretty-print.h and
6803         gimple-pretty-print.h.
6804         * tree-vect-loop-manip.c: Include tree-pretty-print.h and
6805         gimple-pretty-print.h.
6806         * tree-vect-loop.c: Include tree-pretty-print.h and
6807         gimple-pretty-print.h.
6808         * tree-vect-patterns.c: Include gimple-pretty-print.h.
6809         * tree-vect-slp.c: Include tree-pretty-print.h and
6810         gimple-pretty-print.h.
6811         * tree-vect-stmts.c: Include tree-pretty-print.h and
6812         gimple-pretty-print.h.
6813         * tree-vectorizer.c: Include tree-pretty-print.h.
6814         * tree-vrp.c: Include tree-pretty-print.h and
6815         gimple-pretty-print.h.
6816         * value-prof.c: Include tree-pretty-print.h and
6817         gimple-pretty-print.h.
6818         * var-tracking.c: Include tree-pretty-print.h.
6819         * Makefile.in (OBJS-common): Add tree-diagnostic.o.
6820         (tree-diagnostic.o): New dependencies.
6821         (c-objc-common.o, c-pretty-print.o, langhooks.o, tree.o,
6822         tree-inline.o, print-tree.o, stor-layout.o, tree-ssa-uninit.o,
6823         tree-ssa.o, tree-into-ssa.o, tree-ssa-ter.o, tree-ssa-coalesce.o,
6824         tree-outof-ssa.o, tree-ssa-forwprop.o, tree-ssa-phiprop.o,
6825         tree-ssa-ifcombine.o, tree-nrv.o, tree-ssa-copy.o,
6826         tree-ssa-propagate.o, tree-ssa-dom.o, tree-ssa-uncprop.o,
6827         tree-ssa-live.o, tree-ssa-copyrename.o, tree-ssa-pre.o,
6828         tree-ssa-sccvn.o, tree-vrp.o, tree-cfg.o, tree-tailcall.o,
6829         tree-ssa-sink.o, tree-if-conv.o, tree-dfa.o, tree-ssa-operands.o,
6830         tree-ssa-address.o, tree-ssa-loop-niter.o,
6831         tree-ssa-loop-ivcanon.o, tree-ssa-loop-prefetch.o, tree-predcom.o,
6832         tree-ssa-loop-ivopts.o, tree-affine.o, tree-ssa-loop-im.o,
6833         tree-ssa-math-opts.o, tree-ssa-alias.o, tree-ssa-reassoc.o,
6834         gimplify.o, tree-browser.o, tree-chrec.o, tree-scalar-evolution.o,
6835         tree-data-ref.o, sese.o, graphite-poly.o, tree-vect-loop.o,
6836         tree-vect-loop-manip.o, tree-vect-patterns.o, tree-vect-slp.o,
6837         tree-vect-stmts.o, tree-vect-data-refs.o, tree-vectorizer.o,
6838         tree-parloops.o, tree-stdarg.o, tree-object-size.o,
6839         gimple-pretty-print.o, tree-pretty-print.o, diagnostic.o,
6840         toplev.o, print-rtl.o, except.o, dwarf2out.o, cgraphunit.o,
6841         ipa-prop.o, ipa-cp.o, ipa-inline.o, ipa-pure-const.o,
6842         ipa-type-escape.o, ipa-struct-reorg.o, tree-ssa-dce.o,
6843         tree-call-cdce.o, tree-ssa-ccp.o, tree-sra.o,
6844         tree-switch-conversion.o, var-tracking.o, value-prof.o,
6845         cfgexpand.o, pretty-print.o): Update dependencies.
6847 2010-05-22  Andreas Tobler  <andreast@fgznet.ch>
6849         * tree-ssa-structalias.c: Remove tm_p.h from include.
6851 2010-05-21  Jeff Law  <law@redhat.com>
6853         * ira-costs.c (ira_tune_allocno_costs_and_cover_classes): Fix typo.
6855 2010-05-21  Jason Merrill  <jason@redhat.com>
6857         * tree-eh.c (cleanup_is_dead_in): New.
6858         (lower_try_finally): Don't generate a dead cleanup region.
6859         (lower_cleanup): Likewise.
6861 2010-05-21  Jakub Jelinek  <jakub@redhat.com>
6863         PR debug/44223
6864         * haifa-sched.c (schedule_insn): When freeing INSN_REG_USE_LIST,
6865         unchain each use from the cyclic next_regno_use chain first.
6867 2010-05-21  Steven Bosscher  <steven@gcc.gnu.org>
6869         * real: Do not include gmp.h, mpfr.h, and mpc.h.
6870         (REAL_VALUE_NEGATE, REAL_VALUE_ABS, real_arithmetic2): Remove.
6871         (real_value_negate, real_value_abs): New prototypes.
6872         (do_mpc_arg2, real_from_mpfr, mpfr_from_real): Move from here...
6873         * realmpfr.h (do_mpc_arg2, real_from_mpfr, mpfr_from_real): ...to here,
6874         new include file for interface between MPFR and REAL_VALUE_TYPE.
6875         * real.c: Include realmpfr.h.
6876         (real_arithmetic2): Remove legacy function.
6877         (real_value_negate): New.
6878         (real_value_abs): New.
6879         (mfpr_from_real, real_from_mpfr): Move from here...
6880         * realmpfr.c (mpfr_from_real, real_from_mpfr): ...to here, new file.
6881         * builtins.c: Include realmpfr.h.
6882         * fold-const.c: Include realmpfr.h.
6883         (fold_comparison): Use real_value_negate instead of REAL_VALUE_NEGATE.
6884         (fold_negate_const): Likewise.
6885         (fold_abs_const): Use real_value_abs instead of REAL_VALUE_ABS.
6886         * toplev.c: Include realmpfr.h.
6887         * simplify-rtx.c (simplify_const_unary_operation): Use real_value_abs
6888         and real_value_negate.
6889         * fixed-value.c (check_real_for_fixed_mode): Likewise.
6890         * config/arm/arm.c (neg_const_double_rtx_ok_for_fpa): Likewise.
6891         (vfp3_const_double_index): Likewise.
6892         (arm_print_operand): Likewise.
6893         * Makefile.in: Update dependencies.
6895 2010-05-21  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
6897         * config/s390/s390.c (override_options): Increase the default
6898         of max-completely-peel-times.
6900 2010-05-21  Julian Brown  <julian@codesourcery.com>
6901             Mark Mitchell  <mark@codesourcery.com>
6903         * config/arm/arm.c (arm_function_ok_for_sibcall): Only forbid
6904         sibling calls for Thumb-1.
6905         * config/arm/arm.h (USE_RETURN_INSN): Enable for Thumb-2.
6906         * config/arm/arm.md (*call_symbol, *call_value_symbol): Use for
6907         Thumb-2.
6908         (*call_insn, *call_value_insn): Don't use for Thumb-2.
6909         (sibcall, sibcall_value, *sibcall_insn, *sibcall_value_insn): Use
6910         for Thumb-2.
6911         (return): New expander.
6912         (*arm_return): New name for ARM return insn.
6913         * config/arm/thumb2.md (*thumb2_return): New insn pattern.
6915 2010-05-19  Joel Sherrill <joel.sherrill@oarcorp.com>
6917         * config.gcc (sparc64-*-rtems*): New target.
6919 2010-05-21  Nathan Froyd  <froydnj@codesourcery.com>
6921         * tree.c (build_function_decl_skip_args): Fix grammar.
6922         (build_function_type_list_1): Fix typos, adjust formatting.
6924 2010-05-21  Steven Bosscher  <steven@gcc.gnu.org>
6926         * tree.h: Include real.h and fixed-value.h as basic datatypes.
6927         * dfp.c, convert.c, reload1.c, reginfo.c, tree-flow.h,
6928         tree-ssa-threadedge.c, tree-ssanames.c, tree-loop-linear.c,
6929         tree-into-ssa.c, tree-vect-generic.c, tree-ssa-structalias.c,
6930         tree-ssa-loop-im.c, tree-dump.c, tree-complex.c, tree-ssa-uninit.c,
6931         genrecog.c, tree-ssa-threadupdate.c, tree-ssa-loop-niter.c,
6932         tree-pretty-print.c, tree-loop-distribution.c,
6933         tree-ssa-loop-unswitch.c, c-lex.c, optabs.c, postreload-gcse.c,
6934         tree-ssa-loop-manip.c, postreload.c, tree-ssa-loop-ch.c,
6935         tree-tailcall.c, tree.c, reload.c, tree-scalar-evolution.c, rtlanal.c,
6936         tree-phinodes.c, builtins.c, final.c, genoutput.c, fold-const.c,
6937         tree-ssa-dse.c, genautomata.c, tree-ssa-uncprop.c, toplev.c,
6938         tree-chrec.c, genemit.c, c-cppbuiltin.c, tree-ssa-sccvn.c,
6939         tree-ssa-ccp.c, tree-ssa-loop-ivopts.c, mode-switching.c,
6940         tree-call-cdce.c, cse.c, genpeep.c, tree-ssa-math-opts.c,
6941         tree-ssa-dom.c, tree-nrv.c, tree-ssa-propagate.c, tree-ssa-alias.c,
6942         tree-ssa-sink.c, jump.c, ifcvt.c, dwarf2out.c, expr.c, genattrtab.c,
6943         genconditions.c, tree-ssa-loop-ivcanon.c, tree-ssa-loop.c,
6944         tree-parloops.c, recog.c, tree-ssa-address.c, lcm.c, tree-eh.c,
6945         gimple-pretty-print.c, c-pretty-print.c, print-rtl.c, gcse.c,
6946         tree-if-conv.c, tree-data-ref.c, tree-affine.c, gimplify.c,
6947         tree-ssa-phiopt.c, implicit-zee.c, expmed.c, tree-dfa.c, emit-rtl.c,
6948         store-motion.c, cselib.c, tree-cfgcleanup.c, simplify-rtx.c,
6949         tree-ssa-pre.c, genpreds.c, tree-mudflap.c, print-tree.c,
6950         tree-ssa-copy.c, tree-ssa-forwprop.c, tree-ssa-dce.c, varasm.c,
6951         tree-nested.c, tree-ssa.c, tree-ssa-loop-prefetch.c, rtl.c,
6952         tree-inline.c, integrate.c, tree-optimize.c, tree-ssa-phiprop.c,
6953         fixed-value.c, combine.c, tree-profile.c, c-common.c, sched-vis.c,
6954         tree-cfg.c, passes.c, tree-ssa-reassoc.c, config/alpha/alpha.c,
6955         config/frv/frv.c, config/s390/s390.c, config/m32c/m32c.c,
6956         config/spu/spu.c, config/sparc/sparc.c, config/mep/mep.c,
6957         config/m32r/m32r.c, config/rx/rx.c, config/i386/i386.c,
6958         config/sh/sh.c, config/pdp11/pdp11.c, config/avr/avr.c,
6959         config/crx/crx.c, config/xtensa/xtensa.c, config/stormy16/stormy16.c,
6960         config/fr30/fr30.c, config/lm32/lm32.c, config/moxie/moxie.c,
6961         config/m68hc11/m68hc11.c, config/cris/cris.c, config/iq2000/iq2000.c,
6962         config/mn10300/mn10300.c, config/ia64/ia64.c, config/m68k/m68k.c,
6963         config/rs6000/rs6000.c, config/picochip/picochip.c, config/darwin.c,
6964         config/arc/arc.c, config/mcore/mcore.c, config/score/score3.c,
6965         config/score/score7.c, config/score/score.c, config/arm/arm.c,
6966         config/pa/pa.c, config/mips/mips.c, config/vax/vax.c,
6967         config/h8300/h8300.c, config/v850/v850.c, config/mmix/mmix.c,
6968         config/bfin/bfin.c: Clean up redundant includes.
6969         * Makefile.in: Update accordingly.
6971 2010-05-21  Nathan Froyd  <froydnj@codesourcery.com>
6973         PR middle-end/44204
6974         * builtins.c (fold_call_stmt): Pass &error_mark_node if the call
6975         statement has no arguments.
6977 2010-05-21  Kai Tietz  <kai.tietz@onevision.com>
6979         PR/44139
6980         * varasm.c (emutls_decl): Merge attributes to new decl.
6982 2010-05-21  Eric Botcazou  <ebotcazou@adacore.com>
6984         PR middle-end/44101
6985         * gimplify.c (gimplify_init_constructor): Build a VIEW_CONVERT_EXPR
6986         around the uniquized constructor if its type requires a conversion.
6988 2010-05-21  Jakub Jelinek  <jakub@redhat.com>
6990         PR debug/44205
6991         * tree-cfgcleanup.c (tree_forwarder_block_p): Return false if
6992         at -O0 goto_locus of any of the incoming edges differs from
6993         goto_locus of outgoing edge, or gimple_location of any of the
6994         labels differs.
6996 2009-09-14  Vladimir Makarov <vmakarov@redhat.com>
6998         * ira.c (ira_non_ordered_class_hard_regs): Define.
6999         (setup_class_hard_regs): Initialize ira_non_ordered_class_hard_regs.
7000         * ira-int.h (ira_non_ordered_class_hard_regs): Declare.
7001         * ira-costs.c (ira_tune_allocno_costs_and_cover_classes): Increase
7002         cost of unaligned hard regs when allocating multi-reg pseudos.
7004 2010-05-20  Richard Sandiford  <rdsandiford@googlemail.com>
7006         * config.gcc (mips*-sde-elf*): Don't use sdemtk.opt.
7007         * config/mips/mips.h (TARGET_CPU_CPP_BUILTINS): Define __mips_no_float
7008         for TARGET_NO_FLOAT.
7009         * config/mips/mips.c (mips_file_start): Expand conditional expression
7010         into "if" statements.  Use .gnu_attribute 4,0 for TARGET_NO_FLOAT.
7011         (mips_override_options): Move -mno-float override -msoft-float and
7012         -mhard-float.
7013         * config/mips/mips.opt (mno-float): Move from sdemtk.opt, but add
7014         Condition(TARGET_SUPPORTS_NO_FLOAT).
7015         * config/mips/sdemtk.h (TARGET_OS_CPP_BUILTINS): Don't set
7016         __mips_no_float here.
7017         (SUBTARGET_OVERRIDE_OPTIONS): Delete.
7018         (TARGET_SUPPORTS_NO_FLOAT): Define.
7019         * config/mips/sdemtk.opt: Delete.
7021 2010-05-20  Segher Boessenkool  <segher@kernel.crashing.org>
7023         * ipa-prop.c (compute_complex_ancestor_jump_func): Bail out if !cond.
7025 2010-05-20  Uros Bizjak  <ubizjak@gmail.com>
7027         PR target/43733
7028         * configure.ac (gcc_cv_as_ix86_sahf): Switch to 64bit mode.
7029         * configure: Regenerate.
7030         * config.in: Regenerate.
7031         * config/i386/i386.md (x86_sahf_1): Conditionally output 0x9e
7032         instead of sahf only for 64bit targets.
7034 2010-05-20  Jakub Jelinek  <jakub@redhat.com>
7036         PR debug/44178
7037         * haifa-sched.c (initiate_bb_reg_pressure_info): Do not call
7038         setup_ref_regs for DEBUG_INSNs.
7040 2010-05-20  Jan Hubicka  <jh@suse.cz>
7042         PR middle-end/44197
7043         * varpool.c (varpool_remove_node): Handle in-varpool aliases.
7045 2010-05-20  Kenneth Zadeck  <zadeck@naturalbridge.com>
7047         PR bootstrap/43870
7048         * df-scan.c (df_ref_compare): Stabilize sort.
7050 2010-05-20  Jakub Jelinek  <jakub@redhat.com>
7052         * dwarf2out.c (new_loc_descr_op_bit_piece): Add offset
7053         argument.  Don't use DW_OP_piece if offset is non-zero,
7054         put offset into second DW_OP_bit_piece argument.
7055         (dw_sra_loc_expr): Adjust callers.  For memory expressions
7056         compute offset.
7058 2010-05-20  Hans-Peter Nilsson  <hp@axis.com>
7060         PR target/44202
7061         * config/cris/cris.md ("*addsi3_v32"): Correct "cc"
7062         settings for 16-bit-constant "addo" alternative.
7064 2010-05-19  James E. Wilson  <wilson@codesourcery.com>
7066         * config/mips/mips-dsp.md (add<DSPV:mode>3,
7067         mips_add<DSP:dspfmt1>_s_<DSP:dspfmt2>): Add ISA_HAS_DSP condition.
7069         PR target/43764
7070         * mips.c (mips_call_expr_from_insn): New arg second_call.  Set it.
7071         (mips_annotate_pic_calls): Pass new arg to mips_call_expr_from_insn.
7072         Use it.
7074 2010-05-19  Joseph Myers  <joseph@codesourcery.com>
7076         * diagnostic.c (FLOAT, FFS): Don't undefine.
7077         * passes.c, pretty-print.c, rtl-error.c, toplev.c: Likewise.
7078         * cse.c, regmove.c: Remove comments about stdio.h and rtl.h
7079         include ordering.
7081 2010-05-19  Richard Sandiford  <rdsandiford@googlemail.com>
7083         * combine.c (propagate_for_debug): Call make_compound_operation
7084         on the source value.
7085         (try_combine): When implementing a split chosen by find_split_point,
7086         either copy i2src or set it to null.  Assert that i2src is not null
7087         before substituting into CALL_INSN_FUNCTION_USAGE.
7089 2010-05-19  Anatoly Sokolov  <aesok@post.ru>
7091         * double-int.h (double_int_ior): New function.
7092         * tree.h (build_int_cst_wide_type): Remove.
7093         * tree.c (build_int_cst_wide_type): Remove.
7094         * fold-const.c (native_interpret_int): Use double_int_to_tree instead
7095         of build_int_cst_wide_type.
7096         * stor-layout.c (set_sizetype): (Ditto.).
7097         * dojump.c (do_jump): Use build_int_cstu instead of
7098         build_int_cst_wide_type.
7100 2010-05-19  Eric Botcazou  <ebotcazou@adacore.com>
7102         * langhooks.h (struct lang_hooks): Add new field deep_unsharing.
7103         * langhooks-def.h (LANG_HOOKS_DEEP_UNSHARING): New macro.
7104         (LANG_HOOKS_INITIALIZER): Add LANG_HOOKS_DEEP_UNSHARING.
7105         * gimplify.c (mostly_copy_tree_r): Copy trees under SAVE_EXPR and
7106         TARGET_EXPR nodes, but only once, if instructed to do so.  Do not
7107         propagate the 'data' argument to copy_tree_r.
7108         (copy_if_shared_r): Remove bogus ATTRIBUTE_UNUSED marker.
7109         Propagate 'data' argument to walk_tree.
7110         (copy_if_shared): New function.
7111         (unmark_visited_r): Remove bogus ATTRIBUTE_UNUSED marker.
7112         (unmark_visited): New function.
7113         (unshare_body): Call copy_if_shared instead of doing it manually.
7114         (unvisit_body): Call unmark_visited instead of doing it manually.
7116 2010-05-19  Nathan Froyd  <froydnj@codesourcery.com>
7118         * hooks.h (hook_tree_tree_tree_bool_null): Rename to...
7119         (hook_tree_tree_int_treep_bool_null): ...this.  Update signature.
7120         * hooks.c: Likewise.
7121         * target-def.h (TARGET_FOLD_BUILTIN): Define to
7122         hook_tree_tree_int_treep_bool_null.
7123         * target.h (struct gcc_target): Update signature of fold_builtin
7124         field.
7125         * doc/tm.texi (TARGET_FOLD_BUILTIN): Update description and signature.
7126         * builtins.c (fold_call_expr): Pass call_expr_nargs and CALL_EXPR_ARGP
7127         instead of the call expression.
7128         (fold_builtin_call_array): Pass n and argarray directly.
7129         (fold_call_stmt): Pass nargs and gimple_call_arg_ptr instead of
7130         consing a list.
7131         * config/alpha/alpha.c (alpha_fold_builtin): Update signature.  Lift
7132         MAX_ARGS check out of the loop.  Delete declaration of `arity', declare
7133         `i' and use it in place of `arity'.
7134         * config/sparc/sparc.c (sparc_fold_builtin): Update signature.
7135         Dereference `args' directly.
7136         * config/xtensa/xtensa (xtensa_fold_builtin): Likewise.
7138 2010-05-19  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
7140         * doc/sourcebuild.texi (Effective-Target Keywords): Document
7141         3dnow, sse3, sse2.
7142         (Directives): Document optional dg-require-effective-target
7143         selector.
7145 2010-05-19  Richard Guenther  <rguenther@suse.de>
7147         PR lto/44196
7148         * tree.c (find_decls_types_r): Walk BLOCKs and its vars.
7150 2010-05-19  Richard Guenther  <rguenther@suse.de>
7152         * doc/invoke.texi (-fwhopr): Document new optional jobs argument.
7153         * common.opt (fwhopr=): New.
7154         * opts.c (common_handle_option): Handle OPT_fwhopr.
7155         * gcc.c (LINK_COMMAND_SPEC): Pass fwhopr*.
7156         * collect2.c (main): Match -fwhopr*.
7157         * lto-wrapper.c (run_gcc): Handle jobs argument of -fwhopr.
7158         Execute ltrans stage in parallel when jobs is bigger than 1.
7160 2010-05-19  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
7162         * config.gcc (i[34567]86-*-solaris2*): Default with_arch_32 to
7163         pentiumpro on Solaris 8/x86 with Sun as.
7164         * configure.ac (gcc_cv_as_hidden): Check for Solaris 9/x86 as
7165         hidden alias bug.
7166         (gcc_cv_as_ix86_quad): Check for .quad directive.
7167         * configure: Regenerate.
7168         * config.in: Regenerate.
7169         * config/i386/sol2.h (ASM_QUAD): Change guard to !HAVE_AS_IX86_QUAD.
7171 2010-05-19  Martin Jambor  <mjambor@suse.cz>
7173         * ipa-prop.c (ipa_print_node_jump_functions): Print jump functions
7174         also for indirect edges.  Actual printing moved...
7175         (ipa_print_node_jump_functions_for_edge): ...here.
7176         (ipa_compute_jump_functions): Renamed to
7177         ipa_compute_jump_functions_for_edge and made static.
7178         (ipa_compute_jump_functions): New function.
7179         (make_edge_direct_to_target): Check if the number of arguments on
7180         the newly direct edge is the same as the number of parametrs of
7181         the callee.
7182         * ipa-cp.c (ipcp_init_stage): Most functionality moved to new
7183         ipa_compute_jump_functions.  Call ipa_analyze_params_uses.
7184         * ipa-inline.c (inline_indirect_intraprocedural_analysis): Call
7185         analysis functions unconditionally, call the new
7186         ipa_analyze_params_uses on the node instead of every edge.
7188 2010-05-19  Christian Borntraeger  <borntraeger@de.ibm.com>
7190         * tree-ssa-loop-prefetch.c (mem_ref_group, ar_data): Change step
7191         to tree.
7192         (dump_mem_ref): Adopt debug code to handle a tree as step.  This
7193         also checks for a constant int vs.  non-constant but
7194         loop-invariant steps.
7195         (find_or_create_group): Change the sort algorithm to only consider
7196         steps that are constant ints.
7197         (idx_analyze_ref): Adopt code to handle a tree instead of a
7198         HOST_WIDE_INT for step.
7199         (gather_memory_references_ref): Handle tree instead of int and be
7200         prepared to see a NULL_TREE.
7201         (prune_ref_by_self_reuse, prune_ref_by_group_reuse): Do not prune
7202         prefetches if the step cannot be calculated at compile time.
7203         (issue_prefetch_ref): Issue prefetches for non-constant but
7204         loop-invariant steps.
7206 2010-05-18  Nathan Froyd  <froydnj@codesourcery.com>
7208         Revert:
7209         2010-05-18  Nathan Froyd  <froydnj@codesourcery.com>
7211         * tree.h (build_call_list): Remove.
7212         * tree.c (build_call_list): Remove.
7214 2010-05-18  Nathan Froyd  <froydnj@codesourcery.com>
7216         * tree.h (build_call_list): Remove.
7217         * tree.c (build_call_list): Remove.
7219 2010-05-18  Jan Hubicka  <jh@suse.cz>
7221         * ipa-reference.c (propagate): Walk all nodes in the cleanup stage.
7223 2010-05-18  Vladimir Makarov  <vmakarov@redhat.com>
7225         PR rtl-optimization/43332
7226         * haifa-sched.c (setup_insn_max_reg_pressure): Check barrier.
7228 2010-05-18  Anatoly Sokolov  <aesok@post.ru>
7230         * tree.h (build_int_cstu): Implement as static inline.
7231         * tree.c (build_int_cstu): Remove function.
7232         (double_int_to_tree, double_int_fits_to_tree_p): Handle size types as
7233         sign extended.
7235 2010-05-18  Richard Guenther  <rguenther@suse.de>
7237         PR lto/44143
7238         * lto-wrapper.c (verbose): New variable.  Initialize from -v.
7239         (debug): Initialize from -save-temps.
7240         (collect_execute): Print command-line when verbose.
7241         (run_gcc): Always use COLLECT_GCC_OPTIONS.  Use fork_execute
7242         for ltrans invocation.  Produce -dumpbase flag again.
7243         (process_args): Remove.
7244         (main): Simplify.
7245         * collect2.c (maybe_run_lto_and_relink): Only pass object
7246         files to lto-wrapper.
7247         * gcc.c (LINK_COMMAND_SPEC): Likewise.
7249 2010-05-18  Jan Hubicka  <jh@suse.cz>
7251         * opts.c (decode_options): Do not disable whopr at ipa_cp.
7252         * ipa-prop.c (ipa_detect_param_modifications): Walk PHI nodes too.
7254 2010-05-18  Steven Bosscher  <steven@gcc.gnu.org>
7256         PR lto/44184
7257         * lto-streamer-out.c (output_gimple_stmt): Output number of labels
7258         in a GIMPLE_ASM.
7259         * lto-streamer-in.c (input_gimple_stmt): Read number of labels
7260         in a GIMPLE_ASM.
7262 2010-05-18  Jakub Jelinek  <jakub@redhat.com>
7264         PR debug/41371
7265         * var-tracking.c (find_loc_in_1pdv): Add a few checks from
7266         rtx_equal_p inline.
7268 2010-05-18  Steven Bosscher  <steven@gcc.gnu.org>
7270         * config.gcc (powerpc-*-darwin*, powerpc64-*-darwin*): Add
7271         lto-macho as lto_binary_reader.
7273         * darwin.c (darwin_asm_named_section): Do not add assembler comment
7274         after .section directive; just print it before the directive instead.
7276 2010-05-17  Jan Hubicka  <jh@suse.cz>
7278         * cgraph.c (cgraph_create_virtual_clone): Only check
7279         versionable_function_p when not in wpa and checking is enabled.
7280         * cgraphunit.c (cgraph_materialize_all_clones): Stabilize after
7281         there are no more functions to materialize.
7283 2010-05-17  Jan Hubicka  <jh@suse.cz>
7285         * cgraph.h (struct ipa_replace_map): Add parm_num parameter.
7286         * lto-cgraph.c (output_cgraph_opt_summary, input_cgraph_opt_summary):
7287         New functions.
7288         (output_cgraph): Call output_cgraph_opt_summary.
7289         (input_cgrpah): Call input_cgraph_opt_summary.
7290         (output_cgraph_opt_summary_p, output_node_opt_summary,
7291         input_node_opt_summary, input_cgraph_opt_section): New functions.
7292         * lto-section-in.c (lto_section_name): Add cgraphopt.
7293         * tree-inline.c (tree_function_versioning): Handle parm_num.
7294         * lto-streamer.c (lto_get_section_name): Handle cgraphopt.
7295         * lto-streamer.h (lto_section_type): Add LTO_section_cgraph_opt_sum.
7297 2010-05-17  Changpeng Fang  <changpeng.fang@amd.com>
7299         * doc/invoke.texi: Update documentation for min-insn-to-prefetch-ratio.
7300         * tree-ssa-loop-prefetch.c (is_loop_prefetching_profitable): Also apply
7301         the insn to prefetch ratio heuristic to loops with known trip count.
7303 2010-05-17  Changpeng Fang  <changpeng.fang@amd.com>
7305         * tree-ssa-loop-prefetch.c (PREFETCH_MOD_TO_UNROLL_FACTOR_RATIO): New.
7306         (schedule_prefetches): Do not generate a prefetch if the unroll factor
7307         is far from what is required by the prefetch.
7309 2010-05-17  Jan Hubicka  <jh@suse.cz>
7311         * ipa-cp.c (ipcp_update_callgraph): Use ipa_is_param_used.
7312         (ipcp_estimate_growth): Likewise.
7313         (ipcp_const_param_count): Likewise.
7314         (ipcp_insert_stage): Likewise.
7315         * ipa-prop.c (visit_load_for_mod_analysis): New function.
7316         (visit_store_addr_for_mod_analysis): Set used flag.
7317         (ipa_detect_param_modifications): Set used flag for SSE params;
7318         update use of walk_stmt_load_store_addr_ops.
7319         (ipa_print_node_params): Print used flag.
7320         (ipa_write_node_info): Stream used flag.
7321         (ipa_read_node_info): Likewise.
7322         * ipa-prop.h (struct ipa_param_descriptor): Add used field.
7323         (ipa_is_param_used): New function.
7324         (lto_ipa_fixup_call_notes): Remove unused declaration.
7326 2010-05-17  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
7328         PR target/44074
7329         * configure.ac (HAVE_AS_IX86_REP_LOCK_PREFIX): New test.
7330         * configure: Regenerate.
7331         * config.in: Regenerate.
7332         * config/i386/i386.c (print_operand) <case ;>: Also print ";" if
7333         !HAVE_AS_IX86_REP_LOCK_PREFIX.
7334         Don't emit whitespace.
7335         * config/i386/i386.md (*rep_movdi_rex64): Use {%;} after rep.
7336         (*rep_movsi): Likewise.
7337         (*rep_movsi_rex64): Likewise.
7338         (*rep_movqi): Likewise.
7339         (*rep_movqi_rex64): Likewise.
7340         (*rep_stosdi_rex64): Likewise.
7341         (*rep_stossi): Likewise.
7342         (*rep_stossi_rex64): Likewise.
7343         (*rep_stosqi): Likewise.
7344         (*rep_stosqi_rex64): Likewise.
7345         (*cmpstrnqi_nz_1): Use {%;} after repz.
7346         (*cmpstrnqi_nz_rex_1): Likewise.
7347         (*cmpstrnqi_1): Likewise.
7348         (*cmpstrnqi_rex_1): Likewise.
7349         (*strlenqi_1): Use {%;} after repnz.
7350         (*strlenqi_rex_1): Likewise.
7351         * config/i386/sync.md (memory_barrier_nosse): Replace {%;| } by {%;} .
7352         (*sync_compare_and_swap<mode>): Likewise.
7353         (sync_double_compare_and_swap<mode>): Likewise.
7354         (*sync_double_compare_and_swapdi_pic): Likewise.
7355         (sync_old_add<mode>): Likewise.
7356         (sync_add<mode>): Likewise.
7357         (sync_sub<mode>): Likewise.
7358         (sync_<code><mode>): Likewise.
7360 2010-05-17  Martin Jambor  <mjambor@suse.cz>
7362         * cgraph.h (cgraph_indirect_call_info): New fields anc_offset,
7363         otr_token and polymorphic.
7364         * cgraph.c (cgraph_create_indirect_edge): Inilialize the above fields.
7365         (cgraph_clone_edge): Copy the above fields.
7366         * tree.c (get_binfo_at_offset): New function.
7367         * tree.h (get_binfo_at_offset): Declare.
7368         * ipa-prop.h (enum jump_func_type): Added known_type jump function
7369         type, reordered items, updated comments.
7370         (union jump_func_value): Added base_type field, reordered fields.
7371         (enum ipa_lattice_type): Moved down in the file.
7372         (struct ipa_param_descriptor): New field polymorphic.
7373         (ipa_is_param_polymorphic): New function.
7374         * ipa-prop.c: Include gimple.h and gimple-fold.h.
7375         (ipa_print_node_jump_functions): Print known type jump functions.
7376         (compute_complex_pass_through): Renamed to...
7377         (compute_complex_assign_jump_func): this.
7378         (compute_complex_ancestor_jump_func): New function.
7379         (compute_known_type_jump_func): Likewise.
7380         (compute_scalar_jump_functions): Create known type and complex ancestor
7381         jump functions.
7382         (ipa_note_param_call): New parameter polymorphic, set the corresponding
7383         flag in the call note accordingly.
7384         (ipa_analyze_call_uses): Renamed to...
7385         (ipa_analyze_indirect_call_uses): this.  New parameter target, define
7386         variable var only in the block where it is used.
7387         (ipa_analyze_virtual_call_uses): New function.
7388         (ipa_analyze_call_uses): Likewise.
7389         (combine_known_type_and_ancestor_jfs): Likewise.
7390         (update_jump_functions_after_inlining): Implemented handling of a
7391         number of new jump function types combination.
7392         (print_edge_addition_message): Removed.
7393         (make_edge_direct_to_target): New function.
7394         (try_make_edge_direct_simple_call): Likewise.
7395         (try_make_edge_direct_virtual_call): Likewise.
7396         (update_call_notes_after_inlining): Renamed to...
7397         (update_indirect_edges_after_inlining): this.  Moved edge creation for
7398         indirect calls to try_make_edge_direct_simple_call, also calls
7399         try_make_edge_direct_virtual_call for virtual calls.
7400         (ipa_print_node_params): Changed the header message.
7401         (ipa_write_jump_function): Stream also known type jump functions.
7402         (ipa_read_jump_function): Likewise.
7403         (ipa_write_indirect_edge_info): Stream new fields in
7404         cgraph_indirect_call_info.
7405         (ipa_read_indirect_edge_info): Likewise.
7406         * Makefile.in (ipa-prop.o): Add dependency to GIMPLE_H and
7407         GIMPLE_FOLD_H.
7409 2010-05-17  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
7411         * config/i386/sol2.h (TARGET_SUN_TLS): Remove duplicate definition.
7413 2010-05-17  Nathan Froyd  <froydnj@codesourcery.com>
7415         * tree.h (CALL_EXPR_ARGS): Delete.
7416         (call_expr_arglist): Delete.
7417         * tree.c (call_expr_arglist): Delete.
7418         * builtins.c (fold_call_expr): Pass the whole CALL_EXPR to
7419         targetm.fold_builtin.
7420         * config/alpha/alpha.c (alpha_fold_builtin): Rename arglist parameter.
7421         Rewrite iteration to work on call_expr_nargs rather than TREE_CHAIN.
7422         * config/picochip/picochip.c (picochip_expand_builtin_2op): Rename
7423         arglist parameter.  Use CALL_EXPR_ARG.
7424         (picochip_expand_builtin_3op): Likewise.
7425         (picochip_expand_builtin_2opvoid): Likewise.
7426         (picochip_expand_array_get): Likewise.
7427         (picochip_expand_array_put): Likewise.
7428         (picochip_expand_array_testport): Likewise.
7429         (picochip_expand_builtin): Don't call CALL_EXPR_ARGS.  Pass exp
7430         rather than arglist.
7431         * config/rx/rx.c (rx_expand_builtin): Call call_expr_nargs instead of
7432         CALL_EXPR_ARGS.
7433         * config/sparc/sparc.c (sparc_fold_builtin): Use CALL_EXPR_ARG rather
7434         than TREE_VALUE and TREE_CHAIN.
7435         * config/xtensa/xtensa.c (xtensa_fold_builtin): Likewise.
7436         * doc/tm.texi (TARGET_FOLD_BUILTIN): Pass CALL_EXPR tree instead of
7437         the arglist.
7439 2010-05-17  Jakub Jelinek  <jakub@redhat.com>
7441         PR bootstrap/42347
7442         * cfglayout.c (fixup_reorder_chain): Allow returnjump_p
7443         to have no fallthru edge.
7445         PR middle-end/44102
7446         * cfgcleanup.c (try_optimize_cfg): When removing trivially empty
7447         bb with no successors, move footer whenever in IR_RTL_CFGLAYOUT
7448         mode, not just when CLEANUP_CFGLAYOUT, and when in IR_RTL_CFGRTL
7449         add BARRIER after previous bb if needed.
7451 2010-05-17  Nathan Froyd  <froydnj@codesourcery.com>
7453         * tree.c (build_function_type_list_1): Remove bogus assert condition.
7455 2010-05-17  Alan Modra  <amodra@gmail.com>
7457         * config/rs6000/rs6000.c (rs6000_emit_allocate_stack): Delete
7458         unnecessary prototype.  Replace copy_r12 and copy_r11 flag params
7459         with copy_reg rtx param.
7460         (rs6000_emit_prologue): Update rs6000_emit_allocate_stack calls.
7461         Correct cases where code for ABI_V4 did not initialise the reg
7462         used to access frame.  Also leave frame_reg_rtx as sp for large
7463         frames that save no regs.
7465 2010-05-17  Martin Jambor  <mjambor@suse.cz>
7467         PR middle-end/44133
7468         * tree-sra.c (create_access_replacement): New parameter rename, mark
7469         the replaement for renaming only when it is true.
7470         (get_access_replacement): Pass true in the rename parameter of
7471         create_access_replacement.
7472         (get_unrenamed_access_replacement): New function.
7473         (replace_uses_with_default_def_ssa_name): New parameter racc, get the
7474         replacement declaration from it.
7476 2010-05-17  Bernd Schmidt  <bernds@codesourcery.com>
7478         * function.c (try_fit_stack_local, add_frame_space): New static
7479         functions.
7480         (assign_stack_local_1): Use them.  Look for opportunities to use
7481         space previously wasted on alignment.
7482         * function.h (struct frame_space): New.
7483         (struct rtl_data): Add FRAME_SPACE_LIST member.
7484         * reload1.c (something_was_spilled): New static variable.
7485         (alter_reg): Set it.
7486         (reload): Test it in addition to testing if the frame size changed.
7488 2010-05-17  Christian Borntraeger  <borntraeger@de.ibm.com>
7490         * config/s390/s390.c: Define sane prefetch settings and activate
7491         flag_prefetch_loop_arrays on -O3.
7492         * config/s390/s390.h: Declare that read can use write prefetch.
7494 2010-05-17  Jakub Jelinek  <jakub@redhat.com>
7496         * lto-streamer-out.c (lto_output): Fix --enable-checking=release
7497         build.
7499 2010-05-16  Jan Hubicka  <jh@suse.cz>
7501         * ipa-cp.c (ipcp_versionable_function_p): Walk cgraph edges instead of
7502         function body; do not check stdarg field of struct function.
7504 2010-05-16  Jan Hubicka  <jh@suse.cz>
7506         * cgraph.c (dump_cgraph_node): Dump versionable flag.
7507         * cgraph.h (cgraph_local_info): Add versionable flag.
7508         * ipa-cp.c (ipcp_analyze_node): Set versionable flag.
7509         (ipcp_versionable_function_p): Use it.
7510         * lto-cgraph.c (lto_output_node, input_overwrite_node): Stream
7511         versionable flag.
7513 2010-05-16  Jan Hubicka  <jh@suse.cz>
7515         * cgraph.c (cgraph_clone_node): Take decl argument and insert
7516         clone into hash when it is different from orig.
7517         (cgraph_create_virtual_clone): Update use of cgraph_clone_node.
7518         * cgraph.h (cgraph_clone_node): Update prototype.
7519         * lto-cgrpah.c (lto_cgraph_encoder_new): Create body map.
7520         (lto_cgraph_encoder_delete): Delete body map.
7521         (lto_cgraph_encoder_size): Move to header.
7522         (lto_cgraph_encoder_encode_body_p,
7523         lto_set_cgraph_encoder_encode_body): New.
7524         (lto_output_node): Do not take written_decls argument; output clone_of
7525         pointer.
7526         (add_node_to): Add include_body_argument; call
7527         lto_set_cgraph_encoder_encode_body on master of the clone.
7528         (add_references): Update use of add_node_to.
7529         (compute_ltrans_boundary): Likewise.
7530         (output_cgraph): Do not create written_decls bitmap.
7531         (input_node): Take nodes argument; stream in clone_of correctly.
7532         (input_cgraph_1): Update use of input_node.
7533         * lto-streamer-out.c (lto_output): Use encoder info to decide
7534         what bodies to output.
7535         * ipa-inline.c (cgraph_clone_inlined_nodes,
7536         cgraph_decide_recursive_inlining): Update call of cgraph_clone_node.
7537         * lto-streamer.h (lto_cgraph_encoder_d): Add body.
7538         (lto_cgraph_encoder_size): Define here.
7539         (lto_cgraph_encoder_encode_body_p, lto_varpool_encoder_encode_body_p):
7540         Declare.
7542 2010-05-16  Richard Guenther  <rguenther@suse.de>
7544         * doc/invoke.texi (-fipa-struct-reorg): Do not mention
7545         -fipa-type-escape.
7546         * ipa-type-escape.c (gate_type_escape_vars): Run when
7547         -fipa-struct-reorg runs.
7548         * opts.c (decode_options): Do not unset flag_ipa_type_escape.
7549         * common.opt (fipa-type-escape): Remove.
7551 2010-05-16  Eric Botcazou  <ebotcazou@adacore.com>
7553         * opts.c (handle_option): Call into LTO streamer only if ENABLE_LTO.
7554         (decode_options): Likewise.
7555         * Makefile.in (opts.o): Add dependency on LTO_STREAMER_H.
7557 2010-05-16  Jan Hubicka  <jh@suse.cz>
7559         * ipa.c (function_and_variable_visibility): Also bring local all
7560         aliases.
7562 2010-05-16  Richard Guenther  <rguenther@suse.de>
7564         * alias.c (nonoverlapping_memrefs_p): Remove use of
7565         IPA type-escape information.
7567 2010-05-16  Joseph Myers  <joseph@codesourcery.com>
7569         * c-common.c (c_common_reswords): Add _Static_assert for C.
7570         * c-parser.c (c_token_starts_declaration,
7571         c_parser_next_token_starts_declaration,
7572         c_parser_static_assert_declaration_no_semi,
7573         c_parser_static_assert_declaration): New.
7574         (c_parser_declaration_or_fndef): Add parameter static_assert_ok.
7575         Handle static assertions if static_assert_ok.
7576         (c_parser_external_declaration, c_parser_declaration_or_fndef,
7577         c_parser_compound_statement_nostart, c_parser_label,
7578         c_parser_for_statement, c_parser_objc_methodprotolist,
7579         c_parser_omp_for_loop): All callers of
7580         c_parser_declaration_or_fndef changed.
7581         (c_parser_struct_declaration): Handle static assertions.
7582         (c_parser_compound_statement_nostart): Use
7583         c_parser_next_token_starts_declaration and
7584         c_token_starts_declaration to detect start of declarations.
7585         (c_parser_label, c_parser_for_statement, c_parser_omp_for_loop):
7586         Likewise.
7588 2010-05-16  Anatoly Sokolov  <aesok@post.ru>
7590         * config/mmix/mmix.h (FUNCTION_VALUE, FUNCTION_OUTGOING_VALUE,
7591         LIBCALL_VALUE, FUNCTION_VALUE_REGNO_P): Remove macros.
7592         * config/mmix/mmix.c (TARGET_FUNCTION_VALUE, TARGET_LIBCALL_VALUE,
7593         TARGET_FUNCTION_VALUE_REGNO_P): Define.
7594         (mmix_function_outgoing_value): Rename to...
7595         (mmix_function_value): ...this. Make static. Add 'outgoing' argument.
7596         (mmix_function_value_regno_p): Make static.
7597         (mmix_libcall_value): New function.
7598         * config/mmix/mmix-protos.h (mmix_function_outgoing_value,
7599         mmix_function_value_regno_p): Remove declaration.
7601 2010-05-16  Eric Botcazou  <ebotcazou@adacore.com>
7603         * tree.c (build_common_builtin_nodes): Always clear TREE_NOTHROW on
7604         BUILT_IN_ALLOCA if stack checking is enabled.
7606 2010-05-16  Richard Guenther  <rguenther@suse.de>
7608         * var-tracking.c (vars_copy_1): Inline ...
7609         (vars_copy): ... here.  Use FOR_EACH_HTAB_ELEMENT.
7610         (variable_union): Use FOR_EACH_HTAB_ELEMENT.  Merge asserts.
7611         (variable_merge_over_cur): Adjust.  Merge asserts.
7612         (variable_merge_over_src): Likewise.
7613         (dataflow_set_merge): Use FOR_EACH_HTAB_ELEMENT.
7614         (variable_post_merge_new_vals): Merge asserts.
7615         (variable_post_merge_perm_vals): Likewise.
7616         (find_mem_expr_in_1pdv): Likewise.
7617         (dataflow_set_different_value): Remove.
7618         (onepart_variable_different_p): Merge asserts.
7619         (variable_different_p): Likewise.
7620         (dataflow_set_different_1): Inline ...
7621         (dataflow_set_different): ... here.  Use FOR_EACH_HTAB_ELEMENT.
7622         (emit_notes_for_differences_1): Merge asserts.
7624 2010-05-16  Richard Guenther  <rguenther@suse.de>
7626         * lto-symtab.c (lto_symtab_entry_hash): Use IDENTIFIER_HASH_VALUE.
7627         * optabs.c (libfunc_decl_hash): Likewise.
7628         * varasm.c (emutls_decl): Likewise.
7630 2010-05-16  Steven Bosscher  <steven@gcc.gnu.org>
7632         * c-decl.c: Don't include gimple.h.
7633         (merge_decls): Do not copy gimple_body.
7635 2010-05-15  Jason Merrill  <jason@redhat.com>
7637         * c.opt: Add -fnothrow-opt.
7639 2010-05-15  Jan Hubicka  <jh@suse.cz>
7641         * ipa-prop.c (ipa_prop_read_section): Add sanity check that node is
7642         analyzed.
7643         * passes.c (ipa_write_summaries): Write all analyzed nodes.
7645 2010-05-15  Steven Bosscher  <steven@gcc.gnu.org>
7647         * vecir.h: New file with VEC primitives for tree, gimple, and rtl.
7648         * Makefile.in: Add it.
7649         Fix all other Makefile dependencies for changes below.
7650         * tree.h: Include it instead of defining VEC primitives here.
7651         * gimple.h: Likewise.
7652         * rtl.h: Likewise.
7653         * tree-inline.h: Inlclude vecir.h instead of gimple.h.
7654         * except.h: Include vecir.h, break dependence on tree.h.
7656         * gimplify.c (append_to_statement_list_1, append_to_statement_list):
7657         Move from here...
7658         * tree-iterator.c: ...to here.
7659         * tree-iterator.h: Fix file introduction comment.  Add extern markers.
7661         * c-lex.c: Include fixed-value.h instead of rtl.h.  Do not include
7662         tm_p.h.
7663         * c-cppbuiltin.c: Explain why debug.h and tm_p.h are included.
7664         * c-objc-common.h: Do not include tm.h, rtl.h, insn-config.h,
7665         integrate.h, function.h, toplev.h, tree-inline.h, ggc.h,
7666         tree-mudflap.h, and target.h.
7667         * c-semantics.c: Do not include except.h, ggc.h, rtl.h, timevar.h,
7668         predict.h, tree-inline.h, gimple.h, and langhooks.h.
7669         * c-decl.c: Do not include expr.h, ggc.h, libfuncs.h, except.h.
7670         Add FIXME for why gimple.h is still included (should be unnecessary
7671         since GCC 4.5 gimplification unit-at-a-time).
7672         * c-typeck.c: Do not include rtl.h, tm_p.h, ggc.h, and gimple.h.
7673         * c-pragma.c: Add FIXME for why function.h needs to be included just
7674         for cfun, at front-end level.
7675         Add note that REGISTER_TARGET_PRAGMAS should probably be a target hook.
7676         Do not include ggc.h, but include vecprim.h for VEC(char).
7677         * c-opts.c: Do not include tm.h, tree-inline.h, and tm_p.h.
7678         Explain why target.h is included.
7679         * c-omp.h: Do not include tm.h, function.h, and bitmap.h.
7680         Explain why gimple.h is included.
7681         * c-ppoutput.c: Do not include tm.h.
7682         * c-common.c: Do not include gimple.h.  Explain why expr.h is included.
7683         * c-parses.c: Explain why rtl.h is included, and that this (and only
7684         this) is also why tm.h must be included.
7685         Do not include except.h.
7686         * c-lang.c: Do not include ggc.h.
7688 2010-05-15  Uros Bizjak  <ubizjak@gmail.com>
7690         * targhooks.c (GO_IF_MODE_DEPENDENT_ADDRESS): Use CONST_CAST_RTX.
7692 2010-05-15  Joseph Myers  <joseph@codesourcery.com>
7694         * c-decl.c (grokfield): Allow typedefs for anonymous structs and
7695         unions by default if those structs and unions have no tags.  Do
7696         not condition anonymous struct and unions handling on flag_iso.
7697         Allow anonymous structs and unions for C1X.
7698         (finish_struct): Do not diagnose lack of named fields when
7699         anonymous structs and unions present for C1X.  Accept flexible
7700         array members in structure with anonymous structs or unions but no
7701         directly named fields.
7702         * doc/extend.texi (Unnamed Fields): Update.
7704 2010-05-15  Eric Botcazou  <ebotcazou@adacore.com>
7706         * gimple.h (compare_field_offset): Rename into...
7707         (gimple_compare_field_offset): ...this.
7708         * gimple.c (compare_field_offset): Rename into...
7709         (gimple_compare_field_offset): ...this.  Compare the full access if
7710         the offset is self-referential.
7711         (gimple_types_compatible_p): Adjust for above renaming.
7712         * lto-streamer-in.c (input_gimple_stmt): Likewise.  Also compare the
7713         DECL_NONADDRESSABLE_P flag of fields before merging them.
7715 2010-05-15  Nathan Froyd  <froydnj@codesourcery.com>
7717         * tree.h (ctor_to_list): Delete.
7718         * tree.c (ctor_to_list): Delete.
7720 2010-05-15  Jan Hubicka  <jh@suse.cz>
7722         * ipa-reference.c: Include toplev.h
7723         (is_proper_for_analysis): Only add to all_module_statics
7724         if it is allocated.
7725         (write_node_summary_p, stream_out_bitmap,
7726         ipa_reference_write_optimization_summary,
7727         ipa_reference_read_optimization_summary): New.
7728         (struct ipa_opt_pass_d pass_ipa_reference): Add
7729         optimization summary streaming.
7730         * lto-cgraph.c (referenced_from_this_partition_p,
7731         reachable_from_this_partition_p): New functions.
7732         * tree-ssa-alias.c (ref_maybe_used_by_call_p_1,
7733         call_may_clobber_ref_p_1): Ask ipa-reference even for public vars.
7734         * opts.c (decode_options): Enable ipa_reference.
7735         * Makefile.in (ipa-reference.o): Add toplev.h dependency.
7736         * lto-streamer.h (referenced_from_this_partition_p,
7737         reachable_from_this_partition_p): Declare.
7739 2010-05-15  Richard Guenther  <rguenther@suse.de>
7741         PR tree-optimization/44038
7742         * tree-ssa-forwprop.c (forward_propagate_addr_expr_1): Avoid
7743         taking the address of a V_C_E of a constant.
7745 2010-05-14  Jan Hubicka  <jh@suse.cz>
7747         * tree.h (memory_identifier_string): Remove.
7748         * ipa-reference.c: Update comment; do not include gt-ipa-reference.h
7749         (ipa_reference_global_vars_info_d): Remove statics_not_read and
7750         statics_not_written.
7751         (ipa_reference_optimization_summary_d): New structure.
7752         (ipa_reference_optimization_summary_t): New type and vector.
7753         (ipa_reference_vars_info_d): Embedd structures instead of using
7754         pointers.
7755         (reference_vars_to_consider): Remove out of GGC space.
7756         (module_statics_escape): Remove.
7757         (global_info_obstack): Rename to ...
7758         (optimization_summary_obstack): ... this one.
7759         (initialization_status_t): Remove.
7760         (memory_identifier_string): Remove.
7761         (get_reference_vars_info): Fix indenting.
7762         (set_reference_vars_info): Likewise.
7763         (get_reference_optimization_summary): New.
7764         (set_reference_optimization_summary): New.
7765         (get_global_reference_vars_info): Remove.
7766         (ipa_reference_get_read_global): Remove.
7767         (ipa_reference_get_written_global): Remove.
7768         (ipa_reference_get_not_read_global): Update.
7769         (ipa_reference_get_not_written_global): Update.
7770         (is_proper_for_analysis): Outlaw addressable.
7771         (propagate_bits): Update for new datastructures.
7772         (analyze_variable): Remove.
7773         (init_function_info): Update for new datastructures.
7774         (clean_function_local_data): Remove.
7775         (clean_function): Remove.
7776         (copy_global_bitmap): Use optimizations_summary_obstack.
7777         (duplicate_node_data): Duplicate optimization summary only.
7778         (remove_node_data): Remove optimization summary only.
7779         (generate_summary): Do not analyze variables; do not compute
7780         module_statics_escape; do not prune solutions by it.
7781         (read_write_all_from_decl): Fix typos in comments.
7782         (propagate): Doscover readonly and nonaddressable first;
7783         update for new datastructures; share global bitmaps.
7784         * ipa-reference.h (ipa_reference_get_read_global,
7785         ipa_reference_get_written_global): Remove.
7786         * ipa-pure-const.c (check_stmt): Do not use memory_identifier_string.
7787         * Makefile.in: Remove ipa-refereference from GT files.
7789 2010-05-14  Jakub Jelinek  <jakub@redhat.com>
7791         PR debug/44112
7792         * dwarf2out.c (resolve_one_addr): Check TREE_ASM_WRITTEN
7793         for all SYMBOL_REF_DECLs.
7795 2010-05-14  Jan Hubicka  <jh@suse.cz>
7797         * cgraph.h (ipa_discover_readonly_nonaddressable_vars): Declare.
7798         (varpool_all_refs_explicit_p): New inline function.
7799         * ipa-reference.c: Update comment.
7800         (module_statics_written): Remove.
7801         (get_static_decl): Remove.
7802         (ipa_init): Do not initialize module_statics_written.
7803         (analyze_function): Likewise.
7804         (generate_summary): Likewise; do not compute module_statics_readonly
7805         and do not update variable flags.
7806         (propagate): Call ipa_discover_readonly_nonaddressable_vars.
7807         * ipa.c: Inlucde flags.h
7808         (cgraph_local_node_p): New.
7809         (cgraph_remove_unreachable_nodes): Return early when not optimizing;
7810         promote functions to local.
7811         (ipa_discover_readonly_nonaddressable_vars): New function.
7812         (function_and_variable_visibility): Use cgraph_local_node_p.
7813         * varpool.c (varpool_finalize_decl): Set force_output for
7814         DECL_PRESERVE_P vars.
7816 2010-05-14  Jan Hubicka  <jh@suse.cz>
7818         * ipa.c (cgraph_remove_unreachable_nodes): Revert accidental commit.
7820 2010-05-14  Richard Guenther  <rguenther@suse.de>
7822         PR tree-optimization/44119
7823         * tree-ssa-pre.c (eliminate): Properly mark replacement of
7824         a PHI node necessary.
7826 2010-05-14  Eric Botcazou  <ebotcazou@adacore.com>
7828         * tree.h (TREE_ADDRESSABLE): Remove bogus usage for FIELD_DECL.
7830 2010-05-14  Jason Merrill  <jason@redhat.com>
7832         PR c++/44127
7833         * gimple.h (enum gf_mask): Add GF_CALL_NOTHROW.
7834         (gimple_call_set_nothrow): New.
7835         * gimple.c (gimple_build_call_from_tree): Call it.
7836         (gimple_call_flags): Set ECF_NOTHROW from GF_CALL_NOTHROW.
7838         PR c++/44127
7839         * gimplify.c (gimplify_seq_add_stmt): No longer static.
7840         * gimple.h: Declare it.
7841         * gimple.c (gimple_build_eh_filter): No ops.
7843 2010-05-14  Jan Hubicka  <jh@suse.cz>
7845         * ipa.c (enqueue_cgraph_node): Update comment; do not re-enqueue
7846         nodes already in queue.
7847         (cgraph_remove_unreachable_nodes): Cleanup; fix problem with
7848         re-enqueueing node.
7850 2010-05-14  Jakub Jelinek  <jakub@redhat.com>
7852         PR debug/44136
7853         * cfgexpand.c (expand_debug_expr): If non-memory op0
7854         has BLKmode, return NULL.
7856 2010-05-14  Harsha Jagasia  <harsha.jagasia@amd.com>
7858         * config.gcc: Add support for --with-cpu option for bdver1.
7859         * config/i386/i386.h (TARGET_BDVER1): New macro.
7860         (ix86_tune_indices): Change SSE_UNALIGNED_MOVE_OPTIMAL
7861         to SSE_UNALIGNED_LOAD_OPTIMAL. Add SSE_UNALIGNED_STORE_OPTIMAL.
7862         (ix86_tune_features) :Change SSE_UNALIGNED_MOVE_OPTIMAL
7863         to SSE_UNALIGNED_LOAD_OPTIMAL. Add SSE_UNALIGNED_STORE_OPTIMAL.
7864         Add SSE_PACKED_SINGLE_INSN_OPTIMAL.
7865         (TARGET_CPU_DEFAULT_NAMES): Add bdver1.
7866         (processor_type): Add PROCESSOR_BDVER1.
7867         * config/i386/i386.md: Add bdver1 as a new cpu attribute to match
7868         processor_type in config/i386/i386.h.
7869         Add check for TARGET_SSE_PACKED_SINGLE_INSN_OPTIMAL to emit
7870         movaps <reg, reg> instead of movapd <reg, reg> when replacing
7871         movsd <reg, reg> or movss <reg, reg> for SSE and AVX.
7872         Add check for  TARGET_SSE_PACKED_SINGLE_INSN_OPTIMAL
7873         to emit packed xor instead of packed double/packed integer
7874         xor for SSE and AVX when moving a zero value.
7875         * config/i386/sse.md: Add check for
7876         TARGET_SSE_PACKED_SINGLE_INSN_OPTIMAL to emit movaps instead of
7877         movapd/movdqa for SSE and AVX.
7878         Add check for TARGET_SSE_PACKED_SINGLE_INSN_OPTIMAL to emit packed
7879         single logical operations i.e and, or and xor instead of packed double
7880         logical operations for SSE and AVX.
7881         * config/i386/i386-c.c (ix86_target_macros_internal):
7882         Add PROCESSOR_BDVER1.
7883         * config/i386/driver-i386.c: Turn on -mtune=native for BDVER1.
7884         (has_fma4, has_xop): New.
7885         * config/i386/i386.c (bdver1_cost): New variable.
7886         (m_BDVER1): New macro.
7887         (m_AMD_MULTIPLE): Add m_BDVER1.
7888         (x86_tune_use_leave, x86_tune_push_memory, x86_tune_unroll_strlen,
7889         x86_tune_deep_branch_prediction, x86_tune_use_sahf, x86_tune_movx,
7890         x86_tune_use_simode_fiop, x86_tune_promote_qimode,
7891         x86_tune_add_esp_8, x86_tune_tune_sub_esp_4, x86_tune_sub_esp_8,
7892         x86_tune_integer_dfmode_moves, x86_tune_partial_reg_dependency,
7893         x86_tune_sse_partial_reg_dependency,
7894         x86_tune_sse_unaligned_load_optimal,
7895         x86_tune_sse_unaligned_store_optimal, x86_tune_sse_typeless_stores,
7896         x86_tune_memory_mismatch_stall, x86_tune_use_ffreep,
7897         x86_tune_inter_unit_moves, x86_tune_inter_unit_conversions,
7898         x86_tune_use_bt, x86_tune_pad_returns, x86_tune_slow_imul_imm32_mem,
7899         x86_tune_slow_imul_imm8, x86_tune_fuse_cmp_and_branch):
7900         Enable/disable for bdver1.
7901         (processor_target_table): Add bdver1_cost.
7902         (cpu_names): Add bdver1.
7903         (override_options): Set up PROCESSOR_BDVER1 for bdver1 entry in
7904          processor_alias_table.
7905         (ix86_expand_vector_move_misalign): Change.
7906         TARGET_SSE_UNALIGNED_MOVE_OPTIMAL to TARGET_SSE_UNALIGNED_LOAD_OPTIMAL.
7907         Check for TARGET_SSE_UNALIGNED_STORE_OPTIMAL.
7908         Check for TARGET_SSE_PACKED_SINGLE_INSN_OPTIMAL to emit movups instead
7909         of movupd/movdqu for SSE and AVX.
7910         (ix86_tune_issue_rate): Add PROCESSOR_BDVER1.
7911         (ix86_tune_adjust_cost): Add code for bdver1.
7912         (standard_sse_constant_opcode): Add check for
7913         TARGET_SSE_PACKED_SINGLE_INSN_OPTIMAL to emit packed single xor instead
7914         of packed double xor for SSE and AVX.
7916 2010-05-14  Pat Haugen  <pthaugen@us.ibm.com>
7918         * tree-ssa-loop.prefetch.c (prune_ref_by_group_reuse): Cast abs()
7919         result to unsigned.
7921 2010-05-14  Tristan Gingold  <gingold@adacore.com>
7923         * toplev.c (default_debug_hooks): Remove this variable.
7924         (process_options): Remove assignments to default_debug_hooks.
7926 2010-05-14  Martin Jambor  <mjambor@suse.cz>
7928         * langhooks-def.h (LANG_HOOKS_FOLD_OBJ_TYPE_REF): Remove.
7929         (LANG_HOOKS_INITIALIZER): Remove LANG_HOOKS_FOLD_OBJ_TYPE_REF.
7930         * langhooks.h (struct lang_hooks_for_decls): Removed field
7931         fold_obj_type_ref.
7932         * tree.c (free_lang_data): Remove assignment to
7933         lang_hooks.fold_obj_type_ref.
7934         * tree.def (OBJ_TYPE_REF): Update comment.
7936 2010-05-14  Richard Guenther  <rguenther@suse.de>
7938         PR tree-optimization/44124
7939         * tree-ssa-sccvn.c (vn_nary_may_trap): Fix invalid memory access.
7941 2010-05-14  Alan Modra  <amodra@gmail.com>
7943         PR target/44075
7944         * config/rs6000/rs6000.c (struct machine_function): Reorder
7945         fields for better packing.  Add lr_save_state.
7946         (rs6000_ra_ever_killed): Return lr_save_state if set.
7947         (rs6000_emit_eh_reg_restore): Set lr_save_state.
7949 2010-05-13  Jan Hubicka  <jh@suse.cz>
7951         * varpool.c (decide_is_variable_needed): Drop code checking
7952         TREE_SYMBOL_REFERENCED.
7954 2010-05-13  Jan Hubicka  <jh@suse.cz>
7956         * final.c (output_addr_const): Do not call mark_decl_referenced.
7957         * cgraphunit.c (process_function_and_variable_attributes): Use
7958         mark_needed_node dirrectly.
7959         (assemble_thunk): Do not call mark_decl_referenced.
7961 2010-05-13  Anatoly Sokolov  <aesok@post.ru>
7963         * targhooks.c (default_mode_dependent_address_p): Cast 'addr' to rtx.
7965 2010-05-13  Jeff Law  <law@redhat.com>
7967         * ira-conflicts.c (print_allocno_conflicts): New function broken out
7968         from...
7969         (print_conflicts): Call print_allocno_conflicts.
7971 2010-05-13  Jakub Jelinek  <jakub@redhat.com>
7973         PR debug/44104
7974         * dwarf2out.c (modified_type_die): Don't dereference mod_type_die
7975         if it is NULL.
7977 2010-05-13  Kai Tietz  <kai.tietz@onevision.com>
7979         * config.gcc (i[34567]86-*-mingw* | x86_64-*-mingw*): Choose
7980         t-mingw-w64 or t-mingw-w32 for multilib configuration.
7981         * config/i386/t-mingw-w32: New.
7982         * config/i386/t-mingw-w64 (MULTILIB_OSDIRNAMES): Change lib64 to lib.
7984 2010-05-13  Martin Jambor  <mjambor@suse.cz>
7986         * gimple.c (gimple_fold_obj_type_ref): Removed (a replacement moved to
7987         gimple-fold.c).
7988         * gimple-fold.c (get_base_binfo_for_type): New function.
7989         (gimple_get_relevant_ref_binfo): Likewise.
7990         (gimple_fold_obj_type_ref_known_binfo): Likewise.
7991         (gimple_fold_obj_type_ref): Likewise.
7992         (fold_gimple_call): Simplify condition for folding virtual calls
7993         and call gimple_fold_obj_type_ref.
7994         * gimple.h (gimple_get_relevant_ref_binfo): Declare.
7995         (gimple_fold_obj_type_ref_known_binfo): Likewise.
7997 2010-05-13  Andreas Schwab  <schwab@linux-m68k.org>
7999         * config/rs6000/rs6000-protos.h
8000         (rs6000_mode_dependent_address_ptr): Change argument to const_rtx.
8001         * config/rs6000/rs6000.c (rs6000_mode_dependent_address)
8002         (rs6000_debug_mode_dependent_address)
8003         (rs6000_mode_dependent_address_ptr): Likewise.
8005 2010-05-13  Jakub Jelinek  <jakub@redhat.com>
8007         PR debug/43983
8008         * var-tracking.c (track_expr_p): Allow tracking of variables optimized
8009         by SRA.
8010         * Makefile.in (dwarf2out.o): Depend on $(TREE_FLOW_H).
8011         * tree-sra.c (create_access_replacement): Call unshare_expr before
8012         passing expr to SET_DECL_DEBUG_EXPR, and remove any SSA_NAMEs from it.
8013         * dwarf2out.c: Include tree-flow.h.
8014         (struct var_loc_node): Rename var_loc_note field to loc, add comment.
8015         (size_of_loc_descr, output_loc_operands, output_loc_operands_raw):
8016         Handle DW_OP_bit_piece.
8017         (decl_piece_bitsize, decl_piece_varloc_ptr, decl_piece_node,
8018         construct_piece_list, adjust_piece_list): New functions.
8019         (add_var_loc_to_decl): Handle SRA optimized variables.
8020         Adjust for var_loc_note to loc field renaming.
8021         (dw_loc_list_1): For WANT_ADDRESS == 2 prefer DECL_MODE of decl
8022         in VAR_LOCATION note.
8023         (new_loc_descr_op_bit_piece): New function.
8024         (dw_sra_loc_expr): New function.
8025         (dw_loc_list): Use it.  Don't handle the last range after the
8026         loop, handle it inside of the loop.  Adjust for var_loc_note
8027         to loc field renaming.
8028         (add_location_or_const_value_attribute): Only special case
8029         single entry loc lists if loc is NOTE_P.  Adjust for
8030         var_loc_note to loc field renaming.
8031         (dwarf2out_var_location): Don't set newloc->var_loc_note
8032         and newloc->next here.
8034 2010-05-12  Jan Hubicka  <jh@suse.cz>
8036         * cgraph.c (cgraph_mark_address_taken_node): No longer imply needed
8037         flag.
8038         * cgraph.h (cgraph_only_called_directly_p,
8039         cgraph_can_remove_if_no_direct_calls_p): test address_taken flag.
8040         (cgraph_can_remove_if_no_direct_calls_and_refs_p): New function.
8041         * cgraphunit.c (cgraph_mark_functions_to_output): Test address_taken.
8042         (assemble
8043         * ipa.c (cgraph_remove_unreachable_nodes): Use
8044         cgraph_can_remove_if_no_direct_calls_and_refs_p; clear address_taken
8045         flags.
8046         * tree-inline.c (copy_bb): Check address_taken flag.
8047         * tree-profile.c (tree_gen_ic_func_profiler): Check address_taken and
8048         externally_visible flag.
8050 2010-05-12  Jason Merrill  <jason@redhat.com>
8052         PR bootstrap/44048
8053         PR target/44099
8054         * dbxout.c (dbxout_type): Remove NULLPTR_TYPE handling.
8055         * sdbout.c (plain_type_1): Likewise.
8056         * dwarf2out.c (is_base_type): Likewise.
8057         (gen_type_die_with_usage): Likewise.  Generate
8058         DW_TAG_unspecified_type for any LANG_TYPE.
8060 2010-05-12  Jan Hubicka  <jh@suse.cz>
8062         * cgraphbuild.c (build_cgraph_edges, rebuild_cgraph_edges): Build
8063         indrect edges too.
8064         * cgraph.c (cgraph_create_indirect_edge): Take ecf_flags argument.
8065         (cgraph_clone_edge): Update.
8066         (cgraph_node_remove_callees): Remove indirect calls too.
8067         * cgraph.h (cgraph_indirect_call_info): Add ecf_flags.
8068         (cgraph_create_indirect_edge): Update prototype.
8069         * ipa-reference.c (has_proper_scope_for_analysis): Rename to
8070         is_proper_for_analysis.
8071         (add_new_function, visited_nodes, function_insertion_hook_holder,
8072         get_local_reference_vars_info, mark_address_taken, mark_address,
8073         mark_load, mark_store, check_asm_memory_clobber, check_call,
8074         scan_stmt_for_static_refs, scan_initializer_for_static_refs): Remove.
8075         (ipa_init): Do not initialize visited_nodes;
8076         function_insertion_hook_holder.
8077         (analyze_variable): Rewrite.
8078         (analyze_function): Rewrite.
8079         (copy_local_bitmap): Remove.
8080         (duplicate_node_dat): Do not duplicate local info.
8081         (generate_summary): Simplify to only walk cgraph.
8082         (write_node_summary_p, ipa_reference_write_summary,
8083         ipa_reference_read_summary): Remove.
8084         (propagate): Do not remove function insertion;
8085         generate summary.
8086         (pass_ipa_reference): NULLify summary handling fields.
8087         * lto-cgraph.c (lto_output_edge): Output ecf_flags.
8088         (input_edge): Input ecf_flags.
8089         * ipa-prop.c (ipa_note_parm_call): Expect edge to be around.
8090         (update_indirect_edges_after_inlining): Ignore edges with unknown
8091         param.
8093 2010-05-12  Sriraman Tallam  <tmsriram@google.com>
8095         * implicit-zee.c: New file.
8096         * tree-pass.h (pass_implicit_zee): Declare.
8097         * passes.c (init_optimization_passes): Add zee pass.
8098         * common.opt (fzee): New flag.
8099         * timevar.def (TV_ZEE): Define.
8100         * config/i386/i386.c (optimization_options): Turn on ZEE for level 2
8101         and beyond.
8102         * Makefile.in (implicit-zee.o): Add new build file.
8104 2010-05-12  Kazu Hirata  <kazu@codesourcery.com>
8105             Nathan Froyd  <froydnj@codesourcery.com>
8107         * c-common.c (sync_resolve_params): Remove write-only variable.
8109 2010-05-12  Anatoly Sokolov  <aesok@post.ru>
8111         * target.h (struct gcc_target): Add mode_dependent_address_p field.
8112         * target-def.h (TARGET_MODE_DEPENDENT_ADDRESS_P): New.
8113         (TARGET_INITIALIZER): Use TARGET_MODE_DEPENDENT_ADDRESS_P.
8114         * targhooks.c (default_mode_dependent_address_p): New function.
8115         * targhooks.h (default_mode_dependent_address_p): Declare function.
8116         * doc/tm.texi (TARGET_MODE_DEPENDENT_ADDRESS_P): New.
8117         (GO_IF_MODE_DEPENDENT_ADDRESS): Update.
8118         * recog.c (mode_dependent_address_p): Call mode_dependent_address_p
8119         target hook. Change return type to bool.
8120         * recog.h (mode_dependent_address_p): Change return type to bool.
8122 2010-05-12  Kazu Hirata  <kazu@codesourcery.com>
8123             Nathan Froyd  <froydnj@codesourcery.com>
8125         * tree-mudflap.c (build_function_type_0, build_function_type_1,
8126         build_function_type_2, build_function_type_3): Remove.
8127         (mudflap_init): Use build_function_type_list.
8129 2010-05-12  Kazu Hirata  <kazu@codesourcery.com>
8130             Nathan Froyd  <froydnj@codesourcery.com>
8132         * coverage.c (build_fn_info_value): Call build_constructor instead of
8133         build_constructor_from_list.
8134         (build_ctr_info_value): Likewise.
8135         (build_gcov_info): Likewise.
8137 2010-05-12  Nathan Froyd  <froydnj@codesourcery.com>
8139         * tree.c (build_constructor): Compute TREE_CONSTANT for the
8140         resultant constructor.
8141         (build_constructor_single): Don't set TREE_CONSTANT.
8142         (build_constructor_from_list): Don't compute TREE_CONSTANT.
8144 2010-05-12  Jan Hubicka  <jh@suse.cz>
8146         * cgraph.h (struct varpool_node): Add aux.
8147         * varasm.c (find_decl_and_mark_needed): Force output of varpool nodes.
8148         * varpool.c (varpool_remove_node): Do not remove initializer.
8149         (varpool_reset_queue): Export.
8150         (varpool_finalize_decl): Volatile vars are forced to be output.
8151         * lto-symtab.c (lto_varpool_replace_node): Clear out initializer of
8152         replaced decl.
8153         * ipa.c (enqueue_cgraph_node, enqueue_varpool_node,
8154         process_references, varpool_can_remove_if_no_refs): New functions.
8155         (cgraph_remove_unreachable_nodes): Handle variables too.
8157 2010-05-12  H.J. Lu  <hongjiu.lu@intel.com>
8159         PR target/44088
8160         * config/i386/sse.md (*avx_vmmaskcmp<mode>3): New.
8162 2010-05-12  Jakub Jelinek  <jakub@redhat.com>
8164         PR middle-end/44085
8165         * gimplify.c (enum omp_region_type): Add ORT_UNTIED_TASK,
8166         change value of ORT_TASK.
8167         (new_omp_context): Handle ORT_UNTIED_TASK like ORT_TASK.
8168         (omp_notice_threadprivate_variable): New function.
8169         (omp_notice_variable): Call it for threadprivate variables.
8170         If enclosing ctx is a task, print enclosing task rather than
8171         enclosing parallel.  Handle ORT_UNTIED_TASK like ORT_TASK.
8172         (gimplify_omp_task): Pass ORT_UNTIED_TASK instead of ORT_TASK
8173         if task has untied clause.
8175         PR debug/42278
8176         * dwarf2out.c (base_type_die): Don't add name attribute here.
8177         (modified_type_die): Instead of sizetype use
8178         its underlying original type.  If a DW_TAG_base_type doesn't
8179         have name added, add __unknown__.
8180         (dwarf2out_imported_module_or_decl_1): Don't call base_type_die,
8181         always call force_type_die instead.
8183 2010-05-12  Maxim Kuvyrkov  <maxim@codesourcery.com>
8185         * targhooks.c (default_stack_protect_guard): Avoid sharing RTL
8186         for __stack_chk_guard.
8188 2010-05-11  Jakub Jelinek  <jakub@redhat.com>
8190         * c-opts.c (c_common_parse_file): If start_end_main_source_file,
8191         don't call start_source_file debug hook here...
8192         (finish_options): ... but here, after outputting predefined and
8193         command line defines and undefs.
8195         PR middle-end/44071
8196         * cfglayout.c (fixup_reorder_chain): Allow asm goto to have
8197         no fallthru edge.
8198         * cfgcleanup.c (try_optimize_cfg): When in cfglayout mode
8199         optimizing away empty bb with no successors, move over its
8200         footer chain to fallthru predecessor.
8201         * cfgrtl.c (patch_jump_insn): Update also REG_LABEL_OPERAND.
8202         (rtl_split_edge): For asm goto call patch_jump_insn even if
8203         splitting fallthru edge.
8205         PR c++/44059
8206         * config/elfos.h (ASM_DECLARE_OBJECT_NAME): Use qnu_unique_object
8207         even for DECL_ONE_ONLY DECL_ARTIFICIAL !TREE_READONLY decls.
8208         * config/alpha/elf.h (ASM_DECLARE_OBJECT_NAME): Likewise.
8209         * dwarf2asm.c (dw2_output_indirect_constant_1): Set TREE_READONLY
8210         on DW.ref.* decls.
8212         PR c++/44062
8213         * c-parser.c (c_parser_expression): Mark LHS of a comma
8214         expression as read if it is a decl, handled component or
8215         COMPOUND_EXPR with that on the RHS.
8216         * c-typeck.c (c_process_expr_stmt): Mark RHS of COMPOUND_EXPR
8217         if it is a decl or handled component.
8219 2010-05-11  Jan Hubicka  <jh@suse.cz>
8221         * lto-symtab.c (lto_symtab_free): New function.
8222         * lto-streamer.h (lto_symtab_free): Declare.
8224 2010-05-11  Jan Hubicka  <jh@suse.cz>
8226         * lto-cgraph.c (reachable_from_other_partition_p): Export; do not assume
8227         that if function is needed it is reachable.
8228         (lto_output_node): See if it the function is reachable or referenced.
8229         (output_cgraph): Update call of lto_output_node.
8230         * lto-streamer.h (reachable_from_other_partition_p): Declare.
8232 2010-05-11  Jan Hubicka  <jh@suse.cz>
8234         * crtstuff.c (__JCR_LIST__, __DTOR_END__, __JCR_END__, __FRAME_END__):
8235         Mark as used.
8237 2010-05-11  Jan Hubicka  <jh@suse.cz>
8239         PR tree-optimize/44063
8240         * ipa-inline.c (cgraph_edge_badness): Move always inlines to top of
8241         queue.
8242         (cgraph_decide_inlining_of_small_function): Skip check when disrgarding
8243         limits.
8244         (estimate_function_body_sizes): Compute sizes even when disregarding.
8246 2010-05-11  Kai Tietz  <kai.tietz@onevision.com>
8248         * collect2.c (maybe_lto_object_file): Add x64-coff magic and check.
8250 2010-05-11  Jan Hubicka  <jh@suse.cz>
8252         * lto-cgraph.c (output_cgraph): Remove loop adding all varpool nodes
8253         into every boundary.
8255 2010-05-11  Jan Hubicka  <jh@suse.cz>
8257         * matrix-reorg.c (matrix_reorg): Rebuild edges.
8259 2010-05-11  Jan Hubicka  <jh@suse.cz>
8261         * lto-streamer.c (lto_streamer_cache_add_to_node_array,
8262         lto_streamer_cache_delete): Put nodes into heap.
8263         * lto-streamer.h (struct lto_streamer_cache_d): Nodes vector is in
8264         heap.
8266 2010-05-11  Jan Hubicka  <jh@suse.cz>
8268         * cgraphbuild.c (cgraph_rebuild_references): New.
8269         * cgraph.c (cgraph_mark_reachable_node): Accept references to optimized
8270         out extern inlines.
8271         * cgraph.h (cgraph_rebuild_references): Declare.
8272         * tree-inline.c (tree_function_versioning): Use it.
8273         * ipa-struct-reorg.c (do_reorg_for_func): Likewise.
8275 2010-05-11  Jan Hubicka  <jh@suse.cz>
8277         * cgraph.c: Include ipa-utils.h
8278         (cgraph_create_virtual_clone): Update references.
8279         * Makefile.in (cgraph.o): Add dependency at ipa-utils.h
8281 2010-05-11  Christian Borntraeger  <borntraeger@de.ibm.com>
8283         * tree-ssa-loop-prefetch.c (prune_ref_by_group_reuse): Reset
8284         prefetch_before to PREFETCH_ALL if to accesses "meet" beyond
8285         cache size.
8287 2010-05-11  Christian Borntraeger  <borntraeger@de.ibm.com>
8289         * tree-ssa-loop-prefetch.c: Add debug for dropped prefetches.
8291 2010-05-11  Jakub Jelinek  <jakub@redhat.com>
8293         * gcc.c (execute): For -### don't quote arguments that
8294         contain just alphanumerics and _/-. characters.
8295         * doc/invoke.texi: Document that change for -###.
8297         PR debug/44023
8298         * df-problems.c (struct dead_debug): Add to_rescan field.
8299         (dead_debug_init): Clear to_rescan field.
8300         (dead_debug_finish): Rescan all debug insns in to_rescan
8301         bitmap and free the bitmap.
8302         (dead_debug_insert_before): Instead of rescanning debug insns
8303         immediately queue their rescanning until dead_debug_finish.
8304         (df_note_bb_compute): After dead_debug_add do continue instead
8305         of break.
8307 2010-05-10  Jakub Jelinek  <jakub@redhat.com>
8309         PR debug/44028
8310         * haifa-sched.c (schedule_insn): When clearing INSN_VAR_LOCATION_LOC,
8311         clear also INSN_REG_USE_LIST.
8313 2010-05-10  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
8315         * config/mips/mips.c (TARGET_SMALL_REGISTER_CLASSES_FOR_MODE_P): Undef.
8317 2010-05-10  Jan Hubicka  <jh@suse.cz>
8319         * lto-stramer-out.c (produce_asm_for_decls): Correct accidentally
8320         commited change.
8322 2010-05-10  Jan Hubicka  <jh@suse.cz>
8324         * passes.c (ipa_write_summaries_1, ipa_write_optimization_summaries):
8325         Allocate encoders.
8326         * lto-section-out.c (lto_new_out_decl_state): Do not allocate it here.
8327         * lto-streamer.c (lto_streamer_cache_insert_1): Use alloc pool.
8328         (lto_streamer_cache_create): Init alloc pool.
8329         (lto_streamer_cache_delete): Free alloc pool.
8330         * lto-streamer.h: Include alloc pool.
8331         (lto_streamer_cache_d): Use alloc pool.
8332         * lto-stramer-out.c (produce_asm_for_decls): Delete fn_out_states.
8334 2010-05-10  Jan Hubicka  <jh@suse.cz>
8336         * Makefile.in (cgraphbuild.o): Add dependency on except.h.
8337         * cgraphbuild.c: Include except.h
8338         (record_type_list, record_eh_tables): New function.
8339         (build_cgraph_edges, rebuild_cgraph_edges): Use it.
8341 2010-05-10  Jan Hubicka  <jh@suse.cz>
8343         * crtstuff.c (force_to_data, __do_global_dtors_aux_fini_array_entry,
8344         __frame_dummy_init_array_entry, force_to_data): Attribute as used
8345         rather than unused.
8347 2010-05-10  Michael Matz  <matz@suse.de>
8349         * tree-ssa-reassoc.c (undistribute_ops_list): Use create_tmp_reg.
8350         (can_reassociate_p): Use FLOAT_TYPE_P.
8351         * tree-vectorizer.h (vect_is_simple_reduction): Rename to ...
8352         (vect_force_simple_reduction): ... this.
8353         * tree-parloops.c (gather_scalar_reductions): Use
8354         vect_force_simple_reduction.
8355         * tree-vect-loop.c (vect_is_simple_reduction_1): Rename from
8356         vect_is_simple_reduction, add modify argument, if true rewrite
8357         "a-b" into "a+(-b)".
8358         (vect_is_simple_reduction, vect_force_simple_reduction): New
8359         functions.
8360         (vect_analyze_scalar_cycles_1): Use vect_force_simple_reduction.
8362 2010-05-10  H.J. Lu  <hongjiu.lu@intel.com>
8363             Vladimir Makarov  <vmakarov@redhat.com>
8365         PR rtl-optimization/44012
8366         * ira-build.c (remove_unnecessary_allocnos): Nullify
8367         regno_allocno_map of the removed allocno.
8369 2010-05-10  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
8371         * configure.ac (gcc_cv_ld_eh_gc_sections): Redirect objdump errors
8372         to /dev/null.
8373         * configure: Regenerate.
8375 2010-05-10  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
8377         * config/sol2.c (solaris_assemble_visibility): Declare decl, vis
8378         unused.
8379         Define visibility_types, name, type inside HAVE_GAS_HIDDEN.
8380         * configure.ac (gcc_cv_ld_hidden): Explain stages of visibility
8381         support in Sun ld.
8382         * configure: Regenerate.
8384 2010-05-10  Richard Guenther  <rguenther@suse.de>
8386         * lto-symtab.c (lto_symtab_entry_marked_p): Make entry
8387         marked if the entry identifier is marked.
8389 2010-05-10  Richard Guenther  <rguenther@suse.de>
8391         * c-common.c (struct c_common_attributes): Add fnspec attribute.
8392         (handle_fnspec_attribute): New function.
8393         * gimple.h (gimple_call_return_flags): Declare.
8394         (gimple_call_arg_flags): Likewise.
8395         * gimple.c (gimple_call_arg_flags): New function.
8396         (gimple_call_return_flags): Likewise.
8397         * tree.h (EAF_DIRECT, EAF_NOCLOBBER, EAF_NOESCAPE, EAF_UNUSED):
8398         New argument flags.
8399         (ERF_RETURN_ARG_MASK, ERF_RETURNS_ARG, ERF_NOALIAS): New function
8400         return value flags.
8401         * tree-ssa-alias.c (ref_maybe_used_by_call_p_1): Skip unused args.
8402         * tree-ssa-structalias.c (make_constraint_from_heapvar): Split
8403         main work to ...
8404         (make_heapvar_for): ... this new function.
8405         (handle_rhs_call): Handle fnspec attribute argument specifiers.
8406         (handle_lhs_call): Likewise.
8407         (find_func_aliases): Adjust.
8409 2010-05-10  Richard Guenther  <rguenther@suse.de>
8411         PR tree-optimization/44050
8412         * tree-inline.c (tree_function_versioning): Clone the ipa-pta flag.
8414 2010-05-10  Wei Guozhi  <carrot@google.com>
8416         PR target/42879
8417         * config/arm/thumb2.md (thumb2_tlobits_cbranch): New insn pattern.
8419 2010-05-09  Joseph Myers  <joseph@codesourcery.com>
8421         PR c/10676
8422         * c-typeck.c (lookup_field): Take a type directly.  Update
8423         recursive calls.
8424         (build_component_ref): Update call to lookup_field.
8425         (set_init_label): Use lookup_field to find initialized field.
8426         Handle returned list of fields like a sequence of designators.
8428 2010-05-09  Richard Guenther  <rguenther@suse.de>
8430         PR middle-end/44024
8431         * fold-const.c (tree_single_nonzero_warnv_p): Properly
8432         handle &FUNCTION_DECL.
8434 2010-05-09  Joseph Myers  <joseph@codesourcery.com>
8436         PR c/4784
8437         * c-decl.c (detect_field_duplicates_hash): New.  Handle anonymous
8438         structures and unions recursively.
8439         (detect_field_duplicates): Move duplicate detection with a hash to
8440         detect_field_duplicates_hash.  Always use a hash if anonymous
8441         structures or unions are present.
8442         * doc/extend.texi (Unnamed Fields): Document that duplicate fields
8443         give errors.
8445 2010-05-09  H.J. Lu  <hongjiu.lu@intel.com>
8447         PR target/44046
8448         * config/i386/driver-i386.c (host_detect_local_cpu): Properly
8449         detect Atom, Core 2 and Core i7.
8451 2010-05-09  Richard Guenther  <rguenther@suse.de>
8453         * gcc.c (store_arg): Handle temporary file deletion for
8454         joined arguments.
8456 2010-05-09  Richard Guenther  <rguenther@suse.de>
8458         PR middle-end/44043
8459         * ipa-inline.c (estimate_function_body_sizes): Return after
8460         disregarding inline limits.
8462 2010-05-09  Richard Guenther  <rguenther@suse.de>
8464         * gcc.c (store_arg): Revert last change.
8466 2010-05-08  Sandra Loosemore  <sandra@codesourcery.com>
8468         PR middle-end/28685
8469         * tree-ssa-reassoc.c (eliminate_redundant_comparison): New function.
8470         (optimize_ops_list): Call it.
8472 2010-05-08  Richard Guenther  <rguenther@suse.de>
8474         PR tree-optimization/44030
8475         * tree-ssa-pre.c (eliminate): Copy NECESSARY flag.  Set
8476         NECESSARY flag if we propagate from a inserted expression.
8478 2010-05-08  Eric Botcazou  <ebotcazou@adacore.com>
8480         * gimple.c (gimple_types_compatible_p) <ARRAY_TYPE>: Treat bounds of
8481         domain types as equal if they are both PLACEHOLDER_EXPRs.
8483 2010-05-08  Richard Guenther  <rguenther@suse.de>
8485         * lto-wrapper.c (run_gcc): Remove linker output from
8486         command line for LTRANS invocation.
8488 2010-05-07  Steven Bosscher  <steven@gcc.gnu.org>
8490         * config.gcc (i[34567]86-*-darwin*, x86_64-*-darwin*): Add
8491         lto-macho as lto_binary_reader.
8492         * target.h (struct gcc_target): New hooks lto_start and lto_end.
8493         * target-def.h (TARGET_ASM_LTO_START, TARGET_ASM_LTO_END): Define.
8494         * cgraphunit.c (ipa_passes): Wrap LTO assembler output generation
8495         in lto_start and lto_end calls.
8496         (is_elf_or_coff): Rename to maybe_lto_object_file.  Add Mach-O
8497         magic numbers.
8498         (scan_prog_file): Update is_elf_or_coff call.
8499         * doc/tm.text (TARGET_ASM_LTO_START, TARGET_ASM_LTO_END): Document.
8501         * collect2.c (main): Fix enum comparison.
8503         * config/darwin-protos.h (darwin_asm_lto_start, darwin_asm_lto_end):
8504         Add prototypes.
8505         * darwin9.h (LINK_COMMAND_SPEC): Pass -flto and -fwhopr to the linker.
8506         * darwin.h (LINK_COMMAND_SPEC): Likewise.  Define TARGET_ASM_LTO_START
8507         and TARGET_ASM_LTO_END.
8508         * darwin.c: Include obstack.h and lto-streamer.h.
8509         (lto_section_names_offset, lto_section_names_obstack,
8510         lto_asm_out_file, lto_asm_out_name, saved_asm_out_file): New static
8511         global variables.
8512         (LTO_SEGMENT_NAME, LTO_NAMES_SECTION): New defines.
8513         (darwin_asm_lto_start): New function.  Redirect output to asm_out_file
8514         to a temporary file.
8515         (darwin_asm_lto_end): New function.  Restore asm_out_file.
8516         (darwin_asm_named_section): For LTO sections, replace the name with
8517         the offset of the section name in a string table, and build this
8518         table.
8519         (darwin_file_start): Initialize global vars for LTO support.
8520         (darwin_file_end): If output to asm_out_file was redirected, append it
8521         to the proper asm_out_file here.  Add the section names section.
8523 2010-05-07  Steven Bosscher  <steven@gcc.gnu.org>
8525         * c-pragma.c (pending_weak_d, pending_weak): New.
8526         (pending_weaks): Change the type to VEC((pending_weak,gc) *.
8527         (maybe_apply_pragma_weak, maybe_apply_pending_pragma_weaks,
8528         handle_pragma_weak): Update the uses of pending_weaks.
8530 2010-05-07  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
8532         PR documentation/44016
8533         * doc/standards.texi (Standards): Link to unversioned
8534         cxx0x_status.html page.
8536 2010-05-07  Iain Sandoe <iains@gcc.gnu.org>
8538         PR target/43708
8539         * config/darwin-c.c (darwin_pragma_unused): Set DECL_READ_P
8540         in addition to TREE_USED, to avoid "set but unused" warnings.
8542 2010-05-07  Changpeng Fang  <changpeng.fang@amd.com>
8544         * tree-ssa-loop-prefetch.c (TRIP_COUNT_TO_AHEAD_RATIO): New.
8545         (is_loop_prefetching_profitable): Do not insert prefetches
8546         when the trip count is not at least TRIP_COUNT_TO_AHEAD_RATIO
8547         times the prefetch ahead distance.
8549 2010-05-07  Changpeng Fang  <changpeng.fang@amd.com>
8551         * tree-ssa-loop-prefetch.c (is_loop_prefetching_profitable):
8552         Account for loop unrolling in the insn-to-prefetch ratio heuristic.
8553         (loop_prefetch_arrays): Pass to is_loop_prefetching_profitable
8554         the unroll_factor.
8556 2010-05-07  Changpeng Fang  <changpeng.fang@amd.com>
8558         * tree-ssa-loop-prefetch.c (is_loop_prefetching_profitable): Dump
8559         a diagnostic info when the insn-to-mem ratio is too small.
8561 2010-05-07  Richard Guenther <rguenther@suse.de>
8563         * gcc.c (LINK_COMMAND_SPEC): Provide a resolution file to
8564         the linker plugin.
8565         (store_arg): Queue temp_filename for deletion instead of
8566         the whole argument.
8568 2010-05-07  Richard Guenther  <rguenther@suse.de>
8570         * lto-wrapper.c (DUMPBASE_SUFFIX): Define.
8571         (run_gcc): Handle LTRANS phase invocation.
8572         * collect2.c (maybe_run_lto_and_relink): Do not set WPA_SAVE_LTRANS.
8574 2010-05-07  Jakub Jelinek  <jakub@redhat.com>
8576         * tree.h (TREE_ADDRESSABLE): Adjust comment to say that
8577         this is also meaningful on PARM_DECLs and RESULT_DECLs.
8579 2010-05-07  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
8581         * config/mips/iris6.h (LINK_SPEC): Don't pass -init, -fini with -r.
8583 2010-05-07  Richard Guenther  <rguenther@suse.de>
8585         PR tree-optimization/44020
8586         * tree-ssa-pre.c (execute_pre): Do not remove dead inserted
8587         code when PRE is not yet initialized.
8589 2010-05-07  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
8591         * config/mips/dbxmdebug.h: Remove.
8592         * config.gcc (mips-sgi-irix6.5*): Remove mips/dbxmdebug.h.
8594 2010-05-07  Shujing Zhao  <pearly.zhao@oracle.com>
8596         * c-typeck.c (build_binary_op): Warn ordered comparison of pointer
8597         with null pointer and also warn about ordered comparison of zero with
8598         pointer if -Wextra.
8600 2010-05-05  Andreas Simbuerger  <simbuerg@fim.uni-passau.de>
8602         * graphite-blocking.c
8603         (pbb_strip_mine_profitable_p): Replace Value with mpz_t.
8604         * graphite-clast-to-gimple.c
8605         (clast_to_gcc_expression): Same.
8606         (precision_for_value): Same.
8607         (precision_for_interval): Same.
8608         (gcc_type_for_interval): Same.
8609         (graphite_create_new_guard): Same.
8610         (compute_bounds_for_level): Same.
8611         (graphite_create_new_loop_guard): Same.
8612         * graphite-interchange.c
8613         (build_linearized_memory_access): Same.
8614         (pdr_stride_in_loop): Same.
8615         (memory_strides_in_loop_1): Same.
8616         (memory_strides_in_loop): Same.
8617         (extend_scattering): Same.
8618         (psct_scattering_dim_for_loop_depth): Same.
8619         (pbb_number_of_iterations): Same.
8620         * graphite-poly.h
8621         (debug_iteration_domains): Same.
8622         * graphite-ppl.c
8623         (new_Cloog_Domain_from_ppl_Pointset_Powerset): Same.
8624         (ppl_set_inhomogeneous_gmp): Same.
8625         (ppl_strip_loop): Same.
8626         (ppl_lexico_compare_linear_expressions): Same.
8627         (ppl_read_polyhedron_matrix): Same.
8628         (ppl_max_for_le_pointset): Same.
8629         * graphite-ppl.h
8630         (ppl_read_polyhedron_matrix): Same.
8631         (tree_int_to_gmp): Same.
8632         (gmp_cst_to_tree): Same.
8633         (ppl_set_inhomogeneous): Same.
8634         (ppl_set_inhomogeneous_tree): Same.
8635         (ppl_set_coef): Same.
8636         (ppl_set_coef_tree): Same.
8637         * graphite-sese-to-poly.c
8638         (build_pbb_scattering_polyhedrons): Same.
8639         (build_scop_scattering): Same.
8640         (scan_tree_for_params_right_scev): Same.
8641         (scan_tree_for_params): Same.
8642         (find_params_in_bb): Same.
8643         (find_scop_parameters): Same.
8644         (add_upper_bounds_from_estimated_nit): Same.
8645         (build_loop_iteration_domains): Same.
8646         (add_condition_to_domain): Same.
8647         (pdr_add_memory_accesses): Same.
8649 2010-05-05  Andreas Simbuerger  <simbuerg@fim.uni-passau.de>
8651         * graphite-blocking.c (pbb_strip_mine_profitable_p): Resolve
8652         CLooG's value_* macros to their respective mpz_* counterparts.
8653         * graphite-clast-to-gimple.c (clast_to_gcc_expression): Same.
8654         (graphite_create_new_loop_guard): Same.
8655         * graphite-interchange.c (build_linearized_memory_access): Same.
8656         (pdr_stride_in_loop): Same.
8657         (memory_strides_in_loop_1): Same.
8658         (1st_interchange_profitable_p): Same.
8659         * graphite-poly.c (extend_scattering): Same.
8660         (psct_scattering_dim_for_loop_depth): Same.
8661         (pbb_number_of_iterations): Same.
8662         (pbb_number_of_iterations_at_time): Same.
8663         * graphite-poly.h (new_1st_loop): Same.
8664         * graphite-ppl.c (cloog_matrix_to_ppl_constraint): Same.
8665         (oppose_constraint): Same.
8666         (insert_constraint_into_matrix): Same.
8667         (ppl_set_inhomogeneous_gmp): Same.
8668         (ppl_set_coef_gmp): Same.
8669         (ppl_strip_loop): Same.
8670         (ppl_lexico_compare_linear_expressions): Same.
8671         (ppl_max_for_le_pointset): Same.
8672         (ppl_min_for_le_pointset): Same.
8673         (ppl_build_realtion): Same.
8674         * graphite-ppl.h (gmp_cst_to_tree): Same.
8675         (ppl_set_inhomogeneous): Same.
8676         (ppl_set_inhomogeneous_tree): Same.
8677         (ppl_set_coef): Same.
8678         (ppl_set_coef_tree): Same.
8679         * graphite-sese-to-poly.c (build_pbb_scattering_polyhedrons): Same.
8680         (build_scop_scattering): Same.
8681         (add_value_to_dim): Same.
8682         (scan_tree_for_params_right_scev): Same.
8683         (scan_tree_for_params_int): Same.
8684         (scan_tree_for_params): Same.
8685         (find_params_in_bb): Same.
8686         (find_scop_parameters): Same.
8687         (add_upper_bounds_from_estimated_nit): Same.
8688         (build_loop_iteration_domains): Same.
8689         (create_linear_expr_from_tree): Same.
8690         (add_condition_to_domain): Same.
8691         (pdr_add_memory_accesses): Same.
8693 2010-05-06  Magnus Fromreide  <magfr@lysator.liu.se>
8694             Jason Merrill  <jason@redhat.com>
8696         * c-common.c (c_common_reswords): Add nullptr.
8697         * c-common.h: Add RID_NULLPTR.  Reorganize C++0x rids.
8698         * dwarf2out.c (is_base_type): Handle NULLPTR_TYPE.
8699         (gen_type_die_with_usage): Likewise.
8700         * dbxout.c (dbxout_type): Likewise.
8701         * sdbout.c (plain_type_1): Likewise.
8703 2010-05-06  Jason Merrill  <jason@redhat.com>
8705         * gimplify.c (gimplify_expr): Set GS_ALL_DONE when appropriate.
8706         Don't change GS_OK to GS_ALL_DONE.  Make sure that all cases set
8707         ret appropriately.
8708         (gimplify_compound_lval): Return GS_ALL_DONE as appropriate.
8710         * gimplify.c (gimplify_modify_expr_rhs): Don't return GS_OK for
8711         stripping WITH_SIZE_EXPR.
8712         (gimplify_expr) [MODIFY_EXPR]: Trust GS_OK even if the rhs didn't
8713         change.
8715 2010-05-06  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
8717         * config.gcc: Removed mips-sgi-irix5*, mips-sgi-irix6.[0-4]* from
8718         list of obsolete configurations.
8719         Disabled check for obsolete configurations.
8720         (mips-sgi-irix[56]*): Restrict to mips-sgi-irix6.5*.
8721         Removed support for previous versions.
8722         * config/mips/iris.h: Removed.
8723         * config/mips/iris5.h: Removed.
8724         * config/mips/iris6.h: Merged old iris.h contents.
8725         (TARGET_IRIX): Removed.
8726         (DRIVER_SELF_SPECS): Removed mabi=32.
8727         (IDENT_ASM_OP): Removed undef.
8728         (STARTFILE_SPEC): Removed mabi=32.
8729         (ENDFILE_SPEC): Likewise.
8730         (IRIX_SUBTARGET_LINK_SPEC): Likewise.
8731         (MACHINE_TYPE): Update for IRIX 6.5.
8732         * config/mips/mips.c (mips_build_builtin_va_list): Replaced
8733         TARGET_IRIX by TARGET_IRIX6.
8734         (mips_file_start): Likewise.
8735         (mips_output_external): Remove IRIX 5/6 O32 support.
8736         (mips_output_function_prologue): Likewise.
8737         * config/mips/mips.h (TARGET_GPWORD): Replaced TARGET_IRIX by
8738         TARGET_IRIX6.
8739         (TARGET_CPU_CPP_BUILTINS): Likewise.
8740         (TARGET_IRIX): Removed.
8741         * config/mips/t-iris6 (MULTILIB_OPTIONS): Removed mabi=32.
8742         (MULTILIB_DIRNAMES): Removed 32.
8743         (MULTILIB_OSDIRNAMES): Removed ../lib.
8744         * doc/install.texi (Prerequisites): Don't reference IRIX before 6.5.
8745         (Specific, mips-sgi-irix5): Document removal.
8746         (Specific, mips-sgi-irix6): Document IRIX 6.[0-4] and O32 ABI removal.
8747         Remove references to older IRIX 6 releases and the O32 ABI.
8749 2010-05-06  Jakub Jelinek  <jakub@redhat.com>
8751         PR bootstrap/43994
8752         * df-problems.c (dead_debug_insert_before): Use *DF_REF_REAL_LOC
8753         instead of DF_REF_REAL_REG.
8755 2010-05-06  Dave Korn  <dave.korn.cygwin@gmail.com>
8757         PR target/43888
8758         * config/i386/winnt.c (i386_pe_binds_local_p): Tweak weak symbol
8759         handling to still return true for x64 targets.
8761 2010-05-06  Maxim Kuvyrkov  <maxim@codesourcery.com>
8763         * config/m68k/uclinux.h (LIB_SPEC): Bring in sync with config/linux.h.
8765 2010-05-06  Jan Hubicka  <jh@suse.cz>
8767         PR tree-optimization/43791
8768         * ipa-inline.c (update_caller_keys): Remove bogus
8769         disregard_inline_limits check.
8771 2010-05-06  Michael Matz  <matz@suse.de>
8773         PR tree-optimization/43984
8774         * tree-ssa-pre.c (inserted_phi_names): Remove.
8775         (inserted_exprs): Change to bitmap.
8776         (create_expression_by_pieces): Set bits, don't append to vector.
8777         (insert_into_preds_of_block): Don't handle inserted_phi_names.
8778         (eliminate): Don't look at inserted_phi_names, remove deleted
8779         insns from inserted_exprs.
8780         (remove_dead_inserted_code): Adjust to use bitmaps instead of vectors.
8781         (init_pre, fini_pre): Allocate and free bitmaps.
8782         (execute_pre): Insert insns on edges before elimination.
8784 2010-05-06  Maxim Kuvyrkov  <maxim@codesourcery.com>
8786         * tree.c (initializer_zerop): Handle STRING_CST.
8788 2010-05-06  Manuel López-Ibáñez  <manu@gcc.gnu.org>
8790         PR 40989
8791         * doc/invoke.texi (Wimplicit): Document as C only.
8792         * opts.c (common_handle_option): Add argument kind.
8793         (handle_option): Rename as read_cmdline_option. Factor out code to...
8794         (handle_option): ... here. New.
8795         (handle_options): Rename as read_cmdline_options.
8796         (decode_options): Update call.
8797         (set_option): Use option index instead of option pointer. Classify
8798         diagnostics correctly.
8799         (enable_warning_as_error): Call handle_option.
8800         * opts.h (set_option): Update declaration.
8801         (handle_option): Declare.
8802         * langhooks.h (struct lang_hooks): Add argument kind to handle_option.
8803         * c.opt (Wimplicit,Wimplicit-int): Initialize to -1.
8804         * c-opts.c (set_Wimplicit): Delete.
8805         (c_family_lang_mask): New static constant.
8806         (c_common_handle_option): Add argument kind. Use handle_option
8807         instead of set_Wimplicit.
8808         (c_common_post_options): warn_implicit and warn_implicit_int
8809         are disabled by default.
8810         * c-common.c (warn_implicit): Do not define here.
8811         * c-common.h (warn_implicit): Do not declare here.
8812         (c_common_handle_option): Update declaration.
8813         * lto-opts.c (lto_reissue_options): Update call to set_option.
8815 2010-05-06  Richard Guenther  <rguenther@suse.de>
8817         PR tree-optimization/43571
8818         * domwalk.c (walk_dominator_tree): Walk the dominator
8819         sons in more optimal order.
8821 2010-05-06  Richard Guenther  <rguenther@suse.de>
8823         PR tree-optimization/43934
8824         * tree-ssa-loop-im.c (movement_possibility): Handle PHI nodes.
8825         (stmt_cost): Likewise.
8826         (extract_true_false_args_from_phi): New helper.
8827         (determine_max_movement): For PHI nodes verify we can hoist them
8828         and compute their cost.
8829         (determine_invariantness_stmt): Handle PHI nodes.
8830         (move_computations_stmt): Likewise.  Hoist PHI nodes in
8831         if-converted form using COND_EXPRs.
8832         (move_computations): Return TODO_cleanup_cfg if we hoisted PHI nodes.
8833         (tree_ssa_lim): Likewise.
8834         * tree-flow.h (tree_ssa_lim): Adjust prototype.
8835         * tree-ssa-loop.c (tree_ssa_loop_im): Return todo.
8837 2010-05-06  Richard Guenther  <rguenther@suse.de>
8839         PR tree-optimization/43987
8840         * tree-ssa-structalias.c (could_have_pointers): For possibly
8841         address-taken variables force pointers to be recorded.
8842         (create_variable_info_for_1): Likewise.
8843         (push_fields_onto_fieldstack): Pass in wheter all fields
8844         must have pointers.
8845         (find_func_aliases): Query types instead of vars whether
8846         they contain pointers where appropriate.
8848 2010-05-06  Jan Hubicka  <jh@suse.cz>
8850         * cgraphbuild.c (record_reference_ctx): Add varpool_node.
8851         (record_reference, mark_address, mark_load, mark_store): Record
8852         references.
8853         (record_references_in_initializer): Update call of record_references.
8854         (rebuild_cgraph_edges): Remove all references before rebuiding.
8855         * cgraph.c (cgraph_create_node): Clear ref list.
8856         (cgraph_remove_node): Remove references.
8857         (dump_cgraph_node): Dump references.
8858         (cgraph_clone_node): Clone references.
8859         * cgraph.h: Include ipa-ref.h and ipa-ref-inline.h
8860         (struct cgraph_node, varpool_node): Add ref_lst.
8861         * ipa-ref.c: New file.
8862         * ipa-ref.h: New file.
8863         * ipa-ref-inline.h: New file.
8864         * lto-cgraph.c (output_varpool): Take cgrag node set argument.
8865         (referenced_from_other_partition_p): New function.
8866         (lto_output_varpool_node): Take set arugment; call
8867         referenced_from_other_partition.
8868         (lto_output_ref): New.
8869         (add_references): New.
8870         (output_refs): New.
8871         (output_cgraph): Compute boundary based on references; output refs.
8872         (output_varpool): Accept cgraph_node_set argument.
8873         (input_ref): New.
8874         (input_refs): New.
8875         (input_cgraph): Call input_refs.
8876         * lto-section-in.c (lto_section_name): Add refs.
8877         * Makefile.in (cgraph.h): Include ipa-ref.h and ipa-ref-inline.h
8878         (ipa-ref.o): New file.
8879         * varpool.c (varpool_node): Clear ipa ref list.
8880         (varpool_remove_node): Remove references.
8881         (dump_varpool_node): Dump references.
8882         (varpool_assemble_decl): Only compile finalized ones.
8883         (varpool_extra_name_alias): Initialize ref list.
8884         * lto-streamer.c (lto-get_section_name): Add .refs section.
8885         * lto-streamer.h (lto_section_type): Add LTO_section_refs.
8886         (referenced_from_other_partition_p): Declared.
8888 2010-05-06  Ira Rosen  <irar@il.ibm.com>
8890         PR tree-optimization/43901
8891         * tree-vect-stmts.c (vectorizable_call): Assert that vector
8892         type is not NULL if it's transformation phase, and return
8893         FALSE if it's analysis.
8894         (vectorizable_conversion, vectorizable_operation,
8895         vectorizable_type_demotion, vectorizable_type_promotion): Likewise.
8897 2010-05-05  Andrew Pinski  <andrew.pinski@caviumnetworks.com>
8899         * config/mips/mips.h (TARGET_SMALL_REGISTER_CLASSES_FOR_MODE_P):
8900         Delete.
8901         * config/mips/mips.c (TARGET_SMALL_REGISTER_CLASSES_FOR_MODE_P):
8902         New define.
8903         * config/mips/mips-protos.h
8904         (mips_small_register_classes_for_mode_p): Delete prototype.
8906 2010-05-06  Bernd Schmidt  <bernds@codesourcery.com>
8908         * config/arm/arm.h (MAX_LDM_STM_OPS): New macro.
8909         * config/arm/arm.c (multiple_operation_profitable_p,
8910         compute_offset_order): New static functions.
8911         (load_multiple_sequence, store_multiple_sequence): Use them.
8912         Replace constant 4 with MAX_LDM_STM_OPS.  Compute order[0] from
8913         memory offsets, not register numbers.
8914         (emit_ldm_seq, emit_stm_seq): Replace constant 4 with MAX_LDM_STM_OPS.
8916 2010-05-05  Steven Bosscher  <steven@gcc.gnu.org>
8918         * stor-layout.c (pending_sizes): Change the type to VEC(tree,gc) *.
8919         (get_pending_sizes, put_pending_size, put_pending_sizes):
8920         Update the uses of pending_sizes.
8921         * c-decl.c (store_parm_decls): Likewise.
8922         * c-tree.h (struct c_arg_info): Likewise.
8923         * tree.h: Update the prototype for get_pending_sizes and
8924         put_pending_sizes.
8926 2010-05-05  Jason Merrill  <jason@redhat.com>
8928         PR debug/43370
8929         * c-common.c (handle_aligned_attribute): Respect
8930         ATTR_FLAG_TYPE_IN_PLACE.
8932         PR testsuite/43758
8933         * target.h (struct gcc_target): Add attribute_takes_identifier_p.
8934         * target_def.h (TARGET_ATTRIBUTE_TAKES_IDENTIFIER_P): Define.
8935         (TARGET_INITIALIZER): Use it.
8936         * c-common.c (attribute_takes_identifier_p): Call it.
8937         * c-common.h: Update prototype.
8938         * config/rs6000/rs6000.c (rs6000_attribute_takes_identifier_p): New.
8939         (TARGET_ATTRIBUTE_TAKES_IDENTIFIER_P): Define.
8941 2010-05-05  Jakub Jelinek  <jakub@redhat.com>
8943         PR debug/43950
8944         * dwarf2out.c (gen_compile_unit_die): Add DW_AT_identifier_case
8945         DW_ID_down_case for Fortran compilation units.
8947 2010-05-05  Jan Hubicka  <jh@suse.cz>
8949         * lto-cgraph.c (lto_output_varpool_node, input_varpool_node): Correctly
8950         handle aliases.
8952 2010-05-05  Eric Botcazou  <ebotcazou@adacore.com>
8954         * gimplify.c (gimplify_return_expr): Gimplify the size expressions of
8955         a variable-sized RESULT_DECL.
8957 2010-05-05  Maxim Kuvyrkov  <maxim@codesourcery.com>
8959         * doc/invoke.texi (-mfix-cortex-m3-ldrd): Move from ARC section to ARM.
8961 2010-05-05  Jason Merrill  <jason@redhat.com>
8963         PR c++/43787
8964         * gimplify.c (gimplify_expr): Keep working if gimplify_modify_expr
8965         returns GS_OK.
8966         (gimplify_modify_expr_rhs): Return GS_OK if anything changed.
8968 2010-05-05  Alexandre Oliva  <aoliva@redhat.com>
8969             Jakub Jelinek  <jakub@redhat.com>
8971         PR debug/43478
8972         * df-problems.c (struct dead_debug_use, struct dead_debug): New.
8973         (dead_debug_init, dead_debug_finish): New functions.
8974         (dead_debug_add, dead_debug_insert_before): Likewise.
8975         (df_note_bb_compute): Initialize a dead_debug object, add dead
8976         debug uses to it, insert debug bind insns before death insns,
8977         reset debug insns that refer to pending uses at the end.
8978         * rtl.h (make_debug_expr_from_rtl): New prototype.
8979         * varasm.c (make_debug_expr_from_rtl): New function.
8981 2010-05-05  Jan Hubicka  <jh@suse.cz>
8983         * lto-cgraph.c (output_varpool): Forward declare; work on encoder.
8984         (lto_varpool_encoder_new, lto_varpool_encoder_delete,
8985         lto_varpool_encoder_encode, lto_varpool_encoder_lookup,
8986         lto_varpool_encoder_deref, lto_varpool_encoder_size,
8987         lto_varpool_encoder_encode_initializer_p,
8988         lto_set_varpool_encoder_encode_initializer): New functions.
8989         (lto_output_cgraph): Take vset parameter too; compute varpool encoder;
8990         call output_varpool.
8991         (input_varpool_node): Do not always set analyzed.
8992         (input_cgraph_1): Return vector of cgraph nodes.
8993         (input_varpool_1): Return vector of varpools.
8994         (input_cgraph): Free the vectors.
8995         * lto-streamer-out.c (lto_output_ts_decl_common_tree_pointers):
8996         output only initializers needed.
8997         (lto_output): Only call output_cgraph.
8998         (produce_asm_for_decls): Call lto_varpool_encoder_delete.
8999         * lto-section-out.c (lto_new_out_decl_state): Initialize
9000         state->varpool_node_encoder.
9001         * lto-streamer.h (lto_varpool_encoder_d): New.
9002         (lto_out_decl_state, lto_file_decl_data): Add varpool_node_encoder.
9003         (lto_cgraph_encoder_delete, output_cgraph): Update prototype.
9004         (lto_varpool_encoder_deref, lto_varpool_encoder_lookup,
9005         lto_varpool_encoder_encode, lto_varpool_encoder_delete,
9006         lto_varpool_encoder_encode_initializer_p, lto_varpool_encoder_new):
9007         Declare.
9008         (output_varpool, input_varpool): Remove declarations.
9010 2010-05-05  Jan Hubicka  <jh@suse.cz>
9012         * lto-symtab.c (lto_symtab_resolve_can_prevail_p): Alias of variable
9013         with body can prevail.
9015 2010-05-05  Jan Hubicka  <jh@suse.cz>
9017         * lto-symtab.c (lto_symtab_merge_decls_1): Prefer declarations with
9018         size.
9020 2010-05-05  Laurynas Biveinis  <laurynas.biveinis@gmail.com>
9022         * Makefile.in (build/gengtype.o): Add $(HASHTAB_H) to dependencies.
9024         * gengtype.h (erro_at_line): Constify pos argument.
9026         * gengtype.c: Include hashtab.h.
9027         (enum gc_used): Document GC_MAYBE_POINTED_TO.
9028         (error_at_line): Constify pos argument.
9029         (do_typedef): Initialize p->opt field.
9030         (get_file_gtfilename): Fix comment typo.
9031         (struct walk_type_data): Constify line field.
9032         (get_output_file_for_structure): New function.
9033         (write_local_func_for_structure): Constify orig_s argument.
9034         Use get_output_file_for_structure.
9035         (write_func_for_structure): Use get_output_file_for_structure.
9036         (INDENT): New define.
9037         (dump_pair, dump_type, dump_type_list, dump_typekind)
9038         (dump_gc_used, dump_options, dump_fileloc, dump_type_u_s)
9039         (dump_type_u_a, dump_type_u_param_struct, dump_everything): New
9040         functions.
9041         (seen_types): New variable.
9042         (main): New variable do_dump.  Process "-d" command line option.
9043         Call dump_everything if dump requested.
9045 2010-05-05  Jakub Jelinek  <jakub@redhat.com>
9047         * var-tracking.c (var_debug_decl): Save DECL_DEBUG_EXPR value
9048         in a temporary instead of invoking the macro multiple times.
9049         (track_expr_p): Likewise.
9051 2010-05-04  Neil Vachharajani <nvachhar@google.com>
9053         * doc/invoke.texi (-Wcoverage-mismatch): Updated documentation as
9054         per new semantics.
9055         * opts.c (decode_options): Enable -Werror=coverage-mismatch.
9056         * coverage.c (get_coverage_counts): Always emit a warning.  Adjust
9057         conditions for printing notes.
9058         * common.opt (-Wcoverage-mismatch): Allow negative, default to
9059         true, update documentation.
9060         * Makefile.in (coverage.o): Add dependence on DIAGNOSTIC_H and intl.h.
9062 2010-05-04  Jakub Jelinek  <jakub@redhat.com>
9064         PR c/43981
9065         * c-parser.c (c_parser_direct_declarator_inner): Call mark_exp_read
9066         on dimen.
9068 2010-05-04  H.J. Lu  <hongjiu.lu@intel.com>
9070         PR target/43799
9071         * config/i386/i386.md (sse_prologue_save): Clobber CC register.
9072         (*sse_prologue_save_insn1): Likewise.
9073         (SSE prologue save splitter): Likewise.
9075 2010-05-04  Eric Botcazou  <ebotcazou@adacore.com>
9077         * tree.c (free_lang_data_in_one_sizepos): New inline function.
9078         (free_lang_data_in_type): Call it on TYPE_{MIN|MAX}_VALUE of numerical
9079         types.  Call it on TYPE_SIZE and TYPE_SIZE_UNIT of all types.
9080         (free_lang_data_in_decl): Call it on DECL_SIZE and DECL_SIZE_UNIT of
9081         all decls.  Call it on DECL_FIELD_OFFSET of fields.
9082         (find_decls_types_r): Follow DECL_VALUE_EXPR.
9083         (iterative_hash_expr) <PLACEHOLDER_EXPR>: New case.
9085 2010-05-04  Martin Jambor  <mjambor@suse.cz>
9087         * tree-sra.c (build_access_from_expr_1): The first parameter type
9088         changed to simple tree.
9089         (build_access_from_expr): Likewise, gsi parameter was eliminated.
9090         (scan_assign_result): Renamed to assignment_mod_result, enum elements
9091         renamed as well.
9092         (build_accesses_from_assign): Removed all parameters except for a
9093         simple gimple statement.  Now returns a simple bool.
9094         (scan_function): All non-analysis parts moved to separate functions
9095         sra_modify_function_body and ipa_sra_modify_function_body.  Removed all
9096         parameters and updated both callers.
9097         (sra_modify_expr): Removed parameter data.
9098         (sra_modify_function_body): New function.
9099         (perform_intra_sra): Call sra_modify_function_body to modify the
9100         function body.
9101         (replace_removed_params_ssa_names): Parameter data changed into
9102         adjustments vector.
9103         (sra_ipa_modify_expr): Likewise.  Also removed unused parameter gsi and
9104         changed the parameter dont_convert to convert with the opposite
9105         meaning.
9106         (sra_ipa_modify_assign): Parameter data changed into adjustments
9107         vector, return value changed to bool.
9108         (ipa_sra_modify_function_body): New function.
9109         (sra_ipa_reset_debug_stmts): Updated a comment.
9110         (modify_function): Use ipa_sra_modify_function_body to modify function
9111         body.
9113 2010-05-04  H.J. Lu  <hongjiu.lu@intel.com>
9115         PR middle-end/43671
9116         * alias.c (true_dependence): Handle the same VALUE in x and mem.
9117         (canon_true_dependence): Likewise.
9118         (write_dependence_p): Likewise.
9120 2010-05-04  Jan Hubicka  <jh@suse.cz>
9122         * Makefile.in (cgraphbuild.o): Add dependency on ipa-utils.h
9123         * cgraphbuild.c: Include ipa-utils.h
9124         (record_reference_ctx): New struct.
9125         (record_reference): Simplify to work on initializers; not statements.
9126         (mark_address, mark_load, mark_store): New.
9127         (build_cgraph_edges): Simplify using walk_stmt_load_store_addr_ops;
9128         walk PHI nodes too.
9129         (record_references_in_initializer): Update use of record_reference.
9130         (rebuild_cgraph_edges): Simplify using walk_stmt_load_store_addr_ops;
9131         walk PHI nodes too.
9133 2010-05-04  Jan Hubicka  <jh@suse.cz>
9135         * lto-symtab.c (lto_cgraph_replace_node): Do not remove edges;
9136         node will be removed anyway.
9137         (lto_varpool_replace_node): Allow also unanalyzed nodes;
9138         relink aliases of node into prevailing node.
9139         * varpool.c (varpool_remove_node): Remove aliases properly;
9140         when removing node, remove all its aliases too; remove DECL_INITIAL
9141         of removed node; ggc_free the varpool node.
9143 2010-05-04  Richard Guenther  <rguenther@suse.de>
9145         PR tree-optimization/43879
9146         * tree-ssa-structalias.c (alias_get_name): Use
9147         DECL_ASSEMBLER_NAME if available.
9148         (create_function_info_for): Return the varinfo node.
9149         (ipa_pta_execute): Associate same-body aliases and extra names
9150         with their origin nodes varinfo.  Dump DECL_ASSEMBLER_NAME.
9152 2010-05-04  Kaz Kojima  <kkojima@gcc.gnu.org>
9154         * config/sh/sh.c (sh_small_register_classes_for_mode_p): Remove static.
9156 2010-05-04  Mikael Pettersson  <mikpe@it.uu.se>
9158         PR bootstrap/43964
9159         * ira-color.c (assign_hard_reg): Declare rclass and add_cost
9160         only if HONOR_REG_ALLOC_ORDER is not defined.
9162 2010-05-04  Richard Guenther  <rguenther@suse.de>
9164         PR tree-optimization/43949
9165         * tree-vrp.c (extract_range_from_binary_expr): Only handle
9166         TRUNC_MOD_EXPR.
9168 2010-04-26  Jason Merrill  <jason@redhat.com>
9170         * c.opt (-fstrict-enums): New.
9171         * doc/invoke.texi (C++ Dialect Options): Document -fstrict-enums.
9173 2010-05-03  David Ung <davidu@mips.com>
9174             James E. Wilson  <wilson@codesourcery.com>
9176         * config/mips/mips.c (mips_output_division): If GENERATE_DIVIDE_TRAPS,
9177         emit the trap instruction before the divide for TUNE_74K.
9179 2010-05-03  Steven Bosscher  <steven@gcc.gnu.org>
9181         * doc/tm.texi (defmac SMALL_REGISTER_CLASSES): Remove.
9182         (TARGET_SMALL_REGISTER_CLASSES_FOR_MODE_P): Add documentation,
9183         based on the above, for new target hook.
9185         * hooks.c (hook_bool_mode_true): New generic hook.
9186         * hooks.h (hook_bool_mode_true): Add prototype.
9188         * target.h (struct gcc_target): Add small_register_classes_for_mode_p
9189         target hook.
9190         * target-def.h (TARGET_SMALL_REGISTER_CLASSES_FOR_MODE_P): New default
9191         target hook, set to hook_bool_mode_false.
9192         * regs.h: Remove default definition of SMALL_REGISTER_CLASSES.
9193         * reload.c (push_secondary_reload): Replace SMALL_REGISTER_CLASSES
9194         with targetm.small_register_classes_for_mode_p.
9195         (find_reusable_reload): Likewise.
9196         (combine_reloads): Likewise.
9197         * reload1.c (reload_as_needed): Likewise.
9198         * cse.c (approx_reg_cost_1, hash_rtx_cb): Likewise.
9199         * ifcvt.c (noce_process_if_block, check_cond_move_block,
9200         dead_or_predicable): Likewise.
9201         * regmove.c (optimize_reg_copy_1): Likewise.
9202         * calls.c (prepare_call_address): Likewise.
9203         (precompute_register_parameters): Likewise.
9205         * config/sh/sh.h: Replace SMALL_REGISTER_CLASSES with new target
9206         hook definition.
9207         * config/sh/sh.c (sh_small_register_classes_for_mode_p): Add
9208         implementation of the hook that considers all register classes
9209         small except for SH64.
9210         (sh_override_options): Use the new hook.
9211         * config/sh/sh-protos.h (sh_small_register_classes_for_mode_p):
9212         Add prototype.
9214         * config/arm/arm.h: Replace SMALL_REGISTER_CLASSES with new target
9215         hook definition.
9216         * config/arm/arm.c (arm_small_register_classes_for_mode_p): Add
9217         implementation of the hook that considers all register classes
9218         small for THUMB1.
9219         * config/arm/arm-protos.h (arm_small_register_classes_for_mode_p):
9220         Add prototype.
9222         * config/mips/mips.h: Replace SMALL_REGISTER_CLASSES with new target
9223         hook definition.
9224         * config/mips/mips.c (mips_small_register_classes_for_mode_p): Add
9225         implementation of the hook that considers all register classes
9226         small for MIPS16.
9227         * config/mips/mips-protos.h (mips_small_register_classes_for_mode_p):
9228         Add prototype.
9230         * config/i386/i386.h: Replace SMALL_REGISTER_CLASSES with new target
9231         hook definition.
9232         * config/m32c/m32c.h: Likewise.
9233         * config/pdp11/pdp11.h: Likewise.
9234         * config/avr/avr.h: Likewise.
9235         * config/xtensa/xtensa.h: Likewise.
9236         * config/m68hc11/m68hc11.h: Likewise.
9237         * config/mn10300/mn10300.h: Likewise.
9238         * config/mcore/mcore.h: Likewise.
9239         * config/h8300/h8300.h: Likewise.
9240         * config/bfin/bfin.h: Likewise.
9242         * config/iq2000/iq2000.h: Remove SMALL_REGISTER_CLASSES definition.
9243         * config/rx/rx.h: Remove SMALL_REGISTER_CLASSES definition.
9245 2010-05-03  Anatoly Sokolov  <aesok@post.ru>
9247         * double-int.h (tree_to_double_int): Remove macro.
9248         (double_int_to_tree, double_int_fits_to_tree_p): Move prototypes ...
9249         * tree.h (double_int_to_tree, double_int_fits_to_tree_p): ... here.
9250         (tree_to_double_int): New function.
9251         * double-int.c (double_int_to_tree, double_int_fits_to_tree_p):
9252         Move ...
9253         * tree.c (double_int_to_tree, double_int_fits_to_tree_p): ... here.
9255 2010-05-03  Richard Guenther  <rguenther@suse.de>
9257         PR tree-optimization/43971
9258         * tree-ssa-structalias.c (get_constraint_for_1): Fix
9259         constraints in the !flag_delete_null_pointer_checks case.
9261 2010-05-03  Jakub Jelinek  <jakub@redhat.com>
9263         PR debug/43972
9264         * config/i386/i386.c (ix86_delegitimize_address): Make sure the
9265         result mode matches original rtl mode.
9267 2010-05-03  Dave Korn  <dave.korn.cygwin@gmail.com>
9269         PR target/43888
9270         * config/i386/winnt.c (i386_pe_binds_local_p): Handle weak decls.
9272 2010-05-02  Uros Bizjak  <ubizjak@gmail.com>
9274         * config/i386/i386.c (ix86_target_string): Output 'flags', not 'isa',
9275         when processing flag options.
9277 2010-05-02  Uros Bizjak  <ubizjak@gmail.com>
9279         * gcov-iov.c (main): Change format string placeholder
9280         from %#08x to 0x%08x.
9281         * genchecksum.c (dosum): Change format string placeholder
9282         from %#02x to 0x%02x.
9284 2010-05-02  Richard Guenther  <rguenther@suse.de>
9286         PR tree-optimization/43879
9287         * tree-tailcall.c (find_tail_calls): Clobbers also prevent tail calls.
9289 2010-05-02  Bruno Haible  <bruno@clisp.org>
9291         * doc/extend.texi (Function Attributes): Fix a typo.
9293 2010-05-02  Uros Bizjak  <ubizjak@gmail.com>
9295         Revert:
9296         * hwint.h (HOST_WIDE_INT_PRINT_DOUBLE_HEX): Change format string
9297         placeholder from 0x%x to %#x.
9298         (HOST_WIDEST_INT_PRINT_DOUBLE_HEX): Ditto.
9299         * config/i386/i386elf.h (ASM_OUTPUT_ASCII): Ditto.
9300         * config/i386/i386-interix.h (ASM_OUTPUT_ASCII): Ditto.
9301         * config/i386/att.h (ASM_OUTPUT_ASCII): Ditto.
9302         * config/i386/sysv4.h (ASM_OUTPUT_ASCII): Ditto.
9303         * config/i386/i386.c (ix86_target_string): Ditto.
9304         * config/i386/i386.c (output_pic_addr_const): Ditto.
9305         (print_operand): Ditto.
9307 2010-05-02  Uros Bizjak  <ubizjak@gmail.com>
9309         * vmsdbgout.c (ASM_OUTPUT_DEBUG_DATA1): Change format string
9310         placeholder from 0x%x to %#x.
9311         (ASM_OUTPUT_DEBUG_DATA1): Ditto.
9312         (ASM_OUTPUT_DEBUG_DATA4): Ditto.
9313         (ASM_OUTPUT_DEBUG_DATA): Ditto.
9314         (ASM_OUTPUT_DEBUG_ADDR_DATA): Ditto.
9315         (ASM_OUTPUT_DEBUG_DATA8): Ditto.
9316         * optc-gen.awk: Ditto.
9317         * hwint.h (HOST_WIDE_INT_PRINT_DOUBLE_HEX): Ditto.
9318         (HOST_WIDE_INT_PRINT_HEX): Ditto.
9319         (HOST_WIDEST_INT_PRINT_HEX): Ditto.
9320         (HOST_WIDEST_INT_PRINT_DOUBLE_HEX): Ditto.
9322 2010-05-01  Anatoly Sokolov  <aesok@post.ru>
9324         * target.h (struct calls): Add function_value_regno_p field.
9325         * target-def.h (TARGET_FUNCTION_VALUE_REGNO_P): Define.
9326         (TARGET_INITIALIZER): Use TARGET_FUNCTION_VALUE_REGNO_P.
9327         * targhooks.c (default_function_value_regno_p): New function.
9328         * targhooks.h (default_function_value_regno_p): Declare function.
9329         * rtlanal.c (keep_with_call_p): Use function_value_regno_p hook.
9330         * builtins.c. (apply_result_size): (Ditto.).
9331         * combine.c. (likely_spilled_retval_p): (Ditto.).
9332         * mode-switching.c. Include 'target.h'.
9333         (create_pre_exit): Use function_value_regno_p hook.
9334         * Makefile.in (mode-switching.o): Add dependency on TARGET_H.
9335         * doc/tm.texi (FUNCTION_VALUE_REGNO_P,
9336         TARGET_FUNCTION_VALUE_REGNO_P): Revise documentation.
9338         * config/i386/i386.h (TARGET_FUNCTION_VALUE_REGNO_P): Remove macro.
9339         * config/i386/i386.c (TARGET_FUNCTION_VALUE_REGNO_P): Define macro.
9340         (ix86_function_value_regno_p): Declare as static, change argument
9341         type to const unsigned int.
9342         * config/i386/i386-protos.h (ix86_function_value_regno_p): Remove.
9344 2010-05-01  Richard Guenther  <rguenther@suse.de>
9346         PR tree-optimization/43949
9347         * tree-vrp.c (ssa_name_nonnegative_p): Return true for unsigned
9348         types.
9349         (extract_range_from_binary_expr): Handle *_MOD_EXPR.
9351 2010-05-01  Anatoly Sokolov  <aesok@post.ru>
9353         * rtl.h (CONST_DOUBLE_P): Define.
9354         (rtx_to_double_int): Declare.
9355         * emit-rtl.c (rtx_to_double_int): New function.
9356         * dwarf2out.c (insert_double): New function.
9357         (loc_descriptor, add_const_value_attribute): Clean up, use
9358         rtx_to_double_int and insert_double functions.
9360 2010-05-01  Jonathan Wakely  <jwakely.gcc@gmail.com>
9362         * doc/extend.texi (Inline): Add missing return keyword to examples.
9363         (Function Attributes, Variable Attributes, Pragmas): Hyphenate
9364         "command-line".
9366 2010-04-30  Eric Botcazou  <ebotcazou@adacore.com>
9368         * tree-ssa-loop-ivopts.c (may_be_unaligned_p): Check the alignment of
9369         the variable part of the offset as well.  Use highest_pow2_factor for
9370         all alignment checks.
9372 2010-04-30  Richard Guenther  <rguenther@suse.de>
9374         PR tree-optimization/43879
9375         * tree-ssa-structalias.c (type_could_have_pointers): Functions
9376         can have pointers.
9378 2010-04-30  Jan Hubicka  <jh@suse.cz>
9380         * lto-symtab.c (lto_symtab_resolve_can_prevail_p): Chose var with
9381         varpool.
9382         (lto_symtab_merge_decls_1): Remove logic looking for an initializer.
9384 2010-04-30  Jan Hubicka  <jh@suse.cz>
9386         * cgraph.h (cgraph_node_set_nonempty_p, varpool_node_set_nonempty_p):
9387         New.
9388         * lto-cgraph.c (input_cgraph): Remove call to lto_mark_file_for_ltrans.
9389         * lto-streamer.h (lto_file_decl_data): Remove needs_ltrans_p.
9390         (lto_file_needs_ltrans_p, lto_mark_file_for_ltrans,
9391         cgraph_node_set_needs_ltrans_p): Remove.
9393 2010-04-30  Steven Bosscher  <steven@gcc.gnu.org>
9395         * sdbout.c: Include vec.h, do not include varray.h.
9396         (deferred_global_decls, sdbout_global_decl,
9397         sdbout_finish, sdbout_init): Use VEC instead of VARRAY.
9398         * toplev.c: Do not include varray.h.
9399         (dump_memory_report): Do not dump VARRAY statistics.
9400         * gengtype.c (open_base_file): Ignore varray.h.
9401         * Makefile.in: Update for abovementioned changes.
9402         Remove all traces of varray.c and varray.h.
9403         * varray.c: Remove file.
9404         * varray.h: Remove file.
9406 2010-04-30  Jan Hubicka  <jh@suse.cz>
9408         * lto-cgraph.c (lto_output_varpool_node): Always output constant pool
9409         references.
9411 2010-04-30  Jan Hubicka  <jh@suse.cz>
9413         * tree-profile.c (tree_init_ic_make_global_vars): Mark new decls as
9414         needed.
9416 2010-04-30  Richard Guenther  <rguenther@suse.de>
9418         * tree-ssa-structalias.c (get_constraint_for_1): Generate
9419         constraints for CONSTRUCTOR.
9421 2010-04-30  Richard Guenther  <rguenther@suse.de>
9423         PR lto/43946
9424         * passes.c (init_optimization_passes): Move pass_ipa_free_lang_data
9425         first after all lowering passes.
9427 2010-04-30  Steven Bosscher  <steven@gcc.gnu.org>
9429         * toplev.c: Include varray.h for statistics dumping.
9430         * tree.h: Do not declare varray_head_tag.
9431         * tree-into-ssa.c, tree-ssa-uninit.c, tree-phinodes.c, omega.c,
9432         regs.h, lto-cgraph.c, tree-ssa-loop-ivopts.c, tree-nomudflap.c,
9433         c-objc-common.c, lto-streamer-out.c, tree-ssa-propagate.c,
9434         gimple-low.c, c-semantics.c, dwarf2out.c, lto-streamer-in.c,
9435         lto-section-in.c, alias.c, tree-if-conv.c, gimplify.c, ggc-zone.c,
9436         tree-ssa.c, tree-ssa-loop-prefetch.c, integrate.h, c-gimplify.c,
9437         c-common.c, c-common.h, reg-stack.c, basic-block.h,
9438         tree-ssa-structalias.c, lto-section-out.c, tree-ssanames.c: Do not
9439         include varray.h.
9440         * Makefile.in: Update for abovementioned changes.
9442 2010-04-30  Jakub Jelinek  <jakub@redhat.com>
9444         PR debug/43942
9445         * tree.c (auto_var_in_fn_p): Return false for DECL_EXTERNAL vars.
9447 2010-04-30  Hariharan Sandanagobalane  <hariharan@picochip.com>
9449         * config/picochip/picochip.c (picochip_legitimize_address): Define.
9450         Use this function to do machine-specific conversion.
9451         (picochip_legitimize_reload_address): Likewise.
9452         (picochip_legitimate_address_p): Check valid base register only if
9453         strict.
9454         (picochip_check_conditional_copy): Check for modw only if opnd is
9455         register.
9456         * config/picochip/picochip.h (LEGITIMIZE_RELOAD_ADDRESS): Use this
9457         to call the function in c.
9458         * config/picochip/picochip-protos.h
9459         (picochip_legitimize_reload_address): Define.
9460         * config/picochip/picochip.md (supported_compare1): Define.
9462 2010-04-30  Jan Hubicka  <jh@suse.cz>
9464         * cgraph.h (cgraph_local_info): Remove for_functions_valid.
9465         (cgraph_global_info): Remove inlined.
9466         (LTO_cgraph_tag_names): Remove.
9467         (LTO_cgraph_tags, LCC_NOT_FOUND): Move to ...
9468         * lto-cgraph.c (LTO_cgraph_tags, LCC_NOT_FOUND): ... here;
9469         simplify cgraph tags and document.
9470         (lto_output_node): Use only LTO_cgraph_unavail_node and
9471         LTO_cgraph_analyzed_node; Do not save analzed, reachable,
9472         for_functions_valid, global info, process and output flags.
9473         (input_overwrite_node): Initialize estimated stack size and
9474         estimated growth.  Do not read flags we no longer store.
9475         (input_node): Likewise do not read info no longer stored.
9476         * ipa-inline.c (cgraph_mark_inline_edge): Do not set global.inlined
9477         flag.
9479 2010-04-30  Richard Guenther  <rguenther@suse.de>
9481         PR tree-optimization/43879
9482         * tree-ssa-structalias.c (get_constraint_for_1): Properly
9483         handle non-zero initializers.
9485 2010-04-30  Richard Guenther  <rguenther@suse.de>
9487         * builtins.c (fold_builtin_1): Delete free (0).
9489 2010-04-29  Jan Hubicka  <jh@suse.cz>
9491         * gengtype.c (open_base_files): Add lto-streamer.h
9492         * cgraph.h (cgraph_local_info): lto_file_data is now in GGC.
9493         (pass_ipa_cp): GGC collect.
9494         * toplev. (compile_file): Do not output symbols.
9495         * ipa-inline.c (pass_ipa_inline): Add ggc collect.
9496         * timevar.def (TV_VARPOOL, TV_IPA_LTO_DECL_INIT_IO,
9497         TV_IPA_LTO_DECL_MERGE, TV_IPA_LTO_CGRAPH_MERGE, TV_VAROUT): New.
9498         * lto-section-in.c: Include ggc.h
9499         (lto_new_in_decl_state): Alloc in GGC.
9500         (lto_delete_in_decl_state): Likewise.
9501         * ipa.c (pass_ipa_function_visibility, pass_ipa_whole_program):
9502         Collect.
9504 2010-04-29  Bernd Schmidt  <bernds@codesourcery.com>
9506         PR target/42895
9507         * doc/tm.texi (ADJUST_REG_ALLOC_ORDER): Renamed from
9508         ORDER_REGS_FOR_LOCAL_ALLOC.  All instances of this macro changed.
9509         (HONOR_REG_ALLOC_ORDER): Describe new macro.
9510         * ira.c (setup_alloc_regs): Use ADJUST_REG_ALLOC_ORDER if defined.
9511         * ira-color.c (assign_hard_reg): Take prologue/epilogue costs into
9512         account only if HONOR_REG_ALLOC_ORDER is not defined.
9513         * config/arm/arm.h (HONOR_REG_ALLOC_ORDER): Define.
9514         * system.h (ORDER_REGS_FOR_LOCAL_ALLOC): Poison.
9516 2010-04-29  Jon Grant  <04@jguk.org>
9518         * collect2.c (vflag): Change type from int to bool.
9519         (debug): Likewise.
9520         (helpflag): New global bool.
9521         (main): Set vflag and debug with boolean, not integer truth values.
9522         Accept new "--help" option and output usage text if found.
9523         * collect2.h (vflag): Update prototype.
9524         (debug): Likewise.
9526 2010-04-29  H.J. Lu  <hongjiu.lu@intel.com>
9528         PR bootstrap/43936
9529         * plugin.h (flag_plugin_added): Moved out of invoke_plugin_callbacks.
9531 2010-04-29  Richard Guenther  <rguenther@suse.de>
9533         PR bootstrap/43935
9534         * plugin.h (invoke_plugin_callbacks): Annotate arguments
9535         with ATTRIBUTE_UNUSED.
9537 2010-04-29  H.J. Lu  <hongjiu.lu@intel.com>
9539         PR target/43921
9540         * config/i386/i386.c (get_some_local_dynamic_name): Replace
9541         INSN_P with NONDEBUG_INSN_P.
9542         (distance_non_agu_define): Likewise.
9543         (distance_agu_use): Likewise.
9545 2010-04-29  Bernd Schmidt  <bernds@codesourcery.com>
9547         From Dominique d'Humieres <dominiq@lps.ens.fr>
9548         PR bootstrap/43858
9549         * ifcvt.c (dead_or_predicable): Use df_simulate_find_defs to compute
9550         test_set.
9552 2010-04-29  Brian Hackett  <bhackett1024@gmail.com>
9554         * plugin.h (invoke_plugin_callbacks): New inline function.
9555         * plugin.c (flag_plugin_added): New global flag.
9556         (add_new_plugin): Initialize above flag.
9557         (invoke_plugin_callbacks): Rename to ...
9558         (invoke_plugin_callbacks_full): ... this.
9560 2010-04-28  Jan Hubicka  <jh@suse.cz>
9562         * lto-symtab.c (lto_symtab_entry_def) Add vnode.
9563         (lto_varpool_replace_node): New.
9564         (lto_symtab_resolve_symbols): Resolve varpool nodes.
9565         (lto_symtab_merge_decls_1): Prefer decls with varpool node.
9566         (lto_symtab_merge_cgraph_nodes_1): Merge varpools.
9567         * cgraph.h (varpool_node_ptr): New type.
9568         (varpool_node_ptr): New vector.
9569         (varpool_node_set_def): New structure.
9570         (varpool_node_set): New type.
9571         (varpool_node_set): New vector.
9572         (varpool_node_set_element_def): New structure.
9573         (varpool_node_set_element, const_varpool_node_set_element): New types.
9574         (varpool_node_set_iterator): New type.
9575         (varpool_node): Add prev pointers, add used_from_other_partition,
9576         in_other_partition.
9577         (varpool_node_set_new, varpool_node_set_find, varpool_node_set_add,
9578         varpool_node_set_remove, dump_varpool_node_set, debug_varpool_node_set,
9579         varpool_get_node, varpool_remove_node): Declare.
9580         (vsi_end_p, vsi_next, vsi_node, vsi_start, varpool_node_in_set_p,
9581         varpool_node_set_size): New inlines.
9582         * cgraph.c (dump_cgraph_node): Dump asm names of aliases.
9583         * tree-pass.h (varpool_node_set_def): Forward declare.
9584         (ipa_opt_pass_d): Summary writting takes vnode sets too.
9585         (ipa_write_optimization_summaries): Update prototype.
9586         * ipa-cp.c (ipcp_write_summary): Update.
9587         * ipa-reference.c (ipa_reference_write_summary): Update.
9588         * lto-cgraph.c (lto_output_varpool_node): New static function.
9589         (output_varpool): New function.
9590         (input_varpool_node): New static function.
9591         (input_varpool_1): New function.
9592         (input_cgraph): Input varpool.
9593         * ipa-pure-const.c (pure_const_write_summary): Update.
9594         * lto-streamer-out.c (lto_output): Update, output varpool too.
9595         (write_global_stream): Kill WPA hack.
9596         (produce_asm_for_decls): Update.
9597         (output_alias_pair_p): Handle variables.
9598         (output_unreferenced_globals): Output only needed partition of varpool.
9599         * ipa-inline.c (inline_write_summary): Update.
9600         * lto-streamer-in.c (lto_input_tree_ref, lto_input_tree): Do not build
9601         cgraph.
9602         * lto-section-in.c (lto_section_name): Add varpool and jump funcs.
9603         * ipa.c (hash_varpool_node_set_element, eq_varpool_node_set_element,
9604         varpool_node_set_new, varpool_node_set_add,
9605         varpool_node_set_remove, varpool_node_set_find, dump_varpool_node_set,
9606         debug_varpool_node_set): New functions.
9607         * passes.c (rest_of_decl_compilation): when in LTO do not finalize.
9608         (execute_one_pass): Process new decls too.
9609         (ipa_write_summaries_2): Pass around vsets.
9610         (ipa_write_summaries_1): Likewise.
9611         (ipa_write_summaries): Build vset; be more selective about cgraph nodes
9612         to add.
9613         (ipa_write_optimization_summaries_1): Pass around vsets.
9614         (ipa_write_optimization_summaries): Likewise.
9615         * varpool.c (varpool_get_node): New.
9616         (varpool_node): Update doubly linked lists.
9617         (varpool_remove_node): New.
9618         (dump_varpool_node): More dumping.
9619         (varpool_enqueue_needed_node): Update doubly linked lists.
9620         (decide_is_variable_needed): Kill ltrans hack.
9621         (varpool_finalize_decl): Kill lto hack.
9622         (varpool_assemble_decl): Skip decls in other partitions.
9623         (varpool_assemble_pending_decls): Update doubly linkes lists.
9624         (varpool_empty_needed_queue): Likewise.
9625         (varpool_extra_name_alias): Likewise.
9626         * lto-streamer.c (lto_get_section_name): Add vars section.
9627         * lto-streamer.h (lto_section_type): Update.
9628         (output_varpool, input_varpool): Declare.
9630 2010-04-28  Mike Stump  <mikestump@comcast.net>
9632         * config/i386/darwin.h (CC1_SPEC): Ignore -mdynamic-no-pic for now.
9634 2010-04-28  Eric Botcazou  <ebotcazou@adacore.com>
9636         * lto-streamer-in.c (unpack_ts_type_value_fields): Replace test for
9637         record or union type with RECORD_OR_UNION_TYPE_P predicate.
9638         (lto_input_ts_type_tree_pointers): Likewise.
9639         * lto-streamer-out.c (pack_ts_type_value_fields): Likewise.
9640         (lto_output_ts_type_tree_pointers): Likewise.
9642 2010-04-28  Eric Botcazou  <ebotcazou@adacore.com>
9644         Uniquization of constants at the Tree level
9645         * tree.h (DECL_IN_CONSTANT_POOL): New macro.
9646         (tree_decl_with_vis): Add in_constant_pool bit, move shadowed_for_var_p
9647         bit to the end.
9648         (tree_output_constant_def): Declare.
9649         * gimplify.c (gimplify_init_constructor): When using block copy, first
9650         uniquize the constant constructor on the RHS.
9651         * lto-streamer-in.c (unpack_ts_decl_with_vis_value_fields): Deal with
9652         DECL_IN_CONSTANT_POOL flag.
9653         * lto-streamer-out.c (pack_ts_decl_with_vis_value_fields): Likewise.
9654         * varasm.c (make_decl_rtl): Deal with variables belonging to the global
9655         constant pool.
9656         (assemble_variable): Deal with symbols belonging to the tree constant
9657         pool.
9658         (get_constant_section): Add ALIGN parameter and simplify.
9659         (build_constant_desc): Build a VAR_DECL and attach it to the symbol.
9660         (assemble_constant_contents): Use the expression of the VAR_DECL.
9661         (output_constant_def_contents): Use the alignment of the VAR_DECL.
9662         (tree_output_constant_def): New global function.
9663         (mark_constant): Use the expression of the VAR_DECL.
9664         (place_block_symbol): Use the alignment of the VAR_DECL and the size of
9665         its expression.
9666         (output_object_block): Likewise and assemble the expression.
9668 2010-04-28  Eric Botcazou  <ebotcazou@adacore.com>
9670         * lto-streamer.c [LTO_STREAMER_DEBUG] (tree_htab, tree_hash_entry,
9671         hash_tree, eq_tree): New tree hash table.
9672         (lto_streamer_init) [LTO_STREAMER_DEBUG]: Initialize it.
9673         [LTO_STREAMER_DEBUG] (lto_orig_address_map, lto_orig_address_get,
9674         lto_orig_address_remove): Reimplement.
9676 2010-04-28  Xinliang David Li  <davidxl@google.com>
9678         PR c/42643
9679         * tree-ssa-uninit.c (can_skip_redundant_opnd): New function.
9680         (compute_uninit_opnds_pos): New function.
9681         (is_non_loop_exit_postdominating): New function.
9682         (compute_control_dep_chain): New function.
9683         (find_pdom): New function.
9684         (convert_control_dep_chain_into_preds): New function.
9685         (find_predicates): New function.
9686         (find_control_equiv_block): New function.
9687         (collect_phi_def_edges): New function.
9688         (find_def_preds): New function.
9689         (find_dom): New function.
9690         (dump_predicates): New function.
9691         (get_cmp_code): New function.
9692         (is_value_included_in): New function.
9693         (find_matching_predicate_in_rest_chains): New function.
9694         (use_pred_not_overlap_with_undef_path_pred): New function.
9695         (is_use_properly_guarded): New function.
9696         (normalize_cond_1): New function.
9697         (is_and_or_or): New function.
9698         (normalize_cond): New function.
9699         (is_gcond_subset_of): New function.
9700         (is_subset_of_any): New function.
9701         (is_or_set_subset_of): New function.
9702         (is_and_set_subset_of): New function.
9703         (is_norm_cond_subset_of): New function.
9704         (is_pred_expr_subset_of): New function.
9705         (is_pred_chain_subset_of): New function.
9706         (is_included_in): New function.
9707         (is_superset_of): New function.
9708         (find_uninit_use): New function.
9709         (warn_uninitialized_phi): New function.
9710         (compute_possibly_undefined_names): New function.
9711         (ssa_undefined_value_p): New function.
9712         (execute_late_warn_uninitialized): New function.
9713         * tree-ssa.c (ssa_undefined_value_p): Removed.
9714         (warn_uninit): Changed to extern.
9715         (warn_uninitialized_phi): Removed.
9716         (warn_uninitialized_vars): Changed to extern.
9717         (execute_late_warn_uninitialized): Removed
9718         * tree-flow.h: Add new prototypes.
9719         * timevar.def: Add new time variable.
9720         * Makefile.in: Add new build file.
9722 2010-04-28  Uros Bizjak  <ubizjak@gmail.com>
9724         * config/alpha/elf.h (ASM_DECLARE_OBJECT_NAME): Use gnu_unique_object
9725         type if available.
9727 2010-04-28  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
9729         PR target/22224
9730         * config/alpha/osf5.h (ASM_OUTPUT_LOCAL): Redefine.
9732 2010-04-28  Martin Jambor  <mjambor@suse.cz>
9734         * cgraph.h (struct cgraph_node): New field indirect_calls.
9735         (struct cgraph_indirect_call_info): New type.
9736         (struct cgraph_edge): Removed field indirect_call. New fields
9737         indirect_info, indirect_inlining_edge and indirect_unknown_callee.
9738         (cgraph_create_indirect_edge): Declare.
9739         (cgraph_make_edge_direct): Likewise.
9740         (enum LTO_cgraph_tags): New item LTO_cgraph_indirect_edge.
9741         * ipa-prop.h (struct ipa_param_call_note): Removed.
9742         (struct ipa_node_params): Removed field param_calls.
9743         (ipa_create_all_structures_for_iinln): Declare.
9744         * cgraph.c: Described indirect edges and uids in initial comment.
9745         (cgraph_add_edge_to_call_site_hash): New function.
9746         (cgraph_edge): Search also among the indirect edges, use
9747         cgraph_add_edge_to_call_site_hash to add edges to the call site hash.
9748         (cgraph_set_call_stmt): Possibly turn an indirect edge into a direct
9749         one, use cgraph_add_edge_to_call_site_hash to add edges to the call
9750         site hash.
9751         (initialize_inline_failed): Assign a reason to indirect edges.
9752         (cgraph_create_edge_1): New function.
9753         (cgraph_create_edge): Moved some functionality to
9754         cgraph_create_edge_1.
9755         (cgraph_create_indirect_edge): New function.
9756         (cgraph_edge_remove_callee): Add an assert checking for
9757         non-indirectness.
9758         (cgraph_edge_remove_caller): Special-case indirect edges.
9759         (cgraph_remove_edge): Likewise.
9760         (cgraph_set_edge_callee): New function.
9761         (cgraph_redirect_edge_callee): Use cgraph_set_edge_callee.
9762         (cgraph_make_edge_direct): New function.
9763         (cgraph_update_edges_for_call_stmt_node): Do nothing only when also
9764         the declaration of the call statement matches.
9765         (cgraph_node_remove_callees): Special-case indirect edges.
9766         (cgraph_clone_edge): Likewise.
9767         (cgraph_clone_node): Clone also the indirect edges.
9768         (dump_cgraph_node): Dump indirect_inlining_edge flag instead of
9769         indirect_call, dump count of indirect_calls edges.
9770         * ipa-prop.c (iinlining_processed_edges): New variable.
9771         (ipa_note_param_call): Create indirect edges instead of
9772         creating notes.  New parameter node.
9773         (ipa_analyze_call_uses): New parameter node, pass it on to
9774         ipa_note_param_call.
9775         (ipa_analyze_stmt_uses): Likewise.
9776         (ipa_analyze_params_uses): Pass node to ipa_analyze_stmt_uses.
9777         (print_edge_addition_message): Work on edges rather than on notes.
9778         (update_call_notes_after_inlining): Likewise, renamed to
9779         update_indirect_edges_after_inlining.
9780         (ipa_create_all_structures_for_iinln): New function.
9781         (ipa_free_node_params_substructures): Do not free notes.
9782         (ipa_edge_duplication_hook): Propagate bits within
9783         iinlining_processed_edges bitmap.
9784         (ipa_node_duplication_hook): Do not duplicate notes.
9785         (free_all_ipa_structures_after_ipa_cp): Renamed to
9786         ipa_free_all_structures_after_ipa_cp.
9787         (free_all_ipa_structures_after_iinln): Renamed to
9788         ipa_free_all_structures_after_iinln.
9789         (ipa_write_param_call_note): Removed.
9790         (ipa_read_param_call_note): Removed.
9791         (ipa_write_indirect_edge_info): New function.
9792         (ipa_read_indirect_edge_info): Likewise.
9793         (ipa_write_node_info): Do not stream notes, do stream information
9794         in indirect edges.
9795         (ipa_read_node_info): Likewise.
9796         (lto_ipa_fixup_call_notes): Removed.
9797         * ipa-cp.c (pass_ipa_cp): Set stmt_fixup to NULL.
9798         * ipa-inline.c (pass_ipa_inline): Likewise.
9799         * cgraphunit.c (verify_cgraph_node): Check also indirect edges.
9800         * cif-code.def (INDIRECT_UNKNOWN_CALL): New reason.
9801         * tree-inline.c (copy_bb): Removed an unnecessary double check for
9802         is_gimple_call.
9803         * tree-inline.c (get_indirect_callee_fndecl): Do not consider indirect
9804         edges.
9805         * lto-cgraph.c (output_outgoing_cgraph_edges): New function.
9806         (output_cgraph): Stream also indirect edges.
9807         (lto_output_edge): Added capability to stream indirect edges.
9808         (input_edge): Likewise.
9809         (input_cgraph_1): Likewise.
9810         * lto-streamer-in.c (fixup_call_stmt_edges_1): Fixup also statements
9811         of indirect edges.
9813 2010-04-28  Richard Guenther  <rguenther@suse.de>
9815         PR tree-optimization/43879
9816         PR tree-optimization/43909
9817         * tree-ssa-structalias.c (struct variable_info): Add
9818         only_restrict_pointers flag.
9819         (new_var_info): Initialize it.  Increment stats.total_vars here.
9820         (create_function_info_for): Do not increment stats.total_vars here.
9821         (get_function_part_constraint): Fix build with C++.
9822         (insert_into_field_list): Remove.
9823         (push_fields_onto_fieldstack): Properly merge fields.
9824         (create_variable_info_for): Split and simplify.
9825         (create_variable_info_for_1): New piece.
9826         (intra_create_variable_infos): Properly make restrict constraints
9827         from parameters.
9829 2010-04-28  Richard Guenther  <rguenther@suse.de>
9831         PR c++/43880
9832         * tree-inline.c (copy_bind_expr): Also copy bind expr vars value-exprs.
9834 2010-04-27  Manuel López-Ibáñez  <manu@gcc.gnu.org>
9835             Jan Hubicka <hubicka@ucw.cz>
9837         * doc/invoke.texi (-Wsuggest-attribute=const,
9838         -Wsuggest-attribute=pure): Document.
9839         * ipa-pure-const.c: Include toplev.h, intl.h and opts.h.
9840         (function_always_visible_to_compiler_p,
9841         suggest_attribute, warn_function_pure, warn_function_const):
9842         New functions.
9843         (check_call): Improve debug info.
9844         (analyze_function): Do not check availability.
9845         (add_new_function): Check availability.
9846         (propagate): Output warnings.
9847         (skip_function_for_local_pure_const): New function.
9848         (local_pure_const): Use it; output warnings.
9849         * common.opt (Wsuggest-attribute=const,
9850         Wsuggest-attribute=pure): New.
9852 2010-04-27  Jakub Jelinek  <jakub@redhat.com>
9854         * dwarf2out.c (def_cfa_1): After DW_CFA_def_cfa_expression
9855         force using DW_CFA_def_cfa instead of DW_CFA_def_cfa_register
9856         or DW_CFA_def_cfa_offset{,_sf}.
9858 2010-04-27  Eric Botcazou  <ebotcazou@adacore.com>
9860         * tree.h: Fix truncated long macros.
9862 2010-04-27  Kai Tietz  <kai.tietz@onevision.com>
9864         * collect2.c (TARGET_64BIT): Redefine to target's default.
9865         * tlink.c: Likewise.
9866         * config/i386/cygming.h (USER_LABEL_PREFIX): Define
9867         dependent to TARGET_64BIT and USE_MINGW64_LEADING_UNDERSCORES.
9868         * config/i386/i386.h (CRT_CALL_STATIC_FUNCTION): Use
9869         for underscoring __USER_LABEL_PREFIX__.
9870         * config/i386/mingw-w64.h (SUB_LINK_ENTRY): New macro.
9871         (SUB_LINK_ENTRY32): New.
9872         (SUB_LINK_ENTRY64): New.
9873         (LINK_SPEC): Replace entry point spec by SUB_LINK_ENTRY.
9874         * config/i386/mingw32 (SUB_LINK_ENTRY32): New.
9875         (SUB_LINK_ENTRY64): New.
9876         (SUB_LINK_ENTRY): New.
9877         (LINK_SPEC): Use SUB_LINK_ENTRY instead of hard-coded entry-point.
9878         (DWARF2_UNWIND_INFO): Error out for use of dw2 unwind when
9879         x64 target is choosen.
9880         * config.in (USE_MINGW64_LEADING_UNDERSCORES): New.
9881         * configure: Regenerated.
9882         * configure.ac (leading-mingw64-underscores): Option added.
9884 2010-04-27  Jan Hubicka  <jh@suse.cz>
9886         * doc/invoke.texi (-fipa-profile): Document.
9887         * opts.c (decode_options): Enable ipa-profile at -O1.
9888         * timevar.def (TV_IPA_PROFILE): Define.
9889         * common.opt (fipa-profile): Add.
9890         * cgraph.c (cgraph_clone_node): Set local flag and clear vtable method
9891         flag for clones.
9892         (cgraph_propagate_frequency): Handle only local ones.
9893         * tree-pass.h (pass_ipa_profile): Declare.
9894         * ipa-profile.c (gate_profile): Use flag_ipa_profile.
9895         (pass_ipa_profile): Use TV_IPA_PROFILE.
9896         * ipa.c (ipa_profile): New function.
9897         (gate_ipa_profile): Likewise.
9898         (pass_ipa_profile): New global variable.
9899         * passes.c (pass_ipa_profile): New.
9901 2010-04-27  Nathan Froyd  <froydnj@codesourcery.com>
9903         * config/arm/arm.c (arm_expand_builtin): Remove redundant declaration.
9905 2010-04-27  Martin Jambor  <mjambor@suse.cz>
9907         PR middle-end/43812
9908         * ipa.c (dissolve_same_comdat_group_list): New function.
9909         (function_and_variable_visibility): Call
9910         dissolve_same_comdat_group_list when comdat group contains external or
9911         newly local nodes.
9912         * cgraphunit.c (verify_cgraph_node): Verify that same_comdat_group
9913         lists are circular and that they contain only DECL_ONE_ONLY nodes.
9915 2010-04-27  Eric Botcazou  <ebotcazou@adacore.com>
9917         * varasm.c (decode_addr_const): Handle special case of INDIRECT_REF.
9918         (const_hash_1) <VECTOR_CST>: New case.
9919         (compare_constant) <VECTOR_CST>: Likewise.
9920         <ADDR_EXPR>: Deal with LABEL_REFs.
9921         (copy_constant) <VECTOR_CST>: New case.
9923 2010-04-27  Jan Hubicka  <jh@suse.cz>
9925         * cgraph.c (cgraph_propagate_frequency): New function.
9926         * cgraph.h (cgraph_propagate_frequency): Declare.
9927         * ipa-inline.c (cgraph_clone_inlined_nodes): Call
9928         cgraph_propagate_frequency.
9930 2010-04-27  Jakub Jelinek  <jakub@redhat.com>
9932         * unwind-dw2.c (_Unwind_DebugHook): Add used and noclone attributes.
9934 2010-04-27  Bernd Schmidt  <bernds@codesourcery.com>
9936         PR target/40657
9937         * config/arm/arm.c (thumb1_extra_regs_pushed): New function.
9938         (thumb1_expand_prologue, thumb1_output_function_prologue): Call it
9939         here to determine which regs to push and how much stack to reserve.
9941 2010-04-27  Jie Zhang  <jie@codesourcery.com>
9943         * doc/gimple.texi (gimple_statement_with_ops): Remove
9944         addresses_taken field.
9945         (gimple_statement_with_memory_ops): Likewise.
9947 2010-04-27  Jan Hubicka  <jh@suse.cz>
9949         * tree-inline.c (eni_inlining_weights): Remove.
9950         (estimate_num_insns): Special case more builtins.
9952 2010-04-27  Shujing Zhao  <pearly.zhao@oracle.com>
9954         PR c/32207
9955         * c-typeck.c (build_binary_op): Move forward check for comparison
9956         pointer with null pointer constant and adjust the diagnostic message.
9958 2010-04-27  Dave Korn  <dave.korn.cygwin@gmail.com>
9960         PR lto/42776
9961         * configure.ac (gcc_cv_as_section_has_align): Set if installed
9962         binutils supports extended .section directive needed by LTO, or
9963         warn if older binutils found.
9964         (LTO_BINARY_READER): New AC_SUBST'd variable.
9965         (LTO_USE_LIBELF): Likewise.
9966         * gcc/config.gcc (lto_binary_reader): New target-specific configure
9967         variable.
9968         * gcc/Makefile.in (LTO_BINARY_READER): Import AC_SUBST'd autoconf var.
9969         (LTO_USE_LIBELF): Likewise.
9970         * configure: Regenerate.
9972         * collect2.c (is_elf): Rename from this ...
9973         (is_elf_or_coff): ... to this, and recognize and allow i386 COFF
9974          object files in addition to ELF-formatted ones.
9975         (scan_prog_file): Caller updated.  Also allow for LTO info marker
9976         symbol to be prefixed or not by an extra underscore.
9978         * config/i386/t-cygming (winnt.o): Also depend on LTO_STREAMER_H.
9979         * config/i386/winnt.c: Also #include lto-streamer.h
9980         (i386_pe_asm_named_section): Specify 1-byte section alignment for
9981         LTO named sections.
9982         (i386_pe_asm_output_aligned_decl_common): Add comment.
9983         (i386_pe_maybe_record_exported_symbol): Allow decl arg to be NULL.
9985 2010-04-27  Hans-Peter Nilsson  <hp@bitrange.com>
9987         PR target/43889
9988         * config/mmix/mmix.md ("*divdi3_nonknuth", "*moddi3_nonknuth"):
9989         Add missing earlyclobber for second alternative.
9991 2010-04-26  Bernd Schmidt  <bernds@codesourcery.com>
9993         * df-problems.c (df_simulate_initialize_forwards): Set, don't clear,
9994         bits for artificial defs at the top of the block.
9995         * fwprop.c (single_def_use_enter_block): Don't call it.
9997 2010-04-26  Jack Howarth <howarth@bromo.med.uc.edu>
9999         PR 43715
10000         * gcc/configure.ac: Use "$gcc_cv_nm -g" on darwin
10001         instead of "$gcc_cv_objdump -T".
10002         Use "-undefined dynamic_lookup" on darwin.
10003         * gcc/configure: Regenerate.
10005 2010-04-26  Jakub Jelinek  <jakub@redhat.com>
10007         PR c/43893
10008         * c-omp.c (c_finish_omp_for): Handle also EQ_EXPR.
10010 2010-04-26  Nathan Froyd  <froydnj@codesourcery.com>
10012         * c-parser.c (struct c_token): Move location field up.
10013         * c-tree.h (struct c_typespec): Move expr_const_operands field up.
10014         (struct c_declspecs): Convert typespec_word, storage_class, and
10015         default_int_p into bitfields.
10016         (struct c_declarator): Move loc field up.
10018 2010-04-26  Nathan Froyd  <froydnj@codesourcery.com>
10020         * cfgloop.h (struct loop): Move can_be_parallel field up.
10021         * ipa-prop.h (struct ip_node_params): Move bitfields up.
10022         * tree-ssa-loop-ivopts.c (struct version_info): Move inv_id field
10023         down.
10024         (struct iv_cand): Convert pos field into a bitfield.
10025         * tree-vectorizer.h (struct _loop_vec_info): Move loop_line_number
10026         field up.
10027         (struct _stmt_vec_info): Shuffle fields for better packing.
10029 2010-04-26  Eric Botcazou  <ebotcazou@adacore.com>
10031         * varasm.c (IN_NAMED_SECTION): Remove guard.
10032         * config/arm/unknown-elf.h (IN_NAMED_SECTION): Rename to...
10033         (IN_NAMED_SECTION_P): ...this.
10034         (ASM_OUTPUT_ALIGNED_BSS): Adjust for above renaming.
10035         (ASM_OUTPUT_ALIGNED_DECL_LOCAL): Likewise.
10037 2010-04-26  Eric Botcazou  <ebotcazou@adacore.com>
10039         * gimplify.c (gimplify_cond_expr): Use THEN_ and ELSE_ local variables.
10040         Use VOID_TYPE_P for all void type tests.  Adjust TYPE variable instead
10041         of shadowing it.  Fix comments.
10043 2010-04-26  Jan Hubicka  <jh@suse.cz>
10045         * cgraph.c (cgraph_create_node): Set node frequency to normal.
10046         (cgraph_clone_node): Copy function frequency.
10047         * cgraph.h (node_frequency): New enum
10048         (struct cgraph_node): Add.
10049         * final.c (rest_of_clean_state): Update.
10050         * lto-cgraph.c (lto_output_node): Output node frequency.
10051         (input_overwrite_node): Input node frequency.
10052         * tre-ssa-loop-ivopts (computation_cost): Update.
10053         * lto-streamer-out.c (output_function): Do not output function
10054         frequency.
10055         * predict.c (maybe_hot_frequency_p): Update and handle functions
10056         executed once.
10057         (cgraph_maybe_hot_edge_p): Likewise; use cgraph frequency instead of
10058         attribute lookup.
10059         (probably_never_executed_bb_p, optimize_function_for_size_p): Update.
10060         (compute_function_frequency): Set noreturn functions to be executed
10061         once.
10062         (choose_function_section): Update.
10063         * lto-streamer-in.c (input_function): Do not input function frequency.
10064         * function.c (allocate_struct_function): Do not initialize function
10065         frequency.
10066         * function.h (function_frequency): Remove.
10067         (struct function): Remove function frequency.
10068         * ipa-profile.c (CGRAPH_NODE_FREQUENCY): Remove.
10069         (try_update): Update.
10070         * tree-inline.c (initialize_cfun): Do not update function frequency.
10071         * passes.c (pass_init_dump_file): Update.
10072         * i386.c (ix86_compute_frame_layout): Update.
10073         (ix86_pad_returns): Update.
10075 2010-04-26  Jie Zhang  <jie@codesourcery.com>
10077         PR tree-optimization/43833
10078         * tree-vrp.c (range_int_cst_p): New.
10079         (range_int_cst_singleton_p): New.
10080         (extract_range_from_binary_expr): Optimize BIT_AND_EXPR case
10081         when both operands are constants.  Use range_int_cst_p in
10082         BIT_IOR_EXPR case.
10084 2010-04-26  Jan Hubicka  <jh@suse.cz>
10086         * cgraphunit.c (cgraph_copy_node_for_versioning): Fix profile updating.
10088 2010-04-26  Richard Guenther  <rguenther@suse.de>
10090         PR lto/43080
10091         * gimple.c (gimple_decl_printable_name): Deal gracefully
10092         with a NULL DECL_NAME.
10094 2010-04-26  Richard Guenther  <rguenther@suse.de>
10096         PR lto/42425
10097         * tree.c (free_lang_data_in_type): Do not free TYPE_CONTEXT
10098         if emitting debug information and it is either a function
10099         or a namespace decl.
10101 2010-04-26  Ira Rosen  <irar@il.ibm.com>
10103         * tree-vectorizer.h (struct _stmt_vec_info): Add new field to
10104         determine if the statement is vectorizable, and a macro to access it.
10105         * tree-vect-data-refs.c (vect_analyze_data_ref_dependence):
10106         Skip statements that can't be vectorized. If the analysis fails,
10107         mark the statement as unvectorizable if vectorizing basic block.
10108         (vect_compute_data_refs_alignment): Likewise.
10109         (vect_verify_datarefs_alignment): Skip statements marked as
10110         unvectorizable. Add print.
10111         (vect_analyze_group_access): Skip statements that can't be
10112         vectorized. If the analysis fails, mark the statement as
10113         unvectorizable if vectorizing basic block.
10114         (vect_analyze_data_ref_accesses, vect_analyze_data_refs): Likewise.
10115         * tree-vect-stmts.c (vectorizable_store): Fix the number of
10116         generated stmts for SLP.
10117         (new_stmt_vec_info): Initialize the new field.
10118         * tree-vect-slp.c (vect_build_slp_tree): Fail to vectorize
10119         statements marked as unvectorizable.
10121 2010-04-25  Joseph Myers  <joseph@codesourcery.com>
10123         * c-common.c (flag_isoc1x): New.
10124         (flag_isoc99): Update comment.
10125         * c-common.h (flag_isoc1x): New.
10126         (flag_isoc99): Update comment.
10127         * c-cppbuiltin.c (builtin_define_float_constants): Also define
10128         __<type>_DECIMAL_DIG__.
10129         * c-opts.c (set_std_c1x): New.
10130         (c_common_handle_option): Handle -std=c1x and -std=gnu1x.
10131         (set_std_c89, set_std_c99): Also set flag_isoc1x to 0.
10132         * c.opt (-std=c1x, -std=gnu1x): New options.
10133         * doc/cpp.texi: Mention -std=c1x.
10134         * doc/cppopts.texi (-std=c1x, -std=gnu1x): Document.
10135         * doc/extend.texi: Mention -std=c1x and -std=gnu1x.
10136         * doc/invoke.texi (-std=c1x, -std=gnu1x): Document.
10137         * doc/standards.texi: Mention C1X.
10138         * ginclude/float.h (FLT_DECIMAL_DIG, DBL_DECIMAL_DIG,
10139         LDBL_DECIMAL_DIG, FLT_HAS_SUBNORM, DBL_HAS_SUBNORM,
10140         LDBL_HAS_SUBNORM, FLT_TRUE_MIN, DBL_TRUE_MIN, LDBL_TRUE_MIN):
10141         Define for C1X.
10143 2010-04-25  Uros Bizjak  <ubizjak@gmail.com>
10145         * config/i386/gmon-sol2.c (_mcleanup): Change format string
10146         placeholder from 0x%x to %#x.
10147         * config/i386/i386elf.h (ASM_OUTPUT_ASCII): Ditto.
10148         * config/i386/i386-interix.h (ASM_OUTPUT_ASCII): Ditto.
10149         * config/i386/att.h (ASM_OUTPUT_ASCII): Ditto.
10150         * config/i386/sysv4.h (ASM_OUTPUT_ASCII): Ditto.
10151         * config/i386/i386.c (ix86_target_string): Ditto.
10152         (output_pic_addr_const): Ditto.
10153         (print_operand): Ditto.
10155 2010-04-25  Paolo Bonzini  <bonzini@gnu.org>
10157         * combine.c (find_split_point): Add third argument.  Use it
10158         to find nested multiply-accumulate instructions.  Adjust calls.
10159         (try_combine): Adjust call to find_split_point.
10161 2010-04-24  Gerald Pfeifer  <gerald@pfeifer.com>
10163         * doc/contrib.texi (Contributors): Add Dodji Seketeli.
10165 2010-04-24  Bernd Schmidt  <bernds@codesourcery.com>
10167         PR tree-optimization/41442
10168         * fold-const.c (merge_truthop_with_opposite_arm): New function.
10169         (fold_binary_loc): Call it.
10171 2010-04-23  Manuel López-Ibáñez  <manu@gcc.gnu.org>
10173         * toplev.c (general_init): Set default for fdiagnostics-show-option.
10174         * opts.c (common_handle_option): Allow disabling it.
10175         * common.opt (fdiagnostics-show-option): Add Var. Enabled by default.
10177 2010-04-23  Eric Botcazou  <ebotcazou@adacore.com>
10179         * expr.c (expand_expr_real_1) <VIEW_CONVERT_EXPR>: Only use conversion
10180         between modes if both types are integral.
10182 2010-04-23  Richard Guenther  <rguenther@suse.de>
10184         PR tree-optimization/43572
10185         * tree-tailcall.c (find_tail_calls): Allow PARM_DECL uses.
10187 2010-04-23  Richard Guenther  <rguenther@suse.de>
10189         PR lto/43455
10190         * tree-inline.c (tree_can_inline_p): Also check compatibility
10191         of return types.
10193 2010-04-23  Martin Jambor  <mjambor@suse.cz>
10195         PR tree-optimization/43846
10196         * tree-sra.c (struct access): New flag grp_assignment_read.
10197         (build_accesses_from_assign): Set grp_assignment_read.
10198         (sort_and_splice_var_accesses): Propagate grp_assignment_read.
10199         (enum mark_read_status): New type.
10200         (analyze_access_subtree): Propagate grp_assignment_read, create
10201         accesses also if both direct_read and root->grp_assignment_read.
10203 2010-04-23  Martin Jambor  <mjambor@suse.cz>
10205         PR middle-end/43835
10206         * tree-sra.c (ipa_sra_preliminary_function_checks): Check that the
10207         function does not have type attributes.
10209 2010-04-23  Richard Guenther  <rguenther@suse.de>
10211         PR lto/42653
10212         * tree.c (free_lang_data_in_decl): Do not reset DECL_CONTEXT
10213         of FUNCTION_DECLs.
10215 2010-04-22  Laurynas Biveinis  <laurynas.biveinis@gmail.com>
10217         * sese.h (create_if_region_on_edge): Remove.
10219         * sese.c (create_if_region_on_edge): Make static.
10221         * tree-inline.c: Do not include ggc.h.
10223         * expr.c: Do not include ggc.h.
10225         * Makefile.in (tree-inline.o, expr.o): Remove $(GGC_H) from
10226         dependencies.
10228 2010-04-22  Kaz Kojima  <kkojima@gcc.gnu.org>
10230         PR target/43744
10231         * config/sh/sh.c (find_barrier): Don't emit a constant pool
10232         in the middle of insns for casesi_worker_2.
10234 2010-04-22  David Edelsohn  <edelsohn@gnu.org>
10236         * config/rs6000/x-aix: Override LDFLAGS for all COMPILERS.
10238 2010-04-22  Ira Rosen  <irar@il.ibm.com>
10240         PR tree-optimization/43842
10241         * tree-vect-loop.c (vect_create_epilog_for_reduction): Handle
10242         loop unrolling in update of exit phis. Fix comment.
10243         * tree-vect-slp.c (vect_analyze_slp): Check that there are at
10244         least two reduction statements in the loop before starting SLP
10245         analysis.
10247 2010-04-22  Nick Clifton  <nickc@redhat.com>
10249         * config/stormy16/stormy16-lib2.c (__ucmpsi2): Fix thinko.
10251 2010-04-22  Alexander Monakov  <amonakov@ispras.ru>
10253         * tree-ssa-reassoc.c (eliminate_plus_minus_pair): Handle BIT_NOT_EXPR
10254         to simplify a + ~a.
10256 2010-04-22  Laurynas Biveinis  <laurynas.biveinis@gmail.com>
10258         * tree-parloops.c (loop_parallel_p): New argument
10259         parloop_obstack.  Pass it down.
10260         (parallelize_loops): New variable parloop_obstack.  Initialize it,
10261         pass it down, free it.
10263         * tree-loop-linear.c (linear_transform_loops): Pass down
10264         lambda_obstack.
10266         * tree-data-ref.h (lambda_compute_access_matrices): New argument
10267         of type struct obstack *.
10269         * tree-data-ref.c (analyze_subscript_affine_affine): New variable
10270         scratch_obstack.  Initialize it, pass down, free it.
10272         * lambda.h (lambda_loop_new): Remove.
10273         (lambda_matrix_new, lambda_matrix_inverse)
10274         (lambda_trans_matrix_new, lambda_trans_matrix_inverse): New
10275         argument of type struct obstack *.
10277         * lambda-trans.c (lambda_trans_matrix_new): New argument
10278         lambda_obstack.  Pass it down, use obstack allocation for ret.
10279         (lambda_trans_matrix_inverse): New argument lambda_obstack.  Pass
10280         it down.
10282         * lambda-mat.c (lambda_matrix_get_column)
10283         (lambda_matrix_project_to_null): Remove.
10284         (lambda_matrix_new): New argument lambda_obstack.  Use obstack
10285         allocation for mat.
10286         (lambda_matrix_inverse_hard, lambda_matrix_inverse): New argument
10287         lambda_obstack.
10289         * lambda-code.c (lambda_loop_new): New function.
10290         (lambda_lattice_new, compute_nest_using_fourier_motzkin)
10291         (lambda_compute_auxillary_space, lambda_compute_target_space)
10292         (lambda_loopnest_transform, gcc_loop_to_lambda_loop)
10293         (lambda_loopnest_to_gcc_loopnest): Pass down lambda_obstack.
10294         (build_access_matrix): New argument lambda_obstack.  Use obstack
10295         allocation for am.
10296         (lambda_compute_step_signs, lambda_compute_access_matrices): New
10297         argument lambda_obstack.  Pass it down.
10299 2010-04-22  Bernd Schmidt  <bernds@codesourcery.com>
10301         * optabs.h (expand_widening_mult): Declare.
10303 2010-04-22  Richard Guenther  <rguenther@suse.de>
10305         PR tree-optimization/43845
10306         * tree-ssa-pre.c (create_component_ref_by_pieces_1): Properly
10307         lookup the CALL_EXPR function and arguments.
10309 2010-04-22  Nick Clifton  <nickc@redhat.com>
10311         * config/stormy16/stormy16.c
10312         (xstormy16_asm_output_aligned_common): Handle a NULL decl parameter.
10313         * config/stormy16/stormy16.h: Tidy up formatting.
10314         (DONT_USE_BUILTIN_SETJMP): Remove definition.
10315         * config/stormy16/stormy16.c (cbranchsi4): Delete pattern.
10316         (ineqbranchsi): Delete pattern.
10317         * config/stormy16/stormy16-lib2-ucmpsi2.c: New file.
10318         * config/stormy16/stormy16-lib2.c (__ucmpsi2): New function.
10319         * config/stormy16/t-stormy16 (LIB2FUNCS_EXTRA): Add
10320         stormy16-lib2-ucmpsi2.c.
10322 2010-04-22  Bernd Schmidt  <bernds@codesourcery.com>
10324         * ifcvt.c (dead_or_predicable): Use df_simulate_find_defs and
10325         df_simulate_find_noclobber_defs as appropriate.  Keep track of an
10326         extra set merge_set_noclobber, and use it to relax the final test
10327         slightly.
10328         * df.h (df_simulate_find_noclobber_defs): Declare.
10329         * df-problems.c (df_simulate_find_defs): Don't ignore partial or
10330         conditional defs.
10331         (df_simulate_find_noclobber_defs): New function.
10333 2010-04-22  Uros Bizjak  <ubizjak@gmail.com>
10335         * config/i386/i386.md: Use {} around multi-line preparation statements.
10337 2010-04-22  Laurynas Biveinis  <laurynas.biveinis@gmail.com>
10339         * c-tree.h (push_init_level, pop_init_level, set_init_index)
10340         (process_init_element): New argument of type struct obstack *.
10342         * c-typeck.c (push_init_level, pop_init_level, set_designator)
10343         (set_init_index, set_init_label, set_nonincremental_init)
10344         (set_nonincremental_init_from_string, find_init_member)
10345         (output_init_element, output_pending_init_elements)
10346         (process_init_element): New argument braced_init_obstack.  Pass it
10347         down.
10348         (push_range_stack, add_pending_init): New argument
10349         braced_init_obstack.  Use obstack allocation.
10351         * c-parser.c (c_parser_initelt, c_parser_initval): New argument
10352         braced_init_obstack.  Pass it down.
10353         (c_parser_braced_init): New variables ret, braced_init_obstack.
10354         Initialize obstack, pass it down and finally free it.
10356 2010-04-22  Bernd Schmidt  <bernds@codesourcery.com>
10358         PR middle-end/29274
10359         * tree-pass.h (pass_optimize_widening_mul): Declare.
10360         * tree-ssa-math-opts.c (execute_optimize_widening_mul,
10361         gate_optimize_widening_mul): New static functions.
10362         (pass_optimize_widening_mul): New.
10363         * expr.c (expand_expr_real_2) <case WIDEN_MULT_EXPR>: New case.
10364         <case MULT_EXPR>: Remove support for widening multiplies.
10365         * tree.def (WIDEN_MULT_EXPR): Tweak comment.
10366         * cfgexpand.c (expand_debug_expr) <case WIDEN_MULT_EXPR>: Use
10367         simplify_gen_unary rather than directly building extensions.
10368         * tree-cfg.c (verify_gimple_assign_binary): Add tests for
10369         WIDEN_MULT_EXPR.
10370         * expmed.c (expand_widening_mult): New function.
10371         * passes.c (init_optimization_passes): Add pass_optimize_widening_mul.
10373 2010-04-21  Jan Hubicka  <jh@suse.cz>
10375         * timevar.def (TV_WHOPR_WPA_FIXUP): Remove.
10376         * lto-section-in.c (lto_section_name): Remove wpa_fixup.
10377         * lto-wpa-fixup.c: Remove.
10378         * Makefile.in (lto-wpa-fixup.o): Remove.
10379         * passes.c (init_optimization_passes): Remove pass_ipa_lto_wpa_fixup.
10380         (execute_all_ipa_transforms): Set cgraph_state to CGRAPH_STATE_IPA_SSA.
10381         * lto-streamer.c (lto_get_section_name): Remove wpa_fixup section.
10383 2010-04-21  Jan Hubicka  <jh@suse.cz>
10385         * tree-pass.h (ipa_opt_pass_d): Rename function_read_summary;
10386         add write_optimization_summary, read_optimization_summary.
10387         (ipa_write_summaries_of_cgraph_node_set): Remove.
10388         (ipa_write_optimization_summaries): Declare.
10389         (ipa_read_optimization_summaries): Declare.
10390         * ipa-cp.c (pass_ipa_cp): Update.
10391         * ipa-reference.c (pass_ipa_reference): Update.
10392         * ipa-pure-const.c (pass_ipa_pure_const): Update.
10393         * lto-streamer-out.c (pass_ipa_lto_gimple, pass_ipa_lto_finish):
10394         Update.
10395         * ipa-inline.c (pass_ipa_inline): Update.
10396         * ipa.c (pass_ipa_whole_program): Update.
10397         * lto-wpa-fixup.c (pass_ipa_lto_wpa_fixup): Update.
10398         * passes.c (ipa_write_summaries_1): Do not test wpa.
10399         (ipa_write_optimization_summaries_1): New.
10400         (ipa_write_optimization_summaries): New.
10401         (ipa_read_summaries): Do not test ltrans.
10402         (ipa_read_optimization_summaries_1): New.
10403         (ipa_read_optimization_summaries): New.
10405 2010-04-21  Jan Hubicka  <jh@suse.cz>
10407         * lto-cgraph.c (lto_output_node): Do not output comdat groups
10408         for boundary nodes.
10409         (output_cgraph): Do not arrange comdat groups for boundary nodes.
10411 2010-04-21  Jakub Jelinek  <jakub@redhat.com>
10413         PR debug/40040
10414         * dwarf2out.c (add_name_and_src_coords_attributes): Add
10415         DW_AT_{,MIPS_}linkage_name even for Fortran decls.
10417 2010-04-21  Jan Hubicka  <jh@suse.cz>
10419         * ipa-prop.c (ipa_edge_removal_hook): Check for bounds.
10421 2010-04-21  Jan Hubicka  <jh@suse.cz>
10423         * varpool.c (decide_is_variable_needed): Variable is always needed
10424         during ltrans.
10426 2010-04-21  Jan Hubicka  <jh@suse.cz>
10428         * opts.c (decode_options): Enable pure-const pass for whopr.
10430 2010-04-21  Jan Hubicka  <jh@suse.cz>
10432         * cgraph.c (dump_cgraph_node): Dump also assembler name.
10433         * ipa-inline.c (cgraph_decide_inlining_of_small_functions): Do not ice
10434         at WPA dumping.
10435         (cgraph_decide_inlining): Do not expect callee to be removed in all
10436         cases.
10438 2010-04-21  Eric B. Weddington  <eric.weddington@atmel.com>
10440         * config/avr/avr-devices.c (avr_mcu_types): Add missing comma.
10442 2010-04-21  Uros Bizjak  <ubizjak@gmail.com>
10444         * config/i386/i386.md (x86_shrd): Add athlon_decode and
10445         amdfam10_decode attributes.
10447 2010-04-21  Jakub Jelinek  <jakub@redhat.com>
10449         PR middle-end/43570
10450         * omp-low.c (scan_sharing_clauses): Don't scan_omp_op
10451         OMP_CLAUSE_DECL for OMP_CLAUSE_COPYPRIVATE.
10452         (lower_copyprivate_clauses): Use private var in outer
10453         context instead of original var.  Make sure the types
10454         are correct for VLAs.
10456 2010-04-21  Richard Guenther  <rguenther@suse.de>
10458         * tree-ssa-structalias.c (do_ds_constraint): Avoid escaping
10459         to non-pointer objects.
10461 2010-04-21  Jakub Jelinek  <jakub@redhat.com>
10463         * dwarf2out.c (add_var_loc_to_decl): Add LABEL argument.  Drop
10464         last chain entry if it starts with the still current label.
10465         (add_location_or_const_value_attribute): Check that
10466         loc_list->first->next is NULL instead of comparing ->first with ->last.
10467         (dwarf2out_var_location): Pass last_label resp. last_postcall_label
10468         to add_var_loc_to_decl.
10470         * dwarf2out.c (output_call_frame_info): For dw_cie_version
10471         >= 4 add also address size and segment size fields into CIE header.
10473         * unwind-dw2.c (extract_cie_info): Handle CIE version 4, as
10474         long as address size is the same as sizeof (void *) and
10475         segment size is 0.
10476         * unwind-dw2-fde.c (get_cie_encoding): Likewise.  If
10477         address size or segment size is unexpected, return DW_EH_PE_omit.
10478         (classify_object_over_fdes): If get_cie_encoding returned
10479         DW_EH_PE_omit, return -1.
10480         (init_object): If classify_object_over_fdes returned -1,
10481         pretend there were no FDEs at all.
10483 2010-04-21  Uros Bizjak  <ubizjak@gmail.com>
10485         * config/i386/i386.md (bswap<mode>2): Macroize expander from
10486         bswap{si,di}2 using SWI48 mode iterator.
10487         (*bswap<mode>2_movbe): Macroize insn from *bswap{si,di}_movbe using
10488         SWI48 mode iterator.  Set type attribute of bswap insn to bitmanip,
10489         set modrm attribute of bswap insn to 0 and remove length attribute.
10490         (*bswap<mode>2_1): Macroize insn from *bswap{si,di}_1 using SWI48 mode
10491         iterator.  Set type attribute to bitmanip, set modrm attribute to 0,
10492         set mode attribute to <MODE> and remove length attribute.
10494 2010-04-20  James E. Wilson  <wilson@codesourcery.com>
10496         PR rtl-optimization/43520
10497         * ira-lives.c (ira_implicitly_set_insn_hard_regs): Exclude classes with
10498         zero available registers.
10500 2010-04-20  Kaveh R. Ghazi  <ghazi@caip.rutgers.edu>
10502         * builtins.c (fold_builtin_cproj): Fold more cases.
10504 2010-04-20  Kaveh R. Ghazi  <ghazi@caip.rutgers.edu>
10506         * builtins.c (build_complex_cproj, fold_builtin_cproj): New.
10507         (fold_builtin_1): Fold builtin cproj.
10508         * builtins.def (BUILT_IN_CPROJ, BUILT_IN_CPROJF, BUILT_IN_CPROJL):
10509         Use ATTR_CONST_NOTHROW_LIST.
10511 2010-04-20  Uros Bizjak  <ubizjak@gmail.com>
10513         * config/i386/i386.md (ffs<mode>2): Macroize expander from ffs_cmove
10514         and ffsdi2 using SWI48 mode iterator.  Expand SImode insn through
10515         ffsi2_no_cmove for !TARGET_CMOVE.
10516         (ffssi2_no_cmove): Rename from *ffs_no_cmove.  Make public.
10517         (ffssi2): Remove expander.
10518         (*ffs<mode>_1): Macroize insn from *ffs{si,di} using SWI48
10519         mode iterator.
10520         (ctz<mode>2): Ditto from ctz{si,di}2.
10521         (clz<mode>2): Macroize expander from ctz{hi,si,di}2 using SWI248
10522         mode iterator.
10523         (clz<mode>2_abm): Macroize insn from clz{hi,si,di}2_abm using SWI248
10524         mode iterator.
10526 2010-04-20  Jakub Jelinek  <jakub@redhat.com>
10528         * dwarf2out.c (AT_linkage_name): Define.
10529         (clone_as_declaration): Handle DW_AT_linkage_name.
10530         (add_name_and_src_coords_attributes): Use AT_linkage_name instead
10531         of DW_AT_MIPS_linkage_name.
10532         (move_linkage_attr): Likewise.
10533         (dwarf2out_finish): Likewise.
10535 2010-04-20  Xinliang David Li  <davidxl@gcc.gnu.org>
10537         PR middle-end/41952
10538         * fold-const.c (fold_comparison): New folding rule.
10540 2010-04-20  Anatoly Sokolov  <aesok@post.ru>
10542         * double-int.h (double_int_setbit): Declare.
10543         * double-int.c (double_int_setbit): New function.
10544         * rtl.h (immed_double_int_const): Declare.
10545         * emit-rtl.c (immed_double_int_const): New function.
10546         * builtins.c (expand_builtin_signbit): Clean up, use double_int_*
10547         and immed_double_int_const functions.
10548         * optabs.c (expand_absneg_bit, expand_copysign_absneg,
10549         expand_copysign_bit):  (Ditto.).
10550         * simplify-rtx.c (simplify_binary_operation_1): (Ditto.).
10551         * tree-ssa-address.c (addr_for_mem_ref): (Ditto.).
10552         * dojump.c (prefer_and_bit_test): (Ditto.).
10553         * expr.c (convert_modes, reduce_to_bit_field_precision,
10554         const_vector_from_tree): (Ditto.).
10555         * expmed.c (mask_rtx, lshift_value): (Ditto.).
10557 2010-04-20  Jan Hubicka  <jh@suse.cz>
10559         * cgraph.c (cgraph_remove_node): Kill bodies in other partitoin.
10560         (dump_cgraph_node): Dump new flags.
10561         * cgraph.h (struct cgraph_node): Add flags
10562         reachable_from_other_partition and in_other_partition.
10563         (cgraph_can_remove_if_no_direct_calls_p): Functions used by
10564         other partition can not be removed.
10565         * cgraphunit.c (cgraph_mark_functions_to_output): Functions used by
10566         the other partition must be output; silence sanity checking on
10567         leaking functions bodies from other paritition.
10568         * lto-cgraph.c (reachable_from_other_partition_p): New function.
10569         (lto_output_node): Output new flags; do not sanity check that inline
10570         clones are output; drop lto_forced_extern_inline_p code; do not mock
10571         visibility flags at partition boundaries.
10572         (add_node_to): New function.
10573         (output_cgraph): Use it to sort functions so masters appear before
10574         clones.
10575         (input_overwrite_node): Input new flags.
10576         * passes.c (ipa_write_summaries): Do not call
10577         lto_new_extern_inline_states.
10578         * lto-section-out.c (forced_extern_inline,
10579         lto_new_extern_inline_states lto_delete_extern_inline_states,
10580         lto_force_functions_extern_inline, lto_forced_extern_inline_p): Kill.
10581         * lto-streamer.h (lto_new_extern_inline_states,
10582         * lto_delete_extern_inline_states, lto_force_functions_extern_inline,
10583         lto_forced_extern_inline_p): Kill.
10585 2010-04-20  Richard Guenther  <rguenther@suse.de>
10587         * tree-ssa-structalias.c (do_sd_constraint): Add edges only
10588         from vars that can have pointers.
10589         (process_constraint): Dump useless constraints.
10591 2010-04-20  Richard Guenther  <rguenther@suse.de>
10593         * tree-ssa-structalias.c (do_structure_copy): Properly handle DEREF.
10594         (dump_sa_points_to_info): Remove asserts.
10595         (init_base_vars): nothing_id isn't an escape point nor does it
10596         have pointers.
10598 2010-04-20  Jakub Jelinek  <jakub@redhat.com>
10600         * tree.h (TYPE_REF_IS_RVALUE): Define.
10601         * dwarf2out.c (attr_checksum_ordered, is_type_die, is_comdat_die,
10602         should_move_die_to_comdat, prune_unused_types_walk): Handle
10603         DW_TAG_rvalue_reference_type like DW_TAG_reference_type.
10604         (modified_type_die, gen_reference_type_die): Emit
10605         DW_TAG_rvalue_reference_type instead of DW_TAG_reference_type
10606         if TYPE_REF_IS_RVALUE and -gdwarf-4.
10608 2010-04-20  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
10610         PR target/43635
10611         * config/s390/s390.c (s390_emit_call): Turn direct into indirect
10612         calls for -fpic -m31 if they have been sibcall optimized.
10614 2010-04-19  James E. Wilson  <wilson@codesourcery.com>
10616         * config/ia64/ia64.h (FIXED_REGISTERS, CALL_USED_REGISTERS): Make
10617         ar.lc fixed and call-used.
10619         * config/ia64/ia64.c (TARGET_INVALID_WITHIN_DOLOOP): Define.
10621 2010-04-19  Jan Hubicka  <jh@suse.cz>
10623         * opts.c (decode_options): Disable whpr incompatible passes.
10624         * lto/lto.c (lto_1_to_1_map): Skip clones.
10625         (read_cgraph_and_symbols): Do not mark everything as needed.
10626         (do_whole_program_analysis): Do map only after optimizing;
10627         set proper cgraph_state; use passmanager.
10629 2010-04-19  DJ Delorie  <dj@redhat.com>
10631         * cfgexpand.c (expand_debug_expr): Check for mismatched modes in
10632         POINTER_PLUS_EXPR and fix them.
10634 2010-04-19  Eric B. Weddington  <eric.weddington@atmel.com>
10636         * config/avr/avr-devices.c (avr_mcu_types): Add support for new
10637         devices atmega644pa, attiny2313a, attiny24a, attiny261a, attiny4313,
10638         attiny44a, attiny861a, atmega16a, atmega168a, atmega164a, atmega165a,
10639         atmega169a, atmega169pa, atmega16hva2, atmega324a, atmega324pa,
10640         atmega325a, atmega3250a, atmega328, atmega329a, atmega329pa,
10641         atmega3290a, atmega48a, atmega644a, atmega645a, atmega645p,
10642         atmega6450a, atmega6450p, atmega649a, atmega649p, atmega6490a,
10643         atmega6490p, atmega64hve, atmega88a, atmega88pa, attiny461a, attiny84a,
10644         m3000. Remove support for devices atmega8m1, atmega8c1, atmega16c1,
10645         atmega4hvd, atmega8hvd, attiny327, m3000f, m3000s, m3001b.
10646         * config/avr/t-avr.c (MULTILIB_MATCHES): Same.
10648 2010-04-19  Eric Botcazou  <ebotcazou@adacore.com>
10650         * ifcvt.c (noce_try_cmove_arith): Fix long lines.
10651         (check_cond_move_block): Likewise.
10652         (cond_move_process_if_block): Likewise.
10653         (noce_find_if_block): Improve formatting.
10654         (find_if_header): Pass 0 to memset and tweak conditions.
10655         (cond_exec_find_if_block): Fix long lines and tweak conditions.
10657 2010-04-19  Jakub Jelinek  <jakub@redhat.com>
10659         * dwarf2out.c (lower_bound_default): For DW_LANG_Python return 0
10660         for -gdwarf-4.
10662         PR middle-end/43337
10663         * tree-nested.c (convert_nonlocal_omp_clauses): OMP_CLAUSE_PRIVATE
10664         with non-local decl doesn't need chain.
10666 2010-04-19  Vladimir Makarov  <vmakarov@redhat.com>
10668         * ira-color.c (allocno_reload_assign): Avoid accumulating
10669         reload registers in ALLOCNO_TOTAL_CONFLICT_HARD_REGS.
10671 2010-04-19  Martin Jambor  <mjambor@suse.cz>
10673         * gimple.h (create_tmp_reg): Declare.
10674         * gimplify.c (create_tmp_reg): New function.
10675         (gimplify_return_expr): Use create_tmp_reg.
10676         (gimplify_omp_atomic): Likewise.
10677         (gimple_regimplify_operands): Likewise.
10678         * tree-dfa.c (make_rename_temp): Likewise.
10679         * tree-predcom.c (predcom_tmp_var): Likewise.
10680         (reassociate_to_the_same_stmt): Likewise.
10681         * tree-sra.c (replace_uses_with_default_def_ssa_name): Likewise.
10682         (get_replaced_param_substitute): Likewise.
10683         * tree-ssa-phiprop.c (phiprop_insert_phi): Likewise.
10684         * tree-ssa-phiopt.c (cond_store_replacement): Likewise.
10685         * tree-ssa-pre.c (get_representative_for): Likewise.
10686         (create_expression_by_pieces): Likewise.
10687         * tree-tailcall.c (adjust_return_value_with_ops): Likewise.
10688         (create_tailcall_accumulator): Likewise.
10690 2010-04-19  Martin Jambor  <mjambor@suse.cz>
10692         * cgraphunit.c (cgraph_redirect_edge_call_stmt_to_callee): Update
10693         new_stmt.
10694         (cgraph_materialize_all_clones): Assert !need_ssa_update_p.
10696 2010-04-19  Richard Guenther  <rguenther@suse.de>
10698         PR tree-optimization/43796
10699         * tree-vrp.c (adjust_range_with_scev): Lookup init and step
10700         from SCEV in the lattice.
10701         (vrp_visit_phi_node): Dump change.
10703 2010-04-19  Richard Guenther  <rguenther@suse.de>
10705         * configure.ac: Fix quoting around elf_getshstrndx ABI check.
10706         * configure: Re-generated.
10708 2010-04-19  Richard Guenther  <rguenther@suse.de>
10710         PR tree-optimization/43783
10711         * tree-ssa-pre.c (create_component_ref_by_pieces_1): Drop
10712         constant ARRAY_REF operands two and three if possible.
10714 2010-04-19  Uros Bizjak  <ubizjak@gmail.com>
10716         PR target/43766
10717         * config/i386/i386.c (ix86_decompose_address): Handle ASHIFT addends.
10719 2010-04-19  Jie Zhang  <jie@codesourcery.com>
10721         PR target/43662
10722         * reginfo.c (reinit_regs): Set caller_save_initialized_p to false.
10724 2010-04-19  Ira Rosen  <irar@il.ibm.com>
10726         PR tree-optimization/37027
10727         * tree-vectorizer.h (struct _loop_vec_info): Add new field reductions
10728         and macro to access it.
10729         (vectorizable_reduction): Add argument.
10730         (vect_get_slp_defs): Likewise.
10731         * tree-vect-loop.c (vect_analyze_scalar_cycles_1): Collect reduction
10732         statements for possible use in SLP.
10733         (new_loop_vec_info): Initialize LOOP_VINFO_REDUCTIONS.
10734         (destroy_loop_vec_info): Free LOOP_VINFO_REDUCTIONS.
10735         (vect_create_epilog_for_reduction): Handle SLP. Modify documentation,
10736         add new argument.
10737         (vectorizable_reduction): Likewise.
10738         * tree-vect-stmts.c (vect_get_vec_defs): Update call to
10739         vect_get_slp_defs.
10740         (vectorizable_type_demotion, vectorizable_type_promotion,
10741         vectorizable_store): Likewise.
10742         (vect_analyze_stmt): Update call to vectorizable_reduction.
10743         (vect_transform_stmt): Likewise.
10744         * tree-vect-slp.c (vect_get_and_check_slp_defs): Handle reduction.
10745         (vect_build_slp_tree): Fix indentation. Check that there are no loads
10746         from different interleaving chains in same node.
10747         (vect_slp_rearrange_stmts): New function.
10748         (vect_supported_load_permutation_p): Allow load permutations for
10749         reductions. Call vect_slp_rearrange_stmts() to rearrange statements
10750         inside SLP nodes if necessary.
10751         (vect_analyze_slp_instance): Handle reductions.
10752         (vect_analyze_slp): Try to build SLP instances originating from groups
10753         of reductions.
10754         (vect_detect_hybrid_slp_stmts): Skip reduction statements.
10755         (vect_get_constant_vectors): Create initial vectors for reductions
10756         according to reduction code. Add new argument.
10757         (vect_get_slp_defs): Add new argument, pass it to
10758         vect_get_constant_vectors.
10759         (vect_schedule_slp_instance): Remove SLP tree root statements.
10761 2010-04-19  Jakub Jelinek  <jakub@redhat.com>
10763         * tree.h (ENUM_IS_SCOPED): Define.
10764         * dwarf2out.c (gen_enumeration_type_die): Add DW_AT_enum_class
10765         for ENUM_IS_SCOPED enums.
10767 2010-04-18  Eric Botcazou  <ebotcazou@adacore.com>
10769         * fold-const.c (fold_comparison): Use ssizetype.
10770         * gimple-fold.c (maybe_fold_offset_to_array_ref): Likewise.
10771         * ipa-prop.c (ipa_modify_call_arguments): Use sizetype.
10772         * tree-loop-distribution.c (build_size_arg_loc): Likewise.
10773         * tree-object-size.c (compute_object_sizes): Use size_type_node.
10775         * tree.h (initialize_sizetypes): Remove parameter.
10776         (build_common_tree_nodes): Remove second parameter.
10777         * stor-layout.c (initialize_sizetypes): Remove parameter.
10778         Always create an unsigned type.
10779         (set_sizetype): Assert that the passed type is unsigned and simplify.
10780         * tree.c (build_common_tree_nodes): Remove second parameter.
10781         Adjust call to initialize_sizetypes.
10782         * c-decl.c (c_init_decl_processing): Remove second argument in call to
10783         build_common_tree_nodes.
10785 2010-04-18  Matthias Klose  <doko@ubuntu.com>
10787         * gcc.c (main): Search for liblto_plugin.so with mode R_OK.
10789 2010-04-18  Ira Rosen  <irar@il.ibm.com>
10791         PR tree-optimization/43771
10792         * tree-vect-slp.c (vect_supported_load_permutation_p): Check that
10793         load permutation doesn't have gaps.
10795 2010-04-18  Jan Hubicka  <jh@suse.cz>
10797         * i386.md (UNSPEC_SSE_PROLOGUE_SAVE_LOW): New.
10798         (sse_prologue_save_insn expander): Use new pattern.
10799         (sse_prologue_save_insn1): New pattern and splitter.
10800         (sse_prologue_save_insn): Update to deal also with 64bit aligned
10801         blocks.
10802         * i386.c (setup_incoming_varargs_64): Do not compute jump
10803         destination here.
10804         (ix86_gimplify_va_arg): Update alignment needed.
10805         (ix86_local_alignment): Do not align all local arrays to 128bit.
10807 2010-04-17  Jan Hubicka  <jh@suse.cz>
10809         * ipa-inline.c (cgraph_early_inlining): Handle flattening too.
10811 2010-04-17  Richard Earnshaw  <rearnsha@arm.com>
10813         * arm.md (negdi2): Remove redundant code to force values into a
10814         register.
10816 2010-04-17  Richard Earnshaw  <rearnsha@arm.com>
10818         * arm/bpabi.S: Add EABI alignment attributes to objects.
10819         * arm/bpabi-v6m.S: Likewise.
10820         * arm/crti.asm: Likewise.
10821         * arm/crtn.asm: Likewise.
10822         * arm/lib1funcs.asm: Likewise.
10823         * arm/libunwind.S: Likewise.
10825 2010-04-17  Richard Earnshaw  <rearnsha@arm.com>
10827         * arm-protos.h (tune_params): New structure.
10828         * arm.c (current_tune): New variable.
10829         (arm_constant_limit): Delete.
10830         (struct processors): Add pointer to the tune parameters.
10831         (arm_slowmul_tune): New tuning option.
10832         (arm_fastmul_tune, arm_xscale_tune, arm_9e_tune): Likewise.
10833         (all_cores): Adjust to pick up the tuning model.
10834         (arm_constant_limit): New function.
10835         (arm_override_options): Select the appropriate tuning model.  Delete
10836         initialization of arm_const_limit.
10837         (arm_split_constant): Use the new constant-limit model.
10838         (arm_rtx_costs): Pick up the current tuning model.
10839         * arm.md (is_strongarm, is_xscale): Delete.
10840         * arm-generic.md (load_ldsched_x, load_ldsched): Test explicitly
10841         for Xscale variant architectures.
10842         (mult_ldsched_strongarm, mult_ldsched): Similarly for StrongARM.
10844 2010-04-17  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
10846         * config/arm/arm.c (arm_gen_constant): Remove unused variable
10847         can_shift.
10848         (arm_rtx_costs_1): Remove unused variable extra_cost.
10849         (arm_unwind_emit_set): Use variable offset.
10850         (thumb1_output_casesi): Remove unused variable flags.
10852 2010-04-16  Jeff Law  <law@redhat.com>
10854         * ira-color.c (ira_reassign_pseudos): Collect and sort all the pseudos
10855         needing assignment rather than doing a two-phase assignment.  Remove
10856         unused variable 'm'.
10858 2010-04-16  Jakub Jelinek  <jakub@redhat.com>
10860         PR bootstrap/43767
10861         * alias.c (memrefs_conflict_p): Don't crash if CSELIB_VAL_PTR is NULL.
10863 2010-04-16  Doug Kwan  <dougkwan@google.com>
10865         * tree-ssa-reassoc.c (struct operand_entry): Add new field ID.
10866         (next_operand_entry_id): New static variable.
10867         (sort_by_operand_rank): Stabilize qsort comparator by using unique IDs.
10868         (add_to_ops_vec): Assigned unique ID to operand entry.
10869         (struct oecount_s): New field ID.
10870         (oecount_cmp): Stabilize qsort comparotor by using unique IDs.
10871         (undistribute_ops_list): Assign unique IDs to oecounts.
10872         (init_reassoc): reset next_operand_entry_id.
10874 2010-04-16  Doug Kwan  <dougkwan@google.com>
10876         * config/i386/i386.md (*jcc_bt<mode>): Fix build breakage by adding
10877         missing left parenthesis.
10879 2010-04-16  Uros Bizjak  <ubizjak@gmail.com>
10881         * config/i386/i386.md (*bt<mode>): Macroize insn from *btsi and
10882         *btdi_rex64 using SWI48 mode iterator.
10883         (*jcc_bt<mode>): Ditto from *jcc_btsi and *jcc_btdi_rex64.
10884         (*jcc_bt<mode>_mask): Ditto from *jcc_btsi_mask and
10885         *jcc_btdi_mask_rex64.
10887 2010-04-16  Anatoly Sokolov  <aesok@post.ru>
10889         * double-int.h (tree_to_double_int): Convert to macro.
10890         * double-int.c (tree_to_double_int): Remove.
10892 2010-04-16  Jakub Jelinek  <jakub@redhat.com>
10894         PR debug/43762
10895         * dwarf2out.c (add_bound_info): Always call loc_list_from_tree
10896         with want_address 2 and in case a single element list might be
10897         possible, call it again with want_address 0.
10899 2010-04-12  Kaushik Phatak  <kaushik.phatak@kpitcummins.com>
10901         * config/h8300/h8300.c (print_operand) : Modify case 'V' and
10902         case 'W' print operands for HI mode.
10903         * config/h8300/h8300.h (Y0, Y2) : New constraints.
10904         * config/h8300/h8300.md (bclrqi_msx, bclrhi_msx): New patterns
10905         (bsetqi_msx, bsethi_msx, bnotqi_msx, bnothi_msx): Likewise.
10906         * config/h8300/predicate.md (bit_register_indirect_operand): New.
10908         * config/h8300/h8300.h (OK_FOR_U): Support 'U' constraint for H8300SX.
10910         * config/h8300/h8300.md (movqi_h8sx, movhi_h8sx, movsi_h8sx,
10911         cmphi_h8300hs_znvc, cmpsi, addhi3_h8sx) : Emit instructions in
10912         #xx:3 and #xx:4 mode.
10914         * config/h8300/h8300.md (inverted load with HImode dest): Add
10915         support for H8300SX.
10917         * config/h8300/predicate.md (bit_operand): Allow immediate values that
10918         satisfy 'U' constraint.
10920 2010-04-16  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
10922         * configure.ac: Check for elf_getshdrstrndx or elf_getshstrndx flavor.
10923         * configure: Regenerate.
10924         * config.in: Regenerate.
10925         * doc/install.texi (Prerequisites): Document that Solaris 2 libelf
10926         works.
10928 2010-04-16  Richard Guenther  <rguenther@suse.de>
10930         * tree.h (struct tree_decl_minimal): Move pt_uid ...
10931         (struct tree_decl_common): ... here.
10932         (DECL_PT_UID): Adjust.
10933         (SET_DECL_PT_UID): Likewise.
10934         (DECL_PT_UID_SET_P): Likewise.
10936 2010-04-16  Richard Guenther  <rguenther@suse.de>
10938         PR tree-optimization/43572
10939         * tree-ssa-alias.h (call_may_clobber_ref_p): Declare.
10940         * tree-ssa-alias.c (call_may_clobber_ref_p): Export.
10941         * tree-flow.h (is_call_clobbered): Remove.
10942         * tree-flow-inline.h (is_call_clobbered): Likewise.
10943         * tree-dfa.c (dump_variable): Do not dump call clobber state.
10944         * tree-nrv.c (dest_safe_for_nrv_p): Use the alias oracle.
10945         (execute_return_slot_opt): Adjust.
10946         * tree-tailcall.c (suitable_for_tail_opt_p): Remove
10947         check for call clobbered vars here.
10948         (find_tail_calls): Move tailcall verification to the
10949         proper place.
10951 2010-04-16  Diego Novillo  <dnovillo@google.com>
10953         * doc/invoke.texi: Explain how are unrecognized -Wno- warnings handled.
10955 2010-04-16  Bernd Schmidt  <bernds@codesourcery.com>
10957         PR target/40603
10958         * config/arm/arm.md (cbranchqi4): New pattern.
10959         * config/arm/predicates.md (const0_operand,
10960         cbranchqi4_comparison_operator): New predicates.
10962 2010-04-16  Richard Guenther  <rguenther@suse.de>
10964         * gimple-pretty-print.c (dump_gimple_phi): Dump alias info.
10965         (dump_gimple_stmt): Likewise.
10967 2010-04-16  Bernd Schmidt  <bernds@codesourcery.com>
10969         * recog.h (struct recog_data): New field is_operator.
10970         (struct insn_operand_data): New field is_operator.
10971         * recog.c (extract_insn): Set recog_data.is_operator.
10972         * genoutput.c (output_operand_data): Emit code to set the
10973         is_operator field.
10974         * reload.c (find_reloads): Use it rather than testing for an
10975         empty constraint string.
10977         PR target/41514
10978         * config/arm/arm.md (cbranchsi4_insn): Renamed from "*cbranchsi4_insn".
10979         If the previous insn is a cbranchsi4_insn with the same arguments,
10980         omit the compare instruction.
10982         * config/arm/arm.md (addsi3_cbranch): If destination is a high
10983         register, inputs must be low registers and we need a low register
10984         scratch.  Handle alternative 2 like alternative 3.
10986 2010-04-16  Jakub Jelinek  <jakub@redhat.com>
10988         * alias.c (memrefs_conflict_p): If x and y are the same VALUE,
10989         don't call get_addr on both.  If one expression is a VALUE and
10990         the other a REG, check VALUE's locs if the REG isn't among them.
10992 2010-04-16  Christian Bruel  <christian.bruel@st.com>
10994         * config/sh/sh.h (sh_frame_pointer_required): New function.
10995         * config/sh/sh.h (TARGET_FRAME_POINTER_REQUIRED): New macro.
10996         (flag_omit_frame_pointer) Set.
10997         (MASK_ACCUMULATE_OUTGOING_ARGS) Define and Set.
10998         (rounded_frame_size): Adjust size with outgoing_args_size.
10999         (sh_set_return_address): Must return from stack pointer.
11000         * gcc/config/sh/sh.h (CAN_DEBUG_WITHOUT_FP): Define.
11001         (SUBTARGET_FRAME_POINTER_REQUIRED): Define.
11002         (ACCUMULATE_OUTGOING_ARGS): Define.
11003         * doc/invoke.texi (maccumulate-outgoing-args): Document for SH.
11004         * gcc/config/sh/sh.opt (maccumulate-outgoing-args): New option.
11006 2010-04-15  Kaz Kojima  <kkojima@gcc.gnu.org>
11008         PR target/43471
11009         * config/sh/sh.c (sh_legitimize_reload_address): Use
11010         MAYBE_BASE_REGISTER_RTX_P instead of BASE_REGISTER_RTX_P.
11011         Remove a unneeded check for offset_base.
11013 2010-04-15  H.J. Lu  <hongjiu.lu@intel.com>
11015         * configure: Regenerated.
11017 2010-04-15  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
11019         * config/s390/s390.c (s390_call_save_register_used): Switch back
11020         to HARD_REGNO_NREGS.
11022 2010-04-15  Richard Guenther  <rguenther@suse.de>
11024         * alias.c (alias_set_subset_of): Handle alias-set zero
11025         child properly.
11027 2010-04-15  Mark Shinwell  <shinwell@codesourcery.com>
11028             Julian Brown  <julian@codesourcery.com>
11030         * config/arm/thumb2.md (thumb2_movsi_insn): Split ldr and str
11031         alternatives according to use of high and low regs.
11032         * config/arm/vfp.md (thumb2_movsi_vfp): Likewise.
11033         * config/arm/arm.h (CONDITIONAL_REGISTER_USAGE): Use high regs when
11034         optimizing for size on Thumb-2.
11036 2010-04-15  Thomas Schwinge  <tschwinge@gnu.org>
11038         * config.gcc <i[34567]86-*-gnu*>: Handle softfp as for Linux.
11040 2010-04-15  Richard Guenther  <rguenther@suse.de>
11042         * tree-ssa-structalias.c (struct variable_info): Add
11043         is_fn_info flag.
11044         (new_var_info): Initialize it.
11045         (dump_constraints): Support printing last added constraints.
11046         (debug_constraints): Adjust.
11047         (dump_constraint_graph): Likewise.
11048         (make_heapvar_for): Check for NULL cfun.
11049         (get_function_part_constraint): New function.
11050         (get_fi_for_callee): Likewise.
11051         (find_func_aliases): Properly implement IPA PTA constraints.
11052         (process_ipa_clobber): New function.
11053         (find_func_clobbers): Likewise.
11054         (insert_into_field_list_sorted): Remove.
11055         (create_function_info_for): Properly allocate vars for IPA mode.
11056         Do not use insert_into_field_list_sorted.
11057         (create_variable_info_for): Properly generate constraints for
11058         global vars in IPA mode.
11059         (dump_solution_for_var): Always dump the solution.
11060         (set_uids_in_ptset): Initialize DECL_PT_UID if in ipa-mode.
11061         (find_what_var_points_to): Adjust.
11062         (pt_solution_set): Change.
11063         (pt_solution_ior_into): New function.
11064         (pt_solution_empty_p): Export.
11065         (pt_solution_includes_global): Adjust.
11066         (pt_solution_includes_1): Likewise.
11067         (pt_solutions_intersect_1): Likewise.
11068         (dump_sa_points_to_info): Check some invariants.
11069         (solve_constraints): Move constraint dumping ...
11070         (compute_points_to_sets): ... here.
11071         (ipa_pta_execute): ... and here.
11072         (compute_may_aliases): Do not re-compute points-to info
11073         locally if IPA info is available.
11074         (ipa_escaped_pt): New global var.
11075         (ipa_pta_execute): Properly implement IPA PTA.
11076         * tree-into-ssa.c (dump_decl_set): Support dumping
11077         decls not in referenced-vars.
11078         * tree-flow.h (struct gimple_df): Add ipa_pta flag.
11079         * tree-ssa-alias.c (ptr_deref_may_alias_decl_p): Adjust.
11080         (dump_points_to_solution): Likewise.
11081         * tree-dfa.c (dump_variable): Also dump DECL_PT_UID.
11082         * tree-inline.c (remap_ssa_name): Copy IPA points-to solution.
11083         (remap_gimple_stmt): Reset call clobber/use information if necessary.
11084         (copy_decl_to_var): Copy DECL_PT_UID.
11085         (copy_result_decl_to_var): Likewise.
11086         * tree.c (make_node_stat): Initialize DECL_PT_UID.
11087         (copy_node_stat): Copy it.
11088         * tree.h (DECL_PT_UID): New macro.
11089         (SET_DECL_PT_UID): Likewise.
11090         (DECL_PT_UID_SET_P): Likewise.
11091         (struct tree_decl_minimal): Add pt_uid member.
11092         * tree-ssa-alias.h (struct pt_solution): Add ipa_escaped flag.
11093         (pt_solution_empty_p): Declare.
11094         (pt_solution_set): Adjust.
11095         (ipa_escaped_pt): Declare.
11096         * cfgexpand.c (update_alias_info_with_stack_vars): Adjust.
11097         * gimple-pretty-print.c (pp_points_to_solution): New function.
11098         (dump_gimple_call): Dump call clobber/use information.
11099         * tree-dump.c (dump_option_value_in): Add TDF_ALIAS entry.
11100         * tree-pass.h (TDF_ALIAS): New dump option.
11101         * tree-pretty-print.c (dump_decl_name): Dump DECL_PT_UID if asked to.
11102         * doc/invoke.texi (-fipa-pta): Update documentation.
11104 2010-04-15  Richard Guenther  <rguenther@suse.de>
11106         * Makefile.in (OBJS-common): Add gimple-fold.o.
11107         (gimple-fold.o): New rule.
11108         * tree.h (maybe_fold_offset_to_reference,
11109         maybe_fold_offset_to_address, maybe_fold_stmt_addition): Move
11110         prototypes ...
11111         * gimple.h: ... here.
11112         * tree-flow.h (fold_stmt, fold_stmt_inplace, get_symbol_constant_value,
11113         may_propagate_address_into_dereference): Move prototypes ...
11114         * gimple.h: ... here.
11115         * tree-ssa-ccp.c (get_symbol_constant_value,
11116         may_propagate_address_into_dereference, maybe_fold_offset_to_array_ref,
11117         maybe_fold_offset_to_component_ref, maybe_fold_offset_to_reference,
11118         maybe_fold_offset_to_address, maybe_fold_stmt_indirect,
11119         maybe_fold_stmt_addition, maybe_fold_reference, get_maxval_strlen,
11120         ccp_fold_builtin, fold_gimple_assign, fold_gimple_cond,
11121         fold_gimple_call, fold_stmt_1, fold_stmt, fold_stmt_inplace,
11122         gimplify_and_update_call_from_tree): Move ...
11123         * gimple-fold.c: ... here.  New file.
11124         (ccp_fold_builtin): Rename to ...
11125         (gimple_fold_builtin): ... this.
11126         * tree-ssa-ccp.c (execute_fold_all_builtins): Adjust.
11128 2010-04-15  Richard Guenther  <rguenther@suse.de>
11130         * fold-const.c (LOWPART, HIGHPART, BASE, encode, decode,
11131         fit_double_type, force_fit_type_double, add_double_with_sign,
11132         neg_double, mul_double_with_sign, lshift_double, rshift_double,
11133         lrotate_double, rrotate_double, div_and_round_double): Move ...
11134         * double-int.c: ... here.
11135         * tree.h (force_fit_type_double, fit_double_type, add_double_with_sign,
11136         add_double, neg_double, mul_double_with_sign, mul_double,
11137         lshift_double, rshift_double, lrotate_double, rrotate_double,
11138         div_and_round_double): Move prototypes ...
11139         * double-int.h: ... here.
11141 2010-04-15  Bernd Schmidt  <bernds@codesourcery.com>
11143         PR target/43742
11144         * config/sh/sh.md (doloop_end_split, dect): Undo previous patch.  Use
11145         matching constraints to ensure inputs match the output.
11147 2010-04-15  Kaz Kojima  <kkojima@gcc.gnu.org>
11149         PR target/43742
11150         * config/sh/sh.md (doloop_end_split): Remove "+r" constraint
11151         in an input-only operand.
11153 2010-04-15  Anatoly Sokolov  <aesok@post.ru>
11155         * double-int.h (HOST_BITS_PER_DOUBLE_INT): Define.
11156         (double_int_not, double_int_lshift, double_int_rshift): Declare.
11157         (double_int_negative_p): Convert to static inline function.
11158         * double-int.c (double_int_lshift, double_int_lshift): New functions.
11159         (double_int_negative_p): Remove.
11160         * tree.h (lshift_double, rshift_double):
11161         * tree.c (build_low_bits_mask): Clean up, use double_int_* functions.
11162         * fold-const.c (fold_convert_const_int_from_real,
11163         fold_convert_const_int_from_fixed, div_if_zero_remainder): (Ditto.).
11164         (lshift_double): Change type of arith argument to bool.
11165         (rshift_double): Change type of arith argument to bool. Correct
11166         comment.
11167         * expmed.c (mask_rtx, lshift_value): (Ditto.).
11169 2010-04-14  Bernd Schmidt  <bernds@codesourcery.com>
11171         PR target/21803
11172         * ifcvt.c (cond_exec_process_if_block): Look for identical sequences
11173         at the start and end of the then/else blocks, and omit them from the
11174         conversion.
11175         * cfgcleanup.c (flow_find_cross_jump): No longer static.  Remove MODE
11176         argument; all callers changed.  Pass zero to old_insns_match_p instead.
11177         (flow_find_head_matching_sequence): New function.
11178         (old_insns_match_p): Check REG_EH_REGION notes for calls.
11179         * basic-block.h (flow_find_cross_jump,
11180         flow_find_head_matching_sequence): Declare functions.
11182 2010-04-14  Jason Merrill  <jason@redhat.com>
11184         PR c++/36625
11185         * c-common.c (attribute_takes_identifier_p): New fn.
11186         * c-common.h: Declare it.
11188 2010-04-14  Uros Bizjak  <ubizjak@gmail.com>
11190         * config/i386/i386.md (*divmod<mode>4): Remove stray "&&" from
11191         splitter condition.
11192         (*udivmod<mode>4): Ditto.
11194 2010-04-14  Uros Bizjak  <ubizjak@gmail.com>
11196         * config/i386/i386.md (maxmin_int): Rename code attribute from
11197         maxminiprefix and update all users.
11198         (maxmin_float): Ditto from maxminfprefix.
11199         (logic): Ditto from logicprefix.
11200         (absneg_mnemonic): Ditto from absnegprefix.
11201         * config/i386/mmx.md: Update all users of maxminiprefix,
11202         maxminfprefix and logicprefix for rename.
11203         * config/i386/sse.md: Ditto.
11204         * config/i386/sync.md (sync_<code><mode>): Update for
11205         logicprefix rename.
11207 2010-04-14  Manuel López-Ibáñez  <manu@gcc.gnu.org>
11209         PR 42966
11210         * diagnostics.c (diagnostic_report_diagnostic): Mark specially
11211         warnings converted to errors.
11213 2010-04-14  Uros Bizjak  <ubizjak@gmail.com>
11215         * config/alpha/alpha.c (alpha_adjust_cost): Remove set but not
11216         used insn_type variable.
11217         (function_value): Add ATTRIBUTE_UNUSED to dummy variable declaration
11218         to avoid set-but-not-used warning.
11220 2010-04-14  Uros Bizjak  <ubizjak@gmail.com>
11222         * df-core.c (df_ref_debug): Change format string placeholder
11223         from 0x%x to %#x.
11224         * dwarf2asm.c (dw2_asm_output_data_raw,
11225         dw2_asm_output_data_uleb128_raw, dw2_asm_output_data_uleb128,
11226         dw2_asm_output_data_sleb128_raw, dw2_asm_output_data_sleb128): Ditto.
11227         * dwarf2out.c (output_cfi, output_cfi_directive,
11228         dwarf2out_do_cfi_startproc, output_loc_sequence_raw,
11229         output_cfa_loc_raw, output_die, output_ranges, output_file_names):
11230         Ditto.
11231         * genattrtab.c (write_test_expr, write_attr_valueq): Ditto.
11232         * print-rtl.c (print_rtx): Ditto.
11234 2010-04-14  Michael Meissner  <meissner@linux.vnet.ibm.com>
11236         PR middle-end/42694
11237         * builtins.c (expand_builtin_pow_root): New function to expand pow
11238         calls with exponents 0.25, 0.50, 0.75, 1./3., and 1./6. into a
11239         series of sqrt and cbrt calls under -ffast-math.
11240         (expand_builtin_pow): Call it.
11242 2010-04-14  Michael Matz  <matz@suse.de>
11244         PR tree-optimization/42963
11245         * tree-cfg.c (touched_switch_bbs): New static variable.
11246         (group_case_labels_stmt): New function broken out from ...
11247         (group_case_labels): ... here, use the above.
11248         (start_recording_case_labels): Allocate touched_switch_bbs.
11249         (end_recording_case_labels): Deallocate it, call
11250         group_case_labels_stmt.
11251         (gimple_redirect_edge_and_branch): Remember index of affected BB.
11253 2010-04-14  Uros Bizjak  <ubizjak@gmail.com>
11255         * config/i386/i386.md (*popcountsi2_cmp_zext): Remove mode attribute
11256         from insn template.
11258 2010-04-14  Uros Bizjak  <ubizjak@gmail.com>
11260         * config/i386/i386.md (*ashlqi3_1_slp): New insn pattern.
11262 2010-04-13  Jan Hubicka  <jh@suse.cz>
11264         * ipa-inline.c (cgraph_mark_inline_edge): Avoid double accounting
11265         of optimized out static functions.
11266         (cgraph_edge_badness): Add DUMP parameter and dump reasons for the
11267         cost computation.  Also sanity check for overflows.
11268         (update_caller_keys): Update cgraph_edge_badness call; properly
11269         update fibheap and sanity check that it is up to date.
11270         (add_new_edges_to_heap): Update cgraph_edge_badness.
11271         (cgraph_decide_inlining_of_small_function): Likewise;
11272         add sanity checking that badness in heap is up to date;
11273         improve dumping of reason; Update badness of calls to the
11274         offline copy of function currently inlined; dump badness
11275         of functions not inlined because of unit growth limits.
11277 2010-04-13  Eric Botcazou  <ebotcazou@adacore.com>
11279         PR middle-end/32628
11280         * c-common.c (pointer_int_sum): Disregard overflow that occured only
11281         because of sign-extension change when converting to sizetype here...
11282         * fold-const.c (fold_convert_const_int_from_int): ...and not here.
11284         * fold-const.c (fold_binary_op_with_conditional_arg): Do not restrict
11285         the folding to constants.  Remove redundant final conversion.
11286         (fold_binary) <associate>: Do not associate if the re-association of
11287         constants alone overflows.
11288         (fold_binary) <FLOOR_MOD_EXPR>: Move transformation into BIT_AND_EXPR
11289         to the end of the list.
11290         (multiple_of_p) <COND_EXPR>: New case.
11292 2010-04-13  Manuel López-Ibáñez  <manu@gcc.gnu.org>
11294         * opt-functions.awk (opt_sanitized_name): New.
11295         (opt_enum): New.
11296         * optc-gen.awk: Use it
11297         * opth-gen.awk: Use it.
11299 2010-04-13  Martin Jambor  <mjambor@suse.cz>
11301         * tree-sra.c (replace_uses_with_default_def_ssa_name): New function.
11302         (sra_modify_assign): Delete stmts loading dead data even if racc has no
11303         children.  Call replace_uses_with_default_def_ssa_name to handle
11304         SSA_NAES on lhs.
11306 2010-04-13  Michael Matz  <matz@suse.de>
11308         PR middle-end/43730
11309         * builtins.c (expand_builtin_interclass_mathfn): Also create
11310         a register if the predicate doesn't match.
11312 2010-04-13  Diego Novillo  <dnovillo@google.com>
11314         * Makefile.in (c-pch.o, ggc-common.o): Depend on timevar.h.
11315         * c-pch.c: Include timevar.h.
11316         (c_common_write_pch): Use TV_PCH_SAVE and TV_PCH_CPP_SAVE timers.
11317         (c_common_read_pch): Use TV_PCH_RESTORE and TV_PCH_CPP_RESTORE timers.
11318         * ggc-common.c: Include timevar.h.
11319         (gt_pch_save): Use TV_PCH_PTR_REALLOC and TV_PCH_PTR_SORT timers.
11320         * timevar.def (TV_PCH_SAVE): Define.
11321         (TV_PCH_CPP_SAVE): Define.
11322         (TV_PCH_PTR_REALLOC): Define.
11323         (TV_PCH_PTR_SORT): Define.
11324         (TV_PCH_RESTORE): Define.
11325         (TV_PCH_CPP_RESTORE): Define.
11327 2010-04-13  Michael Matz  <matz@suse.de>
11329         * tree-ssa-reassoc.c (repropagate_negates): Merge negates also
11330         into MINUS_EXPRs.
11331         (can_reassociate_p): New function.
11332         (break_up_subtract_bb, reassociate_bb): Use it.
11334 2010-04-13  Richard Guenther  <rguenther@suse.de>
11336         PR bootstrap/43737
11337         * builtins.c (c_readstr): Fix assert.
11339 2010-04-13  Uros Bizjak  <ubizjak@gmail.com>
11341         * config/i386/i386.md (extendsidi2 splitter): Also check for DX_REG
11342         when generating cltd insn.
11344         (*ashl<mode>3_1): Remove special handling for register operand 2.
11345         (*ashlsi3_1_zext): Ditto.
11346         (*ashlhi3_1): Ditto.
11347         (*ashlhi3_1_lea): Ditto.
11348         (*ashlqi3_1): Ditto.
11349         (*ashlqi3_1_lea): Ditto.
11350         (*<shiftrt_insn><mode>3_1): Ditto.
11351         (*<shiftrt_insn>si3_1_zext): Ditto.
11352         (*<shiftrt_insn>qi3_1_slp): Ditto.
11353         (*<rotate_insn><mode>3_1): Ditto.
11354         (*<rotate_insn>si3_1_zext): Ditto.
11355         (*<rotate_insn>qi3_1_slp): Ditto.
11357 2010-04-13  Richard Guenther  <rguenther@suse.de>
11359         * tree-ssa-structalias.c (callused_id): Remove.
11360         (call_stmt_vars): New.
11361         (get_call_vi): Likewise.
11362         (lookup_call_use_vi): Likewise.
11363         (lookup_call_clobber_vi): Likewise.
11364         (get_call_use_vi): Likewise.
11365         (get_call_clobber_vi): Likewise.
11366         (make_transitive_closure_constraints): Likewise.
11367         (handle_const_call): Adjust to do per-call call-used handling.
11368         (handle_pure_call): Likewise.
11369         (find_what_var_points_to): Remove general callused handling.
11370         (init_base_vars): Likewise.
11371         (init_alias_vars): Initialize call_stmt_vars.
11372         (compute_points_to_sets): Process call-used and call-clobbered
11373         vars for call statements.
11374         (delete_points_to_sets): Free call_stmt_vars.
11376 2010-04-13  Richard Guenther  <rguenther@suse.de>
11378         * tree-vect-data-refs.c (vect_analyze_data_ref_dependence):
11379         Only add RW dependence for dependence distance zero.
11380         Adjust maximal vectorization factor according to dependences.
11381         Move alignment handling ...
11382         (vect_find_same_alignment_drs): ... here.  New function.
11383         (vect_analyze_data_ref_dependences): Adjust.
11384         (vect_analyze_data_refs_alignment): Call vect_find_same_alignment_drs.
11385         (vect_analyze_data_refs): Adjust minimal vectorization factor
11386         according to data references.
11387         * tree-vect-loop.c (vect_analyze_loop): Analyze data-ref
11388         dependences before determining the vectorization factor.
11389         Analyze alignment after determining the vectorization factor.
11390         * tree-vect-slp.c ((vect_slp_analyze_bb): Analyze data-ref
11391         dependences before alignment.
11392         * tree-vectorizer.h (vect_analyze_data_ref_dependences):
11393         Adjust prototype.
11394         (vect_analyze_data_refs): Likewise.
11395         (MAX_VECTORIZATION_FACTOR): New define.
11397 2010-04-13  Duncan Sands  <baldrick@free.fr>
11399         * except.h (lang_eh_type_covers): Remove.
11400         * except.c (lang_eh_type_covers): Likewise.
11402 2010-04-13  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
11403             Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
11405         * gcc/config/s390/s390.md: Replace TARGET_64BIT with TARGET_ZARCH.
11406         * gcc/config/s390/s390.c: Replace UNTIS_PER_WORD with
11407         UNITS_PER_LONG where it is ABI relevant.
11408         (s390_return_addr_rtx): Likewise.
11409         (s390_back_chain_rtx): Likewise.
11410         (s390_frame_area): Likewise.
11411         (s390_frame_info): Likewise.
11412         (s390_initial_elimination_offset): Likewise.
11413         (save_gprs): Likewise.
11414         (s390_emit_prologue): Likewise.
11415         (s390_emit_epilogue): Likewise.
11416         (s390_function_arg_advance): Likewise.
11417         (s390_function_arg): Likewise.
11418         (s390_va_start): Likewise.
11419         (s390_gimplify_va_arg): Likewise.
11420         (s390_function_profiler): Likewise.
11421         (s390_optimize_prologue): Likewise.
11422         (s390_rtx_costs): Likewise.
11423         (s390_secondary_reload): Likewise.
11424         (s390_promote_function_mode): Likewise.
11425         (s390_hard_regno_mode_ok): Replace TARGET_64BIT with TARGET_ZARCH.
11426         (s390_scalar_mode_supported_p): Disallow TImode if no 64 bit
11427         registers available.
11428         (s390_unwind_word_mode): New function.
11429         (s390_function_value): Split 64 bit values into register pair if
11430         used as return value.
11431         (s390_call_saved_register_used): Don't use HARD_REGNO_NREGS for
11432         function call parameters.  Handle parallels.
11433         (TARGET_SCALAR_MODE_SUPPORTED_P): New macro.
11434         (HARD_REGNO_CALL_PART_CLOBBERED): New macro.
11435         (DWARF_CIE_DATA_ALIGNMENT): New macro.
11436         (s390_expand_setmem): Remove unused variable src_addr.
11437         * gcc/longlong.h: Make smul_ppmm and sdiv_qrnnd inline asms to
11438         deal with 64 bit registers.
11439         * gcc/config/s390/s390.h: Define __zarch__ predefined macro.
11440         Replace UNITS_PER_WORD with UNITS_PER_LONG where it is ABI relevant.
11441         (UNITS_PER_LONG): New macro.
11442         * libjava/include/s390-signal.h: Define extended ucontext
11443         structure containing the upper halfs of the 64 bit registers.
11445 2010-04-13  Simon Baldwin  <simonb@google.com>
11447         * cfgexpand.c (gimple_expand_cfg): Clarify warning message text.
11449 2010-04-13  Eric Botcazou  <ebotcazou@adacore.com>
11451         * gimple.c (walk_gimple_op) <GIMPLE_ASSIGN>: Do not request a pure
11452         rvalue on the RHS if the LHS is of a non-renamable type.
11453         * tree-ssa-ccp.c (maybe_fold_offset_to_component_ref): Fold result.
11455 2010-04-13  Matthias Klose  <doko@ubuntu.com>
11457         * gcc.c (cc1_options): Handle -iplugindir before processing
11458         the cc1 spec. Only add -iplugindir once.
11459         (cpp_unique_options): Add -iplugindir option if -fplugin* options
11460         found.
11461         * common.opt (iplugindir): Remove `Separate' property, initialize.
11462         * plugin.c (default_plugin_dir_name): Error with missing -iplugindir
11463         option.
11464         * Makefile.in (check-%, check-parallel-%): Create plugin dir.
11465         (distclean): Remove plugin dir.
11466         * doc/invoke.texi: Document -iplugindir.
11468 2010-04-13  Basile Starynkevitch  <basile@starynkevitch.net>
11470         * doc/plugins.texi (Loading Plugins): Document short
11471         -fplugin=foo option.
11472         (Plugin API): Mention default_plugin_dir_name function.
11474         * gcc.c (find_file_spec_function): Add new declaration.
11475         (static_spec_func): Use it for "find-file".
11476         (find_file_spec_function): Add new function.
11477         (cc1_options): Add -iplugindir option if -fplugin* options found.
11479         * gcc-plugin.h (default_plugin_dir_name): Added new declaration.
11481         * plugin.c (add_new_plugin): Updated comment, and handle short
11482         plugin name.
11483         (default_plugin_dir_name): Added new function.
11485         * common.opt (iplugindir): New option to set the plugin directory.
11487 2010-04-12  Uros Bizjak  <ubizjak@gmail.com>
11489         * config/i386/i386.md (any_rotate): New code iterator.
11490         (rotate_insn): New code attribute.
11491         (rotate): Ditto.
11492         (SWIM124): New mode iterator.
11493         (<rotate_insn>ti3): New expander.
11494         (<rotate_insn>di3): Macroize expander from {rotl,rotr}di3 using
11495         any_rotate code iterator.
11496         (<rotate_insn><mode>3) Macroize expander from {rotl,rotr}{qi,hi,si}3
11497         using any_rotate code iterator and SWIM124 mode iterator.
11498         (ix86_rotlti3): New insn_and_split pattern.
11499         (ix86_rotrti3): Ditto.
11500         (ix86_rotl<dwi>3_doubleword): Macroize insn_and_split pattern from
11501         ix86_rotl{di,ti}3 patterns.
11502         (ix86_rotr<dwi>3_doubleword): Ditto from ix86_rotr{di,ti}3 patterns.
11503         (*<rotate_insn><mode>3_1): Merge with *{rotl,rotr}{qi,hi,si}3_1_one_bit
11504         and *{rotl,rotr}di3_1_one_bit_rex64. Macroize insn from
11505         *{rotl,rotr}{qi,hi,si}3_1 and *{rotl,rotr}di3_1_rex64 using any_rotate
11506         code iterator and SWI mode iterator.
11507         (*<rotate_insn>si3_1_zext): Merge with *{rotl,rotr}si3_1_one_bit_zext.
11508         Macroize insn from {rotl,rotr}si3_1_zext using any_rotate
11509         code iterator.
11510         (*<rotate_insn>qi3_1_slp): Merge with *{rotl,rotr}qi3_1_one_bit_slp.
11511         Macroize insn from {rotl,rotr}qi3_1_slp using any_rotate code iterator.
11512         (bswap rotatert splitter): Add splitter.
11513         (bswap splitter): Macroize splitter using any_rotate code iterator.
11514         Add insn predicate to split only for TARGET_USE_XCHGB or when
11515         optimizing function for size.
11517 2010-04-12  Steve Ellcey  <sje@cup.hp.com>
11519         * config/pa/pa.c (emit_move_sequence): Remove use of
11520         deleted variable flag_argument_noalias.
11522 2010-04-12  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
11524         * config.gcc: Removed *-*-solaris2.7* from list of obsolete
11525         configurations.
11526         Add to unsupported targets list.
11527         * configure.ac (gcc_cv_as_tls): Removed i[34567]86-*-solaris2.[567]*,
11528         sparc*-sun-solaris2.[567]* from target lists.
11529         * configure: Regenerate.
11530         * doc/install.texi (Specific, *-*-solaris2*): Document Solaris 7
11531         removal.
11532         Remove Solaris 7 patch references.
11533         (Specific, sparc-sun-solaris2.7): Removed.
11534         (sparc-sun-solaris2*): Update Solaris 7 example.
11535         (sparc64-*-solaris2*): Likewise.
11537 2010-04-12  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
11539         * config.build (alpha*-dec-osf4*): Remove.
11540         * config.gcc: Remove alpha*-dec-osf4*, alpha-dec-osf5.0* from list
11541         of obsolete configurations.
11542         (alpha*-dec-osf[45]*): Remove alpha*-dec-osf4*, alpha-dec-osf5.0*
11543         support.
11544         * config/alpha/t-osf4: Renamed to ...
11545         * config/alpha/t-osf5: ... this.
11546         * config/alpha/osf.h: Renamed to ...
11547         * config/alpha/osf5.h: ... this.
11548         Merged old osf5.h contents.
11549         Update comments.
11550         (ASM_SPEC): Use ASM_OLDAS_SPEC directly.
11551         (EXTRA_SPECS): Removed.
11552         * doc/install.texi (Specific, alpha*-dec-osf5.1): Renamed to
11553         reflect removal of Tru64 UNIX V4.0/V5.0 support.
11554         Document that.
11556 2010-04-12  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
11558         * doc/contrib.texi (Contributors, Rainer Orth): Update.
11560 2010-04-12  Kai Tietz  <kai.tietz@onevision.com>
11562         PR/43702
11563         * config/i386/i386.c (x86_this_parameter): Handle aggregate for
11564         __thiscall convention.
11566 2010-04-12  Steve Ellcey  <sje@cup.hp.com>
11568         * config/pa/pa.c (hppa_legitimize_address): Remove unused variable
11569         orig_base.
11570         * config/pa/pa.md (call, call_value): Remove unused variable call_insn.
11572 2010-04-12  Steve Ellcey  <sje@cup.hp.com>
11574         * function.c (assign_parms_initialize_all): Add unused attribute
11575         to fntype.
11577 2010-04-12  Richard Guenther  <rguenther@suse.de>
11579         * gsstruct.def (GSS_CALL): New.
11580         * gimple.def (GIMPLE_CALL): Change to GSS_CALL.
11581         * gimple.h: Include tree-ssa-alias.h.
11582         (struct gimple_statement_call): New.
11583         (union gimple_statement_struct_d): Add gimple_call member.
11584         (gimple_call_reset_alias_info): Declare.
11585         (gimple_call_use_set): New function.
11586         (gimple_call_clobber_set): Likewise.
11587         * Makefile.in (GIMPLE_H): Add tree-ssa-alias.h.
11588         * gimple.c (gimple_call_reset_alias_info): New function.
11589         (gimple_build_call_1): Call it.
11590         * lto-streamer-in.c (input_gimple_stmt): Likewise.
11591         * tree-inline.c (remap_gimple_stmt): Likewise.
11592         (expand_call_inline): Remove callused handling.
11593         * cfgexpand.c (update_alias_info_with_stack_vars): Likewise.
11594         * tree-dfa.c (dump_variable): Likewise.
11595         * tree-parloops.c (parallelize_loops): Likewise.
11596         * tree-ssa.c (init_tree_ssa): Likewise.
11597         (delete_tree_ssa): Likewise.
11598         * tree-flow-inline.h (is_call_used): Remove.
11599         * tree-flow.h (struct gimple_df): Remove callused member.
11600         * tree-nrv.c (dest_safe_for_nrv_p): Adjust predicate.
11601         * tree-ssa-alias.c (dump_alias_info): Remove callused handling.
11602         (ref_maybe_used_by_call_p_1): Simplify.
11603         (call_may_clobber_ref_p_1): Likewise.
11604         * tree-ssa-structalias.c (compute_points_to_sets): Set
11605         the call stmt used and clobbered sets.
11606         * tree-tailcall.c (suitable_for_tail_opt_p): Adjust predicate.
11607         (find_tail_calls): Verify the tail call.
11609 2010-04-12  Richard Guenther  <rguenther@suse.de>
11611         * ipa.c (cgraph_postorder): Adjust postorder to guarantee
11612         single-iteration always-inline inlining.
11613         * ipa-inline.c (cgraph_mark_inline): Do not return anything.
11614         (cgraph_decide_inlining): Do not handle always-inline specially.
11615         (try_inline): Remove always-inline cycle detection special case.
11616         Do not recurse on always-inlines.
11617         (cgraph_early_inlining): Do not iterate if not optimizing.
11618         (cgraph_gate_early_inlining): remove.
11619         (pass_early_inline): Run unconditionally.
11620         (gate_cgraph_decide_inlining): New function.
11621         (pass_ipa_inline): Use it.  Do not run the IPA inliner if
11622         not inlining or optimizing.
11623         (cgraph_decide_inlining_of_small_functions): Also consider
11624         always-inline functions.
11625         (cgraph_default_inline_p): Return true for nodes which should
11626         disregard inline limits.
11627         (estimate_function_body_sizes): Assume zero size and time for
11628         nodes which are marked as disregarding inline limits.
11629         (cgraph_decide_recursive_inlining): Do not perform recursive
11630         inlining on always-inline nodes.
11632 2010-04-12  Jakub Jelinek  <jakub@redhat.com>
11634         PR bootstrap/43699
11635         * c-typeck.c (c_process_expr_stmt): Call mark_exp_read even
11636         for exprs satisfying handled_component_p.
11638 2010-04-12  Eric Botcazou  <ebotcazou@adacore.com>
11640         * expr.c (categorize_ctor_elements_1): Properly count sub-elements of
11641         non-constant aggregate elements.
11643         * gimplify.c (gimplify_init_constructor): Do not pre-evaluate if this
11644         is a real initialization.
11646 2010-04-12  Shujing Zhao  <pearly.zhao@oracle.com>
11648         PR c/36774
11649         * c-decl.c (start_function): Move forward check for nested function.
11651 2010-04-11  Kaz Kojima  <kkojima@gcc.gnu.org>
11653         * config/sh/sh-protos.h (sh_legitimize_reload_address): Declare.
11654         * config/sh/sh.c: Include reload.h.
11655         (sh_legitimize_reload_address): New.
11656         * config/sh/sh.h (LEGITIMIZE_RELOAD_ADDRESS): Use
11657         sh_legitimize_reload_address.
11659 2010-04-11  Kaushik Phatak  <kaushik.phatak@kpitcummins.com>
11661         * config/sh/sh.md (*movqi_pop): New insn pattern.
11662         * config/sh/predicates.md (sh_no_delay_pop_operand): New predicate.
11664 2010-04-11  Uros Bizjak  <ubizjak@gmail.com>
11666         * config/i386/i386.md (any_shiftrt): New code iterator.
11667         (shiftrt_insn): New code attribute.
11668         (shiftrt): Ditto.
11669         (<shiftrt_insn><mode>3): Macroize expander from {ashr,lshr}<mode>3
11670         using any_shiftrt code iterator.
11671         (*<shiftrt_insn><mode>3_doubleword): Macroize insn_and_split from
11672         *{ashr,lshr}<mode>3_doubleword using any_shiftrt code iterator.
11673         (*<shiftrt_insn><mode>3_doubleword peephole2): Macroize peephole2
11674         pattern from corresponding peephole2 patterns.
11675         (*<shiftrt_insn><mode>3_1): Macroize insn from *{ashr,lshr}<mode>3_1
11676         using any_shiftrt code iterator.
11677         (*<shiftrt_insn>si3_1_zext): Ditto from *{ashr,lshr}si3_1_zext.
11678         (*<shiftrt_insn>qi3_1_slp): Ditto from *{ashr,lshr}qi3_1_slp.
11679         (*<shiftrt_insn><mode>3_cmp): Ditto from *{ashr,lshr}<mode>3_cmp.
11680         (*<shiftrt_insn><mode>3_cmp_zext): Ditto from
11681         *{ashr,lshr}<mode>3_cmp_zext.
11682         (*<shiftrt_insn><mode>3_cconly): Ditto from *{ashr,lshr}<mode>3_cconly.
11684 2010-04-11  Uros Bizjak  <ubizjak@gmail.com>
11686         * config/i386/i386.md (*ashr<mode>3_cconly): Fix wrong mode of
11687         scratch register.
11688         (*lshr<mode>3_cconly): Ditto.
11690 2010-04-11  Uros Bizjak  <ubizjak@gmail.com>
11692         * config/i386/i386.md (lshr<mode>3): Macroize expander from
11693         lshr{qi,hi,si,di,ti}3_1 using SDWIM mode iterator.
11694         (*lshr<mode>3_doubleword): New insn_and_split_pattern.  Macroize
11695         pattern from *lshr{di,ti}3_1 and corresponding splitters using
11696         DWI mode iterator.
11697         (*lshr<mode>3_doubleword peephole2): Macroize peephole2 pattern
11698         from corresponding peephole2 patterns.
11699         (*lshr<mode>3_1): Merge with *lshr{qi,hi,si}3_1_one_bit and
11700         *lshrdi3_1_one_bit_rex64. Macroize insn from *lshr{qi,hi,si}3_1
11701         and *lshrdi3_1_rex64 using SWI mode iterator.
11702         (*lshrsi3_1_zext): Merge with *lshrsi3_1_one_bit_zext.
11703         (*lshrqi3_1_slp): Merge with *lshrqi3_1_one_bit_slp.
11704         (*lshr<mode>3_cmp): Merge with *lshr{qi,hi,si}3_one_bit_cmp and
11705         *lshrdi3_one_bit_cmp_rex64. Macroize insn from *lshr{qi,hi,si}3_cmp
11706         and *lshrdi3_cmp_rex64 using SWI mode iterator.
11707         (*lshrsi3_cmp_zext): Merge with *lshrsi3_cmp_one_bit_zext.
11708         (*lshr<mode>3_cconly): Merge with *lshr{qi,hi,si}3_one_bit_cconly and
11709         *lshrdi3_one_bit_cconly_rex64. Macroize insn from
11710         *lshr{qi,hi,si}3_cconly and *lshrdi3_cconly_rex64 using
11711         SWI mode iterator.
11713 2010-04-10  Uros Bizjak  <ubizjak@gmail.com>
11715         * config/i386/i386.md (ashr<mode>3): Macroize expander from
11716         ashr{qi,hi,si,di,ti}3_1 using SDWIM mode iterator.
11717         (*ashr<mode>3_doubleword): New insn_and_split_pattern.  Macroize
11718         pattern from *ashr{di,ti}3_1 and corresponding splitters using
11719         DWI mode iterator.
11720         (*ashr<mode>3_doubleword peephole2): Macroize peephole2 pattern
11721         from corresponding peephole2 patterns.
11722         (ashrdi3_cvt): Rename from ashrdi3_63_rex64.
11723         (ashrsi3_cvt): Rename from ashrsi3_31.
11724         (*ashrsi3_cvt_zext): Rename from *ashrsi3_31_zext.
11725         (x86_shift<mode>_adj_3): Macroize expander from x86_shift_adj_3
11726         and x86_64_shift_adj_3 using SWI48 mode iterator.
11727         (*ashr<mode>3_1): Merge with *ashr{qi,hi,si}3_1_one_bit and
11728         *ashrdi3_1_one_bit_rex64. Macroize insn from *ashr{qi,hi,si}3_1
11729         and *ashrdi3_1_rex64 using SWI mode iterator.
11730         (*ashrsi3_1_zext): Merge with *ashrsi3_1_one_bit_zext.
11731         (*ashrqi3_1_slp): Merge with *ashrqi3_1_one_bit_slp.
11732         (*ashr<mode>3_cmp): Merge with *ashr{qi,hi,si}3_one_bit_cmp and
11733         *ashrdi3_one_bit_cmp_rex64. Macroize insn from *ashr{qi,hi,si}3_cmp
11734         and *ashrdi3_cmp_rex64 using SWI mode iterator.
11735         (*ashrsi3_cmp_zext): Merge with *ashrsi3_cmp_one_bit_zext.
11736         (*ashr<mode>3_cconly): Merge with *ashr{qi,hi,si}3_one_bit_cconly and
11737         *ashrdi3_one_bit_cconly_rex64. Macroize insn from
11738         *ashr{qi,hi,si}3_cconly and *ashrdi3_cconly_rex64 using
11739         SWI mode iterator.
11740         (sign_extend splitters): Update for renamed ashr{di,si}3_cvt patterns.
11741         * config/i386/i386.c (ix86_split_ashr): Update for renamed
11742         x86_shift<mode>_adj_3 expanders.
11744 2010-04-10  Wei Guozhi  <carrot@google.com>
11746         PR target/42601
11747         * config/arm/arm.c (arm_pic_static_addr): New function.
11748         (legitimize_pic_address): Call arm_pic_static_addr when it detects
11749         a static symbol.
11750         (arm_output_addr_const_extra): Output expression for new pattern.
11751         * config/arm/arm.md (UNSPEC_SYMBOL_OFFSET): New unspec symbol.
11753 2010-04-10  Bernd Schmidt  <bernds@codesourcery.com>
11755         * ira-costs.c (record_reg_classes): Ignore alternatives that are
11756         not enabled.
11758         * Makefile.in (web.o): Depend on insn-config.h and $(RECOG_H).
11759         * web.c: Include "insn-config.h" and "recog.h".
11760         (union_match_dups): New function.
11761         (web_main): Call it.
11762         (union_defs): Don't try to recognize match_dups.
11764         * reload1.c (eliminate_regs_in_insn): Don't restore an operand
11765         if doing so would replace the entire pattern.
11767 2010-04-09  Uros Bizjak  <ubizjak@gmail.com>
11769         PR target/43707
11770         PR target/43709
11771         * config/i386/i386.md (*ashl<mode>3_doubleword): Split to insn
11772         and splitter pattern.  Change splitter operand 1 predicate to
11773         nonmemory_operand.
11775 2010-04-09  Martin Jambor  <mjambor@suse.cz>
11777         * ipa-cp.c (ipcp_lats_are_equal): Return true also if the two
11778         lattices are addresses of CONST_DECLs with the same initial value.
11779         (ipcp_print_all_lattices): Print values of CONST_DECLs.
11780         * ipa-prop.c (ipa_print_node_jump_functions): Likewise.
11782 2010-04-09  Eric Botcazou  <ebotcazou@adacore.com>
11783             Bernd Schmidt  <bernds@codesourcery.com>
11785         * loop-invariant.c (replace_uses): New static function.
11786         (move_invariant_reg): Use it to ensure we can replace the uses.
11788 2010-04-09  Hariharan Sandanagobalane  <hariharan@picochip.com>
11790         * config/picochip/picochip.c (picochip_rtx_costs): Use correct
11791         function template.
11792         (picochip_override_options): Enable section anchors only above -O1.
11793         (picochip_reorg): Fixed a couple of build warnings.
11795 2010-04-09  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
11797         * configure.ac (plugin -rdynamic test): Log result.
11798         * configure: Regenerate.
11799         * config/sol2.h (LINK_SPEC): Handle -rdynamic.
11800         (RDYNAMIC_SPEC): Define.
11801         * config/sol2-gld.h (RDYNAMIC_SPEC): Redefine.
11803 2010-04-09  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
11805         * configure.ac: Determine Sun ld version numbers.
11806         (comdat_group): Restrict GNU ld version checks to gld.
11807         (comdat_group, *-*-solaris2.1[1-9]*): Enable for Sun ld > 1.1688.
11808         (enable_comdat): Support --enable-comdat.
11809         * configure: Regenerate.
11810         * doc/install.texi (Configuration): Document --enable-comdat.
11812 2010-04-09  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
11814         * config/sparc/sol2-gld.h: Remove SPARC reference.  Rename ...
11815         * config/sol2-gld.h: ... here.
11816         * config.gcc (sparc*-*-solaris2*): Reflect this.
11817         (i[34567]86-*-solaris2*): Use it.
11819 2010-04-09  Steve Ellcey  <sje@cup.hp.com>
11821         * config/ia64/ia64.c (ia64_dfa_new_cycle): Remove unused variable
11822         setup_clocks_p.
11823         (final_emit_insn_group_barriers): Remove unused variable prev_insn.
11825 2010-04-09  Manuel López-Ibáñez  <manu@gcc.gnu.org>
11827         PR 42965
11828         * diagnostic.c (diagnostic_initialize): Initialize
11829         some_warnings_are_errors.
11830         (diagnostic_finish): New.
11831         (diagnostic_action_after_output): Call it before exiting.
11832         (diagnostic_report_diagnostic): Do not print message here. Set
11833         some_warnings_are_errors.
11834         * diagnostic.h (diagnostic_context): Delete
11835         issue_warnings_are_errors_message. Add some_warnings_are_errors.
11836         (diagnostic_finish): Declare.
11837         * toplev.c (toplev_main): Call it before exit.
11839 2010-04-09  Jason Merrill  <jason@redhat.com>
11841         PR c++/42623
11842         * c-common.c (c_sizeof_or_alignof_type): Return error_mark_node
11843         for incomplete type.
11845         PR c++/41788
11846         * stor-layout.c (finalize_record_size): Don't change TYPE_PACKED
11847         based on a warning flag.
11849 2010-04-09  Richard Guenther  <rguenther@suse.de>
11851         * tree-pretty-print.c (dump_generic_node): Dump TYPE_VECTOR_SUBPARTS.
11853 2010-04-09  Iain Sandoe  <iains@gcc.gnu.org>
11855         PR bootstrap/43684
11856         * varasm.c (default_assemble_visibility): Wrap vars that are
11857         set, but unused, by targets without GAS.
11858         * config/rs6000/rs6000.c (paired_emit_vector_compare):
11859         Remove set, but unused, vars.
11860         (rs6000_legitimize_tls_address): Likewise.
11861         (altivec_expand_dst_builtin): Likewise.
11862         * config/darwin.c (machopic_classify_symbol): Likewise.
11863         (machopic_indirection_name): Likewise.
11865 2010-04-09  Uros Bizjak  <ubizjak@gmail.com>
11867         * config/i386/i386.md (DWI): New mode iterator.
11868         (S): New mode attribute.
11869         (shift_operand): Ditto.
11870         (shift_immediate_operand): Ditto.
11871         (ashl_input_operand): Ditto.
11872         (ashl<mode>3): Macroize expander from ashl{qi,hi,si,di,ti}3_1
11873         using SDWIM mode iterator.
11874         (*ashl<mode>3_doubleword): New insn_and_split_pattern.  Macroize
11875         pattern from *ashl{di,ti}3_1 and corresponding splitters using
11876         DWI mode iterator.
11877         (*ashl<mode>3_doubleword peephole2): Macroize peephole2 pattern
11878         from corresponding peephole2 patterns.
11879         (x86_shift<mode>_adj_1): Macroize expander from x86_shift_adj_1
11880         and x86_64_shift_adj_1 using SWI48 mode iterator.
11881         (x86_shift<mode>_adj_2): Ditto.
11882         (*ashldi3_1_rex64): Split TYPE_LEA pattern.
11883         (*ashl<mode>3_1): Macroize insn from *ashlsi3_1 and *ashldi3_1_rex64
11884         using SWI48 mode iterator.
11885         (*ashl<mode>3_cmp): Macroize insn from *ashl{qi,hi,si}3_cmp and
11886         *ashldi3_cmp_rex64 using SWI mode iterator.
11887         (*ashl<mode>3_cconly): Macroize insn from *ashl{qi,hi,si}3_cconly and
11888         *ashldi3_cconly_rex64 using SWI mode iterator.
11889         * config/i386/i386.c (ix86_split_ashl): Update for renamed
11890         x86_shift<mode>_adj_{1,2}.
11891         (ix86_split_ashr): Ditto.
11892         (ix86_split_lshr): Ditto.
11894 2010-04-09  Richard Guenther  <rguenther@suse.de>
11896         * target.h (builtin_conversion): Pass in input and output types.
11897         * targhooks.c (default_builtin_vectorized_conversion): Adjust.
11898         * targhooks.h (default_builtin_vectorized_conversion): Likewise.
11899         * tree-vect-stmts.c (vectorizable_conversion): Adjust.
11900         * doc/tm.texi (TARGET_VECTORIZE_BUILTIN_CONVERSION): Adjust.
11902         * config/i386/i386.c (ix86_vectorize_builtin_conversion): Adjust.
11903         Handle AVX modes.
11904         * config/rs6000/rs6000.c (rs6000_builtin_conversion): Adjust.
11906 2010-04-09  Richard Guenther  <rguenther@suse.de>
11908         PR target/43152
11909         * config/i386/sse.md (vcond<mode>): Handle AVX modes as well.
11911 2010-04-09  Richard Guenther  <rguenther@suse.de>
11913         * tree-vectorizer.h (struct _stmt_vec_info): Document
11914         that vectype is the type of the LHS.
11915         (supportable_widening_operation, supportable_narrowing_operation):
11916         Get both input and output vector types as arguments.
11917         (vect_is_simple_use_1): Declare.
11918         (get_same_sized_vectype): Likewise.
11919         * tree-vect-loop.c (vect_determine_vectorization_factor):
11920         Set STMT_VINFO_VECTYPE to the vector type of the def.
11921         (vectorizable_reduction): Adjust.
11922         * tree-vect-patterns.c (vect_recog_widen_mult_pattern):
11923         Adjust.  Specify the output vector type.
11924         (vect_pattern_recog_1): Adjust.
11925         * tree-vect-stmts.c (get_same_sized_vectype): New function.
11926         (vectorizable_call): Adjust.
11927         (vectorizable_conversion): Likewise.
11928         (vectorizable_operation): Likewise.
11929         (vectorizable_type_demotion): Likewise.
11930         (vectorizable_type_promotion): Likewise.
11931         (vect_analyze_stmt): Set STMT_VINFO_VECTYPE to the vector type of
11932         the def.
11933         (vect_is_simple_use_1): New function.
11934         (supportable_widening_operation): Get both input and output
11935         vector types.
11936         (supportable_narrowing_operation): Likewise.
11937         * tree-vect-slp.c (vect_schedule_slp_instance): Adjust.
11939 2010-04-09  Kai Tietz  <kai.tietz@onevision.com>
11941         * config/i386/cygming.h (TARGET_OS_CPP_BUILTINS): Add
11942         __thiscall and _thiscall as predefined macros.
11943         * config/i386/i386.c (ix86_handle_cconv_attribute): Add
11944         thiscall attribute handling.
11945         (ix86_comp_type_attributes): Likewise.
11946         (ix86_function_regparm): Likewise.
11947         (ix86_return_pops_args): Likewise.
11948         (init_cumulative_args): Likewise.
11949         (find_drap_reg): Likewise.
11950         (ix86_static_chain): Likewise.
11951         (x86_this_parameter): Likewise.
11952         (x86_output_mi_thunk): Likewise.
11953         (ix86_attribute_table): Add description for thiscall attribute.
11954         * config/i386/i386.h (ix86_args): Adjust comment for member fastcall.
11955         * doc/extend.texi: Add documentation for thiscall.
11957 2010-04-09  Manuel López-Ibáñez  <manu@gcc.gnu.org>
11959         PR c++/28584
11960         * c.opt (Wint-to-pointer-cast): Available in C++.
11961         * doc/invoke.texi (Wint-to-pointer-cast): Available in C++.
11963 2010-04-08  Eric Botcazou  <ebotcazou@adacore.com>
11965         * tree.h (TREE_ADDRESSABLE): Document its effect for function types.
11966         * calls.c (expand_call): Pass the function type to aggregate_value_p.
11967         * function.c (aggregate_value_p): Do not honor DECL_BY_REFERENCE on
11968         the target function of a CALL_EXPR.  Honor TREE_ADDRESSABLE on the
11969         function type instead.  Reorder and simplify checks.
11971         * gimplify.c (gimplify_modify_expr_rhs) <WITH_SIZE_EXPR>: New case.
11973 2010-04-08  Jing Yu  <jingyu@google.com>
11974             Zdenek Dvorak  <ook@ucw.cz>
11976         PR tree-optimization/42720
11977         * tree-ssa-loop-unswitch.c (tree_ssa_unswitch_loops): Move one-time
11978         loop unswitch conditions here from ...
11979         (tree_unswitch_single_loop): ... here.
11981 2010-04-08  Sebastian Pop  <sebastian.pop@amd.com>
11983         * tree-if-conv.c: Fix comments and simplify logic.
11985 2010-04-08  Sebastian Pop  <sebastian.pop@amd.com>
11987         * tree-if-conv.c (if_convertible_loop_p): Remove unused parameter.
11988         (tree_if_conversion): Same.  Update call to if_convertible_loop_p.
11989         (main_tree_if_conversion): Update call to tree_if_conversion.
11991 2010-04-08  Manuel López-Ibáñez  <manu@gcc.gnu.org>
11993         PR 42485
11994         * doc/invoke.texi (-b,-V): Delete.
11995         * doc/tm.texi: Do not mention -b.
11996         * gcc.c (display_help): Delete -b and -V.
11997         (process_command): Delete -b and -V.
11998         * gcc.h (DEFAULT_SWITCH_TAKES_ARG): Delete -b and -V.
12000 2010-04-08  Christian Borntraeger  <borntraeger@de.ibm.com>
12001             Wolfgang Gellerich  <gellerich@de.ibm.com>
12003         Implement target hook for loop unrolling
12004         * target.h (loop_unroll_adjust): Add a new target hook function.
12005         * target-def.h (TARGET_LOOP_UNROLL_ADJUST): Likewise.
12006         * doc/tm.texi (TARGET_LOOP_UNROLL_ADJUST): Document it.
12007         * config/s390/s390.c (TARGET_LOOP_UNROLL_ADJUST): Define it.
12008         (s390_loop_unroll_adjust): Implement the new target hook for s390.
12009         * loop-unroll.c (decide_unroll_runtime_iterations): Call loop unroll
12010         target hook.
12011         (decide_unroll_stupid): Likewise.
12013 2010-04-08  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
12015         PR target/43643
12016         * config/i386/gmon-sol2.c [__x86_64__]: Properly restore %rcx.
12018 2010-04-08  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
12020         * doc/install.texi (Specific, i?86-*-solaris2.10): Fix grammar.
12021         (Specific, *-*-solaris2*): Likewise.
12022         Don't prefer Sun as over GNU as.
12024 2010-04-08  Wolfgang Gellerich  <gellerich@de.ibm.com>
12026         * config/s390/s390.c (override_options): Adjust the z10 defaults
12027         for max-unroll-times, max-completely-peeled-insns
12028         and max-completely-peel-times.
12030 2010-04-08  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
12032         * config/s390/s390.c (s390_expand_movmem): Issue prefetch
12033         instructions for z10.
12034         (s390_expand_setmem): Likewise.
12035         (s390_expand_cmpmem): Likewise.
12037 2010-04-08  Richard Guenther  <rguenther@suse.de>
12039         PR tree-optimization/43679
12040         * tree-ssa-pre.c (eliminate): Only propagate copies.
12042 2010-04-08  Jakub Jelinek  <jakub@redhat.com>
12044         PR bootstrap/43681
12045         * expr.c (block_move_libcall_safe_for_call_parm): Avoid
12046         set but not used variable warning.
12048 2010-04-08  Wei Guozhi  <carrot@google.com>
12050         PR target/41653
12051         * config/arm/arm.c (thumb1_size_rtx_costs): New function.
12052         (arm_size_rtx_costs): Call the new function when optimized for size.
12054 2010-04-08  Jakub Jelinek  <jakub@redhat.com>
12056         PR debug/43670
12057         * cfgexpand.c (expand_debug_expr): If for non-NULL offset
12058         op0 is not a MEM, just return NULL instead of assertion
12059         failure.
12060         (discover_nonconstant_array_refs): Don't walk debug stmts.
12062 2010-04-08  Doug Kwan  <dougkwan@google.com>
12064         * configure.ac: Recognize gold and do not use its version number
12065         to test ld features.
12066         * configure: Regenerate.
12068 2010-04-08  Maxim Kuvyrkov  <maxim@codesourcery.com>
12070         PR middle-end/40815
12071         * tree-ssa-reassoc.c (broken_up_substracts): Rename to plus_negates.
12072         (negate_value): Move code to push elements to broken_up_substracts ...
12073         (eliminate_plus_minus_pair): ... here.  Push operands that have no
12074         negative pair to plus_negates.
12075         (repropagate_negates, init_reassoc, fini_reassoc): Update.
12077 2010-04-07  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
12079         * doc/install.texi (Configuration): Move description of
12080         --enable-lto, --with-libelf*, --enable-gold from Java section to
12081         general section.
12083         * doc/generic.texi (Working with declarations)
12084         (Function Properties, C and C++ Trees): Fix typos.
12085         * doc/sourcebuild.texi (Top Level): Likewise.
12087 2010-04-07  Jakub Jelinek  <jakub@redhat.com>
12089         PR c/18624
12090         * tree.h (DECL_READ_P): Define.
12091         (struct tree_decl_common): Add decl_read_flag.
12092         * c-decl.c (pop_scope): If TREE_USED but !DECL_READ_P, issue
12093         a set but not used warning.
12094         (merge_decls): Merge DECL_READ_P flag.
12095         (finish_decl, build_compound_literal): Set DECL_READ_P flag.
12096         (finish_function): Issue -Wunused-but-set-parameter diagnostics.
12097         * c-common.c (handle_used_attribute, handle_unused_attribute):
12098         Likewise.
12099         * c-tree.h (default_function_array_read_conversion, mark_exp_read):
12100         New prototypes.
12101         * c-typeck.c (default_function_array_read_conversion, mark_exp_read):
12102         New functions.
12103         (default_conversion, c_process_expr_stmt): Call mark_exp_read.
12104         * c-parser.c (c_parser_initializer, c_parser_expr_no_commas,
12105         c_parser_binary_expression, c_parser_cast_expression,
12106         c_parser_expr_list, c_parser_omp_atomic, c_parser_omp_for_loop):
12107         Call default_function_array_read_conversion instead of
12108         default_function_array_conversion where needed.
12109         (c_parser_unary_expression, c_parser_conditional_expression,
12110         c_parser_postfix_expression_after_primary, c_parser_initelt):
12111         Likewise.  Call mark_exp_read where needed.
12112         (c_parser_statement_after_labels, c_parser_asm_operands,
12113         c_parser_typeof_specifier, c_parser_sizeof_expression,
12114         c_parser_alignof_expression, c_parser_initval): Call mark_exp_read
12115         where needed.
12116         * common.opt (Wunused-but-set-variable, Wunused-but-set-parameter):
12117         New.
12118         * toplev.c (warn_unused_but_set_variable): Default to warn_unused.
12119         (warn_unused_but_set_parameter): Default to warn_unused
12120         && extra_warnings.
12121         * doc/invoke.texi: Document -Wunused-but-set-variable and
12122         -Wunused-but-set-parameter.
12124         * tree-ssa-pre.c (my_rev_post_order_compute): Remove set but not
12125         used count variable.
12126         * genemit.c (gen_expand, gen_split): Avoid set but not used warnings
12127         when operandN variables aren't used in the body of the expander
12128         or splitter.
12129         * tree-outof-ssa.c (FOR_EACH_ELIM_GRAPH_SUCC,
12130         FOR_EACH_ELIM_GRAPH_PRED): Avoid set but not used warnings.
12131         * tree-ssa-operands.h (FOR_EACH_SSA_TREE_OPERAND): Likewise.
12132         * tree-flow.h (FOR_EACH_IMM_USE_FAST, FOR_EACH_IMM_USE_STMT,
12133         FOR_EACH_IMM_USE_ON_STMT): Likewise.
12134         * tree.h (FOR_EACH_CONSTRUCTOR_ELT): Likewise.
12135         * tree.c (PROCESS_ARG): Likewise.
12137 2010-04-07  Simon Baldwin  <simonb@google.com>
12139         * diagnostic.h (diagnostic_override_option_index): New macro to
12140         set a diagnostic's option_index.
12141         * c-tree.h (c_cpp_error): Add warning reason argument.
12142         * opts.c (_warning_as_error_callback): New.
12143         (register_warning_as_error_callback): Store callback for
12144         warnings enabled via enable_warning_as_error.
12145         (enable_warning_as_error): Call callback, minor code tidy.
12146         * opts.h (register_warning_as_error_callback): Declare.
12147         * c-opts.c (warning_as_error_callback): New, set cpp_opts flag in
12148         response to -Werror=.
12149         (c_common_init_options): Register warning_as_error_callback in opts.c.
12150         * common.opt: Add -Wno-cpp option.
12151         * c-common.c (struct reason_option_codes_t): Map cpp warning
12152         reason codes to gcc option indexes.
12153         * (c_option_controlling_cpp_error): New function, lookup the gcc
12154         option index for a cpp warning reason code.
12155         * (c_cpp_error): Add warning reason argument, call
12156         c_option_controlling_cpp_error for diagnostic_override_option_index.
12157         * doc/invoke.texi: Document -Wno-cpp.
12159 2010-04-07  Richard Guenther  <rguenther@suse.de>
12161         * ipa-reference.c (mark_load): Use get_base_address.
12162         (mark_store): Likewise.
12164         * tree-ssa-ccp.c (gimplify_and_update_call_from_tree): Avoid
12165         inserting GIMPLE_NOPs into the IL.
12166         * tree-ssa-structalias.c (get_constraint_for_component_ref):
12167         Explicitly strip handled components and indirect references.
12169         * fold-const.c (fold_unary_loc): Do not strip qualifiers when
12170         folding address expressions.
12171         * gimple.c (gimple_ior_addresses_taken_1): Use get_base_address.
12172         * tree-ssa-alias.c (decl_refs_may_alias_p): Do not use
12173         operand_equal_p to compare decls.
12174         (ptr_deref_may_alias_decl_p): Likewise.
12175         * tree-ssa-operands.c (get_asm_expr_operands): Simplify
12176         * tree-ssa-forwprop.c (forward_propagate_into_gimple_cond):
12177         Handle reversed comparison ops.
12178         * tree-sra.c (asm_visit_addr): Use get_base_address.
12179         * ipa-prop.c (visit_store_addr_for_mod_analysis): Use get_base_address.
12180         * ipa-reference.c (mark_address): Use get_base_address.
12182 2010-04-07  Richard Guenther  <rguenther@suse.de>
12184         * tree-ssa-forwprop.c (forward_propagate_addr_expr):
12185         Propagate constants everywhere.
12187 2010-04-07  Jakub Jelinek  <jakub@redhat.com>
12189         PR debug/43516
12190         * tree.c (MAX_INT_CACHED_PREC): Define.
12191         (nonstandard_integer_type_cache): New array.
12192         (build_nonstandard_integer_type): Cache results for precision
12193         <= MAX_INT_CACHED_PREC.
12195 2010-04-07  Richard Guenther  <rguenther@suse.de>
12197         * doc/invoke.texi (-fargument-alias, -fargument-noalias,
12198         -fargument-noalias-global, -fargument-noalias-anything): Remove.
12199         * common.opt: Likewise.
12200         * tree-ssa-structalias.c (intra_create_variable_infos): Adjust comment.
12201         * alias.c (base_alias_check): Remove flag_argument_noalias handling.
12202         (nonoverlapping_memrefs_p): Likewise.
12203         * emit-rtl.c (set_mem_attributes_minus_bitpos): Likewise.
12204         * opts.c (common_handle_option): Handle OPT_fargument_alias,
12205         OPT_fargument_noalias, OPT_fargument_noalias_anything and
12206         OPT_fargument_noalias_global for backward compatibility.
12208 2010-04-07  Richard Guenther  <rguenther@suse.de>
12210         PR tree-optimization/43270
12211         * tree-vrp.c (check_array_ref): Fix flexible array member detection.
12212         * tree-ssa-sccvn.h (fully_constant_vn_reference_p): Declare.
12213         * tree-ssa-pre.c (phi_translate_1): Adjust.
12214         (fully_constant_expression): Split out vn_reference handling to ...
12215         * tree-ssa-sccvn.c (fully_constant_vn_reference_p): ... here.
12216         Fold reads from constant strings.
12217         (vn_reference_lookup): Handle fully constant references.
12218         (vn_reference_lookup_pieces): Likewise.
12219         * Makefile.in (expmed.o-warn): Add -Wno-error.
12221 2010-04-07  Martin Jambor  <mjambor@suse.cz>
12223         * tree-sra.c (find_param_candidates): Allow scalar va_list types.
12225 2010-04-07  Iain Sandoe  <iains@gcc.gnu.org>
12227         PR driver/41594
12228         * gcc.c: Add -static-libstdc++ to list of recognized options.
12230 2010-04-07  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
12232         * config.gcc (i[34567]86-*-solaris2*): Default with_tune_32 to generic.
12234 2010-04-07  Richard Guenther  <rguenther@suse.de>
12236         PR middle-end/42617
12237         * expr.c (expand_expr_real_1): For TARGET_MEM_REFs with pointer
12238         bases build simple mem attributes to retain points-to information.
12240 2010-04-07  Richard Guenther  <rguenther@suse.de>
12242         PR middle-end/42617
12243         * alias.c (ao_ref_from_mem): Without MEM_OFFSET or MEM_SIZE
12244         preserve points-to related information.
12246 2010-04-07  Richard Guenther  <rguenther@suse.de>
12248         PR middle-end/42617
12249         * emit-rtl.c (set_mem_attributes_minus_bitpos): Do not
12250         discard plain indirect references.
12251         * fold-const.c (operand_equal_p): Guard against NULL_TREE type.
12252         * tree.c (tree_nop_conversion): Likewise.
12254 2010-04-07  Dodji Seketeli  <dodji@redhat.com>
12256         PR debug/43628
12257         * dwarf2out.c (modified_type_die): Ignore artificial typedefs.
12259 2010-04-06  Kai Tietz  <kai.tietz@onevision.com>
12261         * config/i386/i386.c (ix86_handle_cconv_attribute): Ignore
12262         calling convention attributes on METHOD_TYPEs for w64 ABI, too.
12264 2010-04-07  Sebastian Pop  <sebastian.pop@amd.com>
12266         * tree-if-conv.c: Fix indentation and comments.
12268 2010-04-07  Sebastian Pop  <sebastian.pop@amd.com>
12270         * tree-if-conv.c: Sort static functions in topological order.
12272 2010-04-07  Sebastian Pop  <sebastian.pop@amd.com>
12274         * tree-if-conv.c: Fix indentation and comments.
12276 2010-04-06  Sebastian Pop  <sebastian.pop@amd.com>
12278         PR middle-end/43519
12279         * graphite-clast-to-gimple.c (max_signed_precision_type): Use
12280         lang_hooks.types.type_for_size instead of
12281         build_nonstandard_integer_type.
12282         When converting an unsigned type to signed, double its precision.
12283         (gcc_type_for_interval): Use lang_hooks.types.type_for_size.
12284         (gcc_type_for_iv_of_clast_loop): Call max_signed_precision_type.
12285         (graphite_create_new_loop_guard): When ub + 1 wraps around,
12286         use lb <= ub.
12288 2010-04-06  Sebastian Pop  <sebastian.pop@amd.com>
12290         PR middle-end/43519
12291         * graphite-clast-to-gimple.c (graphite_create_new_loop_guard): Use
12292         POINTER_PLUS_EXPR for pointer types.
12294 2010-04-06  Sebastian Pop  <sebastian.pop@amd.com>
12296         PR middle-end/43519
12297         * Makefile.in (graphite-clast-to-gimple.o): Depends on langhooks.h.
12298         * graphite-clast-to-gimple.c: Include langhooks.h.
12299         (max_signed_precision_type): New.
12300         (max_precision_type): Takes two types as arguments.
12301         (precision_for_value): New.
12302         (precision_for_interval): New.
12303         (gcc_type_for_interval): New.
12304         (gcc_type_for_value): New.
12305         (gcc_type_for_clast_term): New.
12306         (gcc_type_for_clast_red): New.
12307         (gcc_type_for_clast_bin): New.
12308         (gcc_type_for_clast_expr): Split up into several functions.
12309         (gcc_type_for_clast_eq): Rewritten.
12310         (compute_bounds_for_level): New.
12311         (compute_type_for_level_1): New.
12312         (compute_type_for_level): New.
12313         (gcc_type_for_cloog_iv): Removed.
12314         (gcc_type_for_iv_of_clast_loop): Rewritten.
12315         (graphite_create_new_loop): Compute the lower and upper bound types
12316         with gcc_type_for_clast_expr.
12317         (graphite_create_new_loop_guard): Same.
12318         (find_cloog_iv_in_expr): Removed.
12319         (compute_cloog_iv_types_1): Removed.
12320         (compute_cloog_iv_types): Removed.
12321         (gloog): Do not call compute_cloog_iv_types.
12322         * graphite-sese-to-poly.c (new_gimple_bb): Do not initialize
12323         GBB_CLOOG_IV_TYPES.
12324         (free_data_refs_aux): Do not free GBB_CLOOG_IV_TYPES.
12325         * sese.h (struct gimple_bb): Removed field cloog_iv_types.
12326         (GBB_CLOOG_IV_TYPES): Removed.
12328 2010-04-06  Sebastian Pop  <sebastian.pop@amd.com>
12330         * graphite-sese-to-poly.c (rewrite_close_phi_out_of_ssa): Assert that
12331         gimple_phi_num_args of the loop close SSA phi node is equal to 1.
12332         (detect_commutative_reduction): Same.
12334 2010-04-06  Sebastian Pop  <sebastian.pop@amd.com>
12336         * graphite-clast-to-gimple.c (graphite_verify): Remove redundant
12337         call to verify_ssa.  Invoke verify_loop_closed_ssa with an extra
12338         argument.
12339         * graphite-scop-detection.c (canonicalize_loop_closed_ssa_form): Same.
12340         * graphite-sese-to-poly.c (rewrite_reductions_out_of_ssa): Same.
12341         (rewrite_commutative_reductions_out_of_ssa): Same.
12342         * passes.c (execute_function_todo): Call verify_ssa for every pass
12343         in the LNO.  Invoke verify_loop_closed_ssa with an extra argument.
12344         * tree-flow.h (verify_loop_closed_ssa): Update declaration.
12345         * tree-parloops.c (parallelize_loops): Invoke verify_loop_closed_ssa
12346         with an extra argument.
12347         * tree-ssa-loop-manip.c (check_loop_closed_ssa_stmt): Same.  Call
12348         verify_ssa only when the extra argument is true.
12349         (gimple_duplicate_loop_to_header_edge): Invoke verify_loop_closed_ssa
12350         with an extra argument.
12351         (tree_transform_and_unroll_loop): Same.
12353 2010-04-06  Sebastian Pop  <sebastian.pop@amd.com>
12355         * passes.c (execute_function_todo): Call verify_loop_closed_ssa
12356         for all the passes of the LNO having LOOP_CLOSED_SSA.
12357         * tree-if-conv.c (pass_if_conversion): Remove TODO_verify_loops.
12358         * tree-loop-distribution.c (pass_loop_distribution): Same.
12359         * tree-pass.h (TODO_verify_loops): Removed.
12360         * tree-ssa-loop.c (pass_tree_loop_init): Same.
12361         (pass_lim): Same.
12362         (pass_tree_unswitch): Same.
12363         (pass_predcom): Same.
12364         (pass_vectorize): Same.
12365         (pass_linear_transform): Same.
12366         (pass_graphite_transforms): Same.
12367         (pass_iv_canon): Same.
12368         (pass_complete_unroll): Same.
12369         (pass_complete_unrolli): Same.
12370         (pass_parallelize_loops): Same.
12371         (pass_loop_prefetch): Same.
12372         (pass_iv_optimize): Same.
12374 2010-04-06  Changpeng Fang  <changpeng.fang@amd.com>
12376         PR middle-end/32824
12377         * passes.c (init_optimization_passes): Move pass_lim before
12378         pass_copy_prop and pass_dce_loop.
12380 2010-04-06  Jakub Jelinek  <jakub@redhat.com>
12382         PR target/43667
12383         * config/i386/i386.c (bdesc_multi_arg): Use OPTION_MASK_ISA_XOP
12384         instead of OPTION_MASK_ISA_AVX for __builtin_ia32_vpermil2p*.
12385         (ix86_expand_args_builtin): Use V*_FTYPE_* enum codes instead of
12386         MULTI_* defines for 4 argument vpermil2p* builtins.
12388 2010-04-06  Uros Bizjak  <ubizjak@gmail.com>
12390         * config/i386/i386-protos.h (x86_maybe_negate_const_int): Declare.
12391         * config/i386/i386.c (x86_maybe_negate_const_int): New.
12392         (x86_output_mi_thunk): Use x86_maybe_negate_const_int.
12393         * config/i386/i386.md (*add<mode>_1, *addsi_1_zext, *addhi_1,
12394         *addhi_1_lea, *addqi_1, *addqi_1_lea, *addqi_1_slp, *add<mode>_2,
12395         *addsi_2_zext, *addhi_2, *addqi_2, *add<mode>_3, *addsi_3_zext,
12396         *addhi_3, *addqi_3,*add<mode>_5, *addhi_5, *addqi_5):
12397         Use x86_maybe_negate_const_int to output insn mnemonic.
12398         (*adddi_4, *addsi_4, *addhi_4, *addqi_4): Ditto.  Remove overflow
12399         check from instruction predicate.  Update comments.
12400         * config/i386/sync.md (sync_add<mode>): Use
12401         x86_maybe_negate_const_int to output insn mnemonic.
12403 2010-04-06  Jan Hubicka  <jh@suse.cz>
12405         PR tree-optimization/42906
12406         * tree-ssa-dce.c (mark_control_dependent_edges_necessary): Add
12407         IGNORE_SELF argument.  Set visited_control_parents for fully
12408         processed BBs.
12409         (find_obviously_necessary_stmts): Update call of
12410         mark_control_dependent_edges_necessary.
12411         (propagate_necessity): Likewise.  Handle PHI edges more curefully.
12413 2010-04-06  Uros Bizjak  <ubizjak@gmail.com>
12415         * config/i386/i386.md: Remove comment about 'e' and 'E'
12416         operand modifier.
12418 2010-04-06  Richard Guenther  <rguenther@suse.de>
12420         PR tree-optimization/43627
12421         * tree-vrp.c (extract_range_from_unary_expr): Widenings
12422         of [1, +INF(OVF)] go to [1, +INF(OVF)] of the wider type,
12423         not varying.
12425 2010-04-06  Jakub Jelinek  <jakub@redhat.com>
12427         * BASE-VER: Change to 4.6.0.
12429         PR target/43638
12430         * config/i386/i386.c (print_operand): Remove 'e' and 'E' code
12431         handling.
12433 2010-04-06  Richard Guenther  <rguenther@suse.de>
12435         PR middle-end/43661
12436         * fold-const.c (fold_comparison): Handle X * 0 CMP 0.
12438 2010-04-05  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
12440         * doc/invoke.texi (Optimize Options): Document that LTO
12441         won't remove object access purely due to incompatible
12442         declarations.
12444 2010-04-04  Matthias Klose  <doko@ubuntu.com>
12446         * graphite-sese-to-poly.c (translate_scalar_reduction_to_array):
12447         Initialize variable.
12449 2010-04-03  Richard Guenther  <rguenther@suse.de>
12451         PR middle-end/42509
12452         * alias.c (nonoverlapping_memrefs_p): For spill-slot accesses
12453         require a non-NULL MEM_OFFSET.
12455 2010-04-02  Steven Bosscher  <steven@gcc.gnu.org>
12457         * ada/gcc-interface/Make-lang.in, alias.c, attribs.c, auto-inc-dec.c,
12458         basic-block.h, bb-reorder.c, calls.c, c-common.c, cgraph.h,
12459         collect2.h, config/alpha/alpha.c, config/alpha/alpha.md,
12460         config/alpha/predicates.md, config/arm/arm.md,
12461         config/arm/lib1funcs.asm, config/arm/neon-schedgen.ml,
12462         config/avr/avr.c, config/avr/avr.md, config/bfin/bfin.c,
12463         config/darwin9.h, config/darwin.c, config/darwin.h,
12464         config/h8300/h8300.c, config/i386/cpuid.h, config/i386/cygming.h,
12465         config/i386/cygwin.h, config/i386/mingw32.h, config/i386/msformat-c.c,
12466         config/i386/sol2-10.h, config/i386/xopintrin.h, config/ia64/ia64.c,
12467         config/ia64/ia64.md, config/ia64/sync.md, config/mep/mep.c,
12468         config/mips/mips.md, config/mn10300/mn10300.c,
12469         config/mn10300/mn10300.h, config/pa/pa.c, config/pa/pa.md,
12470         config/rs6000/aix.h, config/rs6000/dfp.md,
12471         config/rs6000/rs6000-builtin.def, config/rs6000/rs6000-c.c,
12472         config/rs6000/vector.md, config/rtems.h, config/rx/rx.md,
12473         config/s390/s390.md, config/sol2-c.c, config/sparc/sol2-bi.h,
12474         config/sparc/sol2-gas.h, config/sparc/sparc.h, config/sparc/sparc.md,
12475         config/sparc/sparc-protos.h, config/spu/spu.c, config/spu/spu-c.c,
12476         config/t-darwin, convert.c, c.opt, c-opts.c, cp/Make-lang.in,
12477         c-pretty-print.c, c-typeck.c, df-core.c, df-scan.c, diagnostic.c,
12478         diagnostic.h, doc/cppopts.texi, doc/cpp.texi, doc/extend.texi,
12479         doc/gimple.texi, doc/languages.texi, doc/plugins.texi, doc/rtl.texi,
12480         doc/standards.texi, doc/tree-ssa.texi, doc/trouble.texi, dominance.c,
12481         fold-const.c, fortran/Make-lang.in, fwprop.c, gcc-plugin.h,
12482         gensupport.c, gimple.h, gimple-iterator.c, graphite.c,
12483         graphite-clast-to-gimple.c, graphite-clast-to-gimple.h,
12484         graphite-dependences.c, graphite-poly.c, graphite-poly.h,
12485         graphite-ppl.c, graphite-ppl.h, graphite-scop-detection.c,
12486         graphite-sese-to-poly.c, graphite-sese-to-poly.h, ifcvt.c, intl.c,
12487         intl.h, ipa.c, ipa-cp.c, ipa-inline.c, ipa-prop.c, ipa-prop.h,
12488         ipa-pure-const.c, ipa-reference.c, ipa-type-escape.c, ira-color.c,
12489         ira-conflicts.c, ira-lives.c, java/Make-lang.in, lambda-code.c,
12490         loop-invariant.c, lto/Make-lang.in, lto-streamer.h, lto-streamer-in.c,
12491         objc/Make-lang.in, objcp/Make-lang.in, omp-low.c, optc-gen.awk,
12492         opt-functions.awk, opth-gen.awk, params.def, passes.c,
12493         postreload-gcse.c, print-tree.c, recog.c, regrename.c, reload.h,
12494         rtl.def, sched-int.h, sched-rgn.c, sel-sched-dump.c, sese.c, sese.h,
12495         store-motion.c, stor-layout.c, tree-cfgcleanup.c, tree-chrec.c,
12496         tree-complex.c, tree-data-ref.c, tree.def, tree-eh.c, tree-flow.h,
12497         tree-flow-inline.h, tree.h, tree-loop-distribution.c, tree-outof-ssa.c,
12498         tree-parloops.c, tree-pass.h, tree-predcom.c, tree-profile.c,
12499         tree-scalar-evolution.c, tree-ssa-address.c, tree-ssa-alias.c,
12500         tree-ssa-coalesce.c, tree-ssa-copy.c, tree-ssa-dce.c, tree-ssa-dom.c,
12501         tree-ssa-dse.c, tree-ssa-loop-im.c, tree-ssa-loop-ivcanon.c,
12502         tree-ssa-loop-manip.c, tree-ssa-math-opts.c, tree-ssa-operands.c,
12503         tree-ssa-pre.c, tree-ssa-sccvn.c, tree-ssa-structalias.c,
12504         tree-ssa-uncprop.c, tree-tailcall.c, tree-vect-data-refs.c,
12505         tree-vect-loop.c, tree-vectorizer.h, tree-vect-slp.c, tree-vrp.c,
12506         unwind-dw2-fde-darwin.c, varpool.c: Update copyright years.
12508 2010-04-02  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
12510         PR other/43620
12511         * doc/install.texi (Prerequisites): Bump Automake version to 1.11.1.
12512         * aclocal.m4: Regenerate.
12514 2010-04-02  Richard Guenther  <rguenther@suse.de>
12516         PR tree-optimization/43629
12517         * tree-ssa-ccp.c (likely_value): Reset all_undefined_operands
12518         if we have seen a constant value.
12520 2010-04-02  Joseph Myers  <joseph@codesourcery.com>
12522         * read-rtl.c (read_rtx_1): Give an error for EOF while looking for ']'.
12524 2010-04-02  Richard Earnshaw  <rearnsha@arm.com>
12526         PR target/43469
12527         * arm.c (legitimize_tls_address): Adjust call to
12528         gen_tls_load_dot_plus_four.
12529         (arm_note_pic_base): New function.
12530         (arm_cannot_copy_insn_p): Use it.
12531         * thumb2.md (tls_load_dot_plus_four): Rework to avoid use of '+' in
12532         constraint.
12534 2010-04-02  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
12536         PR bootstrap/43531
12538         Revert:
12539         2009-09-28  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
12541         * Makefile.in ($(out_object_file)): Depend on
12542         gt-$(basename $(notdir $(out_file))).h.
12544 2010-04-01  Ralf Corsépius <ralf.corsepius@rtems.org>
12546         * config.gcc (lm32-*-rtems*): Add t-lm32.
12548 2010-04-01  Joel Sherrill <joel.sherrill@oarcorp.com>
12550         * config.gcc: Add lm32-*-rtems*.
12551         * config/lm32/rtems.h: New file.
12553 2010-04-01  Dave Korn  <dave.korn.cygwin@gmail.com>
12555         PR target/42609
12556         * config/i386/cygwin.h (CXX_WRAP_SPEC): Disable spec when -mno-cygwin.
12558 2010-04-01  Jakub Jelinek  <jakub@redhat.com>
12560         * dwarf2out.c (output_compilation_unit_header): For
12561         -gdwarf-4 use version 4 instead of version 3.
12562         (output_line_info): For version 4 and above emit additional
12563         maximum ops per insn header field.
12564         (DWARF_LINE_DEFAULT_MAX_OPS_PER_INSN): Define.
12566         * dwarf2out.c (is_c_family, is_java): Remove.
12567         (lower_bound_default): New function.
12568         (add_bound_info, gen_descr_array_type_die): Use it.
12570 2010-04-01  Dodji Seketeli  <dodji@redhat.com>
12572         PR debug/43325
12573         * dwarf2out.c (gen_variable_die): Allow debug info for variable
12574         re-declaration when it happens in a function.
12576 2010-04-01  Aldy Hernandez  <aldyh@redhat.com>
12578         * cgraph.c (cgraph_add_function_insertion_hook): Update comment.
12579         (cgraph_remove_function_insertion_hook): Same.
12580         (cgraph_call_function_insertion_hooks): Same.
12582 2010-04-01  Richard Guenther  <rguenther@suse.de>
12584         PR middle-end/43614
12585         * tree-ssa-address.c (copy_mem_ref_info): Copy TREE_SIDE_EFFECTS
12586         and TREE_THIS_VOLATILE.
12587         (copy_ref_info): Likewise.
12588         * tree-ssa-operands.c (get_tmr_operands): Check TREE_THIS_VOLATILE.
12589         * tree.c (build6_stat): Ignore side-effects of all but arg5
12590         for TARGET_MEM_REF.  Set TREE_THIS_VOLATILE from arg5 of
12591         TARGET_MEM_REF.
12593 2010-04-01  Richard Guenther  <rguenther@suse.de>
12595         PR tree-optimization/43607
12596         * ipa-type-escape.c (check_call): Do not access non-existing
12597         arguments.
12599 2010-04-01  Richard Guenther  <rguenther@suse.de>
12601         PR middle-end/43602
12602         Revert
12603         2010-03-30  Seongbae Park <seongbae.park@gmail.com>
12604                     Jack Howarth <howarth@bromo.med.uc.edu>
12606         * tree-profile.c (tree_init_ic_make_global_vars): Make static
12607         variables TLS.
12609 2010-04-01  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
12611         * doc/install.texi (Prerequisites): Document libelf usability on
12612         IRIX 5/6 and Solaris 2.
12613         (Specific, i?86-*-solaris2.10): No 64-bit default configuration.
12614         Update GNU as, GNU ld requirements.
12615         (Specific, *-*-solaris2*): Document Solaris 7 obsoletion, removal.
12616         Document Sun Studio compiler download.
12617         Update and simplify as, ld recommendations.
12618         (Specific, *-*-solaris2.7): Note obsoletion, removal.
12620 2010-04-01  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
12622         * config.gcc (i[34567]86-*-solaris2*): Default with_arch_32,
12623         with_tune_32 to pentium4.
12625 2010-04-01  Uros Bizjak  <ubizjak@gmail.com>
12627         * config/i386/cpuid.h (__get_cpuid_max): Move misplaced comment.
12629 2010-04-01  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
12631         * doc/install.texi (Specific, mips-sgi-irix5): Document IRIX 5
12632         obsoletion, removal.
12633         Update IDO URL.
12634         Document GNU as requirement.
12635         Update configure requirements.
12636         (Specific, mips-sgi-irix6): Document IRIX 6 < 6.5 obsoletion, removal.
12637         Recomment IRIX 6.5.18+.
12638         Document IDF/IDL requirement.
12639         Document GNU as requirement.
12640         Document GNU ld bootstrap failure.
12641         Remove freeware.sgi.com reference.
12643 2010-04-01  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
12645         * doc/install.texi (Specific, alpha*-dec-osf*): Document Tru64
12646         UNIX V4.0, V5.0 obsoletion, removal.
12647         Remove --with-gc=simple reference.
12648         Update VM requirements during bootstrap.
12649         Remove -oldas bootstrap description.
12650         Update binutils reference.
12651         Remove comparison failure note.
12653 2010-03-31  Richard Guenther  <rguenther@suse.de>
12654             Zdenek Dvorak  <ook@ucw.cz>
12655             Sebastian Pop  <sebastian.pop@amd.com>
12657         PR middle-end/43464
12658         * tree-ssa-copy.c (init_copy_prop): Handle loop close phi nodes
12659         with multiple arguments.
12660         (execute_copy_prop): Remove call to rewrite_into_loop_closed_ssa.
12662 2010-03-31  Sebastian Pop  <sebastian.pop@amd.com>
12664         * graphite-dependences.c (print_pddr): Call print_pdr with an
12665         extra argument.
12666         * graphite-poly.c (debug_pdr): Add an extra argument for the
12667         verbosity level.
12668         (print_pdr): Same.
12669         (print_pbb_domain): Same.
12670         (print_pbb): Same.
12671         (print_scop_context): Same.
12672         (print_scop): Same.
12673         (print_cloog): Same.
12674         (debug_pbb_domain): Same.
12675         (debug_pbb): Same.
12676         (print_pdrs): Same.
12677         (debug_pdrs): Same.
12678         (debug_scop_context): Same.
12679         (debug_scop): Same.
12680         (debug_cloog): Same.
12681         (print_scop_params): Same.
12682         (debug_scop_params): Same.
12683         (print_iteration_domain): Same.
12684         (print_iteration_domains): Same.
12685         (debug_iteration_domain): Same.
12686         (debug_iteration_domains): Same.
12687         (print_scattering_function): Same.
12688         (print_scattering_functions): Same.
12689         (debug_scattering_function): Same.
12690         (debug_scattering_functions): Same.
12691         * graphite-poly.h (debug_pdr): Update declaration.
12692         (print_pdr): Same.
12693         (print_pbb_domain): Same.
12694         (print_pbb): Same.
12695         (print_scop_context): Same.
12696         (print_scop): Same.
12697         (print_cloog): Same.
12698         (debug_pbb_domain): Same.
12699         (debug_pbb): Same.
12700         (print_pdrs): Same.
12701         (debug_pdrs): Same.
12702         (debug_scop_context): Same.
12703         (debug_scop): Same.
12704         (debug_cloog): Same.
12705         (print_scop_params): Same.
12706         (debug_scop_params): Same.
12707         (print_iteration_domain): Same.
12708         (print_iteration_domains): Same.
12709         (debug_iteration_domain): Same.
12710         (debug_iteration_domains): Same.
12711         (print_scattering_function): Same.
12712         (print_scattering_functions): Same.
12713         (debug_scattering_function): Same.
12714         (debug_scattering_functions): Same.
12716 2010-03-31  Sebastian Pop  <sebastian.pop@amd.com>
12718         * graphite-poly.c (print_scattering_function_1): New.
12719         (print_scattering_function): Call it.
12720         (print_scop_params): Remove spaces at the end of lines.
12721         (print_cloog): New.
12722         (debug_cloog): New.
12723         * graphite-poly.h (print_cloog): Declared.
12724         (debug_cloog): Declared.
12726 2010-03-31  Sebastian Pop  <sebastian.pop@amd.com>
12728         * graphite-sese-to-poly.c (graphite_loop_normal_form): Add the IV bump
12729         in loop->header.
12730         * tree-flow.h (canonicalize_loop_ivs): Updated declaration.
12731         * tree-parloops.c (gen_parallel_loop): Add the IV bump in loop->latch.
12732         * tree-ssa-loop-manip.c (canonicalize_loop_ivs): Add a new parameter
12733         to switch between adding the IV bump in loop->latch or in loop->header.
12735 2010-03-31  Sebastian Pop  <sebastian.pop@amd.com>
12737         * graphite-poly.c (print_scattering_function): Pretty print following
12738         the scoplib format.
12739         (print_pdr): Same.
12740         (print_pbb_domain): Same.
12741         (dump_gbb_cases): Same.
12742         (dump_gbb_conditions): Same.
12743         (print_pdrs): Same.
12744         (print_pbb): Same.
12745         (print_scop_params): Same.
12746         (print_scop_context): Same.
12747         (print_scop): Same.
12748         (print_pbb_body): New.
12749         (lst_indent_to): New.
12750         (print_lst): Start new lines with a #.
12751         * graphite-poly.h (pbb_bb): New.
12752         (pbb_index): Use pbb_bb.
12753         * graphite-ppl.c (ppl_print_powerset_matrix): Print the number of
12754         disjuncts.
12755         * tree-data-ref.c (dump_data_reference): Start new lines with a #.
12757 2010-03-31  Jakub Jelinek  <jakub@redhat.com>
12759         * dwarf2out.c (size_of_die): For -gdwarf-4 use
12760         uleb128 size instead of fixed 1 or 2 for dw_val_class_loc
12761         and 0 instead of 1 for dw_val_class_flag.
12762         (value_format): For -gdwarf-4 use DW_FORM_sec_offset for
12763         dw_val_class_range_list, dw_val_class_loc_list,
12764         dw_val_class_lineptr and dw_val_class_macptr, use
12765         DW_FORM_flag_present for dw_val_class_flag and
12766         DW_FORM_exprloc for dw_val_class_loc.
12767         (output_die): For -gdwarf-4 print dw_val_class_loc
12768         size as uleb128 instead of 1 or 2 bytes and don't print
12769         anything for dw_val_class_flag.
12771         * var-tracking.c (vt_init_cfa_base): Use cselib_lookup_from_insn
12772         instead of cselib_lookup following by tweaking locs->setting_insn.
12774         PR bootstrap/43596
12775         * cselib.c (cselib_process_insn): Clear cselib_current_insn
12776         even before returning from label, setjmp call or volatile asm
12777         handling.
12779 2010-03-31  Richard Guenther  <rguenther@suse.de>
12781         PR middle-end/43600
12782         * cgraphunit.c (cgraph_output_in_order): Do not allocate
12783         temporary data on stack.
12785 2010-03-31  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
12787         * config/sparc/sysv4.h (PUSHSECTION_FORMAT): Remove undef.
12788         (PUSHSECTION_ASM_OP): Remove.
12789         (POPSECTION_ASM_OP): Remove.
12790         (PUSHSECTION_FORMAT): Remove.
12791         * config/sol2.h (PUSHSECTION_FORMAT): Define.
12792         * config/sparc/sol2.h [!USE_GAS] (PUSHSECTION_FORMAT): Redefine.
12793         * config/sol2.c (solaris_output_init_fini): Use it.
12795 2010-03-31  Jie Zhang  <jie@codesourcery.com>
12797         PR 43574
12798         * opt-functions.awk (var_type_struct): Use signed char type
12799         for simple variables.
12801 2010-03-31  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
12803         * config/sol2.c: Include output.h.
12804         (solaris_assemble_visibility): New function.
12805         * config/t-sol2 (sol2.o): Add output.h dependency.
12806         * config/sol2-protos.h (solaris_assemble_visibility): Declare.
12807         * config/sol2.h [!USE_GAS] (TARGET_ASM_ASSEMBLE_VISIBILITY):
12808         Redefine.
12810 2010-03-31  Jakub Jelinek  <jakub@redhat.com>
12812         PR target/43580
12813         * config/arm/arm.c (arm_save_coproc_regs): Use Pmode instead of
12814         V2SImode or XFmode on PRE_DEC.
12816         PR debug/43557
12817         * cfgexpand.c (expand_debug_expr): Handle VOIDmode mode like
12818         BLKmode.
12820 2010-03-31  Jie Zhang  <jie@codesourcery.com>
12822         PR 43562
12823         * reload.h (caller_save_initialized_p): Declare.
12824         * toplev.c (backend_init_target): Don't call
12825         init_caller_save but set caller_save_initialized_p to false.
12826         * caller-save.c (caller_save_initialized_p): Define.
12827         (init_caller_save): Check caller_save_initialized_p.
12828         * ira.c (ira): Call init_caller_save if flag_caller_saves.
12830 2010-03-31  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
12832         PR target/39048
12833         * config.gcc (i[34567]86-*-solaris2*): Add i386/t-fprules-softfp
12834         and soft-fp/t-softfp to tmake_file.
12835         * config/i386/sol2.h (LIBGCC2_HAS_TF_MODE): Redefine.
12836         (LIBGCC2_TF_CEXT): Define.
12837         (TF_SIZE): Define.
12839 2010-03-30  Alexandre Oliva  <aoliva@redhat.com>
12841         PR debug/42977
12842         * cselib.c (n_useless_values): Document handling of debug locs.
12843         (n_useless_debug_values, n_debug_values): New variables.
12844         (new_elt_loc_list): Don't add to debug values, keep count.
12845         (promote_debug_loc): New.
12846         (cselib_reset_table): Zero new variables.
12847         (entry_and_rtx_equal_p): Promote debug locs.
12848         (discard_useless_locs): Increment n_useless_debug_values for
12849         debug values.
12850         (remove_useless_values): Adjust n_useless_values and n_debug_values
12851         with n_useless_debug_values.
12852         (add_mem_for_addr): Promote debug locs.
12853         (cselib_lookup_mem): Likewise.
12854         (cselib_lookup_addr): Renamed to...
12855         (cselib_lookup_addr_1): ... this.  Promote debug locs.  Don't call...
12856         (cselib_log_lookup): ... this.  Turn into...
12857         (cselib_lookup_addr): ... new wrapper.
12858         (cselib_lookup_from_insn): New.
12859         (cselib_invalidate_regno): Increment n_useless_debug_values for
12860         debug values.
12861         (cselib_invalidate_mem): Likewise.
12862         (cselib_process_insn): Take n_deleted and n_debug_values into
12863         account to guard remove_useless_value call.
12864         (cselib_finish): Zero n_useless_debug_values.
12865         * cselib.h (cselib_lookup_from_insn): Declare.
12866         * sched-deps.c (sched_analyze_1): Use cselib_lookup_from_insn.
12867         (sched_analyze_2): Likewise.
12869 2010-03-30  Jakub Jelinek  <jakub@redhat.com>
12871         * var-tracking.c (use_narrower_mode_test, use_narrower_mode): New
12872         functions.
12873         (adjust_mems): Replace narrowing SUBREG of expression containing
12874         just PLUS, MINUS, MULT and ASHIFT of registers and constants
12875         with operations in the narrower mode.
12877         PR debug/43593
12878         * var-tracking.c (dataflow_set_clear_at_call): Invalidate just
12879         regs_invalidated_by_call instead all call_used_reg_set registers.
12881 2010-03-30  Sebastian Pop  <sebastian.pop@amd.com>
12883         PR middle-end/43430
12884         * tree-vect-slp.c (vect_get_and_check_slp_defs): Replace type
12885         pointer comparisons with types_compatible_p.
12886         * tree-vect-stmts.c (vectorizable_call): Same.
12887         (vectorizable_condition): Same.
12889 2010-03-30  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
12891         * config/s390/s390.c (s390_emit_prologue): Omit issuing a dynamic
12892         stack check if the mask would be zero.
12894 2010-03-30  Seongbae Park <seongbae.park@gmail.com>
12895             Jack Howarth <howarth@bromo.med.uc.edu>
12897         * tree-profile.c (tree_init_ic_make_global_vars): Make static
12898         variables TLS.
12900 2010-03-30  Joseph Myers  <joseph@codesourcery.com>
12902         PR other/25232
12903         * libgcc-std.ver (GCC_4.5.0): Define version.  Include __unordxf2
12904         and __unordtf2.
12905         * config/bfin/libgcc-bfin.ver (GCC_4.5.0): Define version.
12906         Include ___unordxf2 and ___unordtf2.
12907         * config/i386/libgcc-glibc.ver: Do not define inheritance from
12908         GCC_4.4.0 here.
12910 2010-03-30  Tarik Graba  <tarik.graba@telecom-paristech.fr>
12912         * config/lm32/t-lm32: New file.
12913         * config.gcc: Use the above file when targetting lm32.
12915 2010-03-28  Duncan Sands  <baldrick@free.fr>
12917         * Makefile.in (PLUGIN_HEADERS): Add except.h.
12919 2010-03-29  Sebastian Pop  <sebastian.pop@amd.com>
12921         PR middle-end/43431
12922         * tree-vect-loop.c (vect_estimate_min_profitable_iters):
12923         Improve vectorization cost model diagnostic.
12925 2010-03-29  Sebastian Pop  <sebastian.pop@amd.com>
12927         PR middle-end/43436
12928         * tree-vect-data-refs.c (vect_analyze_data_refs): When
12929         compute_data_dependences_for_loop returns false, early exit
12930         and output an extra diagnostic for the failed data reference
12931         analysis.
12933 2010-03-29  Richard Guenther  <rguenther@suse.de>
12935         PR tree-optimization/43560
12936         * tree-ssa-loop-im.c (ref_always_accessed_p): Add store_p parameter.
12937         (can_sm_ref_p): Treat stores to readonly locations as trapping.
12939 2010-03-29  Jie Zhang  <jie@codesourcery.com>
12941         PR 43564
12942         * toplev.c (process_options): Set optimization_default_node
12943         and optimization_current_node.
12944         * opts.c (decode_options): Don't set optimization_default_node
12945         and optimization_current_node.
12947 2010-03-29  Ralf Corsépius  <ralf.corsepius@rtems.org>
12949         * config/rtems.h: Abandon -qrtems_debug.
12951 2010-03-28  Jan Hubicka  <jh@suse.cz>
12953         PR tree-optimization/43505
12954         * cgraph.c (cgraph_clone_node): When clonning a clone, replacement
12955         map should not be copied.
12957 2010-03-27  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
12959         PR middle-end/41674
12960         * cgraphunit.c (cgraph_build_static_cdtor): If target doesn't have
12961         cdtors, set DECL_PRESERVE_P.
12962         * ipa.c (cgraph_externally_visible_p): Return true if declaration
12963         should be preseved.
12965 2010-03-27  Uros Bizjak  <ubizjak@gmail.com>
12967         PR tree-optimization/43528
12968         * stor-layout.c (place_field): Check that constant fits into
12969         unsigned HWI when skipping calculation of MS bitfield layout.
12971 2010-03-27  Jan Hubicka  <jh@suse.cz>
12973         PR middle-end/43391
12974         * varasm.c (make_decl_rtl): Deal with COMMON flag to make
12975         notice_global_symbol work.
12977 2010-03-27  Jakub Jelinek  <jakub@redhat.com>
12979         * dwarf2out.c (dwarf2_debug_hooks): Use dwarf2out_function_decl
12980         instead of dwarf2out_decl.
12981         (struct var_loc_node): Remove section_label field.
12982         (dwarf2out_function_decl): New function.
12983         (dwarf2out_var_location): Don't set section_label field.
12984         (dwarf2out_begin_function): Don't empty decl_loc_table here.
12986 2010-03-26  Michael Meissner  <meissner@linux.vnet.ibm.com>
12988         PR tree-optimization/43544
12989         * doc/tm.texi (TARGET_VECTORIZE_BUILTIN_VECTORIZED_FUNCTION):
12990         First argument for builtin vectorized function hook is now a
12991         tree to be able to distinguish between machine specific and
12992         standard builtins.
12993         * targhooks.c (default_builtin_vectorized_function): Ditto.
12994         * targhooks.h (default_builtin_vectorized_function): Ditto.
12995         * target.h (struct gcc_target): Ditto.
12996         * tree-vect-stmts.c (vectorizable_function): Ditto.
12997         * config/i386/i386.c (ix86_builtin_vectorized_function): Ditto.
12998         * config/rs6000/rs6000.c (rs6000_builtin_vectorized_function):
12999         Ditto.
13001 2010-03-26  Joseph Myers  <joseph@codesourcery.com>
13003         PR c/43381
13004         * c-decl.c (get_parm_info): Assert that decl going in OTHERS has a
13005         nested binding iff it is a FUNCTION_DECL.
13006         (store_parm_decls_newstyle): Pass nested=true to bind for
13007         FUNCTION_DECLs amongst parameters.
13009 2010-03-26  Jakub Jelinek  <jakub@redhat.com>
13011         * var-tracking.c (vt_expand_loc_callback): Don't run
13012         cselib_expand_value_rtx_cb in dummy mode if
13013         cselib_dummy_expand_value_rtx_cb returned false.
13015         * var-tracking.c (emit_note_insn_var_location): For one part
13016         notes with offset 0, don't add EXPR_LIST around the location.
13017         * dwarf2out.c (loc_descriptor, dw_loc_list_1,
13018         add_location_or_const_value_attribute): Adjust for that change.
13020         PR debug/43540
13021         * dwarf2out.c (reg_save): For DW_CFA_expression put regnum
13022         into first operand and location into second.
13023         (dw_cfi_oprnd1_desc): Return dw_cfi_oprnd_reg_num instead of
13024         dw_cfi_oprnd_loc for DW_CFA_expression.
13025         (dw_cfi_oprnd2_desc): Return dw_cfi_oprnd_loc for DW_CFA_expression.
13026         (output_cfa_loc, output_cfa_loc_raw): For DW_CFA_expression
13027         assume first argument is regnum and second argument is location.
13029 2010-03-26  Uros Bizjak  <ubizjak@gmail.com>
13031         PR target/42113
13032         * config/alpha/alpha.md (*cmp_sadd_si): Change mode
13033         of scratch register to DImode.  Split to DImode comparison operator.
13034         Use SImode subreg of scratch register in the multiplication.
13035         (*cmp_sadd_sidi): Ditto.
13036         (*cmp_ssub_si): Ditto.
13037         (*cmp_ssub_sidi): Ditto.
13039 2010-03-26  Uros Bizjak  <ubizjak@gmail.com>
13041         PR target/43524
13042         * config/i386/i386.c (ix86_expand_prologue) [TARGET_STACK_PROBE]:
13043         Remove invalid assert and wrong comment.
13045 2010-03-26  Jakub Jelinek  <jakub@redhat.com>
13047         PR debug/43516
13048         * flags.h (final_insns_dump_p): New extern.
13049         * final.c (final_insns_dump_p): New variable.
13050         (rest_of_clean_state): Set it before -fdump-final-insns=
13051         dumping, clear afterwards.
13052         * print-rtl.c (print_rtx): If final_insns_dump_p don't dump
13053         MEM_ALIAS_SET on MEMs.
13055 2010-03-26  David S. Miller  <davem@davemloft.net>
13057         * configure.ac: Fix sparc GOTDATA_OP bug check.
13058         * configure: Rebuild.
13060 2010-03-26  Alan Modra  <amodra@gmail.com>
13062         * config/rs6000/rs6000.md (cmptf_internal2): Correct comparison.
13064 2010-03-25  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
13066         * doc/tm.texi (Sections): Document TLS_COMMON_ASM_OP,
13067         TLS_SECTION_ASM_FLAG.
13069 2010-03-25  Jakub Jelinek  <jakub@redhat.com>
13071         PR bootstrap/43511
13072         * config/i386/i386.c (ix86_code_end): Set DECL_WEAK if TARGET_MACHO.
13073         Clear first_function_block_is_cold.
13075         PR c/43385
13076         * gimplify.c (gimple_boolify): Only recurse on __builtin_expect
13077         argument if the argument is truth_value_p.
13079 2010-03-24  Michael Meissner  <meissner@linux.vnet.ibm.com>
13081         * config/rs6000/constraints.md: Update copyright year for my changes.
13083         PR target/43484
13084         * config/rs6000/rs6000.c (rs6000_split_multireg_move): If r0 is
13085         used in reg+reg addressing, swap registers.
13087 2010-03-24  Jakub Jelinek  <jakub@redhat.com>
13089         PR debug/43293
13090         * target.h (struct gcc_target): Add code_end hook.
13091         * target-def.h (TARGET_ASM_CODE_END): Define to hook_void_void
13092         if not yet defined.
13093         (TARGET_ASM_OUT): Add TARGET_ASM_CODE_END.
13094         * toplev.c (compile_file): Call targetm.asm_out.code_end
13095         hook before unwind info/debug info output.
13096         * config/i386/winnt.c (i386_pe_file_end): Don't call ix86_file_end.
13097         * config/i386/linux.h (NEED_INDICATE_EXEC_STACK): Don't define.
13098         (TARGET_ASM_FILE_END): Define to file_end_indicate_exec_stack.
13099         * config/i386/linux64.h (NEED_INDICATE_EXEC_STACK): Don't define.
13100         (TARGET_ASM_FILE_END): Define to file_end_indicate_exec_stack.
13101         * config/i386/i386.c (ix86_file_end): Renamed to...
13102         (ix86_code_end): ... this.  Make static.  Don't call
13103         file_end_indicate_exec_stack.  Emit unwind info using
13104         final_start_function/final_end_function.
13105         (darwin_x86_file_end): Remove.
13106         (TARGET_ASM_CODE_END): Define.
13107         * config/i386/i386.h (TARGET_ASM_FILE_END,
13108         NEED_INDICATE_EXEC_STACK): Don't define.
13109         * config/i386/darwin.h (darwin_x86_file_end): Remove prototype.
13110         (TARGET_ASM_FILE_END): Define to darwin_file_end.
13111         * config/i386/i386-protos.h (ix86_file_end): Remove prototype.
13112         * doc/tm.texi (TARGET_ASM_CODE_END): Document.
13114         PR target/43498
13115         * config/i386/i386.c (x86_output_mi_thunk): Call final_start_function
13116         at the beginning and final_end_function at the end.
13117         * config/s390/s390.c (s390_output_mi_thunk): Likewise.
13119 2010-03-24  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
13121         * configure.ac (i[34567]86-*-*): Handle Solaris 2/x86 TLS support
13122         and Sun as TLS syntax.
13123         (TLS_SECTION_ASM_FLAG) [on_solaris && !gas_flag]: Define.
13124         * configure: Regenerate.
13125         * config.in: Regenerate.
13126         * varasm.c (TLS_SECTION_ASM_FLAG): Define default.
13127         (default_elf_asm_named_section): Use it.
13128         * config/i386/i386.c (output_pic_addr_const): Lowercase @DTPOFF.
13129         (i386_output_dwarf_dtprel): Likewise.
13130         (output_addr_const_extra): Likewise.
13131         (output_pic_addr_const): Lowercase @GOTTPOFF.
13132         (output_addr_const_extra): Likewise.
13133         (output_pic_addr_const): Lowercase @GOTNTPOFF.
13134         (output_addr_const_extra): Likewise.
13135         (output_pic_addr_const): Lowercase @INDNTPOFF.
13136         (output_addr_const_extra): Likewise.
13137         (output_pic_addr_const): Lowercase @NTPOFF.
13138         (output_addr_const_extra): Likewise.
13139         (output_pic_addr_const): Lowercase @TPOFF.
13140         (output_addr_const_extra): Likewise.
13141         * config/i386/i386.md (*tls_global_dynamic_32_gnu): Lowercase @TLSGD.
13142         (*tls_global_dynamic_64): Likewise.
13143         (*tls_local_dynamic_base_32_gnu): Lowercase @TLSLDM.
13144         (*tls_local_dynamic_base_64): Lowercase @TLSLD.
13146         * defaults.h (TLS_COMMON_ASM_OP): Provide default.
13147         (ASM_OUTPUT_TLS_COMMON): Use it.
13148         * config/i386/sol2-gas.h (TLS_COMMON_ASM_OP): Undef.
13150         PR target/38118
13151         * config.gcc (sparc*-*-solaris2*) [$gas=yes]: Add usegas.h to tm_file.
13152         * config/sparc/sol2.h (ASM_OUTPUT_ALIGNED_COMMON): Move ...
13153         * config/sol2.h (ASM_OUTPUT_ALIGNED_COMMON): ... here.
13154         * config/i386/sol2-10.h (ASM_OUTPUT_ALIGNED_COMMON): Redefine.
13155         * config/i386/sol2.h (TARGET_SUN_TLS): Redefine.
13156         (ASM_DECLARE_OBJECT_NAME) [!USE_GAS]: Redefine.
13158 2010-03-24  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
13160         * config/i386/i386.c (override_options): Don't accept
13161         -mtls-dialect=sun any longer.
13162         * config/i386/i386.h (TARGET_SUN_TLS): Define as 0.
13163         * config/i386/i386.md (*tls_global_dynamic_32_sun): Remove.
13164         (*tls_local_dynamic_base_32_sun): Likewise.
13165         * config/i386/sol2.h (TARGET_SUN_TLS): Redefine.
13167 2010-03-24  Jakub Jelinek  <jakub@redhat.com>
13169         PR debug/43508
13170         * dwarf2out.c (mem_loc_descriptor): Don't ICE on
13171         VEC_{MERGE,SELECT,CONCAT,DUPLICATE}.
13173         PR debug/43479
13174         * ira.c (adjust_cleared_regs): New function.
13175         (update_equiv_regs): Adjust cleared_regs in DEBUG_INSNs.
13177         PR debug/19192
13178         PR debug/43479
13179         * cfgexpand.c (gimple_assign_rhs_to_tree): Also set TREE_BLOCK
13180         from gimple_block.
13181         * expr.c (expand_expr_real): Restore previous
13182         curr_insn_source_location and curr_insn_block after
13183         expand_expr_real_1 call.
13184         (expand_expr_real_1) <case SSA_NAME>: Call expand_expr_real
13185         instead of expand_expr_real_1.
13187 2010-03-23  Vladimir Makarov  <vmakarov@redhat.com>
13189         PR rtl-optimization/43413
13190         * ira-color.c (setup_allocno_available_regs_num): Count prohibited
13191         hard regs too.
13193 2010-03-22  James E. Wilson  <wilson@codesourcery.com>
13195         PR target/43348
13196         * ia64.md (call_nogp, call_value_nogp, sibcall_nogp, call_gp,
13197         call_value_gp, sibcall_gp): Use 's' constraint not 'i'.
13199 2010-03-22  H.J. Lu  <hongjiu.lu@intel.com>
13201         * config/i386/i386.c (ix86_target_string): Add -mfma.
13202         Fix a typo in comment.
13204 2010-03-22  Mike Stump  <mikestump@comcast.net>
13206         PR target/23071
13207         * config/rs6000/rs6000.c (darwin_rs6000_special_round_type_align):
13208         Don't overly align based upon packed packed fields.
13210 2010-03-22  Jason Merrill  <jason@redhat.com>
13212         * c-pretty-print.c (pp_c_specifier_qualifier_list) [VECTOR_TYPE]:
13213         Use () rather than [], and move before the element type.
13215 2010-03-22  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
13217         * doc/configfiles.texi (Configuration Files): Removed
13218         fixinc/Makefile*, intl/Makefile.*.
13219         * doc/makefile.texi: Fixed markup. Abstract from version
13220         control system used.
13221         (Makefile): Removed obsolete gcc/java/parse.y example.
13222         * doc/sourcebuild.texi: Likewise.
13223         (Top Level): Added config, gnattools, libdecnumber, libgcc,
13224         libgomp, libssp.  Removed fastjar.
13225         (Miscellaneous Docs): Clarify location.
13226         Added COPYING3, COPYING3.LIB.
13227         (Front End Directory): Moved Make-lang.in entry to new subsubsection.
13229 2010-03-22  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
13231         PR target/38085
13232         * config/i386/i386.c (x86_function_profiler)
13233         [!NO_PROFILE_COUNTERS]: Fix typo.
13234         * config/i386/gmon-sol2.c (_mcleanup) [__x86_64__]: Use call
13235         instead of callq.
13237 2010-03-22  Janis Johnson  <janis187@us.ibm.com>
13238             Rainer Orth <ro@CeBiTec.Uni-Bielefeld.DE>
13240         * doc/sourcebuild.texi (Test Directives): Split into six
13241         subsections, with most of the current text in new subsections
13242         Directives, Selectors, and Final Actions.
13243         (Directives): Split list of test directives into multiple
13244         subsubsections.
13245         (Selectors): Describe use and syntax of selectors.
13246         (Effective-Target Keywords): Describe all existing keywords.
13247         (Add Options): Describe features for dg-add-options.
13248         (Require Support): Describe variants of dg-require-support.
13249         (Final Actions): Describe commands to use in dg-final.
13251 2010-03-22  Michael Matz  <matz@suse.de>
13253         PR middle-end/43475
13254         * recog.c (validate_replace_rtx_group): Replace also in
13255         REG_EQUAL and REG_EQUIV notes.
13257 2010-03-22  Richard Guenther  <rguenther@suse.de>
13259         PR tree-optimization/43390
13260         * tree-vect-stmts.c (get_vectype_for_scalar_type): Make
13261         sure vector extracts are type correct.
13263 2010-03-22  Richard Guenther  <rguenther@suse.de>
13265         PR middle-end/40106
13266         * builtins.c (expand_builtin_pow): Expand pow (x, 1.5) as
13267         x * sqrt (x) even when optimizing for size if the target
13268         has native support for sqrt.
13270 2010-03-22  Jakub Jelinek  <jakub@redhat.com>
13272         * varasm.c (make_decl_rtl_for_debug): Also clear
13273         flag_mudflap for the duration of make_decl_rtl call.
13275         PR debug/43443
13276         * var-tracking.c (add_cselib_value_chains): Remove ASM_OPERANDS
13277         locs from preserved VALUEs.
13279 2010-03-21  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
13281         PR middle-end/42718
13282         * pa.md (movmemsi): Set align to one if zero.
13283         (movmemdi): Likewise.
13285 2010-03-21  Richard Earnshaw  <rearnsha@arm.com>
13287         PR target/42321
13288         * arm.c (arm_output_epilogue): Correctly match VFP pop instructions
13289         with their corresponding prologue pushes.
13291 2010-03-20  Andrew Pinski  <pinskia@gmail.com>
13293         PR target/43156
13294         * config/spu/spu.c (spu_expand_prologue): Don't emit NOTE_INSN_DELETED
13295         at the begining or end.
13296         (spu_expand_epilogue): Likewise.
13298 2010-03-20  Richard Guenther  <rguenther@suse.de>
13300         PR rtl-optimization/43438
13301         * combine.c (make_extraction): Properly zero-/sign-extend an
13302         extraction of the low part of a CONST_INT.  Also handle
13303         CONST_DOUBLE.
13305 2010-03-19  Mike Stump  <mikestump@comcast.net>
13307         * config/i386/darwin.h (SUBTARGET32_DEFAULT_CPU): Add.
13308         * config/i386/i386.c (SUBTARGET32_DEFAULT_CPU): Add.
13309         (override_options): Use SUBTARGET32_DEFAULT_CPU.
13311 2010-03-19  Andrew Pinski  <andrew_pinski@caviumnetworks.com>
13313         PR c/43211
13314         * c-decl.c (grokparms): Set arg_types to NULL_TREE if there was
13315         an error.
13317 2010-03-19  Bernd Schmidt  <bernds@codesourcery.com>
13319         PR rtl-optimization/42258
13320         * ira-lives.c (check_and_make_def_conflict): Ignore conflict for a
13321         use that may match DEF.
13323         PR target/40697
13324         * optabs.c (avoid_expensive_constant): Use rtx_cost to find out
13325         the cost of loading the constant rather than assuming
13326         COSTS_N_INSNS (1).
13327         * config/arm/arm.c (thumb1_rtx_costs) <case CONST_INT>: If the
13328         outer code is AND, do the same tests as the andsi3 expander and
13329         return COSTS_N_INSNS (1) if and is cheap.
13331         * optabs.c (avoid_expensive_constant): Fix formatting.
13333 2010-03-19  Michael Matz  <matz@suse.de>
13335         PR c++/43116
13336         * attribs.c (decl_attributes): When rebuilding a function pointer
13337         type use the same qualifiers as the original pointer type.
13339 2010-03-19  Martin Jambor  <mjambor@suse.cz>
13341         * doc/gimple.texi (Logical Operators): Describe is_gimple_ip_invariant
13342         and is_gimple_ip_invariant_address.
13344 2010-03-19  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
13346         Revert
13347         2009-10-01  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
13349         * config/arm/arm.c (arm_override_options): Turn off
13350         flag_dwarf2_cfi_asm for AAPCS variants.
13352 2010-03-19  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
13354         PR target/43399
13355         * config/arm/arm.c (emit_multi_reg_push): Update comments.
13356         Use PRE_MODIFY instead of PRE_DEC.
13357         (emit_sfm): Use PRE_MODIFY instead of PRE_DEC.
13358         (vfp_emit_fstmd): Likewise.
13360 2010-03-19  Michael Matz  <matz@suse.de>
13362         PR target/43305
13363         * builtins.c (expand_builtin_interclass_mathfn,
13364         expand_builtin_signbit): Use maybe_emit_unop_insn, emit libcalls
13365         if that fails.
13367 2010-03-19  Richard Guenther  <rguenther@suse.de>
13369         PR tree-optimization/43415
13370         * tree-ssa-pre.c (phi_translate): Split out worker to ...
13371         (phi_translate_1): ... this.
13372         (phi_translate): Move all caching here.  Cache all NARY
13373         and REFERENCE translations.
13375 2010-03-19  David S. Miller  <davem@davemloft.net>
13377         With help from Eric Botcazou.
13378         * config/sparc/sparc.c: Include dwarf2out.h.
13379         (emit_pic_helper): Delete.
13380         (pic_helper_symbol_name): Delete.
13381         (pic_helper_emitted_p): Delete.
13382         (pic_helper_needed): New.
13383         (USE_HIDDEN_LINKONCE): Define to '1' if HAVE_GAS_HIDDEN else '0'.
13384         (get_pc_thunk_name): New.
13385         (load_pic_register): Remove 'delay_pic_helper' arg.  Use
13386         get_thunk_pc_name and ggc_strdup to generate PIC thunk symbol.
13387         Set pic_helper_needed to true.  Don't call emit_pic_helper.
13388         (sparc_expand_prologue): Update load_pic_register call.
13389         (sparc_output_mi_thunk): Likewise.
13390         (sparc_file_end): Emit a hidden comdat symbol for the PIC
13391         thunk if possible.  Output CFI information as needed.
13393 2010-03-18  Francois-Xavier Coudert <fxcoudert@gcc.gnu.org>
13394             Jack Howarth <howarth@bromo.med.uc.edu>
13396         PR target/36399
13397         * config/i386/i386.h: Fix ABI on darwin x86-32.
13399 2010-03-18  Aldy Hernandez  <aldyh@redhat.com>
13401         * tree.h: Declare make_decl_rtl_for_debug.
13402         * varasm.c (make_decl_rtl_for_debug): New.
13403         * dwarf2out.c (rtl_for_decl_location): Call it.
13404         * cfgexpand.c (expand_debug_expr): Call it.
13406 2010-03-18  Jakub Jelinek  <jakub@redhat.com>
13408         PR bootstrap/43399
13409         * var-tracking.c (adjust_mems) <case POST_MODIFY>: Allow BLKmode
13410         mem_mode.
13412         PR bootstrap/43403
13413         * var-tracking.c (vt_init_cfa_base): Do nothing if
13414         cfa_base_rtx would be hard_frame_pointer_rtx or non-fixed register.
13416 2010-03-18  Alexandre Oliva  <aoliva@redhat.com>
13418         PR debug/42873
13419         * var-tracking.c (canonicalize_vars_star): New.
13420         (dataflow_post_merge_adjust): Use it.
13422 2010-03-18  Jakub Jelinek  <jakub@redhat.com>
13424         PR debug/43058
13425         * var-tracking.c (non_suitable_const): New function.
13426         (add_uses): For DEBUG_INSNs with constants, don't record any
13427         value, instead just the constant value itself.
13428         (compute_bb_dataflow) <case MO_VAL_LOC>: If PAT_VAR_LOCATION_LOC
13429         is not VAR_LOC_UNKNOWN_P, set var to the constant.
13430         (emit_notes_in_bb): Likewise.
13431         (emit_note_insn_var_location): For onepart variables if
13432         cur_loc is a VOIDmode constant, use DECL_MODE.
13434 2010-03-18  Martin Jambor  <mjambor@suse.cz>
13436         PR middle-end/42450
13437         * cgraph.h (cgraph_redirect_edge_call_stmt_to_callee): Declare.
13438         * cgraphunit.c (cgraph_materialize_all_clones): Update calls in
13439         all non-clones.  Moved call redirection...
13440         (cgraph_redirect_edge_call_stmt_to_callee): ...to this new function.
13441         (cgraph_materialize_all_clones): Dispose of all
13442         combined_args_to_skip bitmaps.
13443         (verify_cgraph_node): Do not check for edges pointing to wrong
13444         nodes in inline clones.
13445         * tree-inline.c (copy_bb): Call
13446         cgraph_redirect_edge_call_stmt_to_callee.
13447         * ipa.c (cgraph_remove_unreachable_nodes): Call
13448         cgraph_node_remove_callees even when there are used clones.
13450 2010-03-18  H.J. Lu  <hongjiu.lu@intel.com>
13452         * config/i386/libgcc-glibc.ver: Make GCC_4.5.0 inherit GCC_4.4.0.
13454 2010-03-18  H.J. Lu  <hongjiu.lu@intel.com>
13456         PR target/43383
13457         * config/i386/libgcc-glibc.ver: Add __extendxftf2 to GCC_4.5.0
13458         for 32bit.
13460 2010-03-18  Michael Matz  <matz@suse.de>
13462         PR middle-end/43419
13463         * builtins.c (expand_builtin_pow): Don't transform pow(x, 0.5)
13464         into sqrt(x) if we need to preserve signed zeros.
13466 2010-03-18  Steven Bosscher  <steven@gcc.gnu.org>
13467             Eric Botcazou  <ebotcazou@adacore.com>
13469         PR rtl-optimization/43360
13470         * loop-invariant.c (move_invariant_reg): Remove the REG_EQUAL
13471         note if we don't know its invariant status.
13473 2010-03-18  Michael Matz  <matz@suse.de>
13475         PR tree-optimization/43402
13476         * tree-cfgcleanup.c (cleanup_control_expr_graph): Don't follow
13477         PHI chains of ssa names registered for update.
13479 2010-03-17  Peter Bergner  <bergner@vnet.ibm.com>
13481         PR target/42427
13482         * config/rs6000/rs6000.c (rs6000_split_multireg_move): Add support for
13483         non-offsettable and pre_modify update addressing.
13484         * config/rs6000/dfp.md (*movdd_hardfloat32): Make the "0", "1"
13485         and "2" alternatives "#".
13486         (*movdd_softfloat32): Make all alternatives "#";
13487         * config/rs6000/rs6000.md (DIFD): New define_mode_iterator.
13488         (*movdf_hardfloat32): Make the "0", "1" and "2" alternatives "#".
13489         (*movdf_softfloat32): Make all alternatives "#";
13490         (movdi): Use the new DIFD mode iterator to create a common splitter
13491         for movdi, movdf and movdd patterns.
13493 2010-03-18  Shujing Zhao  <pearly.zhao@oracle.com>
13495         * common.opt (dumpdir): Remove redundant tab.
13497 2010-03-17  Martin Jambor  <mjambor@suse.cz>
13499         PR tree-optimization/43347
13500         * tree-sra.c (create_access_replacement): Set TREE_NO_WARNING when the
13501         original base is DECL_ARTIFICIAL or DECL_IGNORED_P.
13503 2010-03-17  Bernd Schmidt  <bernd.schmidt@analog.com>
13505         PR rtl-optimization/42216
13506         * regrename.c (create_new_chain): New function, broken out from...
13507         (scan_rtx_reg): ... here.  Call it.  Handle the case where we are
13508         appending a use to an empty chain.
13509         (build_def_use): Remove previous changes that convert OP_INOUT to
13510         OP_OUT operands; instead detect the case where an OP_INOUT operand
13511         uses a previously untracked register and create an empty chain for it.
13513 2010-03-17  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
13515         * doc/extend.texi (Function Attributes): Rewrite unfinished
13516         sentence in ms_abi documentation.
13518 2010-03-17  Alan Modra  <amodra@gmail.com>
13520         * config/rs6000/linux64.opt (mprofile-kernel): Use profile_kernel var.
13521         * config/rs6000/linux64.h (TARGET_PROFILE_KERNEL): Define.
13522         (SUBSUBTARGET_OVERRIDE_OPTIONS): Don't use SET_PROFILE_KERNEL.
13523         * config/rs6000/rs6000.c (SET_PROFILE_KERNEL): Don't define.
13525 2010-03-16  Richard Henderson  <rth@redhat.com>
13527         PR middle-end/43365
13528         * tree-eh.c (replace_goto_queue): Also replace in the eh_seq.
13529         (lower_try_finally): Save and restore eh_seq around the expansion
13530         of the try-finally.
13532 2010-03-16  Aldy Hernandez  <aldyh@redhat.com>
13534         * graphite-sese-to-poly.c (split_reduction_stmt): Skip debug
13535         statements before splitting block.
13537 2010-03-16  Rainer Orth <ro@CeBiTec.Uni-Bielefeld.DE>
13539         * doc/sourcebuild.texi (Testsuites): Fix markup.
13540         Use pathnames relative to gcc/testsuite.
13541         (Test Directives): Move description of how timeout is determined.
13542         (Ada Tests): Favor gnat.exp over ada/acats/tests/gcc.
13543         (C Tests): Correct gcc.misc-tests directory.
13544         Framework tests now live in gcc.test-framework.
13546 2010-03-16  Richard Guenther  <rguenther@suse.de>
13548         PR middle-end/43379
13549         * tree-cfg.c (gimple_merge_blocks): When propagating virtual PHI
13550         operands make sure to merge SSA_NAME_OCCURS_IN_ABNORMAL_PHI properly.
13552 2010-03-16  Aldy Hernandez  <aldyh@redhat.com>
13553             Alexandre Oliva  <aoliva@redhat.com>
13555         PR tree-optimization/42917
13556         * lambda-code.c (remove_iv): Skip debug statements.
13557         (lambda_loopnest_to_gcc_loopnest): Likewise.
13558         (not_interesting_stmt): Debug statements are not interesting.
13560 2010-03-16  Jakub Jelinek  <jakub@redhat.com>
13562         PR debug/43051
13563         PR debug/43092
13564         * cselib.c (cselib_preserve_constants,
13565         cfa_base_preserved_val): New static variables.
13566         (preserve_only_constants): New function.
13567         (cselib_reset_table): If cfa_base_preserved_val is non-NULL, don't
13568         clear its REG_VALUES.  If cselib_preserve_constants, don't
13569         empty the whole hash table, but preserve there VALUEs with constants,
13570         cfa_base_preserved_val and cfa_base_preserved_val plus constant.
13571         (cselib_preserve_cfa_base_value): New function.
13572         (cselib_invalidate_regno): Don't invalidate cfa_base_preserved_val.
13573         (cselib_init): Change argument to int bitfield.  Set
13574         cselib_preserve_constants to whether CSELIB_PRESERVE_CONSTANTS
13575         is in it.
13576         (cselib_finish): Clear cselib_preserve_constants and
13577         cfa_base_preserved_val.
13578         * cselib.h (enum cselib_record_what): New enum.
13579         (cselib_init): Change argument to int.
13580         (cselib_preserve_cfa_base_value): New prototype.
13581         * postreload.c (reload_cse_regs_1): Adjust cselib_init caller.
13582         * dse.c (dse_step1): Likewise.
13583         * cfgcleanup.c (thread_jump): Likewise.
13584         * sched-deps.c (sched_analyze): Likewise.
13585         * gcse.c (local_cprop_pass): Likewise.
13586         * simplify-rtx.c (simplify_replace_fn_rtx): Add argument to callback.
13587         If FN is non-NULL, call the callback always and whenever it returns
13588         non-NULL just return that.  Only do rtx_equal_p if FN is NULL.
13589         * rtl.h (simplify_replace_fn_rtx): Add argument to callback.
13590         * combine.c (propagate_for_debug_subst): Add old_rtx argument,
13591         compare from with old_rtx and if it isn't rtx_equal_p, return NULL.
13592         * Makefile.in (var-tracking.o): Depend on $(RECOG_H).
13593         * var-tracking.c: Include recog.h.
13594         (bb_stack_adjust_offset): Remove.
13595         (vt_stack_adjustments): Don't call it, instead just gather the
13596         adjustments using insn_stack_adjust_offset_pre_post on each bb insn.
13597         (adjust_stack_reference): Remove.
13598         (compute_cfa_pointer): New function.
13599         (hard_frame_pointer_adjustment, cfa_base_rtx): New static variables.
13600         (struct adjust_mem_data): New type.
13601         (adjust_mems, adjust_mem_uses, adjust_mem_stores, adjust_insn): New
13602         functions.
13603         (get_address_mode): New function.
13604         (replace_expr_with_values): Use it.
13605         (use_type): Don't do cselib_lookup for VAR_LOC_UNKNOWN_P.
13606         Use get_address_mode.  For cfa_base_rtx return MO_CLOBBER.
13607         (adjust_sets): Remove.
13608         (add_uses): Don't add extra MO_VAL_USE for cfa_base_rtx plus constant.
13609         Use get_address_mode.
13610         (get_adjusted_src): Remove.
13611         (add_stores): Don't call it.  Never reuse expr SET.  Don't add extra
13612         MO_VAL_USE for cfa_base_rtx plus constant.  Use get_address_mode.
13613         (add_with_sets): Don't call adjust_sets.
13614         (fp_setter, vt_init_cfa_base): New functions.
13615         (vt_initialize): Change return type to bool.  Move most of pool etc.
13616         initialization to the beginning of the function from end.  Pass
13617         CSELIB_RECORD_MEMORY | CSELIB_PRESERVE_CONSTANTS to cselib_init.
13618         If !frame_pointer_needed, call vt_stack_adjustment before mos
13619         vector is filled, call vt_init_cfa_base if argp/framep has been
13620         eliminated to sp.  If frame_pointer_needed and argp/framep has
13621         been eliminated to hard frame pointer, set
13622         hard_frame_pointer_adjustment and call vt_init_cfa_base after
13623         encountering fp setter in the prologue.  For MO_ADJUST, call
13624         log_op_type before pusing the op into mos vector, not afterwards.
13625         Call adjust_insn before cselib_process_insn/add_with_sets,
13626         call cancel_changes (0) afterwards.
13627         (variable_tracking_main_1): Adjust for vt_initialize calling
13628         vt_stack_adjustments and returning whether it succeeded or not.
13630 2010-03-15  Aldy Hernandez  <aldyh@redhat.com>
13632         * graphite-sese-to-poly.c (rewrite_cross_bb_scalar_deps): Skip
13633         debug statements.
13635 2010-03-15  Jakub Jelinek  <jakub@redhat.com>
13637         * dwarf2out.c (dwarf2out_frame_debug): Don't assert drap_reg
13638         has been set.
13639         (based_loc_descr): Use DW_OP_fbreg for vdrap_reg even when
13640         drap_reg has not been set.
13642 2010-03-15  Michael Matz  <matz@suse.de>
13644         PR middle-end/43300
13645         * tree-outof-ssa.c (emit_partition_copy): New argument sizeexp,
13646         use it to expand block copies.
13647         (insert_partition_copy_on_edge, insert_rtx_to_part_on_edge,
13648         insert_part_to_rtx_on_edge): Adjust callers of emit_partition_copy.
13649         (insert_value_copy_on_edge): Use store_expr for BLKmode values.
13651 2010-03-15  Richard Guenther  <rguenther@suse.de>
13653         PR tree-optimization/43367
13654         * tree-cfg.c (gimple_can_merge_blocks_p): Simplify PHI
13655         elimination check.
13657 2010-03-15  Richard Guenther  <rguenther@suse.de>
13659         PR tree-optimization/43317
13660         * ipa-struct-reorg.c (create_new_general_access): Update stmt.
13662 2010-03-15  Martin Jambor  <mjambor@suse.cz>
13664         PR tree-optimization/43141
13665         * tree-sra.c (create_abstract_origin): New function.
13666         (modify_function): Call create_abstract_origin.
13668 2010-03-15  Chris Demetriou  <cgd@google.com>
13670         * Makefile.in (stmp-int-hdrs): Don't chmod include/stdint.h if it
13671         wasn't copied.
13673 2010-03-13  Sebastian Pop  <sebastian.pop@amd.com>
13675         PR middle-end/43354
13676         * graphite-sese-to-poly.c (rewrite_close_phi_out_of_ssa): Do not
13677         call insert_out_of_ssa_copy for default definitions.
13679 2010-03-13  Sebastian Pop  <sebastian.pop@amd.com>
13681         * graphite-clast-to-gimple.c (my_long_long): Defined.
13682         (gcc_type_for_cloog_iv): Use it instead of long_long_integer_type_node.
13683         * graphite-sese-to-poly.c (my_long_long): Defined.
13684         (scop_ivs_can_be_represented): Use it.
13686 2010-03-13  Sebastian Pop  <sebastian.pop@amd.com>
13688         * doc/invoke.texi: Fix documentation of graphite-max-nb-scop-params,
13689         graphite-max-bbs-per-function, and loop-block-tile-size.
13690         * params.def (PARAM_GRAPHITE_MAX_NB_SCOP_PARAMS): Replace "maximal"
13691         with "maximum".
13692         (PARAM_GRAPHITE_MAX_BBS_PER_FUNCTION): Same.
13694 2010-03-13  Sebastian Pop  <sebastian.pop@amd.com>
13696         * graphite-clast-to-gimple.c (gcc_type_for_iv_of_clast_loop): Remove
13697         forward declaration.
13698         * graphite-sese-to-poly.c (reduction_phi_p): Remove FIXME comment.
13699         (add_upper_bounds_from_estimated_nit): New.
13700         (build_loop_iteration_domains): Use it.
13702 2010-03-13  Sebastian Pop  <sebastian.pop@amd.com>
13704         * doc/invoke.texi (PARAM_LOOP_BLOCK_TILE_SIZE): Document.
13706 2010-03-13  Sebastian Pop  <sebastian.pop@amd.com>
13708         PR middle-end/43306
13709         * tree-chrec.c (evolution_function_right_is_integer_cst): CHREC_RIGHT
13710         should be an INTEGER_CST.  Also handle CASE_CONVERT.
13712 2010-03-13  Sebastian Pop  <sebastian.pop@amd.com>
13714         * graphite.c (graphite_initialize): To bound the number of bbs per
13715         function, use PARAM_GRAPHITE_MAX_BBS_PER_FUNCTION.
13716         * params.def (PARAM_GRAPHITE_MAX_BBS_PER_FUNCTION): Declared.
13717         * doc/invoke.texi: Document it.
13719 2010-03-13  Sebastian Pop  <sebastian.pop@amd.com>
13721         * graphite-sese-to-poly.c (build_poly_scop): Do not return bool.
13722         * graphite-sese-to-poly.h (build_poly_scop): Same.
13724 2010-03-13  Sebastian Pop  <sebastian.pop@amd.com>
13726         * graphite-sese-to-poly.c (build_poly_scop): Limit scops following
13727         the number of parameters in the scop.  Use as an upper bound
13728         PARAM_GRAPHITE_MAX_NB_SCOP_PARAMS.
13729         * params.def (PARAM_GRAPHITE_MAX_NB_SCOP_PARAMS): Declared.
13730         * doc/invoke.texi: Document it.
13732 2010-03-13  Jerry Quinn  <jlquinn@optonline.net>
13734         * Makefile.in (TEXI_GCCINT_FILES): Remove c-tree.texi.
13735         * doc/c-tree.texi: Remove.
13736         * doc/generic.texi: Merge c-tree.texi here.
13737         * doc/gccint.texi (Trees): Remove menu entry.
13738         (c-tree.texi): Remove @include.
13739         * doc/rtl.texi (Reading RTL): Update pxref from Trees to GENERIC.
13740         * doc/languages.texi (Reading RTL): Ditto.
13742 2010-03-12  Steve Ellcey  <sje@cup.hp.com>
13744         PR target/42869
13745         * config/ia64/sync.md (sync_compare_and_swap): Move memory fence.
13747 2010-03-12  Michael Meissner  <meissner@linux.vnet.ibm.com>
13749         PR middle-end/42431
13750         * gcc/config/rs6000/rs6000.c (rs6000_emit_move): Delete band-aid
13751         code added to work around reload clobbering CONST insns.
13753 2010-03-12  Jakub Jelinek  <jakub@redhat.com>
13755         * cselib.c (LONG_TERM_PRESERVED_VALUE_P): Remove.
13756         (cselib_preserve_definitely, cselib_clear_preserve): Remove.
13757         (cselib_preserve_only_values): Remove retain argument, don't
13758         traverse hash table with cselib_{preserve_definitely,clear_preserve}.
13759         * cselib.h (cselib_preserve_only_values): Remove retain argument.
13760         * var-tracking.c (micro_operation): Move insn field before union.
13761         Add DEF_VEC_O and DEF_VEC_ALLOC_O for this type.
13762         (struct variable_tracking_info_def): Remove n_mos field, change
13763         mos into a vector of micro_operations.
13764         (count_uses, count_uses_1, count_stores, count_with_sets): Remove.
13765         (bb_stack_adjust_offset, log_op_type, add_uses, add_stores,
13766         compute_bb_dataflow, emit_notes_in_bb): Adjust for VTI (bb)->mos
13767         changing into a vector.
13768         (add_with_sets): Likewise.  Ensure MO_VAL_USE uops from add_stores
13769         come before all other uops generated by add_stores.
13770         (vt_add_function_parameters): Adjust for cselib_preserve_only_values
13771         argument removal.
13772         (vt_initialize): Likewise.  Adjust for VTI (bb)->mos changing into
13773         a vector.  Run just one pass over the bbs instead of separate counting
13774         and computation phase.
13775         (vt_finalize): Free VTI (bb)->mos vector instead of array.
13777         PR debug/43329
13778         * tree-inline.c (remap_decls): Put old_var rather than origin_var
13779         into *nonlocalized_list vector.
13780         * dwarf2out.c (gen_formal_parameter_die): Call decl_ultimate_origin
13781         even if origin is non-NULL.
13782         (gen_variable_die): Likewise.
13783         (process_scope_var): Don't change origin.
13784         (gen_decl_die): Likewise.
13785         * tree-cfgcleanup.c (remove_forwarder_block): Check single_pred_p
13786         before adding new edges instead of after it, fix moving over
13787         debug stmts.
13789 2010-03-11  David S. Miller  <davem@davemloft.net>
13791         * configure.ac (gcc_cv_as_cfi_advance_working): Skip a multiple
13792         of four.
13793         * configure: Rebuild.
13795 2010-03-11  Martin Jambor  <mjambor@suse.cz>
13797         PR tree-optimization/43257
13798         * tree.c (assign_assembler_name_if_neeeded): New function.
13799         (free_lang_data_in_cgraph): Assembler name assignment moved to the
13800         above new function.
13801         * tree.h (assign_assembler_name_if_neeeded): Declare.
13802         * cgraphunit.c (cgraph_analyze_function): Create an assembler name for
13803         the function if needed.
13805 2010-03-11  Chris Demetriou  <cgd@google.com>
13807         * Makefile.in (stmp-int-hdrs): Make include/unwind.h,
13808         include/stdint-gcc.h, and include/stdint.h world-readable.
13810 2010-03-11  Richard Guenther  <rguenther@suse.de>
13812         PR tree-optimization/43255
13813         * tree-vrp.c (process_assert_insertions_for): Do not insert
13814         asserts for trivial conditions.
13816 2010-03-11  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
13818         PR tree-optimization/43280
13819         * tree-ssa-math-opts.c (find_bswap_1): Modify symbolic number
13820         generation.  Move calculation of size out of the if branch.
13821         (find_bswap): Modify compare number generation.
13823 2010-03-11  Richard Guenther  <rguenther@suse.de>
13825         PR lto/43200
13826         * lto-streamer-in.c (maybe_fixup_decls): Simplify.
13827         (input_gimple_stmt): Fixup handled component types during
13828         operand read.  Also fix up decls in ADDR_EXPRs.
13830 2010-03-10  Eric Botcazou  <ebotcazou@adacore.com>
13832         * config/sparc/sol2-bi.h (CC1_SPEC): Default to -mcpu=v9 for -m32.
13833         * config/sparc/t-sol2-64 (MULTILIB_DIRNAMES): Use sparcv8plus.
13835 2010-03-10  Jan Hubicka  <jh@suse.cz>
13837         PR c/43288
13838         * ipa.c (function_and_variable_visibility) Normalize COMMON bits.
13839         * varasm.c (get_variable_section): Don't do that here...
13840         (make_decl_rtl): ... and here.
13841         (do_assemble_alias): Produce decl RTL.
13842         (assemble_alias): Likewise.
13844 2010-03-10  Jakub Jelinek  <jakub@redhat.com>
13846         PR debug/43290
13847         * reg-notes.def (REG_CFA_SET_VDRAP): New note.
13848         * dwarf2out.c (dwarf2out_frame_debug_expr): Remove rule 20 - setting
13849         of fde->vdrap_reg.
13850         (dwarf2out_frame_debug): Handle REG_CFA_SET_VDRAP note.
13851         (based_loc_descr): Only express drap or vdrap regno based expressions
13852         using DW_OP_fbreg when not optimizing.
13853         * config/i386/i386.c (ix86_get_drap_rtx): When not optimizing,
13854         make the vDRAP = DRAP assignment RTX_FRAME_RELATED_P and add
13855         REG_CFA_SET_VDRAP note.
13857 2010-03-10  Alexander Monakov  <amonakov@ispras.ru>
13859         PR tree-optimization/43236
13860         * tree-loop-distribution.c (generate_memset_zero): Fix off-by-one
13861         error in calculation of base address in reverse iteration case.
13862         (generate_builtin): Take number of latch executions if the statement
13863         is in the latch.
13865 2010-03-10  Andrey Belevantsev  <abel@ispras.ru>
13867         PR middle-end/42859
13868         * tree-eh.c: Include pointer-set.h.
13869         (lower_eh_dispatch): Filter out duplicate case labels and
13870         remove the unneeded edge when the label is unused.  Return
13871         true when some edges are removed.
13872         (execute_lower_eh_dispatch): When any lowering resulted in
13873         removing an edge, also delete unreachable blocks.
13875 2010-03-10  Jakub Jelinek  <jakub@redhat.com>
13877         PR bootstrap/43287
13878         * config/rs6000/rs6000.c (rs6000_delegitimize_address): Handle
13879         UNSPEC_MACHOPIC_OFFSET.
13881 2010-03-09  Andreas Schwab  <schwab@linux-m68k.org>
13883         PR target/43294
13884         * config/m68k/m68k.c (TARGET_DELEGITIMIZE_ADDRESS): Define.
13885         (m68k_delegitimize_address): New function.
13887 2010-03-09  Jakub Jelinek  <jakub@redhat.com>
13889         PR debug/43299
13890         * dwarf2out.c (const_ok_for_output_1): Return 1 for UNSPECs.
13892         PR debug/43299
13893         * var-tracking.c (adjust_sets): New function.
13894         (count_with_sets, add_with_sets): Use it.
13895         (get_adjusted_src): New inline function.
13896         (add_stores): Use it.
13898         PR debug/43304
13899         * var-tracking.c (vt_expand_loc_callback) <case SUBREG>: If dummy,
13900         call cselib_dummy_expand_value_rtx_cb instead of
13901         cselib_expand_value_rtx_cb.
13903         PR debug/43293
13904         * config/i386/t-i386 (i386.o): Depend on debug.h and dwarf2out.h.
13905         * config/i386/i386.c: Include debug.h and dwarf2out.h.
13906         (ix86_file_end): If dwarf2out_do_cfi_asm (), emit .cfi_startproc
13907         and .cfi_endproc around the pic thunks.
13908         (output_set_got): For TARGET_DEEP_BRANCH_PREDICTION pic, ensure
13909         all queued unwind info register saves are saved before the call.
13910         For !TARGET_DEEP_BRANCH_PREDICTION pic, ensure the call is
13911         considered as sp-=4 for unwind info and the pop as sp+=4 which
13912         also clobbers dest, but doesn't actually restore it.
13914         PR debug/43290
13915         * config/i386/i386.c (ix86_get_drap_rtx): Don't set
13916         RTX_FRAME_RELATED_P.
13918 2010-03-09  Jie Zhang  <jie@codesourcery.com>
13920         * config/arm/arm.md (thumb_mulsi3_v6): Remove trailing
13921         whitespaces in output template.
13923 2010-03-09  Jie Zhang  <jie@codesourcery.com>
13925         * ira-lives.c (check_and_make_def_use_conflict): Don't fall
13926         out array boundary.
13928 2010-03-08  Jakub Jelinek  <jakub@redhat.com>
13930         * Makefile.in (check_gcc_parallelize): Run dg-torture.exp and
13931         builtins.exp in a separate job.
13933 2010-03-08  Sebastian Pop  <sebastian.pop@amd.com>
13935         * graphite-sese-to-poly.c (add_param_constraints): Use
13936         lower_bound_in_type and upper_bound_in_type.
13938 2010-03-08  Sebastian Pop  <sebastian.pop@amd.com>
13940         * graphite-sese-to-poly.c (add_param_constraints): Use sizetype
13941         instead of unsigned_type_node.
13943 2010-03-08  Sebastian Pop  <sebastian.pop@amd.com>
13944             Reza Yazdani  <reza.yazdani@amd.com>
13946         PR middle-end/43065
13947         * graphite-sese-to-poly.c (add_param_constraints): Insert bounds
13948         on pointer type parameters.
13950 2010-03-08  Tobias Grosser  <grosser@fim.uni-passau.de>
13952         PR middle-end/42644
13953         PR middle-end/42130
13954         * graphite-clast-to-gimple.c (clast_to_gcc_expression): Also
13955         handle conversions from pointer to integers.
13956         (gcc_type_for_cloog_iv): Choose the smalles signed integer as an
13957         induction variable, to be able to work with code generated by CLooG.
13958         * graphite-sese-to-poly.c (scop_ivs_can_be_represented): New.
13959         (build_poly_scop): Bail out if we cannot codegen a loop.
13961 2010-03-08  Tobias Grosser  <grosser@fim.uni-passau.de>
13963         * graphite-clast-to-gimple.c (translate_clast): Do not short-cut
13964         code generation with gloog_error.
13966 2010-03-08  Sebastian Pop  <sebastian.pop@amd.com>
13968         * sese.c (expand_scalar_variables_ssa_name): Add new argument for type.
13969         Call fold_convert on all the returned values.
13970         (expand_scalar_variables_expr): Pass to
13971         expand_scalar_variables_ssa_name the type of the resulting expression.
13973 2010-03-08  Sebastian Pop  <sebastian.pop@amd.com>
13975         * graphite-ppl.c (ppl_min_for_le_polyhedron): Renamed
13976         ppl_min_for_le_pointset.
13977         Use ppl_Pointset_Powerset_C_Polyhedron_minimize.
13978         * graphite-ppl.h (ppl_min_for_le_polyhedron): Update declaration.
13980 2010-03-08  Sebastian Pop  <sebastian.pop@amd.com>
13982         * graphite-dependences.c (map_into_dep_poly): Removed.
13983         (dependence_polyhedron_1): Use combine_context_id_scat.
13985 2010-03-08  Sebastian Pop  <sebastian.pop@amd.com>
13987         * graphite-poly.h (struct poly_scattering): Add layout documentation.
13988         (struct poly_bb): Same.
13989         (combine_context_id_scat): New.
13991 2010-03-08  Sebastian Pop  <sebastian.pop@amd.com>
13993         PR middle-end/42326
13994         * sese.c (name_defined_in_loop_p): Return false for default
13995         definitions.
13997 2010-03-08  Sebastian Pop  <sebastian.pop@amd.com>
13999         * graphite-clast-to-gimple.c (find_cloog_iv_in_expr): Simplify
14000         and clean up the logic.
14002 2010-03-08  Sebastian Pop  <sebastian.pop@amd.com>
14004         * graphite-sese-to-poly.c (add_param_constraints): Enabled: remove
14005         early return.
14007 2010-03-08  Jakub Jelinek  <jakub@redhat.com>
14009         * var-tracking.c (remove_cselib_value_chains): Define only for
14010         ENABLE_CHECKING.
14011         (dataflow_set_preserve_mem_locs, dataflow_set_remove_mem_locs,
14012         delete_slot_part, emit_notes_for_differences_1): Don't call
14013         remove_cselib_value_chains here.
14014         (set_slot_part, emit_notes_for_differences_2): Don't call
14015         add_cselib_value_chains here.
14016         (preserved_values): New vector.
14017         (preserve_value): New function.
14018         (add_uses, add_stores, vt_add_function_parameters): Use it
14019         instead of cselib_preserve_value.
14020         (changed_values_stack): New vector.
14021         (check_changed_vars_0): New function.
14022         (check_changed_vars_1, check_changed_vars_2): Use it.
14023         (emit_notes_for_changes): Call set_dv_changed (*, false) on all
14024         changed_values_stack VALUEs.
14025         (vt_emit_notes): For all preserved_values call
14026         add_cselib_value_chains.  If ENABLE_CHECKING call
14027         remove_cselib_value_chains before verifying value_chains is empty.
14028         Initialize and free changed_values_stack.
14029         (vt_initialize): Initialize preserved_values.
14030         (vt_finalize): Free preserved_values.
14032 2010-03-08  Richard Guenther  <rguenther@suse.de>
14034         PR tree-optimization/43269
14035         * tree-ssa-dse.c (dse_possible_dead_store_p): Fix post-dom
14036         region detection.
14038 2010-03-08  Martin Jambor  <mjambor@suse.cz>
14040         * ipa-prop.h (struct ipa_param_descriptor): Removed the called field.
14041         (ipa_is_param_called): Removed.
14042         * ipa-prop.c (ipa_note_param_call): Do not set the called flag.
14043         (ipa_print_node_params): Do not print the called flag.
14044         (ipa_write_node_info): Do not stream the called flag.
14045         (ipa_read_node_info): Likewise.
14047 2010-03-07  Jakub Jelinek  <jakub@redhat.com>
14049         PR debug/43176
14050         * Makefile.in (var-tracking.o): Depend on pointer-set.h.
14051         * cselib.c (struct expand_value_data): Add dummy field.
14052         (cselib_expand_value_rtx, cselib_expand_value_rtx_cb): Initialize
14053         dummy to false.
14054         (cselib_dummy_expand_value_rtx_cb): New function.
14055         (cselib_expand_value_rtx_1): If evd->dummy is true, don't allocate
14056         any rtl.
14057         * cselib.h (cselib_dummy_expand_value_rtx_cb): New prototype.
14058         * var-tracking.c: Include pointer-set.h.
14059         (variable): Change n_var_parts to char from int.  Add
14060         cur_loc_changed and in_changed_variables fields.
14061         (variable_canonicalize): Remove.
14062         (shared_var_p): New inline function.
14063         (unshare_variable): Maintain cur_loc_changed and
14064         in_changed_variables fields.  If var was in changed_variables,
14065         replace it there with new_var.  Just copy cur_loc instead of
14066         resetting it to something else.
14067         (variable_union): Don't recompute cur_loc.  Use shared_var_p.
14068         (dataflow_set_union): Don't call variable_canonicalize.
14069         (loc_cmp): If both x and y are DEBUG_EXPRs, compare uids
14070         of their DEBUG_EXPR_TREE_DECLs.
14071         (canonicalize_loc_order_check): Verify that cur_loc is NULL
14072         and in_changed_variables and cur_loc_changed is false.
14073         (variable_merge_over_cur): Clear cur_loc, in_changed_variables
14074         and cur_loc_changed.  Don't update cur_loc here.
14075         (variable_merge_over_src): Don't call variable_canonicalize.
14076         (dataflow_set_preserve_mem_locs): Use shared_var_p.  When
14077         removing loc that is equal to cur_loc, clear cur_loc,
14078         set cur_loc_changed and ensure variable_was_changed is called.
14079         (dataflow_set_remove_mem_locs): Use shared_var_p.  Only
14080         compare pointers in cur_loc check, if it is equal to loc,
14081         clear cur_loc and set cur_loc_changed.  Don't recompute cur_loc here.
14082         (variable_different_p): Remove compare_current_location argument,
14083         don't compare cur_loc.
14084         (dataflow_set_different_1): Adjust variable_different_p caller.
14085         (variable_was_changed): If dv had some var in changed_variables
14086         already, reset in_changed_variables flag for it and propagate
14087         cur_loc_changed over to the new variable.  On empty var
14088         always set cur_loc_changed.  Set in_changed_variables on whatever
14089         var is added to changed_variables.
14090         (set_slot_part): Clear cur_loc_changed and in_changed_variables.
14091         Use shared_var_p.  When removing loc that is equal to cur_loc,
14092         clear cur_loc and set cur_loc_changed.  If cur_loc is NULL at the
14093         end, don't set it to something else, just call variable_was_changed.
14094         (delete_slot_part): Use shared_var_p.  When cur_loc equals to
14095         loc being removed, clear cur_loc and set cur_loc_changed.
14096         Set cur_loc_changed if all locations have been removed.
14097         (struct expand_loc_callback_data): New type.
14098         (vt_expand_loc_callback): Add dummy mode in which no rtxes are
14099         allocated.  Always create SUBREGs if simplify_subreg failed.
14100         Prefer to use cur_loc, when that fails and still in
14101         changed_variables (and seen first time) recompute it.  Set
14102         cur_loc_changed of variables which had to change cur_loc and
14103         compute elcd->cur_loc_changed if any of the subexpressions used
14104         had to change cur_loc.
14105         (vt_expand_loc): Adjust to pass arguments in
14106         expand_loc_callback_data structure.
14107         (vt_expand_loc_dummy): New function.
14108         (emitted_notes): New variable.
14109         (emit_note_insn_var_location): For VALUEs and DEBUG_EXPR_DECLs
14110         that weren't used for any other decl in current
14111         emit_notes_for_changes call call vt_expand_loc_dummy to update
14112         cur_loc.  For -fno-var-tracking-assignments, set cur_loc to
14113         first loc_chain location if NULL before.  Always use just
14114         cur_loc instead of first loc_chain location.  When cur_loc_changed
14115         is false, when not --enable-checking=rtl just don't emit any note.
14116         When rtl checking, compute the note and assert it is the same
14117         as previous note.  Clear cur_loc_changed and in_changed_variables
14118         at the end before removing from changed_variables.
14119         (check_changed_vars_3): New function.
14120         (emit_notes_for_changes): Traverse changed_vars to call
14121         check_changed_vars_3 on each changed var.
14122         (emit_notes_for_differences_1): Clear cur_loc_changed and
14123         in_changed_variables.  Recompute cur_loc of new_var.
14124         (emit_notes_for_differences_2): Clear cur_loc if new variable appears.
14125         (vt_emit_notes): Initialize and destroy emitted_notes.
14127 2010-03-07  Bernd Schmidt  <bernd.schmidt@analog.com>
14129         PR rtl-optimization/42220
14130         * regrename.c (scan_rtx) <case STRICT_LOW_PART, ZERO_EXTRACT>:
14131         Use verify_reg_tracked to determine if we should use OP_OUT rather
14132         than OP_INOUT.
14133         (build_def_use): If we see an in-out operand for a register that we
14134         know nothing about, treat is an output if possible, fail the block if
14135         not.
14137 2010-03-06  Alexandre Oliva  <aoliva@redhat.com>
14139         PR debug/42897
14140         * gimple-iterator.c (gsi_remove): Propagate only PHI DEFs removed
14141         permanently.
14143 2010-03-06  Alexandre Oliva  <aoliva@redhat.com>
14145         PR debug/42897
14146         * tree-vect-loop.c (vect_transform_loop): Kill out-of-loop debug
14147         uses of relevant DEFs that are dead outside the loop too.
14149 2010-03-06  Alexandre Oliva <aoliva@redhat.com>
14151         * var-tracking.c (dataflow_set_merge): Swap src and src2.
14152         Reverted:
14153         2010-01-13  Jakub Jelinek  <jakub@redhat.com>
14154         PR debug/41371
14155         * var-tracking.c (values_to_unmark): New variable.
14156         (find_loc_in_1pdv): Clear VALUE_RECURSED_INTO of values in
14157         values_to_unmark vector.  Moved body to...
14158         (find_loc_in_1pdv_1): ... this.  Don't clear VALUE_RECURSED_INTO,
14159         instead queue it into values_to_unmark vector.
14160         (vt_find_locations): Free values_to_unmark vector.
14162 2010-03-05  Eric Botcazou  <ebotcazou@adacore.com>
14164         * Makefile.in (PLUGINCC, PLUGINCFLAGS): New variables.
14165         (site.exp): Export them when plugins are enabled.
14167 2010-03-05  Sebastian Pop  <sebastian.pop@amd.com>
14169         PR middle-end/42326
14170         * tree-chrec.c (chrec_fold_plus_1): Do not handle convert expressions
14171         that contain scevs.
14172         (chrec_fold_multiply): Same.
14174 2010-03-04  Andrew Pinski  <andrew_pinski@caviumnetworks.com>
14176         PR c/43248
14177         * c-decl.c (build_compound_literal): Return early if init is
14178         an error_mark_node.
14180 2010-03-04  Martin Jambor  <mjambor@suse.cz>
14182         PR tree-optimization/43164
14183         PR tree-optimization/43191
14184         * tree-sra.c (type_consists_of_records_p): Reject records with
14185         zero-size bit-fields at the end.
14187 2010-03-04  Mike Stump  <mikestump@comcast.net>
14189         * Makefile.in (TAGS): Remove *.y.
14191 2010-03-04  Richard Guenther  <rguenther@suse.de>
14193         PR tree-optimization/40761
14194         * tree-ssa-pre.c (compute_antic): Walk reverse postorder
14195         in reverse order.
14196         (my_rev_post_order_compute): New function.
14197         (init_pre): Call it.
14199 2010-03-04  Changpeng Fang  <changpeng.fang@amd.com>
14201         PR middle-end/43209
14202         * tree-ssa-loop-ivopts.c (determine_use_iv_cost_condition): Do not
14203         decrease the cost of an IV candidate when the cost is infinite.
14205 2010-03-04  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
14207         * doc/extend.texi (Vector Extensions, X86 Built-in Functions):
14208         Use '3DNow!' for the extension of that name, ensure normal space
14209         after the string.
14210         * doc/invoke.texi (i386 and x86-64 Options): Likewise.
14212 2010-03-03  Jeff Law  <law@redhat.com>
14214         * PR middle-end/32693
14215         * expmed.c (store_bit_field_1): Use gen_lowpart_SUBREG rather
14216         than gen_rtx_SUBREG.
14217         (extract_bit_field_1): Likewise.
14219 2010-03-03  Janis Johnson  <janis187@us.ibm.com>
14221         * doc/sourcebuild.texi (Test directives): Document that arguments
14222         include-opts and exclude-opts are now optional for dg-skip-if,
14223         dg-xfail-if, dg-xfail-run-if, and dg-shouldfail.
14225 2010-03-03  Jason Merrill  <jason@redhat.com>
14227         PR c++/12909
14228         * cgraph.h (varpool_node): Add extra_name field.
14229         * varpool.c (varpool_extra_name_alias): New.
14230         (varpool_assemble_decl): Emit extra name aliases.
14231         (varpool_mark_needed_node): Look past an extra name alias.
14232         * lto-streamer.h (LTO_tags): Add LTO_var_decl_alias.
14233         * lto-streamer-in.c (lto_input_tree): Read it.
14234         * lto-streamer-out.c (output_unreferenced_globals): Write it.
14236 2010-03-03  Eric Botcazou  <ebotcazou@adacore.com>
14238         * config.gcc (sparc64-*-solaris2*, sparc-*-solaris2*): Merge into...
14239         (sparc*-*-solaris2*): ...this.
14241 2010-03-03  Jakub Jelinek  <jakub@redhat.com>
14243         PR debug/43229
14244         * cfgexpand.c (expand_debug_expr): Handle DOT_PROD_EXPR,
14245         WIDEN_MULT_EXPR and WIDEN_SUM_EXPR.  Return NULL without
14246         ICE for vector expressions, ADDR_SPACE_CONVERT_EXPR,
14247         FIXED_CONVERT_EXPR, OBJ_TYPE_REF and WITH_SIZE_EXPR.
14249         PR debug/43237
14250         * dwarf2out.c (add_bound_info): If a decl bound doesn't have decl_die,
14251         fallthrough to default handling, just with want_address 0 instead of 2.
14252         For single element lists, add_AT_loc directly, otherwise create an
14253         artificial variable DIE and stick location list to it.
14255         PR debug/43177
14256         * var-tracking.c (loc_cmp): Don't assert VALUEs have the same mode.
14257         (VAL_EXPR_HAS_REVERSE): Define.
14258         (reverse_op): New function.
14259         (add_stores): For reversible operations add an extra MO_VAL_USE.
14261 2010-03-02  Jason Merrill  <jason@redhat.com>
14263         * c-pretty-print.c (pp_c_specifier_qualifier_list): Print vector size.
14265 2010-03-02  Eric Botcazou  <ebotcazou@adacore.com>
14267         * config.gcc (sparc-*-linux*): Do not include sparc/gas.h.
14268         (sparc64-*-linux*): Likewise.
14269         (sparc64-*-solaris2*): Include assembler files before linker ones.
14270         (sparc-*-solaris2*): Simplify and reorder to match previous case.
14271         * config/sparc/gas.h: Delete.
14272         * config/sparc/sol2-64.h: Add copyright notice.
14273         * config/sparc/sol2-gas-bi.h: Likewise.
14274         * config/sparc/sol2-gld.h: Likewise.
14275         * config/sparc/sysv4.h (TARGET_ASM_NAMED_SECTION): Delete.
14276         * config/sparc/sol2.h (TARGET_ASM_NAMED_SECTION): Redefine.
14277         * config/sparc/sol2-gas.h (TARGET_ASM_NAMED_SECTION): Likewise.
14278         * config/sparc/sparc.c (TARGET_ASM_ALIGNED_SI_OP): Never redefine.
14279         (sparc_elf_asm_named_section): Rename into...
14280         (sparc_solaris_elf_asm_named_section): ...this.  Always define.
14282 2010-03-02  Uros Bizjak  <ubizjak@gmail.com>
14284         * config/alpha/alpha.c (override_options): Fix -mtune error message.
14286 2010-03-02  Jeff Law  <law@redhat.com>
14288         PR middle-end/42431
14289         * reload1.c (rtx_p, substitute_stack): Declare.
14290         (substitute): Record addresses of changed rtxs.
14291         (gen_reload_chain_without_interm_reg_p): Don't use copy_rtx anymore.
14292         Restore the original rtx when complete.
14293         (reload): Free subsitute_stack when complete.
14295 2010-03-02  Janis Johnson  <janis187@us.ibm.com>
14297         * doc/gccint.texi (menu): Add Testsuites as a chapter.
14298         * doc/sourcebuild.texi (Testsuites): Move up a level to be a
14299         new chapter.
14300         (Test Idioms, Test Directives, Ada Tests, C Tests, libgcj Tests,
14301         LTO Testing, gcov Testing, profopt Testing, compat Testing,
14302         Torture Tests): Change from subsection to section.
14304 2010-03-02  Jakub Jelinek  <jakub@redhat.com>
14305             Steven Bosscher  <steven@gcc.gnu.org>
14307         * var-tracking.c (vt_initialize): Scan insns in ebb chunks
14308         instead of bb.
14310 2010-03-02  Reza Yazdani  <reza.yazdani@amd.com>
14312         PR middle-end/42640
14313         * tree-loop-distribution.c (update_phis_for_loop_copy): Replaced
14314         the assignment from the new induction variable to the assignment
14315         of the value from the original loop PHI function.
14317 2010-03-01  Janis Johnson  <janis187@us.ibm.com>
14318             Daniel Jacobowitz  <dan@codesourcery.com>
14320         * doc/sourcebuild.texi (Test directives): Clarify options to
14321         dg-skip-if.
14323 2010-03-01  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
14325         * configure.ac (gcc_cv_as_cfi_directive) [i?86-*-solaris*]:
14326         Disable cfi directives unless GCC and gas agree on using read-only
14327         .eh_frame sections for 64-bit.
14328         * configure: Regenerate.
14330 2010-03-01  Richard Guenther  <rguenther@suse.de>
14332         PR tree-optimization/43220
14333         * tree-ssa-ccp.c (optimize_stack_restore): Do not optimize
14334         BUILT_IN_STACK_{SAVE,RESTORE} around alloca.
14336 2010-03-01  Richard Guenther  <rguenther@suse.de>
14337             Martin Jambor  <mjambor@suse.cz>
14339         PR middle-end/41250
14340         * gimplify.c (gimplify_body): Unset DECL_HAS_VALUE_EXPR_P on
14341         gimplified parameters.
14343 2010-03-01  Christian Bruel  <christian.bruel@st.com>
14345         * except.c (dw2_build_landing_pads): set LABEL_PRESERVE_P.
14347 2010-03-01  H.J. Lu  <hongjiu.lu@intel.com>
14349         * config/i386/linux64.h (ASM_SPEC): Use SPEC_32 and SPEC_64.
14351 2010-03-01  Richard Guenther  <rguenther@suse.de>
14353         PR middle-end/43213
14354         * expr.c (expand_assignment): Use the alias-oracle to tell
14355         if the rhs aliases the result decl.
14357 2010-03-01  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
14359         PR pch/14940
14360         * config/host-solaris.c (HOST_HOOKS_GT_PCH_GET_ADDRESS): Redefine
14361         to sol_gt_pch_get_address.
14362         (TRY_EMPTY_VM_SPACE): Define for all combinations of 32 and
14363         64-bit, SPARC and x86.
14364         (sol_gt_pch_get_address): New function.
14366 2010-03-01  Marco Poletti  <poletti.marco@gmail.com>
14368         * toplev.h (inform_n, error_n): Declare.
14369         * diagnostic.c (inform_n, error_n): New function.
14371 2010-03-01  Jakub Jelinek  <jakub@redhat.com>
14373         * cfgexpand.c (expand_used_vars): If an artificial non-ignored var
14374         has no rtl yet when processing local_decls, queue it and recheck
14375         if deferred stack allocation hasn't assigned it rtl.
14377 2010-02-28  Kaz Kojima  <kkojima@gcc.gnu.org>
14379         * config/sh/sh.c (unspec_bbr_uid): New.
14380         (gen_block_redirect): Use it instead of INSN_UID.
14381         (gen_far_branch): Likewise.
14383 2010-02-28  H.J. Lu  <hongjiu.lu@intel.com>
14385         * config/i386/darwin.h (TARGET_SUBTARGET32_ISA_DEFAULT): Make
14386         it the same as TARGET_SUBTARGET64_ISA_DEFAULT.
14388 2010-02-28  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
14390         * doc/invoke.texi (Warning Options, RX Options): Fix typos.
14391         (Warning Options): -Wno-conversion-null is valid for
14392         Objective-C++ as well.
14393         * doc/tm.texi (Named Address Spaces): Likewise.
14394         * doc/plugins.texi (Plugins): Replace TABs with spaces.
14395         * doc/tree-ssa.texi (Tree SSA): Likewise.
14397 2010-02-27  H.J. Lu  <hongjiu.lu@intel.com>
14399         PR bootstrap/43202
14400         * config.gcc: Don't enable SSE math for i[34567]86-*-darwin*
14401         by default.  Don't set the default arch for
14402         i[34567]86-*-darwin*|x86_64-*-darwin*.
14404 2010-02-27  H.J. Lu  <hongjiu.lu@intel.com>
14406         PR bootstrap/43202
14407         * config.gcc: Enable SSE math for i[34567]86-*-darwin* by
14408         default.  Set the default 32bit/64bit archs with $with_arch
14409         instead of $arch for i[34567]86-*-*|x86_64-*-* targets.
14411 2010-02-27  Richard Guenther  <rguenther@suse.de>
14413         PR tree-optimization/43186
14414         * params.def (PARAM_MAX_UNROLL_ITERATIONS): New param.
14415         * doc/invoke.texi (max-completely-peel-loop-nest-depth): Document.
14416         * tree-ssa-loop-ivcanon.c (tree_unroll_loops_completely): Limit
14417         unroller iterations.
14419 2010-02-27  H.J. Lu  <hongjiu.lu@intel.com>
14421         * config.gcc: Set the default 32bit/64bit archs if 64bit ISA is
14422         required and i[34567]86-*-* targets don't support 64bit ISA.
14424 2010-02-26  Eric Botcazou  <ebotcazou@adacore.com>
14426         PR ada/43096
14427         * tree-ssa-alias.c (same_type_for_tbaa): Return -1 if the types have
14428         the same alias set.
14430 2010-02-26  H.J. Lu  <hongjiu.lu@intel.com>
14432         * config.gcc: Set the default arch at least to Prescott for
14433         i[34567]86-*-darwin* and Pentium 4 for i[34567]86-*-* targets
14434         if SSE math is enabled.
14436 2010-02-26  Manuel López-Ibáñez  <manu@gcc.gnu.org>
14438         * diagnostic.c (diagnostic_initialize): Update.
14439         (diagnostic_report_diagnostic): Test inhibit_notes_p for
14440         informative notes.
14441         * diagnostic.h (diagnostic_context): New bool inhibit_notes_p.
14442         (diagnostic_inhibit_notes): New.
14443         * toplev.c (process_options): inhibit notes with -fcompare-debug.
14445 2010-02-26  Manuel López-Ibáñez  <manu@gcc.gnu.org>
14447         PR c/20631
14448         * doc/cpp.texi: Use c90 instead of c89 and gnu90 instead of gnu89.
14449         * doc/standards.texi: Likewise.
14450         * doc/extend.texi: Likewise.
14451         * doc/trouble.texi: Likewise.
14452         * doc/cppopts.texi: Likewise.
14453         * doc/install.texi: Likewise.
14454         * c.opt (std=c90,std=gnu90): New options.
14455         * c-opts.c (c_common_handle_option): Handle them.
14457 2010-02-26  Manuel López-Ibáñez  <manu@gcc.gnu.org>
14459         PR c/24577
14460         * c-decl.c (undeclared_variable): Use an informative note.
14462 2010-02-26  Richard Guenther  <rguenther@suse.de>
14464         PR tree-optimization/43186
14465         * gimple.h (gimple_fold): Remove.
14466         * gimple.c (gimple_fold): Remove.  Inline into single user ...
14467         * tree-cfgcleanup.c (cleanup_control_expr_graph): ... here.
14468         Try harder for conditions.
14470 2010-02-26  Jakub Jelinek  <jakub@redhat.com>
14472         PR debug/43190
14473         * function.c (used_types_insert): Don't skip through named pointer
14474         types.  Don't use TYPE_MAIN_VARIANT if the original type has a name
14475         and it is different from the main variant's type.
14477 2010-02-26  Nick Clifton  <nickc@redhat.com>
14479         * config/rx/rx.md (sminsi3): Remove bogus alternative.
14481 2010-02-26  H.J. Lu  <hongjiu.lu@intel.com>
14483         * config.gcc: Support --with-fpmath=sse for x86.
14485         * config/i386/ssemath.h: New.
14487         * doc/install.texi (--with-fpmath=sse): Documented.
14489 2010-02-26  Richard Guenther  <rguenther@suse.de>
14491         PR tree-optimization/43188
14492         * tree-vect-stmts.c (get_vectype_for_scalar_type): Do not build
14493         vector types of over-aligned element type.
14495 2010-02-26  Uros Bizjak  <ubizjak@gmail.com>
14497         PR target/43175
14498         * config/i386/i386.c (expand_vec_perm_blend): Use correct
14499         operands in V8HImode subregs.  Fix operand order in VEC_MERGE rtx.
14501 2010-02-26  Jan Kratochvil  <jan.kratochvil@redhat.com>
14503         * doc/invoke.texi (-fvar-tracking-assignments): Fix typo.
14505 2010-02-26  Jakub Jelinek  <jakub@redhat.com>
14507         * Makefile.in (var-tracking.o): Depend on $(DIAGNOSTIC_H).
14508         * var-tracking.c: Include diagnostic.h.
14509         (debug_dv): New function.
14510         (dump_var): Print DEBUG_EXPR_DECLs as D#N instead of D.-N.
14512         PR debug/43160
14513         * var-tracking.c (dv_onepart_p): Return true for DEBUG_EXPR_DECLs.
14514         (add_value_chain, add_value_chains, remove_value_chain,
14515         remove_value_chains): Handle DEBUG_EXPRs.
14516         (check_changed_vars_1, check_changed_vars_2): Handle DEBUG_EXPR_DECLs.
14518         PR debug/43161
14519         * regcprop.c (struct queued_debug_insn_change): New type.
14520         (struct value_data_entry): Add debug_insn_changes field.
14521         (struct value_data): Add n_debug_insn_changes field.
14522         (debug_insn_changes_pool): New variable.
14523         (free_debug_insn_changes, apply_debug_insn_changes,
14524         cprop_find_used_regs_1, cprop_find_used_regs): New functions.
14525         (kill_value_one_regno): Call free_debug_insn_changes if needed.
14526         (init_value_data): Clear debug_insn_changes and n_debug_insn_changes
14527         fields.
14528         (replace_oldest_value_reg): Don't change DEBUG_INSNs, instead queue
14529         changes for them.
14530         (copyprop_hardreg_forward_1): Don't call apply_change_group for
14531         DEBUG_INSNs.  For a real insn, if there are queued DEBUG_INSN
14532         changes, call cprop_find_used_regs via note_stores.
14533         (copyprop_hardreg_forward): When copying vd from predecessor
14534         which has any queued DEBUG_INSN changes, make sure the pointers are
14535         cleared.  At the end call df_analyze and then if there are any
14536         DEBUG_INSN changes queued at the end of some basic block for still
14537         live registers, apply them.
14538         (pass_cprop_hardreg): Set TODO_df_finish in todo_flags_finish.
14540 2010-02-25  Uros Bizjak  <ubizjak@gmail.com>
14542         * config.gcc (i[34567]86-*-* | x86_64-*-*): Split long line.
14543         (arm*-*-*): Ditto.
14545 2010-02-25  H.J. Lu  <hongjiu.lu@intel.com>
14547         * config.gcc: Set arch/cpu for i[34567]86-*-*|x86_64-*-*
14548         targets.  Set the default with_cpu/with_arch from arch/cpu.
14549         Allow x86-64 and native for with_cpu/with_arch.
14551 2010-02-25  Nicolas Benoit  <nbenoit@tuxfamily.org>
14553         * ebitmap.c: Change calls to verify_popcount with calls to
14554         sbitmap_verify_popcount.
14555         (ebitmap_clear_bit): Fixed map->cacheindex test and
14556         map>cache update when bit clearing results in an empty
14557         element.
14559 2010-02-25  Michael Meissner  <meissner@linux.vnet.ibm.com>
14561         PR target/43154
14562         * config/rs6000/vector.md (VEC_64): New iterator for V2DF, V2DI.
14563         (vec_interleave_high<mode>): Rename from vec_interleave_highv2df
14564         and support both V2DF and V2DI modes.
14565         (vec_interleave_low<mode>): Rename from vec_interleave_lowv2df and
14566         support both V2DF and V2DI modes.
14567         (general): Delete trailing whitespace from a few patterns.
14569         * config/rs6000/rs6000-c.c (altivec_overloaded_builtins): Add
14570         V2DF/V2DI interleave high/low builtins.
14572         * config/rs6000/rs6000-builtin.def (VSX_BUILTIN_VEC_MERGE*): Add
14573         new VSX builtins.
14575         * config/rs6000/rs6000.c (bdesc_2arg): Add support for V2DF/V2DI
14576         interleave high/low functions.
14578 2010-02-25  Gerald Pfeifer  <gerald@pfeifer.com>
14580         * doc/extend.texi (Symbol-Renaming Pragmas): Fix spelling of
14581         #pragma extern_prefix.
14583 2010-02-25  Jakub Jelinek  <jakub@redhat.com>
14585         PR debug/43166
14586         * cfgexpand.c (expand_debug_expr) <case VAR_DECL>: If mode is
14587         BLKmode, assert op0 is a MEM and just adjust its mode.
14589         PR debug/43165
14590         * cfgexpand.c (expand_debug_expr): Don't call simplify_gen_subreg
14591         if bitpos isn't multiple of mode's bitsize.
14593 2010-02-24  Manuel López-Ibáñez  <manu@gcc.gnu.org>
14595         * c.opt (-ftemplate-depth=): New.
14596         (-ftemplate-depth-): Deprecate.
14597         * optc-gen.awk: Handle -ftemplate-depth=.
14598         * opth-gen.awk: Likewise.
14599         * c-opts.c (c_common_handle_option): Likewise.
14600         * doc/invoke.texi (-ftemplate-depth-): Replace with -ftemplate-depth=.
14602 2010-02-24  Jason Merrill  <jason@redhat.com>
14604         * doc/invoke.texi: Improve -Wabi and -fabi-version docs.
14606 2010-02-24  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
14608         * cfg.c (alloc_aux_for_block): Remove inline.
14609         (alloc_aux_for_edge): Likewise.
14611 2010-02-24  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
14613         * config.gcc: Fix typo in mips-sgi-irix6.[0-4]* obsoletion.
14615 2010-02-24  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
14617         * config/i386/sol2.h (NO_DBX_BNSYM_ENSYM): Define.
14618         * config/i386/sol2-gas.h: New file.
14619         * config.gcc (i[34567]86-*-solaris2*): Use it.
14621 2010-02-24  Manuel López-Ibáñez  <manu@gcc.gnu.org>
14623         PR c/43128
14624         * c-typeck.c (ep_convert_and_check): New.
14625         (build_conditional_expr): Use it.
14626         (build_binary_op): Likewise.
14628 2010-02-24  Jakub Jelinek  <jakub@redhat.com>
14630         * regcprop.c (copyprop_hardreg_forward_1): Don't call df_insn_rescan.
14632         PR debug/43150
14633         * gimplify.c (gimplify_type_sizes): Clear DECL_IGNORED_P for VLA
14634         bounds even for -O+.
14635         * var-tracking.c (track_expr_p): If !need_rtl, don't mandate
14636         expr needs to have DECL_NAME set.
14638 2010-02-24  Nick Clifton  <nickc@redhat.com>
14640         * config/mep/mep.c: Include gimple.h.
14641         (mep_function_uses_sp): Delete unused function.
14642         (mep_gimplify_va_arg_expr): Change types of pre_p and post_p
14643         parameters.  Use unsigned integers to count args.  Return a
14644         NULL_RTX instead of an error_mark_node.  Toidy up formatting.
14646 2010-02-23  Jakub Jelinek  <jakub@redhat.com>
14648         PR target/43107
14649         * config/i386/i386.c (avx_vpermilp_parallel): Reject indexes
14650         greater or equal to nelt instead of 2 * nelt.
14651         (expand_vec_perm_1): When op0 and op1 are equal, mask indexes
14652         with nelt - 1.
14654 2010-02-23  Jason Merrill  <jason@redhat.com>
14656         PR debug/42800
14657         * cfgexpand.c (expand_used_vars): Keep artificial non-ignored vars
14658         in cfun->local_decls even if they have register types.
14660         PR c++/42837
14661         * stor-layout.c (place_field): Don't warn about unnecessary
14662         DECL_PACKED if the type is packed.
14664 2010-02-23  Jakub Jelinek  <jakub@redhat.com>
14666         PR target/43139
14667         * config/i386/i386.c (ix86_delegitimize_address): Delegitimize all
14668         GOTOFF relocs, even when the base reg isn't pic pointer.
14670 2010-02-23  Michael Matz  <matz@suse.de>
14672         PR debug/43077
14673         * cfgexpand (expand_debug_expr): Expand TERed ssa names in place.
14674         (expand_gimple_basic_block): Generate and use debug temps if there
14675         are debug uses left after the last real use of TERed ssa names.
14676         Unlink debug immediate uses when they are expanded.
14678 2010-02-23  Manuel López-Ibáñez  <manu@gcc.gnu.org>
14680         PR 43123
14681         * config/i386/i386.c (override_options): Reorganise to provide
14682         better error messages.
14684 2010-02-22  Sebastian Pop  <sebastian.pop@amd.com>
14686         PR middle-end/43083
14687         * graphite-scop-detection.c (create_single_exit_edge): Move
14688         the call to find_single_exit_edge to....
14689         (create_sese_edges): ...here.  Don't handle multiple edges
14690         exiting the function.
14691         (build_graphite_scops): Don't handle multiple edges
14692         exiting the function.
14694 2010-02-22  Sebastian Pop  <sebastian.pop@amd.com>
14696         PR middle-end/43097
14697         * sese.c (get_rename): Assert that old_name is an SSA_NAME.
14698         (rename_variables_in_stmt): Continue when the use is not an SSA_NAME.
14700 2010-02-22  Sebastian Pop  <sebastian.pop@amd.com>
14702         PR middle-end/43026
14703         * sese.c (expand_scalar_variables_expr): Handle COMPONENT_REF.
14705 2010-02-22  Manuel López-Ibáñez  <manu@gcc.gnu.org>
14707         PR c++/43126
14708         * c-typeck.c (convert_arguments): Print declaration location.
14709         * c-common.c (validate_nargs): Rename as
14710         builtin_function_validate_nargs.
14711         (check_builtin_function_arguments): Update.
14713 2010-02-22  Richard Guenther  <rguenther@suse.de>
14715         PR lto/43045
14716         * tree-inline.c (declare_return_variable): Use the type of
14717         the call stmt lhs if available.
14719 2010-02-22  Duncan Sands  <baldrick@free.fr>
14721         * passes.c (register_pass): Always consider all pass lists when
14722         ref_pass_instance_number is zero.
14724 2010-02-22  Richard Guenther  <rguenther@suse.de>
14726         PR tree-optimization/42749
14727         * tree-tailcall.c (adjust_return_value_with_ops): Drop update
14728         parameter.  Do arithmetic in the original type.
14729         (update_accumulator_with_ops): Likewise.
14730         (adjust_accumulator_values): Adjust.
14732 2010-02-22  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
14734         * config/s390/s390.md ("movqi"): Re-add the mem->mem alternative.
14735         (QI to BLKmode splitter): New splitter.
14737 2010-02-22  H.J. Lu  <hongjiu.lu@intel.com>
14739         * config/i386/i386.c (initial_ix86_tune_features): Turn on
14740         X86_TUNE_INTER_UNIT_MOVES for m_ATOM.
14742 2010-02-22  Richard Guenther  <rguenther@suse.de>
14744         * tree-vect-slp.c (vect_slp_analyze_bb): Fix typo.
14746 2010-02-22  Hans-Peter Nilsson  <hp@bitrange.com>
14748         Migrate crti, crtn, crtbegin, crtend build rules to libgcc.
14749         * config/mmix/t-mmix (EXTRA_MULTILIB_PARTS): Don't set.
14750         ($(T)crti.o, $(T)crtn.o): Remove rules.
14752 2010-02-21  Tobias Burnus  <burnus@net-b.de>
14754         PR fortran/35259
14755         * doc/invoke.texi (-fassociative-math): Document that this
14756         option is automatically enabled for Fortran.
14758 2010-02-20  David S. Miller  <davem@davemloft.net>
14760         * configure.ac: Test if linker and assembler properly support
14761         GOTDATA_OP relocations.
14762         * configure: Rebuild.
14763         * config.in: Likewise.
14764         * config/sparc/sparc.md (UNSPEC_MOVE_GOTDATA): New.
14765         (movsi_lo_sum_pic): Use %gdop_*() relocs if available.
14766         (movsi_high_pic): Likewise.
14767         (movdi_lo_sum_pic): Likewise.
14768         (movdi_high_pic): Likewise.
14769         (movsi_pic_gotdata_op): New pattern.
14770         (movdi_pic_gotdata_op): Likewise.
14771         * config/sparc/sparc.c (legitimize_pic_address): If flag_pic is 2,
14772         emit gen_mov{si,di}_pic_gotdata_op for the GOT slot load.
14774 2010-02-20  Uros Bizjak  <ubizjak@gmail.com>
14776         PR target/43067
14777         * config/i386/sse.md (xop_mulv2div2di3_low): Change type
14778         attribute to ssemul.
14779         (xop_mulv2div2di3_high): Ditto.
14781 2010-02-20  Manuel López-Ibáñez  <manu@gcc.gnu.org>
14783         PR c++/35669
14784         * c.opt (Wconversion-null): New option.
14785         * doc/invoke.texi (Wconversion-null): Document.
14787 2010-02-20  Manuel López-Ibáñez  <manu@gcc.gnu.org>
14789         * common.opt (Wlarger-than-): Add Undocumented.
14791 2010-02-19  Mike Stump  <mikestump@comcast.net>
14793         * config/t-darwin (gt-darwin.h): Remove as Makefile now handles it.
14795 2010-02-19  Jason Merrill  <jason@redhat.com>
14797         PR target/40332
14798         * configure.ac (gcc_cv_as_cfi_advance_working): Check 32-bit advance.
14799         * configure: Likewise.
14801 2010-02-20  Alan Modra  <amodra@gmail.com>
14803         PR middle-end/42344
14804         * cgraph.h (cgraph_make_decl_local): Declare.
14805         * cgraph.c (cgraph_make_decl_local): New function.
14806         (cgraph_make_node_local): Use it.
14807         * cgraphunit.c (cgraph_function_versioning): Likewise.
14808         * ipa.c (function_and_variable_visibility): Likewise.
14810 2010-02-19  Jakub Jelinek  <jakub@redhat.com>
14812         PR bootstrap/43121
14813         * except.c (sjlj_emit_function_enter): Don't call
14814         add_reg_br_prob_note, instead add REG_BR_PROB note to the last insn
14815         directly.
14816         * rtl.h (add_reg_br_prob_note): Remove prototype.
14818 2010-02-19  Manuel López-Ibáñez  <manu@gcc.gnu.org>
14820         PR 41779
14821         * c-common.c (conversion_warning): Remove widening conversions
14822         before checking the conversion of integers to reals.
14824 2010-02-19  Mike Stump  <mikestump@comcast.net>
14826         PR middle-end/43125
14827         * c-decl.c (merge_decls): Merge DECL_PRESERVE_P.
14829         PR objc/43061
14830         * cgraphunit.c (process_function_and_variable_attributes): Check
14831         DECL_PRESERVE_P instead of looking up attribute "used".
14832         * ipa-pure-const.c (check_decl): Likewise.
14833         * ipa-reference.c (has_proper_scope_for_analysis): Likewise.
14834         * ipa-type-escape.c (has_proper_scope_for_analysis): Likewise.
14835         * config/sol2.c (solaris_insert_attributes): Set DECL_PRESERVE_P
14836         instead of attribute "used".
14837         * config/sol2-c.c (solaris_pragma_init): Likewise.
14838         (solaris_pragma_fini): Likewise.
14840 2010-02-19  Jakub Jelinek  <jakub@redhat.com>
14842         * ipa-struct-reorg.c (make_field_acc_node, gen_cluster, peel_field):
14843         Use XCNEW instead of xcalloc.
14844         (add_access_to_acc_sites, create_new_var_node, add_alloc_site): Use
14845         XNEW instead of xmalloc.
14846         (get_fields): Use XNEWVEC instead of xmalloc.
14848         PR debug/43084
14849         * ipa-struct-reorg.c (add_access_to_acc_sites): For debug stmts don't
14850         populate vars array.
14851         (create_new_general_access): For debug stmts just reset value.
14852         (get_stmt_accesses): For accesses within debug stmts just record them
14853         using add_access_to_acc_sites instead of preventing the peeling or
14854         counting them as accesses.
14856         PR middle-end/42233
14857         * dojump.c (do_jump) <case TRUTH_NOT_EXPR>: Invert priority.
14859 2010-02-19  Richard Guenther  <rguenther@suse.de>
14861         PR tree-optimization/42916
14862         * tree-vect-slp.c (vect_slp_analyze_bb): Count only real
14863         instructions.
14865 2010-02-19  Andreas Schwab  <schwab@linux-m68k.org>
14867         * configure.ac: Replace all uses of changequote in macro arguments
14868         with proper quoting.
14870 2010-02-19  Jakub Jelinek  <jakub@redhat.com>
14872         PR middle-end/42233
14873         * loop-doloop.c (add_test): Adjust do_compare_rtx_and_jump caller.
14875 2010-02-19  Richard Guenther  <rguenther@suse.de>
14877         PR tree-optimization/42944
14878         * tree-ssa-alias.c (call_may_clobber_ref_p_1): Massage
14879         test for aliasing with errno.
14881 2010-02-19  Jakub Jelinek  <jakub@redhat.com>
14883         PR middle-end/42233
14884         * expr.h (jumpifnot, jumpifnot_1, jumpif, jumpif_1, do_jump,
14885         do_jump_1, do_compare_rtx_and_jump): Add PROB argument.
14886         * dojump.c: Include output.h.
14887         (inv): New inline function.
14888         (jumpifnot, jumpifnot_1, jumpif, jumpif_1, do_jump_1, do_jump,
14889         do_jump_by_parts_greater_rtx, do_jump_by_parts_greater,
14890         do_jump_by_parts_zero_rtx, do_jump_by_parts_equality_rtx,
14891         do_jump_by_parts_equality, do_compare_and_jump): Add PROB
14892         argument, pass it down to other calls.
14893         (do_compare_rtx_and_jump): Likewise.  If PROB is not -1,
14894         add REG_BR_PROB note to the conditional jump.
14895         * cfgexpand.c (add_reg_br_prob_note): Removed.
14896         (expand_gimple_cond): Don't call it, add the probability
14897         as last argument to jumpif_1/jumpifnot_1.
14898         * Makefile.in (dojump.o): Depend on output.h.
14899         * builtins.c (expand_errno_check): Adjust do_compare_rtx_and_jump
14900         callers.
14901         * expmed.c (emit_store_flag_force, do_cmp_and_jump): Likewise.
14902         * stmt.c (do_jump_if_equal): Likewise.
14903         * cfgrtl.c (rtl_lv_add_condition_to_bb): Likewise.
14904         * loop-unswitch.c (compare_and_jump_seq): Likewise.
14905         * config/rs6000/rs6000.c (rs6000_aix_emit_builtin_unwind_init):
14906         Likewise.
14907         * optabs.c (expand_doubleword_shift, expand_abs): Likewise.
14908         * expr.c (expand_expr_real_1): Adjust do_jump, jumpifnot and
14909         jumpifnot_1 callers.
14910         (expand_expr_real_2): Adjust jumpifnot_1 and do_compare_rtx_and_jump
14911         callers.
14912         (store_expr): Adjust jumpifnot caller.
14913         (store_constructor): Adjust jumpif caller.
14915         PR middle-end/42233
14916         * gimplify.c (gimple_boolify): For __builtin_expect call
14917         gimple_boolify also on its first argument.
14919 2010-02-18  Uros Bizjak  <ubizjak@gmail.com>
14921         * configure.ac (gnu-unique-object): Wrap regexps using [] in
14922         changequote block.
14923         (__stack_chk_fail): Ditto.  Remove quadrigraphs.
14924         * configure: Regenerated.
14926 2010-02-18  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
14928         * config/spu/spu-c.c (spu_resolve_overloaded_builtin): Call
14929         lang_hooks.types_compatible_p instead of comptypes.
14931 2010-02-18  Sebastian Huber <sebastian.huber@embedded-brains.de>
14933         * config/arm/lib1funcs.asm (__prefer_thumb__): New define.
14934         (udivsi3, aeabi_uidivmod, divsi3, aeabi_idivmod): Use Thumb-1 variant
14935         if __prefer_thumb__ is defined.
14937 2010-02-18  Martin Jambor  <mjambor@suse.cz>
14939         PR tree-optimization/43066
14940         * tree-sra.c (build_ref_for_offset_1): Return false on encountering an
14941         array with zero-sized element type.
14943 2010-02-18  Jakub Jelinek  <jakub@redhat.com>
14945         * dwarf2out.c (add_var_loc_to_decl): Change last argument to
14946         rtx, allocate struct var_loc_node here and return it to the
14947         caller, and only if it is actually needed.
14948         (dwarf2out_var_location): Adjust add_var_loc_to_decl caller,
14949         move it earlier and return immediately if it returns NULL.
14951 2010-02-17  Mikael Pettersson  <mikpe@it.uu.se>
14953         * config/sparc/gas.h: New file.  Restore
14954         TARGET_ASM_NAMED_SECTION to its ELF default.
14955         * config/sparc/sysv4.h (TARGET_ASM_NAMED_SECTION): Do not
14956         check !HAVE_GNU_AS.
14957         * config/sparc/sparc.c (sparc_elf_asm_named_section):
14958         Likewise.  Add ATTRIBUTE_UNUSED to prototype.
14959         * config.gcc (sparc*-*-linux*): Include sparc/gas.h
14960         after sparc/sysv4.h.
14962 2010-02-17  Dave Korn  <dave.korn.cygwin@gmail.com>
14964         * config/i386/mingw32.h (LIBGCJ_SONAME): Fix cut'n'pasto in DLL name.
14966 2010-02-17  Steven Bosscher  <steven@gcc.gnu.org>
14968         * gensupport.c (process_one_cond_exec): Derive name for COND_EXEC
14969         patterns from predicated pattern.
14971 2010-02-17  Uros Bizjak  <ubizjak@gmail.com>
14973         PR target/43103
14974         * config/i386/sse.md (xop_vpermil2<mode>3): Use avxmodesuffixf2c
14975         for insn mnemonic suffix.
14977 2010-02-17  Richard Guenther  <rguenther@suse.de>
14979         * tree-vrp.c (vrp_visit_phi_node): Restrict SCEV analysis
14980         to loop PHI nodes.
14982 2010-02-17  Jakub Jelinek  <jakub@redhat.com>
14984         PR debug/42918
14985         * caller-save.c (save_call_clobbered_regs): If BB ends with
14986         a DEBUG_INSN, move any notes in between last real insn and the last
14987         DEBUG_INSN after the last DEBUG_INSN.
14989 2010-02-16  Joern Rennecke  <joern.rennecke@embecosm.com>
14991         * tm.texi (TARGET_SCHED_FIRST_CYCLE_MULTIPASS_DFA_LOOKAHEAD_GUARD_SPEC):
14992         Fix return type.  Fix argument type.  Explain meaning of return value.
14994 2010-02-16  Richard Guenther  <rguenther@suse.de>
14996         PR tree-optimization/41043
14997         * tree-vrp.c  (vrp_var_may_overflow): Only ask SCEV for real loops.
14998         (vrp_visit_assignment_or_call): Do not ask SCEV for regular
14999         statements ...
15000         (vrp_visit_phi_node): ... but only for loop PHI nodes.
15002 2010-02-16  Ira Rosen  <irar@il.ibm.com>
15004         PR tree-optimization/43074
15005         * tree-vectorizer.h (VECTORIZABLE_CYCLE_DEF): New.
15006         * tree-vect-loop.c (vect_analyze_loop_operations): Add
15007         vectorizable cycles in hybrid SLP check.
15008         * tree-vect-slp.c (vect_detect_hybrid_slp_stmts): Likewise.
15010 2010-02-16  Richard Guenther  <rguenther@suse.de>
15012         * alias.c (memrefs_conflict_p): Distinguish must-alias from don't know.
15013         (true_dependence): If memrefs_conflict_p computes must-alias
15014         trust it.  Move TBAA check after offset-based disambiguation.
15015         (canon_true_dependence): Likewise.
15017 2010-02-16  Alexandre Oliva  <aoliva@redhat.com>
15019         * params.def (PARAM_MAX_VARTRACK_SIZE): New.
15020         * doc/invoke.texi: Document it.
15021         * var-tracking.c: Include toplev.h and params.h.
15022         (vt_find_locations): Return bool indicating success.  Compute
15023         hash sizes unconditionally.  Check new parameter, report.
15024         (variable_tracking_main_1): Check vt_find_locations results and
15025         retry.  Renamed from...
15026         (variable_tracking_main): ... this.  New wrapper to preserve
15027         flag_var_tracking_assignments.
15028         * Makefile.in (var-tracking.o): Adjust dependencies.
15030 2010-02-16  Jack Howarth <howarth@bromo.med.uc.edu>
15031             Jakub Jelinek <jakub@redhat.com>
15033         PR target/42854
15034         * config/darwin.h (ASM_WEAKEN_DECL): Don't check weak attribute
15035         if weak_import attribute is present.
15036         * config/darwin.c (machopic_select_section): Likewise.
15038 2010-02-15  Joern Rennecke  <joern.rennecke@embecosm.com>
15040         * doc/tm.texi (TARGET_VECTORIZE_BUILTIN_VECTORIZATION_COST): Document.
15041         (TARGET_VECTORIZE_VECTOR_ALIGNMENT_REACHABLE): Likewise.
15042         (TARGET_VECTORIZE_BUILTIN_VEC_PERM): Likewise.
15043         (TARGET_VECTORIZE_BUILTIN_VEC_PERM_OK): Likewise.
15045         * doc/tm.texi (TARGET_VECTORIZE_BUILTIN_CONVERSION): Fix argument
15046         types.
15048         * doc/tm.texi (TARGET_VECTORIZE_BUILTIN_VECTORIZED_FUNCTION):
15049         Fix argument types.
15051         * doc/tm.texi (TARGET_SCHED_DFA_NEW_CYCLE): Add argument names.
15052         Rewrite text to refer to the names.
15054 2010-02-15  Sebastian Pop  <sebastian.pop@amd.com>
15056         * config/i386/i386-builtin-types.def
15057         (V2DF_FTYPE_V2DF_V2DF_V2DI_INT): Declared.
15058         (V4DF_FTYPE_V4DF_V4DF_V4DI_INT): Declared.
15059         (V4SF_FTYPE_V4SF_V4SF_V4SI_INT): Declared.
15060         (V8SF_FTYPE_V8SF_V8SF_V8SI_INT): Declared.
15061         * config/i386/i386.c (enum ix86_builtins): Add IX86_BUILTIN_VPERMIL2PD,
15062         IX86_BUILTIN_VPERMIL2PS, IX86_BUILTIN_VPERMIL2PD256, and
15063         IX86_BUILTIN_VPERMIL2PS256.
15064         (MULTI_ARG_4_DF2_DI_I): Defined.
15065         (MULTI_ARG_4_DF2_DI_I1): Defined.
15066         (MULTI_ARG_4_SF2_SI_I): Defined.
15067         (MULTI_ARG_4_SF2_SI_I1): Defined.
15068         (bdesc_multi_arg): Add __builtin_ia32_vpermil2pd,
15069         __builtin_ia32_vpermil2ps, __builtin_ia32_vpermil2pd256, and
15070         __builtin_ia32_vpermil2ps256.
15071         (ix86_expand_multi_arg_builtin): Handle MULTI_ARG_4_DF2_DI_I,
15072         MULTI_ARG_4_DF2_DI_I1, MULTI_ARG_4_SF2_SI_I, and
15073         MULTI_ARG_4_SF2_SI_I1.  Handle builtins with 4 arguments.
15074         (ix86_expand_args_builtin): Handle MULTI_ARG_4_DF2_DI_I,
15075         MULTI_ARG_4_DF2_DI_I1, MULTI_ARG_4_SF2_SI_I, and
15076         MULTI_ARG_4_SF2_SI_I1.  Handle CODE_FOR_xop_vpermil2v2df3,
15077         CODE_FOR_xop_vpermil2v4sf3, CODE_FOR_xop_vpermil2v4df3, and
15078         CODE_FOR_xop_vpermil2v8sf3.
15079         * config/i386/i386.md (UNSPEC_VPERMIL2): Declared.
15080         * config/i386/sse.md (xop_vpermil2<mode>3): New insn pattern.
15081         * config/i386/xopintrin.h (_mm_permute2_pd): New.
15082         (_mm256_permute2_pd): New.
15083         (_mm_permute2_ps): New.
15084         (_mm256_permute2_ps): New.
15086 2010-02-15  Nick Clifton  <nickc@redhat.com>
15088         * config/h8300/h8300.c (h8300_push_pop): Use bool type for
15089         boolean parameters.  Use emit_jump_insn when emitting a pop
15090         instruction containing a return insn.
15091         (push): Use 'true' rather than '1' as second parameter to F.
15092         (h8300_expand_prologue): Likewise.
15093         Use 'true' and 'false' for boolean parameters to h8300_push_pop.
15094         (h8300_expand_epilogue): Likewise.
15096 2010-02-15  Richard Guenther  <rguenther@suse.de>
15098         PR middle-end/43068
15099         * cgraphunit.c (thunk_adjust): Skip adjusting by fixed_offset
15100         if that is zero.
15102 2010-02-15  Nick Clifton  <nickc@redhat.com>
15104         * config/mn10300/mn10300.h (FUNCTION_ARG_REGNO_P): Revert previous
15105         delta.
15107 2010-02-14  Marco Poletti  <poletti.marco@gmail.com>
15109         * intl.c (fake_ngettext): New function.
15110         * intl.h (fake_ngettext): Declare.
15111         (ngettext): Define macro.
15112         * collect2.c (notice_translated): New function.
15113         (main): Use notice_translated and ngettext.
15114         * collect2.h (notice_translated): Declare.
15116 2010-02-14  Steven Bosscher  <steven@gcc.gnu.org>
15118         * reorg.c (delete_computation): Comment fixes.
15119         * caller-save.c (setup_save_areas): Idem.
15120         * sel-sched-dump.c (dump_lv_set): Idem.
15121         * rtl.def: Idem.
15123 2010-02-14  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
15125         * config/s390/s390.c (s390_sched_init): New function.
15126         (TARGET_SCHED_INIT): Target hook defined.
15128 2010-02-12  Dave Korn  <dave.korn.cygwin@gmail.com>
15129             Jack Howarth  <howarth@bromo.med.uc.edu>
15130             Iain Sandoe <iain.sandoe@sandoe-acoustics.co.uk>
15132         PR target/42982
15133         Partial revert of unintended change in fix for PR41605.
15134         * config/darwin.h: Fix typo.
15135         * config/darwin9.h: Same.
15137 2010-02-11  Jakub Jelinek  <jakub@redhat.com>
15139         * c-pch.c (pch_init): Clear v.
15141 2010-02-11  Sebastian Pop  <sebastian.pop@amd.com>
15143         PR middle-end/42930
15144         * graphite-scop-detection.c (graphite_can_represent_scev): Call
15145         graphite_can_represent_init for MULT_EXPR.
15147 2010-02-11  Sebastian Pop  <sebastian.pop@amd.com>
15149         PR middle-end/42914
15150         PR middle-end/42530
15151         * graphite-sese-to-poly.c (remove_phi): New.
15152         (translate_scalar_reduction_to_array): Call remove_phi.
15154 2010-02-11  Sebastian Pop  <sebastian.pop@amd.com>
15156         PR middle-end/42771
15157         * graphite-clast-to-gimple.c (gloog): Call rename_sese_parameters.
15158         * graphite-clast-to-gimple.h (gloog): Update declaration.
15159         * graphite-poly.c (new_scop): Clear POLY_SCOP_P.
15160         * graphite-poly.h (struct poly_bb): Add missing comments.
15161         (struct scop): Add poly_scop_p field.
15162         (POLY_SCOP_P): New.
15163         * graphite-sese-to-poly.c (build_poly_scop): Set POLY_SCOP_P.
15164         * graphite.c (graphite_transform_loops): Build the polyhedral
15165         representation for each scop before code generation.
15166         * sese.c (rename_variables_in_operand): Removed.
15167         (rename_variables_in_expr): Return the renamed expression.
15168         (rename_sese_parameters): New.
15169         * sese.h (rename_sese_parameters): Declared.
15171 2010-02-11  Richard Guenther  <rguenther@suse.de>
15173         PR tree-optimization/42998
15174         * tree-ssa-pre.c (create_expression_by_pieces): Treat
15175         POINTER_PLUS_EXPR properly.
15177 2010-02-11  Sebastian Pop  <sebastian.pop@amd.com>
15178             Changpeng Fang  <changpeng.fang@amd.com>
15180         PR middle-end/40886
15181         * tree-ssa-loop-ivopts.c (determine_use_iv_cost_condition): Decrement
15182         the cost of an IV candidate when the IV is used in a test against zero.
15184         * gcc.dg/tree-ssa/ivopts-3.c: New.
15186 2010-02-11  Richard Guenther  <rguenther@suse.de>
15188         PR lto/41664
15189         * tree-ssa-alias.c (refs_may_alias_p_1): Canonicalize
15190         pointer-vs-decl case by swapping refs.  Handle some cases
15191         of pointer-vs-decl disambiguations more conservatively.
15192         * cfgexpand.c (gimple_expand_cfg): Set gimple_df->in_ssa_p
15193         to false after expanding.
15195 2010-02-11  Richard Guenther  <rguenther@suse.de>
15197         PR driver/43021
15198         * gcc.c (process_command): Handle LTO file@offset case more
15199         appropriately.
15201 2010-02-11  Jakub Jelinek  <jakub@redhat.com>
15203         * reload1.c (eliminate_regs_1): If insn is DEBUG_INSN, avoid any
15204         modifications outside of the DEBUG_INSN.  Accept CLOBBERs inside
15205         of DEBUG_INSNs.
15206         (eliminate_regs_in_insn): Eliminate regs even in DEBUG_INSNs.
15208         * dwarf2out.c (mem_loc_descriptor) <case MEM>: Use DW_OP_deref_size
15209         if MEM's mode size isn't DWARF2_ADDR_SIZE.
15210         (mem_loc_descriptor) <do_scompare>: Allow also VOIDmode arguments.
15211         Optimize eq/ne comparisons when both arguments are known to be
15212         zero-extended.
15213         (mem_loc_descriptor) <do_ucompare>: Allow also VOIDmode arguments.
15214         Don't mask operands unnecessarily if they are known to be already
15215         zero-extended.
15217 2010-02-10  Vladimir Makarov  <vmakarov@redhat.com>
15219         * ira-conflicts.c (add_insn_allocno_copies): Use find_reg_note
15220         instead of loop.
15222 2010-02-10  Richard Guenther  <rguenther@suse.de>
15224         PR tree-optimization/43017
15225         * tree-vrp.c (vrp_int_const_binop): Trust int_const_binop
15226         for wrapping signed arithmetic.
15228 2010-02-10  Jakub Jelinek  <jakub@redhat.com>
15230         PR debug/43010
15231         * dwarf2out.c (retry_incomplete_types): Don't call gen_type_die
15232         if no debug info should be emitted for it.
15234 2010-02-10  Kaz Kojima  <kkojima@gcc.gnu.org>
15236         * config/sh/sh.c (find_barrier): Skip call insn with a REG_EH_REGION
15237         note when flag_exceptions is set.
15239 2010-02-10  Duncan Sands  <baldrick@free.fr>
15241         * Makefile.in (PLUGIN_HEADERS): Add debug.h.
15243 2010-02-10  Richard Guenther  <rguenther@suse.de>
15245         PR c/43007
15246         * tree.c (get_unwidened): Handle constants.
15247         * convert.c (convert_to_integer): Handle TRUNC_DIV_EXPR.
15249 2010-02-10  Martin Jambor  <mjambor@suse.cz>
15251         PR lto/42985
15252         * ipa-prop.c (ipa_update_after_lto_read): Count parameters and
15253         check for variable argument counts independently.
15255 2010-02-10  Christian Bruel  <christian.bruel@st.com>
15257         PR target/42841
15258         * config/sh/sh.c (find_barrier): Increase length for non delayed
15259         conditional branches.
15261 2010-02-10  Christian Bruel  <christian.bruel@st.com>
15263         * config/sh/sh.c (find_barrier): Don't emit a CP inside the GP setting.
15265 2010-02-10  Jakub Jelinek  <jakub@redhat.com>
15267         * builtins.c (set_builtin_user_assembler_name): Also handle
15268         ffs if int is smaller than word.
15270 2010-02-09  Vladimir Makarov  <vmakarov@redhat.com>
15272         PR middle-end/42973
15273         * ira-conflicts.c (get_dup): Remove.
15274         (process_reg_shuffles): Add new parameter.  Use it as an
15275         additional guard for copy generation.
15276         (add_insn_allocno_copies): Rewrite.
15278 2010-02-09  Alexander Monakov  <amonakov@ispras.ru>
15280         * common.opt (fsched2-use-traces): Preserved for backward
15281         compatibility.
15282         * doc/invoke.texi: Remove the documentation about option
15283         -fsched2-use-traces.
15284         * sched-rgn.c (rest_of_handle_sched2): Remove usage of
15285         flag_sched2_use_traces.
15286         * opts.c (common_handle_option): Add OPT_fsched2_use_traces to
15287         the backward compatibility flag section.
15289 2010-02-09  Richard Guenther  <rguenther@suse.de>
15291         PR tree-optimization/43008
15292         * tree-ssa-structalias.c (handle_lhs_call): Pass in the fndecl,
15293         make HEAP variables initialized from global memory if they
15294         are not known builtin functions.
15295         (find_func_aliases): Adjust.
15297 2010-02-09  Richard Guenther  <rguenther@suse.de>
15299         PR tree-optimization/43000
15300         * tree-vrp.c (vrp_int_const_binop): Only handle unsigned
15301         arithmetic manually.
15303 2010-02-08  Jakub Jelinek  <jakub@redhat.com>
15305         PR tree-optimization/42931
15306         * tree-loop-linear.c (try_interchange_loops): Don't call
15307         double_int_mul if estimated_loop_iterations failed.
15309 2010-02-08  Martin Jambor  <mjambor@suse.cz>
15311         PR middle-end/42898
15312         * tree-sra.c (build_accesses_from_assign): Do not mark in
15313         should_scalarize_away_bitmap if stmt has volatile ops.
15314         (sra_modify_assign): Do not process assigns piecemeal if if stmt
15315         has volatile ops.
15317 2010-02-08  Joern Rennecke  <joern.rennecke@embecosm.com>
15319         * doc/tm.texi (TARGET_UNWIND_WORD_MODE): Document.
15321 2010-02-07  Adam Nemet  <adambnmet@gmail.com>
15323         * config/mips/mips.md (*<optab>_trunc<mode>_exts): Fix comment
15324         before the pattern.
15326 2010-02-07  Andrew Pinski  <pinskia@gmail.com>
15328         PR middle-end/42946
15329         * df-core.c (df_finish_pass): Change type of saved_flags to int.
15331 2010-02-07  Sebastian Pop  <sebastian.pop@amd.com>
15333         PR middle-end/42988
15334         * graphite-dependences.c (dependence_polyhedron): Set PDDR_KIND
15335         to unknown_dependence.
15336         (graphite_legal_transform_dr): Handle the unknown_dependence.
15337         (graphite_carried_dependence_level_k): Same.
15339 2010-02-07  Sebastian Pop  <sebastian.pop@amd.com>
15341         * ChangeLog.graphite: Remove testsuite/ or gcc/testsuite/.
15343 2010-02-07  Richard Guenther  <rguenther@suse.de>
15345         PR middle-end/42991
15346         * expr.c (get_inner_reference): Always initialize *pbitsize.
15348 2010-02-07  Richard Guenther  <rguenther@suse.de>
15350         PR middle-end/42956
15351         * gimplify.c (gimple_fold_indirect_ref): Avoid generating
15352         new ARRAY_REFs on variable size element or minimal index arrays.
15353         Complete.
15354         * tree-ssa-loop-ivopts.c (find_interesting_uses_address): Use
15355         gimple_fold_indirect_ref.
15357 2010-02-06  Richard Earnshaw  <rearnsha@arm.com>
15359         PR target/42957
15360         * arm.c (arm_override_options): Just return if the user has specified
15361         an invalid fpu name.
15363 2010-02-03  Jason Merrill  <jason@redhat.com>
15365         PR c++/42870
15366         * config/i386/cygming.h (ASM_OUTPUT_DEF_FROM_DECLS): Call
15367         i386_pe_maybe_record_exported_symbol.
15369 2010-02-05  Steve Ellcey  <sje@cup.hp.com>
15371         PR target/42924
15372         * config/pa/pa.c (TARGET_DELEGITIMIZE_ADDRESS): Redefine.
15373         (pa_delegitimize_address): New function.
15375 2010-02-05  Ozkan Sezer  <sezeroz@gmail.com>
15377         * config/i386/msformat-c.c (ms_printf_length_specs): Set the
15378         scalar_identity_flag for the size_t/ptrdiff_t %Id and %Iu specs.
15380 2010-02-05  Richard Guenther  <rguenther@suse.de>
15382         PR lto/42762
15383         * lto-streamer-in.c (get_resolution): Deal with references
15384         to undefined functions.
15386 2010-02-05  Richard Guenther  <rguenther@suse.de>
15388         * tree-ssa-ccp.c (get_symbol_constant_value): Strip all conversions.
15389         (fold_const_aggregate_ref): Likewise.
15390         (ccp_fold_stmt): Substitute loads.
15391         (maybe_fold_reference): Verify types before substituting.
15392         Unshare properly.
15393         (fold_gimple_assign): Unshare properly.
15394         (fold_stmt_1): Insert conversion if necessary before replacing the RHS.
15396 2010-02-05  Nathan Froyd  <froydnj@codesourcery.com>
15398         * config/rs6000/rs6000.c (rs6000_override_options): Invert check
15399         for rs6000_gen_cell_microcode.
15401 2010-02-04  Richard Guenther  <rguenther@suse.de>
15403         PR rtl-optimization/42952
15404         * dse.c (const_or_frame_p): Remove MEM handling.
15406 2010-02-04  Nick Clifton  <nickc@redhat.com>
15408         * config/mn10300/mn10300.c (TARGET_ASM_OUTPUT_MI_THUNK): Define.
15409         (TARGET_ASM_CAN_OUTPUT_MI_THUNK): Define.
15410         (function_arg): Use NULL_RTX and FIRST_ARGUMENT_REGNUM.
15411         (mn10300_asm_output_mi_thunk): New function.
15412         (mn10300_can_output_mu_thunk): New function.
15413         * config/mn10300/mn10300.h (FIRST_ARGUMENT_REGNUM): Define.
15414         (FUNCTION_ARG_REGNO_P): Fix comment.  Accept d0 and d1.
15415         (FUNCTION_ARG): Delete incorrect comment.
15417 2010-02-03  Jason Merrill  <jason@redhat.com>
15419         PR c++/40138
15420         * fold-const.c (operand_equal_p): Handle erroneous types.
15422 2010-02-03  Kaushik Phatak  <kaushik.phatak@kpitcummins.com>
15424         * config/h8300/h8300.md (can_delay): Fix attibute condition.
15426 2010-02-03  Vladimir Makarov  <vmakarov@redhat.com>
15428         PR rtl-optimization/42941
15429         * sched-deps.c (setup_insn_reg_pressure_info): Use xcalloc instead
15430         of xmalloc.
15432 2010-02-03  Jason Merrill  <jason@redhat.com>
15434         PR c++/35652
15435         * builtins.c (c_strlen): Use EXPR_LOCATION in diagnostics.
15437 2010-02-03  Alexandre Oliva  <aoliva@redhat.com>
15439         PR debug/42896
15440         * cselib.h (struct cselib_val_struct): Add uid.  Rename value to hash.
15441         (cselib_reset_table): Renamed from...
15442         (cselib_reset_table_with_next_value): ... this.
15443         (cselib_get_next_uid): Renamed from...
15444         (cselib_get_next_unknown_value): ... this.
15445         * cselib.c (next_uid): Renamed from...
15446         (next_unknown_value): ... this.
15447         (cselib_clear_table): Adjust.
15448         (cselib_reset_table): Adjust.  Renamed from...
15449         (cselib_reset_table_with_next_value): ... this.
15450         (cselib_get_next_uid): Adjust.  Renamed from...
15451         (cselib_get_next_unknown_value): ... this.
15452         (get_value_hash): Use hash.
15453         (cselib_hash_rtx): Likewise.
15454         (new_cselib_val): Adjust.  Set and dump uid.
15455         (cselib_lookup_mem): Pass next_uid as hash.
15456         (cselib_subst_to_values): Likewise.
15457         (cselib_log_lookup): Dump uid.
15458         (cselib_lookup): Pass next_uid as hash.  Adjust.
15459         (cselib_process_insn): Adjust.
15460         (cselib_init): Initialize next_uid.
15461         (cselib_finish): Adjust.
15462         (dump_cselib_table): Likewise.
15463         * dse.c (canon_address): Dump value uid.
15464         * print-rtl.c (print_rtx): Print value uid.
15465         * var-tracking.c (VARIABLE_HASH_VAL): Dropped.
15466         (dvuid): New type.
15467         (dv_uid): New function, sort of renamed from...
15468         (dv_htab_hash): ... this, reimplemented in terms of it and...
15469         (dv_uid2hash): ... this.  New.
15470         (variable_htab_eq): Drop excess assertions.
15471         (tie_break_pointers): Removed.
15472         (canon_value_cmp): Compare uids.
15473         (variable_post_merge_New_vals): Print uids.
15474         (vt_add_function_parameters): Adjust.
15475         (vt_initialize): Reset table.  Adjust.
15477 2010-02-03  Richard Guenther  <rguenther@suse.de>
15479         PR tree-optimization/42944
15480         * tree-ssa-alias.c (ref_maybe_used_by_call_p_1): Handle calloc.
15481         (call_may_clobber_ref_p_1): Likewise.  Properly handle
15482         malloc and calloc clobbering errno.
15484 2010-02-03  Steven Bosscher  <steven@gcc.gnu.org>
15486         * doc/invoke.texi: Fix name of sched1 dump.
15488         * opts.c (decode_options): Set flag_tree_switch_conversion
15489         only conditionally on optimize >= 2.
15491         * gcse.c: Assorted comment fixes in pass description.
15493 2010-02-03  Anthony Green  <green@moxielogic.com>
15495         * config/moxie/moxie.c (moxie_asm_trampoline_template): Introduce
15496         nop padding in order to maintain alignment of storage location of
15497         target function address.
15498         (moxie_trampoline_init): Store target function address at newly
15499         aligned location.
15500         * config/moxie/moxie.h (TRAMPOLINE_ALIGNMENT): Increase alignment
15501         to 32.
15502         (TRAMPOLINE_SIZE): Increase size by 2 bytes for alignment padding.
15504 2010-02-03  Richard Guenther  <rguenther@suse.de>
15506         PR middle-end/42927
15507         * tree-cfg.c (verify_gimple_assign_binary): Fix shift verification.
15509 2010-02-03  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
15511         * config.gcc: Reenable check for obsolete targets.
15512         Obsolete alpha*-dec-osf4*, alpha*-dec-osf5.0*, mips-sgi-irix5*,
15513         mips-sgi-irix6.[0-4]*.
15515 2010-02-02  Nick Clifton  <nickc@redhat.com>
15517         * config/rx/rx.c (rx_is_legitimate_constant): Treat a maximum
15518         constant size of 4 as being the same as 0.
15519         * doc/invoke.texi (RX Options): Document that -mmax-constant-size
15520         can take values in the range 0..4.
15522 2010-02-02  Jack Howarth  <howarth@bromo.med.uc.edu>
15524         PR java/41991
15525         * unwind-dw2-fde-darwin.c: Re-export _Unwind_FindEnclosingFunction()
15526         as _darwin10_Unwind_FindEnclosingFunction().
15527         * libgcc-libsystem.ver: New.
15529 2010-02-01  Vladimir Makarov  <vmakarov@redhat.com>
15531         PR target/41399
15532         * sched-deps.c (sched_analyze_insn): Ignore fixed registers for
15533         implicitly set registers.
15535 2010-02-01  Richard Earnshaw  <rearnsha@arm.com>
15537         * arm.c (FL_FOR_ARCH_7A): is also a superset of ARMv6K.
15538         (arm_override_options): Allow automatic selection of the thread
15539         pointer register if thumb2.
15540         (legitimize_pic_address): Improve code sequences for Thumb2.
15541         (arm_call_tls_get_addr): Likewise.
15542         (legitimize_tls_address): Likewise.
15543         * arm.md (pic_load_addr_arm): Delete.  Replace with ...
15544         (pic_load_addr_32bit): ... this.  New named pattern.
15545         * thumb2.md (pic_load_addr_thumb2): Delete.
15546         (pic_load_dot_plus_four): Delete.
15547         (tls_load_dot_plus_four): New named pattern.
15549 2010-02-01  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
15551         PR libgomp/29986
15552         * doc/install.texi (Specific): Add sparc-sun-solaris2.10 entry.
15553         Document fix for TLS bug.
15555 2010-01-31  Richard Guenther  <rguenther@suse.de>
15557         * tree-sra.c (ptr_parm_has_direct_uses): Rewrite to be
15558         conservatively correct.
15560 2010-01-31  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
15562         PR target/42850
15563         Revert:
15564         2010-01-02  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
15566         * config/pa/t-slibgcc-dwarf-ver (SHLIB_SOVERSION): Bump by two.
15568 2010-01-31  Kaveh R. Ghazi  <ghazi@caip.rutgers.edu>
15570         * doc/install.texi: Update recommended GMP/MPFR/MPC versions.
15572 2010-01-31  Kai Tietz  <kai.tietz@onevision.com>
15574         * config.gcc: Adjust order of makefile fragments for mingw targets.
15576 2010-01-31  Richard Guenther  <rguenther@suse.de>
15578         PR middle-end/42898
15579         * gimplify.c (gimplify_init_constructor): For volatile LHS
15580         initialize a temporary.
15582 2010-01-31  Matthias Klose  <doko@ubuntu.com>
15584         * configure.ac: Fix __stack_chk_fail check for cross builds configured
15585         --with-headers
15586         * configure: Regenerate.
15588 2010-01-29  Eric Botcazou  <ebotcazou@adacore.com>
15590         * tree-ssa-alias.c (same_type_for_tbaa): Return -1 if the types have
15591         the same alias set and their sizes different constantness.
15592         (aliasing_component_refs_p): Revert 2009-10-24 change.
15594 2010-01-29  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
15596         * config/sparc/sparc.c (sparc_elf_asm_named_section): Declare decl
15597         unused.
15599 2010-01-29  Richard Guenther  <rguenther@suse.de>
15601         * tree-ssa-ccp.c (ccp_fold_stmt): Unshare values we substitute.
15602         Assert we successfully updated the call.
15604 2010-01-29  Jakub Jelinek  <jakub@redhat.com>
15606         PR rtl-optimization/42889
15607         * df.h (df_set_bb_dirty_nonlr): New prototype.
15608         * df-core.c (df_set_bb_dirty_nonlr): New function.
15609         * df-scan.c (df_insn_rescan): Call it instead of
15610         df_set_bb_dirty for DEBUG_INSNs.
15612 2010-01-29  Richard Guenther  <rguenther@suse.de>
15614         PR middle-end/37448
15615         * ipa-inline.c (cgraph_decide_inlining_incrementally): Avoid
15616         quadratic behavior in most cases.
15618 2010-01-28  Uros Bizjak  <ubizjak@gmail.com>
15620         PR target/42891
15621         * config/i386/i386.c (ix86_expand_int_movcc): Convert tmp to SImode
15622         in the call to gen_x86_movsicc_0_m1.
15624 2010-01-28  Richard Guenther  <rguenther@suse.de>
15626         PR tree-optimization/42871
15627         * tree-ssa-pre.c (phi_translate_set): Make sure to retain leaders.
15629 2010-01-28  Richard Guenther  <rguenther@suse.de>
15631         * tree-ssa-ccp.c (ccp_fold_stmt): Fold calls and propagate
15632         into call arguments.
15634 2010-01-28  Richard Guenther  <rguenther@suse.de>
15636         PR middle-end/42883
15637         * tree-cfgcleanup.c (remove_forwarder_block): Do not remove
15638         the forwarder if the destination is an EH landing pad.
15640 2010-01-28  Razya Ladelsky  <razya@il.ibm.com>
15642         * tree-parloops.c (transform_to_exit_first_loop): Update the basic
15643         block list passed to gimple_duplicate_sese_tail.
15644         (parallelize_loops): Avoid parallelization when the function
15645         has_nonlocal_label.
15646         Avoid parallelization when the preheader is IRREDUCIBLE.
15647         Try to optimize when estimated_loop_iterations_int is unresolved.
15648         Add the loop's location to the dump file.
15649         * tree-cfg.c (add_phi_args_after_redirect): Remove.
15650         (gimple_duplicate_sese_tail): Remove the check for the latch.
15651         Redirect nexits to the exit block.
15652         Remove handling of the incoming edges to the latch.
15653         Redirect the backedge from the copied latch to the exit bb.
15655 2010-01-28  Michael Matz  <matz@suse.de>
15657         PR target/42881
15658         * config/i386/i386.c (ix86_expand_vector_init_duplicate):
15659         Wrap force_reg into a sequence, emit it before user.
15661 2010-01-28  Stephen Thomas  <stephen.thomas@arm.com>
15663         * config/arm/arm.md (bswapsi2): Add support for bswapsi2.
15664         (arm_rev): New.
15665         (arm_legacy_rev): Likewise.
15666         (thumb_legacy_rev): Likewise.
15668 2010-01-27  Jakub Jelinek  <jakub@redhat.com>
15670         * dwarf2out.c (mem_loc_descriptor): Remove special casing of
15671         CONSTANT_POOL_ADDRESS_P SYMBOL_REFs.  If for MEM recursive call
15672         on MEM's address failed, try avoid_constant_pool_reference and
15673         recurse if it returned something different.
15674         (loc_descriptor): If for MEM mem_loc_descriptor failed on the
15675         address, try avoid_constant_pool_reference and recurse if it
15676         returned something different.
15677         (dw_loc_list_1): If for MEM mem_loc_descriptor failed on the
15678         address and avoid_constant_pool_reference returned something
15679         different, don't set have_address.
15681 2010-01-27  Alexandre Oliva  <aoliva@redhat.com>
15683         PR debug/42861
15684         * var-tracking.c (val_store): Add modified argument, obey it.
15685         Adjust callers.
15686         (count_uses): Move down logging of main.
15687         (compute_bb_dataflow): Use val_store for MO_VAL_USEs that
15688         don't need resolution.
15689         (emit_notes_in_bb): Likewise.
15691 2010-01-27  Richard Guenther  <rguenther@suse.de>
15693         PR middle-end/42878
15694         * tree-inline.c (remap_decl): Delay remapping of SSA name
15695         default definitions until we need them.
15697 2010-01-27  Jakub Jelinek  <jakub@redhat.com>
15699         * config/rs6000/rs6000.c (TARGET_DELEGITIMIZE_ADDRESS): Redefine.
15700         (rs6000_delegitimize_address): New function.
15702         * config/s390/s390.c (s390_delegitimize_address): Call
15703         delegitimize_mem_from_attrs.
15705         PR middle-end/42874
15706         * tree-inline.c (cannot_copy_type_1): Removed.
15707         (copy_forbidden): Don't forbid copying of functions containing
15708         records/unions with variable length fields.
15710 2010-01-27  Christian Bruel  <christian.bruel@st.com>
15712         Revert:
15713         PR target/42841
15714         * config/sh/sh.c (find_barrier): Increase length for non delayed
15715         conditional branches.
15717 2010-01-27  Matthias Klose  <doko@ubuntu.com>
15719         * configure.ac (gnu-unique-object): Fix ldd version check.
15720         * configure: Regenerate.
15722 2010-01-26  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
15724         * config/sparc/sparc.c (sparc_elf_asm_named_section): Test for
15725         HAVE_GNU_AS value.
15726         * config/sparc/sysv4.h [HAVE_GNU_AS] (TARGET_ASM_NAMED_SECTION):
15727         Test for HAVE_GNU_AS value.
15729 2010-01-26  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
15731         * config.gcc (mips-sgi-irix[56]*): Set use_gcc_stdint.
15732         * config/mips/iris.h (INT8_TYPE, INT16_TYPE, INT32_TYPE,
15733         INT64_TYPE): Define.
15734         (UINT8_TYPE, UINT16_TYPE, UINT32_TYPE, UINT64_TYPE): Define.
15735         (INT_LEAST8_TYPE, INT_LEAST16_TYPE, INT_LEAST32_TYPE,
15736         INT_LEAST64_TYPE): Define.
15737         (UINT_LEAST8_TYPE, UINT_LEAST16_TYPE, UINT_LEAST32_TYPE,
15738         UINT_LEAST64_TYPE): Define.
15739         (INT_FAST8_TYPE, INT_FAST16_TYPE, INT_FAST32_TYPE)
15740         INT_FAST64_TYPE): Define.
15741         (UINT_FAST8_TYPE, UINT_FAST16_TYPE, UINT_FAST32_TYPE,
15742         UINT_FAST64_TYPE): Define.
15743         (INTMAX_TYPE, UINTMAX_TYPE): Define.
15744         (INTPTR_TYPE, UINTPTR_TYPE): Define.
15745         (SIG_ATOMIC_TYPE): Define.
15747 2010-01-26  Richard Guenther  <rguenther@suse.de>
15749         * df-scan.c (df_scan_set_bb_info): Remove assert.
15750         (df_insn_rescan_debug_internal): Merge asserts.
15751         (df_install_ref): Likewise.
15752         (df_mark_reg): Use bitmap_set_range.
15753         (df_hard_reg_used_p): Remove assert.
15754         (df_hard_reg_used_count): Likewise.
15756 2010-01-26  Richard Guenther  <rguenther@suse.de>
15758         PR rtl-optimization/42685
15759         * web.c (web_main): Ignore DEBUG_INSNs.
15761 2010-01-26  Joern Rennecke  <amylaar@spamcop.net>
15763         * doc/tm.texi (TARGET_HANDLE_C_OPTION): Explain arguments.
15765         (TARGET_RESOLVE_OVERLOADED_BUILTIN): Add loc parameter.
15766         Fix types of fndecl and arglist parameters.
15768 2010-01-26  Richard Guenther  <rguenther@suse.de>
15770         PR middle-end/42806
15771         * tree-eh.c (unsplit_eh): Skip debug insns.
15773 2010-01-26  Richard Guenther  <rguenther@suse.de>
15775         PR tree-optimization/42250
15776         * ipa-type-escape.c (type_escape_execute): Do not analyze clones.
15778 2010-01-26  Jakub Jelinek  <jakub@redhat.com>
15780         PR fortran/42866
15781         * omp-low.c (expand_omp_sections): Only use single_pred if
15782         l2_bb is single_pred_p.
15784 2010-01-25  Christian Bruel  <christian.bruel@st.com>
15786         PR target/42841
15787         * config/sh/sh.c (find_barrier): Increase length for non delayed
15788         conditional branches.
15789         (sh_insn_length_adjustment): Use JUMP_TABLE_DATA_P.
15791 2010-01-24  David S. Miller  <davem@davemloft.net>
15793         * config/sparc/sysv4.h (TARGET_ASM_NAMED_SECTION): Only
15794         define if not using GAS.
15795         * config/sparc/sparc.c (sparc_elf_asm_named_section):
15796         Likewise.  Delete SECTION_MERGE code, which is only applicable
15797         when using GAS.
15799 2010-01-24  Mark Mitchell  <mark@codesourcery.com>
15801         PR c++/42748
15802         * config/arm/arm.c (arm_mangle_type): Do not warn about changes to
15803         mangling of va_list in system headers.
15805 2010-01-23  Toon Moene  <toon@moene.org>
15807         * tree-predcom.c (combine_chains): Return NULL, not false.
15809 2010-01-23  Joern Rennecke  <amylaar@spamcop.net>
15811         * tree-loop-distribution.c (distribute_loop): Fix declaration and
15812         initialization of variable res to agree with return type.
15814 2010-01-22  Steve Ellcey  <sje@cup.hp.com>
15816         * Makefile.in (tree-sra.o): Add $(EXPR_H) dependency.
15817         * tree-sra.c: Add include of expr.h.
15819 2010-01-22  Jakub Jelinek  <jakub@redhat.com>
15821         * tree-into-ssa.c (maybe_register_def): If stmt ends the bb,
15822         insert the debug stmt on the single non-EH edge from the stmt.
15824 2010-01-22  Richard Henderson  <rth@redhat.com>
15826         PR tree-opt/42833
15827         * tree-sra.c (sra_modify_assign): Delay re-gimplification of
15828         the RHS until after generate_subtree_copies has insertted its
15829         code before the current statement.
15831 2010-01-22  Joern Rennecke  <amylaar@spamcop.net>
15833         * doc/tm.texi (TARGET_MIN_DIVISIONS_FOR_RECIP_MUL): Fix return type.
15835         * gcc-plugin.h (plugin_init): Use "C" likage for c++.
15837 2010-01-21  Martin Jambor  <mjambor@suse.cz>
15839         PR tree-optimization/42585
15840         * tree-sra.c (struct access): New field grp_total_scalarization.
15841         (dump_access): Dump the new field.
15842         (should_scalarize_away_bitmap): New variable.
15843         (cannot_scalarize_away_bitmap): Likewise.
15844         (sra_initialize): Allocate new bitmaps.
15845         (sra_deinitialize): Free new bitmaps.
15846         (create_access_1): New function.
15847         (create_access): Parts moved to create_access_1.
15848         (type_consists_of_records_p): New function.
15849         (completely_scalarize_record): Likewise.
15850         (build_access_from_expr): Set bit in cannot_scalarize_away_bitmap.
15851         (build_accesses_from_assign): Set bits in should_scalarize_away_bitmap.
15852         (sort_and_splice_var_accesses): Hint groups with a total_scalarization
15853         access.
15854         (analyze_all_variable_accesses): Completely scalarize small eligible
15855         records.
15857 2010-01-21  Martin Jambor  <mjambor@suse.cz>
15859         * tree-sra.c (build_ref_for_offset_1): Allow for zero size fields.
15861 2010-01-21  Andrew Haley  <aph@redhat.com>
15863         * gcc.c (process_command): Move lang_specific_driver before
15864         setting cc_libexec_prefix.
15866 2010-01-21  Richard Guenther  <rguenther@suse.de>
15868         PR middle-end/19988
15869         * fold-const.c (negate_expr_p): Pretend only negative
15870         real constants are easily negatable.
15872 2010-01-20  Janis Johnson  <janis187@us.ibm.com>
15873             Jason Merrill  <jason@redhat.com>
15875         * tree.h (TYPE_TRANSPARENT_UNION): Replace with ...
15876         (TYPE_TRANSPARENT_AGGR): this, for union and record.
15877         * calls.c (initialize argument_information): Handle it.
15878         * c-common.c (handle_transparent_union_attribute): Use new name.
15879         * c-decl.c (finish_struct): Ditto.
15880         * c-typeck.c (type_lists_compatible_p): Ditto.
15881         (convert_for_assignment): Use new name and also handle record.
15882         * function.c (aggregate_value_p): Handle it.
15883         (pass_by_reference): Ditto.
15884         (assign_parm_data_types): Ditto.
15885         * print-tree.c (print_node): Ditto.
15886         * lto-streamer-in.c (unpack_ts_type_value_fields): Ditto.
15887         * lto-streamer-out.c (pack_ts_type_value_fields): Ditto.
15888         * tree.c (first_field): New fn.
15890 2010-01-21  Dave Korn  <dave.korn.cygwin@gmail.com>
15892         PR target/42818
15893         * config/i386/cygwin.h (CXX_WRAP_SPEC_LIST): Always apply wrappers,
15894         even when linking statically, for now.
15896 2010-01-20  Alexandre Oliva  <aoliva@redhat.com>
15898         PR debug/42715
15899         * var-tracking.c (use_type): Choose MO_VAL_SET for REGs set
15900         without a cselib val.
15901         (count_uses): Accept MO_VAL_SET with no val on stores.
15902         (add_stores): Likewise.
15904 2010-01-20  Jakub Jelinek  <jakub@redhat.com>
15906         * var-tracking.c (check_value_val): Add a compile time assertion.
15907         (dv_is_decl_p): Simplify.
15908         (dv_as_decl, dv_as_value, dv_from_decl, dv_from_value): Only use
15909         gcc_assert if ENABLE_CHECKING.
15911 2010-01-20  Alexandre Oliva  <aoliva@redhat.com>
15913         PR debug/42782
15914         * var-tracking.c: Include tree-flow.h.
15915         (mem_dies_at_call): New.
15916         (dataflow_set_preserve_mem_locs): Use it.
15917         (dataflow_set_remove_mem_locs): Likewise.
15918         (dump_var): Renamed from dump_variable.  Adjust all callers.
15919         (dump_var_slot): Renamed from dump_variable_slot.  Likewise.
15920         * Makefile.in (var-tracking.o): Adjust deps.
15922 2010-01-20  Joern Rennecke  <amylaar@spamcop.net>
15924         * doc/tm.texi (TARGET_SCHED_SET_SCHED_FLAGS): Fix argument list.
15926 2010-01-20  Richard Guenther  <rguenther@suse.de>
15928         PR tree-optimization/42717
15929         * tree-ssa-dce.c (get_live_post_dom): Remove.
15930         (forward_edge_to_pdom): Take an arbitrary edge to copy
15931         degenerate PHI args from.
15932         (remove_dead_stmt): Use the first post-dominator even if it
15933         does not contain live statements as redirection destination.
15935 2010-01-20  Richard Guenther  <rguenther@suse.de>
15937         * tree-inline.c (estimate_num_insns): Handle EH builtins.
15939 2010-01-20  Jakub Jelinek  <jakub@redhat.com>
15941         * sel-sched.c (create_speculation_check): Remove set but not used
15942         variable twin.
15943         (try_transformation_cache): Remove set but not used variable ds.
15944         (calculate_privileged_insns): Remove set but not used variables
15945         cur_insn and min_spec_insn.
15946         (find_best_expr): Remove set but not used variable avail_n.
15947         * tree-predcom.c (base_names_in_chain_on): Remove set but not used
15948         variable e.
15949         * cgraphunit.c (assemble_thunk): Remove set but not used variable
15950         false_label.
15951         * haifa-sched.c (remove_notes): Remove set but not used variable prev.
15952         * graphite-clast-to-gimple.c (gloog): Remove set but not used variable
15953         new_scop_exit_edge.
15955 2010-01-20  Felyza Wishbringer  <fwishbringer@gmail.com>
15957         PR bootstrap/42786
15958         * config.gcc (i[34567]86-*-*): Fix handling of athlon64 and athlon-fx
15959         cpu types.  Add support for *-sse3 cpu types.
15960         (x86_64-*-*): Ditto.
15962 2010-01-20  Jakub Jelinek  <jakub@redhat.com>
15964         PR middle-end/42803
15965         * varasm.c (narrowing_initializer_constant_valid_p): Add CACHE
15966         argument, call initializer_constant_valid_p_1 instead of
15967         initializer_constant_valid_p, pass CACHE to it, return NULL
15968         immediately if first call returns NULL.
15969         (initializer_constant_valid_p_1): New function.
15970         (initializer_constant_valid_p): Use it.
15972 2010-01-20  Thomas Quinot  <quinot@adacore.com>
15974         * tree.def (PLACEHOLDER_EXPR): Fix comment.
15976 2010-01-20  Jakub Jelinek  <jakub@redhat.com>
15978         * dwarf2out.c (mem_loc_descriptor): Use DW_OP_mod for UMOD instead
15979         of MOD, handle MOD using DW_OP_{over,over,div,mul,minus}.
15980         (loc_list_from_tree): Don't handle unsigned division.  Handle
15981         signed modulo using DW_OP_{over,over,div,mul,minus}.
15982         * unwind-dw2.c (execute_stack_op): Handle DW_OP_mod using unsigned
15983         modulo instead of signed.
15985 2010-01-20  DJ Delorie  <dj@redhat.com>
15987         * config/h8300/h8300.c (F): Add "in_epilogue" flag.
15988         (Fpa): Pass it
15989         (h8300_emit_stack_adjustment): Propogate it.
15990         (push): Pass it.
15991         (h8300_expand_prologue): Likewise.
15992         (h8300_expand_epilogue): Likewise.
15994 2010-01-19  Michael Matz  <matz@suse.de>
15996         PR tree-optimization/41783
15997         * tree-data-ref.c (toplevel): Include flags.h.
15998         (dump_data_dependence_relation):  Also dump the inputs if the
15999         result will be unknown.
16000         (split_constant_offset_1): Look through some conversions.
16001         * tree-predcom.c (determine_roots_comp): Restart a new chain if
16002         the offset from last element is too large.
16003         (ref_at_iteration): Deal also with MISALIGNED_INDIRECT_REF.
16004         (reassociate_to_the_same_stmt): Handle vector registers.
16005         * tree-vect-data-refs.c (vect_equal_offsets): Handle unary operations
16006         (e.g. conversions).
16007         * tree-vect-loop-manip.c (vect_gen_niters_for_prolog_loop): Add
16008         wide_prolog_niters argument, emit widening instructions.
16009         (vect_do_peeling_for_alignment): Adjust caller, use widened
16010         variant of the iteration cound.
16011         * Makefile.in (tree-data-ref.o): Add $(FLAGS_H).
16013 2010-01-19  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
16015         PR target/38697
16016         * config/arm/neon-testgen.m (emit_automatics): New parameter
16017         features. Adjust for Fixed_return_reg feature.
16018         (test_intrinsic): Call emit_automatics with new feature.
16019         * config/arm/neon.ml: Update copyright years.
16020         (features): New Fixed_return_reg feature.
16021         (ops): Update feature for Vget_low.
16023 2010-01-19  Jakub Jelinek  <jakub@redhat.com>
16025         PR tree-optimization/42719
16026         * tree-outof-ssa.c (trivially_conflicts_p): Don't consider debug
16027         stmt uses.
16029         PR debug/42728
16030         * fwprop.c (all_uses_available_at): Return false if def_set dest
16031         is a REG that is used in def_insn.
16033 2010-01-19  Joern Rennecke  <amylaar@spamcop.net>
16035         * doc/tm.texi (TARGET_FIXED_CONDITION_CODE_REGS): Add argument names.
16037         (TARGET_CC_MODES_COMPATIBLE): Put return value in braces.
16038         Add argument names.
16040         (TARGET_SCHED_INIT_SCHED_CONTEXT): Clarify language.
16042         * target.h (struct gcc_target) <secondary_reload>: Change type
16043         of last argument to secondary_reload_info *.
16045 2010-01-18  Uros Bizjak  <ubizjak@gmail.com>
16047         PR target/42774
16048         * config/alpha/predicates.md (aligned_memory_operand): Return 0 for
16049         memory references with unaligned offsets.  Remove CQImode handling.
16050         (unaligned_memory_operand): Return 1 for memory references with
16051         unaligned offsets.  Remove CQImode handling.
16053 2010-01-18  Richard Guenther  <rguenther@suse.de>
16055         PR middle-end/39954
16056         * cfgexpand.c (expand_call_stmt): TER pointer arguments in
16057         builtin calls.
16059 2010-01-18  Richard Guenther  <rguenther@suse.de>
16061         PR tree-optimization/42781
16062         * tree-ssa-structalias.c (find_what_var_points_to): Skip
16063         restrict processing only if the original variable was artificial.
16065 2010-01-18  Joern Rennecke  <amylaar@spamcop.net>
16067         * doc/tm.texi (TARGET_ASM_FUNCTION_EPILOGUE): Update text on where to
16068         find number of popped argument bytes.
16070         (TARGET_INVALID_WITHIN_DOLOOP): Put return value in braces.
16071         Fix the text that describes the return value for invalid insns.
16073         (TARGET_SCHED_NEEDS_BLOCK_P): Fix return type.  Fix argument list.
16075         (TARGET_SCHED_IS_COSTLY_DEPENDENCE): Fix argument types.
16076         Clarify what 'cost of the -dependence' is.  Fix quoting.
16078         * toplev.c (default_get_pch_validity): Rename argument to "sz".
16079         * doc/tm.texi (TARGET_GET_PCH_VALIDITY): Likewise.
16081 2010-01-17  Jakub Jelinek  <jakub@redhat.com>
16083         * dwarf2out.c (mem_loc_descriptor): Don't ICE on
16084         {S,U}S_{PLUS,MINUS,NEG,ABS,ASHIFT}.
16086 2010-01-17  Richard Guenther  <rguenther@suse.de>
16088         PR middle-end/42248
16089         * function.c (split_complex_args): Take a VEC to modify.
16090         (assign_parms_augmented_arg_list): Build a VEC instead of
16091         a chain of PARM_DECLs.
16092         (assign_parms_unsplit_complex): Take a VEC of arguments.
16093         Do not fixup unmodified parms.
16094         (assign_parms): Deal with the VEC.
16095         (gimplify_parameters): Likewise.
16097 2010-01-17  Richard Guenther  <rguenther@suse.de>
16099         * tree-ssa-uncprop.c (uncprop_into_successor_phis): Fix PHI
16100         node existence check.
16101         * tree-vect-loop.c (vect_analyze_loop_form): Likewise.
16102         * tree-cfgcleanup.c (merge_phi_nodes): Likewise.
16103         * tree-ssa-dce.c (forward_edge_to_pdom): Likewise.
16104         * tree-cfg.c (gimple_execute_on_growing_pred): Likewise.
16105         (gimple_execute_on_growing_pred): Likewise.
16107 2010-01-17  Richard Guenther  <rguenther@suse.de>
16109         PR tree-optimization/42773
16110         * tree-ssa-pre.c (phi_translate_set): Fix check for PHI node existence.
16111         (compute_antic_aux): Likewise.
16112         (compute_partial_antic_aux): Likewise.
16114 2010-01-17  Jie Zhang  <jie.zhang@analog.com>
16116         PR debug/42767
16117         * dwarf2out.c (mem_loc_descriptor): Handle SS_TRUNCATE
16118         and US_TRUNCATE.
16120 2010-01-17  Joern Rennecke  <amylaar@spamcop.net>
16122         * doc/tm.texi (TARGET_INIT_LIBFUNCS): Put @findex entries in order of
16123         appearance.
16125         (TARGET_LEGITIMATE_ADDRESS_P): Add return type.
16126         Fix markup for strict argument.
16128         (TARGET_SCHED_REORDER2): Fix argument types.
16130         (TARGET_SCHED_DFA_PRE_CYCLE_INSN): Fix return type.
16131         (TARGET_SCHED_DFA_POST_CYCLE_INSN): Likewise.
16133         (TARGET_SCHED_DFA_PRE_ADVANCE_CYCLE): Fix name.
16134         (TARGET_SCHED_DFA_POST_ADVANCE_CYCLE): Likewise.
16136         (TARGET_SCHED_FIRST_CYCLE_MULTIPASS_DFA_LOOKAHEAD_GUARD):
16137         Add argument name.
16139         (TARGET_SCHED_ALLOC_SCHED_CONTEXT): Remove duplicate documentation.
16140         (TARGET_SCHED_INIT_SCHED_CONTEXT): Likewise.
16141         (TARGET_SCHED_SET_SCHED_CONTEXT): Likewise.
16142         (TARGET_SCHED_CLEAR_SCHED_CONTEXT): Likewise.
16143         (TARGET_SCHED_FREE_SCHED_CONTEXT): Likewise.
16145         (TARGET_SCHED_SET_SCHED_CONTEXT): Fix typo.
16147         (TARGET_SCHED_GEN_SPEC_CHECK): Fix name.
16149         (TARGET_ASM_RELOC_RW_MASK): Add return type.
16150         (TARGET_MANGLE_DECL_ASSEMBLER_NAME): Fix return type.
16152         (TARGET_STRIP_NAME_ENCODING): Fix markup of return type and parameter.
16154         (TARGET_ASM_FILE_START): Put @findex before paragraph start.
16155         Use prototype.
16157         (TARGET_ASM_NAMED_SECTION): Fix argument list.
16159         (TARGET_HAVE_NAMED_SECTIONS): Use @deftypevr.
16160         (TARGET_HAVE_SWITCHABLE_BSS_SECTIONS): Likewise.
16162         (TARGET_ASM_RECORD_GCC_SWITCHES_SECTION): Use @deftypevr.
16164         (TARGET_ASM_ASSEMBLE_VISIBILITY): Fix argument types.
16166         (TARGET_ASM_MARK_DECL_PRESERVED): Fix argument and markup
16167         referring to it.  Fix language.
16169         (TARGET_HAVE_CTORS_DTORS): Use @deftypevr.
16171         (TARGET_ASM_FINAL_POSTSCAN_INSN): Adjust name of first argument.
16173         (TARGET_ASM_EMIT_UNWIND_LABEL): Add argument types.
16175         (TARGET_ASM_EMIT_EXCEPT_TABLE_LABEL): Add type to argument.
16177         (TARGET_UNWIND_EMIT): Remove space between 'FILE *' and
16178         '@var{stream}.  Remove stray 'and'.
16180         (TARGET_ARM_EABI_UNWINDER): Use @deftypevr.
16182         (TARGET_ASM_OUTPUT_DWARF_DTPREL): Adjust name of first argument.
16184         (TARGET_SET_DEFAULT_TYPE_ATTRIBUTES): Add missing article.
16186         (TARGET_OPTION_VALID_ATTRIBUTE_P): Fix name, it was
16187         misspelled as TARGET_VALID_OPTION_ATTRIBUTE_P.
16189         (TARGET_GET_PCH_VALIDITY): Put 'void *' in braces.
16190         Fix description of return value.
16191         Rename argument "sz" to "len."
16193         (TARGET_CXX_GUARD_MASK_BIT): Add missing article.
16194         Clarify meaning of 'true' return value.
16196         (TARGET_SHIFT_TRUNCATION_MASK): Fix return type.
16198         (TARGET_MODE_REP_EXTENDED): Fix two inconsisent uses of
16199         rep_mode versus mode_rep.
16201         (TARGET_HANDLE_PRAGMA_EXTERN_PREFIX): Document.
16203         (TARGET_BUILTIN_DECL): Fix name.
16205         (TARGET_COMMUTATIVE_P): Fix type of first argument.
16207         (TARGET_SET_CURRENT_FUNCTION): Mention possibility of cfun being NULL.
16209         (TARGET_BRANCH_TARGET_REGISTER_CLASS): Fix return type.
16211         (TARGET_USE_LOCAL_THUNK_ALIAS_P): Document as macro instead of hook.
16213         (TARGET_RELAXED_ORDERING): Use @deftypevr.
16215         (TARGET_GET_DRAP_RTX): Note that this is a hook.
16216         Clarify language.
16218         (TARGET_BUILTIN_RECIPROCAL): Fix argument types.
16219         Rename argument tm_fn to md_fn.
16221         (TARGET_OPTION_PRINT): Fix argument list.
16223 2010-01-16  Harsha Jagasia  <harsha.jagasia@amd.com>
16225         PR target/42664
16226         * config/i386/i386.c (ix86_fixup_binary_operands):
16227         Revert FMA4 fixup of operands.
16229 2010-01-16  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
16231         PR gcc/42525
16232         * Makefile.in (write_entries_to_file, install-plugin):
16233         Use \012 instead of \n with tr.
16235 2010-01-16  Richard Sandiford  <r.sandiford@uk.ibm.com>
16237         * configure.ac (HAVE_AS_REF): New C macro.
16238         * configure: Regenerate.
16239         * config.in: Likewise.
16240         * collect2.c (main): Only postpone SCAN_DWEH to the second pass
16241         if HAVE_AS_REF.
16242         * config/rs6000/aix.h (ASM_OUTPUT_DWARF_TABLE_REF): Only define
16243         if HAVE_AS_REF.
16245 2010-01-16  Joern Rennecke  <amylaar@spamcop.net>
16247         * doc/tm.texi (TARGET_USE_BLOCKS_FOR_CONSTANT_P): Fix argument types.
16249         (TARGET_SUPPORT_VECTOR_MISALIGNMENT): Fix argument types.
16251         (TARGET_USE_ANCHORS_FOR_SYMBOL_P): Fix argument types.
16253         (TARGET_SCHED_ALLOC_SCHED_CONTEXT): Put 'void *' in braces.
16255         (TARGET_IN_SMALL_DATA_P): Fix argument type.
16257         (TARGET_BINDS_LOCAL_P): Fix argument type.
16259         (TARGET_ASM_FILE_END): Use prototype.
16261         (TARGET_ASM_RECORD_GCC_SWITCHES): Don't put 'int' in braces.
16263         (TARGET_DWARF_CALLING_CONVENTION): Fix argument type.
16265         (TARGET_COMP_TYPE_ATTRIBUTES): Fix argument types.
16267         (TARGET_VALID_DLLIMPORT_ATTRIBUTE_P): Fix argument type.
16269         (TARGET_EMUTLS_VAR_ALIGN_FIXED): Don't put 'bool' in braces.
16270         (TARGET_EMUTLS_DEBUG_FORM_TLS_ADDRESS): Likewise.
16272         (TARGET_PCH_VALID_P): Put 'const char *' in braces.
16273         (TARGET_CHECK_PCH_TARGET_FLAGS): Likewise.
16275         (TARGET_ADDR_SPACE_LEGITIMATE_ADDRESS_P): Don't put 'bool' in braces.
16276         (TARGET_ADDR_SPACE_SUBSET_P): Likewise.
16277         (TARGET_ADDR_SPACE_LEGITIMIZE_ADDRESS): Don't put 'rtx' in braces.
16278         (TARGET_ADDR_SPACE_CONVERT): Likewise.
16280         (TARGET_CASE_VALUES_THRESHOLD): Put 'unsigned int' in braces.
16282         (TARGET_MACHINE_DEPENDENT_REORG: Use prototype.
16284         (TARGET_INIT_BUILTINS): Use prototype.
16286         (TARGET_INVALID_ARG_FOR_UNPROTOTYPED_FN):
16287         Put 'const char *' in braces.  Fix parameter types.
16288         (TARGET_INVALID_CONVERSION): Fix parameter types.
16289         (TARGET_INVALID_UNARY_OP, TARGET_INVALID_BINARY_OP): Likewise.
16290         (TARGET_INVALID_PARAMETER_TYPE, TARGET_INVALID_RETURN_TYPE): Likewise.
16292         (TARGET_PROMOTED_TYPE): Remove braces around 'tree'.
16293         Fix argument type.
16295         (TARGET_CONVERT_TO_TYPE): Remove braces around 'tree'.
16297         (TARGET_ALLOCATE_STACK_SLOTS_FOR_ARGS): Remove braces around 'bool'.
16299 2010-01-15  Joern Rennecke  <amylaar@spamcop.net>
16301         * doc/tm.texi (TARGET_HELP): Fix return type.
16303         (TARGET_PROMOTE_FUNCTION_MODE): Put 'enum machine_mode'
16304         in braces.  Fix argument types.
16306         (TARGET_LIBGCC_CMP_RETURN_MODE): Use prototype.
16308         (TARGET_LIBGCC_SHIFT_COUNT_MODE): Use prototype.
16310         (TARGET_MS_BITFIELD_LAYOUT_P): Fix argument type.
16312         (TARGET_DECIMAL_FLOAT_SUPPORTED_P): Don't put 'bool' in braces.
16313         (TARGET_FIXED_POINT_SUPPORTED_P): Likewise.
16315         (TARGET_MANGLE_TYPE): Fix argument types.
16317         (TARGET_IRA_COVER_CLASSES): Use prototype.
16319         (TARGET_BUILTIN_SETJMP_FRAME_VALUE): Fix return type.  Use prototype.
16321         (TARGET_CAN_ELIMINATE): Use identifiers for argument names.
16323         (TARGET_PROMOTE_PROTOTYPES): Fix argument type.
16325         (TARGET_MUST_PASS_IN_STACK): Fix argument type.
16327         (TARGET_CALLEE_COPIES): Fix argument types.
16329         (TARGET_SPLIT_COMPLEX_ARG): Fix argument type.
16331         (TARGET_GIMPLIFY_VA_ARG_EXPR): Fix argument types.
16333         (TARGET_FUNCTION_VALUE): Fix argument types.
16335         (TARGET_RETURN_IN_MSB): Fix argument type.
16337         (TARGET_RETURN_IN_MEMORY): Fix argument types.
16339         (TARGET_ASM_CAN_OUTPUT_MI_THUNK): Fix argument types.
16341         (TARGET_EXTRA_LIVE_ON_ENTRY): Fix argument type.
16343         (TARGET_STRICT_ARGUMENT_NAMING): Make literal in text
16344         agree with return type.
16346         (TARGET_PRETEND_OUTGOING_VARARGS_NAMED): Add Prototype.
16348 2010-01-15  Jing Yu  <jingyu@google.com>
16350         PR rtl-optimization/42691
16351         * combine.c (try_combine): Set changed_i3_dest to 1 when I2 and I3 set
16352         a pseudo to a constant and are merged, and adjust comments.
16354 2010-01-15  Eric Botcazou  <ebotcazou@adacore.com>
16356         * config/i386/sse.md (avx_vperm2f128<mode>3): Fix typo.
16358 2010-01-15  Richard Guenther  <rguenther@suse.de>
16360         PR middle-end/42739
16361         * tree-cfgcleanup.c (remove_forwarder_block): Move destination
16362         labels of computed or non-local gotos to the destination.
16363         * tree-cfg.c (gimple_verify_flow_info): Verify that a EH
16364         landing pad label is the first label.
16366 2010-01-15  Richard Guenther  <rguenther@suse.de>
16368         * tree-ssa-loop-im.c (gen_lsm_tmp_name): Fix bogus fallthru.
16370 2010-01-14  Michael Meissner  <meissner@linux.vnet.ibm.com>
16372         PR target/42747
16373         * config/rs6000/rs6000.md (sqrtdf2): Split into expander and insn
16374         to allow generation of the xssqrtdp instruction on power7.
16375         (sqrtdf2_fpr): Ditto.
16377 2010-01-14  Jakub Jelinek  <jakub@redhat.com>
16379         PR middle-end/42674
16380         * c-decl.c (finish_function): Don't emit -Wreturn-type warnings in
16381         functions with noreturn attribute.
16383         PR c++/42608
16384         * varasm.c (declare_weak): Add weak attribute to decl if it
16385         doesn't have one already.
16386         (assemble_external): Only add decls to weak_decls if they also
16387         have weak attribute.
16389 2010-01-14  Alexandre Oliva  <aoliva@redhat.com>
16391         * var-tracking.c (var_reg_delete): Don't delete the association
16392         between REGs and values or one-part variables if the register
16393         isn't clobbered.
16395 2010-01-14  Jakub Jelinek  <jakub@redhat.com>
16397         PR debug/42657
16398         * tree-inline.c (copy_debug_stmt): Don't reset debug stmt just
16399         because its first operand is a non-localized variable.
16401 2010-01-14  Martin Jambor  <mjambor@suse.cz>
16403         PR tree-optimization/42706
16404         * tree-sra.c (encountered_recursive_call): New variable.
16405         (encountered_unchangable_recursive_call): Likewise.
16406         (sra_initialize): Initialize both new variables.
16407         (callsite_has_enough_arguments_p): New function.
16408         (scan_function): Call decl and flags check only for IPA-SRA, check
16409         whether there is a recursive call and whether it has enough arguments.
16410         (all_callers_have_enough_arguments_p): New function.
16411         (convert_callers): Look for recursive calls only when
16412         encountered_recursive_call is set.
16413         (ipa_early_sra): Bail out either if
16414         !all_callers_have_enough_arguments_p or
16415         encountered_unchangable_recursive_call.
16417 2010-01-14  Alexander Monakov  <amonakov@ispras.ru>
16419         * sel-sched.c: Add 2010 to copyright years.
16420         * sel-sched-ir.c: Likewise.
16421         * sel-sched-ir.h: Likewise.
16423 2010-01-14  Martin Jambor  <mjambor@suse.cz>
16425         PR tree-optimization/42714
16426         * tree-sra.c (sra_ipa_modify_assign): Handle incompatible-type
16427         constructors specially.
16429 2010-01-14  Andi Kleen  <ak@linux.intel.com>
16431         * config/i386/drivers-i386.c (detect_caches_intel):
16432         Add l2sizekb parameter and fill in.
16433         (host_detect_local_cpu): Add l2sizekb, fill in.
16434         Add Atom small cache heuristic.
16436 2010-01-14  Andi Kleen  <ak@linux.intel.com>
16438         * config/i386/drivers-i386.c (detect_caches_cpuid4):
16439         Add level3 parameter and fill in.
16440         (detect_caches_intel): Handle level3 cache.
16442 2010-01-14  Andi Kleen  <ak@linux.intel.com>
16444         * config/i386/drivers-i386.c (host_detect_local_cpu):
16445         Fix core duo detection.
16447 2010-01-14  Andi Kleen  <ak@linux.intel.com>
16449         * config/i386/drivers-i386.c (host_detect_local_cpu):
16450         Fix Atom detection.
16452 2010-01-14  Alexander Monakov  <amonakov@ispras.ru>
16454         * config/rs6000/rs6000.c (rs6000_variable_issue): Rename to...
16455         (rs6000_variable_issue_1): this.  Use...
16456         (rs6000_variable_issue): here.  Reimplement.  Print debug info.
16458 2010-01-14  Alexander Monakov  <amonakov@ispras.ru>
16460         * sel-sched-ir.c (sel_restore_other_notes): Rename to
16461         sel_restore_notes.  Update all callers.  Call reemit_notes
16462         for all insns.
16464 2010-01-14  Andrey Belevantsev  <abel@ispras.ru>
16466         PR rtl-optimization/42246
16467         * sel-sched-ir.h (get_all_loop_exits): Include exits from inner
16468         loops.
16470 2010-01-14  Andrey Belevantsev  <abel@ispras.ru>
16472         * sel-sched.c (compute_av_set_at_bb_end): Do not test that number of
16473         all successors is the same as number of successors in current region.
16475 2010-01-14  Alexander Monakov  <amonakov@ispras.ru>
16477         * sel-sched.c (maybe_emit_renaming_copy): Exit early when expression
16478         to rename is not separable.  Otherwise check that its LHS is not NULL.
16480 2010-01-14  Alexander Monakov  <amonakov@ispras.ru>
16482         * sel-sched.c (choose_best_reg_1):  Loop over all regs for mode.
16484 2010-01-14  Alexander Monakov  <amonakov@ispras.ru>
16486         * sel-sched.c (mark_unavailable_hard_regs): Do not try to search
16487         available registers when failed to discover LHS register class.
16488         Fix indentation.  Update comment.
16490 2010-01-14  Andrey Belevantsev  <abel@ispras.ru>
16491             Alexander Monakov  <amonakov@ispras.ru>
16493         PR rtl-optimization/42389
16494         * sel-sched.c (advance_one_cycle): Set FENCE_ISSUE_MORE
16495         to can_issue_more.
16496         (advance_state_on_fence): Likewise.
16497         (sel_target_adjust_priority): Print debug output only when
16498         sched_verbose >= 4, not 2.
16499         (get_expr_cost): Do not issue all unique insns on the next cycle.
16500         (fill_insns): Initialize can_issue_more from the value saved
16501         with the fence.
16502         * sel-sched-ir.c (flist_add): New parameter issue_more.
16503         Init FENCE_ISSUE_MORE with it.
16504         (merge_fences): Likewise.
16505         (init_fences): Update call to flist_add.
16506         (add_to_fences, add_clean_fence_to_fences)
16507         (add_dirty_fence_to_fences): Likewise.
16508         (move_fence_to_fences): Update call to merge_fences.
16509         (invoke_reorder_hooks): Do not reset can_issue_more on insns from
16510         sched groups.
16511         * sel-sched-ir.h (struct _fence): New field issue_more.
16512         (FENCE_ISSUE_MORE): New accessor macro.
16514 2010-01-14  Andrey Belevantsev  <abel@ispras.ru>
16516         PR rtl-optimization/42388
16517         * sel-sched-ir.c (maybe_tidy_empty_bb): Do not delete empty blocks
16518         that have no predecessors nor successors.  Do not call move_bb_info
16519         for empty blocks outside of current region.
16521 2010-01-14  Alexander Monakov  <amonakov@ispras.ru>
16523         PR rtl-optimization/42294
16524         * sel-sched-ir.h (struct _sel_insn_data): Update comment.
16525         * sel-sched.c (move_exprs_to_boundary): Transitively add all
16526         originators' originators.
16528 2010-01-14  Alexander Monakov  <amonakov@ispras.ru>
16530         PR rtl-optimization/39453
16531         PR rtl-optimization/42246
16532         * sel-sched-ir.c (considered_for_pipelining_p): Do not test
16533         for pipelining_p.
16534         (sel_add_loop_preheaders): Add preheader to last_added_blocks.
16536 2010-01-14  Andrey Belevantsev  <abel@ispras.ru>
16537             Alexander Monakov  <amonakov@ispras.ru>
16539         PR middle-end/42245
16540         * sel-sched-ir.c (sel_recompute_toporder): New.  Use it...
16541         (maybe_tidy_empty_bb): ... here.  Make static.  Add new
16542         argument.  Update all callers.
16543         (tidy_control_flow): ... and here.  Recompute topological order
16544         of basic blocks in region if necessary.
16545         (sel_redirect_edge_and_branch): Change return type.  Return true
16546         if topological order might have been invalidated.
16547         (purge_empty_blocks): Export and move from...
16548         * sel-sched.c (purge_empty_blocks): ... here.
16549         * sel-sched-ir.h (sel_redirect_edge_and_branch): Update prototype.
16550         (maybe_tidy_empty_bb): Delete prototype.
16551         (purge_empty_blocks): Declare.
16553 2010-01-14  Andrey Belevantsev <abel@ispras.ru>
16555         PR rtl-optimization/42249
16556         * sel-sched.c (try_replace_dest_reg): When chosen register
16557         and original register is the same, do not bail out early, but
16558         still check all original insns for validity of replacing destination
16559         register.  Set EXPR_TARGET_AVAILABLE to 1 before leaving function
16560         in this case.
16562 2010-01-14  Jakub Jelinek  <jakub@redhat.com>
16564         PR c/42721
16565         Port from no-undefined-overflow branch:
16566         2009-03-09  Richard Guenther  <rguenther@suse.de>
16568         * fold-const.c (add_double_with_sign): Fix unsigned overflow detection.
16570 2010-01-14  Richard Guenther  <rguenther@suse.de>
16572         PR lto/42665
16573         * gimple.c (iterative_hash_gimple_type): Avoid hashing error_mark_node.
16575 2010-01-14  Ira Rosen  <irar@il.ibm.com>
16577         PR tree-optimization/42709
16578         * tree-vect-slp.c (vect_get_constant_vectors): Use constant's type
16579         as scalar type in creation of constant vector operand.
16581 2010-01-14  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
16583         PR testsuite/42414
16584         * Makefile.in ($(TESTSUITEDIR)/site.exp, check-%)
16585         (check-parallel-%): Match `testsuite' directory component only
16586         at the end.
16588 2010-01-14  Shujing Zhao  <pearly.zhao@oracle.com>
16590         PR translation/39521
16591         * gcc.c (do_spec_1): Wrapped the error and notice messages of specs
16592         strings with _().
16594 2010-01-13  Richard Guenther  <rguenther@suse.de>
16596         PR tree-optimization/42730
16597         * tree-ssa-ccp.c (maybe_fold_stmt_indirect): Add shortcut for
16598         offset zero.
16600 2010-01-13  Steve Ellcey  <sje@cup.hp.com>
16602         PR target/pr42542
16603         * config/ia64/ia64.c (ia64_expand_vecint_compare): Convert GTU to GT
16604         for V2SI by subtracting (-(INT MAX) - 1) from both operands to make
16605         them signed.
16607 2010-01-13  Bernd Schmidt  <bernd.schmidt@analog.com>
16609         * config/bfin/libgcc-bfin.ver: Regenerate based on current
16610         libgcc-std.ver.  Add entries for ___smulsi3_highpart and
16611         ___umulsi3_highpart.
16613         * config/bfin/bfin.c (bfin_reorg): Call run_selective_scheduling
16614         rather than schedule_insns if the pass is enabled.
16616 2010-01-13  Martin Jambor  <mjambor@suse.cz>
16618         PR tree-optimization/42704
16619         * tree-sra.c (sra_modify_assign): Do not delete assignments to
16620         SSA_NAMEs.
16622 2010-01-13  Martin Jambor  <mjambor@suse.cz>
16624         PR tree-optimization/42703
16625         * tree-sra.c (analyze_access_subtree): Check that we can build a
16626         reference to the original data within the aggregate.
16628 2010-01-13  Richard Guenther  <rguenther@suse.de>
16630         PR tree-optimization/42705
16631         * tree-ssa-reassoc.c (build_and_add_sum): Insert stmts after labels.
16633 2010-01-13  Richard Guenther  <rguenther@suse.de>
16635         PR middle-end/42716
16636         * fold-const.c (fold_unary_loc): Fold INDIRECT_REFs.
16638 2010-01-13  Jakub Jelinek  <jakub@redhat.com>
16640         PR debug/41371
16641         * var-tracking.c (values_to_unmark): New variable.
16642         (find_loc_in_1pdv): Clear VALUE_RECURSED_INTO of values in
16643         values_to_unmark vector.  Moved body to...
16644         (find_loc_in_1pdv_1): ... this.  Don't clear VALUE_RECURSED_INTO,
16645         instead queue it into values_to_unmark vector.
16646         (vt_find_locations): Free values_to_unmark vector.
16648 2010-01-13  Wolfgang Gellerich  <gellerich@de.ibm.com>
16650         * config/s390/s390.c (override_options): Set
16651         default of max-pending-list-length to 256
16653 2010-01-13  Richard Guenther  <rguenther@suse.de>
16655         PR lto/42678
16656         * tree-pass.h (PROP_gimple_lcx): New.
16657         * cfgexpand.c (pass_expand): Require PROP_gimple_lcx.
16658         * passes.c (init_optimization_passes): Move pass_lower_complex_O0
16659         before the final cleanup_eh.
16660         (dump_properties): Dump PROP_gimple_lcx.
16661         * tree-complex.c (pass_lower_complex): Provide PROP_gimple_lcx.
16662         (tree_lower_complex_O0): Remove.
16663         (gate_no_optimization): Run if PROP_gimple_lcx is not set.
16664         (pass_lower_complex_O0): Provide PROP_gimple_lcx.  Run
16665         tree_lower_complex, schedule TODO_update_ssa.
16666         * lto-streamer-out.c (output_function): Stream the functions
16667         properties.
16668         * lto-streamer-in.c (input_function): Likewise.
16669         (lto_read_body): Do not override them here.
16671 2010-01-12  Joseph Myers  <joseph@codesourcery.com>
16673         PR c/42708
16674         * c-typeck.c (build_c_cast): Fold value cast to union type before
16675         wrapping it in a CONSTRUCTOR.
16677 2010-01-12  Jakub Jelinek  <jakub@redhat.com>
16679         PR rtl-optimization/42699
16680         * cse.c (cse_insn): Optimize lhs ZERO_EXTRACT if only CONST_INTs are
16681         involved.
16683 2010-01-12  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
16685         * config/mips/iris6.h (SUBTARGET_DONT_WARN_UNUSED_SPEC,
16686         SUBTARGET_WARN_UNUSED_SPEC): Move ...
16687         config/mips/iris.h (SUBTARGET_DONT_WARN_UNUSED_SPEC,
16688         SUBTARGET_WARN_UNUSED_SPEC): ... here
16689         * config/mips/iris5.h (LIBGCC_SPEC): Define.
16691 2010-01-12  Julian Brown  <julian@codesourcery.com>
16693         * config/arm/neon-schedgen.ml (Utils): Don't try to
16694         open missing module.
16695         (find_with_result): New.
16697 2010-01-12  Jakub Jelinek  <jakub@redhat.com>
16699         PR debug/42662
16700         * simplify-rtx.c (simplify_relational_operation_1): Avoid invalid rtx
16701         sharing when canonicalizing ({lt,ge}u (plus a b) b).
16703         PR tree-optimization/42645
16704         * tree-inline.c (processing_debug_stmt): Move earlier.  Make static.
16705         (remap_ssa_name): If processing_debug_stmt and name wasn't found in
16706         decl_map, set processing_debug_stmt to -1 and return name without
16707         any remapping.
16709 2010-01-11  Dave Korn  <dave.korn.cygwin@gmail.com>
16711         * doc/install.texi (Specific#x-x-cygwin): Document minimum required
16712         binutils version, and reword target configuration description.
16714 2010-01-11  Andy Hutchinson  <hutchinsonandy@gcc.gnu.org>
16716         * config/avr/avr.h (LINKER_NAME): Remove.
16718 2010-01-11  Janis Johnson  <janis187@us.ibm.com>
16720         PR target/42416
16721         * config/rs6000/rs6000.c (rs6000_override_options): On targets
16722         that support VSX, warn for -mno-altivec if vsx is not disabled,
16723         and disable vsx.
16725 2010-01-11  Joseph Myers  <joseph@codesourcery.com>
16726             Shujing Zhao  <pearly.zhao@oracle.com>
16728         PR translation/42469
16729         * common.opt (Wframe-larger-than=, fcompare-debug=, fdbg-cnt=,
16730         fira-verbose=, flto-compression-level=, fplugin-arg-): Use tab
16731         character between option name and help text.
16732         * c.opt (imultilib): Likewise.
16734 2010-01-10  Rafael Avila de Espindola  <espindola@google.com>
16736         * lto-streamer-out.c (output_unreferenced_globals): Output static
16737         variables.
16739 2010-01-10  Steven Bosscher  <steven@gcc.gnu.org>
16741         PR rtl-optimization/42621
16742         * bb-reorder.c (gate_duplicated_computed_gotos): Only run if not
16743         optimizing for size.
16744         (duplicate_computed_gotos): Remove now-redundant check.
16746 2010-01-10  Steve Ellcey  <sje@cup.hp.com>
16748         PR target/37454
16749         * configure.ac: Save and restore LDFLAGS and LIBS
16750         * configure: Regenerate.
16752 2010-01-10  Richard Guenther  <rguenther@suse.de>
16754         PR middle-end/42667
16755         * builtins.c (fold_builtin_strlen): Add type argument and
16756         convert the resulting length to it.
16757         (fold_builtin_1): Adjust.
16759 2010-01-09  Jakub Jelinek  <jakub@redhat.com>
16761         * config/rs6000/rs6000.c (rs6000_emit_set_long_const): Shorten
16762         sequence for DImode constants >= 0x80000000UL <= 0xFFFFFFFFUL by
16763         1 insn.
16764         (num_insns_constant_wide): Adjust for that change.
16766 2010-01-09  Alexandre Oliva  <aoliva@redhat.com>
16768         PR debug/42631
16769         * web.c (union_defs): Add used argument, to combine uses of
16770         uninitialized regs.
16771         (entry_register): Adjust type and tests of used argument.
16772         (web_main): Widen used for new use.  Pass it to union_defs.
16773         * df.h (union_defs): Adjust prototype.
16775 2010-01-09  Alexandre Oliva  <aoliva@redhat.com>
16777         PR debug/42630
16778         * loop-unroll.c (referenced_in_one_insn_in_loop_p): Count debug
16779         uses in new incoming argument.  Free body.
16780         (reset_debug_uses_in_loop): New.
16781         (analyze_insn_to_expand_var): Call the latter if the former found
16782         anything.  Fix whitespace.  Reject invalid dest overlaps before
16783         going through all insns in the loop.
16785 2010-01-09  Alexandre Oliva  <aoliva@redhat.com>
16787         PR debug/42629
16788         * haifa-sched.c (dying_use_p): Debug insns don't count.
16790 2010-01-09  Alexandre Oliva  <aoliva@redhat.com>
16792         PR middle-end/42363
16793         * gimplify.c (gimplify_modify_expr): Drop lhs on noreturn calls.
16794         * tree-cfg.c (is_ctrl_altering_stmt): Don't compute flags twice.
16795         (verify_gimple_call): Reject LHS in noreturn calls.
16797 2010-01-09  Alexandre Oliva  <aoliva@redhat.com>
16799         PR debug/42604
16800         PR debug/42395
16801         * tree-vect-loop-manip.c (adjust_info): New type.
16802         (adjust_vec): New pointer to vector.
16803         (adjust_debug_stmts_now, adjust_vec_debug_stmts): New.
16804         (adjust_debug_stmts, adjust_phi_and_debug_stmts): New.
16805         (slpeel_update_phis_for_duplicate_loop): Use them.
16806         (slpeel_update_phi_nodes_for_guard1): Likewise.
16807         (slpeel_update_phi_nodes_for_guard2): Likewise.
16808         (slpeel_tree_peel_loop_to_edge): Likewise.
16809         (vect_update_ivs_after_vectorizer): Likewise.
16811 2010-01-09  Alexandre Oliva  <aoliva@redhat.com>
16813         * vec.h (DEF_VEC_ALLOC_FUNC_O_STACK): Drop excess paren.
16814         (DEF_VEC_ALLOC_FUNC_I_STACK): Likewise.
16816 2010-01-09  Alexandre Oliva  <aoliva@redhat.com>
16818         * config/i386/i386.c (ix86_vectorize_builtin_vec_perm): Silence
16819         bogus uninitialized warning.
16821 2010-01-09  Richard Guenther  <rguenther@suse.de>
16823         PR middle-end/42512
16824         * tree-scalar-evolution.c (interpret_loop_phi): Make sure
16825         the evolution is compatible with the initial condition.
16827 2010-01-09  Jakub Jelinek  <jakub@redhat.com>
16829         * gcc.c (process_command): Update copyright notice dates.
16830         * gcov.c (print_version): Likewise.
16831         * gcov-dump.c (print_version): Likewise.
16832         * mips-tfile.c (main): Likewise.
16833         * mips-tdump.c (main): Likewise.
16835 2010-01-08  Andy Hutchinson  <hutchinsonandy@gcc.gnu.org>
16837         PR target/41885
16838         * config/avr/avr.md (rotlqi3): Add CONST_INT_P check.
16839         (rotlhi3): Delete.
16840         (rotlhi3_8): Delete.
16841         (rotlsi3): Delete.
16842         (rotlsi3_8): Delete.
16843         (rotlsi3_16): Delete.
16844         (rotlsi3_24): Delete.
16845         (rotl<mode>3): New.
16846         (*rotw<mode>3): New.
16847         (*rotb<mode>3): New.
16848         * config/avr/avr.c (avr_rotate_bytes): New function.
16849         * config/avr/avr-proto.h (avr_rotate_bytes): New function.
16851 2010-01-08  Steve Ellcey  <sje@cup.hp.com>
16853         PR target/37454
16854         * configure.ac: Modify -rdynamic check.
16855         * configure: Regenerate.
16857 2010-01-08  DJ Delorie  <dj@redhat.com>
16859         * config/sh/sh.c (sh_expand_epilogue): Fix interrupt handler
16860         register popping order.
16862 2010-01-08  Richard Guenther  <rguenther@suse.de>
16864         PR lto/42528
16865         * c.opt (fsigned-char): Also let LTO handle this option.
16866         (funsigned-char): Likewise.
16868 2010-01-07  Richard Guenther  <rguenther@suse.de>
16870         * gimple.h (gss_for_code): Wrap gcc_assert in ENABLE_CHECKING.
16871         (gimple_op): Likewise.
16872         (gimple_op_ptr): Likewise.
16873         (gimple_assign_set_lhs): Remove gcc_assert.
16874         (gimple_assign_set_rhs1): Likewise.
16875         (gimple_assign_set_rhs2): Likewise.
16876         (gimple_call_set_lhs): Likewise.
16877         (gimple_call_set_fn): Likewise.
16878         (gimple_call_set_fndecl): Likewise.
16879         (gimple_call_fndecl): Likewise.
16880         (gimple_call_return_type): Likewise.
16881         (gimple_call_set_chain): Likewise.
16882         (gimple_call_num_args): Likewise.
16883         (gimple_call_set_arg): Likewise.
16884         (gimple_cond_set_code): Likewise.
16885         (gimple_cond_set_lhs): Likewise.
16886         (gimple_cond_set_rhs): Likewise.
16887         (gimple_cond_set_true_label): Likewise.
16888         (gimple_cond_set_false_label): Likewise.
16889         (gimple_label_set_label): Likewise.
16890         (gimple_goto_set_dest): Likewise.
16891         (gimple_debug_bind_get_var): Wrap gcc_assert in ENABLE_CHECKING.
16892         (gimple_debug_bind_get_value): Likewise.
16893         (gimple_debug_bind_get_value_ptr): Likewise.
16894         (gimple_debug_bind_set_var): Likewise.
16895         (gimple_debug_bind_set_value): Likewise.
16896         (gimple_debug_bind_reset_value): Likewise.
16897         (gimple_debug_bind_has_value_p): Likewise.
16898         (gimple_return_retval_ptr): Remove gcc_assert.
16899         (gimple_return_retval): Likewise.
16900         (gimple_return_set_retval): Likewise.
16901         * tree-flow.h (struct gimple_df): Remove nonlocal_all member.
16902         (safe_referenced_var_iterator): Remove.
16903         (FOR_EACH_REFERENCED_VAR_SAFE): Likewise.
16904         * tree-flow-inline.h (gimple_nonlocal_all): Remove.
16905         (fill_referenced_var_vec): Remove.
16906         (first_readonly_imm_use): Remove redundant gcc_assert.
16907         (phi_arg_index_from_use): Combine gcc_asserts.
16908         (move_use_after_head): Wrap gcc_assert in ENABLE_CHECKING.
16909         (first_imm_use_stmt): Remove redundant gcc_assert.
16910         * tree-cfg.c (verify_gimple_call): Verify function and chain
16911         operands.  Verify arguments.
16912         (verify_types_in_gimple_stmt): Verify condition code and labels.
16914 2010-01-07  Richard Guenther  <rguenther@suse.de>
16916         PR tree-optimization/42641
16917         * sese.c (rename_map_elt_info): Use the SSA name version, do
16918         not hash pointers.
16920 2010-01-07  Jakub Jelinek  <jakub@redhat.com>
16922         PR tree-optimization/42625
16923         * cgraph.c (cgraph_make_node_local): Clear DECL_COMDAT*,
16924         TREE_PUBLIC, DECL_WEAK and DECL_EXTERNAL also for same_body aliases.
16926 2010-01-07  Duncan Sands  <baldrick@free.fr>
16928         * Makefile.in (PLUGIN_HEADERS): Add version.h.
16930 2010-01-07  Uros Bizjak  <ubizjak@gmail.com>
16932         PR target/42511
16933         * ifcvt.c (dead_or_predicable): Also remove REG_EQUAL note when
16934         note itself is not function_invariant_p.
16936 2009-01-07  Steven Bosscher  <steven@gcc.gnu.org>
16938         * gcse.c (execute_rtl_cprop, execute_rtl_pre, execute_rtl_hoist):
16939         Do not add the DF_NOTE problem.
16940         * store-motion.c (execute_rtl_store_motion): Likewise.
16942 2010-01-07  Martin Jambor  <mjambor@suse.cz>
16944         PR tree-optimization/42157
16945         * tree-sra.c (compare_access_positions): Stabilize sort if both
16946         accesses have integer types, return zero immediately if they are the
16947         same.
16949 2010-01-06  Richard Henderson  <rth@redhat.com>
16951         PR middle-end/41883
16952         * haifa-sched.c (add_to_note_list): Merge into ...
16953         (concat_note_lists): ... here, and ...
16954         (unlink_other_notes, rm_other_notes): Merge into...
16955         (remove_notes): ... here.  Create REG_SAVE_NOTEs for
16956         NOTE_INSN_EPILOGUE_BEG.
16958 2010-01-06  Richard Guenther  <rguenther@suse.de>
16960         * ipa-inline.c (cgraph_decide_inlining_incrementally): Do
16961         not inline regular functions into always-inline functions.
16963 2010-01-06  Nick Clifton  <nickc@redhat.com>
16965         * config/rx/rx.h (enum rx_cpu_type): Add RX200.
16966         (CC1_SPEC): Issue an error message if -mcpu=rx200 and -fpu are
16967         used together.
16968         (OVERRIDE_OPTIONS): Delete.
16969         (OPTIMIZATION_OPTIONS): Define.
16970         (ALLOW_RX_FPU_INSNS): Define only in terms of -fpu option.
16971         * config/rx/rx.c (rx_handle_option): Issue an error message if
16972         -mcpu=rx200 and -fpu are used together.
16973         (rx_set_optimization_options): New function.  Issue an error
16974         message if an optimization attribute attempts to reset the FPU/
16975         math optimization pairing.
16976         * config/rx/rx-protos.h (rx_set_optimization_options): Prototype.
16977         * config/rx/rx.opt: Set the default to 32-bit doubles.
16978         * config/rx/t-rx: Add multilibs for -nofpu option.
16979         * doc/invoke.texi: Update documentation of RX options.
16981 2010-01-06  Richard Guenther  <rguenther@suse.de>
16983         * tree-ssa-pre.c (name_to_id): New global.
16984         (alloc_expression_id): Simplify SSA name handling.
16985         (lookup_expression_id): Likewise.
16986         (init_pre): Zero name_to_id.
16987         (fini_pre): Free it.
16989 2010-01-06  Uros Bizjak  <ubizjak@gmail.com>
16991         * ifcvt.c (if_convert): Output slim multiple dumps with TDF_SLIM.
16993 2010-01-05  H.J. Lu  <hongjiu.lu@intel.com>
16995         PR target/42542
16996         * config/i386/sse.md (smaxv2di3): New.
16997         (umaxv2di3): Likewise.
16998         (sminv2di3): Likewise.
16999         (uminv2di3): Likewise.
17001 2010-01-05  Eric Botcazou  <ebotcazou@adacore.com>
17003         PR target/42564
17004         * config/sparc/sparc.h (SPARC_SYMBOL_REF_TLS_P): Delete.
17005         * config/sparc/sparc-protos.h (legitimize_pic_address): Likewise.
17006         (legitimize_tls_address): Likewise.
17007         (sparc_tls_referenced_p): Likewise.
17008         * config/sparc/sparc.c (sparc_expand_move): Use legitimize_tls_address
17009         and adjust calls to legitimize_pic_address.
17010         (legitimate_constant_p) Use sparc_tls_referenced_p.
17011         (legitimate_pic_operand_p): Likewise.
17012         (sparc_legitimate_address_p): Do not use SPARC_SYMBOL_REF_TLS_P.
17013         (sparc_tls_symbol_ref_1): Delete.
17014         (sparc_tls_referenced_p): Make static, recognize specific patterns.
17015         (legitimize_tls_address): Make static, handle CONST patterns.
17016         (legitimize_pic_address): Make static, remove unused parameter and
17017         adjust recursive calls.
17018         (sparc_legitimize_address): Make static, use sparc_tls_referenced_p
17019         and adjust call to legitimize_pic_address.
17020         (sparc_output_mi_thunk): Likewise.
17022 2010-01-05  Paolo Bonzini  <bonzini@gnu.rg>
17023             H.J. Lu  <hongjiu.lu@intel.com>
17025         PR target/42542
17026         * config/i386/i386.c (ix86_expand_int_vcond): Convert GTU to GT
17027         for V4SI and V2DI by subtracting (-(INT MAX) - 1) from both
17028         operands to make them signed.
17030         Revert:
17031         2010-01-04  H.J. Lu  <hongjiu.lu@intel.com>
17033         PR target/42542
17034         * config/i386/i386.c (ix86_expand_int_vcond): Don't convert
17035         GTU to GT for V4SI and V2DI.
17037         * config/i386/sse.md (umaxv4si3): Enabled for SSE4.1 and XOP.
17038         (umin<mode>3): Removed.
17039         (uminv8hi3): New.
17040         (uminv4si3): Likewise.
17042 2010-01-05  Martin Jambor  <mjambor@suse.cz>
17044         PR tree-optimization/42462
17045         * ipa-inline.c (compute_inline_parameters): Pass node->decl instead of
17046         current_function_decl to helper functions and macros.
17048 2010-01-05  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
17050         PR bootstrap/41771
17051         * flags.h: Don't include real.h.
17052         (HONOR_NANS, HONOR_SNANS, HONOR_INFINITIES, HONOR_SIGNED_ZEROS,
17053         HONOR_SIGN_DEPENDENT_ROUNDING): Move ...
17054         * real.h (HONOR_NANS, HONOR_SNANS, HONOR_INFINITIES,
17055         HONOR_SIGNED_ZEROS, HONOR_SIGN_DEPENDENT_ROUNDING): ... here.
17056         * dominance.c: Update copyright.
17057         * gimple.c (walk_gimple_op): Remove inline.
17058         * tree-ssa-reassoc.c: Include real.h.
17059         * Makefile.in (FLAGS_H): Remove $(REAL_H).
17060         (tree-ssa-reassoc.o): Depend on $(REAL_H).
17062 2010-01-05  Nick Clifton  <nickc@redhat.com>
17064         * config/rx/rx.c (rx_get_stack_layout): Fix allocation of second
17065         register to push into the stack frame when the accumulator has to
17066         be saved during interrupts.
17068 2010-01-05  Eric Fisher  <joefoxreal@gmail.com>
17070         * doc/invoke.texi: Remove the documentation about option
17071         -Wunreachable-code.
17072         * common.opt (Wunreachable-code):  Preserved for backward
17073         compatibility.
17074         * tree-cfg.c: Remove the implementation of -Wunreachable-code.
17075         * opts.c (common_handle_option): Add OPT_Wunreachable_code to
17076         the backward compatibility flag section.
17078 2010-01-05  Richard Guenther  <rguenther@suse.de>
17080         * tree-ssa-pre.c (bitmap_value_insert_into_set): Optimize.
17082 2010-01-05  Jakub Jelinek  <jakub@redhat.com>
17084         PR other/42611
17085         * cfgexpand.c (expand_one_var): Diagnose too large variables.
17087         PR tree-optimization/42508
17088         * tree-sra.c (convert_callers): Check for recursive call
17089         by comparing cgraph nodes instead of decls.
17090         (modify_function): Call ipa_modify_formal_parameters also
17091         on all same_body aliases.
17093         * cgraphunit.c (cgraph_materialize_all_clones): Compare
17094         cgraph nodes when checking for same_body aliases.
17096 2010-01-05  Richard Guenther  <rguenther@suse.de>
17098         * tree-ssa-pre.c (get_or_alloc_expr_for_name): Avoid redundant
17099         allocation and lookup.
17100         (get_or_alloc_expr_for_constant): Likewise.
17101         (phi_translate): Sink allocation.
17103 2010-01-04  Richard Guenther  <rguenther@suse.de>
17105         * tree-ssa-sccvn.c (get_or_alloc_constant_value_id): Allocate
17106         a new entry only if needed.
17107         * tree-ssa-dom.c (lookup_avail_expr): Likewise.
17108         * tree-ssa-coalesce.c (find_coalesce_pair): Avoid one
17109         hashtable lookup.
17110         * tree-ssa-pre.c (sorted_array_from_bitmap_set): Pre-allocate
17111         the result array.
17112         (phi_translate): Handle CONSTANTs early.
17114 2010-01-04  Martin Jambor  <mjambor@suse.cz>
17116         PR tree-optimization/42398
17117         * tree-sra.c (struct access): Removed flag grp_different_types.
17118         (dump_access): Do not dump the removed flag.
17119         (sort_and_splice_var_accesses): Do not set the removed flag.
17120         (sra_modify_expr): Check for type compatibility directly.
17122 2010-01-04  Martin Jambor  <mjambor@suse.cz>
17124         PR tree-optimization/42366
17125         * ipa-cp.c (ipcp_init_stage): Always call ipa_compute_jump_functions on
17126         edges with variable number of parameters.
17127         * ipa-prop.c (ipa_write_node_info): Stream out uses_analysis_done
17128         flag instead of asserting it.
17129         (ipa_read_node_info): Read uses_analysis_done flag.
17131 2010-01-04  Richard Guenther  <rguenther@suse.de>
17133         * tree-ssa-sccvn.c (vn_reference_op_compute_hash): Use
17134         iterative_hash_* as intended.
17135         (vn_reference_compute_hash): Likewise.  Simplify hashing
17136         SSA names.
17137         (vn_reference_lookup_2): Likewise.
17138         (vn_nary_op_compute_hash): Likewise.
17139         (vn_phi_compute_hash): Likewise.
17140         (expressions_equal_p): Remove strange code.
17141         * tree-ssa-pre.c (pre_expr_eq): Use gcc_unreachable ().
17142         (pre_expr_hash): Likewise.  Simplify hashing SSA names.
17143         (bitmap_insert_into_set_1): Take value-id as parameter.
17144         (add_to_value): Pass it.
17145         (bitmap_insert_into_set): Likewise.
17146         (bitmap_value_insert_into_set): Likewise.  Remove redundant check.
17148 2010-01-04  Jakub Jelinek  <jakub@redhat.com>
17150         PR driver/42442
17151         * gcc.c (SWITCH_IGNORE_PERMANENTLY): Define.
17152         (do_self_spec): For switches with SWITCH_IGNORE set set also
17153         SWITCH_IGNORE_PERMANENTLY.
17154         (check_live_switch): Check SWITCH_IGNORE_PERMANENTLY instead
17155         of SWITCH_IGNORE.
17157 2010-01-04  Rafael Avila de Espindola  <espindola@google.com>
17159         * lto-streamer-out.c (output_unreferenced_globals): Output the full
17160         tree of an unreferenced global var.
17162 2010-01-04  H.J. Lu  <hongjiu.lu@intel.com>
17164         PR target/42542
17165         * config/i386/i386.c (ix86_expand_int_vcond): Don't convert
17166         GTU to GT for V4SI and V2DI.
17168         * config/i386/sse.md (umaxv4si3): Enabled for SSE4.1 and XOP.
17169         (umin<mode>3): Removed.
17170         (uminv8hi3): New.
17171         (uminv4si3): Likewise.
17173 2010-01-04  H.J. Lu  <hongjiu.lu@intel.com>
17175         PR lto/42581
17176         * collect2.c (main): Turn on trace in collect2 if -v is passed
17177         to gcc with LTO.
17179 2010-01-03  Jerry Quinn  <jlquinn@optonline.net>
17181         * doc/c-tree.texi (RETURN_STMT): Change to RETURN_EXPR.  Update
17182         description of expression operand.
17184 2010-01-03  Andrew Jenner  <andrew@codesourcery.com>
17186         * configure.ac: Add install-html to target_list for Make-hooks.
17187         * configure: Regenerate.
17188         * fortran/Make-lang.in (F95_HTMLFILES): New.
17189         (fortran.html): Use it.
17190         (fortran.install-html): New.
17191         * Makefile.in (install-html): Add lang.install-html.
17192         * java/Make-lang.in (JAVA_HTMLFILES): New.
17193         (java.html): Use it.
17194         (java.install-html): New.
17195         * objc/Make-lang.in (objc.install-html): New.
17196         * objcp/Make-lang.in (obj-c++.install-html): New.
17197         * cp/Make-lang.in (c++.install-html): New.
17198         * ada/gcc-interface/Make-lang.in (ada.install-html): New.
17199         * lto/Make-lang.in (lto.install-html): New.
17201 2010-01-03  H.J. Lu  <hongjiu.lu@intel.com>
17203         PR lto/42520
17204         * gcc.c (LINK_COMMAND_SPEC): Pass -m* and -v to -plugin-opt.
17206 2009-01-03  Steven Bosscher  <steven@gcc.gnu.org>
17208         PR rtl-optimization/41862
17209         * store-motion.c (store_killed_in_insn, compute_store_table,
17210         remove_reachable_equiv_notes, replace_store_insn,
17211         build_store_vectors): Ignore all DEBUG_INSNs.
17213 2010-01-03  H.J. Lu  <hongjiu.lu@intel.com>
17215         PR lto/41564
17216         * common.opt: Add dumpdir.
17218         * gcc.c (cc1_options): Add "-dumpbase %B" only if -dumpbase
17219         isn't specified.
17220         (option_map): Add --dumpdir.
17222         * gcc.h (DEFAULT_WORD_SWITCH_TAKES_ARG): Add dumpdir.
17224         * lto-wrapper.c (run_gcc): Add -dumpbase and -dumpdir for -o.
17226         * opts.c (decode_options): Try dump_dir_name first if
17227         dump_base_name isn't an absolute path.
17228         (common_handle_option): Handle OPT_dumpdir.
17230         * toplev.c (dump_dir_name): New.
17231         (print_switch_values): Also ignore -dumpdir.
17233         * toplev.h (dump_dir_name): New.
17235 2010-01-03  Richard Guenther  <rguenther@suse.de>
17237         PR tree-optimization/42589
17238         * tree-ssa-math-opts.c (execute_optimize_bswap): Allow
17239         double-word expansion of bswap32.
17241 2010-01-03  Steven Bosscher  <steven@gcc.gnu.org>
17243         * postreload-gcse.c (insert_expr_in_table): Replace BLOCK_NUM
17244         with BLOCK_FOR_INSN.
17245         * auto-inc-dec.c (attempt_change, get_next_ref, find_inc): Likewise.
17246         * ifcvt.c (noce_get_alt_condition, noce_try_abs,
17247         noce_process_if_block): Likewise.
17248         * gcse.c (compute_local_properties, insert_expr_in_table,
17249         insert_set_in_table, canon_list_insert, find_avail_set,
17250         pre_insert_copy_insn): Likewise.
17252         * basic-block.h (BLOCK_NUM): Move from here...
17253         * sched-int.h (BLOCK_NUM): ... to here to localize it in the scheduler.
17255 2010-01-03  Richard Guenther  <rguenther@suse.de>
17257         PR tree-optimization/42438
17258         * tree-ssa-pre.c (struct bb_bitmap_sets): Add
17259         contains_may_not_return_call flag.
17260         (BB_MAY_NOTRETURN): New.
17261         (valid_in_sets): Trapping nary operations are not valid
17262         in blocks that may not return.
17263         (insert_into_preds_of_block): Remove check for trapping expressions.
17264         (compute_avail): Compute also BB_MAY_NOTRETURN.
17266 2010-01-03  Gerald Pfeifer  <gerald@pfeifer.com>
17268         * doc/invoke.texi: Add 2010 to copyright years.
17270 2010-01-03  Eric Botcazou  <ebotcazou@adacore.com>
17272         * config/sparc/sparc.c: Fix formatting nits.
17274 2010-01-02  Gerald Pfeifer  <gerald@pfeifer.com>
17275             Alexander Monakov  <amonakov@ispras.ru>
17277         * doc/invoke.texi (Optimize Options): Reword introduction a bit.
17279 2010-01-02  Richard Guenther  <rguenther@suse.de>
17281         PR middle-end/42577
17282         * tree-vrp.c (check_all_array_refs): Skip non-excutable blocks.
17283         (simplify_switch_using_ranges): Mark to be removed edges
17284         as non-executable.
17286 2010-01-02  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
17288         * config/pa/t-slibgcc-dwarf-ver (SHLIB_SOVERSION): Bump by two.
17290         * collect2.c (scan_libraries): Add missing argument in call to
17291         scan_prog_file.
17293 2010-01-02  Uros Bizjak  <ubizjak@gmail.com>
17295         PR target/42448
17296         * config/alpha/predicates.md (aligned_memory_operand): Return false
17297         for CQImode.
17298         (unaligned_memory_operand): Return true for CQImode.
17299         * config/alpha/alpha.c (get_aligned_mem): Assert that location
17300         doesn not cross aligned SImode word boundary.
17302 2010-01-02  Anatoly Sokolov  <aesok@post.ru>
17304         * config/avr/avr.h (REG_OK_FOR_BASE_P, REG_OK_FOR_INDEX_P, XEXP_):
17305         Remove.
17306         * config/avr/avr-protos.h (avr_init_once, avr_optimization_options,
17307         avr_change_section, avr_reg_class_from_letter) : Remove declaration.
17309 2010-01-02  Richard Guenther  <rguenther@suse.de>
17311         PR lto/41597
17312         * toplev.c (compile_file): Emit LTO marker properly.  Change
17313         it to __gnu_lto_v1.
17314         * collect2.c (scan_prog_file): Adjust for changed LTO marker.
17316 2010-01-01  Richard Guenther  <rguenther@suse.de>
17318         PR debug/42455
17319         * tree-sra.c (analyze_all_variable_accesses): Work in DECL_UID order.
17321 2010-01-01  Richard Guenther  <rguenther@suse.de>
17323         PR c/42570
17324         * c-decl.c (grokdeclarator): For zero-size arrays force
17325         structural equality checks as layout_type does.
17327 2010-01-01  H.J. Lu  <hongjiu.lu@intel.com>
17329         * builtins.c: Update copyright to 2010.
17331 2010-01-01  H.J. Lu  <hongjiu.lu@intel.com>
17333         PR lto/42531
17334         * lto-streamer-out.c (produce_asm): Revert the last change.
17335         (copy_function): Likewise.
17337         * lto-streamer.c (lto_get_section_name): Skip any leading
17338         asterisk in name.
17340 2010-01-01  Richard Guenther  <rguenther@suse.de>
17342         PR middle-end/42559
17343         * builtins.c (get_object_alignment): Do not use DECL_ALIGN
17344         for LABEL_DECLs.
17347 Copyright (C) 2010 Free Software Foundation, Inc.
17349 Copying and distribution of this file, with or without modification,
17350 are permitted in any medium without royalty provided the copyright
17351 notice and this notice are preserved.