OSDN Git Service

c68706eeb9b350aa58c62dc8f087f2730df2affc
[pf3gnuchains/gcc-fork.git] / gcc / ChangeLog
1 2008-06-24  Andrew Pinski  <andrew_pinski@playstation.sony.com>
2
3         PR middle-end/36594
4         * builtins.c (expand_builtin_nonlocal_goto): Stabilize the address of
5         the memory instead of the memory itself for the save area.
6
7 2008-06-24  Olivier Hainque  <hainque@adacore.com>
8             Nicolas Roche  <roche@adacore.com>
9
10         * gengtype.c (srcdir_len): size_t instead of int.
11         (get_file_realbasename): New function.  For F a filename, the real
12         basename of F, with all the path components stripped.
13         (get_file_srcdir_relative_path): New function.  For F a filename, the
14         relative path to F from $(srcdir).
15         (get_file_basename): Rewrite using get_file_srcdir_relative_path and
16         get_file_realbasename.  Adjust the head comment.
17         (get_prefix_langdir_index): New function. For F a filename, return the
18         lang_dir_names[] relative index of the language directory that is
19         a prefix in F.
20         (get_file_langdir): For F a filename, return the name of the language
21         directory where F is located.
22         (get_file_gtfilename): New function. The gt- output file name for an
23         input filename F.
24         (get_output_file_with_visibility): Replace in-line computations with
25         uses of get_file_gtfilename and get_prefix_langdir_index.
26         * Makefile.in (GTFILES_H): Adjust to match what gengtype generates.
27
28 2008-06-24  Jakub Jelinek  <jakub@redhat.com>
29
30         PR tree-optimization/36504
31         * tree-ssa-loop-prefetch.c (gather_memory_references_ref): Skip
32         references without base address.
33
34 2008-06-23  Uros Bizjak  <ubizjak@gmail.com>
35
36         PR middle-end/PR36584
37         * calls.c (expand_call): Increase alignment for recursive functions.
38
39 2008-06-23  Anatoly Sokolov  <aesok@post.ru>
40
41         * config/avr/avr.c (avr_function_value): Add new 'outgoing' argument.
42         (TARGET_FUNCTION_VALUE): New define.
43         * config/avr/avr-protos.h (avr_function_value): Remove declaration.
44         * config/avr/avr.h (FUNCTION_VALUE): Remove.
45
46 2008-06-23  Uros Bizjak  <ubizjak@gmail.com>
47
48         * config/i386/i386.md (fmodxf3): Change sequence of move instructions.
49         (fmod<mode>3): Ditto.
50         (remainderxf3): Ditto.
51         (remainder<mode>3): Ditto.
52
53 2008-06-23  Jakub Jelinek  <jakub@redhat.com>
54
55         PR target/36533
56         * emit-rtl.c (set_reg_attrs_from_value): Do nothing if
57         REG is a hard register.
58
59         PR tree-optimization/36508
60         * tree-ssa-pre.c (compute_antic): Allow num_iterations up to
61         499, don't check it at all in release compilers.
62
63 2008-06-23  Uros Bizjak  <ubizjak@gmail.com>
64
65         * config/i386/i386.md (*fop_<mode>_1_i387): Use SSE_FLOAT_MODE_P
66         together with SSE_TARGET_MATH to disable insn pattern.
67         (*fop_<MODEF:mode>_2_i387): Ditto.
68         (*fop_<MODEF:mode>_3_i387): Ditto.
69
70 2008-06-22  Andy Hutchinson  <hutchinsonandy@aim.com>
71
72         * config/avr/avr.h (SUPPORTS_INIT_PRIORITY): Define.
73         
74 2008-06-22  Laurynas Biveinis  <laurynas.biveinis@gmail.com>
75
76         PR middle-end/34906
77         * gimplify.c (gimplify_asm_expr): Check the return code of
78         parse_output_constraint call, set function return and is_inout
79         value if it failed.
80
81 2008-06-22  Ian Lance Taylor  <iant@google.com>
82
83         * c-lex.c (narrowest_unsigned_type): Change itk to int.
84         (narrowest_signed_type): Likewise.
85         * c-typeck.c (c_common_type): Change local variable mclass to enum
86         mode_class, twice.
87         (parser_build_binary_op): Compare the TREE_CODE_CLASS with
88         tcc_comparison, not the tree code itself.
89         * c-common.c (def_fn_type): Pass int, not an enum, to va_arg.
90         (c_expand_expr): Cast modifier to enum expand_modifier.
91         * c-common.h (C_RID_CODE): Add casts.
92         (C_SET_RID_CODE): Define.
93         * c-parser.c (c_parse_init): Use C_SET_RID_CODE.
94         (c_lex_one_token): Add cast to avoid warning.
95         (c_parser_objc_type_name): Rename local typename to type_name.
96         (check_no_duplicate_clause): Change code parameter to enum
97         omp_clause_code.
98         (c_parser_omp_var_list_parens): Change kind parameter to enum
99         omp_clause_code.
100         (c_parser_omp_flush): Pass OMP_CLAUSE_ERROR, not 0, to
101         c_parser_omp_list_var_parens.
102         (c_parser_omp_threadprivate): Likewise.
103         * cp/lex.c (init_reswords): Use C_SET_RID_CODE.
104         * cp/parser.c (cp_lexer_get_preprocessor_token): Likewise.
105         * c-format.c (NO_FMT): Define.
106         (printf_length_specs): Use NO_FMT.
107         (asm_fprintf_length_specs): Likewise.
108         (gcc_diag_length_specs): Likewise.
109         (scanf_length_specs): Likewise.
110         (strfmon_length_specs): Likewise.
111         (gcc_gfc_length_specs): Likewise.
112         (printf_flag_specs): Change 0 to STD_C89.
113         (asm_fprintf_flag_specs): Likewise.
114         (gcc_diag_flag_specs): Likewise.
115         (gcc_cxxdiag_flag_specs): Likewise.
116         (scanf_flag_specs): Likewise.
117         (strftime_flag_specs): Likewise.
118         (strfmon_flag_specs): Likewise.
119         (print_char_table): Likewise.
120         (asm_fprintf_char_table): Likewise.
121         (gcc_diag_char_table): Likewise.
122         (gcc_tdiag_char_table): Likewise.
123         (gcc_cdiag_char_table): Likewise.
124         (gcc_cxxdiag_char_table): Likewise.
125         (gcc_gfc_char_table): Likewise.
126         (scan_char_table): Likewise.
127         (time_char_table): Likewis.
128         (monetary_char_table): Likewise.
129         * c-format.h (BADLEN): Likewise.
130
131 2008-06-21  Ian Lance Taylor  <iant@google.com>
132
133         * tree.h (enum tree_code): Include all-tree.def, not tree.def.
134         Define END_OF_BASE_TREE_CODES around inclusion.
135         * tree.c (tree_code_type): New global array.
136         (tree_code_length, tree_code_name): Likewise.
137         * Makefile.in (TREE_H): Add all-tree.def, c-common.def, and
138         $(lang_tree_files).
139         (all-tree.def, s-alltree): New targets.
140         (gencheck.h, s-gencheck): Remove.
141         (tree.o): Depend upon all-tree.def.
142         (build/gencheck.o): Remove gencheck.h dependency.
143         (mostlyclean): Don't remove gencheck.h.
144         * c-common.h (enum c_tree_code): Remove.
145         * c-lang.c (tree_code_type): Remove.
146         (tree_code_length, tree_code_name): Remove.
147         * gencheck.c (tree_codes): Include all-tree.def, rather than
148         tree.def, c-common.def, and gencheck.h.  Undefined DEFTREECODE
149         after it is used.
150         * tree-browser.c (tb_tree_codes): Include all-tree.def, rather
151         than tree.def.
152         * cp/cp-tree.h (enum cplus_tree_code): Remove.
153         (operator_name_info): Size to MAX_TREE_CODES.
154         (assignment_operator_name_info): Likewise.
155         * cp/cp-lang.c (tree_code_type): Remove.
156         (tree_code_length, tree_code_name): Remove.
157         * cp/lex.c (operator_name_info): Size to MAX_TREE_CODES.
158         (assignment_operator_name_info): Likewise.
159         * cp/decl.c (grok_op_properties): Change LAST_CPLUS_TREE_CODE to
160         MAX_TREE_CODES.
161         * cp/mangle.c (write_expression): Likewise.
162         * cp/Make-lang.in (CXX_TREE_H): Remove cp/cp-tree.def.
163         * fortran/f95-lang.c (tree_code_type): Remove.
164         (tree_code_length, tree_code_name): Remove.
165         * java/java-tree.h (enum java_tree_code): Remove.
166         * java/lang.c (tree_code_type): Remove.
167         (tree_code_length, tree_code_name): Remove.
168         * java/Make-lang.in (JAVA_TREE_H): Remove java/java-tree.def.
169         * objc/objc-act.h (enum objc_tree_code): Remove.
170         * objc/objc-lang.c (tree_code_type): Remove.
171         (tree_code_length, tree_code_name): Remove.
172         * objcp/objcp-lang.c (tree_code_type): Remove.
173         (tree_code_length, tree_code_name): Remove.
174         * ada/ada-tree.h (enum gnat_tree_code): Remove.
175         * ada/Make-lang.in (ADA_TREE_H): Remove ada/ada-tre.def.
176         * ada/misc.c (tree_code_type): Remove.
177         (tree_code_length, tree_code_name): Remove.
178
179 2008-06-21  Bernhard Fischer  <aldot@gcc.gnu.org>
180
181         * tree-ssa-pre.c (fini_antic): Bitmap_sets have to be freed before
182         the grand_bitmap_obstack.
183
184 2008-06-20  Kaveh R. Ghazi  <ghazi@caip.rutgers.edu>
185
186         * ggc.h (GGC_RESIZEVAR): New, reorder macros.
187         * tracer.c (tail_duplicate): Fix for -Wc++-compat.
188         * tree-affine.c (aff_combination_expand, free_name_expansion): Likewise.
189         * tree-cfg.c (replace_by_duplicate_decl, replace_ssa_name,
190         move_stmt_r, new_label_mapper): Likewise.
191         * tree-complex.c (cvc_lookup): Likewise.
192         * tree-dfa.c (create_function_ann): Likewise.
193         * tree-dump.c (dump_register): Likewise.
194         * tree-if-conv.c (tree_if_conversion, add_to_predicate_list,
195         find_phi_replacement_condition): Likewise.
196         * tree-inline.c (copy_phis_for_bb, estimate_num_insns_1,
197         tree_function_versioning): Likewise.
198         * tree-into-ssa.c (cmp_dfsnum): Likewise.
199         * tree-iterator.c (tsi_link_before, tsi_link_after): Likewise.
200         * tree-nested.c (lookup_field_for_decl, lookup_tramp_for_decl,
201         get_nonlocal_debug_decl, convert_nonlocal_reference,
202         convert_nonlocal_omp_clauses, get_local_debug_decl,
203         convert_local_reference, convert_local_omp_clauses,
204         convert_nl_goto_reference, convert_nl_goto_receiver,
205         convert_tramp_reference, convert_call_expr): Likewise.
206         * tree-outof-ssa.c (contains_tree_r): Likewise.
207         * tree-parloops.c (reduction_phi, initialize_reductions,
208         eliminate_local_variables_1, add_field_for_reduction,
209         add_field_for_name, create_phi_for_local_result,
210         create_call_for_reduction_1, create_loads_for_reductions,
211         create_stores_for_reduction, create_loads_and_stores_for_name):
212         Likewise.
213         * tree-phinodes.c (allocate_phi_node): Likewise.
214         * tree-predcom.c (order_drefs, execute_pred_commoning_cbck): Likewise.
215         * tree-sra.c (sra_elt_hash, sra_elt_eq, lookup_element): Likewise.
216         * tree-ssa-alias.c (get_mem_sym_stats_for): Likewise.
217         * tree-ssa-coalesce.c (compare_pairs): Likewise.
218         * tree-ssa-loop-im.c (mem_ref_in_stmt, memref_hash, memref_eq,
219         memref_free, gather_mem_refs_stmt, vtoe_hash, vtoe_eq, vtoe_free,
220         record_vop_access, get_vop_accesses, get_vop_stores): Likewise.
221         * tree-ssa-loop-prefetch.c (determine_loop_nest_reuse): Likewise. 
222         * tree-ssa-sccvn.c (VN_INFO_GET, free_phi, free_reference,
223         vn_nary_op_insert): Likewise.
224         * tree-ssa.c (redirect_edge_var_map_add,
225         redirect_edge_var_map_clear, redirect_edge_var_map_dup): Likewise.
226         * tree-vectorizer.c (vectorize_loops): Likewise.
227         * tree.c (make_node_stat, copy_node_stat, build_int_cst_wide,
228         build_fixed, build_real, make_tree_binfo_stat, make_tree_vec_stat,
229         tree_cons_stat, build1_stat, build_variant_type_copy,
230         decl_init_priority_lookup, decl_fini_priority_lookup,
231         decl_priority_info, decl_restrict_base_lookup,
232         decl_restrict_base_insert, decl_debug_expr_lookup,
233         decl_debug_expr_insert, decl_value_expr_lookup,
234         decl_value_expr_insert, type_hash_eq, type_hash_lookup,
235         type_hash_add, get_file_function_name, tree_check_failed,
236         tree_not_check_failed, tree_range_check_failed,
237         omp_clause_range_check_failed, build_omp_clause,
238         build_vl_exp_stat): Likewise.
239         * value-prof.c (gimple_histogram_value,
240         gimple_duplicate_stmt_histograms): Likewise.
241         * var-tracking.c (attrs_list_insert, attrs_list_copy,
242         unshare_variable, variable_union_info_cmp_pos, variable_union,
243         dataflow_set_different_1, dataflow_set_different_2,
244         vt_find_locations, variable_was_changed, set_variable_part,
245         emit_notes_for_differences_1, emit_notes_for_differences_2): Likewise.
246         * varasm.c (prefix_name, emutls_decl, section_entry_eq,
247         section_entry_hash, object_block_entry_eq,
248         object_block_entry_hash, create_block_symbol,
249         initialize_cold_section_name, default_function_rodata_section,
250         strip_reg_name, set_user_assembler_name, const_desc_eq,
251         build_constant_desc, output_constant_def, lookup_constant_def,
252         const_desc_rtx_hash, const_desc_rtx_eq, const_rtx_hash_1,
253         create_constant_pool, force_const_mem, compute_reloc_for_rtx_1,
254         default_internal_label): Likewise.
255         * varray.c (varray_init, varray_grow): Likewise.
256         * vec.c (vec_gc_o_reserve_1, vec_heap_o_reserve_1): Likewise.
257
258 2008-06-20  Uros Bizjak  <ubizjak@gmail.com>
259
260         * config/i386/i386.md (*jcc_fused_1): Handle all valid compare
261         operators for "test" insn.  Macroize insn using SWI mode macro.
262         (*jcc_fused_2): Ditto.
263         (*jcc_fused_3): Macroize insn using SWI mode macro.
264         (*jcc_fused_4): Ditto.
265
266 2008-06-20  Bernhard Fischer  <aldot@gcc.gnu.org>
267
268         * tree-ssa-pre.c: Fix typo in comment.
269         (init_antic, fini_antic): Add explicit funtions for
270         initializing and deinitializing ANTIC and AVAIL sets.
271         (create_expression_by_pieces): Fix typo in comment.
272         Remove redundant set of new_stuff and use NULL_TREE instead of NULL.
273         (execute_pre): Eventually dump details about ANTIC_IN.
274
275 2008-06-19  Kaveh R. Ghazi  <ghazi@caip.rutgers.edu>
276
277         * collect2.c (main, add_to_list): Fix for -Wc++-compat.
278         * gcc.c (translate_options, init_spec, store_arg, read_specs,
279         add_to_obstack, file_at_path, find_a_file, execute,
280         add_preprocessor_option, add_assembler_option, add_linker_option,
281         process_command, insert_wrapper, do_option_spec, do_self_spec,
282         spec_path, do_spec_1, is_directory, main, used_arg,
283         getenv_spec_function): Likewise.
284         * tlink.c (symbol_hash_lookup, file_hash_lookup,
285         demangled_hash_lookup, symbol_push, file_push, frob_extension):
286         Likewise.
287
288 2008-06-19  Kenneth Zadeck <zadeck@naturalbridge.com>
289
290         * doc/rtl.texi: Updated subreg section.
291
292 2008-06-19  Jakub Jelinek  <jakub@redhat.com>
293
294         PR c++/36523
295         * cgraphunit.c (cgraph_process_new_functions): Don't clear
296         node->needed and node->reachable.
297         * cgraphbuild.c (record_reference): Handle OMP_PARALLEL and OMP_TASK.
298         * omp-low.c (delete_omp_context): Call finalize_task_copyfn.
299         (expand_task_call): Don't call expand_task_copyfn.
300         (expand_task_copyfn): Renamed to...
301         (finalize_task_copyfn): ... this.
302
303 2008-06-19  Jan Hubicka  <jh@suse.cz>
304
305         * builtins.c (expand_builtin_nonlocal_goto): Stabilize r_sp before
306         clobbering framepointer.
307
308 2008-06-19  Jan Hubicka  <jh@suse.cz>
309
310         * tree-optimize.c (execute_early_local_optimizations): Set
311         cgraph_state only at first invocation.
312
313 2008-06-19  Kaveh R. Ghazi  <ghazi@caip.rutgers.edu>
314
315         * system.h (-Wc++-compat): Activate as a warning, no an error.
316
317 2008-06-19  Uros Bizjak  <ubizjak@gmail.com>
318
319         * config/i386/i386.md (*jcc_fused_1): Use ASM_COMMENT_START
320         instead of "#" in insn asm template.
321         (*jcc_fused_2): Ditto.
322
323 2008-06-19  Uros Bizjak  <ubizjak@gmail.com>
324
325         * config/i386/i386.h (ix86_tune_indices)
326         [X86_TUNE_FUSE_CMP_AND_BRANCH]: New.
327         (TARGET_FUSE_CMP_AND_BRANCH): New define.
328         * config/i386/i386.md (*jcc_fused_1): New insn pattern
329         (*jcc_fused_2): Ditto.
330         * config/i386/i386.c (ix86_tune_features): Add m_CORE2 to
331         X86_TUNE_FUSE_CMP_AND_BRANCH targets.
332         (print operand): Handle 'E' and 'e' code.
333
334 2008-06-19  Anatoly Sokolov  <aesok@post.ru>
335
336         * config/avr/avr.c (avr_mcu_t): Add attiny13a.
337         * config/avr/avr.h (LINK_SPEC, CRT_BINUTILS_SPECS): (Ditto.).
338         * config/avr/t-avr (MULTILIB_MATCHES): (Ditto.).
339
340 2008-06-19  Bernhard Fischer  <aldot@gcc.gnu.org>
341
342         * cgraphunit.c (cgraph_finalize_function): Remove redundant setting of
343         node->decl.
344         (cgraph_expand_function): Use local copy of decl.
345         (cgraph_expand_all_functions): Remove redundant initialization of
346         order_pos.
347         (cgraph_optimize): Reword internal_error message.
348
349 2008-06-19  Chung-Lin Tang  <ctang@marvell.com>
350
351         * arm-protos.h (arm_return_in_memory): Remove public
352         arm_return_in_memory() prototype.
353         * arm.c (arm_return_in_memory): Add static prototype, add target
354         hook macro, change definition and comments.
355         * arm.h (TARGET_RETURN_IN_MEMORY): Remove.
356
357 2008-06-19  Ben Elliston  <bje@au.ibm.com>
358
359         * dfp.h, dfp.c, config/dfp-bit.h, config/dfp-bit.c, real.h,
360         real.c: Remove references to IEEE 754R.
361         * doc/install.texi (Configuration): IEEE 754R -> IEEE 754-2008.
362         * doc/libgcc.texi (Decimal float library routines): Likewise.
363
364 2008-06-18  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
365
366         * targhooks.h (struct gcc_target): New member unwind_word_mode.
367         (default_unwind_word_mode): Add prototype.
368         * targhooks.c (default_unwind_word_mode): New function.
369         (default_eh_return_filter_mode): Return targetm.unwind_word_mode ()
370         instead of word_mode.
371         * target-def.h (TARGET_UNWIND_WORD_MODE): New macro.
372         (TARGET_INITIALIZER): Use it.
373
374         * c-common.c (handle_mode_attribute): Support "unwind_word"
375         mode attribute.
376         * unwind-generic.h (_Unwind_Word, _Unwind_Sword): Use it.
377
378         * except.c (init_eh): Use targetm.unwind_word_mode () instead of
379         word_mode to access SjLj_Function_Context member "data".
380         (sjlj_emit_dispatch_table): Likewise.  Also, perform type
381         conversion from targetm.eh_return_filter_mode () to
382         targetm.unwind_word_mode () if they differ.
383
384         * builtin-types.def (BT_UNWINDWORD): New primitive type.
385         (BT_FN_UNWINDWORD_PTR): New function type.
386         (BT_FN_WORD_PTR): Remove.
387         * builtins.def (BUILT_IN_EXTEND_POINTER): Use BT_FN_UNWINDWORD_PTR.
388         * except.c (expand_builtin_extend_pointer): Convert pointer to
389         targetm.unwind_word_mode () instead of word_mode.
390
391         * config/spu/spu-protos.h (spu_eh_return_filter_mode): Remove.
392         * config/spu/spu.c (spu_eh_return_filter_mode): Remove.
393         (spu_unwind_word_mode): New function.
394         (TARGET_EH_RETURN_FILTER_MODE): Do not define.
395         (TARGET_UNWIND_WORD_MODE): Define.
396         * config/spu/t-spu-elf (TARGET_LIBGCC2_CFLAGS): Remove -D__word__=SI.
397
398 2008-06-18  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
399
400         * config/spu/spu.c (reg_align): Remove.
401         (regno_aligned_for_load): Also accept ARG_POINTER_REGNUM.
402         (spu_split_load): Use regno_aligned_for_load instead of reg_align.
403         (spu_split_store): Likewise.
404
405 2008-06-18  Bernhard Fischer  <aldot@gcc.gnu.org>
406
407         * gcc/tree-vn.c: Fix typo in comment.
408
409 2008-06-18  Jan Hubicka  <jh@suse.cz>
410
411         * cgraphunit.c (cgraph_optimize): Output debug info when doing
412         toplevel reorder too.
413
414 2008-06-18  Jan Hubicka  <jh@suse.cz>
415
416         * c-opts.c (c_common_post_options): PCH is not compatible with
417         no-unit-at-a-time.
418         * opts.c (handle_options): Enable unit-at-a-time at O0 along with
419         -fno-toplevel-reorder by default now.
420
421 2008-06-18  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
422
423         PR documentation/30739
424         * doc/install.texi (Prerequisites): Document dependency on awk.
425
426 2008-06-18  Uros Bizjak  <ubizjak@gmail.com>
427             Ian Lance Taylor  <iant@google.com>
428
429         PR rtl-optimization/35604
430         * jump.c (redirect_exp_1): Skip the condition of an IF_THEN_ELSE. We
431         only want to change jump destinations, not eventual label comparisons.
432
433 2008-06-16  Jan Hubicka  <jh@suse.cz>
434
435         * cgraphunit.c (cgraph_expand_pending_functions): Give up at
436         syntax errors.
437         (cgraph_analyze_function): Likewise.
438
439 2008-06-16  Jan Hubicka  <jh@suse.cz>
440
441         * cgraph.h (cgraph_mark_if_needed): New function.
442         * cgraphunit.c (cgraph_mark_if_needed): New function.
443         * c-decl.c (duplicate_decl): Use it.
444
445 2008-06-16  Jan Hubicka  <jh@suse.cz>
446
447         * cgraph.c (cgraph_add_new_function): When in expansion state, do
448         lowering.
449
450 2008-06-16  Jan Hubicka  <jh@suse.cz>
451
452         * tree-outof-ssa.c (pass_out_of_ssa): Do not depend on PROP_alias.
453
454 2008-06-16  Daniel Jacobowitz  <dan@codesourcery.com>
455             Kazu Hirata  <kazu@codesourcery.com>
456             Maxim Kuvyrkov  <maxim@codesourcery.com
457
458         * config.gcc (mips64el-st-linux-gnu): Use mips/st.h and mips/t-st.
459         * config.host: Use driver-native.o and mips/x-native for mips*-linux*.
460         * config/mips/linux.h (host_detect_local_cpu): Declare, add to
461         EXTRA_SPEC_FUNCTIONS.
462         (MARCH_MTUNE_NATIVE_SPECS, BASE_DRIVER_SELF_SPECS): New macros.
463         (DRIVER_SELF_SPECS): Adjust.
464         * config/mips/linux64.h (DRIVER_SELF_SPECS): Update.
465         * config/mips/st.h, config/mips/t-st: New.
466         * config/mips/driver-native.c, config/mips/x-native: New.
467         * doc/invoke.texi (MIPS): Document 'native' value for -march and
468         -mtune options.
469
470 2008-06-18  Maxim Kuvyrkov  <maxim@codesourcery.com>
471
472         * config/mips/mips.h (ISA_HAS_CONDMOVE): Slice ISA_HAS_FP_CONDMOVE
473         from it.
474         (ISA_HAS_FP_CONDMOVE): New macro.
475         (ISA_HAS_FP_MADD4_MSUB4, ISA_HAS_FP_MADD3_MSUB3): New macros.
476         (ISA_HAS_NMADD_NMSUB): Rename to ISA_HAS_NMADD4_NMSUB4.
477         (ISA_HAS_NMADD3_NMSUB3): New macro.
478         * config/mips/mips.c (mips_rtx_costs): Update.
479         * config/mips/mips.md (MOVECC): Don't use FP conditional moves when
480         compiling for ST Loongson 2E/2F.
481         (madd<mode>): Rename to madd4<mode>.  Update.
482         (madd3<mode>): New pattern.
483         (msub<mode>): Rename to msub4<mode>.  Update.
484         (msub3<mode>): New pattern.
485         (nmadd<mode>): Rename to nmadd4<mode>.  Update.
486         (nmadd3<mode>): New pattern.
487         (nmadd<mode>_fastmath): Rename to nmadd4<mode>_fastmath.  Update.
488         (nmadd3<mode>_fastmath): New pattern.
489         (nmsub<mode>): Rename to nmsub4<mode>.  Update.
490         (nmsub3<mode>): New pattern.
491         (nmsub<mode>_fastmath): Rename to nmsub4<mode>_fastmath.  Update.
492         (nmsub3<mode>_fastmath): New pattern.
493         (mov<SCALARF:mode>_on_<MOVECC:mode>, mov<mode>cc): Update.
494
495 2008-06-18  Steven Bosscher  <steven@gcc.gnu.org>
496
497         * df.h (struct df_ref): Replace 'insn' field with 'insn_info' field.
498         (DF_REF_INSN_INFO): New.
499         (DF_REF_INSN, DF_REF_INSN_UID): Rewrite macros using DF_REF_INSN_INFO.
500         (DF_REF_IS_ARTIFICIAL): Artificial refs are now identified as refs
501         with a NULL DF_REF_INSN_INFO.
502         (DF_INSN_INFO_GET, DF_INSN_INFO_SET): Renamed from DF_INSN_GET and
503         DF_INSN_SET.
504         (DF_INSN_INFO_LUID, DF_INSN_INFO_DEFS, DF_INSN_INFO_USES,
505         DF_INSN_INFO_EQ_USES): New.
506         (DF_INSN_LUID, DF_INSN_DEFS, DF_INSN_USES, DF_INSN_EQ_USES,
507         DF_INSN_UID_LUID, DF_INSN_UID_DEFS, DF_INSN_UID_USES,
508         DF_INSN_UID_EQ_USES): Rewrite using DF_INSN_INFO_* macros.
509         * df-core.c: Update comment for above changes.
510         (df_insn_debug_regno): Use DF_INSN_INFO_GET instead of INSN_UID and
511         DF_INSN_UID_* macros.
512         (df_ref_debug): Check for NULL DF_REF_INSN_INFO.
513         * df-scan.c (df_ref_record): Take a df_insn_info instead of an
514         insn rtx.  Update all callers.
515         (df_def_record_1, df_defs_record, df_uses_record, df_get_call_refs,
516         df_ref_create_structure, df_insn_refs_collect): Likewise.
517         (df_ref_equal_p): Compare DF_REF_INSN_INFO pointers for the refs.
518         * df-problems.c (df_chain_dump): Test for non-NULL DF_REF_INSN_INFO.
519         (df_live_bb_local_compute): Retrieve DF_INSN_INFO, use DF_INSN_INFO_*
520         macros to access the insn refs.
521         (df_chain_top_dump, df_chain_bottom_dump, df_byte_lr_alloc): Likewise.
522         * fwprop.c (use_killed_between): Use DF_REF_INSN accessor macro.
523         (all_uses_available): Retrieve DF_INSN_INFO for def_insn, and use it
524         for accessing the refs.
525         (try_fwprop_subst): Likewise.
526         * ddg.c (add_cross_iteration_register_deps): Use DF_REF_INSN macro.
527         * web.c (union_defs): Retrieve DF_INSN_INFO for def_insn, and use it
528         for accessing the refs.
529         * loop-invariant.c (invariant_for_use): Use DF_REF_BB macro.
530         (check_dependencies): Use DF_INSN_INFO_GET, use DF_INSN_INFO_* macros
531         to look at the insn refs.
532         (record_uses): Likewise.
533         * dce.c (deletable_insn_p): Don't tolerate artificial DEFs in this
534         function anymore.
535         (mark_artificial_uses): Don't mark_insn for artificial refs.
536         (mark_reg_rependencies): Likewise.
537
538         * doc/rtl.texi: Remove documentation of ADDRESSOF.
539
540 2008-06-17  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
541
542         * configure: Regenerate.
543
544 2008-06-17  Eric B. Weddington  <eric.weddington@atmel.com>
545
546         * config/avr/avr.c (avr_mcu_t): Remove atmega32hvb.
547         * config/avr/avr.h (LINK_SPEC, CRT_BINUTILS_SPECS): Likewise. 
548         * config/avr/t-avr (MULTILIB_MATCHES): Likewise. 
549
550 2008-06-17  Eric B. Weddington  <eric.weddington@atmel.com>
551
552         * config/avr/avr.c (avr_mcu_t): Add attiny167.
553         * config/avr/avr.h (LINK_SPEC, CRT_BINUTILS_SPECS): Likewise. 
554         * gcc/config/avr/t-avr (MULTILIB_MATCHES): Likewise. 
555
556 2008-06-17  Eric B. Weddington  <eric.weddington@atmel.com>
557
558         * config/avr/avr.c (avr_mcu_t): Add atmega32u4.
559         * config/avr/avr.h (LINK_SPEC, CRT_BINUTILS_SPECS): Likewise. 
560         * config/avr/t-avr (MULTILIB_MATCHES): Likewise. 
561
562 2008-06-17  Bernhard Fischer  <aldot@gcc.gnu.org>
563
564         * tree-ssa-sccvn.c: Fix format of comments.
565
566 2008-06-17  Bernhard Fischer  <aldot@gcc.gnu.org>
567
568         * cgraph.c: Remove unneeded forward declarations of eq_node()
569         and hash_node().
570
571 2008-06-17  Steven Bosscher  <steven@gcc.gnu.org>
572
573         * see.c (see_analyse_one_def): Do not look for REG_LIBCALL and
574         REG_RETVAL notes.
575         (see_update_relevancy): Likewise.
576         * fwprop.c (try_fwprop_subst): Likewise.
577         * rtlanal.c (noop_move_p): Likewise.
578         * builtins.c (expand_buitlin_mathfn): Don't try to add REG_EQUAL
579         notes to non-existing libcall blocks.
580         * cse.c (cse_insn): Change prototype.  Don't update libcall notes.
581         Remove orig_set.
582         (cse_extended_basic_block): Don't track libcall and no-conflict notes.
583         (dead_libcall_p): Remove.
584         (delete_trivially_dead_insns): Don't use it.
585         * web.c (union_defs): Remove comment about keeping nops.
586         * gcse.c (hash_scan_insn): Don't take libcall pointers.
587         (compute_hash_table_work): Don't track libcall notes.
588         (do_local_cprop): Don't take libcall pointers.  Don't update
589         libcall notes.
590         (adjust_libcall_notes): Deleted.
591         (local_cprop_pass): Remove stack for nested libcalls (which shouldn't
592         ever have existed in the first place).
593         (replace_store_insn): Don't try to remove libcall notes.
594         * lower-subreg.c (move_libcall_note, move_retval_note): Deleted.
595         (resolve_reg_notes): Don't call them.
596         (resolve_simple_move): Likewise.
597         (decompose_multiword_subregs): Remove block handling REG_RETVAL notes.
598         Don't remove REG_RETVAL notes.
599         * emit-rtl.c (try_split): Don't update libcall notes.
600         (emit_copy_of_insn_after): Dito.
601         * cselib.c (cselib_current_insn_in_libcall): Remove.
602         (cselib_process_insn): Don't set/clear it.
603         (new_elt_loc_list): Don't record it.
604         (cselib_init): Don't initialize it.
605         * cselib.c (struct elt_loc_list): Remove in_libcall field.
606         * loop-invariant.c (find_invariant_insn): Don't look for libcall
607         notes.
608         * sched-deps.c (sched_analyze_insn): Don't group libcall blocks.
609         (sched_analyze): Don't set up deps->libcall_block_tail_insn.
610         (init_deps): Don't initialize it.
611         * sched-int.h (struct deps): Rremove libcall_block_tail_insn field.
612         * combine.c (delete_noop_moves): Don't update libcall notes.
613         (can_combine_p): Remove now pointless #if 0 block.
614         (try_combine): Remove another obsolete #if 0 block.
615         (distribute_notes): Don't distribute libcall notes.
616         * reg-notes.def (REG_LIBCALL, REG_RETVAL): Remove.
617         * dce.c (libcall_dead_p): Remove.
618         (delete_unmarked_insns): Don't handle libcall blocks.
619         (preserve_libcall_for_dce): Remove.
620         (prescan_insns_for_dce): Don't special-case libcall block insns.
621         * reload1 (reload): Don't handle libcall notes. 
622         * doc/rtl.texi (REG_LIBCALL, REG_RETVAL, REG_LIBCALL_ID): Remove
623         documentation.
624
625 2008-06-16  Eric B. Weddington  <eric.weddington@atmel.com>
626
627         * config/avr/avr.c (avr_mcu_t): Add atmega32c1.
628         * config/avr/avr.h (LINK_SPEC, CRT_BINUTILS_SPECS): Likewise.
629         * config/avr/t-avr (MULTILIB_MATCHES): Likewise.
630
631 2008-06-16  Eric B. Weddington  <eric.weddington@atmel.com>
632
633         * config/avr/avr.c (avr_mcu_t): Add atmega32m1.
634         * config/avr/avr.h (LINK_SPEC, CRT_BINUTILS_SPECS): Likewise.
635         * config/avr/t-avr (MULTILIB_MATCHES): Likewise. 
636
637 2008-06-16  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
638
639         * Makefile.in (FLAGS_TO_PASS): Add $(datarootdir).
640
641 2008-06-16  Ira Rosen  <irar@il.ibm.com>
642
643         PR tree-optimization/36493
644         * tree-vect-transform.c (vect_create_data_ref_ptr): Remove TYPE from
645         the arguments list. Use VECTYPE to create vector pointer.
646         (vectorizable_store): Fail if accesses through a pointer to vectype
647         do not alias the original memory reference operands.
648         Call vect_create_data_ref_ptr without the removed argument.
649         (vectorizable_load): Likewise.
650         (vect_setup_realignment): Call vect_create_data_ref_ptr without the
651         removed argument.
652
653 2008-06-015  Andy Hutchinson  <hutchinsonandy@aim.com>
654
655         PR target/36336
656         * config/avr/avr.h (LEGITIMIZE_RELOAD_ADDRESS): Add check for 
657         reg_equiv_constant.
658
659 2008-06-15  Maxim Kuvyrkov  <maxim@codesourcery.com>
660
661         * config/mips/loongson2ef.md: New file.
662         * config/mips/mips.md (UNSPEC_LOONGSON_ALU1_TURN_ENABLED_INSN)
663         (UNSPEC_LOONGSON_ALU2_TURN_ENABLED_INSN)
664         (UNSPEC_LOONGSON_FALU1_TURN_ENABLED_INSN)
665         (UNSPEC_LOONGSON_FALU2_TURN_ENABLED_INSN): New constants.
666         (define_attr "cpu"): Rename loongson2e and loongson2f to loongson_2e
667         and loongson_2f.
668         (loongson2ef.md): New include.
669         * config/mips/loongson.md (vec_pack_ssat_<mode>, vec_pack_usat_<mode>)
670         (add<mode>3, paddd, ssadd<mode>3, usadd<mode>3)
671         (loongson_and_not_<mode>, loongson_average_<mode>, loongson_eq_<mode>)
672         (loongson_gt_<mode>, loongson_extract_halfword)
673         (loongson_insert_halfword_0, loongson_insert_halfword_2)
674         (loongson_insert_halfword_3, loongson_mult_add, smax<mode>3)
675         (umax<mode>3, smin<mode>3, umin<mode>3, loongson_move_byte_mask)
676         (umul<mode>3_highpart, smul<mode>3_highpart, loongson_smul_lowpart)
677         (loongson_umul_word, loongson_pasubub, reduc_uplus_<mode>)
678         (loongson_psadbh, loongson_pshufh, loongson_psll<mode>)
679         (loongson_psra<mode>, loongson_psrl<mode>, sub<mode>3, psubd)
680         (sssub<mode>3, ussub<mode>3, vec_interleave_high<mode>)
681         (vec_interleave_low<mode>): Define type attribute.
682         * config/mips/mips.c (mips_ls2): New static variable.
683         (mips_issue_rate): Update to handle tuning for Loongson 2E/2F.
684         (mips_ls2_init_dfa_post_cycle_insn, mips_init_dfa_post_cycle_insn)
685         (sched_ls2_dfa_post_advance_cycle, mips_dfa_post_advance_cycle):
686         Implement target scheduling hooks.
687         (mips_multipass_dfa_lookahead): Update to handle tuning for
688         Loongson 2E/2F.
689         (mips_sched_init): Initialize data for Loongson scheduling.
690         (mips_ls2_variable_issue): New static function.
691         (mips_variable_issue): Update to handle tuning for Loongson 2E/2F.
692         Add sanity check.
693         (TARGET_SCHED_INIT_DFA_POST_CYCLE_INSN)
694         (TARGET_SCHED_DFA_POST_ADVANCE_CYCLE): Override target hooks.
695         * config/mips/mips.h (TUNE_LOONGSON_2EF): New macros.
696         (ISA_HAS_XFER_DELAY, ISA_HAS_FCMP_DELAY, ISA_HAS_HILO_INTERLOCKS):
697         Handle ST Loongson 2E/2F cores.
698         (CPU_UNITS_QUERY): Define macro to enable querying of DFA units.
699
700 2008-06-15  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
701
702         * omp-low.c (extract_omp_for_data): Fix comment typo.
703         * c.opt: Fix typo.
704
705 2008-06-15  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
706
707         * doc/sourcebuild.texi (Config Fragments): Remove obsolete
708         FIXME note about gcc/config.guess.
709         * doc/options.texi (Option file format): Remove non-ASCII bytes.
710         * doc/cpp.texi: Expand TABs, drop indentation outside examples.
711         * doc/cppopts.texi: Likewise.
712         * doc/extend.texi: Likewise.
713         * doc/gcc.texi: Likewise.
714         * doc/gccint.texi: Likewise.
715         * doc/gcov.texi: Likewise.
716         * doc/gty.texi: Likewise.
717         * doc/hostconfig.texi: Likewise.
718         * doc/install.texi: Likewise.
719         * doc/invoke.texi: Likewise.
720         * doc/loop.texi: Likewise.
721         * doc/makefile.texi: Likewise.
722         * doc/md.texi: Likewise.
723         * doc/passes.texi: Likewise.
724         * doc/tm.texi: Likewise.
725         * doc/tree-ssa.texi: Likewise.
726         * doc/trouble.texi: Likewise.
727
728 2008-06-15  Mark Shinwell  <shinwell@codesourcery.com>
729             Nathan Sidwell  <nathan@codesourcery.com>
730             Maxim Kuvyrkov  <maxim@codesourcery.com>
731             Richard Sandiford  <rdsandiford@googlemail.com>
732         
733         * config/mips/mips-modes.def: Add V8QI, V4HI and V2SI modes.
734         * config/mips/mips-protos.h (mips_expand_vector_init): New.
735         * config/mips/mips-ftypes.def: Add function types for Loongson-2E/2F
736         builtins.
737         * config/mips/mips.c (mips_split_doubleword_move): Handle new modes.
738         (mips_hard_regno_mode_ok_p): Allow 64-bit vector modes for Loongson.
739         (mips_vector_mode_supported_p): Add V2SImode, V4HImode and
740         V8QImode cases.
741         (LOONGSON_BUILTIN, LOONGSON_BUILTIN_ALIAS): New.
742         (CODE_FOR_loongson_packsswh, CODE_FOR_loongson_packsshb,
743         (CODE_FOR_loongson_packushb, CODE_FOR_loongson_paddw,
744         (CODE_FOR_loongson_paddh, CODE_FOR_loongson_paddb,
745         (CODE_FOR_loongson_paddsh, CODE_FOR_loongson_paddsb)
746         (CODE_FOR_loongson_paddush, CODE_FOR_loongson_paddusb)
747         (CODE_FOR_loongson_pmaxsh, CODE_FOR_loongson_pmaxub)
748         (CODE_FOR_loongson_pminsh, CODE_FOR_loongson_pminub)
749         (CODE_FOR_loongson_pmulhuh, CODE_FOR_loongson_pmulhh)
750         (CODE_FOR_loongson_biadd, CODE_FOR_loongson_psubw)
751         (CODE_FOR_loongson_psubh, CODE_FOR_loongson_psubb)
752         (CODE_FOR_loongson_psubsh, CODE_FOR_loongson_psubsb)
753         (CODE_FOR_loongson_psubush, CODE_FOR_loongson_psubusb)
754         (CODE_FOR_loongson_punpckhbh, CODE_FOR_loongson_punpckhhw)
755         (CODE_FOR_loongson_punpckhwd, CODE_FOR_loongson_punpcklbh)
756         (CODE_FOR_loongson_punpcklhw, CODE_FOR_loongson_punpcklwd): New.
757         (mips_builtins): Add Loongson builtins.
758         (mips_loongson_2ef_bdesc): New.
759         (mips_bdesc_arrays): Add mips_loongson_2ef_bdesc.
760         (mips_builtin_vector_type): Handle unsigned versions of vector modes.
761         (MIPS_ATYPE_UQI, MIPS_ATYPE_UDI, MIPS_ATYPE_V2SI, MIPS_ATYPE_UV2SI)
762         (MIPS_ATYPE_V4HI, MIPS_ATYPE_UV4HI, MIPS_ATYPE_V8QI, MIPS_ATYPE_UV8QI):
763         New.
764         (mips_expand_vector_init): New.
765         * config/mips/mips.h (HAVE_LOONGSON_VECTOR_MODES): New.
766         (TARGET_CPU_CPP_BUILTINS): Define __mips_loongson_vector_rev
767         if appropriate.
768         * config/mips/mips.md: Add unspec numbers for Loongson
769         builtins.  Include loongson.md.
770         (MOVE64): Include Loongson vector modes.
771         (SPLITF): Include Loongson vector modes.
772         (HALFMODE): Handle Loongson vector modes.
773         * config/mips/loongson.md: New.
774         * config/mips/loongson.h: New.
775         * config.gcc: Add loongson.h header for mips*-*-* targets.
776         * doc/extend.texi (MIPS Loongson Built-in Functions): New.
777
778 2008-06-14  Joseph Myers  <joseph@codesourcery.com>
779
780         * config.gcc (arc-*-elf*, avr-*-*, fr30-*-elf, frv-*-elf,
781         h8300-*-elf*, h8300-*-*, i[34567]86-*-elf*, x86_64-*-elf*,
782         i[34567]86-*-aout*, i[34567]86-*-coff*, ia64*-*-elf*,
783         iq2000*-*-elf*, m32r-*-elf*, m32rle-*-elf*, m32r-*-linux*,
784         m32rle-*-linux*, m68hc11-*-*|m6811-*-*, m68hc12-*-*|m6812-*-*,
785         m68k-*-coff*, mcore-*-elf, mcore-*-pe*, mipsisa64sr71k-*-elf*,
786         mipsisa64sb1-*-elf* | mipsisa64sb1el-*-elf*, mips-*-elf* |
787         mipsel-*-elf*, mips64-*-elf* | mips64el-*-elf*, mips64vr-*-elf* |
788         mips64vrel-*-elf*, mips64orion-*-elf* | mips64orionel-*-elf*,
789         mipstx39-*-elf* | mipstx39el-*-elf*, mn10300-*-*, pdp11-*-,
790         powerpc-*-elf*, powerpcle-*-elf*, sh-*-elf* | sh[12346l]*-*-elf* |
791         sh-*-symbianelf* | sh[12346l]*-*-symbianelf* | sh-*-linux* |
792         sh[2346lbe]*-*-linux* | sh-*-netbsdelf* | shl*-*-netbsdelf* |
793         sh5-*-netbsd* | sh5l*-*-netbsd* | sh64-*-netbsd* |
794         sh64l*-*-netbsd*, sh-*-*, sparc-*-elf*, sparc64-*-elf*,
795         v850e1-*-*, v850e-*-*, v850-*-*, xstormy16-*-elf, m32c-*-elf*):
796         Remove use_fixproto=yes.
797         (ia64*-*-hpux*): Remove comment about using fixproto.
798         (m68k-*-uclinuxoldabi*, m68k-*-uclinux*): Remove use_fixproto=no.
799
800 2008-06-14  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
801
802         * configure.ac: Update gthr-default.h lazily, to avoid unneeded
803         library rebuilds.
804         * configure: Regenerate.
805
806 2008-06-13  Eric Botcazou  <ebotcazou@adacore.com>
807
808         PR middle-end/36520
809         * builtins.c (get_memory_rtx): Test for the presence of DECL_SIZE_UNIT
810         before evaluating it.
811
812 2008-06-13  Jakub Jelinek  <jakub@redhat.com>
813
814         PR c/36507
815         * c-decl.c (merge_decls): Don't clear DECL_EXTERNAL for
816         nested inline functions.
817         (start_decl, start_function): Don't invert DECL_EXTERNAL
818         for nested inline functions.
819
820 2008-06-13  Richard Sandiford  <rdsandiford@googlemail.com>
821
822         * config/mips/mips.md: Remove TARGET_DEBUG_D_MODE conditions from
823         splits that must be made for correctness.
824
825 2008-06-13  Richard Sandiford  <rdsandiford@googlemail.com>
826
827         * config/mips/mips.c (BUILTIN_AVAIL_NON_MIPS16): New macro.
828         (AVAIL_NON_MIPS16): Likewise.
829         (mips_builtin_description): Replace target_flags with a predicate.
830         (paired_single, sb1_paired_single, mips3d, dsp, dspr2, dsp_32)
831         (dspr2_32): New availability predicates.
832         (MIPS_BUILTIN): New macro.
833         (DIRECT_BUILTIN, CMP_SCALAR_BUILTINS, CMP_PS_BUILTINS)
834         (CMP_4S_BUILTINS, MOVTF_BUILTINS, CMP_BUILTINS)
835         (DIRECT_NO_TARGET_BUILTIN, BPOSGE_BUILTIN): Use it.
836         Replace the TARGET_FLAGS parameters with AVAIL parameters.
837         (mips_ps_bdesc, mips_sb1_bdesc, mips_dsp_bdesc)
838         (mips_dsp_32only_bdesc): Merge into...
839         (mips_builtins): ...this new array.
840         (mips_bdesc_map, mips_bdesc_arrays): Delete.
841         (mips_init_builtins): Update after above changes.
842         (mips_expand_builtin_1): Merge into...
843         (mips_expand_builtin): ...here and update after above changes.
844
845 2008-06-12  Paul Brook  <paul@codesourcery.com>
846
847         * longlong.h (__arm__): Define count_leading_zeros.
848         * config/arm/lib1funcs.asm (xxh, xxl, yyh, yyl): Define.
849         (clzsi2, clzdi2): New functions.
850         * config/arm/bpabi-v6m.S (xxh, xxl, yyh, yyl): Remove.
851         * config/arm/bpabi.S (xxh, xxl, yyh, yyl): Remove.
852         * config/arm/t-strongarm-elf (LIB1ASMFUNCS): Ditto.
853         * config/arm/t-vxworks (LIB1ASMFUNCS): Ditto.
854         * config/arm/t-pe (LIB1ASMFUNCS): Ditto.
855         * config/arm/t-arm-elf (LIB1ASMFUNCS): Ditto.
856         * config/arm/t-arm-coff (LIB1ASMFUNCS): Ditto.
857         * config/arm/t-linux (LIB1ASMFUNCS): Ditto.
858         * config/arm/t-symbian (LIB1ASMFUNCS): Ditto.
859         * config/arm/t-wince-pe (LIB1ASMFUNCS): Ditto.
860
861 2008-06-12  Kazu Hirata  <kazu@codesourcery.com>
862
863         * config/m68k/m68k.c (m68k_tune_flags): New.
864         (override_options): Compute m68k_tune_flags.
865         (MULL_COST, MULW_COST): Update for various variants of CFV2.
866         * config/m68k/m68k.h (TUNE_MAC, TUNE_EMAC): New.
867
868 2008-06-12  Jakub Jelinek  <jakub@redhat.com>
869
870         PR middle-end/36506
871         * omp-low.c (expand_omp_sections): Initialize l2 to avoid bogus warning.
872
873 2008-06-12  Eric Botcazou  <ebotcazou@adacore.com>
874
875         * tree-inline.c (copy_body_r): Copy TREE_SIDE_EFFECTS along with
876         TREE_THIS_VOLATILE on INDIRECT_REF nodes.
877
878 2008-06-12  Eric Botcazou  <ebotcazou@adacore.com>
879
880         * expr.c (store_field): Do a block copy from BLKmode to BLKmode-like.
881         (get_inner_reference): Use BLKmode for byte-aligned BLKmode bitfields.
882
883 2008-06-12  Jakub Jelinek  <jakub@redhat.com>
884
885         PR middle-end/36506
886         * omp-low.c (expand_omp_sections): Handle #pragma omp sections with
887         reductions.
888
889 2008-06-12  Richard Guenther  <rguenther@suse.de>
890
891         PR tree-optimization/36345
892         * tree-flow.h (struct ptr_info_def): Align escape_mask,
893         add memory_tag_needed flag.
894         (may_alias_p): Declare.
895         * tree-ssa-alias.c (may_alias_p): Export.
896         (set_initial_properties): Use memory_tag_needed flag.
897         (update_reference_counts): Likewise.
898         (reset_alias_info): Reset memory_tag_needed flag.
899         (create_name_tags): Check memory_tag_needed flag.
900         (dump_points_to_info_for): Dump it.
901         * tree-ssa-structalias.c (struct variable_info): Remove
902         directly_dereferenced flag.
903         (new_var_info): Do not initialize it.
904         (process_constraint_1): Do not set it.
905         (update_alias_info): Set is_dereferenced flag.
906         (set_uids_in_ptset): Use may_alias_p.
907         (set_used_smts): Check memory_tag_needed flag.
908         (find_what_p_points_to): Likewise.  Pass is_dereferenced flag.
909         * tree-ssa-alias.c (verify_flow_sensitive_alias_info): Check
910         memory_tag_needed flag.
911         * tree-ssa-alias-warnings.c (dsa_named_for): Try to recover
912         from broken design.
913
914 2008-06-12  Kai Tietz  <kai.tietz@onevision.com>
915
916         * config/i386/i386.c (ix86_compute_frame_layout): Disable
917         red zone for w64 abi.
918         (ix86_expand_prologue): Likewise.
919         (ix86_force_to_memory): Likewise.
920         (ix86_free_from_memory): Likewise.
921
922 2008-06-11  Edmar Wienskoski  <edmar@freescale.com>
923
924         PR target/36425
925         * config/rs6000/rs6000.c (rs6000_override_options): Set
926         rs6000_isel conditionally to the absence of comand line override.
927         * config/rs6000/linuxspe.h (SUBSUBTARGET_OVERRIDE_OPTIONS):
928         Remove duplicate rs6000_isel setting.
929         * config/rs6000/eabispe.h: Ditto.
930
931 2008-06-11  Richard Guenther  <rguenther@suse.de>
932
933         * alias.c (get_alias_set): Use the element alias-set for arrays.
934         (record_component_aliases): For arrays and vectors do nothing.
935         * c-common.c (strict_aliasing_warning): Handle the cases
936         of alias set zero explicitly.
937         * Makefile.in (dfp.o-warn): Add -Wno-error.
938
939 2008-06-11  Joseph Myers  <joseph@codesourcery.com>
940
941         * config.gcc (all_defaults): Add arch_32 arch_64 cpu_32 cpu_64
942         tune_32 tune_64.
943         (i[34567]86-*-* | x86_64-*-*): Add arch_32 arch_64 cpu_32 cpu_64
944         tune_32 tune_64 to supported_defaults.  Allow values not
945         supporting 64-bit mode for arch_32, cpu_32 and tune_32 for
946         x86_64.  Do not override cpu_32 or cpu_64 values from target name.
947         (i[34567]86-*-linux*, i[34567]86-*-solaris2.1[0-9]*): Only default
948         with_cpu_64 to generic for 64-bit-supporting configurations, not
949         with_cpu.  Remove FIXMEs.
950         * doc/install.texi (--with-cpu-32, --with-cpu-64, --with-arch-32,
951         --with-arch-64, --with-tune-32, --with-tune-64): Document.
952         * config/i386/i386.h (OPT_ARCH32, OPT_ARCH64): Define.
953         (OPTION_DEFAULT_SPECS): Add tune_32, tune_64, cpu_32, cpu_64,
954         arch_32 and arch_64.
955
956 2008-06-11  Eric Botcazou  <ebotcazou@adacore.com>
957             Olivier Hainque  <hainque@adacore.com>
958
959         * builtins.c (get_memory_rtx): Accept byte-addressable bitfields.
960         Use DECL_SIZE_UNIT to retrieve the size of the field.
961
962 2008-06-11  Joseph Myers  <joseph@codesourcery.com>
963
964         * config/arm/arm.c (arm_init_neon_builtins): Move initialization
965         with function calls after declarations.  Lay out
966         neon_float_type_node before further use.
967
968 2008-06-11  Richard Guenther  <rguenther@suse.de>
969
970         * tree-flow.h (may_point_to_global_var): Declare.
971         * tree-ssa-alias.c (may_point_to_global_var): New function.
972         * tree-ssa-sink.c (is_hidden_global_store): Use it.
973
974 2008-06-10  Kazu Hirata  <kazu@codesourcery.com>
975
976         * configure.ac: Teach that fido supports .debug_line.
977         * configure: Regenerate.
978
979 2008-06-10  Tom Tromey  <tromey@redhat.com>
980
981         * c-lex.c (fe_file_change): Pass SOURCE_LINE to start_source_file
982         debug hook.
983
984 2008-06-10  Joseph Myers  <joseph@codesourcery.com>
985
986         * dfp.c (WORDS_BIGENDIAN): Define to 0 if not defined.
987         (encode_decimal64, decode_decimal64, encode_decimal128,
988         decode_decimal128): Reverse order of 32-bit parts of value if host
989         and target endianness differ.
990
991 2008-06-10  Vinodha Ramasamy  <vinodha@google.com>
992
993         * value_prob.c (tree_divmod_fixed_value_transform): Use gcov_type.
994         Avoid division by 0.
995         (tree_mod_pow2_value_transform): Likewise.
996         (tree_ic_transform): Likewise.
997         (tree_stringops_transform): Likewise.
998         (tree_mod_subtract_transform): Likewise.
999         * tree-inline-c (copy_bb): Corrected int type to gcov_type.
1000         (copy_edges_for_bb): Likewise.
1001         (initialize_cfun): Likewise.
1002
1003 2008-06-10  Uros Bizjak  <ubizjak@gmail.com>
1004
1005         * config/i386/i386.md (*btdi_rex64): Change operand 1 predicate to
1006         nonmemory_operand. Add "N" operand constraint.
1007         (*btsi): Ditto.
1008         (*jcc_btdi_mask_rex64): New instruction and split pattern.
1009         (*jcc_btsi_mask): Ditto.
1010         (*jcc_btsi_mask_1): Ditto.
1011
1012 2008-06-10  Joseph Myers  <joseph@codesourcery.com>
1013
1014         * config/rs6000/rs6000.c (build_opaque_vector_type): Set
1015         TYPE_CANONICAL for copied element type.
1016
1017 2008-06-10  Uros Bizjak  <ubizjak@gmail.com>
1018
1019         PR target/36473
1020         * config/i386/i386.c (ix86_tune_features) [TUNE_USE_BT]:
1021         Add m_CORE2 and m_GENERIC.
1022         * config/i386/predicates.md (bt_comparison_operator): New predicate.
1023         * config/i386/i386.md (*btdi_rex64): New instruction pattern.
1024         (*btsi): Ditto.
1025         (*jcc_btdi_rex64): New instruction and split pattern.
1026         (*jcc_btsi): Ditto.
1027         (*jcc_btsi_1): Ditto.
1028         (*btsq): Fix Intel asm dialect operand order.
1029         (*btrq): Ditto.
1030         (*btcq): Ditto.
1031
1032 2008-06-09  Andy Hutchinson  <hutchinsonandy@aim.com>
1033
1034         PR middle-end/36447
1035         * simplify-rtx.c (simplify_subreg): Add check for shift count 
1036         greater than size.
1037
1038 2008-06-09  Richard Sandiford  <rdsandiford@googlemail.com>
1039
1040         * doc/md.texi: Synchronize with later constraints.md change.
1041         * longlong.h (umul_ppmm): Replace the MIPS asm implementation
1042         with a C implementation.
1043         * config/mips/mips.c (mips_legitimize_move): Remove MFHI and
1044         MFLO handling.
1045         (mips_subword): Assume TImode for CONST_INTs if TARGET_64BIT.
1046         (mips_split_doubleword_move): Use special MTHI and MFHI instructions
1047         when moving to and from MD_REGNUM.
1048         (mips_output_move): Don't handle moves from GPRs to HI_REGNUM.
1049         Handle moves from LO_REGNUM to GPRs using MFLO, MACC or DMACC.
1050         Handle byte and halfword moves.
1051         (mips_hard_regno_mode_ok_p): Handle MD_REGS and DSP_ACC_REGS
1052         separately.
1053         * config/mips/constraints.md (h): Turn into NO_REGS.
1054         (l, x): Update documentation.
1055         * config/mips/mips.md (UNSPEC_MFHILO): Delete.
1056         (UNSPEC_MFHI, UNSPEC_MTHI, UNSPEC_SET_HILO): New.
1057         (UNSPEC_TLS_LDM, UNSPEC_TLS_GET_TP): Renumber.
1058         (HILO): New mode iterator.
1059         (MOVE128): Add TI.
1060         (any_div): New code iterator.
1061         (u): Extend code attribute to div and udiv.
1062         (*add<mode>3_mips16, *movdi_64bit_mips16, *movsi_mips16): Use
1063         d_operand in the splitters.  Remove redundant CONST_INT checks.
1064         (mulsi3_mult3, mul<mode>3_internal, mul<mode>3_r4000, *mul_acc_si)
1065         (*macc, *msac, *msac_using_macc, *macc2, *msac2, *mul_sub_si)
1066         (*muls): Remove "=h" clobbers.  Adjust peephole2s and define_splits
1067         accordingly, using normal moves instead of unspecs to move LO into
1068         a GPR.  Use d_operand and lo_operand instead of *_REG_P checks.
1069         (<u>mulsidi3): Handle expansion in C code.
1070         (<u>mulsidi3_32bit_internal): Rename to...
1071         (<u>mulsidi3_32bit): ...this.
1072         (<u>mulsidi3_32bit_r4000): Fix insn separator.
1073         (*<u>mulsidi3_64bit): Rename to...
1074         (<u>mulsidi3_64bit): ...this.  Combine DImode "=h" and "=l" clobbers
1075         into a TImode "=x" clobber.  In the split, use an UNSPEC_SET_HILO
1076         to set LO and HI to the multiplication result.  Use a normal move
1077         for MFLO and an unspec for MFHI.
1078         (*<u>mulsidi3_64bit_parts): Replace with...
1079         (<u>mulsidi3_64bit_hilo): ...this new instruction.
1080         (<su>mulsi3_highpart): Extend to TARGET_FIX_R4000.
1081         (<su>mulsi3_highpart_internal): Turn into a define_insn_and_split
1082         and extend it to TARGET_FIX_R4000.  Store the destination in a GPR
1083         instead of HI.  Split the instruction into a separate multiplication
1084         and MFHI if !TARGET_FIX_R4000.
1085         (<su>muldi3_highpart): Likewise.
1086         (<su>mulsi3_highpart_mulhi_internal): Remove the first alternative
1087         and the "=h" clobber.
1088         (*<su>mulsi3_highpart_neg_mulhi_internal): Likewise.
1089         (<u>mulditi3): New expander.
1090         (<u>mulditi3_internal, <u>mulditi3_r4000): New patterns.
1091         (madsi): Remove "=h" clobber.
1092         (divmod<mode>4, udivmod<mode>4): Turn into define_insn_and_splits.
1093         Force the modulus result to be a GPR and split the instruction into
1094         a division followed by an MFHI after reload.
1095         (<u>divmod<GPR:mode>4_hilo_<HILO:mode>): New instruction.
1096         (*lea_high64): Use d_operand in the define_peephole2.  Likewise
1097         the MIPS16 HIGH define_split.
1098         (*movdi_32bit, *movdi_gp32_fp64, *movdi_32bit_mips16): Change type
1099         of acc<->gpr moves to "multi".
1100         (*movdi_64bit): Replace the single "x" alternative with
1101         alternatives for moving into and out of "a".
1102         (*movhi_internal, *movqi_internal): Likewise.  Use mips_output_move.
1103         (*movsi_internal): Extend the "d<-A" alternative to "d<-a".
1104         (*movdi_64bit_mips16, *movsi_mips16): Add d<-a alternatives.
1105         Use d_operand in the splitters.  Remove redundant CONST_INT checks.
1106         (*movhi_mips16, *movqi_mips16): Likewise.  Use mips_output_move.
1107         (movti): New expander.
1108         (*movti, *movti_mips16): New insns.
1109         (mfhilo_<mode>, *mfhilo_<mode>, *mfhilo_<mode>_macc): Delete.
1110         (mfhi<GPR:mode>_<HILO:mode>): New pattern.
1111         (mthi<GPR:mode>_<HILO:mode>): Likewise.
1112         * config/mips/predicates.md (fpr_operand): Delete.
1113         (d_operand): New predicate.
1114
1115 2008-06-09  Michael Meissner  <michael.meissner@amd.com>
1116
1117         * config.gcc (i[34567]86-*-*): Put test in quotes to prevent
1118         failure on some Bourne shells.
1119         (x86_64-*-*): Ditto.
1120
1121 2008-06-09  Kai Tietz  <kai.tietz@onevision.com>
1122
1123         * config/i386/cygming.h (TARGET_SUBTARGET64_DEFAULT): New.
1124
1125 2008-06-09  Eric Botcazou  <ebotcazou@libertysurf.fr>
1126
1127         * doc/install.texi (*-*-solaris2*): Remove obsolete contents.
1128         (sparc-sun-solaris2*): Likewise.
1129
1130 2008-06-09  Arnaud Charlet  <charlet@adacore.com
1131
1132         * doc/install.texi: Update requirements to build the Ada compiler.
1133
1134 2008-06-08  Steven Bosscher  <stevenb.gcc@gmail.com>
1135
1136         * df-scan.c (struct df_scan_problem_data): Remove the
1137         mw_link_pool alloc pool.
1138         (df_scan_free_internal): Don't free it.
1139         (df_scan_alloc): Don't allocate it.
1140         * df.h (struct df_link): Update comment.
1141
1142 2008-06-08  Nathan Sidwell  <nathan@codesourcery.com>
1143
1144         * except.h: Correct checks for when SJLJ exceptions must be used.
1145
1146 2008-06-08  Manuel Lopez-Ibanez  <manu@gcc.gnu.org>
1147
1148         * doc/invoke.texi (Wenum-compare): Mention that it is enabled by
1149         default.
1150         
1151 2008-06-08  Joseph Myers  <joseph@codesourcery.com>
1152
1153         PR tree-optimization/36218
1154         * configure.ac: Use LDFLAGS="${LDFLAGS_FOR_BUILD}" when running
1155         configure for the build system.
1156         (BUILD_LDFLAGS): Define.
1157         * configure: Regenerate.
1158         * Makefile.in (BUILD_LDFLAGS): Define to @BUILD_LDFLAGS@.
1159
1160 2008-07-08  Anatoly Sokolov  <aesok@post.ru>
1161
1162         PR target/36424
1163         * config/avr/avr.h (HARD_REGNO_RENAME_OK): Define.
1164         * config/avr/avr.c (avr_hard_regno_rename_ok): New function. 
1165         * config/avr/avr-protos.h (avr_hard_regno_rename_ok): New prototype. 
1166
1167 2008-06-07  Danny Smith  <dannysmith@users.sourceforge.net>
1168
1169         * config/i386/cygming.h (MAYBE_UWIN_CPP_BUILTINS): Remove.
1170
1171 2008-06-07  Joseph Myers  <joseph@codesourcery.com>
1172
1173         * config.gcc (Obsolete configurations): Remove list of
1174         configurations.
1175         (Unsupported targets list): Add *-*-linux*aout*, *-*-linux*libc1*,
1176         *-*-solaris2.[0-6], *-*-solaris2.[0-6].*, *-*-sysv*.  Remove other
1177         targets matched by those patterns.
1178         (strongarm*-*-*, ep9312*-*-*, xscale-*-*, parisc*-*-*,
1179         m680[012]0-*-*, *-*-linux*libc1*, *-*-linux*aout*,
1180         alpha*-*-unicosmk*, strongarm*-*-freebsd*, ep9312-*-elf,
1181         arm*-*-kaos*, cris-*-aout, parisc*64*-*-linux*, parisc*-*-linux*,
1182         hppa1.1-*-pro*, hppa1.1-*-osf*, hppa1.1-*-bsd*,
1183         i[34567]86-sequent-ptx4*, i[34567]86-sequent-sysv4*,
1184         i[34567]86-*-beoself*, i[34567]86-*-beos*, i[34567]86-*-sco3.2v5*,
1185         i[34567]86-*-sysv5*, i[34567]86-*-sysv4*, i[34567]86-*-uwin*,
1186         i[34567]86-*-kaos*, m68020-*-elf*, m68010-*-netbsdelf*,
1187         mips-wrs-windiss, mt-*-elf, powerpc-*-beos*, powerpc-*-chorusos*,
1188         powerpc-wrs-windiss*, powerpcle-*-sysv*, powerpc-*-kaos*,
1189         powerpcle-*-kaos*, sh*-*-kaos*, sparc-*-sysv4*, strongarm-*-elf*,
1190         strongarm-*-pe, strongarm-*-kaos*, vax-*-bsd*, vax-*-sysv*,
1191         vax-*-ultrix*, xscale-*-elf, xscale-*-coff,
1192         i[34567]86-*-linux*aout*, i[34567]86-*-linux*libc1): Remove.
1193         Make code for Solaris 7 and greater unconditional for Solaris.
1194         (ep9312-*-*, parisc1*, m680[012]0-*-*, parisc*-*-*, mt-*-*):
1195         Remove --with-* handling.
1196         * config/rs6000/sysv4.h (-mwindiss): Remove from all specs.
1197         (LIB_WINDISS_SPEC, CPP_OS_WINDISS_SPEC, STARTFILE_WINDISS_SPEC,
1198         ENDFILE_WINDISS_SPEC, LINK_START_WINDISS_SPEC,
1199         LINK_OS_WINDISS_SPEC): Remove.
1200         * config/rs6000/sysv4.opt (mwindiss): Remove.
1201         * configure.ac (strongarm*-*-*, xscale*-*-*): Remove.
1202         * configure: Regenerate.
1203         * doc/cpp.texi: Don't mention BeOS.
1204         * doc/extend.texi (interrupt): Don't mention MS1.
1205         * doc/install.texi: (i386-@var{any}-sysv, m68k-bull-sysv,
1206         m68k-hp-hpux, m68000-hp-hpux, m68000-att-sysv,
1207         alphaev5-cray-unicosmk*, xscale-*-*, i?86-*-linux*aout,
1208         i?86-*-sco3.2v5*, i?86-*-udk, m68k-hp-hpux, powerpc-*-sysv4,
1209         powerpc-*-sysv4, powerpcle-*-sysv4, *-*-sysv*, vax-dec-ultrix):
1210         Remove.
1211         * doc/invoke.texi (MT Options): Remove.
1212         (-mwindiss): Remove.
1213         (CRIS Options): Remove cris-axis-aout references.
1214         (HPPA Options): Don't mention hppa1.1-*-pro.
1215         * doc/md.texi: (MorphoTech family): Remove.
1216         * libgcc2.c: Don't handle UWIN.
1217         * config/alpha/t-unicosmk: Remove.
1218         * config/alpha/unicosmk.h: Remove.
1219         * config/arm/kaos-arm.h: Remove.
1220         * config/arm/kaos-strongarm.h: Remove.
1221         * config/arm/strongarm-coff.h: Remove.
1222         * config/arm/strongarm-elf.h: Remove.
1223         * config/arm/strongarm-pe.h: Remove.
1224         * config/arm/t-strongarm-pe: Remove.
1225         * config/arm/t-xscale-coff: Remove.
1226         * config/arm/t-xscale-elf: Remove.
1227         * config/arm/xscale-coff.h: Remove.
1228         * config/arm/xscale-elf.h: Remove.
1229         * config/chorus.h: Remove.
1230         * config/cris/aout.h: Remove.
1231         * config/cris/aout.opt: Remove.
1232         * config/cris/t-aout: Remove.
1233         * config/i386/beos-elf.h: Remove.
1234         * config/i386/kaos-i386.h: Remove.
1235         * config/i386/ptx4-i.h: Remove.
1236         * config/i386/sco5.h: Remove.
1237         * config/i386/sco5.opt: Remove.
1238         * config/i386/sysv4-cpp.h: Remove.
1239         * config/i386/sysv5.h: Remove.
1240         * config/i386/t-beos: Remove.
1241         * config/i386/t-sco5: Remove.
1242         * config/i386/t-uwin: Remove.
1243         * config/i386/uwin.asm: Remove.
1244         * config/i386/uwin.h: Remove.
1245         * config/kaos.h: Remove.
1246         * config/mips/windiss.h: Remove.
1247         * config/mt: Remove directory.
1248         * config/pa/pa-osf.h: Remove.
1249         * config/pa/pa-pro-end.h: Remove.
1250         * config/pa/t-pro: Remove.
1251         * config/ptx4.h: Remove.
1252         * config/rs6000/beos.h: Remove.
1253         * config/rs6000/kaos-ppc.h: Remove.
1254         * config/rs6000/t-beos: Remove.
1255         * config/rs6000/windiss.h: Remove.
1256         * config/sh/kaos-sh.h: Remove.
1257         * config/sol2-6.h: Remove.
1258         * config/sparc/sol26-sld.h: Remove.
1259         * config/sparc/sysv4-only.h: Remove.
1260         * config/vax/bsd.h: Remove.
1261         * config/vax/t-memfuncs: Remove.
1262         * config/vax/ultrix.h: Remove.
1263         * config/vax/vaxv.h: Remove.
1264         * config/windiss.h: Remove.
1265
1266 2008-06-06 Uros Bizjak <ubizjak@gmail.com>
1267
1268         PR rtl-optimization/36438
1269         * cse.c (fold_rtx) [ASHIFT, LSHIFTRT, ASHIFTRT]: Break out early
1270         for vector shifts with constant scalar shift operands.
1271
1272 2008-06-06  Sandip Matte  <sandip@rmicorp.com>
1273
1274         * doc/invoke.texi: Document -march=xlr.
1275         * config/mips/xlr.md: New file.
1276         * config/mips/mips.md: Include it.
1277         (cpu): Add "xlr".
1278         * config/mips/mips.h (PROCESSOR_XLR): New processor_type.
1279         * config/mips/mips.c (mips_cpu_info_table): Add an XLR entry.
1280         (mips_rtx_cost_data): Likewise.
1281
1282 2008-06-06  Nathan Froyd  <froydnj@codesourcery.com>
1283
1284         * config/rs6000/rs6000.c (rs6000_mode_dependent_address): Remove
1285         PRE_INC and PRE_DEC cases.
1286
1287 2008-06-06  Jakub Jelinek  <jakub@redhat.com>
1288
1289         PR rtl-optimization/36419
1290         * except.c (expand_resx_expr): Call do_pending_stack_adjust () before
1291         the emitting jump insn.
1292
1293         PR target/36362
1294         * gimplify.c (gimplify_expr) <case TRUTH_NOT_EXPR>: If *expr_p type
1295         is not bool, boolify the whole *expr_p and convert to the desired type.
1296
1297 2008-06-06  Jakub Jelinek  <jakub@redhat.com>
1298
1299         * c-cppbuiltin.c (c_cpp_builtins): Change _OPENMP value to 200805.
1300         * langhooks.h (struct lang_hooks_for_decls): Add omp_finish_clause.
1301         Add omp_private_outer_ref hook, add another argument to
1302         omp_clause_default_ctor hook.
1303         * langhooks-def.h (LANG_HOOKS_OMP_FINISH_CLAUSE): Define.
1304         (LANG_HOOKS_OMP_PRIVATE_OUTER_REF): Define.
1305         (LANG_HOOKS_OMP_CLAUSE_DEFAULT_CTOR): Change to
1306         hook_tree_tree_tree_tree_null.
1307         (LANG_HOOKS_DECLS): Add LANG_HOOKS_OMP_FINISH_CLAUSE and
1308         LANG_HOOKS_OMP_PRIVATE_OUTER_REF.
1309         * hooks.c (hook_tree_tree_tree_tree_null): New function.
1310         * hooks.h (hook_tree_tree_tree_tree_null): New prototype.
1311         * tree.def (OMP_TASK): New tree code.
1312         * tree.h (OMP_TASK_COPYFN, OMP_TASK_ARG_SIZE, OMP_TASK_ARG_ALIGN,
1313         OMP_CLAUSE_PRIVATE_OUTER_REF, OMP_CLAUSE_LASTPRIVATE_STMT,
1314         OMP_CLAUSE_COLLAPSE_ITERVAR, OMP_CLAUSE_COLLAPSE_COUNT,
1315         OMP_TASKREG_CHECK, OMP_TASKREG_BODY, OMP_TASKREG_CLAUSES,
1316         OMP_TASKREG_FN, OMP_TASKREG_DATA_ARG, OMP_TASK_BODY,
1317         OMP_TASK_CLAUSES, OMP_TASK_FN, OMP_TASK_DATA_ARG,
1318         OMP_CLAUSE_COLLAPSE_EXPR): Define.
1319         (enum omp_clause_default_kind): Add OMP_CLAUSE_DEFAULT_FIRSTPRIVATE.
1320         (OMP_DIRECTIVE_P): Add OMP_TASK.
1321         (OMP_CLAUSE_COLLAPSE, OMP_CLAUSE_UNTIED): New clause codes.
1322         (OMP_CLAUSE_SCHEDULE_AUTO): New schedule kind.
1323         * tree.c (omp_clause_code_name): Add OMP_CLAUSE_COLLAPSE
1324         and OMP_CLAUSE_UNTIED entries.
1325         (omp_clause_num_ops): Likewise.  Increase OMP_CLAUSE_LASTPRIVATE
1326         num_ops to 2.
1327         (walk_tree_1): Handle OMP_CLAUSE_COLLAPSE and OMP_CLAUSE_UNTIED.
1328         Walk OMP_CLAUSE_LASTPRIVATE_STMT.
1329         * tree-pretty-print.c (dump_omp_clause): Handle
1330         OMP_CLAUSE_SCHEDULE_AUTO, OMP_CLAUSE_UNTIED, OMP_CLAUSE_COLLAPSE,
1331         OMP_CLAUSE_DEFAULT_FIRSTPRIVATE.
1332         (dump_generic_node): Handle OMP_TASK and collapsed OMP_FOR loops.
1333         * c-omp.c (c_finish_omp_for): Allow pointer iterators.  Remove
1334         warning about unsigned iterators.  Change decl/init/cond/incr
1335         arguments to TREE_VECs, check arguments for all collapsed loops.
1336         (c_finish_omp_taskwait): New function.
1337         (c_split_parallel_clauses): Put OMP_CLAUSE_COLLAPSE clause to
1338         ws_clauses.
1339         * c-parser.c (c_parser_omp_for_loop): Parse collapsed loops.  Call
1340         default_function_array_conversion on init.  Add par_clauses argument.
1341         If decl is present in parallel's lastprivate clause, change it to
1342         shared and add lastprivate clause for decl to OMP_FOR_CLAUSES.
1343         Add clauses argument, on success set OMP_FOR_CLAUSES to it.  Look up
1344         collapse count in clauses.
1345         (c_parser_omp_for, c_parser_omp_parallel): Adjust
1346         c_parser_omp_for_loop callers.
1347         (OMP_FOR_CLAUSE_MASK): Add 1 << PRAGMA_OMP_CLAUSE_COLLAPSE.
1348         (c_parser_pragma): Handle PRAGMA_OMP_TASKWAIT.
1349         (c_parser_omp_clause_name): Handle collapse and untied clauses.
1350         (c_parser_omp_clause_collapse, c_parser_omp_clause_untied): New
1351         functions.
1352         (c_parser_omp_clause_schedule): Handle schedule(auto).
1353         Include correct location in the error message.
1354         (c_parser_omp_all_clauses): Handle PRAGMA_OMP_CLAUSE_COLLAPSE
1355         and PRAGMA_OMP_CLAUSE_UNTIED.
1356         (OMP_TASK_CLAUSE_MASK): Define.
1357         (c_parser_omp_task, c_parser_omp_taskwait): New functions.
1358         (c_parser_omp_construct): Handle PRAGMA_OMP_TASK.
1359         * tree-nested.c (convert_nonlocal_omp_clauses,
1360         convert_local_omp_clauses): Handle OMP_CLAUSE_LASTPRIVATE_STMT,
1361         OMP_CLAUSE_REDUCTION_INIT, OMP_CLAUSE_REDUCTION_MERGE,
1362         OMP_CLAUSE_COLLAPSE and OMP_CLAUSE_UNTIED.
1363         Don't handle TREE_STATIC or DECL_EXTERNAL VAR_DECLs in
1364         OMP_CLAUSE_DECL.
1365         (conver_nonlocal_reference, convert_local_reference,
1366         convert_call_expr): Handle OMP_TASK the same as OMP_PARALLEL.  Use
1367         OMP_TASKREG_* macros rather than OMP_PARALLEL_*.
1368         (walk_omp_for): Adjust for OMP_FOR_{INIT,COND,INCR} changes.
1369         * tree-gimple.c (is_gimple_stmt): Handle OMP_TASK.
1370         * c-tree.h (c_begin_omp_task, c_finish_omp_task): New prototypes.
1371         * c-pragma.h (PRAGMA_OMP_TASK, PRAGMA_OMP_TASKWAIT): New.
1372         (PRAGMA_OMP_CLAUSE_COLLAPSE, PRAGMA_OMP_CLAUSE_UNTIED): New.
1373         * c-typeck.c (c_begin_omp_task, c_finish_omp_task): New functions.
1374         (c_finish_omp_clauses): Handle OMP_CLAUSE_COLLAPSE and
1375         OMP_CLAUSE_UNTIED.
1376         * c-pragma.c (init_pragma): Init omp task and omp taskwait pragmas.
1377         * c-common.h (c_finish_omp_taskwait): New prototype.
1378         * gimple-low.c (lower_stmt): Handle OMP_TASK.
1379         * tree-parloops.c (create_parallel_loop): Create 1 entry
1380         vectors for OMP_FOR_{INIT,COND,INCR}.
1381         * tree-cfg.c (remove_useless_stmts_1): Handle OMP_* containers.
1382         (make_edges): Handle OMP_TASK.
1383         * tree-ssa-operands.c (get_expr_operands): Handle collapsed OMP_FOR
1384         loops, adjust for OMP_FOR_{INIT,COND,INCR} changes.
1385         * tree-inline.c (estimate_num_insns_1): Handle OMP_TASK.
1386         * builtin-types.def (BT_PTR_ULONGLONG, BT_PTR_FN_VOID_PTR_PTR,
1387         BT_FN_BOOL_ULONGLONGPTR_ULONGLONGPTR,
1388         BT_FN_BOOL_BOOL_ULL_ULL_ULL_ULLPTR_ULLPTR,
1389         BT_FN_BOOL_BOOL_ULL_ULL_ULL_ULL_ULLPTR_ULLPTR,
1390         BT_FN_VOID_OMPFN_PTR_OMPCPYFN_LONG_LONG_BOOL_UINT): New.
1391         * omp-builtins.def (BUILT_IN_GOMP_TASK, BUILT_IN_GOMP_TASKWAIT,
1392         BUILT_IN_GOMP_LOOP_ULL_STATIC_START,
1393         BUILT_IN_GOMP_LOOP_ULL_DYNAMIC_START,
1394         BUILT_IN_GOMP_LOOP_ULL_GUIDED_START,
1395         BUILT_IN_GOMP_LOOP_ULL_RUNTIME_START,
1396         BUILT_IN_GOMP_LOOP_ULL_ORDERED_STATIC_START,
1397         BUILT_IN_GOMP_LOOP_ULL_ORDERED_DYNAMIC_START,
1398         BUILT_IN_GOMP_LOOP_ULL_ORDERED_GUIDED_START,
1399         BUILT_IN_GOMP_LOOP_ULL_ORDERED_RUNTIME_START,
1400         BUILT_IN_GOMP_LOOP_ULL_STATIC_NEXT,
1401         BUILT_IN_GOMP_LOOP_ULL_DYNAMIC_NEXT,
1402         BUILT_IN_GOMP_LOOP_ULL_GUIDED_NEXT,
1403         BUILT_IN_GOMP_LOOP_ULL_RUNTIME_NEXT,
1404         BUILT_IN_GOMP_LOOP_ULL_ORDERED_STATIC_NEXT,
1405         BUILT_IN_GOMP_LOOP_ULL_ORDERED_DYNAMIC_NEXT,
1406         BUILT_IN_GOMP_LOOP_ULL_ORDERED_GUIDED_NEXT,
1407         BUILT_IN_GOMP_LOOP_ULL_ORDERED_RUNTIME_NEXT): New builtins.
1408         * gimplify.c (gimplify_omp_for): Allow pointer type for decl,
1409         handle POINTER_PLUS_EXPR.  If loop counter has been replaced and
1410         original iterator is present in lastprivate clause or if
1411         collapse > 1, set OMP_CLAUSE_LASTPRIVATE_STMT.  Handle collapsed
1412         OMP_FOR loops, adjust for OMP_FOR_{INIT,COND,INCR} changes.
1413         (gimplify_expr): Handle OMP_SECTIONS_SWITCH and OMP_TASK.
1414         (enum gimplify_omp_var_data): Add GOVD_PRIVATE_OUTER_REF.
1415         (omp_notice_variable): Set GOVD_PRIVATE_OUTER_REF if needed,
1416         if it is set, lookup var in outer contexts too.  Handle
1417         OMP_CLAUSE_DEFAULT_FIRSTPRIVATE.  Handle vars that are supposed
1418         to be implicitly determined firstprivate for task regions.
1419         (gimplify_scan_omp_clauses): Set GOVD_PRIVATE_OUTER_REF if needed,
1420         if it is set, lookup var in outer contexts too.  Set
1421         OMP_CLAUSE_PRIVATE_OUTER_REF if GOVD_PRIVATE_OUTER_REF is set.
1422         Handle OMP_CLAUSE_LASTPRIVATE_STMT, OMP_CLAUSE_COLLAPSE and
1423         OMP_CLAUSE_UNTIED.  Take region_type as last argument
1424         instead of in_parallel and in_combined_parallel.
1425         (gimplify_omp_parallel, gimplify_omp_for, gimplify_omp_workshare):
1426         Adjust callers.
1427         (gimplify_adjust_omp_clauses_1): Set OMP_CLAUSE_PRIVATE_OUTER_REF if
1428         GOVD_PRIVATE_OUTER_REF is set.  Call omp_finish_clause langhook.
1429         (new_omp_context): Set default_kind to
1430         OMP_CLAUSE_DEFAULT_UNSPECIFIED for OMP_TASK regions.
1431         (omp_region_type): New enum.
1432         (struct gimplify_omp_ctx): Remove is_parallel and is_combined_parallel
1433         fields, add region_type.
1434         (new_omp_context): Take region_type as argument instead of is_parallel
1435         and is_combined_parallel.
1436         (gimple_add_tmp_var, omp_firstprivatize_variable, omp_notice_variable,
1437         omp_is_private, omp_check_private): Adjust ctx->is_parallel and
1438         ctx->is_combined_parallel checks.
1439         (gimplify_omp_task): New function.
1440         (gimplify_adjust_omp_clauses): Handle OMP_CLAUSE_COLLAPSE and
1441         OMP_CLAUSE_UNTIED.
1442         * omp-low.c (extract_omp_for_data): Use schedule(static)
1443         for schedule(auto).  Handle pointer and unsigned iterators.
1444         Compute fd->iter_type.  Handle POINTER_PLUS_EXPR increments.
1445         Add loops argument.  Extract data for collapsed OMP_FOR loops.
1446         (expand_parallel_call): Assert sched_kind isn't auto,
1447         map runtime schedule to index 3.
1448         (struct omp_for_data_loop): New type.
1449         (struct omp_for_data): Remove v, n1, n2, step, cond_code fields.
1450         Add loop, loops, collapse and iter_type fields.
1451         (workshare_safe_to_combine_p): Disallow combined for if
1452         iter_type is unsigned long long.  Don't combine collapse > 1 loops
1453         unless all bounds and steps are constant.  Adjust extract_omp_for_data
1454         caller.
1455         (expand_omp_for_generic): Handle pointer, unsigned and long long
1456         iterators.  Handle collapsed OMP_FOR loops.  Adjust
1457         for struct omp_for_data changes.  If libgomp function doesn't return
1458         boolean_type_node, add comparison of the return value with 0.
1459         (expand_omp_for_static_nochunk, expand_omp_for_static_chunk): Handle
1460         pointer, unsigned and long long iterators.  Adjust for struct
1461         omp_for_data changes.
1462         (expand_omp_for): Assert sched_kind isn't auto, map runtime schedule
1463         to index 3.  Use GOMP_loop_ull*{start,next} if iter_type is
1464         unsigned long long.  Allocate loops array, pass it to
1465         extract_omp_for_data.  For collapse > 1 loops use always
1466         expand_omp_for_generic.
1467         (omp_context): Add sfield_map and srecord_type fields.
1468         (is_task_ctx, lookup_sfield): New functions.
1469         (use_pointer_for_field): Use is_task_ctx helper.  Change first
1470         argument's type from const_tree to tree.  Clarify comment.
1471         In OMP_TASK disallow copy-in/out sharing.
1472         (build_sender_ref): Call lookup_sfield instead of lookup_field.
1473         (install_var_field): Add mask argument.  Populate both record_type
1474         and srecord_type if needed.
1475         (delete_omp_context): Destroy sfield_map, clear DECL_ABSTRACT_ORIGIN
1476         in srecord_type.
1477         (fixup_child_record_type): Also remap FIELD_DECL's DECL_SIZE{,_UNIT}
1478         and DECL_FIELD_OFFSET.
1479         (scan_sharing_clauses): Adjust install_var_field callers.  For
1480         firstprivate clauses on explicit tasks allocate the var by value in
1481         record_type unconditionally, rather than by reference.
1482         Handle OMP_CLAUSE_PRIVATE_OUTER_REF.  Scan OMP_CLAUSE_LASTPRIVATE_STMT.
1483         Use is_taskreg_ctx instead of is_parallel_ctx.
1484         Handle OMP_CLAUSE_COLLAPSE and OMP_CLAUSE_UNTIED.
1485         (create_omp_child_function_name): Add task_copy argument, use
1486         *_omp_cpyfn* names if it is true.
1487         (create_omp_child_function): Add task_copy argument, if true create
1488         *_omp_cpyfn* helper function.
1489         (scan_omp_parallel): Adjust create_omp_child_function callers.
1490         Rename parallel_nesting_level to taskreg_nesting_level.
1491         (scan_omp_task): New function.
1492         (lower_rec_input_clauses): Don't run constructors for firstprivate
1493         explicit task vars which are initialized by *_omp_cpyfn*.  
1494         Pass outer var ref to omp_clause_default_ctor hook if
1495         OMP_CLAUSE_PRIVATE_OUTER_REF or OMP_CLAUSE_LASTPRIVATE.
1496         Replace OMP_CLAUSE_REDUCTION_PLACEHOLDER decls in
1497         OMP_CLAUSE_REDUCTION_INIT.
1498         (lower_send_clauses): Clear DECL_ABSTRACT_ORIGIN if in task to
1499         avoid duplicate setting of fields.  Handle
1500         OMP_CLAUSE_PRIVATE_OUTER_REF.
1501         (lower_send_shared_vars): Use srecord_type if non-NULL.  Don't
1502         copy-out if TREE_READONLY, only copy-in.
1503         (expand_task_copyfn): New function.
1504         (expand_task_call): New function.
1505         (struct omp_taskcopy_context): New type.
1506         (task_copyfn_copy_decl, task_copyfn_remap_type, create_task_copyfn):
1507         New functions.
1508         (lower_omp_parallel): Rename to...
1509         (lower_omp_taskreg): ... this.  Use OMP_TASKREG_* macros where needed.
1510         Call create_task_copyfn if srecord_type is needed.  Adjust
1511         sender_decl type.
1512         (task_shared_vars): New variable.
1513         (check_omp_nesting_restrictions): Warn if work-sharing,
1514         barrier, master or ordered region is closely nested inside OMP_TASK.
1515         Add warnings for barrier if closely nested inside of work-sharing,
1516         ordered, or master region.
1517         (scan_omp_1): Call check_omp_nesting_restrictions even for
1518         GOMP_barrier calls.  Rename parallel_nesting_level to
1519         taskreg_nesting_level.  Handle OMP_TASK.
1520         (lower_lastprivate_clauses): Even if some lastprivate is found on a
1521         work-sharing construct, continue looking for them on parent parallel
1522         construct.
1523         (lower_omp_for_lastprivate): Add lastprivate clauses
1524         to the beginning of dlist rather than end.  Adjust for struct
1525         omp_for_data changes.
1526         (lower_omp_for): Add rec input clauses before OMP_FOR_PRE_BODY,
1527         not after it.  Handle collapsed OMP_FOR loops, adjust for
1528         OMP_FOR_{INIT,COND,INCR} changes, adjust extract_omp_for_data caller.
1529         (get_ws_args_for): Adjust extract_omp_for_data caller.
1530         (scan_omp_for): Handle collapsed OMP_FOR
1531         loops, adjust for OMP_FOR_{INIT,COND,INCR} changes.
1532         (lower_omp_single_simple): If libgomp function doesn't return
1533         boolean_type_node, add comparison of the return value with 0.
1534         (diagnose_sb_1, diagnose_sb_2): Handle collapsed OMP_FOR
1535         loops, adjust for OMP_FOR_{INIT,COND,INCR} changes.  Handle OMP_TASK.
1536         (parallel_nesting_level): Rename to...
1537         (taskreg_nesting_level): ... this.
1538         (is_taskreg_ctx): New function.
1539         (build_outer_var_ref, omp_copy_decl): Use is_taskreg_ctx instead
1540         of is_parallel_ctx.
1541         (execute_lower_omp): Rename parallel_nesting_level to
1542         taskreg_nesting_level.
1543         (expand_omp_parallel): Rename to...
1544         (expand_omp_taskreg): ... this.  Use OMP_TASKREG_* macros where needed.
1545         Call omp_task_call for OMP_TASK regions.
1546         (expand_omp): Adjust caller, handle OMP_TASK.
1547         (lower_omp_1): Adjust lower_omp_taskreg caller, handle OMP_TASK.
1548
1549         * bitmap.c (bitmap_default_obstack_depth): New variable.
1550         (bitmap_obstack_initialize, bitmap_obstack_release): Do nothing
1551         if argument is NULL and bitmap_default_obstack is already initialized.
1552         * ipa-struct-reorg.c (do_reorg_1): Call bitmap_obstack_release
1553         at the end.
1554         * matrix-reorg.c (matrix_reorg): Likewise.
1555
1556 2008-06-06  Uros Bizjak  <ubizjak@gmail.com>
1557
1558         * config/i386/i386.md (*indirect_jump): Macroize using P
1559         mode iterator.  Remove !TARGET_64BIT from insn constraints.
1560         (*tablejump_1): Ditto.
1561         (*indirect_jump_rex64): Remove insn pattern.
1562         (*tablejump_1_rex64): Ditto.
1563         (eh_return_<mode>): Macroize using P mode iterator from eh_return_di
1564         and eh_return_si insn patterns.
1565
1566 2008-06-06  Richard Guenther  <rguenther@suse.de>
1567
1568         * tree-ssa-structalias.c (merge_smts_into): Remove.
1569         (find_what_p_points_to): Do not bother to compute the
1570         points-to set for pt_anything pointers.
1571         * tree-ssa-operands.c (get_addr_dereference_operands): No NMT
1572         for pt_anything pointers is ok.
1573
1574 2008-06-06  Jan Hubicka  <jh@suse.cz>
1575
1576         * passes.c (execute_ipa_pass_list): Do not regenerate summaries.
1577
1578 2008-06-06  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
1579
1580         * cgraph.c: Fix typos in comments.
1581         (cgraph_availability_names): Fix string typo.
1582         * fold-const.c: Fix typos in comments.
1583         (fold_binary): Fix typo in warning.
1584         * genautomata.c: Fix typos in comments.
1585         (check_presence_pattern_sets): Fix typo in local variable.
1586         (output_description): Fix typo in output.
1587         * ggc-zone.c (ggc_pch_finish): Fix typo in error message.
1588         * hwint.h: Likewise.
1589         * matrix-reorg.c (check_allocation_function): Likewise.
1590         * omega.c (smooth_weird_equations): Likewise.
1591         * auto-inc-dec.c: Fix typos in comments.
1592         * bb-reorder.c: Likewise.
1593         * builtins.c: Likewise.
1594         * c-common.c: Likewise.
1595         * c-cppbuiltin.c: Likewise.
1596         * c-parser.c: Likewise.
1597         * c-pretty-print.c: Likewise.
1598         * cfgcleanup.c: Likewise.
1599         * cfgexpand.c: Likewise.
1600         * cfghooks.c: Likewise.
1601         * cfglayout.c: Likewise.
1602         * cfgloopmanip.c: Likewise.
1603         * cgraphunit.c: Likewise.
1604         * coverage.c: Likewise.
1605         * dbxout.c: Likewise.
1606         * df-byte-scan.c: Likewise.
1607         * df-core.c: Likewise.
1608         * df-problems.c: Likewise.
1609         * df-scan.c: Likewise.
1610         * dfp.c: Likewise.
1611         * dominance.c: Likewise.
1612         * domwalk.c: Likewise.
1613         * dse.c: Likewise.
1614         * dwarf2out.c: Likewise.
1615         * emit-rtl.c: Likewise.
1616         * et-forest.c: Likewise.
1617         * function.c: Likewise.
1618         * function.h: Likewise.
1619         * gcc.c: Likewise.
1620         * gcov-io.c: Likewise.
1621         * gcov.c: Likewise.
1622         * gcse.c: Likewise.
1623         * genattrtab.c: Likewise.
1624         * ggc-page.c: Likewise.
1625         * gimplify.c: Likewise.
1626         * gthr-lynx.h: Likewise.
1627         * haifa-sched.c: Likewise.
1628         * ipa-cp.c: Likewise.
1629         * ipa-inline.c: Likewise.
1630         * ipa-prop.h: Likewise.
1631         * ipa-pure-const.c: Likewise.
1632         * ipa-struct-reorg.c: Likewise.
1633         * ipa-struct-reorg.h: Likewise.
1634         * ipa-type-escape.c: Likewise.
1635         * ipa.c: Likewise.
1636         * loop-doloop.c: Likewise.
1637         * mips-tfile.c: Likewise.
1638         * mkmap-flat.awk: Likewise.
1639         * mkmap-symver.awk: Likewise.
1640         * modulo-sched.c: Likewise.
1641         * omp-low.c: Likewise.
1642         * optabs.c: Likewise.
1643         * optabs.h: Likewise.
1644         * opts.c: Likewise.
1645         * passes.c: Likewise.
1646         * postreload-gcse.c: Likewise.
1647         * postreload.c: Likewise.
1648         * predict.c: Likewise.
1649         * pretty-print.h: Likewise.
1650         * profile.c: Likewise.
1651         * protoize.c: Likewise.
1652         * ra-conflict.c: Likewise.
1653         * real.c: Likewise.
1654         * recog.c: Likewise.
1655         * regclass.c: Likewise.
1656         * regs.h: Likewise.
1657         * reload.c: Likewise.
1658         * rtl-error.c: Likewise.
1659         * rtlanal.c: Likewise.
1660         * scan.h: Likewise.
1661         * sched-rgn.c: Likewise.
1662         * see.c: Likewise.
1663         * stmt.c: Likewise.
1664         * target.h: Likewise.
1665         * tree-dfa.c: Likewise.
1666         * tree-eh.c: Likewise.
1667         * tree-flow-inline.h: Likewise.
1668         * tree-inline.c: Likewise.
1669         * tree-into-ssa.c: Likewise.
1670         * tree-loop-distribution.c: Likewise.
1671         * tree-nested.c: Likewise.
1672         * tree-parloops.c: Likewise.
1673         * tree-pass.h: Likewise.
1674         * tree-pretty-print.c: Likewise.
1675         * tree-profile.c: Likewise.
1676         * tree-scalar-evolution.c: Likewise.
1677         * tree-sra.c: Likewise.
1678         * tree-ssa-alias-warnings.c: Likewise.
1679         * tree-ssa-ccp.c: Likewise.
1680         * tree-ssa-coalesce.c: Likewise.
1681         * tree-ssa-dom.c: Likewise.
1682         * tree-ssa-dse.c: Likewise.
1683         * tree-ssa-forwprop.c: Likewise.
1684         * tree-ssa-live.c: Likewise.
1685         * tree-ssa-live.h: Likewise.
1686         * tree-ssa-loop-im.c: Likewise.
1687         * tree-ssa-loop-ivopts.c: Likewise.
1688         * tree-ssa-loop-niter.c: Likewise.
1689         * tree-ssa-loop-prefetch.c: Likewise.
1690         * tree-ssa-phiopt.c: Likewise.
1691         * tree-ssa-phiprop.c: Likewise.
1692         * tree-ssa-sccvn.c: Likewise.
1693         * tree-ssa-ter.c: Likewise.
1694         * tree-ssa-threadupdate.c: Likewise.
1695         * tree-ssa.c: Likewise.
1696         * tree-vect-analyze.c: Likewise.
1697         * tree-vect-transform.c: Likewise.
1698         * tree-vectorizer.c: Likewise.
1699         * tree-vn.c: Likewise.
1700         * tree-vrp.c: Likewise.
1701         * tree.c: Likewise.
1702         * tree.def: Likewise.
1703         * tree.h: Likewise.
1704         * unwind-dw2-fde.c: Likewise.
1705         * unwind.inc: Likewise.
1706         * value-prof.c: Likewise.
1707         * vmsdbgout.c: Likewise.
1708
1709 2008-06-05  David Edelsohn  <edelsohn@gnu.org>
1710
1711         * config/rs6000/xcoff.h (ASM_OUTPUT_SPECIAL_POOL_ENTRY_P): Do not
1712         always place FP constants in the TOC for TARGET_POWERPC64.
1713         * config/rs6000/linux64.h (ASM_OUTPUT_SPECIAL_POOL_ENTRY_P): Same.
1714
1715 2008-06-05  Joseph Myers  <joseph@codesourcery.com>
1716
1717         * config.gcc (powerpc-*-linux*spe*): Use t-dfprules.
1718         * config/rs6000/dfp.md (negdd2, absdd2, negtd2, abstd2): Do not
1719         enable for TARGET_E500_DOUBLE.
1720         (*movdd_softfloat32): Also enable for !TARGET_FPRS.
1721         * config/rs6000/rs6000.c (invalid_e500_subreg): Treat decimal
1722         floating-point modes like integer modes for E500 double.
1723         (rs6000_legitimate_offset_address_p): Likewise.
1724         (rs6000_legitimize_address): Likewise.  Do not allow REG+REG
1725         addressing for DDmode for E500 double.
1726         (rs6000_hard_regno_nregs): Do not treat decimal floating-point
1727         modes as using 64-bits of registers for E500 double.
1728         (spe_build_register_parallel): Do not handle DDmode or TDmode.
1729         (rs6000_spe_function_arg): Do not handle DDmode or TDmode
1730         specially for E500 double.
1731         (function_arg): Do not call rs6000_spe_function_arg for DDmode or
1732         TDmode for E500 double.
1733         (rs6000_gimplify_va_arg): Only handle SDmode in registers
1734         specially if TARGET_HARD_FLOAT && TARGET_FPRS.
1735         (rs6000_split_multireg_move): Do not handle TDmode specially for
1736         E500 double.
1737         (spe_func_has_64bit_regs_p): Do not treat DDmode or TDmode as
1738         using 64-bit registers for E500 double.
1739         (emit_frame_save): Do not handle DDmode specially for E500 double.
1740         (gen_frame_mem_offset): Likewise.
1741         (rs6000_function_value): Do not call spe_build_register_parallel
1742         for DDmode or TDmode.
1743         (rs6000_libcall_value): Likewise.
1744         * config/rs6000/rs6000.h (LOCAL_ALIGNMENT, MEMBER_TYPE_FORCES_BLK,
1745         DATA_ALIGNMENT, CLASS_MAX_NREGS): Do not handle DDmode specially
1746         for E500 double.
1747
1748 2008-06-04  H.J. Lu  <hongjiu.lu@intel.com>
1749
1750         * config/i386/i386.c (setup_incoming_varargs_64): Fix a typo
1751         in comments.
1752
1753 2008-06-04  Junjie Gu <jgu@tensilica.com>
1754
1755         * config/xtensa/lib2funcs.S (__xtensa_nonlocal_goto): Use unsigned
1756         comparison for frame pointers.
1757
1758 2008-06-04  Andy Hutchinson  <hutchinsonandy@aim.com>
1759
1760         PR target/27386
1761         * config/avr/avr.h (PUSH_ROUNDING): Remove.
1762
1763 2008-06-04  Andy Hutchinson  <hutchinsonandy@aim.com>
1764
1765         PR target/30243
1766         * builtins.c (expand_builtin_signbit): Don't take lowpart when
1767         register is already smaller or equal to required mode. 
1768
1769 2008-06-04  Xinliang David Li  <davidxl@google.com>
1770
1771         * tree-call-cdce.c: New file. 
1772         (cond_dead_built_in_calls): New static variable.
1773         (input_domain): New struct.
1774         (check_pow): New function.
1775         (check_builtin_call): Ditto.
1776         (check_target_format): Ditto.
1777         (is_call_dce_candidate): Ditto.
1778         (gen_one_condition): Ditto.
1779         (gen_conditions_for_domain): Ditto.
1780         (get_domain): Ditto.
1781         (gen_conditions_for_pow_cst_base): Ditto.
1782         (gen_conditions_for_pow_int_base): Ditto.
1783         (gen_conditions_for_pow): Ditto.
1784         (get_no_error_domain): Ditto.
1785         (gen_shrink_wrap_conditions): Ditto.
1786         (shrink_wrap_one_built_in_call): Ditto.
1787         (shink_wrap_conditional_dead_built_in_calls): Ditto.
1788         (tree_call_cdce): Ditto.
1789         (gate_call_cdce): Ditto.
1790         (pass_call_cdce): New gimple pass.
1791         * passes.c: (init_optimization_passes): New pass.
1792         * tree-pass.h: New pass declaration.
1793         * opts.c (decode_options): New flag setting.
1794         * common.opt: Add -ftree-builtin-call-dce flag.
1795         * Makefile.in: Add new source file.
1796         * tempvar.def: New tv_id.
1797         * doc/invoke.texi (-ftree-builtin-call-dce): New flag.
1798
1799 2008-06-04  Richard Guenther  <rguenther@suse.de>
1800
1801         * tree-flow-inline.h (is_global_var): Do not check TREE_STATIC on MTAGs.
1802         (is_call_clobbered): Always check var_ann->call_clobbered.
1803         (mark_call_clobbered): Always set var_ann->call_clobbered.
1804         (clear_call_clobbered): Always clear var_ann->call_clobbered.
1805         * tree-ssa-alias.c (mark_non_addressable): Use clear_call_clobbered.
1806         (reset_alias_info): Clear call clobbering info on MTAGs and
1807         globals as well.
1808         (set_pt_anything): Set pt_global_mem.
1809         (create_tag_raw): Adjust comment.
1810         (may_be_aliased): Do not check TREE_PUBLIC on MTAGs.
1811
1812 2008-06-04  Joseph Myers  <joseph@codesourcery.com>
1813             Maxim Kuvyrkov  <maxim@codesourcery.com>
1814
1815         * config/m68k/m68k.opt (mxgot): New option.
1816         * config/m68k/m68k.c (legitimize_pic_address): Handle -mxgot.
1817         (m68k_output_addr_const_extra): New.
1818         * config/m68k/m68k.h (OUTPUT_ADDR_CONST_EXTRA): New.
1819         * config/m68k/m68k-protos.h (m68k_output_addr_const_extra): Declare.
1820         * config/m68k/m68k.md (UNSPEC_GOTOFF): Define.
1821         * doc/invoke.texi (M680x0 Options): Document -mxgot.
1822
1823 2008-06-04  Richard Guenther  <rguenther@suse.de>
1824
1825         * tree-ssa-structalias.c (handle_ptr_arith): Correctly handle
1826         negative or non-representable offsets.
1827
1828 2008-06-03  H.J. Lu  <hongjiu.lu@intel.com>
1829
1830         * config/i386/i386.c (ix86_gen_leave): New.
1831         (ix86_gen_pop1): Likewise.
1832         (ix86_gen_add3): Likewise.
1833         (ix86_gen_sub3): Likewise.
1834         (ix86_gen_sub3_carry): Likewise.
1835         (ix86_gen_one_cmpl2): Likewise.
1836         (ix86_gen_monitor): Likewise.
1837         (override_options): Initialize ix86_gen_leave, ix86_gen_pop1,
1838         ix86_gen_add3, ix86_gen_sub3, ix86_gen_sub3_carry,
1839         ix86_gen_one_cmpl2 and ix86_gen_monitor.
1840         (ix86_file_end): Use mov%z0 instead of mov{q}/mov{l}.
1841         (output_set_got): Use mov%z0, pop%z0 and add%z0 instead of
1842         mov{q}/mov{l}, pop{q}/pop{l} and add{q}/add{l}.
1843         (ix86_expand_epilogue): Updated.
1844         (print_operand): Handle integer register operand for 'z'.
1845         (ix86_expand_strlensi_unroll_1): Likewise.
1846         (ix86_expand_strlen): Likewise.
1847         (ix86_expand_builtin): Likewise.
1848         (x86_output_mi_thunk): Use mov%z1 and add%z1 instead of
1849         mov{q}/mov{l} and add{q}/add{l}.
1850
1851 2008-06-03  Kai Tietz  <kai.tietz@onevision.com>
1852
1853         * config/i386/i386.md (P): New mode iterator.
1854         (SFmode push_operand splitter): Macroize DImode and SImode pushes
1855         using P mode iterator.
1856         (DFmode push_operand splitter): Ditto.
1857         (XFmode push_operand splitter): Ditto.
1858         (DFmode float_extend SFmode push_operand splitter): Ditto.
1859         (XFmode float_extend SFmode push_operand splitter): Do not generate
1860         SImode pushes for 64bit target.  Macroize Dimode and SImode
1861         pushes using P mode iterator.
1862         (XFmode float_extend DFmode push_operand splitter): Ditto.
1863
1864 2008-06-03  Kai Tietz  <kai.tietz@onevision.com>
1865
1866         * config/i386/i386-protos.h (ix86_reg_parm_stack_space): New.
1867         * config/i386/i386.h (ix86_reg_parm_stack_space): Removed prototype.
1868         * config/i386/i386.c (ix86_reg_parm_stack_space): Changed
1869         return type to int.
1870         (ix86_call_abi_override): Remove check for call_used_regs.
1871
1872 2008-06-03  Richard Guenther  <rguenther@suse.de>
1873
1874         * tree-ssa-structalias.c (find_func_aliases): Add constraints
1875         for the lhs of calls if the return type contains pointers.
1876
1877 2008-06-03  Kai Tietz  <kai.tietz@onevision.com>
1878
1879         * doc/tm.texi (OVERRIDE_ABI_FORMAT): New.
1880         * doc/extend.texi (ms_abi,sysv_abi): New attribute description.
1881         * function.c (allocate_struct_function): Use of OVERRIDE_ABI_FORMAT.
1882         * config/i386/cygming.h (TARGET_64BIT_MS_ABI): Make use
1883         of cfun and DEFAULT_ABI to deceide abi mode.
1884         (DEFAULT_ABI): New.
1885         (REG_PARM_STACK_SPACE): Removed.
1886         (OUTGOING_REG_PARM_STACK_SPACE): Removed.
1887         (STACK_BOUNDARY): Use default target to deceide stack boundary.
1888         * config/i386/i386-protos.h (ix86_cfun_abi): New.
1889         (ix86_function_abi): Likewise.
1890         (ix86_function_type_abi): Likewise.
1891         (ix86_call_abi_override): Likewise.
1892         * confid/i386/i386.md (SSE_REGPARM_MAX): Replaced by abi
1893         specific define X86_64_SSE_REGPARM_MAX/X64_SSE_REGPARM_MAX.
1894         * config/i386/i386.c (override_options): Replace TARGET_64BIT_MS_ABI.
1895         (X86_64_VARARGS_SIZE): Replace REGPARM_MAX and SSE_REGPARM_MAX by abi
1896         specific defines.
1897         (X86_64_REGPARM_MAX): New.
1898         (X86_64_SSE_REGPARM_MAX): New.
1899         (X64_REGPARM_MAX): New.
1900         (X64_SSE_REGPARM_MAX): New.
1901         (X86_32_REGPARM_MAX): New.
1902         (X86_32_SSE_REGPARM_MAX): New.
1903         (ix86_handle_cconv_attribute): Replace TARGET_64BIT_MS_ABI.
1904         (ix86_function_regparm): Handle user calling abi.
1905         (ix86_function_arg_regno_p): Replace TARGET_64BIT_MS_ABI
1906         by DEFAULT_ABI versus SYSV_ABI check.
1907         (ix86_reg_parm_stack_space): New.
1908         (ix86_function_type_abi): New.
1909         (ix86_call_abi_override): New.
1910         (ix86_function_abi): New.
1911         (ix86_cfun_abi): New.
1912         (init_cumulative_args): Call abi specific initialization.
1913         (function_arg_advance): Remove TARGET_64BIT_MS_ABI.
1914         (function_arg_64): Extend SSE_REGPARM_MAX check.
1915         (function_arg (): Remove TARGET_64BIT_MS_ABI.
1916         (ix86_pass_by_reference): Likewise.
1917         (ix86_function_value_regno_p): Likewise.
1918         (function_value_64): Replace REGPARM_MAX, and SSE_REGPARM_MAX.
1919         (ix86_function_value_1): Replace TARGET_64BIT_MS_ABI.
1920         (return_in_memory_ms_64): Replace TARGET_64BIT_MS_ABI.
1921         (ix86_build_builtin_va_list): Replace TARGET_64BIT_MS_ABI.
1922         (setup_incoming_varargs_64): Adjust regparm for call abi.
1923         (ix86_setup_incoming_varargs): Replace TARGET_64BIT_MS_ABI.
1924         (ix86_va_start): Likewise.
1925         (ix86_gimplify_va_arg): Likewise.
1926         (ix86_expand_prologue): Likewise.
1927         (output_pic_addr_const): Likewise.
1928         (ix86_init_machine_status): Initialize call_abi by DEFAULT_ABI.
1929         (x86_this_parameter): Replace TARGET_64BIT_MS_ABI.
1930         (x86_output_mi_thunk): Likewise.
1931         (x86_function_profiler): Likewise.
1932         * config/i386/i386.h (TARGET_64BIT_MS_ABI): Use ix64_cfun_abi.
1933         (SYSV_ABI, MS_ABI): New constants.
1934         (DEFAULT_ABI): New.
1935         (init_regs): Add prototype of function in regclass.c file.
1936         (OVERRIDE_ABI_FORMAT): New.
1937         (CONDITIONAL_REGISTER_USAGE): Remove TARGET_64BIT_MS_ABI part.
1938         (REG_PARM_STACK_SPACE): Use ix86_reg_parm_stack_space.
1939         (OUTGOING_REG_PARM_STACK_SPACE): New.
1940         (ix86_reg_parm_stack_space): New prototype.
1941         (CUMULATIVE_ARGS): Add call_abi member.
1942         (machine_function): Add call_abi member.
1943         * config/i386/mingw32.h (EXTRA_OS_CPP_BUILTINS): Replace
1944         TARGET_64BIT_MS_ABI by DEFAULT_ABI compare to MS_ABI.
1945
1946 2008-06-02  Andy Hutchinson  <hutchinsonandy@aim.com> 
1947
1948         PR target/34879
1949         * config/avr/avr.c (TARGET_BUILTIN_SETJMP_FRAME_VALUE): Redefine.
1950         (avr_builtin_setjmp_frame_value): New function.
1951         * config/avr/avr.md (nonlocal_goto_receiver): Define.
1952         (nonlocal_goto): Define.
1953
1954 2008-06-02  Richard Sandiford  <rdsandiford@googlemail.com>
1955
1956         * config/mips/mips.c (mips_emit_loadgp): Return early if
1957         there is nothing do to, otherwise emit a blockage if
1958         !TARGET_EXPLICIT_RELOCS || crtl->profile.
1959         * config/mips/mips.md (loadgp_blockage): Use SI rather than DI.
1960
1961 2008-06-02  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
1962
1963         * configure.ac: Drop unneeded backslash ending up in config.in.
1964         * acinclude.m4: Likewise.
1965         * config.in: Regenerate.
1966
1967 2008-05-26  Jan Hubicka  <jh@suse.cz>
1968
1969         * predict.c (maybe_hot_frequency_p): Break out of...
1970         (maybe_hot_bb_p): ... here.
1971         (maybe_hot_edge_p): New.
1972         * tree-ssa-coalesce.c (coalesce_cost_edge): Compute cost based on edge.
1973         * basic-block.h (maybe_hot_edge_p): Declare.
1974
1975 2008-05-31  Uros Bizjak  <ubizjak@gmail.com>
1976
1977         * config/i386/i386.md (*cmpfp_<mode>): Enable for optimize_size.
1978         (*cmpfp_<mode>_cc): Ditto.
1979         (*fp_jcc_8<mode>_387): Ditto.
1980         (*fop_<MODEF:mode>_2_i387): Ditto.
1981         (*fop_<MODEF:mode>_3_i387): Ditto.
1982         (*fop_xf_2_i387): Ditto.
1983         (*fop_xf_3_i387): Ditto.
1984
1985 2008-06-02  Tomas Bily  <tbily@suse.cz>
1986
1987         * tree-ssa-ifcombine.c (get_name_for_bit_test): Use CONVERT_EXPR_P.
1988
1989 2008-06-01  Richard Sandiford  <rdsandiford@googlemail.com>
1990
1991         * config/mips/mips.c (mips_valid_offset_p): New function.
1992         (mips_valid_lo_sum_p): Likewise.
1993         (mips_classify_address): Use them.
1994         (mips_force_address): New function.
1995         (mips_legitimize_address): Use it.
1996         * config/mips/mips.md (MOVE128): New mode iterator.
1997         (movtf): Require TARGET_64BIT.  Remove empty strings.
1998         (*movtf_internal): Rename to...
1999         (*movtf): ...this and require !TARGET_MIPS16.  Use "m" instead
2000         of "R" and use {,fp}{load,store} attributes instead of "multi".
2001         Use a separate define_split.
2002         (*movtf_mips16): New pattern.
2003
2004 2008-06-01  Richard Sandiford  <rdsandiford@googlemail.com>
2005
2006         * config/mips/mips-protos.h (mips_expand_before_return): Declare.
2007         * config/mips/mips.c (mips_expand_before_return): New function.
2008         (mips_expand_epilogue): Call it.
2009         * config/mips/mips.md (return): Turn into a define_expand.
2010         (*return): New insn.
2011
2012 2008-06-01  Richard Sandiford  <rdsandiford@googlemail.com>
2013
2014         * rtl.h (emit_clobber, gen_clobber, emit_use, gen_use): Declare.
2015         * emit-rtl.c (emit_clobber, gen_clobber, emit_use, gen_use): New
2016         functions.  Do not emit uses and clobbers of CONCATs; individually
2017         use and clobber their operands.
2018         * builtins.c (expand_builtin_setjmp_receiver): Use emit_clobber,
2019         gen_clobber, emit_use and gen_use.
2020         (expand_builtin_longjmp, expand_builtin_nonlocal_goto): Likewise.
2021         (expand_builtin_return): Likewise.
2022         * cfgbuild.c (count_basic_blocks): Likewise.
2023         * cfgrtl.c (rtl_flow_call_edges_add): Likewise.
2024         * explow.c (emit_stack_restore): Likewise.
2025         * expmed.c (extract_bit_field_1): Likewise.
2026         * expr.c (convert_move, emit_move_complex_parts): Likewise.
2027         (emit_move_multi_word, store_constructor): Likewise.
2028         * function.c (do_clobber_return_reg, do_use_return_reg): Likewise.
2029         (thread_prologue_and_epilogue_insns): Likewise.
2030         * lower-subreg.c (resolve_simple_move): Likewise.
2031         * optabs.c (widen_operand, expand_binop): Likewise.
2032         (expand_doubleword_bswap, emit_no_conflict_block): Likewise.
2033         * reload.c (find_reloads): Likewise.
2034         * reload1.c (eliminate_regs_in_insn): Likewise.
2035         * stmt.c (expand_nl_goto_receiver): Likewise.
2036         * config/alpha/alpha.md (builtin_longjmp): Likewise.
2037         * config/arc/arc.md (*movdi_insn, *movdf_insn): Likewise.
2038         * config/arm/arm.c (arm_load_pic_register): Likewise.
2039         (thumb1_expand_epilogue, thumb_set_return_address): Likewise.
2040         * config/arm/arm.md (untyped_return): Likewise.
2041         * config/arm/linux-elf.h (PROFILE_HOOK): Likewise.
2042         * config/avr/avr.c (expand_prologue): Likewise.
2043         * config/bfin/bfin.c (do_unlink): Likewise.
2044         * config/bfin/bfin.md (<optab>di3, adddi3, subdi3): Likewise.
2045         * config/cris/cris.c (cris_expand_prologue): Likewise.
2046         * config/darwin.c (machopic_indirect_data_reference): Likewise.
2047         (machopic_legitimize_pic_address): Likewise.
2048         * config/frv/frv.c (frv_frame_access, frv_expand_epilogue): Likewise.
2049         (frv_ifcvt_modify_insn, frv_expand_mdpackh_builtin): Likewise.
2050         * config/i386/i386.c (ix86_expand_vector_move_misalign): Likewise.
2051         (ix86_expand_convert_uns_didf_sse): Likewise.
2052         (ix86_expand_vector_init_general): Likewise.
2053         * config/ia64/ia64.md (eh_epilogue): Likewise.
2054         * config/iq2000/iq2000.c (iq2000_expand_epilogue): Likewise.
2055         * config/m32c/m32c.c (m32c_emit_eh_epilogue): Likewise.
2056         * config/m32r/m32r.c (m32r_reload_lr): Likewise.
2057         (config/iq2000/iq2000.c): Likewise.
2058         * config/mips/mips.md (fixuns_truncdfsi2): Likewise.
2059         (fixuns_truncdfdi2, fixuns_truncsfsi2, fixuns_truncsfdi2): Likewise.
2060         (builtin_longjmp): Likewise.
2061         * config/mn10300/mn10300.md (call, call_value): Likewise.
2062         * config/pa/pa.md (nonlocal_goto, nonlocal_longjmp): Likewise.
2063         * config/pdp11/pdp11.md (abshi2): Likewise.
2064         * config/rs6000/rs6000.c (rs6000_emit_move): Likewise.
2065         * config/s390/s390.c (s390_emit_prologue): Likewise.
2066         * config/s390/s390.md (movmem_long, setmem_long): Likewise.
2067         (cmpmem_long, extendsidi2, zero_extendsidi2, udivmoddi4): Likewise.
2068         (builtin_setjmp_receiver, restore_stack_nonlocal): Likewise.
2069         * config/sh/sh.c (prepare_move_operands): Likewise.
2070         (output_stack_adjust, sh_expand_epilogue): Likewise.
2071         (sh_set_return_address, sh_expand_t_scc): Likewise.
2072         * config/sparc/sparc.c (load_pic_register): Likewise.
2073         * config/sparc/sparc.md (untyped_return, nonlocal_goto): Likewise.
2074         * config/spu/spu.c (spu_expand_epilogue): Likewise.
2075         * config/v850/v850.c (expand_epilogue): Likewise.
2076
2077 2008-05-31  Anatoly Sokolov  <aesok@post.ru>
2078
2079         * config/avr/avr.md (UNSPECV_WRITE_SP_IRQ_ON): New constants.
2080         (UNSPECV_WRITE_SP_IRQ_OFF): (Ditto.).
2081         (movhi_sp_r_irq_off, movhi_sp_r_irq_on): New insn.
2082         * config/avr/avr.c (expand_prologue, expand_epilogue): Use 
2083         movhi_sp_r_irq_off and movhi_sp_r_irq_on insns for writing to the 
2084         stack pointer register.
2085         (output_movhi): Remove code for interrupt specific writing to the 
2086         stack pointer register.
2087
2088 2008-05-31  Richard Guenther  <rguenther@suse.de>
2089
2090         PR tree-optimization/34244
2091         * fold-const.c (tree_expr_nonnegative_warnv_p): Do not ask VRP.
2092         (tree_expr_nonzero_warnv_p): Likewise.
2093         * tree-vrp.c (vrp_expr_computes_nonnegative): Call
2094         ssa_name_nonnegative_p.
2095         (vrp_expr_computes_nonzero): Call ssa_name_nonzero_p.
2096         (extract_range_from_unary_expr): Use vrp_expr_computes_nonzero,
2097         not tree_expr_nonzero_warnv_p.
2098
2099         PR tree-optimization/36262
2100         Revert
2101         2007-11-29  Zdenek Dvorak  <ook@ucw.cz>
2102
2103         PR tree-optimization/34244
2104         * tree-vrp.c (adjust_range_with_scev): Clear scev cache.
2105         (record_numbers_of_iterations): New function.
2106         (execute_vrp): Cache the numbers of iterations of loops.
2107         * tree-scalar-evolution.c (scev_reset_except_niters):
2108         New function.
2109         (scev_reset): Use scev_reset_except_niters.
2110         * tree-scalar-evolution.h (scev_reset_except_niters): Declare.
2111
2112 2008-05-31  Bernd Schmidt  <bernd.schmidt@analog.com>
2113
2114         * config/bfin/bfin.h (TARGET_CPU_CPP_BUILTINS): Define
2115         __WORKAROUND_RETS when appropriate.
2116
2117 2008-05-31  Uros Bizjak  <ubizjak@gmail.com>
2118
2119         * config/i386/i386.md (*fop_<mode>_comm_mixed): Macroize from
2120         *fop_sf_comm_mixed and *fop_df_comm_mixed insn patterns using MODEF
2121         mode iterator.
2122         (*fop_<mode>_comm_sse): Macroize from *fop_sf_comm_sse and
2123         *fop_df_comm_sse insn patterns using MODEF mode iterator.
2124         (*fop_<mode>_comm_i387): Macroize from *fop_sf_comm_i387 and
2125         *fop_df_comm_i387 insn patterns using MODEF mode iterator.
2126         (*fop_<mode>_1_mixed): Macroize from *fop_sf_1_mixed and
2127         *fop_df_1_mixed insn patterns using MODEF mode iterator.
2128         (*fop_<mode>_1_sse): Macroize from *fop_sf_1_sse and
2129         *fop_df_1_sse insn patterns using MODEF mode iterator.
2130         (*fop_<mode>_1_i387): Macroize from *fop_sf_1_i387 and
2131         *fop_df_1_i387 insn patterns using MODEF mode iterator.
2132         (*fop_<MODEF:mode>_2_i387): Macroize from *fop_sf_2<mode>_i387 and
2133         *fop_df_2<mode>_i387 insn patterns using MODEF mode iterator.
2134         (*fop_<MODEF:mode>_3_i387): Macroize from *fop_sf_3<mode>_i387 and
2135         *fop_df_3<mode>_i387 insn patterns using MODEF mode iterator.
2136         (*fop_xf_2_i387): Rename from *fop_xf_2<mode>_i387.
2137         (*fop_xf_3_i387): Rename from *fop_xf_3<mode>_i387.
2138         (*fop_xf_4_i387): Use <MODE> for mode attribute.
2139         (*fop_xf_5_i387): Ditto.
2140         (*fop_xf_6_i387): Ditto.
2141
2142 2008-05-30  Richard Guenther  <rguenther@suse.de>
2143
2144         * builtins.c (build_string_literal): Avoid generating
2145         a non-gimple_val result.
2146
2147 2008-05-30  DJ Delorie  <dj@redhat.com>
2148
2149         * exec-tool.in: Use an environment variable (private) instead of a
2150         file (shared) as a semaphore, so as to not break parallel builds.
2151
2152 2008-05-30  Steven Bosscher  <stevenb.gcc@gmail.com>
2153
2154         * optabs.c (maybe_encapsulate_block): Remove.
2155         (emit_libcall_block): Adjust accordingly.
2156         * optabs.h (maybe_encapsulate_block): Remove prototype.
2157
2158         * config/rs6000/rs6000.c (rs6000_legitimize_tls_address):
2159         Don't use maybe_encapsulate_block.
2160
2161 2008-05-30  Steven Bosscher  <stevenb.gcc@gmail.com>
2162
2163         * config/rs6000/rs6000.c (rs6000_legitimize_address,
2164         rs6000_legitimize_reload_address, rs6000_emit_move): Make sure an
2165         rtx is a SYMBOL_REF before calling get_pool_constant.
2166
2167 2008-05-30  Eric Botcazou  <ebotcazou@adacore.com>
2168
2169         * fold-const.c (fold_unary) <CASE_CONVERT>: Add ??? comment.
2170
2171 2008-05-30  Danny Smith  <dannysmith@users.sourceforge.net>
2172
2173         * incpath.c: Use HOST_LACKS_INODE_NUMBERS conditional
2174         rather than OS names to choose INO_T_EQ definition.
2175         (DIRS_EQ) [!INO_T_EQ]: Don't worry about case in comparison.
2176         (add_path) [!INO_T_EQ]: Use lrealpath to fill canonical_name field.
2177
2178 2008-05-29  Daniel Franke  <franke.daniel@gmail.com>
2179
2180         PR target/36348
2181         * config/darwin-f.c: New.
2182         * config/t-darwin: Added rule to build darwin-f.o.
2183         * config.gcc: Defined new variable, fortran_target_objs.
2184         (*-*-darwin*): Set fortran_target_objs.
2185         * Makefile.in: Defined new variable FORTRAN_TARGET_OBJS.
2186         * configure.ac: Substitute fortran_target_objs, set FORTRAN_TARGET_OBJS.
2187         * configure: Regenerated.
2188
2189 2008-05-29  H.J. Lu  <hongjiu.lu@intel.com>
2190
2191         PR target/35771
2192         * config/i386/i386.c (ix86_function_arg_boundary): Convert to
2193         canonical type if needed.
2194
2195 2008-05-29  Eric Botcazou  <ebotcazou@adacore.com>
2196
2197         * tree-nested.c (check_for_nested_with_variably_modified): Fix typo.
2198
2199 2008-05-29  Richard Guenther  <rguenther@suse.de>
2200
2201         PR tree-optimization/36343
2202         PR tree-optimization/36346
2203         PR tree-optimization/36347
2204         * tree-flow.h (clobber_what_p_points_to): Declare.
2205         * tree-ssa-structalias.c (set_uids_in_ptset): Whether the
2206         pointed-to variable is dereferenced is irrelevant to whether
2207         the pointer can access the pointed-to variable.
2208         (clobber_what_p_points_to): New function.
2209         * tree-ssa-alias.c (set_initial_properties): Use it.
2210         * tree-ssa.c (verify_flow_sensitive_alias_info): Adjust
2211         call clobber check for NMTs.
2212
2213 2008-05-28  Seongbae Park  <seongbae.park@gmail.com>
2214         
2215         * value-prof.c (tree_ic_transform): Use HOST_WIDEST_INT_PRINT_DEC
2216         for printing gcov_type.
2217
2218 2008-05-28  Seongbae Park  <seongbae.park@gmail.com>
2219
2220         * tree-ssa-propagate.c (set_rhs): Preserve the histogram
2221         and the eh region information.
2222         * value-prof.c (gimple_move_stmt_histograms): New function.
2223         * value-prof.h (gimple_move_stmt_histograms): New function declaration.
2224
2225 2008-05-28  Andreas Tobler  <a.tobler@schweiz.org>
2226
2227         * config/pa/pa.md: Remove extern frame_pointer_needed declaration.
2228
2229 2008-05-28  Seongbae Park <seongbae.park@gmail.com>
2230
2231         * value-prof.c (tree_ic_transform): Print counts.
2232         * tree-profile.c (tree_gen_ic_func_profiler):
2233         Clear __gcov_indreict_call_callee variable to avoid misattribution
2234         of the profile.
2235
2236 2008-05-28  Rafael Espindola  <espindola@google.com>
2237
2238         * see.c (see_def_extension_not_merged): Use copy_rtx_if_shared to avoid
2239         invalid sharing.
2240
2241 2008-05-28  Richard Guenther  <rguenther@suse.de>
2242
2243         PR tree-optimization/36339
2244         * tree-ssa-alias.c (set_initial_properties): Move pt_anything
2245         and clobbering code out of the loop.
2246
2247 2008-05-28  Andreas Krebbel  <krebbel1@de.ibm.com>
2248
2249         * config/s390/constraints.md ('b', 'C', 'D', 'e'): New constraint
2250         letters defined.
2251
2252         * config/s390/s390.c (s390_compare_and_branch_condition_mask,
2253         s390_contiguous_bitmask_p, s390_symref_operand_p,
2254         s390_check_symref_alignment, s390_reload_larl_operand,
2255         s390_reload_symref_address): New functions.
2256         (s390_branch_condition_mnemonic): Support compare and branch
2257         instructions.
2258         (s390_mem_constraint): Avoid symrefs to accepted by the 'T'
2259         and 'W' constraints.
2260         (s390_secondary_reload): Add secondary reloads for unaligned
2261         symbol refs or symbol refs to floating point or QI/TI mode
2262         integer values.
2263         (legitimate_address_p): Accept symbol references as addresses.
2264         (s390_expand_insv): Use rotate and insert selected bits
2265         instruction for insv when building for z10.
2266         (print_operand_address): Handle symbol ref addresses.
2267         (print_operand): Output modifier 'c' added for signed byte values.
2268         (s390_encode_section_info): Mark symbol refs with
2269         SYMBOL_FLAG_NOT_NATURALLY_ALIGNED if appropriate.
2270
2271         * config/s390/s390.md (SIL,RRS,RIS): New instruction formats added.
2272         (length attribute): RRF, RRR have 4 byte length.
2273         (FPALL, INTALL): New mode iterators added.
2274         (*tstdi_sign, *cmpdi_ccs_sign, *cmpsi_ccs_sign,
2275         *cmp<mode>_ccs, *cmpdi_ccu_zero, *cmpdi_ccu, *cmpsi_ccu, *cmphi_ccu,
2276         *movdi_64, *movsi_zarch, *movhi, movmem<mode>, *movmem_short,
2277         *extendsidi2, *extendhidi2_extimm, *extendhisi2_extimm,
2278         *zero_extendsidi2, adddi3, *adddi3_31z, *adddi3_31, addsi3,
2279         *add<mode>3, *add<mode>3_carry1_cc, *add<mode>3_carry2_cc,
2280         *add<mode>3_cc, *add<mode>3_imm_cc, *muldi3_sign, muldi3,
2281         *mulsi3_sign, mulsi3, mulsidi3): Patterns enhanced with z10
2282         instructions.
2283         (*cmphi_ccs_z10, *cmpdi_ccs_signhi_rl, *cmpsi_ccu_zerohi_rlsi,
2284         *cmp<GPR:mode>_ccu_zerohi_rldi, *cmp_and_br_signed_<mode>,
2285         *cmp_and_br_unsigned_<mode>, reload<INTALL:mode><P:mode>_tomem_z10,
2286         reload<INTALL:mode><P:mode>_toreg_z10,
2287         reload<FPALL:mode><P:mode>_tomem_z10,
2288         reload<FPALL:mode><P:mode>_toreg_z10,
2289         reload<P:mode>_larl_odd_addend_z10, *execute_rl, *insv<mode>_z10,
2290         *insv<mode>_z10_noshift, *insv<mode>_or_z10_noshift,
2291         *zero_extendhi<mode>2_z10, *cmp_and_trap_signed_int<mode>,
2292         *cmp_and_trap_unsigned_int<mode>, prefetch): New pattern or expander
2293         definition.
2294         (movmem, clrmem, cmpmem): New splitters added.
2295
2296         * config/s390/predicates.md (larl_operand): Use
2297         SYMBOL_REF_FLAGS (op) & SYMBOL_FLAG_ALIGN1 replaced with
2298         SYMBOL_REF_ALIGN1_P.
2299         (s390_signed_integer_comparison,
2300         s390_unsigned_integer_comparison): New predicates.
2301
2302         * config/s390/s390-protos.h (s390_check_symref_alignment,
2303         s390_contiguous_bitmask_p, s390_reload_larl_operand,
2304         s390_reload_symref_address,
2305         s390_compare_and_branch_condition_mask): Prototypes added.
2306
2307         * config/s390/s390.h (TARGET_MEM_CONSTRAINT,
2308         SYMBOL_REF_ALIGN1_P, SYMBOL_FLAG_NOT_NATURALLY_ALIGNED,
2309         SYMBOL_REF_NOT_NATURALLY_ALIGNED_P): Macro definition added.
2310
2311 2008-05-28  Andreas Krebbel  <krebbel1@de.ibm.com>
2312
2313         * config/s390/s390.c (z10_cost): New cost function for z10.
2314         (s390_handle_arch_option, override_options): Support -march=z10 switch.
2315         (s390_issue_rate): Adjust issue rate for z10.
2316         * config/s390/s390.h (processor_type): Add PROCESSOR_2097_Z10.
2317         (processor_flags): Add PF_Z10.
2318         (TARGET_CPU_Z10, TARGET_Z10): New macro definitions.
2319         * config/s390/s390.md (cpu, cpu_facility attributes): Add z10.
2320         * gcc/config.gcc: Add z10.
2321
2322 2008-05-28  Richard Guenther  <rguenther@suse.de>
2323
2324         PR tree-optimization/36291
2325         * tree-flow. h (struct gimple_df): Remove var_anns member.
2326         * tree-flow-inline.h (gimple_var_anns): Remove.
2327         (var_ann): Simplify.
2328         * tree-dfa.c (create_var_ann): Simplify.
2329         (remove_referenced_var): Clear alias info from var_anns of globals.
2330         * tree-ssa.c (init_tree_ssa): Do not allocate var_anns.
2331         (delete_tree_ssa): Clear alias info from var_anns of globals.
2332         Do not free var_anns.
2333         (var_ann_eq): Remove.
2334         (var_ann_hash): Likewise.
2335
2336 2008-05-28  Mark Shinwell  <shinwell@codesourcery.com>
2337
2338         * config/mips/mips.c (mips_cpu_info_table): Add loongson2e
2339         and loongson2f entries.
2340         (mips_rtx_cost_data): Add entries for Loongson-2E/2F.
2341         * config/mips/mips.h (processor_type): Add Loongson-2E
2342         and Loongson-2F entries.
2343         (TARGET_LOONGSON_2E, TARGET_LOONGSON_2F, TARGET_LOONGSON_2EF): New.
2344         (MIPS_ISA_LEVEL_SPEC): Handle Loongson-2E/2F.
2345         * config/mips/mips.md (define_attr cpu): Add loongson2e and loongson2f.
2346         * doc/invoke.texi (MIPS Options): Document loongson2e
2347         and loongson2f processor names.
2348
2349 2008-05-27  H.J. Lu  <hongjiu.lu@intel.com>
2350
2351         PR target/35767
2352         PR target/35771
2353         * config/i386/i386.c (ix86_function_arg_boundary): Use
2354         alignment of canonical type.
2355         (ix86_expand_vector_move): Check unaligned memory access for
2356         all SSE modes.
2357
2358 2008-05-27  H.J. Lu  <hongjiu.lu@intel.com>
2359
2360         * dwarf2out.c (current_fde): Change return type to dw_fde_ref.
2361         Moved to the front of file.
2362
2363 2008-05-27  Xuepeng Guo  <xuepeng.guo@intel.com>
2364             H.J. Lu  <hongjiu.lu@intel.com>
2365
2366         * dwarf2out.c (current_fde): New.
2367         (add_cfi): Use it.
2368         (lookup_cfa:): Likewise.
2369         (dwarf2out_end_epilogue): Likewise.
2370         (dwarf2out_note_section_used): Likewise.
2371
2372 2008-05-27  Michael Matz  <matz@suse.de>
2373
2374         PR c++/27975
2375         * c.opt (Wenum-compare): New warning option.
2376         * doc/invoke.texi  (Warning Options): Document -Wenum-compare.
2377
2378 2008-05-27  Michael Matz  <matz@suse.de>
2379
2380         PR middle-end/36326
2381         * tree-gimple.c (is_gimple_mem_rhs): Remove work-around for
2382         non-BLKmode types.
2383         * tree-tailcall.c (find_tail_calls): Don't mark calls storing
2384         into memory as tail calls.
2385
2386 2008-05-27  Richard Guenther  <rguenther@suse.de>
2387
2388         PR tree-optimization/36339
2389         * tree-ssa-alias.c (set_initial_properties): Escaped pt_anything
2390         pointers cause all addressable variables to be call clobbered.
2391
2392 2008-05-27  Richard Guenther  <rguenther@suse.de>
2393
2394         PR tree-optimization/36245
2395         * tree-ssa-address.c (add_to_parts): Deal with non-pointer bases.
2396
2397 2008-05-27  Andreas Krebbel  <krebbel1@de.ibm.com>
2398
2399         * config/s390/s390.md: Replace all occurences of the 'm'
2400         constraint with 'RT'.
2401
2402 2008-05-27  Andreas Krebbel  <krebbel1@de.ibm.com>
2403
2404         * config/s390/s390.md ("cpu_facility", "enabled"): Attribute
2405         definitions added.
2406         ("*movdi_64dfp", "*movdi_64extimm", "*movdi_64"): Merged into
2407         "*movdi_64".
2408         ("*anddi3_extimm", "*anddi3"): Merged into "*anddi3".
2409         ("*iordi3_extimm", "*iordi3"): Merged into "*iordi3".
2410         ("*xordi3_extimm", "*xordi3"): Merged into "*xordi3".
2411
2412 2008-05-27  Andreas Krebbel  <krebbel1@de.ibm.com>
2413
2414         * reload.c: (find_reloads): Skip alternatives according to the
2415         "enabled" attribute. Constify the constraint variable.
2416         * recog.c (get_attr_enabled): Add default implementation.
2417         (extract_insn): Set the alternative_enabled_p array
2418         in the recog_data struct.
2419         (preprocess_constraints, constrain_operands): Skip
2420         alternatives according to the "enabled" attribute
2421         * recog.h (struct recog_data): New field alternative_enabled_p.
2422         (skip_alternative): New inline function.
2423         * regclass.c: (record_operand_costs): Check the "enabled" attribute.
2424         (record_reg_classes): Skip alternative according to the
2425         "enabled" attribute.
2426
2427         * doc/md.texi: Add documention for the "enabled" attribute.
2428
2429 2008-05-27  Andreas Krebbel  <krebbel1@de.ibm.com>
2430
2431         * defaults.h (TARGET_MEM_CONSTRAINT): New target macro added.
2432         * postreload.c (reload_cse_simplify_operands): Replace 'm'
2433         constraint with TARGET_MEM_CONSTRAINT.
2434         * recog.c (asm_operand_ok, preprocess_constraints,
2435         constrain_operands): Likewise.
2436         * regclass.c (record_reg_classes): Likewise.
2437         * reload.c (find_reloads, alternative_allows_const_pool_ref): Likewise.
2438         * reload1.c (maybe_fix_stack_asms): Likewise.
2439         * stmt.c (parse_output_constraint, parse_input_constraint): Likewise.
2440         * recog.h: Adjust comment.
2441         * genpreds.c (generic_constraint_letters): Remove 'm' constraint.
2442         * genoutput.c (note_constraint): Don't emit error for 'm' constraint.
2443         * doc/md.texi: Add a note to description of 'm' constraint.
2444         * doc/tm.texi: Document the new TARGET_MEM_CONSTRAINT macro.
2445
2446 2008-05-27  Eric Botcazou  <ebotcazou@adacore.com>
2447
2448         * tree-sra.c (sra_type_can_be_decomposed_p) <RECORD_TYPE>: Make sure
2449         that the bitfield is of integral type before testing its precision.
2450
2451 2008-05-27  Trevor Smigiel  <trevor_smigiel@playstation.sony.com>
2452             Sa Liu  <saliu@de.ibm.com> 
2453
2454         * config/spu/spu.c (spu_init_libfuncs): Add __multi3, __divti3, 
2455         __modti3, __udivti3, __umodti3 and __udivmodti4.
2456         * config/spu/t-spu-elf (LIB2FUNCS_STATIC_EXTRA): Add files
2457         that implement TImode mul and div functions.
2458         * config/spu/multi3.c: New. Implement __multi3.
2459         * config/spu/divmodti4.c: New. Implement _udivmodti4 and others.
2460         * testsuite/gcc.target/spu/muldivti3.c: New. Test TImode mul and div
2461         functions on SPU.
2462
2463 2008-05-26  Steven Bosscher  <stevenb.gcc@gmail.com>
2464
2465         * config/rs6000/rs6000.c (rs6000_legitimize_tls_address): Generate
2466         new tls_gd_* and tls_ld_* insns instead of an insn sequence.
2467         * config/rs6000/rs6000.md (TLSmode, tls_abi_suffix, tls_insn_suffix,
2468         tls_sysv_suffix): New mode and mode attribute iterators.
2469         (tls_gd_32, tls_gd_64, tls_ld_32, tls_ld_64): Remove.
2470         (lts_gd_aix*, tls_gd_sysv*, tls_ld_aix*, tls_ld_sysv*): New patterns.
2471         (tls_dtprel_*, tls_dtprel_ha_*, tls_dtprel_lo_*, tls_got_dtprel_*,
2472         tls_tprel_*, tls_tprel_ha_*, tls_tprel_lo_*, tls_got_tprel_*,
2473         tls_tls_*): Merge 32 bit and 64 bit variants using aforementioned
2474         iterators.
2475
2476 2008-05-26  Eric Botcazou  <ebotcazou@adacore.com>
2477
2478         PR tree-optimization/36329
2479         * tree.h (CALL_CANNOT_INLINE_P): Add access check.
2480         * tree-gimple.h (CALL_STMT_CANNOT_INLINE_P): New macro.
2481         * cgraphbuild.c (initialize_inline_failed): Use the latter
2482         macro in lieu of the former.
2483         * ipa-inline.c (cgraph_mark_inline): Likewise.
2484         (cgraph_decide_inlining_of_small_function): Likewise.
2485         (cgraph_decide_inlining): Likewise.
2486         (cgraph_decide_inlining_incrementally): Likewise.
2487
2488 2008-05-26  Tristan Gingold  <gingold@adacore.com>
2489             Anatoly Sokolov  <aesok@post.ru>
2490
2491         * config/avr/avr.md ("call_prologue_saves"): Use hi8(gs())/lo8(gs())
2492         instead of pm_lo8/pm_hi8 to makes this call working on avr6.
2493         * config/avr/avr.c (expand_prologue): Tune "call_prologue" 
2494         optimization for 'avr6' architecture.
2495
2496 2008-05-26  Andy Hutchinson  <hutchinsonandy@aim.com>
2497
2498         PR target/34932
2499         * config/avr/avr.md (*addhi3_zero_extend2): Remove.
2500
2501 2008-05-26  Richard Guenther  <rguenther@suse.de>
2502
2503         * tree-ssa-sccvn.c (expr_has_constants): Declare.
2504         (visit_reference_op_load): Initialize VN_INFO->has_constants properly.
2505
2506 2008-05-26  H.J. Lu  <hongjiu.lu@intel.com>
2507
2508         PR middle-end/36253
2509         * caller-save.c (insert_restore): Verify alignment of spill space.
2510         (insert_save): Likewise.
2511         * cfgexpand.c (LOCAL_ALIGNMENT): Removed.
2512         * defaults.h (LOCAL_ALIGNMENT): New. Provide default.
2513         (STACK_SLOT_ALIGNMENT): Likewise.
2514         * function.c (LOCAL_ALIGNMENT): Removed.
2515         (get_stack_local_alignment): New.
2516         (assign_stack_local): Use it.  Set alignment on stack slot.
2517         (assign_stack_temp_for_type): Use get_stack_local_alignment.
2518         * config/i386/i386.h (LOCAL_ALIGNMENT): Updated.
2519         (STACK_SLOT_ALIGNMENT): New.
2520         * config/i386/i386.c (ix86_local_alignment): Handle caller-save
2521         stack slot in XFmode.
2522
2523         * doc/tm.texi (STACK_SLOT_ALIGNMENT): New.
2524
2525 2008-05-26  Kai Tietz  <kai.tietz@onevision.com>
2526
2527         PR/36321
2528         * config/i386/i386.md (allocate_stack_worker_64): Make sure
2529         argument operand in rax isn't removed.
2530
2531 2008-05-26  Richard Guenther  <rguenther@suse.de>
2532
2533         PR middle-end/36300
2534         * fold-const.c (extract_muldiv_1): Use TYPE_OVERFLOW_WRAPS,
2535         not TYPE_UNSIGNED.  Use TYPE_PRECISION instead of GET_MODE_SIZE.
2536
2537 2008-05-26  Daniel Franke  <franke.daniel@gmail.com>
2538
2539         PR bootstrap/36331
2540         * c-cppbuiltin.c (define__GNUC__): Re-add definition of __GNUG__.
2541
2542 2008-05-26  Dominique Dhumieres  <dominiq@lps.ens.fr>
2543
2544         * config/darwin-c.c: Include "incpath.h" instead of "c-incpath.h".
2545         * config/t-darwin: Use "incpath.h" instead of "c-incpath.h".
2546
2547 2008-05-25  Eric Botcazou  <ebotcazou@adacore.com>
2548
2549         * tree-nested.c (convert_tramp_reference) <ADDR_EXPR>: Do not
2550         build a trampoline if we don't want one.
2551         * varasm.c (initializer_constant_valid_p) <ADDR_EXPR>: Do not
2552         return zero for nested functions if we don't want a trampoline.
2553
2554 2008-05-26  Daniel Franke  <franke.daniel@gmail.com>
2555
2556         * doc/invoke.texi: Added f77, f77-cpp-input to list of file types.
2557
2558 2008-05-26  Daniel Franke  <franke.daniel@gmail.com>
2559
2560         PR fortran/18428
2561         * c.opt: Removed undocumented option '-lang-fortran'.
2562         * c-common.h: Removed global variable 'lang_fortran'.
2563         * c-opts.c (c_common_handle_option): Removed code to handle
2564         option '-lang-fortran'. Updated includes.
2565         * c-cppbuiltin.c (c_cpp_builtins): Removed conditional
2566         definition of '__GFORTRAN__'.
2567         (define__GNUC__): Reimplemented to use BASEVER and
2568         cpp_define_formatted.
2569         (builtin_define_with_value_n): Removed.
2570         * c-incpath.h: Renamed to ...
2571         * incpath.h: ... this.
2572         * c-incpath.c: Renamed to ...
2573         * incpath.c: ... this. Updated includes.
2574         * fix-header.c: Updated includes.
2575         * Makefile.in: Replaced c-incpath.[ch] by incpath.[ch].
2576         (c-cppbuiltin.o): Added dependency on and definition of BASEVER.
2577         (OBJ-archive): Added cppdefault.o, incpath.o and prefix.o.
2578
2579 2008-05-25  Eric Botcazou  <ebotcazou@adacore.com>
2580
2581         * tree.h: Update the table of flags used on tree nodes.
2582         (TREE_NO_TRAMPOLINE): New accessor for static_flag.
2583         (SAVE_EXPR_RESOLVED_P): Use automatically-built access check.
2584         (FORCED_LABEL): Add access check.
2585         (CALL_EXPR_RETURN_SLOT_OPT): Likewise.
2586         (ASM_INPUT_P): Likewise.
2587         (ASM_VOLATILE_P): Likewise.
2588         (EH_FILTER_MUST_NOT_THROW): Access static_flag directly.
2589         (OMP_SECTION_LAST): Access private_flag directly.
2590         (OMP_RETURN_NOWAIT): Likewise.
2591         (OMP_PARALLEL_COMBINED): Likewise.
2592         (OMP_CLAUSE_PRIVATE_DEBUG): Access public_flag directly.
2593         (OMP_CLAUSE_LASTPRIVATE_FIRSTPRIVATE): Likewise.
2594         * tree-ssa-propagate.c (STMT_IN_SSA_EDGE_WORKLIST): Access
2595         deprecated_flag directly.
2596
2597 2008-05-25  H.J. Lu  <hongjiu.lu@intel.com>
2598
2599         * final.c (frame_pointer_needed): Removed.
2600         * flags.h (frame_pointer_needed): Likewise.
2601
2602         * function.h (rtl_data): Add frame_pointer_needed.
2603         (frame_pointer_needed): New.
2604
2605 2008-05-25  Arthur Loiret  <arthur.loiret@u-psud.fr>
2606
2607         * config.gcc (sh2[lbe]*-*-linux*): Allow target.
2608
2609 2008-05-25  Steven Bosscher  <stevenb.gcc@gmail.com>
2610
2611         * gcse.c (hash_scan_set): Do not pick up a REG_EQUAL value if
2612         SRC is a REG.
2613
2614 2008-05-25  Alan Modra  <amodra@bigpond.net.au>
2615
2616         * c-common.c (strip_array_types): Move function to..
2617         * tree.c: ..here.
2618         (get_inner_array_type): Delete.
2619         * c-common.h (strip_array_types): Move declaration to..
2620         * tree.h: ..here.
2621         (get_inner_array_type): Delete.
2622         * config/i386/i386.c (x86_field_alignment): Use strip_array_types.
2623         * config/rs6000/aix.h (ADJUST_FIELD_ALIGN): Likewise.
2624         * config/rs6000/linux64.h (ADJUST_FIELD_ALIGN): Likewise.
2625         * config/pa/pa.c (emit_move_sequence): Likewise.
2626
2627 2008-05-24  H.J. Lu  <hongjiu.lu@intel.com>
2628
2629         * config/i386/i386.md (*sse_prologue_save_insn): Set length
2630         attribute to 34.
2631
2632 2008-05-24  Andy Hutchinson  <hutchinsonandy@aim.com>
2633
2634         * function.c: Include target hook for nonlocal_goto frame value.
2635
2636 2008-05-24  Richard Guenther  <rguenther@suse.de>
2637
2638         * tree-dfa.c (refs_may_alias_p): Re-instantiate case that a scalar
2639         variable can be only accessed through a pointer or a union.
2640
2641 2008-05-24  Kaveh R. Ghazi  <ghazi@caip.rutgers.edu>
2642
2643         * builtins.c (fold_builtin_fpclassify): Fix spelling of FP_INFINITE.
2644         * doc/extend.texi: Likewise.
2645
2646 2008-05-23  DJ Delorie  <dj@redhat.com>
2647
2648         * config/m32c/jump.md (untyped_call): Add.
2649
2650         * config/m32c/m32c.c (m32c_return_addr_rtx): Change pointer type
2651         for A24 to PSImode.
2652         (m32c_address_cost): Detail costs for indirect offsets.
2653
2654 2008-05-23  Rafael Espindola  <espindola@google.com>
2655
2656         * see.c (see_get_extension_data): Don't use SUBREG_REG to test
2657         if a node is a SUBREG.
2658         (see_analyze_one_def): Don't use SUBREG_REG to test if a node
2659         is a SUBREG.
2660
2661 2008-05-23  Paul Brook  <paul@codesourcery.com>
2662             Carlos O'Donell  <carlos@codesourcery.com>
2663
2664         * doc/extend.texi: Clarify use of __attribute__((naked)).
2665         * doc/tm.texi: Document TARGET_ALLOCATE_STACK_SLOTS_FOR_ARGS.
2666         * target.h (gcc_target): Add allocate_stack_slots_for_args.
2667         * function.c (use_register_for_decl): Use
2668         targetm.calls.allocate_stack_slots_for_args.
2669         * target-def.h (TARGET_CALLS): Add TARGET_ALLOCATE_STACK_SLOTS_FOR_ARGS.
2670         * config/arm/arm.c (arm_allocate_stack_slots_for_args): New function.
2671         (TARGET_ALLOCATE_STACK_SLOTS_FOR_ARGS): Define.
2672
2673 2008-05-23  Eric Botcazou  <ebotcazou@adacore.com>
2674
2675         * expr.c (highest_pow2_factor) <BIT_AND_EXPR>: New case.
2676
2677 2008-05-23  Steven Munroe  <sjmunroe@us.ibm.com>
2678
2679         * config/rs6000/darwin-ldouble.c (fmsub): Eliminate the full
2680         PACK/UNPACK between FP_SUB_Q and FD_TRUNC so that the result
2681         is only rounded once.
2682
2683 2008-05-23  Richard Guenther  <rguenther@suse.de>
2684
2685         * tree-ssa-operands.c (mark_difference_for_renaming): Use bitmap_xor.
2686
2687 2008-05-23  Uros Bizjak  <ubizjak@gmail.com>
2688             Jakub Jelinek  <jakub@redhat.com>
2689
2690         PR target/36079
2691         * configure.ac: Handle --enable-cld.
2692         * configure: Regenerated.
2693         * config.gcc: Add USE_IX86_CLD to tm_defines for x86 targets.
2694         * config/i386/i386.h (struct machine_function): Add needs_cld field.
2695         (ix86_current_function_needs_cld): New define.
2696         * config/i386/i386.md (UNSPEC_CLD): New unspec volatile constant.
2697         (cld): New isns pattern.
2698         (strmov_singleop, rep_mov, strset_singleop, rep_stos, cmpstrnqi_nz_1,
2699         cmpstrnqi_1, strlenqi_1): Set ix86_current_function_needs_cld flag.
2700         * config/i386/i386.opt (mcld): New option.
2701         * config/i386/i386.c (ix86_expand_prologue): Emit cld insn if
2702         TARGET_CLD and ix86_current_function_needs_cld.
2703         (override_options): Use -mcld by default for 32-bit code if
2704         USE_IX86_CLD.
2705
2706         * doc/install.texi (Options specification): Document --enable-cld.
2707         * doc/invoke.texi (Machine Dependent Options)
2708         [i386 and x86-64 Options]: Add -mcld option.
2709         (Intel 386 and AMD x86-64 Options): Document -mcld option.
2710
2711 2008-05-23  Kai Tietz  <kai.tietz@onevison.com>
2712         * config/i386/i386.c (return_in_memory_32): Add ATTRIBUTE_UNUSED.
2713         (return_in_memory_64): Likewise.
2714         (return_in_memory_ms_64): Likewise.
2715
2716 2008-05-23  Kaveh R. Ghazi  <ghazi@caip.rutgers.edu>
2717
2718         * builtin-types.def (BT_FN_INT_INT_INT_INT_INT_INT_VAR): New.
2719         * builtins.c (fold_builtin_fpclassify): New.
2720         (fold_builtin_varargs): Handle BUILT_IN_FPCLASSIFY.
2721         * builtins.def (BUILT_IN_FPCLASSIFY): New.
2722         * c-common.c (handle_type_generic_attribute): Adjust to accept
2723         fixed arguments before an elipsis.
2724         (check_builtin_function_arguments): Handle BUILT_IN_FPCLASSIFY.
2725         * doc/extend.texi: Document __builtin_fpclassify.
2726
2727 2008-05-22  Aldy Hernandez  <aldyh@redhat.com>
2728
2729         * omp-low.c (gate_expand_omp_ssa): Remove.
2730         (pass_expand_omp_ssa): Remove.
2731         (gate_expand_omp): Do not check for flag_openmp_ssa.
2732         * common.opt (-fopenmp-ssa): Remove.
2733         * passes.c (init_optimization_passes): Remove pass_expand_omp_ssa.
2734
2735 2008-05-22  Kaz Kojima  <kkojima@gcc.gnu.org>
2736
2737         * config/sh/sh.opt (mfixed-range): New option.
2738         * config/sh/sh-protos.h (sh_fix_range): Declare.
2739         * config/sh/sh.c (sh_fix_range): New function.
2740         * config/sh/sh.h (sh_fixed_range_str): Declare.
2741         (OVERRIDE_OPTIONS): Call sh_fix_range if sh_fixed_range_str
2742         is not empty.
2743         * doc/invoke.texi (SH Options): Document -mfixed-range.
2744
2745 2008-05-22  Kai Tietz  <kai.tietz@onevision.com>
2746
2747         * config/i386/sol2-10.h (SUBTARGET_RETURN_IN_MEMORY): Undefine
2748         it before the redeclaration.
2749
2750 2008-05-22  Anatoly Sokolov <aesok@post.ru>
2751
2752         * config/avr/avr.c (get_sequence_length): Add new function.
2753         (expand_prologue, expand_epilogue): Remove duplicate code.
2754
2755 2008-05-22  Rafael Espindola  <espindola@google.com>
2756
2757         * see.c (see_pre_insert_extensions): Use copy_rtx to avoid invalid rtx
2758         sharing.
2759
2760 2008-05-22  H.J. Lu  <hongjiu.lu@intel.com>
2761
2762         * defaults.h (UNITS_PER_SIMD_WORD): Add scalar mode as argument.
2763         * doc/tm.texi (UNITS_PER_SIMD_WORD): Likewise.
2764
2765         * tree-vect-analyze.c (vect_compute_data_ref_alignment): Replace
2766         UNITS_PER_SIMD_WORD with GET_MODE_SIZE (TYPE_MODE (vectype)).
2767         (vect_update_misalignment_for_peel): Likewise.
2768         (vector_alignment_reachable_p): Likewise.
2769         * tree-vect-transform.c (vectorizable_load): Likewise.
2770         * tree-vectorizer.c (vect_supportable_dr_alignment): Likewise.
2771         (get_vectype_for_scalar_type): Pass mode of scalar_type
2772         to UNITS_PER_SIMD_WORD.
2773
2774         * config/arm/arm.h (UNITS_PER_SIMD_WORD): Updated.
2775         * config/i386/i386.h (UNITS_PER_SIMD_WORD): Likewise.
2776         * config/mips/mips.h (UNITS_PER_SIMD_WORD): Likewise.
2777         * config/rs6000/rs6000.h (UNITS_PER_SIMD_WORD): Likewise.
2778         * config/sparc/sparc.h (UNITS_PER_SIMD_WORD): Likewise.
2779
2780 2008-05-22  Ira Rosen  <irar@il.ibm.com>
2781
2782         PR tree-optimization/36293
2783         * tree-vect-transform.c (vect_transform_strided_load): Don't check
2784         if the first load must be skipped because of a gap.
2785
2786 2008-05-22  Richard Guenther  <rguenther@suse.de>
2787
2788         * tree-dfa.c (refs_may_alias_p): Exit early if possible.  Handle
2789         more cases of offset disambiguation that is possible if
2790         strict-aliasing rules apply.
2791         * tree-ssa-loop-im.c (mem_refs_may_alias_p): Use refs_may_alias_p
2792         for basic offset and type-based disambiguation.
2793
2794 2008-05-21  H.J. Lu  <hongjiu.lu@intel.com>
2795
2796         * config/i386/i386.c (ix86_expand_vector_init_one_var): Use
2797         ix86_expand_vector_set on V16QImode for SSE4.1.
2798
2799 2008-05-21  Tom Tromey  <tromey@redhat.com>
2800
2801         * c.opt (Wimport): Mark as undocumented.
2802         * doc/invoke.texi (Option Summary): Don't mention -Wimport or
2803         -Wno-import.
2804         (Warning Options): Likewise.
2805         * doc/cppopts.texi: Don't mention -Wimport.
2806
2807 2008-05-21  Sebastian Pop  <sebastian.pop@amd.com>
2808
2809         PR tree-optimization/36287
2810         PR tree-optimization/36286
2811         * lambda-code.c (build_access_matrix): Do not use the loop->num
2812         for computing the number of induction variables: use the loop depth
2813         instead.
2814
2815 2008-05-21  Kai Tietz  <kai.tietz@onevision.com>
2816
2817         PR/36280
2818         * config/i386/cygming.h (ASM_OUTPUT_LABELREF): Honor
2819         option -f(no-)leading-underscore.
2820
2821 2008-05-21  H.J. Lu  <hongjiu.lu@intel.com>
2822
2823         * config/i386/i386.c (ix86_expand_vector_init_general): Use
2824         GET_MODE_NUNITS (mode).
2825
2826 2008-05-21  Peter Bergner  <bergner@vnet.ibm.com>
2827
2828         * doc/invoke.texi: Add cpu_type's 464 and 464fp.
2829         (-mmulhw): Add 464 to description.
2830         (-mdlmzb): Likewise.
2831         * config.gcc: Handle --with-cpu=464 and --with-cpu=464fp.
2832         * config/rs6000/rs6000.c (processor_target_table): Add 464 and
2833         464fp entries.
2834         * config/rs6000/rs6000.h (ASM_CPU_SPEC): Add 464 and 464fp support.
2835         * config/rs6000/t-fprules (MULTILIB_MATCHES_FLOAT): Include -mcpu=464.
2836         * config/rs6000/rs6000.md: Update comments for 464.
2837
2838 2008-05-21  Janis Johnson  <janis187@us.ibm.com>
2839
2840         * doc/sourcebuild.texi (Test Directives): Add dg-xfail-run-if.
2841
2842 2008-05-21  H.J. Lu  <hongjiu.lu@intel.com>
2843
2844         * config/i386/sse.md (vec_extractv4sf): Removed.
2845         (vec_extractv2df): Likewise.
2846         (vec_extractv2di): Likewise.
2847         (vec_extractv4si): Likewise.
2848         (vec_extractv8hi): Likewise.
2849         (vec_extractv16qi): Likewise.
2850         (vec_extract<mode>): New.
2851
2852 2008-05-21  H.J. Lu  <hongjiu.lu@intel.com>
2853
2854         * config/i386/sse.md (vec_setv4sf): Removed.
2855         (vec_setv2df): Likewise.
2856         (vec_setv2di): Likewise.
2857         (vec_setv4si): Likewise.
2858         (vec_setv8hi): Likewise.
2859         (vec_setv16qi): Likewise.
2860         (vec_set<mode>): New.
2861
2862 2008-05-21  H.J. Lu  <hongjiu.lu@intel.com>
2863
2864         * config/i386/i386.c (ix86_expand_vector_init_general): Remove
2865         goto for vec_concat and vec_interleave.
2866
2867 2008-05-21  H.J. Lu  <hongjiu.lu@intel.com>
2868
2869         * config/i386/sse.md (vec_initv4sf): Removed.
2870         (vec_initv2df): Likewise.
2871         (vec_initv2di): Likewise.
2872         (vec_initv4si): Likewise.
2873         (vec_initv8hi): Likewise.
2874         (vec_initv16qi): Likewise.
2875         (vec_init<mode>): New.
2876
2877 2008-05-21  Joseph Myers  <joseph@codesourcery.com>
2878
2879         * collect2.c (find_a_file): Use IS_ABSOLUTE_PATH.
2880
2881 2008-05-21  Tom Tromey  <tromey@redhat.com>
2882
2883         * ggc-zone.c (lookup_page_table_if_allocated): New function.
2884         (zone_find_object_offset): Likewise.
2885         (gt_ggc_m_S): Likewise.
2886         (highest_bit): Likewise.
2887         * ggc-page.c (gt_ggc_m_S): New function.
2888         * stringpool.c (string_stack): Remove.
2889         (init_stringpool): Update.
2890         (ggc_alloc_string): Use ggc_alloc.
2891         (maybe_delete_ident): New function.
2892         (ggc_purge_stringpool): Likewise.
2893         (gt_ggc_m_S): Remove.
2894         * ggc-common.c (ggc_protect_identifiers): New global.
2895         (ggc_mark_roots): Call ggc_purge_stringpool.  Use
2896         ggc_protect_identifiers.
2897         * ggc.h (ggc_protect_identifiers): Declare.
2898         (gt_ggc_m_S): Update.
2899         (ggc_purge_stringpool): Declare.
2900         * toplev.c (compile_file): Set and reset ggc_protect_identifiers.
2901         * gengtype.c (write_types_process_field) <TYPE_STRING>: Remove
2902         special case.
2903         (write_root): Cast gt_ggc_m_S to gt_pointer_walker.
2904
2905 2008-05-21  David S. Miller  <davem@davemloft.net>
2906
2907         * config.gcc (sparc-*-linux*): Always include sparc/t-linux in
2908         tmake_file.
2909
2910 2008-05-21  Eric Botcazou  <ebotcazou@adacore.com>
2911
2912         * cfgexpand.c (tree_expand_cfg): Zap the EH throw statement table
2913         once finished.
2914
2915 2008-05-20  David Daney  <ddaney@avtrex.com>
2916
2917         * config/mips/mips.md (UNSPEC_SYNC_NEW_OP_12,
2918         UNSPEC_SYNC_OLD_OP_12, UNSPEC_SYNC_EXCHANGE_12): New define_constants.
2919         (UNSPEC_SYNC_EXCHANGE, UNSPEC_MEMORY_BARRIER, UNSPEC_SET_GOT_VERSION,
2920         UNSPEC_UPDATE_GOT_VERSION): Renumber.
2921         (optab, insn): Add 'plus' and 'minus' to define_code_attr.
2922         (atomic_hiqi_op): New define_code_iterator.
2923         (sync_compare_and_swap<mode>): Call mips_expand_atomic_qihi instead of
2924         mips_expand_compare_and_swap_12.
2925         (compare_and_swap_12): Use MIPS_COMPARE_AND_SWAP_12 instead of
2926         MIPS_COMPARE_AND_SWAP_12_0.  Pass argument to MIPS_COMPARE_AND_SWAP_12.
2927         (sync_<optab><mode>, sync_old_<optab><mode>,
2928         sync_new_<optab><mode>, sync_nand<mode>, sync_old_nand<mode>,
2929         sync_new_nand<mode>): New define_expands for HI and QI mode operands.
2930         (sync_<optab>_12, sync_old_<optab>_12, sync_new_<optab>_12,
2931         sync_nand_12, sync_old_nand_12, sync_new_nand_12): New insns.
2932         (sync_lock_test_and_set<mode>): New define_expand for HI and QI modes.
2933         (test_and_set_12): New insn.
2934         (sync_old_add<mode>, sync_new_add<mode>, sync_old_<optab><mode>,
2935         sync_new_<optab><mode>, sync_old_nand<mode>,
2936         sync_new_nand<mode>, sync_lock_test_and_set<mode>):  Add early
2937         clobber to operand 0 for SI and DI mode insns.
2938         * config/mips/mips-protos.h (mips_gen_fn_6, mips_gen_fn_5,
2939         mips_gen_fn_4): New typedefs.
2940         (mips_gen_fn_ptrs): Define new union type.
2941         (mips_expand_compare_and_swap_12): Remove declaration.
2942         (mips_expand_atomic_qihi): Declare function.
2943         * config/mips/mips.c (mips_expand_compare_and_swap_12): Rename to...
2944         (mips_expand_atomic_qihi): ... this.  Use new generator function
2945         parameter.
2946         * config/mips/mips.h (MIPS_COMPARE_AND_SWAP_12): Add OPS parameter.
2947         (MIPS_COMPARE_AND_SWAP_12_0): Delete macro.
2948         (MIPS_COMPARE_AND_SWAP_12_ZERO_OP, MIPS_COMPARE_AND_SWAP_12_NONZERO_OP,
2949         MIPS_SYNC_OP_12, MIPS_SYNC_OP_12_NOT_NOP,
2950         MIPS_SYNC_OP_12_NOT_NOT, MIPS_SYNC_OLD_OP_12,
2951         MIPS_SYNC_OLD_OP_12_NOT_NOP, MIPS_SYNC_OLD_OP_12_NOT_NOP_REG,
2952         MIPS_SYNC_OLD_OP_12_NOT_NOT, MIPS_SYNC_OLD_OP_12_NOT_NOT_REG,
2953         MIPS_SYNC_NEW_OP_12, MIPS_SYNC_NEW_OP_12_NOT_NOP,
2954         MIPS_SYNC_NEW_OP_12_NOT_NOT, MIPS_SYNC_EXCHANGE_12,
2955         MIPS_SYNC_EXCHANGE_12_ZERO_OP, MIPS_SYNC_EXCHANGE_12_NONZERO_OP):
2956         New macros.
2957
2958 2008-05-20  H.J. Lu  <hongjiu.lu@intel.com>
2959
2960         * config/i386/i386.c (ix86_expand_vector_init_one_nonzero): Add
2961         the missing break.
2962
2963 2008-05-20  Anatoly Sokolov <aesok@post.ru>
2964
2965         * config/avr/avr.h (machine_function): Add 'is_OS_main' field.
2966         * config/avr/avr.c (avr_OS_main_function_p): Add new function.
2967         (avr_attribute_table): Add 'OS_main' function attribute.
2968         (avr_regs_to_save, expand_prologue, expand_epilogue): Handle
2969         functions with 'OS_main' attribute.
2970
2971 2008-05-20  Richard Guenther  <rguenther@suse.de>
2972
2973         PR tree-optimization/35204
2974         * tree-ssa-sccvn.c (extract_and_process_scc_for_name): New
2975         helper, split out from ...
2976         (DFS): ... here.  Make the DFS walk non-recursive.
2977
2978 2008-05-20  Sebastian Pop  <sebastian.pop@amd.com>
2979             Jan Sjodin  <jan.sjodin@amd.com>
2980
2981         PR tree-optimization/36181
2982         * tree-parloops.c (loop_has_vector_phi_nodes): New.
2983         (parallelize_loops): Don't parallelize when the loop has vector
2984         phi nodes.
2985
2986 2008-05-20  Jan Sjodin  <jan.sjodin@amd.com>
2987             Sebastian Pop  <sebastian.pop@amd.com>
2988
2989         * tree-loop-linear.c (gather_interchange_stats): Look in the access
2990         matrix, and never look at the tree representation of the memory
2991         accesses.
2992         (linear_transform_loops): Computes parameters and access matrices.
2993         * tree-data-ref.c (compute_data_dependences_for_loop): Returns false
2994         when fails.
2995         (access_matrix_get_index_for_parameter): New.
2996         * tree-data-ref.h (struct access_matrix): New.
2997         (AM_LOOP_NEST_NUM, AM_NB_INDUCTION_VARS, AM_PARAMETERS, AM_MATRIX,
2998         AM_NB_PARAMETERS, AM_CONST_COLUMN_INDEX, AM_NB_COLUMNS,
2999         AM_GET_SUBSCRIPT_ACCESS_VECTOR, AM_GET_ACCESS_MATRIX_ELEMENT,
3000         am_vector_index_for_loop): New.
3001         (struct data_reference): Add field access_matrix.
3002         (DR_ACCESS_MATRIX): New.
3003         (compute_data_dependences_for_loop): Update declaration.
3004         (lambda_collect_parameters, lambda_compute_access_matrices): Declared.
3005         * lambda.h (lambda_vector_vec_p): Declared.
3006         * lambda-code.c: Depend on pointer-set.h.
3007         (lambda_collect_parameters_from_af, lambda_collect_parameters,
3008         av_for_af_base, av_for_af, build_access_matrix,
3009         lambda_compute_access_matrices): New.
3010         * Makefile.in (lambda-code.o): Depend on pointer-set.h.
3011
3012 2008-05-20  Joseph Myers  <joseph@codesourcery.com>
3013
3014         * doc/install.texi2html: Generate gcc-vers.texi in $DESTDIR not
3015         $SOURCEDIR/include.
3016
3017 2008-05-20  Jan Sjodin  <jan.sjodin@amd.com>
3018             Sebastian Pop  <sebastian.pop@amd.com>
3019
3020         PR tree-optimization/36206
3021         * tree-scalar-evolution.c: Remove enum INSERT_SUPERLOOP_CHRECS,
3022         FOLD_CONVERSIONS.
3023         (instantiate_scev_1): Rename flags to fold_conversions.
3024         Do not check for INSERT_SUPERLOOP_CHRECS, keep SSA_NAMEs defined
3025         outeside instantiation_loop.
3026         * tree-chrec.h (evolution_function_is_affine_in_loop): New.
3027         (evolution_function_is_affine_or_constant_p): Removed.
3028         * tree-data-ref.c (dr_analyze_indices): Replace resolve_mixers with
3029         instantiate_scev.
3030         (analyze_siv_subscript): Pass in the loop nest number.
3031         Call evolution_function_is_affine_in_loop instead of 
3032         evolution_function_is_affine_p.
3033         (analyze_overlapping_iterations): Pass in the loop nest number.
3034
3035 2008-05-20  Jan Sjodin  <jan.sjodin@amd.com>
3036             Sebastian Pop  <sebastian.pop@amd.com>
3037
3038         PR tree-optimization/36206
3039         * tree-chrec.h (chrec_fold_op): New.
3040         * tree-data-ref.c (initialize_matrix_A): Traverse NOP_EXPR, PLUS_EXPR,
3041         and other trees.
3042
3043 2008-05-20  Nathan Sidwell  <nathan@codesourcery.com>
3044
3045         * c-incpath.c (INO_T_EQ): Do not define on non-inode systems.
3046         (DIRS_EQ): New.
3047         (remove_duplicates): Do not set inode on non-inode systems.
3048         Use DIRS_EQ.
3049
3050 2008-05-20  Sandra Loosemore  <sandra@codesourcery.com>
3051
3052         * config.gcc (tm_file): Update comments about relative pathnames.
3053
3054 2008-05-20  Richard Guenther  <rguenther@suse.de>
3055
3056         * tree-ssa-reassoc.c (fini_reassoc): Use the statistics infrastructure.
3057         * tree-ssa-sccvn.c (process_scc): Likewise.
3058         * tree-ssa-sink.c (execute_sink_code): Likewise.
3059         * tree-ssa-threadupdate.c (thread_through_all_blocks): Likewise.
3060         * tree-vrp.c (process_assert_insertions): Likewise.
3061         * tree-ssa-dce.c (eliminate_unnecessary_stmts): Likewise.
3062         (perform_tree_ssa_dce): Likewise.
3063         * tree-ssa-dom.c (tree_ssa_dominator_optimize): Likewise.
3064         (dump_dominator_optimization_stats): Likewise.
3065         * tree-vectorizer.c (vectorize_loops): Likewise.
3066
3067 2008-05-20  Richard Guenther  <rguenther@suse.de>
3068
3069         * tree-vn.c (vn_lookup_with_vuses): Do not use the alias oracle.
3070
3071 2008-05-20  Kai Tietz  <kai.tietz@onevision.com>
3072
3073         * config/i386/i386-protos.h (ix86_return_in_memory): Removed.
3074         (ix86_i386elf_return_in_memory): Likewise.
3075         (ix86_i386interix_return_in_memory): Likewise.
3076         * config/i386/i386-interix.h (TARGET_RETURN_IN_MEMORY): Removed.
3077         (SUBTARGET_RETURN_IN_MEMORY): New.
3078         * config/i386/i386elf.h: Likewise.
3079         * config/i386/ptx4-i.h: Likewise.
3080         * config/i386/sol2-10.h: Likewise.
3081         * config/i386/sysv4.h: Likewise.
3082         * config/i386/vx-common.h: Likewise.
3083         * config/i386/i386.h (TARGET_RETURN_IN_MEMORY): Removed.
3084         * config/i386/i386.c (ix86_return_in_memory): Made static and
3085         make use of optional SUBTARGET_RETURN_IN_MEMORY macro.
3086         (ix86_i386elf_return_in_memory): Removed.
3087         (ix86_i386interix_return_in_memory): Removed.
3088         (TARGET_RETURN_IN_MEMORY): Declared within i386.c only.
3089         * target-def.h (TARGET_RETURN_IN_MEMORY): Remove protection #ifdef.
3090
3091 2008-05-20  Alexandre Oliva  <aoliva@redhat.com>
3092
3093         * cselib.c (cselib_record_sets): Use correct mode for IF_THEN_ELSE.
3094
3095 2008-05-19  Xinliang David Li  <davidxl@google.com>
3096
3097         * tree-ssa-dce.c: Revert patches of 2008-05-17 and 2008-05-18. 
3098         * opts.c: Ditto.
3099         * common.opt: Ditto.
3100         * doc/invoke.texi: Ditto.
3101
3102 2008-05-19  Eric Botcazou  <ebotcazou@adacore.com>
3103
3104         * tree.c (substitute_in_expr) <tcc_vl_exp>: Fix thinko.
3105         (substitute_placeholder_in_expr) <tcc_vl_exp>: Minor tweak.
3106
3107 2008-05-19  H.J. Lu  <hongjiu.lu@intel.com>
3108
3109         * config/i386/i386.c (ix86_expand_vector_init_concat): Change
3110         sizes of operand array from 8/4 to 4/2.
3111         (ix86_expand_vector_init_general): Change size of operand array
3112         from 32 to 16.  Remove op0, op1 and half_mode.
3113
3114 2008-05-19  H.J. Lu  <hongjiu.lu@intel.com>
3115
3116         * config/i386/i386.c (ix86_expand_vector_init_concat): New.
3117         (ix86_expand_vector_init_interleave): Likewise.
3118         (ix86_expand_vector_init_general): Use them.  Assert
3119         word_mode == SImode when n_words == 4.
3120
3121 2008-05-19  Uros Bizjak  <ubizjak@gmail.com>
3122
3123         * config/i386/i386.c (ix86_secondary_reload): New static function.
3124         (TARGET_SECONDARY_RELOAD): New define.
3125         * config/i386/i386.h (SECONDARY_OUTPUT_RELOAD_CLASS): Remove.
3126         * config/i386/i386.md (reload_outqi): Remove.
3127
3128 2008-05-18  Kaveh R. Ghazi  <ghazi@caip.rutgers.edu>
3129
3130         PR middle-end/35509
3131         * builtins.c (mathfn_built_in_1): Renamed from mathfn_built_in.
3132         Add `implicit' parameter.  Handle BUILT_IN_SIGNBIT.
3133         (mathfn_built_in): Rewrite in terms of mathfn_built_in_1.
3134         (fold_builtin_classify): Handle BUILT_IN_ISINF_SIGN.
3135         (fold_builtin_1): Likewise.
3136         * builtins.def (BUILT_IN_ISINF_SIGN): New.
3137         c-common.c (check_builtin_function_arguments): Handle
3138         BUILT_IN_ISINF_SIGN.
3139         * doc/extend.texi: Document __builtin_isinf_sign.
3140         * fold-const.c (operand_equal_p): Handle COND_EXPR.
3141
3142 2008-05-18  Eric Botcazou  <ebotcazou@adacore.com>
3143
3144         * tree-ssa-dom.c (tree_ssa_dominator_optimize): If some blocks need
3145         EH cleanup at the end of the pass, search for those that have been
3146         turned into forwarder blocks and do the cleanup on their successor.
3147
3148 2008-05-18  Richard Guenther  <rguenther@suse.de>
3149
3150         * tree-cfg.c (verify_gimple_expr): Allow conversions from
3151         pointers to sizetype and vice versa.
3152
3153 2008-05-18 Xinliang David Li   <davidxl@google.com>
3154
3155         * gcc/tree-ssa-dce.c: Coding style fix.
3156         (check_pow): Documentation comment. 
3157         (check_log): Documenation comment. Coding style fix.
3158         (is_unnecessary_except_errno_call): Ditto.
3159         (gen_conditions_for_pow): Ditto.
3160         (gen_conditions_for_log): Ditto.
3161         (gen_shrink_wrap_conditions): Ditto.
3162         (shrink_wrap_one_built_in_calls): Ditto.
3163         * gcc/doc/invoke.texi: Better documentation string.
3164         * ChangeLog: Fix wrong change log entries from 
3165         May 17 checkin on function call DCE.
3166
3167 2008-05-17  Kaz Kojima  <kkojima@gcc.gnu.org>
3168
3169         * config/sh/sh.c (sh_output_mi_thunk): Update the use of init_flow.
3170
3171 2008-05-17  Kenneth Zadeck <zadeck@naturalbridge.com>
3172
3173         * doc/rtl.texi (RTL_CONST_CALL_P, RTL_PURE_CALL_P): Fixed typos.
3174         * df-problems.c (simulation routines): Fixed block comment to
3175         properly say how to add forwards scanning functions.
3176         
3177 2008-05-17  Eric Botcazou  <ebotcazou@adacore.com>
3178
3179         * tree-inline.c (setup_one_parameter): Remove dead code.
3180
3181 2008-05-17  Eric Botcazou  <ebotcazou@adacore.com>
3182
3183         * fold-const.c (fold_unary) <CASE_CONVERT>: Fold the cast into
3184         a BIT_AND_EXPR only for an INTEGER_TYPE.
3185
3186 2008-05-17 Xinliang David Li   <davidxl@google.com>
3187
3188         * gcc/tree-ssa-dce.c (cond_dead_built_in_calls): New static variable.
3189         (check_pow, check_log, is_unnecessary_except_errno_call): New 
3190         functions to check for eliminating math functions that are pure 
3191         except for setting errno.
3192         (gen_conditions_for_pow, gen_conditionas_for_log): New functions to
3193         general condition expressions for shrink-wrapping pow/log calls.
3194         (gen_shrink_wrap_conditions): Ditto.
3195         (shrink_wrap_one_built_in_call): Ditto.
3196         (shrink_wrap_conditional_dead_built_in_calls): Ditto.
3197         (mark_operand_necessary): If debugging, output if OP is necessary.
3198         (eliminate_unnecessary_stmts): Eliminate pow, log calls that are
3199         unnecessary.
3200         * gcc/opts.c (decode_options): set flag_tree_builtin_dce to 1 when
3201         opt level >= 2.
3202         * gcc/common.opt: New user flag -ftree-builtin-dce.
3203         * gcc/doc/invoke.texi (-ftree-builtin-dce): New option.
3204
3205 2008-05-16  David S. Miller  <davem@davemloft.net>
3206
3207         * config/sparc/linux.h (NO_PROFILE_COUNTERS): Undef before overriding.
3208         * config/sparc/linux64.h (NO_PROFILE_COUNTERS): Likewise.
3209
3210 2008-05-16  Uros Bizjak  <ubizjak@gmail.com>
3211
3212         PR target/36246
3213         * config/i386/i386.h (SECONDARY_MEMORY_NEEDED_MODE): New define.
3214
3215 2008-05-16  Kenneth Zadeck <zadeck@naturalbridge.com>
3216
3217         * ifcvt.c (dead_or_predicable): Rename
3218         df_simulate_one_insn_backwards to df_simulate_one_insn.
3219         * recog.c (peephole2_optimize): Ditto.
3220         * rtl-factoring.c (collect_pattern_seqs, clear_regs_live_in_seq):
3221         Ditto.
3222         * df.h: Rename df_simulate_one_insn_backwards to
3223         df_simulate_one_insn.  and delete df_simulate_one_insn_forwards.
3224         * df-problems.c (df_simulate_artificial_refs_at_top) Reversed
3225         scanning of defs and uses.
3226         (df_simulate_one_insn_backwards): Renamed to df_simulate_one_insn.
3227         (df_simulate_one_insn_forwards): Removed.
3228
3229 2008-05-16  Doug Kwan  <dougkwan@google.com>
3230
3231         * real.c (real_to_decimal, real_to_hexadecimal): Distinguish
3232         QNaN & SNaN.
3233         (real_from_string): Handle NaNs and Inf as approriate.
3234
3235 2008-05-16  Nathan Froyd  <froydnj@codesourcery.com>
3236
3237         * doc/gty.texi (Source Files Containing Type Information): Note
3238         that headers should appear first in the gtfiles list.
3239
3240 2008-05-16  Kenneth Zadeck <zadeck@naturalbridge.com>
3241
3242         * tree.def (COND_EXEC): Properly documented this code.
3243
3244 2008-05-16  Diego Novillo  <dnovillo@google.com>
3245
3246         * dwarf2asm.c (dw2_assemble_integer): Clarify comment.
3247         * tree-nested.c (get_trampoline_type): Set DECL_CONTEXT for
3248         the new field.
3249
3250 2008-05-16  Kenneth Zadeck <zadeck@naturalbridge.com>
3251
3252         * tree-ssa-dse (max_stmt_uid): Removed.
3253         (get_stmt_uid, dse_possible_dead_store_p, dse_optimize_stmt, 
3254         tree_ssa_dse): Encapsulate all uses of stmt_ann->uid.
3255         * tree-ssa-sccvn.c (compare_ops, init_scc_vn): Ditto.
3256         * function.h (cfun.last_stmt_uid): New field.
3257         * tree-flow-inline.h (set_gimple_stmt_uid, gimple_stmt_uid,
3258         gimple_stmt_max_uid, set_gimple_stmt_max_uid, inc_gimple_stmt_max_uid):
3259         New functions.
3260         * tree-dfa.c (renumber_gimple_stmt_uids): New function.
3261         (create_stmt_ann): Initialize the ann->uid field.
3262         * tree-ssa-pre.c (compute_avail): Encapsulate the stmt_ann->uid
3263         with new calls.
3264         * tree-flow.h (renumber_gimple_stmt_uids): New function.
3265
3266 2008-05-16  Nathan Froyd  <froydnj@codesourcery.com>
3267
3268         * tree-flow.h (init_empty_tree_cfg_for_function): Declare.
3269         * tree-cfg.c (init_empty_tree_cfg_for_function): Define.
3270         (init_empty_tree_cfg): Call it.
3271
3272 2008-05-16  Kenneth Zadeck <zadeck@naturalbridge.com>
3273
3274         * cfg.c (init_flow): Add argument THE_FUN.  Use it instead of cfun.
3275         Update all users.
3276
3277 2008-05-16  Kenneth Zadeck <zadeck@naturalbridge.com>
3278
3279         * doc/invoke.text (-fdump-tree-*-verbose): New option.
3280         * tree-dump.c (dump_options): New verbose option.
3281         * tree-pretty-print.c (dump_phi_nodes, dump_generic_bb_buff):
3282         Add verbose dump.
3283         * tree-pass.h (TDF_VERBOSE): New dump flag.
3284         * print-tree.c (print_node): Added code to be able to print PHI_NODES.
3285         (tree-flow.h): Added include.
3286         * Makefile.in (print-tree.o):  Added TREE_FLOW_H.
3287
3288 2008-05-16  Bernd Schmidt  <bernd.schmidt@analog.com>
3289
3290         * config/bfin/bfin.c (bfin_discover_loops): Delete empty loops.
3291
3292         From Jie Zhang  <jie.zhang@analog.com>
3293         * config/bfin/t-bfin-elf (MULTILIB_OPTIONS, MULTILIB_DIRNAMES,
3294         MULTILIB_MATCHES, MULTILIB_EXCEPTIONS): Remove mcpu=bf532-0.3,
3295         mcpu=bf561-none and mcpu=bf561-0.2.
3296         * config/bfin/t-bfin-uclinux (MULTILIB_OPTIONS, MULTILIB_DIRNAMES,
3297         MULTILIB_MATCHES, MULTILIB_EXCEPTIONS): Likewise.
3298         * config/bfin/t-bfin-linux (MULTILIB_OPTIONS, MULTILIB_DIRNAMES,
3299         MULTILIB_MATCHES, MULTILIB_EXCEPTIONS): Likewise.
3300         * config/bfin/bfin-protos.h (enum bfin_cpu_type): Add BFIN_CPU_UNKNOWN.
3301         * config/bfin/elf.h (STARTFILE_SPEC): Use specific CRT for BF561.
3302         (LIB_SPEC): Use proper linker script for bf561.  Error if no mcpu
3303         option.
3304         * config/bfin/bfin.c (bfin_cpu_type): Set to BFIN_CPU_UNKNOWN.
3305         (cputype_selected): Remove.
3306         (bfin_handle_option): Don't use cputype_selected.
3307         (override_options): When no mcpu option, enable all workarounds.
3308         Don't use bfin_workarounds.
3309         * config/bfin/bfin.h (DRIVER_SELF_SPECS): Don't set default
3310         processor type.
3311         (DEFAULT_CPU_TYPE): Don't define.
3312
3313 2008-05-16  Richard Guenther  <rguenther@suse.de>
3314
3315         * tree-ssa-propagate.c (substitute_and_fold): Fix stmt walking
3316         on deletion of the last stmt.
3317
3318 2008-05-15  H.J. Lu  <hongjiu.lu@intel.com>
3319
3320         * config/i386/i386.c (ix86_expand_vector_init_general): Optimize
3321         V8HImode for SSE2 and V16QImode for SSE4.1.
3322
3323 2008-05-15  Kenneth Zadeck <zadeck@naturalbridge.com>
3324
3325         * cgraph.h (compute_inline_parameters): Made public.
3326         * tree-pass.h (ipa_opt_pass): Removed function_generate_summary,
3327         variable_generate_summary, function_write_summary,
3328         variable_write_summary, variable_read_summary.  Added generate_summary,
3329         write_summary, read_summary.
3330         * cgraphunit.c (cgraph_process_new_functions): Changed call from
3331         pass_ipa_inline.function_generate_summary, to
3332         compute_inline_parameters. 
3333         * ipa-inline.c (compute_inline_parameters): Made public and added
3334         node parameter.
3335         (compute_inline_parameters_for_current): New function.
3336         (pass_inline_param): Now calls compute_inline_parameters_for_current.
3337         (inline_generate_summary): Removed parameter and made to loop over
3338         all cgraph nodes.
3339         (pass_ipa_inline): Updated for new IPA_PASS structure.
3340         * passes.c (execute_ipa_summary_passes): Now is called once per
3341         pass rather than once per node*pass.
3342         
3343 2008-05-15  Anatoly Sokolov <aesok@post.ru>
3344
3345         * config/avr/avr.c (avr_base_arch_macro, avr_have_movw_lpmx_p, 
3346         avr_have_mul_p, avr_asm_only_p): Remove variables.
3347         (avr_override_options): Remove initialization of removed variables.
3348         (avr_file_start):  Convert removed variables to fields of 
3349         'struct base_arch_s *avr_current_arch'. 
3350         * config/avr/avr.h (TARGET_CPU_CPP_BUILTINS): (Ditto.).
3351         (AVR_HAVE_MUL): (Ditto.).
3352         (AVR_HAVE_MOVW): (Ditto.).
3353         (AVR_HAVE_LPMX): (Ditto.). 
3354         (avr_base_arch_macro, avr_have_movw_lpmx_p, avr_have_mul_p, 
3355         avr_asm_only_p): Remove declaration.
3356
3357 2008-05-15  Diego Novillo  <dnovillo@google.com>
3358
3359         * config/arm/arm.c (arm_return_in_memory): Fix return type.
3360         * config/arm/arm-protos.h (arm_return_in_memory): Likewise.
3361
3362 2008-05-15  Adam Nemet  <anemet@caviumnetworks.com>
3363
3364         PR middle-end/36194
3365         * combine.c (check_conversion): Rename back to check_promoted_subreg.
3366         Don't call record_truncated_value from here.
3367         (record_truncated_value): Turn it into a for_each_rtx callback.
3368         (record_truncated_values): New function.
3369         (combine_instructions): Call note_uses with record_truncated_values.
3370         Change name of check_conversion to check_promoted_subreg. 
3371
3372 2008-05-15  Janis Johnson  <janis187@us.ibm.com>
3373
3374         * doc/sourcebuild.texi: Document support for torture tests.
3375
3376 2008-05-15  Uros Bizjak  <ubizjak@gmail.com>
3377
3378         * config/i386/sse.md (*vec_concatv2sf_sse4_1): Add "m" constraint
3379         to alternative 4 of operand 2.
3380
3381 2008-05-15  Richard Guenther  <rguenther@suse.de>
3382
3383         * tree-pass.h (current_pass): Declare.
3384         (get_pass_for_id): Likewise.
3385         * passes.c (passes_by_id, passes_by_id_size): New globals.
3386         (set_pass_for_id): New function.
3387         (get_pass_for_id): Likewise.
3388         (register_one_dump_file): Use set_pass_for_id to populate passes_by_id.
3389         (execute_function_todo): Flush per function statistics.
3390         * toplev.c (compile_file): Init statistics.
3391         (general_init): Do early statistics initialization.
3392         (finalize): Finish statistics.
3393         * statistics.h (statistics_early_init): Declare.
3394         (statistics_init): Likewise.
3395         (statistics_fini): Likewise.
3396         (statistics_fini_pass): Likewise.
3397         (statistics_counter_event): Likewise.
3398         (statistics_histogram_event): Likewise.
3399         * statistics.c: New file.
3400         * Makefile.in (OBJS-common): Add statistics.o.
3401         (statistics.o): Add dependencies.
3402         * doc/invoke.texi (-fdump-statistics): Document.
3403
3404         * tree-ssa-pre.c (compute_antic): Use statistics_histogram_event.
3405         (insert): Likewise.
3406         (execute_pre): Use statistics_counter_event.
3407         * tree-ssa-propagate.c (struct prop_stats_d): Add num_dce field.
3408         (substitute_and_fold): Increment it.  Use statistics_counter_event.
3409
3410 2008-05-15  Diego Novillo  <dnovillo@google.com>
3411
3412         http://gcc.gnu.org/ml/gcc-patches/2008-05/msg00893.html
3413
3414         * treestruct.def (TS_STRUCT_FIELD_TAG): Remove.
3415         * tree-ssa-alias.c (new_type_alias): Remove references to
3416         sub-variables from comment.
3417         * tree-ssa-operands.c (swap_tree_operands): Likewise.
3418
3419 2008-05-15  H.J. Lu  <hongjiu.lu@intel.com>
3420
3421         * config/i386/sse.md (*vec_concatv2sf_sse4_1): Set prefix_extra
3422         attribute to 1 only for insertps alternative.
3423
3424 2008-05-15  Bernd Schmidt  <bernd.schmidt@analog.com>
3425
3426         * config/bfin/bfin.md (loadbytes): New pattern.
3427         * config/bfin/bfin.c (enum bfin_builtins): Add BFIN_BUILTIN_LOADBYTES.
3428         (bfin_init_builtins): Initialize it.
3429         (bdesc_1arg): Add it.
3430
3431 2008-05-15  Sa Liu  <saliu@de.ibm.com>
3432
3433         * testsuite/gfortran.dg/c_kind_int128_test1.f03: New.
3434         * testsuite/gfortran.dg/c_kind_int128_test2.f03: New.
3435         * testsuite/lib/target-supports.exp: Add
3436         check_effective_target_fortran_integer_16.
3437
3438 2008-05-15  Bernd Schmidt  <bernd.schmidt@analog.com>
3439
3440         * config/bfin/bfin.h (TARGET_RETURN_IN_MEMORY): Don't define here.
3441         * config/bfin/bfin-protos.h (bfin_return_in_memory): Don't declare.
3442         * config/bfin/bfin.c (bfin_return_in_memory): Now static.  Return bool.
3443         (TARGET_RETURN_IN_MEMORY): Define.
3444
3445 2008-05-15  Richard Guenther  <rguenther@suse.de>
3446
3447         PR middle-end/36244
3448         * tree-ssa-alias.c (new_type_alias): Do not set TREE_READONLY.
3449         * tree-flow-inline.h (unmodifiable_var_p): Memory tags never
3450         represent unmodifiable vars.
3451
3452 2008-05-15  Richard Guenther  <rguenther@suse.de>
3453
3454         * tree-dfa.c (refs_may_alias_p): Allow all kinds of
3455         INDIRECT_REF and TARGET_MEM_REF.
3456         * tree-ssa-sccvn.c (copy_reference_ops_from_ref): Handle
3457         TARGET_MEM_REF.
3458
3459 2008-05-15  Uros Bizjak  <ubizjak@gmail.com>
3460             H.J. Lu  <hongjiu.lu@intel.com>
3461
3462         * config/i386/sse.md (*vec_concatv2sf_sse4_1): New insn pattern.
3463         (*vec_concatv2si_sse4_1): Use vector_move_operand predicate
3464         for operand 2.  Remove pinsr{q,d} with 0x0 immediate operand from
3465         insn alternatives.  Add missing alternatives.
3466         (*vec_concatv2di_rex64_sse4_1): Likewise.
3467         (*vec_concatv2si_sse2): Use "x" register constraint instead of "Y2".
3468         (*vec_concatv2di_rex64_sse): Rename from *vec_concatv2di_rex64.
3469         Require TARGET_SSE.
3470
3471 2008-05-15  Richard Guenther  <rguenther@suse.de>
3472
3473         PR tree-optimization/36009
3474         PR tree-optimization/36204
3475         * tree-ssa-loop-im.c (tree-ssa-propagate.h): Include.
3476         (determine_invariantness_stmt): Record the loop a store is
3477         always executed in.
3478         * Makefile.in (tree-ssa-loop-im.o): Add tree-ssa-propagate.h
3479         dependency.
3480
3481 2008-05-15  Richard Guenther  <rguenther@suse.de>
3482
3483         PR tree-optimization/34330
3484         * tree-ssa-alias.c (get_smt_for): Only assert that accesses
3485         through the pointer will alias the SMT.
3486
3487 2008-05-14  Andreas Tobler  <a.tobler@schweiz.org>
3488
3489         * config/sparc/sparc.h (NO_PROFILE_COUNTERS): Define as 0.
3490
3491 2008-05-14  H.J. Lu  <hongjiu.lu@intel.com>
3492
3493         * config/i386/sse.md (*sse4_1_pinsrq): Make it 64bit only.
3494
3495 2008-05-14  Michael Meissner  <michael.meissner@amd.com>
3496             Dwarakanath Rajagopal  <dwarak.rajagopal@amd.com>
3497
3498         * optabs.h (optab_index): Add OTI_vashl, OTI_vlshr, OTI_vashr,
3499         OTI_vrotl, OTI_vrotr to support vector/vector shifts.
3500         (vashl_optab): New optab for vector/vector shifts.
3501         (vashr_optab): Ditto.
3502         (vlshr_optab): Ditto.
3503         (vrotl_optab): Ditto.
3504         (vrotr_optab): Ditto.
3505         (optab_subtype): New enum for optab_for_tree_code call.
3506         (optab_for_tree_code): Add enum optab_subtype argument.
3507
3508         * optabs.c (optab_for_tree_code): Take an additional argument to
3509         distinguish between a vector shift by a scalar and vector shift by
3510         a vector.  Make lshr/ashr/ashl/rotl/rotr optabs just vector
3511         shifted by a scalar.  Use vlshr/vashr/vashl/vrotl/vrotr for the
3512         vector shift by a vector.
3513         (expand_widen_pattern_expr): Pass additional argument to
3514         optab_for_tree_code.
3515
3516         * genopinit.c (optabs): Add vashr_optab, vashl_optab, vlshr_optab,
3517         vrotl_optab, vrotr_optab.
3518
3519         * expr.c (expand_expr_real_1): Update calls to
3520         optab_for_tree_code to distinguish between vector shifted by a
3521         scalar and vector shifted by a vector.
3522         * tree-vectorizer.c (supportable_widening_operation): Ditto.
3523         (supportable_narrowing_operation): Ditto.
3524         * tree-vect-analyze.c (vect_build_slp_tree): Ditto.
3525         * tree-vect-patterns.c (vect_pattern_recog_1): Ditto.
3526         * tree-vect-transform.c (vect_model_reduction_cost): Ditto.
3527         (vect_create_epilog_for_reduction): Ditto.
3528         (vectorizable_reduction): Ditto.
3529         (vectorizable_operation): Ditto.
3530         (vect_strided_store_supported): Ditto.
3531         (vect_strided_load_supported): Ditto.
3532         * tree-vect-generic.c (expand_vector_operations_1): Ditto.
3533         * expmed.c (expand_shift): Ditto.
3534
3535         * doc/md.texi (ashl@var{m}3): Document that operand 2 is always a
3536         scalar type.
3537         (ashr@var{m}3): Ditto.
3538         (vashl@var{m}3): Document new vector/vector shift standard name.
3539         (vashr@var{m}3): Ditto.
3540         (vlshr@var{m}3): Ditto.
3541         (vrotl@var{m}3): Ditto.
3542         (vrotr@var{m}3): Ditto.
3543
3544         * config/i386/i386.md (PPERM_SRC): Move PPERM masks here from i386.c.
3545         (PPERM_INVERT): Ditto.
3546         (PPERM_REVERSE): Ditto.
3547         (PPERM_REV_INV): Ditto.
3548         (PPERM_ZERO): Ditto.
3549         (PPERM_ONES): Ditto.
3550         (PPERM_SIGN): Ditto.
3551         (PPERM_INV_SIGN): Ditto.
3552         (PPERM_SRC1): Ditto.
3553         (PPERM_SRC2): Ditto.
3554
3555         * config/i386/sse.md (mulv2di3): Add SSE5 support.
3556         (sse5_pmacsdql_mem): New SSE5 define_and_split that temporarily
3557         allows a memory operand to be the value being added, and split it
3558         to improve vectorization.
3559         (sse5_pmacsdqh_mem): Ditto.
3560         (sse5_mulv2div2di3_low): SSE5 32-bit multiply and extend function.
3561         (sse5_mulv2div2di3_high): Ditto.
3562         (vec_pack_trunc_v8hi): Add SSE5 pperm support.
3563         (vec_pack_trunc_v4si): Ditto.
3564         (vec_pack_trunc_v2di): Ditto.
3565         (sse5_pcmov_<mode>): Remove code that tried to use use
3566         andps/andnps instead of pcmov.
3567         (vec_widen_smult_hi_v4si): If we have SSE5, use the pmacsdql and
3568         pmacsdqh instructions.
3569         (vec_widen_smult_lo_v4si): Ditto.
3570
3571         * config/i386/i386.c (PPERM_SRC): Move PPERM masks to i386.md.
3572         (PPERM_INVERT): Ditto.
3573         (PPERM_REVERSE): Ditto.
3574         (PPERM_REV_INV): Ditto.
3575         (PPERM_ZERO): Ditto.
3576         (PPERM_ONES): Ditto.
3577         (PPERM_SIGN): Ditto.
3578         (PPERM_INV_SIGN): Ditto.
3579         (PPERM_SRC1): Ditto.
3580         (PPERM_SRC2): Ditto.
3581         (ix86_expand_sse_movcc): Move the SSE5 test after the if
3582         true/false tests.
3583         (ix86_expand_int_vcond): If SSE5 generate all possible integer
3584         comparisons.
3585         (ix86_sse5_valid_op_p): Allow num_memory to be negative, which
3586         says ignore whether the last reference is a memory operand.
3587
3588 2008-05-14  Michael Meissner  <michael.meissner@amd.com>
3589             Paolo Bonzini <bonzini at gnu dot org>
3590
3591         * config/rs6000/rs6000.c (bdesc_2arg): Change the names of vector
3592         shift patterns.
3593
3594         * config/rs6000/altivec.md (vashl<mode>3): Rename from ashl<mode>3.
3595         (vlshr<mode>3): Rename from vlshr<mode>3.
3596         (vashr<mode>3): Rename from vashr<mode>3.
3597         (mulv4sf3): Change the names of vector shift patterns.
3598         (mulv4si3): Ditto.
3599         (negv4sf2): Ditt.
3600
3601         * config/spu/spu.c (spu_initialize_trampoline): Rename vector
3602         shift insns.
3603
3604         * config/spu/spu-builtins.def (SI_SHLH): Rename vector shift insns.
3605         (SI_SHLHI): Ditto.
3606         (SI_SHL): Ditto.
3607         (SI_SHLI): Ditto.
3608         (SI_ROTH): Ditto.
3609         (SI_ROTHI): Ditto.
3610         (SI_ROT): Ditto.
3611         (SI_ROTI): Ditto.
3612         (SPU_RL_0): Ditto.
3613         (SPU_RL_1): Ditto.
3614         (SPU_RL_2): Ditto.
3615         (SPU_RL_3): Ditto.
3616         (SPU_RL_4): Ditto.
3617         (SPU_RL_5): Ditto.
3618         (SPU_RL_6): Ditto.
3619         (SPU_RL_7): Ditto.
3620         (SPU_SL_0): Ditto.
3621         (SPU_SL_1): Ditto.
3622         (SPU_SL_2): Ditto.
3623         (SPU_SL_3): Ditto.
3624         (SPU_SL_4): Ditto.
3625         (SPU_SL_5): Ditto.
3626         (SPU_SL_6): Ditto.
3627         (SPU_SL_7): Ditto.
3628
3629         * config/spu/spu.md (v): New iterator macro to add v for vector types.
3630         (floatunssidf2_internal): Change vector/vector shift names.
3631         (floatunsdidf2_internal): Ditto.
3632         (mulv8hi3): Ditto.
3633         (ashrdi3): Ditto.
3634         (ashrti3): Ditto.
3635         (cgt_df): Ditto.
3636         (cgt_v2df): Ditto.
3637         (dftsv): Ditto.
3638         (vashl<mode>3): Rename from ashl<mode>3.
3639         (vashr<mode>3): Rename from ashr<mode>3.
3640         (vlshr<mode>3): Rename from lshr<mode>3.
3641         (vrotl<mode>3): Rename from rotl<mode>3.
3642
3643 2008-05-14  Michael Meissner  <michael.meissner@amd.com>
3644
3645         PR target/36224
3646         * config/i386/sse.md (vec_widen_smult_hi_v4si): Delete, using unsigned
3647         multiply gives the wrong value when doing widening multiplies.
3648         (vec_widen_smult_lo_v4si): Ditto.
3649
3650 2008-05-14  Kenneth Zadeck <zadeck@naturalbridge.com>
3651
3652         * optabs.c (prepare_cmp_insn): Changed LCT_PURE_MAKE_BLOCK to
3653         LCT_PURE and LCT_CONST_MAKE_BLOCK to LCT_CONST in calls to
3654         emit_library_call_value. 
3655         * builtins.c (expand_builtin_powi, expand_builtin_memcmp): Ditto.
3656         * tree.h (ECF_LIBCALL_BLOCK): Removed.
3657         * calls.c (initialize_argument_information, precompute_arguments, 
3658         expand_call, emit_library_call_value_1): Remove ECF_LIBCALL_BLOCK.
3659         (precompute_arguments): Removed flags parameter.
3660         * rtl.h (LCT_CONST_MAKE_BLOCK, LCT_PURE_MAKE_BLOCK): Removed.
3661         
3662 2008-05-14  Richard Guenther  <rguenther@suse.de>
3663
3664         * tree-ssa-dse.c (dse_possible_dead_store_p): Remove dead code.
3665         Make sure to register the store if the use is a PHI_NODE.
3666
3667 2008-05-14  Olivier Hainque  <hainque@adacore.com>
3668
3669         * expr.c (expand_expr_real_1) <normal_inner_ref>: Force op0 to
3670         memory if the component is to be referenced in BLKmode according
3671         to get_inner_reference.
3672
3673 2008-05-14  Adam Nemet  <anemet@caviumnetworks.com>
3674
3675         * calls.c (emit_library_call_value_1): Restore code clearing
3676         ECF_LIBCALL_BLOCK to ensure that we only call end_sequence once.
3677
3678 2008-05-14  Olivier Hainque  <hainque@adacore.com>
3679             Nicolas Roche  <roche@adacore.com>
3680
3681         * configure.ac: Add support for a "gcc_subdir" variable in
3682         config-lang.in, to denote a subdirectory where the language/GCC
3683         integration files are to be found.
3684         * configure: Regenerate.
3685
3686 2008-05-14  Ira Rosen  <irar@il.ibm.com>
3687
3688         PR tree-optimization/36098
3689         * tree-vect-analyze.c (vect_analyze_group_access): Set the gap
3690         value for the first load in the group in case of a gap.
3691         (vect_build_slp_tree): Check that there are no gaps in loads.
3692
3693 2008-05-14  Kenneth Zadeck <zadeck@naturalbridge.com>
3694
3695         * doc/rtl.texi: Removed reference to REG_NO_CONFLICT notes.
3696         * optabs.c (expand_binop, expand_absneg_bit, expand_unop,
3697         expand_copysign_bit, ): Change call to emit_no_conflict_block to
3698         emit_insn and remove unneeded code to construct extra args.
3699         (emit_no_conflict_block): Removed.
3700         * optabls.h: (emit_no_conflict_block): Removed.
3701         * cse.c (cse_extended_basic_block): Remove search for
3702         REG_NO_CONFLICT note.
3703         * global.c: Removed incorrect comment added in revision 117.
3704         * expr.c (convert_move): Change call to emit_no_conflict_block to
3705         emit_insn.
3706         * recog.c: Change comments so that they do not mention
3707         REG_NO_CONFLICT.
3708         * local_alloc.c (combine_regs): Removed last parameter.
3709         (no_conflict_p): Removed.
3710         (block_alloc): Removed note, no_conflict_combined_regno and set
3711         local vars. Removed all code to process REG_NO_CONFLICT blocks.
3712         (combine_regs): Removed already_dead and code to look for
3713         REG_NO_CONFLICT notes.
3714         * lower_subreg (remove_retval_note): Removed code to look for
3715         REG_NO_CONFLICT block.
3716         (resolve_reg_notes): Removed REG_NO_CONFLICT case.
3717         (resolve_clobber): Remove code to process libcalls that have
3718         REG_NO_CONFLICT notes.
3719         * loop_invariant.c (find_invariant_insn): Removed REG_NO_CONFLICT
3720         case.
3721         * combine.c (can_combine_p, distribute_notes):  Removed
3722         REG_NO_CONFLICT case.
3723         * config/cris/cris.md (movdi pattern): Changed emit_no_conflict_block
3724         to emit_insns.
3725         * config/mn10300/mn10300.md (absdf2, negdf2 patterns): Ditto.
3726         * config/m68k/m68k.md (negdf2, negxf2, absdf2, absxf2 patterns):
3727         Ditto.
3728         * reg-notes.def (NO_CONFLICT): Removed.
3729
3730 2008-05-14  David S. Miller  <davem@davemloft.net>
3731
3732         * config/sparc/sparc.c (sparc_profile_hook): If
3733         NO_PROFILE_COUNTERS, don't generate and pass a label into mcount.
3734         * config/sparc/linux.h (NO_PROFILE_COUNTERS): Define as 1.
3735         * config/sparc/linux64.h (NO_PROFILE_COUNTERS): Likewise.
3736
3737 2008-05-14  Andreas Krebbel  <krebbel1@de.ibm.com>
3738
3739         * cse.c (cse_cc_succs): Invoke delete_insn_and_edges.
3740
3741 2008-05-13  Uros Bizjak  <ubizjak@gmail.com>
3742
3743         PR target/36222
3744         * config/i386/i386.c (ix86_expand_vector_init_general): Rearrange op0
3745         and op1 expansion before vector concat to have less live pseudos.
3746
3747 2008-05-13  H.J. Lu  <hongjiu.lu@intel.com>
3748
3749         * config/i386/i386.c (ix86_expand_vector_init_one_nonzero): Use
3750         ix86_expand_vector_set if supported.
3751
3752 2008-05-13  Diego Novillo  <dnovillo@google.com>
3753             Kenneth Zadeck  <zadeck@naturalbridge.com>
3754
3755         http://gcc.gnu.org/ml/gcc-patches/2008-05/msg00748.html
3756
3757         * tree.h (init_phinodes, fini_phinodes, release_phi_node,
3758         phinodes_print_statistics, init_ssanames, fini_ssanames,
3759         make_ssa_name, duplicate_ssa_name, duplicate_ssa_name_ptr_info,
3760         release_ssa_name, release_defs, replace_ssa_name_symbol,
3761         ssanames_print_statistics): Move ...
3762         * tree-flow.h: ... here.
3763         * tree-ssanames.c (init_ssanames): Add arguments FN and SIZE.
3764         Use FN instead of cfun.
3765         (make_ssa_name_fn): Rename from make_ssa_name.
3766         (pass_release_ssa_names): Add TODO_dump_func to finish flags.
3767         * tree-flow-inline.h (make_ssa_name): Move from
3768         tree-ssanames.c.  Convert to static inline.  Call make_ssa_name_fn.
3769         * omp-low.c (expand_omp_parallel):
3770         * tree-flow-inline.h (redirect_edge_var_map_result):
3771         * tree-ssa.c (init_tree_ssa): Add argument FN.
3772         Use it instead of cfun.  Update all users.
3773
3774 2008-05-13  Tom Tromey  <tromey@redhat.com>
3775
3776         PR preprocessor/22168:
3777         * doc/cpp.texi (Top): Update menu.
3778         (Alternatives to Wrapper #ifndef): New node.
3779         (Other Directives): Document deprecation.
3780         (Obsolete Features): Remove menu.
3781         (Assertions): Merge node into Obsolete Features.
3782         (Obsolete once-only headers): Move earlier; rename to Alternatives
3783         to Wrapper #ifndef.
3784         * doc/cppopts.texi: Update.
3785         * c.opt (Wdeprecated): Enable for C and ObjC.
3786         * doc/invoke.texi (Option Summary): Move -Wno-deprecated.
3787         (C++ Dialect Options): Move -Wno-deprecated from here to...
3788         (Warning Options): ... here.
3789
3790 2008-05-13  Richard Guenther  <rguenther@suse.de>
3791
3792         PR middle-end/36227
3793         * fold-const.c (fold_sign_changed_comparison): Do not allow
3794         changes in pointer-ness.
3795
3796 2008-05-12  Kaz Kojima  <kkojima@gcc.gnu.org>
3797
3798         PR target/24713
3799         * config/sh/sh.c (sh_expand_prologue): Don't clear
3800         RTX_FRAME_RELATED_P for push insns.
3801
3802 2008-05-12  Andy Hutchinson  <hutchinsonandy@aim.com>
3803
3804         * config/avr/avr.h (MAX_OFILE_ALIGNMENT): Define.
3805
3806 2008-05-12  Anatoly Sokolov <aesok@post.ru>
3807
3808         * config/avr/avr.h (machine_function): Add 'is_leaf' field.
3809         * config/avr/avr.c (avr_regs_to_save): Compute 'machine->is_leaf'.
3810         Use 'machine->is_leaf' instead of 'leaf_func_p'.
3811
3812 2008-05-12  H.J. Lu  <hongjiu.lu@intel.com>
3813
3814         * config/i386/sse.md (*sse_concatv4sf): Renamed to ...
3815         (*vec_concatv4sf_sse): This.
3816         (*sse2_concatv2si): Renamed to ...
3817         (*vec_concatv2si_sse2): This.
3818         (*sse1_concatv2si): Renamed to ...
3819         (*vec_concatv2si_sse): This.
3820         (*vec_concatv2di_rex): Renamed to ...
3821         (*vec_concatv2di_rex64): This.
3822         (*vec_concatv2si_sse4_1): New.
3823         (*vec_concatv2di_rex64_sse4_1): Likewise.
3824
3825 2008-05-12  Uros Bizjak  <ubizjak@gmail.com>
3826
3827         PR rtl-optimization/36111
3828         * recog.c (validate_replace_rtx_1): Unshare new RTL expression
3829         that was created for swappable operands.
3830
3831 2008-05-12  Samuel Tardieu  <sam@rfc1149.net>
3832
3833         PR ada/36001
3834         * Makefile.in: Substitute GNATMAKE and GNATBIND.
3835         * configure.ac: Add call to ACX_PROG_GNAT.
3836
3837 2008-05-11  Volker Reichelt  <v.reichelt@netcologne.de>
3838
3839         * optc-gen.awk: Fix comment typo.
3840
3841 2008-05-11  Aaron W. LaFramboise  <aaronavay62@aaronwl.com>
3842
3843         * pretty-print.c (pp_integer_with_precision): Use
3844         HOST_LONG_LONG_FORMAT.
3845
3846 2008-05-10  Kenneth Zadeck  <zadeck@naturalbridge.com>
3847
3848         * gcse.c (store_killed_in_insn): Negated call to RTL_CONST_CALL_P.
3849                 
3850 2008-05-10  H.J. Lu  <hongjiu.lu@intel.com>
3851
3852         * config/i386/i386.c (bdesc_ptest): Removed.
3853         (ix86_builtin_type): Add INT_FTYPE_V2DI_V2DI_PTEST.
3854         (bdesc_args): Add __builtin_ia32_ptestz128,
3855         __builtin_ia32_ptestc128 and __builtin_ia32_ptestnzc128.
3856         (ix86_init_mmx_sse_builtins): Updated.
3857         (ix86_expand_args_builtin): Handle INT_FTYPE_V2DI_V2DI_PTEST.
3858         (ix86_expand_builtin): Updated.
3859
3860 2008-05-10  Richard Sandiford  <rdsandiford@googlemail.com>
3861
3862         * tree-cfg.c (valid_fixed_convert_types_p): New function.
3863         (verify_gimple_expr): Handle FIXED_CONVERT_EXPR.
3864
3865 2008-05-10  Uros Bizjak  <ubizjak@gmail.com>
3866
3867         * value-prof.c (interesting_stringop_to_profile): Do not
3868         return early for BUILT_IN_MEMPCPY.
3869
3870 2008-05-09  H.J. Lu  <hongjiu.lu@intel.com>
3871
3872         * calls.c (expand_call): Don't use callgraph to increase
3873         preferred_stack_boundary.
3874
3875         * cgraph.h (cgraph_rtl_info): Use unsigned on
3876         preferred_incoming_stack_boundary.
3877
3878         * final.c (rest_of_clean_state): Use unsigned on
3879         preferred_stack_boundary.
3880
3881 2008-05-09  Tom Tromey  <tromey@redhat.com>
3882
3883         PR preprocessor/22231:
3884         * c-opts.c (sanitize_cpp_opts): Disallow -MG if compilation is
3885         proceeding.
3886
3887 2008-05-09  Uros Bizjak  <ubizjak@gmail.com>
3888
3889         PR tree-optimization/36129
3890         * tree-ssa-ccp.c: Include value-prof.h.
3891         (execute_fold_all_builtins): Call gimple_remove_stmt_histograms if
3892         built-in function was folded to a constant.
3893         * Makefile.in (tree-ssa-ccp.c): Depend on value-prof.h
3894
3895 2008-05-09  Jan Sjodin  <jan.sjodin@amd.com>
3896             Sebastian Pop  <sebastian.pop@amd.com>
3897
3898         * tree-scalar-evolution.c: Document instantiate_scev.
3899         (instantiate_parameters_1): Renamed instantiate_scev_1.
3900         Don't use the same loop for instantiation_loop and evolution_loop.
3901         (instantiate_scev): New.
3902         (instantiate_parameters): Moved...
3903         (resolve_mixers): Update call to instantiate_scev_1 to pass the
3904         same loop twice.  Maintains the semantics for this function.
3905         * tree-scalar-evolution.h (instantiate_scev): Declare.
3906         (instantiate_parameters): ...here.  Now static inline.
3907         * tree-data-ref.c (dr_analyze_indices): Call instantiate_scev
3908         instead of resolve_mixers.
3909
3910 2008-05-09  Maxim Kuvyrkov  <maxim@codesourcery.com>
3911
3912         * rtl-factoring.c (collect_pattern_seqs): Fix typo.
3913
3914 2008-05-09  Tomas Bily  <tbily@suse.cz>
3915
3916         * config/pa/pa.c (reloc_needed): Use CASE_CONVERT.
3917         * tree-cfg.c (verify_expr, verify_gimple_expr): Likewise.
3918         * tree-ssa-structalias.c (get_constraint_for): Likewise.
3919         * c-common.c (c_common_truthvalue_conversion): Likewise.
3920         * tree-object-size.c (compute_object_offset): Likewise.
3921         * tree-inline.c (estimate_num_insns_1): Likewise.
3922         * varasm.c (const_hash_1, compare_constant, copy_constant)
3923         (compute_reloc_for_constant, output_addressed_constants)
3924         (initializer_constant_valid_p): Likewise.
3925         * c-omp.c (check_omp_for_incr_expr): Likewise.
3926         * gimplify.c (gimplify_expr): Likewise.
3927         * c-typeck.c (c_finish_return): Likewise.
3928         * tree-vectorizer.c (supportable_widening_operation)
3929         (supportable_narrowing_operation): Likewise.
3930         * c-pretty-print.c (pp_c_cast_expression, pp_c_expression): Likewise.
3931         * matrix-reorg.c (can_calculate_expr_before_stmt): Likewise.
3932         * expr.c (highest_pow2_factor, expand_expr_real_1): Likewise.
3933         * dwarf2out.c (loc_descriptor_from_tree_1, add_bound_info)
3934         (descr_info_loc): Likewise.
3935         * tree-ssa-loop-ivopts.c (may_be_nonaddressable_p): Likewise.
3936         * fold-const.c (operand_equal_p, make_range, extract_muldiv_1)
3937         (fold_unary): Likewise.
3938         * builtins.c (get_pointer_alignment): Likewise.
3939         * tree-scalar-evolution.c (interpret_rhs_modify_stmt)
3940         (instantiate_parameters_1): Likewise.
3941         * tree.c (expr_align, stabilize_reference): Likewise.
3942         * tree-pretty-print.c (dump_generic_node, op_prio): Likewise.
3943         * tree-ssa-loop-niter.c (derive_constant_upper_bound): Likewise.
3944         * convert.c (strip_float_extensions): Use CONVERT_EXPR_P.
3945         * tree-ssa-threadedge.c (simplify_control_stmt_condition): Likewise.
3946         * config/alpha/alpha.c (va_list_skip_additions): Likewise.
3947         * c-common.c (c_alignof_expr, check_function_arguments_recurse):
3948         Likewise.
3949         * tree-ssa.c (tree_ssa_useless_type_conversion): Likewise.
3950         * varasm.c (initializer_constant_valid_p, output_constant): Likewise.
3951         * tree-ssa-forwprop.c (get_prop_source_stmt, can_propagate_from)
3952         (forward_propagate_addr_expr_1, forward_propagate_addr_expr)
3953         (forward_propagate_comparison)
3954         (tree_ssa_forward_propagate_single_use_vars): Likewise.
3955         * cfgexpand.c (discover_nonconstant_array_refs_r): Likewise.
3956         * emit-rtl.c (component_ref_for_mem_expr)
3957         (set_mem_attributes_minus_bitpos): Likewise.
3958         * tree-ssa-phiopt.c (conditional_replacement): Likewise.
3959         * gimplify.c (gimplify_conversion, goa_lhs_expr_p, gimplify_expr):
3960         Likewise.
3961         * c-typeck.c (default_function_array_conversion, build_indirect_ref)
3962         (build_function_call, pointer_diff, build_compound_expr)
3963         (c_finish_return): Likewise.
3964         * tree-vect-analyze.c (vect_determine_vectorization_factor): Likewise.
3965         * matrix-reorg.c (get_inner_of_cast_expr, may_flatten_matrices_1):
3966         Likewise.
3967         * tree-ssa-ifcombine.c (recognize_single_bit_test): Likewise.
3968         * expr.c (is_aligning_offset): Likewise.
3969         * tree-ssa-alias.c (is_escape_site): Likewise.
3970         * tree-stdarg.c (va_list_counter_bump, check_va_list_escapes)
3971         (check_all_va_list_escapes): Likewise.
3972         * tree-ssa-loop-ivopts.c (determine_base_object)
3973         (determine_common_wider_type): Likewise.
3974         * dojump.c (do_jump): Likewise.
3975         * tree-ssa-sccvn.c (simplify_unary_expression): Likewise.
3976         * tree-gimple.c (is_gimple_cast): Likewise.
3977         * fold-const.c (decode_field_reference, )
3978         (fold_sign_changed_comparison, fold_unary, fold_comparison)
3979         (fold_binary): Likewise.
3980         * tree-ssa-alias-warnings.c (find_alias_site_helper)
3981         (already_warned_in_frontend_p): Likewise.
3982         * builtins.c (get_memory_rtx, fold_builtin_next_arg): Likewise.
3983         * tree.c (really_constant_p, get_unwidened): Likewise.
3984         * tree-ssa-loop-niter.c (expand_simple_operations): Likewise.
3985         * tree-ssa-loop-im.c (rewrite_bittest): Likewise.
3986         * tree-vrp.c (register_edge_assert_for_2, register_edge_assert_for_1):
3987         Likewise.
3988         * tree.h (STRIP_NOPS, STRIP_SIGN_NOPS, STRIP_TYPE_NOPS): Use
3989         CONVERT_EXPR_P.
3990         (CONVERT_EXPR_P): Define.
3991         (CASE_CONVERT): Define.
3992         
3993 2008-05-08  Kenneth Zadeck  <zadeck@naturalbridge.com>
3994
3995         PR middle-end/36117
3996         * dce.c (deletable_insn_p): Do not delete calls if df_in_progress.
3997         (delete_unmarked_insns): When deleting a call, call
3998         delete_unreachable_blocks.
3999         * rtl.texi (RTL_CONST_CALL_P, RTL_PURE_CALL_P,
4000         RTL_CONST_OR_PURE_CALL_P, RTL_LOOPING_CONST_OR_PURE_CALL_P): Fixed doc.
4001
4002 2008-05-08  Richard Guenther  <rguenther@suse.de>
4003
4004         * doc/invoke.texi (-fdump-tree-salias): Remove documentation.
4005         (-ftree-salias): Likewise.
4006         (salias-max-implicit-fields): Remove param documentation.
4007         (salias-max-array-elements): Likewise.
4008         * tree-pass.h (pass_create_structure_vars): Remove.
4009         * params.h (SALIAS_MAX_IMPLICIT_FIELDS): Remove.
4010         (SALIAS_MAX_ARRAY_ELEMENTS): Likewise.
4011         * tree-ssa-alias.c (create_structure_vars): Remove.
4012         (gate_structure_vars): Likewise.
4013         (pass_create_structure_vars): Likewise.
4014         (gate_build_alias): Likewise.
4015         (pass_build_alias): Adjust to run always and dump the function.
4016         * common.opt (ftree-salias): Hide.
4017         * passes.c (init_optimization_passes): Remove
4018         pass_create_structure_vars, adjust comment.
4019         * params.def (PARAM_SALIAS_MAX_IMPLICIT_FIELDS): Remove.
4020         (PARAM_SALIAS_MAX_ARRAY_ELEMENTS): Likewise.
4021         * opts.c (decode_options): Do not set flag_tree_salias.
4022         (common_handle_option): Add OPT_ftree_salias to the backward
4023         compatibility section.
4024
4025 2008-05-08  Richard Guenther  <rguenther@suse.de>
4026
4027         * tree-flow-inline.h (var_can_have_subvars): Move ...
4028         * tree-ssa-structalias.c (var_can_have_subvars): ... here.
4029         * tree-flow.h (var_can_have_subvars): Remove.
4030         (push_fields_onto_fieldstack): Remove.
4031         (sort_fieldstack): Likewise.
4032         (struct fieldoff): Move ...
4033         * tree-ssa-structalias.c (struct fieldoff): ... here.  Remove
4034         alias_set and base_for_components fields.
4035         (sort_fieldstack): Make static.
4036         (push_fields_onto_fieldstack): Likewise.  Remove code that
4037         handles anything but RECORD_TYPEs.  Remove alias_set and
4038         base_for_components handling.
4039         (create_variable_info_for): Adjust.
4040
4041 2008-05-08  Seongbae Park  <seongbae.park@gmail.com>
4042
4043         * common.opt (Wframe-larger-than=): Shorten the help message
4044         to one line.
4045         * doc/invoke.texi (Wframe-larger-than=): Add more description.
4046
4047 2008-05-08  Rafael Espindola  <espindola@google.com>
4048
4049         * tree-complex.c (expand_complex_div_wide): Don't create CONDs that
4050         trap.
4051         * tree-gimple.c (is_gimple_condexpr): Check that the expression doesn't
4052         trap and that both operands are gimple values.
4053         (canonicalize_cond_expr_cond): Use is_gimple_condexpr.
4054         * gcc/tree-eh.c (tree_could_trap_p): Correctly detect if a comparison
4055         is a fp operation.
4056
4057 2008-05-08  Richard Sandiford  <rsandifo@nildram.co.uk>
4058
4059         * read-rtl.c (join_c_conditions): Return the first string if the
4060         two strings are equal.
4061
4062 2008-05-08  Richard Sandiford  <rsandifo@nildram.co.uk>
4063
4064         * gensupport.h (pred_data): Add a "num_codes" field.
4065         (add_predicate_code): Declare.
4066         * gensupport.c (add_predicate_code): New function.
4067         (std_pred_table): Add an "allows_const_p" field.
4068         (std_preds): Set this field for predicates that allow RTX_CONST_OBJs.
4069         Remove the (incomplete) list of such codes from the codes field.
4070         (init_predicate_table): Use add_predicate_code.  Add all
4071         RTX_CONST_OBJs if allows_const_p is true.
4072         * genrecog.c (process_define_predicate): Use add_predicate_code.
4073
4074 2008-05-08  David Daney  <ddaney@avtrex.com>
4075             Richard Sandiford  <rsandifo@nildram.co.uk>
4076         
4077         * config/mips/mips.md (mips_expand_compare_and_swap_12): Handle
4078         special case of constant zero operands.
4079         * config/mips/mips.c (mips_expand_compare_and_swap_12): Zero extend
4080         old and new values.  Special case constant zero values.
4081         * config/mips/mips.h (MIPS_COMPARE_AND_SWAP): Skip 'sync' if compare
4082         fails.
4083         (MIPS_COMPARE_AND_SWAP_12): Handle constant zero operands.
4084         (MIPS_COMPARE_AND_SWAP_12_0): New macro.
4085
4086 2008-05-08  Paolo Bonzini  <bonzini@gnu.org>
4087
4088         PR target/36090
4089         * simplify-rtx.c (simplify_plus_minus): Create CONST of
4090         similar RTX_CONST_OBJ before CONST_INT.
4091
4092 2008-05-08  Steve Ellcey  <sje@cup.hp.com>
4093
4094         * stmt.c (expand_stack_restore): Change sa mode if needed.
4095
4096 2008-05-08  Richard Guenther  <rguenther@suse.de>
4097
4098         * config/i386/i386-protos.h (ix86_return_in_memory): Adjust
4099         return type to bool.
4100         (ix86_sol10_return_in_memory): Likewise.
4101         (ix86_i386elf_return_in_memory): Likewise.
4102         (ix86_i386interix_return_in_memory): Likewise.
4103         * config/i386/i386.c (ix86_return_in_memory): Likewise.
4104         (ix86_sol10_return_in_memory): Likewise.
4105         (ix86_i386elf_return_in_memory): Likewise.
4106         (ix86_i386interix_return_in_memory): Likewise.
4107
4108 2008-05-08  Kai Tietz  <kai.tietz@onevision.com>
4109
4110         PR bootstrap/36180
4111         * calls.c (compute_argument_block_size ): Add ATTRIBUTE_UNUSED to
4112         fndecl argument.
4113         (emit_library_call_value_1): Add ATTRIBUTE_UNUSED to variable fndecl.
4114         * target-def.h: Check that TARGET_RETURN_IN_MEMORY isn't
4115         declared in front.
4116
4117 2008-05-08  Richard Guenther  <rguenther@suse.de>
4118
4119         * tree-data-ref.c (dr_analyze_alias): Do not set DR_SUBVARS.
4120         * tree-data-ref.h (struct dr_alias): Remove subvars field.
4121         (DR_SUBVARS): Remove.
4122         * tree-dfa.c (dump_subvars_for): Remove.
4123         (debug_subvars_for): Likewise.
4124         (dump_variable): Do not dump subvars.
4125         (remove_referenced_var): Do not remove subvars.
4126         * tree-flow-inline.h (clear_call_clobbered): SFTs no longer exist.
4127         (lookup_subvars_for_var): Remove.
4128         (get_subvars_for_var): Likewise.
4129         (get_subvars_at): Likewise.
4130         (get_first_overlapping_subvar): Likewise.
4131         (overlap_subvar): Likewise.
4132         * tree-flow.h (subvar_t): Remove.
4133         (struct var_ann_d): Remove subvars field.
4134         * tree-ssa-alias.c (mark_aliases_call_clobbered): Remove queued
4135         argument.  Remove special handling of SFTs.
4136         (compute_tag_properties): Likewise.
4137         (set_initial_properties): Likewise.
4138         (compute_call_clobbered): Likewise.
4139         (count_mem_refs): Likewise.
4140         (compute_memory_partitions): Likewise.
4141         (compute_flow_insensitive_aliasing): Likewise.
4142         (setup_pointers_and_addressables): Likewise.
4143         (new_type_alias): Likewise.
4144         (struct used_part): Remove.
4145         (used_portions): Likewise.
4146         (struct used_part_map): Likewise.
4147         (used_part_map_eq): Likewise.
4148         (used_part_map_hash): Likewise.
4149         (free_used_part_map): Likewise.
4150         (up_lookup): Likewise.
4151         (up_insert): Likewise.
4152         (get_or_create_used_part_for): Likewise.
4153         (create_sft): Likewise.
4154         (create_overlap_variables_for): Likewise.
4155         (find_used_portions): Likewise.
4156         (create_structure_vars): Likewise.
4157         * tree.def (STRUCT_FIELD_TAG): Remove.
4158         * tree.h (MTAG_P): Adjust.
4159         (struct tree_memory_tag): Remove base_for_components and
4160         unpartitionable flags.
4161         (struct tree_struct_field_tag): Remove.
4162         (SFT_PARENT_VAR): Likewise.
4163         (SFT_OFFSET): Likewise.
4164         (SFT_SIZE): Likewise.
4165         (SFT_NONADDRESSABLE_P): Likewise.
4166         (SFT_ALIAS_SET): Likewise.
4167         (SFT_UNPARTITIONABLE_P): Likewise.
4168         (SFT_BASE_FOR_COMPONENTS_P): Likewise.
4169         (union tree_node): Remove sft field.
4170         * alias.c (get_alias_set): Remove special handling of SFTs.
4171         * print-tree.c (print_node): Remove handling of SFTs.
4172         * tree-dump.c (dequeue_and_dump): Likewise.
4173         * tree-into-ssa.c (mark_sym_for_renaming): Likewise.
4174         * tree-nrv.c (dest_safe_for_nrv_p): Remove special handling of SFTs.
4175         * tree-predcom.c (set_alias_info): Do not set subvars.
4176         * tree-pretty-print.c (dump_generic_node): Do not handle SFTs.
4177         * tree-ssa-loop-ivopts.c (get_ref_tag): Likewise.
4178         * tree-ssa-operands.c (access_can_touch_variable): Likewise.
4179         (add_vars_for_offset): Remove.
4180         (add_virtual_operand): Remove special handling of SFTs.
4181         (add_call_clobber_ops): Likewise.
4182         (add_call_read_ops): Likewise.
4183         (get_asm_expr_operands): Likewise.
4184         (get_modify_stmt_operands): Likewise.
4185         (get_expr_operands): Likewise.
4186         (add_to_addressable_set): Likewise.
4187         * tree-ssa.c (verify_ssa_name): Do not handle SFTs.
4188         * tree-tailcall.c (suitable_for_tail_opt_p): Likewise.
4189         * tree-vect-transform.c (vect_create_data_ref_ptr): Do not set subvars.
4190         * tree.c (init_ttree): Remove STRUCT_FIELD_TAG initialization.
4191         (tree_code_size): Remove STRUCT_FIELD_TAG handling.
4192         (tree_node_structure): Likewise.
4193         * tree-ssa-structalias.c (set_uids_in_ptset): Remove special
4194         handling of SFTs.
4195         (find_what_p_points_to): Likewise.
4196
4197 2008-05-08  Sa Liu  <saliu@de.ibm.com>
4198
4199         * config/spu/spu.md: Fixed subti3 pattern.
4200
4201 2008-05-08  Richard Guenther  <rguenther@suse.de>
4202
4203         PR middle-end/36154
4204         * tree-ssa-structalias.c (push_fields_onto_fieldstack): Make
4205         sure to create a representative for trailing arrays for PTA.
4206
4207 2008-05-08  Richard Guenther  <rguenther@suse.de>
4208
4209         PR middle-end/36172
4210         * fold-const.c (operand_equal_p): Two objects which types
4211         differ in pointerness are not equal.
4212
4213 2008-05-08  Kai Tietz  <kai.tietz@onevision.com>
4214
4215         * calls.c (compute_argument_block_size): Add argument tree fndecl.
4216         (OUTGOING_REG_PARM_STACK_SPACE): Add function type argument.
4217         (emit_library_call_value_1): Add new variable fndecl initialized by
4218         NULL_TREE. It should be the decl type of orgfun, but this information
4219         seems not to be available here, so it uses the default calling abi.
4220         * config/arm/arm.c (arm_return_in_memory): Add fntype argumen.
4221         * config/arm/arm.h (RETURN_IN_MEMORY): Replace RETURN_IN_MEMORY
4222         by TARGET_RETURN_IN_MEMORY.
4223         * config/i386/i386-interix.h: Likewise.
4224         * config/i386/i386.h: Likewise.
4225         * config/i386/i386elf.h: Likewise.
4226         * config/i386/ptx4-i.h: Likewise.
4227         * config/i386/sol2-10.h: Likewise.
4228         * config/i386/sysv4.h: Likewise.
4229         * config/i386/vx-common.h: Likewise.
4230         * config/cris/cris.h: Removed #if 0 clause.
4231         * config/arm/arm-protos.h (arm_return_in_memory): Add fntype argument.
4232         * config/i386/i386-protos.h (ix86_return_in_memory): Add fntype
4233         argument.
4234         (ix86_sol10_return_in_memory): Likewise.
4235         (ix86_i386elf_return_in_memory): New.
4236         (ix86_i386interix_return_in_memory): New.
4237         * config/mt/mt-protos.h (mt_return_in_memory): New.
4238         * config/mt/mt.c: Likewise.
4239         * config/mt/mt.h (OUTGOING_REG_PARM_STACK_SPACE): Add FNTYPE argument.
4240         (RETURN_IN_MEMORY):  Replace by TARGET_RETURN_IN_MEMORY.
4241         * config/bfin/bfin.h: Likewise.
4242         * config/bfin/bfin-protos.h (bfin_return_in_memory): Add fntype
4243         argument.
4244         * config/bfin/bfin.c: Likewise.
4245         * config/pa/pa.h (OUTGOING_REG_PARM_STACK_SPACE): Add FNTYPE argument.
4246         * config/alpha/unicosmk.h: Likewise.
4247         * config/i386/cygming.h: Likewise.
4248         * config/iq2000/iq2000.h: Likewise.
4249         * config/mips/mips.h: Likewise.
4250         * config/mn10300/mn10300.h: Likewise.
4251         * config/rs6000/rs6000.h: Likewise.
4252         * config/score/score.h: Likewise.
4253         * config/spu/spu.h: Likewise.
4254         * config/v850/v850.h: Likewise.
4255         * defaults.h: Likewise.
4256         * doc/tm.texi (OUTGOING_REG_PARM_STACK_SPACE): Adjust documentation.
4257         * expr.c (emit_block_move): Adjust use of
4258         OUTGOING_REG_PARM_STACK_SPACE.
4259         * function.c (STACK_DYNAMIC_OFFSET): Adjust use of
4260         OUTGOING_REG_PARM_STACK_SPACE.
4261         * targhooks.c (default_return_in_memory): Remove RETURN_IN_MEMORY.
4262
4263 2008-05-08  Jakub Jelinek  <jakub@redhat.com>
4264
4265         * tree-parloops.c (create_parallel_loop): Set OMP_RETURN_NOWAIT
4266         on OMP_RETURN for OMP_FOR.
4267
4268         PR debug/35896
4269         * dwarf2out.c (dw_expand_expr, common_check): Removed.
4270         (fortran_common): New function.
4271         (gen_variable_die): Call fortran_common instead of common_check,
4272         adjust for it returning tree instead of rtx.  Formatting.
4273
4274 2008-05-07  Kenneth Zadeck  <zadeck@naturalbridge.com>
4275
4276         PR rtl/7335
4277         PR rtl/33826
4278         * see.c (see_copy_insn): Copy new pure const attributes for new call.
4279         * c-decl.c (merge_decls): Ditto.
4280         * postreload.c (record_opr_changes): Change CONST_OR_PURE_CALL_P
4281         to RTL_CONST_OR_PURE_CALL_P.
4282         * tree.c (define_local_buitin): Rename DECL_IS_PURE to DECL_PURE_P.
4283         Initialized DECL_LOOPING_CONST_PURE.
4284         (process_call_operands): Set tree_side_effects properly.
4285         * tree.h (TREE_READONLY_DECL_P): Removed.
4286         (DECL_IS_PURE): Renamed to DECL_PURE_P.
4287         (DECL_LOOPING_OR_CONST_P): New macro.
4288         (struct tree_function_decl): Added looping_const_or_pure_p.
4289         (ECF_*) Renumbered.
4290         (ECF_LOOPING_OR_CONST_P): New macro.
4291         * rtlanal.c (pure_const_p): Removed.
4292         * builtins.c (expand_builtin): Rename DECL_IS_PURE to DECL_PURE_P.
4293         * reorg.c (delete_prior_computation) Changed CONST_OR_PURE_CALL_P
4294         to RTL_CONST_CALL_P.
4295         * ipa-pure-const.c (pure_const_state_e): Added looping field.
4296         (check_decl, check_tree, check_call, scan_function): Initialize
4297         looping.
4298         (analyze_function): Rename DECL_IS_PURE to DECL_PURE_P.
4299         (static_execute): Set looping true for recursive functions.
4300         Undo setting state to IPA_NEITHER for recursive functions.
4301         * cse.c (cse_insn): 
4302         * ifcvt.c (noce_can_store_speculate_p): Changed
4303         CONST_OR_PURE_CALL_P and pure_call_p to RTL_CONST_CALL_P or 
4304         RTL_CONST_OR_PURE_CALL_P.
4305         * dse.c (scan_insn): Ditto.
4306         * local-alloc.c (validate_equiv_mem, memref_used_between_p): Ditto.
4307         * gcse.c (oprs_not_seen_p) Changed CONST_OR_PURE_CALL_P to
4308         RTL_CONST_OR_PURE_CALL_P.
4309         (store_killed_in_insn): Changed CONST_OR_PURE_CALL_P and
4310         pure_call_p to RTL_CONST_CALL_P.
4311         * gimplify.c (gimplify_call_expr): Clear side effects for
4312         non-looping pure and constant calls.
4313         * calls.c (emit_call_1): Set rtl flags from ecf flags.
4314         (flags_from_decl_or_type): Set ecf flags from decl flags.
4315         (initialize_argument_information): Turn off
4316         ECF_LOOPING_CONST_OR_PURE when turning off ECF_CONST.
4317         Change const to pure if callee_copies is true rather than just
4318         turning off const.
4319         (expand_call): Turn off ECF_LOOPING_PURE_CONST_CALL and remove old
4320         way of marking pure calls.
4321         (emit_library_call_value_1): Turn off ECF_LOOPING_PURE_CONST_CALL.
4322         Remove hack that was supposed to fix pr7335 and remove old
4323         way of marking pure calls.
4324         * emit-rtl.c (emit_copy_of_insn_after): Copy RTL_CONST_CALL_P,
4325         RTL_PURE_CALL_P, RTL_LOOPING_CONST_OR_PURE_CALL_P.
4326         * cselib.c (cselib_process_insn): Changed CONST_OR_PURE_CALL_P to
4327         RTL_CONST_OR_PURE_CALL_P.
4328         * tree-ssa-pre.c (can_value_number_call): Fixed spacing.
4329         * loop-invariant.c (find_exits, find_invariant_bb): Changed
4330         CONST_OR_PURE_CALL_P to RTL_CONST_OR_PURE_CALL_P.
4331         * sched-deps.c (schedule_analyze): Ditto.
4332         * rtl.h (struct rtx_def): Use call field, unchanging field, and
4333         return_val field of calls to represent pure and const function info.
4334         (CONST_OR_PURE_CALL_P): Deleted macro.
4335         (RTL_CONST_CALL_P, RTL_PURE_CALL_P,
4336         RTL_LOOPING_CONST_OR_PURE_CALL_P, RTL_CONST_OR_PURE_P): New macros.
4337         * tree-inline.c (copy_body_r): Changed TREE_READONLY_DECL_P to
4338         TREE_READONLY.
4339         * tree-optimize.c (execute_fixup_cfg): Added test for
4340         ECF_LOOPING_CONST_OR_PURE.
4341         * c-common.c (handle_pure_attribute): Changed DECL_IS_PURE to
4342         DECL_PURE_P.
4343         * tree-cfg.c (update_call_expr_flags): Do not clear tree side
4344         effects for looping pure or const calls.
4345         (verify_gimple_expr): Added verification code. 
4346         * config/alpha/alpha.c (alpha_legitimize_address,
4347         alpha_emit_xfloating_libcall): Changed CONST_OR_PURE_CALL_P to
4348         RTL_CONST_CALL_P.
4349         * config/s390/s390.c (s390_emit_tls_call_insn): Ditto.
4350         * config/rs6000/rs6000.c (rs6000_legitimize_tls_address): Ditto.
4351         * config/mips/mips.c (mips_call_tls_get_addr): Ditto.
4352         * cfgrtl.c (need_fake_edge_p): Changed CONST_OR_PURE_CALL_P to
4353         RTL_CONST_OR_PURE_CALL_P.
4354         * dce.c (deletable_insn_p): Allow non looping, non sibling, pure
4355         and const calls to be deleted.
4356
4357 2008-05-07  Uros Bizjak  <ubizjak@gmail.com>
4358
4359         PR target/35714
4360         * config/i386/mmx.md (mmx_subv2sf3): New expander.
4361         (*mmx_subv2sf3): Rename from mmx_subv2sf3 insn pattern.
4362         (*mmx_eqv2sf3): Rename from mmx_eqv2sf3 insn pattern.
4363         (mmx_eqv2sf3): New expander.  Use ix86_fixup_binary_operands_no_copy
4364         to handle nonimmediate operands.
4365         (*mmx_paddwd): Rename from mmx_paddwd insn pattern.
4366         (mmx_paddwd): New expander.  Use ix86_fixup_binary_operands_no_copy
4367         to handle nonimmediate operands.
4368         (*mmx_pmulhrwv4hi3): Rename from mmx_pmulhrwv4hi3 insn pattern.
4369         (mmx_pmulhrwv4hi3): New expander.  Use
4370         ix86_fixup_binary_operands_no_copy to handle nonimmediate operands.
4371         (*sse2_umulv1siv1di3): Rename from sse2_umulv1siv1di3 insn pattern.
4372         (sse2_umulv1siv1di3): New expander.  Use
4373         ix86_fixup_binary_operands_no_copy to handle nonimmediate operands.
4374         (*mmx_eq<mode>3): Rename from mmx_eq<mode>3 insn pattern.
4375         (mmx_eq<mode>3): New expander.  Use
4376         ix86_fixup_binary_operands_no_copy to handle nonimmediate operands.
4377         (*mmx_uavgv8qi3): Rename from mmx_uavgv8qi3 insn pattern.
4378         (mmx_uavgv8qi3): New expander.  Use
4379         ix86_fixup_binary_operands_no_copy to handle nonimmediate operands.
4380         (*mmx_uavgv4hi3): Rename from mmx_uavgv4hi3 insn pattern.
4381         (mmx_uavgv4hi3): New expander.  Use
4382         ix86_fixup_binary_operands_no_copy to handle nonimmediate operands.
4383
4384         * config/i386/sse.md
4385         (sse_movhlps_exp): New expander.  Use ix86_fixup_binary_operands
4386         to handle nonimmediate operands.
4387         (sse_movlhps_exp): New expander.  Use ix86_fixup_binary_operands
4388         to handle nonimmediate operands.
4389         (sse_loadhps_exp): New expander.  Use ix86_fixup_binary_operands
4390         to handle nonimmediate operands.
4391         (sse_loadlps_exp): New expander.  Use ix86_fixup_binary_operands
4392         to handle nonimmediate operands.
4393         (sse2_unpckhpd_exp): New expander.  Use
4394         ix86_fixup_binary_operands_no_copy to handle nonimmediate operands.
4395         (sse2_unpcklpd_exp): New expander.  Use
4396         ix86_fixup_binary_operands_no_copy to handle nonimmediate operands.
4397         (sse_loadhpd_exp): New expander.  Use ix86_fixup_binary_operands
4398         to handle nonimmediate operands.
4399         (sse_loadlpd): New expander.  Use ix86_fixup_binary_operands
4400         to handle nonimmediate operands.
4401         (*sse2_<plusminus_insn><mode>3): Rename from
4402         sse2_<plusminus_insn><mode>3 insn pattern.
4403         (sse2_<plusminus_insn><mode>3): New expander.  Use
4404         ix86_fixup_binary_operands_no_copy to handle nonimmediate operands.
4405         (*sse2_umulv2siv2di3): Rename from sse2_umulv2siv2di3 insn pattern.
4406         (sse2_umulv2siv2di3): New expander.  Use
4407         ix86_fixup_binary_operands_no_copy to handle nonimmediate operands.
4408         (*sse4_1_mulv2siv2di3): Rename from sse4_1_mulv2siv2di3 insn pattern.
4409         (sse4_1_mulv2siv2di3): New expander.  Use
4410         ix86_fixup_binary_operands_no_copy to handle nonimmediate operands.
4411         (*sse2_pmaddwd): Rename from sse2_pmaddwd insn pattern.
4412         (sse2_pmaddwd): New expander.  Use
4413         ix86_fixup_binary_operands_no_copy to handle nonimmediate operands.
4414         (*sse2_eq<mode>3): Rename from sse2_eq<mode>3 insn pattern.
4415         (sse2_eq<mode>3): New expander.  Use
4416         ix86_fixup_binary_operands_no_copy to handle nonimmediate operands.
4417         (*sse4_1_eqv2di3): Rename from sse4_1_eqv2di3 insn pattern.
4418         (sse4_1_eqv2di3): New expander.  Use
4419         ix86_fixup_binary_operands_no_copy to handle nonimmediate operands.
4420         (*sse2_uavgv16qi3): Rename from sse2_uavgv16qi3 insn pattern.
4421         (sse2_uavgv16qi3): New expander.  Use
4422         ix86_fixup_binary_operands_no_copy to handle nonimmediate operands.
4423         (*sse2_uavgv16qi3): Rename from sse2_uavgv16qi3 insn pattern.
4424         (sse2_uavgv16qi3): New expander.  Use
4425         ix86_fixup_binary_operands_no_copy to handle nonimmediate operands.
4426         (*sse2_uavgv8hi3): Rename from sse2_uavgv8hi3 insn pattern.
4427         (sse2_uavgv8hi3): New expander.  Use
4428         ix86_fixup_binary_operands_no_copy to handle nonimmediate operands.
4429         (*ssse3_pmulhrswv8hi3): Rename from ssse3_pmulhrswv8hi3 insn pattern.
4430         (ssse3_pmulhrswv8hi3): New expander.  Use
4431         ix86_fixup_binary_operands_no_copy to handle nonimmediate operands.
4432         (*ssse3_pmulhrswv4hi3): Rename from ssse3_pmulhrswv4hi3 insn pattern.
4433         (ssse3_pmulhrswv4hi3): New expander.  Use
4434         ix86_fixup_binary_operands_no_copy to handle nonimmediate operands.
4435
4436         (<sse>_vm<plusminus_insn><mode>3): Do not use ix86_binary_operator_ok.
4437         (<sse>_vmmul<mode>3): Ditto.
4438         (divv4sf3): Do not use ix86_fixup_binary_operands_no_copy.
4439         (divv2df3): Ditto.
4440         (ssse3_pmaddubsw128): Use register_operand for operand 1.
4441         (ssse3_pmaddubsw): Ditto.
4442
4443         * config/i386/i386.c (struct_builtin_description)
4444         [IX86_BUILTIN_LOADHPS]: Use CODE_FOR_sse_loadhps_exp.
4445         [IX86_BUILTIN_STOREHPS]: Use CODE_FOR_sse_loadlps_exp.
4446         [IX86_BUILTIN_LOADHPD]: Use CODE_FOR_sse2_loadhpd_exp.
4447         [IX86_BUILTIN_LOADLPD]: Use CODE_FOR_sse2_loadlpd_exp.
4448         [IX86_BUILTIN_MOVHLPS]: Use CODE_FOR_sse_movhlps_exp.
4449         [IX86_BUILTIN_MOVLHPS]: Use CODE_FOR_sse_movlhps_exp.
4450         [IX86_BUILTIN_UNPCKHPD]: Use FOR_sse2_unpckhpd_exp.
4451         [IX86_BUILTIN_UNPCKLPD]: Use FOR_sse2_unpcklpd_exp.
4452         (ix86_fixup_binary_operands): Assert that src1
4453         and src2 must have the same mode when swapped.
4454         (ix86_expand_binop_builtin): Do not use ix86_fixup_binary_operands
4455         and ix86_binary_operator_ok.  Do not force operands in registers
4456         when optimizing.
4457
4458 2008-05-07  Jan Hubicka  <jh@suse.cz>
4459
4460         * cgraph.c (dump_cgraph_node): Update.
4461         * cgraph.h (cgraph_local_info): Break out inline summary.
4462         * cgraphunit.c (cgraph_process_new_functions): Use inliner analysis
4463         hook.
4464         * ipa-inline (inline_summary): New accestor function.
4465         (cgraph_clone_inlined_nodes, cgraph_check_inline_limits,
4466         cgraph_decide_inlining, compute_inline_parameters): Update.
4467         * ipa.c (cgraph_remove_unreachable_nodes): Remove statistics.
4468
4469 2008-05-07  Maxim Kuvyrkov  <maxim@codesourcery.com>
4470
4471         Cleanup ColdFire scheduling support and add V4 pipeline model.
4472
4473         * config/m68k/m68k.md (UNSPEC_TIE): New constant.
4474         (define_attr cpu): Add cfv4 value.
4475         (define_attr type, define_attr type1): Merge into a single 'type'
4476         attribute.  Update all uses.
4477         (define_attr opx_type, define_attr opy_type, define_attr opx_access):
4478         Rearrange and update.  Rename value 'reg' to 'Rn', add value 'FPn'.
4479         Update all uses.
4480         (define_attr opx_mem, define_attr opy_mem): Remove.
4481         (define_attr op_mem): Clean up, update comment.
4482         (define_attr size): Use specific values instead of general int.
4483         (define_attr guess, define_attr split): Remove.  Update all uses.
4484         (movdf_internal, tstsi_internal, tsthi_internal, tstqi_internal,
4485         tst<mode>_68881, pushexthisi_const, movsi_const0_68000_10,
4486         movsi_const0_68040_60, movsi_const0, movsi_cf, movstrictqi_cf,
4487         zero_extendhisi2_cf, zero_extendqisi2_cfv4, cfv4_extendhisi2,
4488         68k_extendhisi2, extendqihi2, cfv4_extendqisi2, 68k_extendqisi2,
4489         floatsi<mode>2_68881, ftrunc<mode>2_68881, ftrunc<mode>2_cf,
4490         fix<mode>qi2_68881, fix<mode>hi2_68881, fix<mode>si2_68881,
4491         adddi_dishl32, addsi3_5200, add<mode>3_floatsi_68881,
4492         add<mode>3_floathi_68881, add<mode>3_floatqi_68881,
4493         add<mode>3_68881, add<mode>3_cf, subdi_dishl32, subsi3,
4494         sub<mode>3_floatsi_68881, sub<mode>3_floathi_68881,
4495         sub<mode>3_floatqi_68881, sub<mode>3_68881, sub<mode>3_cf,
4496         mulhi3, mulhisi3, mulhisisi3_s, mulsi3_68020, mulsi3_cf,
4497         umulhisi3, mulhisisi3_z, mul<mode>3_floatsi_68881,
4498         mul<mode>3_floathi_68881, mul<mode>3_floatqi_68881, fmul<mode>3_cf,
4499         div<mode>3_cf, sqrt<mode>2_cf, abs<mode>2_cf, clzsi2,
4500         one_cmplsi2_5200, subreghi1ashrdi_const32, ashrsi3, lshrsi3,
4501         bsetmemqi, bsetmemqi_ext, bclrmemqi, bclrmemqi_ext,
4502         beq, bne, bgt, blt, bordered, bunordered, buneq, bunge, bungt, bunle,
4503         bunlt, bltgt, tablejump_internal, call, non_symbolic_call_value,
4504         symbolic_call_value_jsr, symbolic_call_value_bsr, link):
4505         Update or set attributes.
4506         (stack_tie): New fake instruction.
4507
4508         * config/m68k/m68k.h (TUNE_CFV4): New macro.
4509         (m68k_sched_attr_size): Update declaration.
4510         (m68k_sched_attr_type2): Remove.
4511         (m68k_sched_address_bypass_p, m68k_sched_indexed_address_bypass_p):
4512         Declare new bypass predicates.
4513
4514         * config/m68k/m68k.c (m68k_sched_issue_rate,
4515         m68k_sched_first_cycle_multipass_dfa_lookahead): Declare hook
4516         implementations.
4517         (TARGET_SCHED_ISSUE_RATE,
4518         TARGET_SCHED_FIRST_CYCLE_MULTIPASS_DFA_LOOKAHEAD): Override hooks.
4519         (override_options): Handle scheduling for ColdFire V4 core.
4520         (m68k_expand_prologue): Emit stack_tie.
4521         (enum attr_op_type): Split value 'OP_TYPE_REG' to 'OP_TYPE_RN' and
4522         'OP_TYPE_FPN'.  Update all uses.
4523         (sched_guess_p): Remove.
4524         (sched_address_type): Handle symbolic addresses.
4525         (sched_get_operand): New static function.
4526         (sched_operand_type): Merge into sched_attr_op_type.
4527         (sched_attr_op_type): Handle FP registers, handle quick constants,
4528         update.
4529         (m68k_sched_attr_opx_type, m68k_sched_attr_opy_type): Update.
4530         (m68k_sched_attr_size): Update.  Move logic to ...
4531         (sched_get_attr_size_int): New static function.
4532         (sched_get_opxy_mem_type): New static function.
4533         (m68k_sched_attr_op_mem): Update.
4534         (m68k_sched_attr_type2): Remove.
4535         (sched_cfv4_bypass_data): New static variable.
4536         (m68k_sched_adjust_cost): Handle ColdFire V4 bypass.
4537         (m68k_sched_issue_rate): Implement scheduler hook.
4538         (struct _sched_ib: enabled_p): New field.
4539         (m68k_sched_variable_issue): Update.  Handle V4.
4540         (SCHED_DUMP_TODO, SCHED_DUMP_DONE, SCHED_DUMP_NOTHING,
4541         sched_dump_class_func_t, sched_dump_split_class,
4542         sched_dump_dfa_guess_unit_code, sched_dump_dfa_state,
4543         sched_dump_dfa_class, m68k_sched_dump): Remove.
4544         (m68k_sched_first_cycle_multipass_dfa_lookahead): Implement scheduler
4545         hook.
4546         (m68k_sched_init_global): Remove statisctics dumping, introduce
4547         sanity check that all instructions have pipeline reservations.  Handle
4548         ColdFire V4 core.
4549         (m68k_sched_dfa_pre_advance_cycle, m68k_sched_dfa_post_advance_cycle):
4550         Handle ColdFire V4 core.
4551         (sched_mem_operand_p, sched_get_reg_operand, sched_get_mem_operand):
4552         New static functions.
4553         (m68k_sched_address_bypass_p): New bypass predicate.
4554         (sched_get_indexed_address_scale): New static function.
4555         (m68k_sched_indexed_address_bypass_p): New bypass predicate.
4556
4557         * cf.md: Update comments.
4558         (define_attr type2): Remove.  Use 'type' attribute instead.
4559         Update all uses.
4560         (cf_ib): Rename to cfv123_ib.  Update all uses.
4561         (cf_oep): Rename to cfv123_oep.  Update all uses.
4562         (cf_chr): Rename to cfv123_chr.  Update all uses.
4563         (cf_mem): Rename to cfv123_mem.  Update all uses.
4564         (cf_mac): Move to more appropriate place.
4565         (cfv123_guess): New automaton and cpu_unit.
4566         (cfv123_*, cfv12_*, cfv1_*, cfv2_*, cfv3_*): Use type attribute.
4567         Update uses of 'size' attribute.  Handle before reload scheduling.
4568         (cfv123_guess): New dummy reservation for unhandled instructions.
4569         (cfv4_*): Pipeline description of ColdFire V4 core.
4570         (ignore): New reservation to handle 'ignore' type.
4571
4572 2008-05-07  Ian Lance Taylor  <iant@google.com>
4573
4574         PR middle-end/36013
4575         * gimplify.c (find_single_pointer_decl_1): Don't look through
4576         indirections.
4577         (find_single_pointer_decl): Adjust comments.
4578
4579 2008-05-07  Jakub Jelinek  <jakub@redhat.com>
4580
4581         PR middle-end/36137
4582         * fold-const.c (fold_binary): Use STRIP_SIGN_NOPS instead of
4583         STRIP_NOPS on arguments even for MIN_EXPR and MAX_EXPR.
4584
4585         PR middle-end/36106
4586         * omp-low.c (expand_omp_atomic_pipeline): Load value using the
4587         integral type rather than floating point, then VIEW_CONVERT_EXPR
4588         to the floating point type.
4589
4590 2008-05-07  Uros Bizjak  <ubizjak@gmail.com>
4591
4592         * config/i386/i386.c (ix86_expand_copysign): Force non-zero constant
4593         TFmode op0 to register.
4594
4595 2008-05-07  Alan Modra  <amodra@bigpond.net.au>
4596
4597         * c-decl.c (grokdeclarator): Comment typo.
4598
4599 2008-05-06  Aldy Hernandez  <aldyh@redhat.com>
4600
4601         * tree-flow.h: Remove prototype for computed_goto_p.
4602         * tree-cfg.c (computed_goto_p): Make static.
4603
4604 2008-05-06  H.J. Lu  <hongjiu.lu@intel.com>
4605
4606         PR target/35657
4607         * config/i386/i386.c (contains_128bit_aligned_vector_p): Renamed to ...
4608         (contains_aligned_value_p): This.  Handle _Decimal128.
4609         (ix86_function_arg_boundary): Only align _Decimal128 to its
4610         natural boundary and handle it properly.
4611
4612 2008-05-06  Martin Jambor  <mjambor@suse.cz>
4613
4614         * ipa-cp.c (ipcp_method_orig_node): Renamed to ipcp_get_orig_node.
4615         (ipcp_method_is_cloned): Renamed to ipcp_node_is_clone
4616         (ipcp_method_set_orig_node): Removed.
4617         (ipcp_cval_get_cvalue_type): Removed.
4618         (ipcp_method_get_scale): Renamed to ipcp_get_node_scale.
4619         (ipcp_method_set_scale): Renamed to ipcp_set_node_scale.
4620         (ipcp_cval_set_cvalue_type): Removed.
4621         (ipcp_cval_get_cvalue): Removed.
4622         (ipcp_cval_set_cvalue): Removed.
4623         (ipcp_type_is_const): Renamed to ipcp_lat_is_const.
4624         (ipcp_cval_equal_cvalues): Renamed to ipcp_lats_are_equal
4625         (ipcp_lats_are_equal): Changed parameters to two ipcp_lattice's
4626         (ipcp_cval_meet): Renamed to ipa_lattice_meet
4627         (ipcp_cval_changed): Changed to use ipcp_lat_is_const
4628         (ipcp_method_cval): Renamed to ipcp_get_ith_lattice
4629         (ipcp_get_ith_lattice): Changed parameters.
4630         (ipcp_cval_compute): Renamed to ipcp_lattice_from_jfunc
4631         (ipcp_lattice_from_jfunc): Changed parameters.
4632         (ipcp_redirect): Local lattice pointer instead of lattice type variable.
4633         (ipcp_method_cval_print): Added temporary variable info.
4634         (ipcp_redirect): Removed already unused local variable caller.
4635         (ipcp_redirect): New temporary variable orig_callee_info
4636         (ipcp_redirect): Removed newly unused local variable callee.
4637         (ipcp_redirect): Removed (a bit confusing) local variable type.
4638         (ipcp_insert_stage): Added local variable info.
4639         (ipcp_cval_changed): Renamed to ipcp_lattice_changed, parameters 
4640         renamed too
4641         (ipcp_formal_create): Removed.
4642         (ipcp_method_cval_set): Removed.
4643         (ipcp_propagate_stage): Renamed lattice variables.
4644         (ipcp_method_cval_set_cvalue_type): Removed.
4645         (ipcp_method_cval_print): Renamed to ipcp_print_all_lattices
4646         (ipcp_print_all_lattices): Changed printed strings to refer to 
4647         lattices rather than cvals.
4648         (ipcp_method_cval_init): Renamed to ipcp_initialize_node_lattices
4649         (ipcp_propagate_const): Changed formal parameters.
4650         (build_const_val): Changed formal parameters.
4651         (ipcp_insert_stage): Removed useless variable cvalue
4652         (build_const_val): Changed formal parameters.
4653         (ipcp_method_compute_scale): Renamed to ipcp_compute_node_scale
4654         (ipcp_after_propagate): Renamed to ipcp_change_tops_to_bottom
4655         (ipcp_callsite_param_print): Renamed to ipcp_print_all_jump_functions
4656         (ipcp_profile_mt_count_print): Renamed to ipcp_print_func_profile_counts
4657         (ipcp_print_func_profile_counts): Changed string from "method" to 
4658         "function"
4659         (ipcp_profile_cs_count_print): Renamed to ipcp_print_call_profile_counts
4660         (ipcp_profile_edge_print): Renamed to ipcp_print_edge_profiles
4661         (ipcp_profile_bb_print): Renamed to ipcp_print_bb_profiles
4662         (ipcp_structures_print): Renamed to ipcp_print_all_structures
4663         (ipcp_profile_print): Renamed to ipcp_print_profile_data
4664         (ipcp_lat_is_const): Changed parameters and made inline.
4665         (ipcp_replace_map_create): Renamed to ipcp_create_replace_map
4666         (ipcp_redirect): Renamed to ipcp_need_redirect_p
4667         (ipcp_need_redirect_p): Calls ipcp_lat_is_const instead of using 
4668         the predicate condition directly
4669         (ipcp_propagate_stage): Added local variable args. Removed local
4670         variable callee.  (Both are mere code simplifications.)
4671         (ipcp_method_dont_insert_const): Renamed to
4672         ipcp_node_not_modifiable_p.
4673         (ipcp_node_not_modifiable_p): Made inline.
4674         (ipcp_cloned_create): Renamed to ipcp_init_cloned_node
4675         (ipcp_propagate_const): Renamed to ipcp_propagate_one_const
4676         (ipcp_print_all_lattices): Removed variable cvalue
4677         (ipcp_method_scale_print): Renamed to ipcp_function_scale_print
4678         Updated comments.
4679
4680 2008-05-06  Olivier Hainque  <hainque@adacore.com>
4681
4682         * tree-sra.c (try_instantiate_multiple_fields): Early return
4683         if field has POINTER_TYPE.
4684
4685 2008-05-06  Kai Tietz  <kai.tietz@onevision.com>
4686
4687         * config/i386/i386.c (output_set_got): Fix for x86_64 output_emit_asm
4688         by using 'q' specifier for instruction.
4689         (ix86_file_end): Replaced case TARGET_64BIT_MS_ABI by TARGET_64BIT.
4690
4691 2008-05-06  Anatoly Sokolov <aesok@post.ru>
4692
4693         * config/avr/avr.md (*sbrx_branch, *sbix_branch, *sbix_branch_tmp):
4694         Change mode of zero_extract from QImode to HImode.
4695         (sign bit tests peepholes): (Ditto.).
4696
4697 2008-05-06  Uros Bizjak  <ubizjak@gmail.com>
4698
4699         * config/i386/mmx.md: Remove double backslashes from asm templates.
4700         (*mmx_addv2sf3): Rename from mmx_addv2sf3 insn pattern.
4701         (mmx_addv2sf3): New expander.  Use ix86_fixup_binary_operands_no_copy
4702         to handle nonimmediate operands.
4703         (*mmx_mulv2sf3): Rename from mmx_mulv2sf3 insn pattern.
4704         (mmx_mulv2sf3): New expander.  Use ix86_fixup_binary_operands_no_copy
4705         to handle nonimmediate operands.
4706         (*mmx_<code>v2sf3_finite): New insn pattern.
4707         (*mmx_<code>v2sf3): Rename from mmx_<code>v2sf3 insn pattern.
4708         (mmx_<code>v2sf3): New expander.  Use
4709         ix86_fixup_binary_operands_no_copy to handle nonimmediate operands.
4710         (mmx_<plusminus_insn><mode>3): New expander.  Use
4711         ix86_fixup_binary_operands_no_copy to handle nonimmediate operands.
4712         (*mmx_<plusminus_insn><mode>3): New insn pattern.
4713         (mmx_add<mode>3): Removed.
4714         (mmx_ssadd<mode>3): Ditto.
4715         (mmx_usadd<mode>3): Ditto.
4716         (mmx_sub<mode>3): Ditto.
4717         (mmx_sssub<mode>3): Ditto.
4718         (mmx_ussub<mode>3): Ditto.
4719         (*mmx_mulv4hi3): Rename from mmx_mulv4hi3 insn pattern.
4720         (mmx_mulv4hi3): New expander.  Use ix86_fixup_binary_operands_no_copy
4721         to handle nonimmediate operands.
4722         (*mmx_smulv4hi3_highpart): Rename from mmx_smulv4hi3_highpart
4723         insn pattern.
4724         (mmx_smulv4hi3_highpart): New expander.  Use
4725         ix86_fixup_binary_operands_no_copy to handle nonimmediate operands.
4726         (*mmx_umulv4hi3_highpart): Rename from mmx_umulv4hi3_highpart
4727         insn pattern.
4728         (mmx_umulv4hi3_highpart): New expander.  Use
4729         ix86_fixup_binary_operands_no_copy to handle nonimmediate operands.
4730         (*mmx_<code>v4hi3): Rename from mmx_<code>v4hi3 insn pattern.
4731         (mmx_<code>v4hi3): New expander.  Use
4732         ix86_fixup_binary_operands_no_copy to handle nonimmediate operands.
4733         (*mmx_<code>v8qi3): Rename from mmx_<code>v8qi3 insn pattern.
4734         (mmx_<code>v8qi3): New expander.  Use
4735         ix86_fixup_binary_operands_no_copy to handle nonimmediate operands.
4736         (*mmx_<code><mode>3): Rename from mmx_<code><mode>3 insn pattern.
4737         (mmx_<code><mode>3): New expander.  Use
4738         ix86_fixup_binary_operands_no_copy to handle nonimmediate operands.
4739
4740 2008-05-05  Jan Hubicka  <jh@suse.cz>
4741
4742         PR tree-optimization/36118
4743         * passes.c (pass_init_dump_file): Fix dump header.
4744
4745 2008-05-05  Andrew Pinski  <andrew_pinski@playstation.sony.com>
4746
4747         PR middle-end/36141
4748         * tree-ssa-forwprop.c (forward_propagate_addr_expr_1): Don't create
4749         VCE for function decls.
4750
4751 2008-05-05  H.J. Lu  <hongjiu.lu@intel.com>
4752
4753         * config/i386/sse.md (sse2_<plusminus_insn><mode>3): Fix a typo.
4754
4755 2008-05-05  H.J. Lu  <hongjiu.lu@intel.com>
4756
4757         * config/i386/i386.md (sat_plusminus): New.
4758         (plusminus_insn): Likewise.
4759         (plusminus_mnemonic): Likewise.
4760         (addsub): Removed.
4761         (comm): Add ss_plus, us_plus, ss_minus and us_minus.
4762         (*<addsub><mode>3_cc_overflow): Renamed to ...
4763         (*<plusminus_insn><mode>3_cc_overflow): This.
4764         (*<addsub>si3_zext_cc_overflow): Renamed to ...
4765         (*<plusminus_insn>si3_zext_cc_overflow): This.
4766
4767         * config/i386/sse.md (<addsub><mode>3): Renamed to ...
4768         (<plusminus_insn><mode>3): This.
4769         (*<addsub><mode>3): Renamed to ...
4770         (*<plusminus_insn><mode>3): This.
4771         (<sse>_vm<addsub><mode>3): Renamed to ...
4772         (<sse>_vm<plusminus_insn><mode>3): This.
4773         (sse3_h<addsub>v4sf3): Renamed to ...
4774         (sse3_h<plusminus_insn>v4sf3): This.
4775         (sse3_h<addsub>v2df3): Renamed to ...
4776         (sse3_h<plusminus_insn>v2df3): This.
4777         (<plusminus_insn><mode>3): New.
4778         (*<plusminus_insn><mode>3): Likewise.
4779         (sse2_<plusminus_insn><mode>3): Likewise.
4780         (add<mode>): Removed.
4781         (*add<mode>3): Likewise.
4782         (sse2_ssadd<mode>3): Likewise.
4783         (sse2_usadd<mode>3): Likewise.
4784         (sub<mode>3): Likewise.
4785         (*sub<mode>3): Likewise.
4786         (sse2_sssub<mode>3): Likewise.
4787         (sse2_ussub<mode>3): Likewise.
4788
4789 2008-05-05  Benjamin Kosnik  <bkoz@redhat.com>
4790
4791         * gthr-single.h: Add in required interface elements as per gthr.h.
4792         Add stub types for __gthread_key_t, __gthread_once_t. Add defines
4793         for __GTHREAD_ONCE_INIT, __GTHREAD_RECURSIVE_MUTEX_INIT.
4794         Generalize UNUSED macro. 
4795         (__gthread_once): Add.
4796         (__gthread_key_create): Add.
4797         (__gthread_key_delete): Add.
4798         (__gthread_getspecific): Add.
4799         (__gthread_setspecific): Add.
4800         
4801 2008-05-05  Andrew Pinski  <Andrew.Pinski@playstation.sony.com>
4802
4803         * tree-ssa-forwprop.c (forward_propagate_addr_expr_1): If we have
4804         the same size types for the indirect reference on the rhs, then
4805         create a VCE.
4806
4807 2008-05-05  Uros Bizjak  <ubizjak@gmail.com>
4808
4809         * config/i386/i386.md
4810         (*float<SSEMODEI24:mode><MODEF:mode>2_sse_interunit): Use only
4811         one insn template instead of template series.
4812         (*xordi_1_rex64): Ditto.
4813         (*xordi_2_rex64): Ditto.
4814
4815 2008-05-05  Ira Rosen  <irar@il.ibm.com>
4816
4817         PR tree-optimization/36119
4818         * tree-vect-transform.c (vectorizable_assignment): Set NCOPIES to 1
4819         in case of SLP.
4820
4821 2008-06-04  Jan Hubicka  <jh@suse.cz>
4822
4823         tree-optimization/36100
4824         * tree-pass.h (pass_O0_always_inline): Declare.
4825         * ipa-inline.c (inline_transform): Remove dead code.
4826         (cgraph_gate_O0_always_inline, cgraph_O0_always_inline,
4827         pass_O0_always_inline): New.
4828         * passes.c (init_optimization_passes): Add pass_O0_always_inline.
4829
4830 2008-05-04  Kai Tietz  <kai.tietz@onevision.com>
4831
4832         * config/i386/i386.c (x86_output_mi_thunk): Use movq alternative
4833         mnemonic in this_param move for TARGET_64BIT.
4834
4835 2008-05-04  Uros Bizjak  <ubizjak@gmail.com>
4836
4837         * config/i386/i386.md (*strmovsi_1): Simplify asm alternatives.
4838         (*strmovsi_rex_1): Ditto.
4839         (*strsetsi_1): Ditto.
4840         (*strsetsi_rex_1): Ditto.
4841
4842         (add<mode>cc): Macroize expander from addqicc, addhicc, addsicc and
4843         adddicc expanders using SWI mode iterator.
4844
4845 2008-05-04  H.J. Lu  <hongjiu.lu@intel.com>
4846
4847         PR target/36121
4848         * config/i386/i386.c (ix86_expand_special_args_builtin): Remove three
4849         argument handling.
4850
4851 2008-05-04  David S. Miller  <davem@davemloft.net>
4852
4853         * config.gcc (sparc*-*-*): Always set need_64bit_hwint to yes.
4854         (sparc*-*-linux*): Use linux.h in tm_file.
4855         (sparc-*-linux*): If 'enabled_targets' is 'all', build a bi-arch
4856         compiler defaulting to 32-bit.
4857         (sparc*-*-*): Remove explicit target settings of need_64bit_hwint,
4858         no longer needed.
4859         * config/sparc/linux.h: Remove definitions now obtained
4860         properly from linux.h
4861         * config/sparc/linux64.h: Likewise.
4862         (ASM_CPU_DEFAULT_SPEC): Change this to ASM_CPU64_DEFAULT_SPEC, we
4863         don't want this setting for 32-bit builds in a biarch compiler.
4864         * doc/install.texi: Add sparc-linux to list of targets
4865         supporting --enable-targets=all.
4866
4867 2008-05-03  Andrew Pinski  <pinskia@gmail.com>
4868
4869         * Makefile.in (tree-ssa-phiprop.o): Fix dependencies.
4870
4871 2008-05-03  H.J. Lu  <hongjiu.lu@intel.com>
4872
4873         * config/i386/i386.c (ix86_builtin_type): Move V4SI_FTYPE_V4SF
4874         after V4SI_FTYPE_V8HI.
4875         (ix86_init_mmx_sse_builtins): Move case V4HI_FTYPE_V4HI after
4876         case V4SI_FTYPE_V2DF.
4877
4878 2008-05-03  Kenneth Zadeck  <zadeck@naturalbridge.com>
4879
4880         * doc/invoke.texi (max-flow-memory-locations): Removed.
4881         * params.def (PARAM_MAX_FLOW_MEMORY_LOCATIONS): Removed.
4882         
4883 2008-05-03  Richard Guenther  <rguenther@suse.de>
4884
4885         PR middle-end/34973
4886         * opts.c (set_Wstrict_aliasing): Handle the turn-off case.
4887
4888 2008-05-02  David S. Miller  <davem@davemloft.net>
4889
4890         * config.gcc (need_64bit_hwint): Document libcpp dependency.
4891
4892 2008-05-02  Simon Baldwin <simonb@google.com>
4893
4894         PR bootstrap/36108
4895         * c-common.h (warn_array_subscript_range): Removed.
4896         * c-common.c (warn_array_subscript_range): Ditto.
4897         * tree-vrp.c (check_array_ref): Revert to ignoring arrays with size 2.
4898         * c-typeck.c (build_array_ref): Remove warn_array_subscript_range.
4899
4900 2008-05-02  H.J. Lu  <hongjiu.lu@intel.com>
4901
4902         * config/i386/i386.c (ix86_special_builtin_type): New.
4903         (bdesc_special_args): Likewise.
4904         (ix86_expand_special_args_builtin): Likewise.
4905         (ix86_init_mmx_sse_builtins): Updated.
4906         (ix86_expand_builtin): Updated.
4907         (ix86_expand_store_builtin): Removed.
4908         (ix86_expand_unop_builtin): Likewise.
4909
4910         * config/i386/mm3dnow.h (__v2sf): Moved to ...
4911         * config/i386/mmintrin.h (__v2sf): Here.
4912
4913         * config/i386/xmmintrin.h (_mm_loadh_pi): Replace __v2si with
4914         const __v2sf.
4915         (_mm_loadl_pi): Likewise.
4916         (_mm_storeh_pi): Replace __v2si with __v2sf.
4917         (_mm_storel_pi): Likewise.
4918
4919         * doc/extend.texi: Correct __builtin_ia32_loadhps,
4920         __builtin_ia32_loadlps, __builtin_ia32_storehps,
4921         __builtin_ia32_storelps, __builtin_ia32_loadhpd and
4922         __builtin_ia32_loadlpd.
4923
4924 2008-05-02  H.J. Lu  <hongjiu.lu@intel.com>
4925
4926         * config/i386/i386.c (ix86_builtin_type): Add FLOAT_FTYPE_FLOAT,
4927         V4SF_FTYPE_V4SF_VEC_MERGE and V2DF_FTYPE_V2DF_VEC_MERGE.
4928         (bdesc_args): Updated.  Add scalar SSE builtins with vec_merge.
4929         (ix86_init_mmx_sse_builtins): Updated.
4930         (ix86_expand_args_builtin): Likewise.
4931         (ix86_expand_builtin): Likewise.
4932         (ix86_expand_unop1_builtin): Renamed to ...
4933         (ix86_expand_unop_vec_merge_builtin): This.
4934
4935 2008-05-01  Jan Hubicka  <jh@suse.cz>
4936
4937         PR bootstrap/36100
4938         * ipa-inline.c (inline_generate_summary): Make static.
4939         (inline_transform): Do not call inlining at -O0; make static.
4940         * passes.c (execute_todo): Add sanity check.
4941         (execute_one_ipa_transform_pass): Execute proper flags.
4942
4943 2008-05-01  Eric Botcazou  <ebotcazou@adacore.com>
4944
4945         * tree.h (TYPE_NONALIASED_COMPONENT): Expand comment.
4946         (DECL_NONADDRESSABLE_P): Likewise.
4947         * alias.c (record_component_aliases): Fix comment.
4948
4949 2008-05-01  Simon Baldwin <simonb@google.com>
4950
4951         * c-common.h (warn_array_subscript_range): New function.
4952         * c-common.c (warn_array_subscript_range): Ditto.
4953         * tree-vrp.c (check_array_ref): Corrected code to agree with
4954         comment, ignoring only arrays of size 0 or size 1.
4955         * c-typeck.c (build_array_ref): Call warn_array_subscript_range.
4956
4957 2008-05-01  H.J. Lu  <hongjiu.lu@intel.com>
4958
4959         * config/i386/i386.c (ix86_builtin_type): Replace
4960         DI_FTYPE_DI_DI_INT with V1DI2DI_FTYPE_V1DI_V1DI_INT.
4961         (bdesc_args): Updated.
4962         (ix86_init_mmx_sse_builtins): Likewise.
4963         (ix86_expand_args_builtin): Likewise.
4964
4965         * config/i386/tmmintrin.h (_mm_alignr_pi8): Replace long long
4966         with __v1di.
4967
4968         * doc/extend.texi: Correct __builtin_ia32_palignr.
4969
4970 2008-05-01  H.J. Lu  <hongjiu.lu@intel.com>
4971
4972         PR target/36095
4973         * config/i386/i386.c (bdesc_crc32): Removed.
4974         (ix86_expand_crc32): Likewise.
4975         (ix86_builtin_type): Replace V2DI2TI_FTYPE_V2DI2TI_INT with
4976         V2DI2TI_FTYPE_V2DI_INT, V2DI2TI_FTYPE_V2DI2TI_V2DI2TI_INT with
4977         V2DI2TI_FTYPE_V2DI_V2DI_INT.  Add UINT64_FTYPE_UINT64_UINT64,
4978         UINT_FTYPE_UINT_UINT, UINT_FTYPE_UINT_USHORT and
4979         UINT_FTYPE_UINT_UCHAR.
4980         (bdesc_args): Updated. Add crc32 builtins.
4981         (ix86_init_mmx_sse_builtins): Updated.
4982         (ix86_expand_args_builtin): Updated to support subreg.
4983
4984         * doc/extend.texi: Correct __builtin_ia32_crc32di.
4985
4986 2008-05-01  Jan Hubicka  <jh@suse.cz>
4987
4988         * tree-pass.h (opt_pass): Add IPA_PASS.
4989         (varpool_node, cgraph_node): Forward declare.
4990         (ipa_opt_pass): Define.
4991         (pass_ipa_inline): Turn into ipa_opt_pass.
4992         (pass_apply_inline): Remove.
4993         * ipa-inline.c (pass_ipa_inline): Turn into ipa_opt_pass.
4994         (apply_inline): Turn into ....
4995         (inline_transform): ... this one.
4996         (inline_generate_summary): New function.
4997         (pass_apply_inline): Remove.
4998         * function.h (ipa_opt_pass): Forward declare structure; typedef;
4999         vector.
5000         (struct function): Add ipa_transforms_to_apply.
5001         * passes.c (register_one_dump_file): Work on IPA_PASS.
5002         (init_optimization_passes): Remove pass_inline_parameters and
5003         pass_apply_inline.
5004         (pass_init_dump_file, pass_fini_dump_file): Break out from ....
5005         (execute_one_pass) ... here; apply transforms when possible.
5006         (add_ipa_transform_pass, execute_ipa_summary_asses,
5007         execute_one_ipa_transform_pass): New.
5008         (execute_ipa_pass_list): Update for IPA_PASS type.
5009
5010 2008-05-01  H.J. Lu  <hongjiu.lu@intel.com>
5011
5012         * config/i386/i386.c (ix86_builtin_type): Add
5013         V2DI_FTYPE_V2DI_V16QI, V2DI_FTYPE_V2DI_UINT_UINT and
5014         V2DI_FTYPE_V2DI_V2DI_UINT_UINT.
5015         (bdesc_args): Add SSE4a builtins.
5016         (ix86_init_mmx_sse_builtins): Updated.
5017         (ix86_expand_args_builtin): Likewise.
5018         (ix86_expand_builtin): Likewise.
5019
5020 2008-05-01  H.J. Lu  <hongjiu.lu@intel.com>
5021
5022         * config/i386/i386.c (ix86_builtin_type): Add
5023         V8HI_FTYPE_V8HI_V8HI_COUNT, V8HI_FTYPE_V8HI_SI_COUNT,
5024         V4SI_FTYPE_V4SI_V4SI_COUNT, V4SI_FTYPE_V4SI_SI_COUNT,
5025         V4HI_FTYPE_V4HI_V4HI_COUNT, V4HI_FTYPE_V4HI_SI_COUNT,
5026         V2DI_FTYPE_V2DI_V2DI_COUNT, V2DI_FTYPE_V2DI_SI_COUNT,
5027         V2SI_FTYPE_V2SI_V2SI_COUNT, V2SI_FTYPE_V2SI_SI_COUNT,
5028         V1DI_FTYPE_V1DI_V1DI_COUNT, V1DI_FTYPE_V1DI_SI_COUNT,
5029         V8HI_FTYPE_V8HI_INT, V4SI_FTYPE_V4SI_INT, V4HI_FTYPE_V4HI_INT,
5030         V2DI2TI_FTYPE_V2DI2TI_INT, V2DI2TI_FTYPE_V2DI2TI_V2DI2TI_INT
5031         and DI_FTYPE_DI_DI_INT.
5032         (bdesc_args): Add MMX/SSE shift, shuffle and palignr builtins.
5033         (ix86_init_mmx_sse_builtins): Updated.
5034         (ix86_expand_args_builtin): Likewise.
5035         (ix86_expand_builtin): Likewise.
5036         (ix86_expand_binop_imm_builtin): Removed.
5037
5038         * doc/extend.texi: Correct __builtin_ia32_palignr128.
5039
5040 2008-04-30  Richard Guenther  <rguenther@suse.de>
5041
5042         PR tree-optimization/32921
5043         * tree-ssa-loop-im.c (mem_refs_may_alias_p): Disambiguate with TBAA.
5044
5045 2008-04-30  Richard Sandiford  <rsandifo@nildram.co.uk>
5046
5047         * config/arm/arm.c (arm_unwind_emit): Use
5048         crtl->all_throwers_are_sibcalls instead of
5049         cfun->all_throwers_are_sibcalls.
5050         (arm_output_fn_unwind): Likewise.
5051         * config/frv/frv.c (frv_stack_info): Use crtl->uses_pic_offset_table
5052         instead of cfun->uses_pic_offset_table.
5053         (frv_expand_prologue): Likewise.
5054         (frv_frame_pointer_required): Likewise.
5055         (frv_expand_fdpic_call): Likewise.
5056         (frv_emit_movsi): Likewise.
5057         * config/iq2000/iq2000.c (iq2000_expand_prologue): Use
5058         cfun->returns_pcc_struct instead of
5059         current_function_returns_pcc_struct.
5060         * config/m32c/m32c.c (need_to_save): Use crtl->calls_eh_return
5061         instead of cfun->calls_eh_return.
5062         (m32c_pushm_popm): Likewise.
5063         * config/xtensa/xtensa.h (cfun->calls_alloca): Remove bogus
5064         "extern" declaration.
5065
5066 2008-04-30  Richard Guenther  <rguenther@suse.de>
5067
5068         PR tree-optimization/21636
5069         * tree-ssa-ccp.c (ccp_fold): Handle &p->x with p being a
5070         constant address.
5071         (evaluate_stmt): Print the likely value.
5072         (ccp_visit_stmt): Avoid excessive vertical spacing.
5073
5074 2008-04-30  Rafael Espindola  <espindola@google.com>
5075
5076         * builtins.c (fold_call_expr): Return realret.
5077         * tree-ssa-threadedge.c
5078         (record_temporary_equivalences_from_stmts_at_dest): Ignore calls to
5079         __builtin_object_size.
5080
5081 2008-04-30  Seongbae Park  <seongbae.park@gmail.com>
5082
5083         * gcc.c (wrapper_string): New variable.
5084         (insert_wrapper): New function.
5085         (execute): New option -wrapper.
5086         * doc/invoke.texi (Overall Options): New driver option -wrapper.
5087
5088 2008-04-30  Nathan Froyd  <froydnj@codesourcery.com>
5089
5090         * config/rs6000/crtresgpr.asm, config/rs6000/crtresxgpr.asm,
5091         config/rs6000/crtsavgpr.asm, config/rs6000/crtresfpr.asm,
5092         config/rs6000/crtresxfpr.asm, config/rs6000/crtsavfpr.asm: Break out
5093         from...
5094         * config/rs6000/crtsavres.asm: ...here.  Remove unneeded file.
5095         * config/rs6000/e500crtres32gpr.asm, config/rs6000/e500crtres64gpr.asm,
5096         config/rs6000/e500crtres64gprctr.asm,
5097         config/rs6000/e500crtrest32gpr.asm, config/rs6000/e500crtrest64gpr.asm,
5098         config/rs6000/e500crtresx32gpr.asm, config/rs6000/e500crtresx64gpr.asm,
5099         config/rs6000/e500crtsav32gpr.asm, config/rs6000/e500crtsav64gpr.asm,
5100         config/rs6000/e500crtsav64gprctr.asm,
5101         config/rs6000/e500crtsavg32gpr.asm, config/rs6000/e500crtsavg64gpr.asm,
5102         config/rs6000/e500crtsavg64gprctr.asm: New files.
5103         * config/rs6000/t-ppccomm: Add build rules for new files.
5104         (LIB2FUNCS_STATIC_EXTRA): Add new files.
5105         * config/rs6000/t-netbsd: Add build rules for new files.
5106         (LIB2FUNCS_STATIC_EXTRA): New variable.
5107         * config/rs6000/sysv4.h (ENDFILE_SPEC): Don't include crtsavres.o
5108         (CRTSAVRES_DEFAULT_SPEC): Likewise.
5109         * config/rs6000/netbsd.h (ENDFILE_SPEC): Likewise.
5110
5111 2008-04-30  H.J. Lu  <hongjiu.lu@intel.com>
5112
5113         * config/i386/i386.c (ix86_builtin_type): Add
5114         FLOAT128_FTYPE_FLOAT128_FLOAT128, V16QI_FTYPE_V16QI_V16QI,
5115         V16QI_FTYPE_V8HI_V8HI, V8QI_FTYPE_V8QI_V8QI,
5116         V8QI_FTYPE_V4HI_V4HI, V8HI_FTYPE_V8HI_V8HI,
5117         V8HI_FTYPE_V16QI_V16QI, V8HI_FTYPE_V4SI_V4SI,
5118         V4SI_FTYPE_V4SI_V4SI, V4SI_FTYPE_V8HI_V8HI,
5119         V4SI_FTYPE_V4SF_V4SF, V4SI_FTYPE_V2DF_V2DF,
5120         V4HI_FTYPE_V4HI_V4HI, V4HI_FTYPE_V8QI_V8QI,
5121         V4HI_FTYPE_V2SI_V2SI, V4SF_FTYPE_V4SF_V4SF,
5122         V4SF_FTYPE_V4SF_V4SF_SWAP, V4SF_FTYPE_V4SF_V2SI,
5123         V4SF_FTYPE_V4SF_V2DF, V4SF_FTYPE_V4SF_DI,
5124         V4SF_FTYPE_V4SF_SI, V2DI_FTYPE_V2DI_V2DI,
5125         V2DI_FTYPE_V16QI_V16QI, V2DI_FTYPE_V4SI_V4SI,
5126         V2DI_FTYPE_V2DF_V2DF, V2SI_FTYPE_V2SI_V2SI,
5127         V2SI_FTYPE_V4HI_V4HI, V2SI_FTYPE_V2SF_V2SF,
5128         V2DF_FTYPE_V2DF_V2DF, V2DF_FTYPE_V2DF_V2DF_SWAP,
5129         V2DF_FTYPE_V2DF_V4SF, V2DF_FTYPE_V2DF_DI,
5130         V2DF_FTYPE_V2DF_SI, V2SF_FTYPE_V2SF_V2SF,
5131         V1DI_FTYPE_V1DI_V1DI, V1DI_FTYPE_V8QI_V8QI and
5132         V1DI_FTYPE_V2SI_V2SI.
5133         (bdesc_2arg): Moved to ...
5134         (bdesc_args): Here.
5135         (ix86_init_mmx_sse_builtins): Updated.
5136         (ix86_expand_args_builtin): Updated.  Take a pointer
5137         to const struct builtin_description.  Handle comparison
5138         builtin functions.
5139         (ix86_expand_sse_compare): Take a new argument for swapping operands.
5140         (ix86_expand_builtin): Updated.
5141
5142         * config/i386/sse.md (ssse3_pmaddubswv8hi3): Renamed to ...
5143         (ssse3_pmaddubsw128): This.
5144         (ssse3_pmaddubswv4hi3): Renamed to ...
5145         (ssse3_pmaddubsw): This.
5146
5147         * doc/extend.texi (__builtin_ia32_packsswb128): Correct prototype.
5148         (__builtin_ia32_packssdw128): Likewise.
5149         (__builtin_ia32_packuswb128): Likewise.
5150         (__builtin_ia32_pmaddubsw): Likewise.
5151         (__builtin_ia32_pmaddubsw128): Likewise.
5152
5153 2008-04-30  Richard Guenther  <rguenther@suse.de>
5154
5155         PR tree-optimization/14847
5156         * tree-ssa-ifcombine.c (get_name_for_bit_test): New helper function.
5157         (recognize_bits_test): Use it.
5158         (recognize_single_bit_test): Likewise.
5159
5160 2008-04-30  Martin Jambor  <mjambor@suse.cz>
5161
5162         * ipa-cp.c (ipcp_init_stage): Calls ipa_set_called_with_variable_arg
5163         instead of setting number of formal parameters to zero.
5164         (ipcp_init_stage): Do not set the number of actual parameters to zero 
5165         either.
5166         (ipcp_propagate_stage): Explicitly skipping all calls to nodes
5167         which are called with variable number of arguments.
5168         (ipcp_insert_stage): Explicitely skipping all nodes which are
5169         called with variable number of arguments.
5170         (ipcp_callsite_param_print): Skipps callsites to nodes with varaible 
5171         number of parameters.
5172
5173         * ipa-prop.h (struct ipa_node_params): Added flag
5174         called_with_var_arguments
5175         (ipa_set_param_count): Added.  Changed sole setter to use it.
5176         (ipa_get_param_count): Added.  All readers of param_count
5177         converted to use it instead.
5178         (ipa_set_called_with_variable_arg): Added.
5179         (ipa_is_called_with_var_arguments): Added.
5180         (ipa_get_ith_param): Added.  All readers of param_decls converted
5181         to use it instead.
5182         (ipa_set_cs_argument_count): Added, sole writer to argument_count 
5183         changed to use it. 
5184         (ipa_get_cs_argument_count): Added, all readers of argument_count
5185         changed to cal it.
5186         (ipa_get_ith_jump_func): Added. Accessors of jump values changed 
5187         to use it.
5188         
5189         * ipa-prop.h (struct ipcp_formal): Renamed to ipcp_lattice
5190         (struct ipcp_lattice): Renamed cval_type to type
5191         (struct ipa_node_params): ipcp_cval renamed to ipcp_lattices
5192
5193         * ipa-cp.c (ipcp_cval_get_cvalue): Changed return value to tree
5194         (ipcp_cval_set_cvalue): Changed type of parameter value to tree
5195         (ipcp_insert_stage): Changed the type of variable cvalue to tree
5196         (ipcp_replace_map_create): Changed the type of parameter cvalue to tree
5197         (build_const_val): Changed the type of parameter cvalue to tree
5198         (ipcp_propagate_const): Changed the type of parameter cvalue to tree
5199         (ipcp_method_cval_set_cvalue_type): Renamed parameter cval_type1 to type
5200         
5201         * ipa-prop.h (struct ipcp_formal): Replaced cvalue with tree called 
5202         constant 
5203
5204         * ipa-prop.c (ipa_methodlist_init): Renamed to ipa_init_func_list
5205         (ipa_methodlist_not_empty): Removed, the sole user now checks directly
5206         (ipa_add_method): Renamed to ipa_push_func_to_list
5207         (ipa_remove_method): Renamed to ipa_pop_func_from_list
5208         (ipa_callsite_param_count): Removed.
5209         (ipa_callsite_param_count_set): Removed.
5210         (ipa_callsite_param): Removed.
5211         (ipa_callsite_callee): Removed.
5212         (ipa_callsite_compute_param): Renamed to ipa_compute_jump_functions
5213         (ipa_callsite_compute_count): Renamed to ipa_count_arguments
5214         (ipa_method_formal_count): Removed.
5215         (ipa_method_formal_count_set): Removed.
5216         (ipa_method_get_tree): Removed.
5217         (ipa_method_tree_map_create): Removed.
5218         (ipa_method_compute_tree_map): Renamed to ipa_create_param_decls_array
5219         (ipa_create_param_decls_array): Creates the array itself
5220         (ipa_create_param_decls_array): Temporary variable info instead of 
5221         a few dereferences.
5222         (ipa_method_formal_compute_count): Renamed to ipa_count_formal_params
5223         (ipa_method_compute_modify): Renamed to ipa_detect_param_modifications
5224         (get_type): Removed.
5225         (ipa_jf_get_info_type): Removed.
5226         (ipa_node_create): Renamed to ipa_create_node_params
5227         (ipa_free): Renamed to ipa_free_all_node_params
5228         (ipa_nodes_create): Renamed to ipa_create_all_node_params
5229         (ipa_edges_create): Renamed to ipa_create_all_edge_args
5230         (ipa_edges_free): Renamed to ipa_free_all_edge_args
5231         (ipa_nodes_free): Integrated into ipa_free_all_node_params and removed
5232         (ipa_free_all_node_params): Deallocation to jump_functions moved to 
5233         ipa_free_all_edge_args
5234         (ipa_method_tree_print): Renamed to ipa_print_all_tree_maps
5235         (ipa_method_modify_print): Renamed to ipa_print_all_params_modified
5236         (ipa_create_methodlist_node): Removed.
5237         (ipa_methodlist_method): Removed.
5238         (ipa_methodlist_method_set): Removed.
5239         (ipa_methodlist_next_method): Removed.
5240         (ipa_methodlist_next_method_set): Removed.
5241         (ipa_method_is_modified): Removed.
5242         (ipa_method_modify_create): Removed.
5243         (ipa_method_modify_init): Temporary variable info instead of a few 
5244         dereferences.
5245         (ipa_detect_param_modifications): Temporary variable info instead of 
5246         a few dereferences.
5247         (ipa_compute_jump_functions): Temporary variable info instead of 
5248         a few dereferences.
5249         (ipa_method_modify_set): Removed.
5250         (ipa_method_tree_map): Renamed to ipa_get_param_decl_index
5251         (ipa_get_param_decl_index): Now accepts struct ipa_node_params rather 
5252         than craph_node as the first parameter.
5253         (ipa_method_modify_stmt): Renamed to ipa_check_stmt_modifications
5254         (ipa_method_modify_init): Removed.
5255         (ipa_compute_jump_functions): Added a temp variable instead of 
5256         repeatadly dereferencing the cgraph_edge.aux pointer
5257         (ipa_callsite_param_set_type): Removed.
5258         (ipa_compute_jump_functions): i renamed to index and moved to 
5259         an inner block
5260         (ipa_callsite_param_set_info_type_formal): Removed.
5261         (ipa_callsite_param_set_info_type): Removed.
5262         (ipa_callsite_param_map_create): Removed.
5263         (ipa_callsite_tree): Removed.
5264         (ipa_callsite_caller): Removed.
5265         (ipa_pop_func_from_list): return_method removed to return_func
5266
5267         * ipa-prop.h (enum cvalue_type): Renamed to ipa_lattice_type,
5268         prefixed all values with IPA_. Changed all users.
5269         (enum jump_func_type): Rnamed UNKNOWN_IPATYPE to IPA_UNKNOWN, 
5270         CONST_IPATYPE to IPA_CONST, CONST_IPATYPE_REF to IPA_CONST_REF 
5271         and FORMAL_IPATYPE IPA_PASS_THROUGH. 
5272         (union parameter_info): Renamed to jump_func_value.
5273         (union jump_func_value): Renamed value to constant
5274         (struct ipa_jump_func): Renamed info_type to value
5275         (struct ipa_node): Renamed to ipa_node_params
5276         (struct ipa_node_params): Renamed ipa_arg_num to param_count
5277         (struct ipa_node_params): Renamed ipa_param_tree to param_decls
5278         (struct ipa_node_params): Renamed ipa_mod to modified_flags
5279         (struct ipa_edge): Renamed to ipa_edge_args
5280         (struct ipa_edge_args): Renamed ipa_param_num to argument_count
5281         (struct ipa_edge_args): Renamed ipa_param_map to jump_functions
5282         (struct ipa_methodlist): Renamed to ipa_func_list
5283         (struct ipa_func_list): method_p renamed to node, next_method
5284         renamed to next
5285         (ipa_methodlist_p): Removed, switched all users to struct pointer
5286         (IS_VALID_TREE_MAP_INDEX): Renamed to IS_VALID_JUMP_FUNC_INDEX
5287
5288 2008-04-30  Alan Modra  <amodra@bigpond.net.au>
5289
5290         * config/rs6000/rs6000.c (ALWAYS_RESTORE_ALTIVEC_BEFORE_POP): Define.
5291         (rs6000_emit_epilogue): Use backchain to restore only when we
5292         have a large frame.  Make use of frame pointer to restore if we
5293         have one.  Handle ALWAYS_RESTORE_ALTIVEC_BEFORE_POP.
5294
5295 2008-04-29  Paolo Bonzini  <bonzini@gnu.org>
5296
5297         * config/avr/avr.md (*sbrx_branch, *sbix_branch, *sbix_branch_tmp):
5298         Add mode to zero_extract.
5299         (sign bit tests peepholes): (Ditto.).
5300
5301 2008-04-29  H.J. Lu  <hongjiu.lu@intel.com>
5302
5303         * config/i386/i386.c (ix86_builtins): Replace Prescott New
5304         Instructions in comments with SSE3.
5305         (ix86_builtin_type): This.  Add FLOAT128_FTYPE_FLOAT128,
5306         INT64_FTYPE_V4SF, INT64_FTYPE_V2DF, INT_FTYPE_V16QI,
5307         INT_FTYPE_V8QI, INT_FTYPE_V4SF, INT_FTYPE_V2DF,
5308         V16QI_FTYPE_V16QI, V8HI_FTYPE_V8HI, V8HI_FTYPE_V16QI,
5309         V8QI_FTYPE_V8QI, V4SI_FTYPE_V4SI, V4SI_FTYPE_V16QI,
5310         V4SI_FTYPE_V4SF, V4SI_FTYPE_V8HI, V4SI_FTYPE_V2DF,
5311         V4HI_FTYPE_V4HI, V4SF_FTYPE_V4SF, V4SF_FTYPE_V4SI,
5312         V4SF_FTYPE_V2DF, V2DI_FTYPE_V2DI, V2DI_FTYPE_V16QI,
5313         V2DI_FTYPE_V8HI, V2DI_FTYPE_V4SI, V2DF_FTYPE_V2DF,
5314         V2DF_FTYPE_V4SI, V2DF_FTYPE_V4SF, V2DF_FTYPE_V2SI,
5315         V2SI_FTYPE_V2SI, V2SI_FTYPE_V4SF, V2SI_FTYPE_V2SF,
5316         V2SI_FTYPE_V2DF, V2SF_FTYPE_V2SF and V2SF_FTYPE_V2SI.
5317         (bdesc_sse_args): Renamed to ...
5318         (bdesc_args): This.  Add IX86_BUILTIN_PF2ID, IX86_BUILTIN_PFRCP,
5319         IX86_BUILTIN_PFRSQRT, IX86_BUILTIN_PI2FD, IX86_BUILTIN_PF2IW,
5320         IX86_BUILTIN_PSWAPDSI, IX86_BUILTIN_PSWAPDSF and
5321         IX86_BUILTIN_FABSQ.
5322         (bdesc_1arg): Moved to ...
5323         (bdesc_args): Here.
5324         (ix86_init_mmx_sse_builtins): Updated.  Replace Prescott New
5325         Instructions in comments with SSE3.
5326         (ix86_expand_sse_operands_builtin): Renamed to ...
5327         (ix86_expand_args_builtin): This.  Updated.
5328         (ix86_expand_unop1_builtin): Update comments.
5329         (ix86_expand_builtin): Updated.
5330
5331 2008-04-29  Richard Guenther  <rguenther@suse.de>
5332
5333         PR tree-optimization/36078
5334         * tree-ssa-loop-ivcanon.c (tree_unroll_loops_completely):
5335         Update virtual SSA form after cleaning up the CFG.
5336
5337 2008-04-29  Richard Guenther  <rguenther@suse.de>
5338
5339         PR middle-end/15255
5340         * fold-const.c (fold_binary): Fold (A + A) * C to A * 2*C.
5341
5342 2008-04-29  Richard Guenther  <rguenther@suse.de>
5343
5344         * tree-ssa-alias.c (finalize_ref_all_pointers): Remove.
5345         (compute_may_aliases): Do not call finalize_ref_all_pointers.
5346         (compute_flow_insensitive_aliasing): Do not treat
5347         PTR_IS_REF_ALL pointers special.
5348         (get_smt_for): Likewise.
5349         (may_alias_p): Re-structure.
5350         (is_escape_site): A ref-all pointer conversion is not an escape site.
5351         * tree-ssa-structalias.c (find_what_p_points_to): Do not treat
5352         PTR_IS_REF_ALL pointers special.
5353         * tree-ssa-structalias.h (struct alias_info): Remove
5354         ref_all_symbol_mem_tag field.
5355         (PTR_IS_REF_ALL): Remove.
5356
5357 2008-04-29  Richard Guenther  <rguenther@suse.de>
5358
5359         PR middle-end/36077
5360         * fold-const.c (extract_muldiv_1): In combining division constants
5361         make sure to never overflow.
5362
5363 2008-04-29  Nick Clifton  <nickc@redhat.com>
5364
5365         * doc/tm.texi (RETURN_ADDR_RTX): Fix typo.
5366
5367 2008-04-28  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
5368
5369         PR bootstrap/35169
5370         * optc-gen.awk: Work around HP-UX/IA awk bug.
5371
5372 2008-04-28  Danny Smith  <dannysmith@users.sourceforge.net>
5373
5374         * config/i386/cygming-crtend.c (register_frame_ctor): Revert my
5375         2008-04-25 commit.
5376
5377 2008-04-28  Uros Bizjak  <ubizjak@gmail.com>
5378
5379         PR target/36073
5380         * config/i386/i386.md
5381         (*float<SSEMODEI24:mode><MODEF:mode>2_mixed_interunit):
5382         Change operand 1 predicate to nonimmediate_operand.
5383
5384 2008-04-28  Jakub Jelinek  <jakub@redhat.com>
5385
5386         PR debug/36060
5387         * dwarf2out.c (struct die_struct): Mark as chain_circular through
5388         die_sub field.
5389         * gengtype.c (walk_type, write_func_for_structure): Handle
5390         chain_circular.
5391         * doc/gty.texi: Document chain_circular.
5392
5393 2008-04-28  Richard Guenther  <rguenther@suse.de>
5394
5395         PR tree-optimization/36066
5396         * tree-vrp.c (execute_vrp): Cleanup the CFG only after finalizing
5397         SCEV and loop.
5398
5399 2008-04-28  Uros Bizjak  <ubizjak@gmail.com>
5400
5401         PR target/36064
5402         * config/i386/i386.md
5403         (floatdi<X87MODEF:mode>2_i387_with_xmm splitters):
5404         Use match_scratch instead of match_operand for operands 3 and 4.
5405
5406 2008-04-27  Richard Guenther  <rguenther@suse.de>
5407
5408         PR tree-optimization/18754
5409         PR tree-optimization/34223
5410         * tree-pass.h (pass_complete_unrolli): Declare.
5411         * tree-ssa-loop-ivcanon.c (try_unroll_loop_completely): Print
5412         loop size before and after unconditionally of UL_NO_GROWTH in effect.
5413         Rewrite loop into loop closed SSA form if it is not already.
5414         (tree_unroll_loops_completely): Re-structure to iterate over
5415         innermost loops with intermediate CFG cleanups.
5416         Unroll outermost loops only if requested or the code does not grow
5417         doing so.
5418         * tree-ssa-loop.c (gate_tree_vectorize): Don't shortcut if no
5419         loops are available.
5420         (tree_vectorize): Instead do so here.
5421         (tree_complete_unroll): Also unroll outermost loops.
5422         (tree_complete_unroll_inner): New function.
5423         (gate_tree_complete_unroll_inner): Likewise.
5424         (pass_complete_unrolli): New pass.
5425         * tree-ssa-loop-manip.c (find_uses_to_rename_use): Only record
5426         uses outside of the loop.
5427         (tree_duplicate_loop_to_header_edge): Only verify loop-closed SSA
5428         form if it is available.  
5429         * tree-flow.h (tree_unroll_loops_completely): Add extra parameter.
5430         * passes.c (init_optimization_passes): Schedule complete inner
5431         loop unrolling pass before the first CCP pass after final inlining.
5432
5433 2008-04-27  Nathan Sidwell  <nathan@codesourcery.com>
5434
5435         * targhooks.h (default_emutls_var_fields,
5436         default_emutls_var_init): Declare.
5437         * tree.h (DECL_THREAD_LOCAL): Compare against TLS_MODEL_REAL.
5438         * target.h (struct gcc_target): Add struct emutls member.
5439         * target-def.h (TARGET_EMUTLS_GET_ADDRESS,
5440         TARGET_EMUTLS_REGISTER_COMMON, TARGET_EMUTLS_VAR_SECTION,
5441         TARGET_EMUTLS_TMPL_SECTION, TARGET_EMUTLS_VAR_PREFIX,
5442         TARGET_EMUTLS_TMPL_PREFIX, TARGET_EMUTLS_VAR_FIELDS,
5443         TARGET_EMUTLS_VAR_INIT, TARGET_EMUTLS_DEBUG_FORM_TLS_ADDRESS,
5444         TARGET_EMUTLS_VAR_ALIGN_FIXED, TARGET_EMUTLS): New.
5445         (TARGET_INITIALIZER): Add TARGET_EMUTLS.
5446         * builtins.def (BUILT_IN_EMUTLS_GET_ADDRESS,
5447         BUILT_IN_EMUTLS_REGISTER_COMMON): Get name from targetm structure.
5448         * dwarf2out.c (loc_descriptor_from_tree_1): Check if emutls can
5449         emit debug information.
5450         * coretypes.h (tls_model): Add TLS_MODEL_EMULATED, TLS_MODEL_REAL.
5451         * varasm.c: Include targhooks.h.
5452         (emutls_object_section, emutls_tmpl_section): New.
5453         (EMUTLS_VAR_PREFIX, EMUTLS_TMPL_PREFIX): Remove.
5454         (EMUTLS_SEPARATOR): New.
5455         (prefix_name): New.
5456         (get_emutls_object_name): New.
5457         (default_emutls_var_fields): New, broken out of ...
5458         (get_emutls_object_type): ... here.  Adjust to use target hooks.
5459         (get_emutls_init_templ_addr): Adjust to use target hooks.
5460         (emutls_decl): Adjust to use target hooks.
5461         (emutls_finish): Likewise.
5462         (default_emutls_var_init): New, broken out of ...
5463         (assemble_variable): ... here.  Adjust to use target hooks.
5464         * output.h (enum section_category): Add SECCAT_EMUTLS_VAR,
5465         SECCAT_EMUTLS_TMPL.
5466         * c-common.c (handle_section_attribute): Prevent overriding
5467         sections for emulated tls with special sections.
5468         * config/i386/i386.c (x86_64_elf_select_section): Add
5469         SECCAT_EMUTLS_VAR and SECCAT_EMUTLS_TMPL.
5470         (x86_64_elf_unique_section): Likewise.
5471         * config/vxworks.c: Include tree.h.
5472         (vxworks_emutls_var_fields, vxworks_emutls_var_init): New.
5473         (vxworks_override_options): Set TLS scheme.
5474         * doc/tm.texi (Emulated TLS): New node.
5475
5476 2008-04-26  Simon Baldwin <simonb@google.com>
5477
5478         PR c/35652
5479         * builtins.c (c_strlen): Suppressed multiple warnings that can occur
5480         with propagated string constants.
5481
5482 2008-04-26  Uros Bizjak  <ubizjak@gmail.com>
5483
5484         * config/i386/i386.md (fix_trunc<mode>_i387_fisttp_with_temp): Use 'X'
5485         constraint for operand 2 when operand 0 is memory operand.
5486         (fix_truncdi_i387_with_temp): : Use 'X' constraint for operand 4 when
5487         operand 0 is memory operand.
5488         (fix_trunc<mode>_i387_with_temp): Ditto.
5489         (*floatsi<mode>2_vector_mixed_with_temp): Use 'X' constraint for
5490         operand 2 when operand 1 is memory operand.
5491         (*float<SSEMODEI24:mode><MODEF:mode>2_mixed_with_temp): Ditto.
5492         (*floatsi<mode>2_vector_sse_with_temp): Ditto.
5493         (*float<SSEMODEI24:mode><MODEF:mode>2_sse_with_temp): Ditto.
5494         (*float<SSEMODEI24:mode><X87MODEF:mode>2_i387_with_temp): Ditto.
5495         (floatdi<X87MODEF:mode>2_i387_with_xmm): Use 'X' constraint for
5496         operands 2,3 and 4 when operand 1 is memory operand.
5497         (fistdi2_with_temp): Use 'X' constraint for operand 2 when operand 0
5498         is memory operand.
5499         (fistdi2_floor_with_temp): Ditto.
5500         (fist<mode>2_floor_with_temp): Ditto.
5501         (fistdi2_ceil_with_temp): Ditto.
5502         (fist<mode>2_ceil_with_temp): Ditto.
5503         (*truncdfsf_fast_mixed): Merge alternatives 0 and 1.
5504
5505 2008-04-26  David Daney  <ddaney@avtrex.com>
5506
5507         * config/mips/mips.md (UNSPEC_COMPARE_AND_SWAP_12): New
5508         unspec_volitile.
5509         (UNSPEC_SYNC_OLD_OP, UNSPEC_SYNC_NEW_OP, UNSPEC_SYNC_EXCHANGE,
5510         UNSPEC_MEMORY_BARRIER, UNSPEC_SET_GOT_VERSION,
5511         UNSPEC_UPDATE_GOT_VERSION): Renumber.
5512         (sync_compare_and_swap<mode>): New expand for QI and HI modes.
5513         (compare_and_swap_12): New insn.
5514         * config/mips/mips-protos.h (mips_expand_compare_and_swap_12): Declare.
5515         * config/mips/mips.c (mips_force_binary): New function.
5516         (mips_emit_int_order_test, mips_expand_synci_loop): Use it.
5517         (mips_expand_compare_and_swap_12): New function.
5518         * config/mips/mips.h (MIPS_COMPARE_AND_SWAP_12): New macro.
5519
5520 2008-04-25  Jan Hubicka  <jh@suse.cz>
5521
5522         PR testsuite/35843
5523         * cfgexpand.c (pass_expand): Turn into RTL pass.
5524         * passes.c (execute_one_pass): Do pass typechecking after execution.
5525         * tree-pass.h (pass_expand): Turn into RTL pass.
5526
5527         * function.h (struct rtl_data): Move here fields
5528         accesses_prior_frames, calls_eh_return, saves_all_registers,
5529         has_nonlocal_goto, has_asm_statement, is_thunk,
5530         all_throwers_are_sibcalls, limit_stack, profile, uses_const_pool,
5531         uses_pic_offset_table, uses_eh_lsda, tail_call_emit,
5532         arg_pointer_save_area_init from struct function; turn into bool.
5533         (struct function): Move
5534         calls_eh_return, saves_all_registers, has_nonlocal_goto,
5535         has_asm_statement, is_thunk, all_throwers_are_sibcalls, limit_stack,
5536         profile, uses_const_pool, uses_pic_offset_table, uses_eh_lsda,
5537         tail_call_emit, arg_pointer_save_area_init
5538         into struct rtl_data.  Remove recursive_call_emit and gimplified flags.
5539         (current_function_returns_struct, current_function_returns_pcc_struct,
5540         current_function_calls_setjmp, current_function_calls_alloca,
5541         current_function_accesses_prior_frames,
5542         current_function_calls_eh_return, current_function_is_thunk,
5543         current_function_stdarg, current_function_profile,
5544         current_function_limit_stack, current_function_uses_pic_offset_table,
5545         current_function_uses_const_pool, current_function_has_nonlocal_label,
5546         current_function_saves_all_registers,
5547         current_function_has_nonlocal_goto,
5548         current_function_has_asm_statement): Remove accesor macros.
5549         * ra-conflict.c (global_conflicts): Update.
5550         * tree-tailcall.c (suitable_for_tail_opt_p): Update.
5551         (suitable_for_tail_call_opt_p): Update.
5552         * builtins.c (expand_builtin_return_addr): Update.
5553         (expand_builtin_setjmp_setup): Update.
5554         (expand_builtin_nonlocal_goto): Update.
5555         * final.c (final_start_function): Update.
5556         (profile_function): Update.
5557         (leaf_function_p): Update.
5558         (only_leaf_regs_used): Update.
5559         * df-scan.c (df_get_exit_block_use_set): Update.
5560         * dojump.c (clear_pending_stack_adjust): Update.
5561         * tree-stdarg.c (gate_optimize_stdarg): Update.
5562         * gimple-low.c (lower_function_body): Update.
5563         * global.c (compute_regsets): Update.
5564         (global_alloc): Update.
5565         * dwarf2out.c (dwarf2out_begin_prologue): Update.
5566         * expr.c (expand_assignment): Update.
5567         * dse.c (dse_step0): Update.
5568         (dse_step1): Update.
5569         * c-decl.c (store_parm_decls): Update.
5570         * local-alloc.c (combine_regs): Update.
5571         (find_free_reg): Update.
5572         * function.c (assign_parms_augmented_arg_list): Update.
5573         (assign_parm_find_data_types): Update.
5574         (assign_parms): Update.
5575         (allocate_struct_function): Update.
5576         (expand_function_start): Update.
5577         (expand_function_end): Update.
5578         (get_arg_pointer_save_area): Update.
5579         (thread_prologue_and_epilogue_insns): Update.
5580         (rest_of_match_asm_constraints): Update.
5581         * stor-layout.c (variable_size): Update.
5582         * gcse.c (gcse_main): Update.
5583         (bypass_jumps): Update.
5584         * gimplify.c (gimplify_function_tree): Update.
5585         * calls.c (emit_call_1): Update.
5586         (expand_call): Update.
5587         * bt-load.c (compute_defs_uses_and_gen): Update.
5588         * except.c (sjlj_assign_call_site_values): Update.
5589         (sjlj_emit_function_enter): Update.
5590         (can_throw_external): Update.
5591         (set_nothrow_function_flags): Update.
5592         (expand_builtin_unwind_init): Update.
5593         (expand_eh_return): Update.
5594         (convert_to_eh_region_ranges): Update.
5595         (output_function_exception_table): Update.
5596         * emit-rtl.c (gen_tmp_stack_mem): Update.
5597         * cfgexpand.c (expand_used_vars): Update.
5598         (tree_expand_cfg): Update.
5599         * cfgcleanup.c (rest_of_handle_jump): Update.
5600         * explow.c (allocate_dynamic_stack_space): Update.
5601         * varasm.c (assemble_start_function): Update.
5602         (force_const_mem): Update.
5603         (mark_constant_pool): Update.
5604         * tree-optimize.c (tree_rest_of_compilation): Update.
5605         * stack-ptr-mod.c (notice_stack_pointer_modification): Update.
5606         * tree-cfg.c (notice_special_calls): Update.
5607         (is_ctrl_altering_stmt): Update.
5608         (tree_can_make_abnormal_goto): Update.
5609         (tree_purge_dead_abnormal_call_edges): Update.
5610         * config/alpha/predicates.md: Update.
5611         * config/alpha/alpha.c (alpha_sa_mask): Update.
5612         (alpha_sa_size): Update.
5613         (alpha_does_function_need_gp): Update.
5614         (alpha_expand_prologue): Update.
5615         (alpha_start_function): Update.
5616         (alpha_output_function_end_prologue): Update.
5617         (alpha_expand_epilogue): Update.
5618         * config/frv/frv.c (frv_stack_info): Update.
5619         (frv_expand_epilogue): Update.
5620         * config/s390/s390.c (s390_regs_ever_clobbered): Update.
5621         (s390_register_info): Update.
5622         (s390_frame_info): Update.
5623         (s390_init_frame_layout): Update.
5624         (s390_can_eliminate): Update.
5625         (save_gprs): Update.
5626         * config/spu/spu.c (spu_split_immediate): Update.
5627         (need_to_save_reg): Update.
5628         (spu_expand_prologue): Update.
5629         (spu_expand_epilogue): Update.
5630         * config/sparc/sparc.md: Update.
5631         * config/sparc/sparc.c (eligible_for_return_delay): Update.
5632         (sparc_tls_got): Update.
5633         (legitimize_pic_address): Update.
5634         (sparc_emit_call_insn): Update.
5635         (sparc_expand_prologue): Update.
5636         (output_return): Update.
5637         (print_operand): Update.
5638         (sparc_function_ok_for_sibcall): Update.
5639         * config/sparc/sparc.h (EXIT_IGNORE_STACK): Update.
5640         * config/m32r/m32r.md: Update.
5641         * config/m32r/m32r.c (MUST_SAVE_RETURN_ADDR): Update.
5642         (m32r_compute_frame_size): Update.
5643         (m32r_expand_prologue): Update.
5644         (m32r_expand_epilogue): Update.
5645         (m32r_legitimize_pic_address): Update.
5646         * config/m32r/m32r.h (FRAME_POINTER_REQUIRED): Update.
5647         * config/i386/linux.h (SUBTARGET_FRAME_POINTER_REQUIRED): Update.
5648         * config/i386/i386.c (ix86_frame_pointer_required): Update.
5649         (gen_push): Update.
5650         (ix86_save_reg): Update.
5651         (ix86_compute_frame_layout): Update.
5652         (ix86_expand_prologue): Update.
5653         (ix86_expand_epilogue): Update.
5654         * config/sh/sh.c (output_stack_adjust): Update.
5655         (calc_live_regs): Update.
5656         (sh5_schedule_saves): Update.
5657         (sh_expand_prologue): Update.
5658         (sh_expand_epilogue): Update.
5659         (sh_setup_incoming_varargs): Update.
5660         (sh_allocate_initial_value): Update.
5661         (sh_get_pr_initial_val): Update.
5662         * config/sh/sh.h (SHMEDIA_REGS_STACK_ADJUST): Update.
5663         * config/sh/sh.md (label:): Update.
5664         * config/avr/avr.c (out_movhi_mr_r): Update.
5665         * config/crx/crx.h (enum): Update.
5666         * config/xtensa/xtensa.h (along): Update.
5667         * config/stormy16/stormy16.c Update.
5668         (xstormy16_compute_stack_layout): Update.
5669         * config/fr30/fr30.c (MUST_SAVE_RETURN_POINTER): Update.
5670         (fr30_expand_prologue): Update.
5671         * config/cris/cris.c (cris_conditional_register_usage): Update.
5672         (cris_reg_saved_in_regsave_area): Update.
5673         (cris_initial_frame_pointer_offset): Update.
5674         (cris_simple_epilogue): Update.
5675         (cris_expand_prologue): Update.
5676         (cris_expand_epilogue): Update.
5677         (cris_expand_pic_call_address): Update.
5678         (cris_asm_output_symbol_ref): Update.
5679         (cris_asm_output_label_ref): Update.
5680         * config/cris/cris.md Update.
5681         * config/iq2000/iq2000.c (compute_frame_size): Update.
5682         (iq2000_expand_epilogue): Update.
5683         * config/mt/mt.h (save_direction): Update.
5684         * config/mn10300/mn10300.c (mn10300_function_value): Update.
5685         * config/ia64/ia64.c (ia64_compute_frame_size): Update.
5686         (ia64_secondary_reload_class): Update.
5687         * config/m68k/m68k.c (m68k_save_reg): Update.
5688         (m68k_expand_prologue): Update.
5689         (m68k_expand_epilogue): Update.
5690         (legitimize_pic_address): Update.
5691         * config/rs6000/rs6000.c (rs6000_got_register): Update.
5692         (first_reg_to_save): Update.
5693         (first_altivec_reg_to_save): Update.
5694         (compute_vrsave_mask): Update.
5695         (compute_save_world_info): Update.
5696         (rs6000_stack_info): Update.
5697         (spe_func_has_64bit_regs_p): Update.
5698         (rs6000_ra_ever_killed): Update.
5699         (rs6000_emit_eh_reg_restore): Update.
5700         (rs6000_emit_allocate_stack): Update.
5701         (rs6000_emit_prologue): Update.
5702         (rs6000_emit_epilogue): Update.
5703         (rs6000_output_function_epilogue): Update.
5704         (output_profile_hook): Update.
5705         (rs6000_elf_declare_function_name): Update.
5706         * config/rs6000/rs6000.h (rs6000_args): Update.
5707         * config/rs6000/rs6000.md: Update.
5708         * config/mcore/mcore.c (mcore_expand_prolog): Update.
5709         * config/arc/arc.c (arc_output_function_epilogue): Update.
5710         * config/arc/arc.h (FRAME_POINTER_REQUIRED): Update.
5711         * config/darwin.c (machopic_function_base_name): Update.
5712         * config/score/score3.c (score3_compute_frame_size): Update.
5713         (rpush): Update.
5714         (rpop): Update.
5715         (score3_epilogue): Update.
5716         * config/score/score7.c (score7_compute_frame_size): Update.
5717         (score7_prologue): Update.
5718         (score7_epilogue): Update.
5719         * config/score/score.h (FRAME_POINTER_REQUIRED): Update.
5720         * config/arm/linux-elf.h (SUBTARGET_FRAME_POINTER_REQUIRED): Update.
5721         * config/arm/arm.c (use_return_insn): Update.
5722         (require_pic_register): Update.
5723         (arm_load_pic_register): Update.
5724         (arm_compute_save_reg0_reg12_mask): Update.
5725         (arm_compute_save_reg_mask): Update.
5726         (thumb1_compute_save_reg_mask): Update.
5727         (output_return_instruction): Update.
5728         (arm_output_function_prologue): Update.
5729         (arm_output_epilogue): Update.
5730         (arm_get_frame_offsets): Update.
5731         (arm_expand_prologue): Update.
5732         (thumb_pushpop): Update.
5733         (thumb_exit): Update.
5734         (thumb1_expand_prologue): Update.
5735         (thumb1_expand_epilogue): Update.
5736         (arm_unwind_emit): Update.
5737         (arm_output_fn_unwind): Update.
5738         * config/arm/arm.h (FRAME_POINTER_REQUIRED): Update.
5739         * config/arm/arm.md: Update.
5740         * config/pa/pa.md: Update.
5741         * config/pa/pa.c (legitimize_pic_address): Update.
5742         (compute_frame_size): Update.
5743         (hppa_expand_prologue): Update.
5744         (hppa_expand_epilogue): Update.
5745         (borx_reg_operand): Update.
5746         * config/pa/pa.h (FRAME_POINTER_REQUIRED): Update.
5747         (HARD_REGNO_RENAME_OK): Update.
5748         * config/mips/mips.c (mips_global_pointer): Update.
5749         (mips_save_reg_p): Update.
5750         (mips_compute_frame_info): Update.
5751         (mips_frame_pointer_required): Update.
5752         (mips_expand_prologue): Update.
5753         (mips_expand_epilogue): Update.
5754         (mips_can_use_return_insn): Update.
5755         (mips_reorg_process_insns): Update.
5756         * config/v850/v850.c (compute_register_save_size): Update.
5757         * config/mmix/mmix.h (FRAME_POINTER_REQUIRED): Update.
5758         * config/mmix/mmix.c (along): Update.
5759         (mmix_expand_epilogue): Update.
5760         * config/bfin/bfin.c (legitimize_pic_address): Update.
5761         (must_save_p): Update.
5762         (stack_frame_needed_p): Update.
5763         (add_to_reg): Update.
5764         (bfin_expand_prologue): Update.
5765         * stmt.c (expand_asm_operands): Update.
5766         * reload1.c (reload): Update.
5767         (init_elim_table): Update.
5768
5769 2008-04-25  Bob Wilson  <bob.wilson@acm.org>
5770         
5771         * optabs.c (expand_float): Fix REG_EQUAL for UNSIGNED_FLOAT libcall.
5772         
5773 2008-04-25  H.J. Lu  <hongjiu.lu@intel.com>
5774
5775         * config/i386/sse.md (mov<mode>): Replace SSEMODEI with SSEMODE.
5776         (*mov<mode>_internal): Likewise.  Support V4SF and V2DF.
5777         (mov<mode>): Removed.
5778         (*movv4sf_internal): Likewise.
5779         (*movv2df_internal): Likewise.
5780
5781 2008-04-25  Pompapathi V Gadad <Pompapathi.V.Gadad@nsc.com>
5782
5783         * config.gcc (crx-*-elf): Remove deprecation.
5784
5785 2008-04-25  Danny Smith  <dannysmith@users.sourceforge.net>
5786
5787         * config/i386/cygming-crtend.c (register_frame_ctor): Register
5788         __gcc_deregister_frame with atexit.
5789         (deregister_frame_dtor): Remove.
5790
5791 2008-04-24  Nathan Froyd  <froydnj@codesourcery.com>
5792             Nathan Sidwell  <nathan@codesourcery.com>
5793
5794         * config/rs6000/rs6000.opt (mspe): Remove Var property.
5795         (misel): Likewise.
5796         * config/rs6000/rs6000.h (rs6000_spe): Declare.
5797         (rs6000_isel): Likewise.
5798         * config/rs6000/rs6000.c (rs6000_spe): New variable.
5799         (rs6000_isel): New variable.
5800         (rs6000_handle_option): Handle OPT_mspe and OPT_misel.
5801
5802 2008-04-24  Jakub Jelinek  <jakub@redhat.com>
5803
5804         PR c++/35758
5805         * c-common.c (handle_vector_size_attribute): Call
5806         lang_hooks.types.reconstruct_complex_type instead of
5807         reconstruct_complex_type.
5808         * config/rs6000/rs6000.c (rs6000_handle_altivec_attribute): Likewise.
5809         * config/spu/spu.c (spu_handle_vector_attribute): Likewise.
5810         * langhooks.h (struct lang_hooks_for_types): Add
5811         reconstruct_complex_type hook.
5812         * langhooks-def.h (LANG_HOOKS_RECONSTRUCT_COMPLEX_TYPE): Define.
5813         (LANG_HOOKS_FOR_TYPES_INITIALIZER): Add it.
5814
5815 2008-04-24  Richard Guenther  <rguenther@suse.de>
5816
5817         * c-common.h (check_builtin_function_arguments): Declare.
5818         * c-common.c (validate_nargs): New function.
5819         (check_builtin_function_arguments): Likewise.
5820         * c-typeck.c (build_function_call): Call
5821         check_builtin_function_arguments.
5822         * builtins.c (fold_builtin_classify): Remove error reporting code.
5823         (fold_builtin_unordered_cmp): Likewise.
5824         (fold_builtin_1): Likewise.
5825         (fold_builtin_n): Likewise.
5826
5827 2008-04-24  Jakub Jelinek  <jakub@redhat.com>
5828
5829         PR tree-optimization/36008
5830         * fold-const.c (try_move_mult_to_index): If s == NULL, divide
5831         the original op1, rather than delta by step.
5832
5833 2008-04-22  Antoniu Pop  <antoniu.pop@gmail.com>
5834             Sebastian Pop  <sebastian.pop@amd.com>
5835
5836         * tree-parloops.c (take_address_of, eliminate_local_variables_1,
5837         eliminate_local_variables_stmt, eliminate_local_variables,
5838         separate_decls_in_loop_name, separate_decls_in_loop_stmt,
5839         separate_decls_in_loop, gen_parallel_loop): Make them work on a region
5840         of code delimited by two edges in the CFG.
5841         (separate_decls_in_loop_name): Renamed separate_decls_in_region_name.
5842         (separate_decls_in_loop_stmt): Renamed separate_decls_in_region_stmt.
5843         (separate_decls_in_loop): Renamed separate_decls_in_region.  Isolate 
5844         the case of parallelisation of reductions.
5845         (expr_invariant_in_region_p): New.
5846
5847         * tree-flow.h (gather_blocks_in_sese_region): Declared.
5848         * tree-cfg.c (gather_blocks_in_sese_region): Extern.
5849
5850 2008-04-24  Ira Rosen  <irar@il.ibm.com>
5851             Richard Guenther  <rguenther@suse.de>
5852
5853         PR tree-optimization/36034
5854         * tree-vect-analyze.c (vect_analyze_group_access): SLP is
5855         incapable of dealing with loads with gaps.
5856
5857 2008-04-24  Rafael Espindola  <espindola@google.com>
5858
5859         * tree-flow.h (vrp_evaluate_conditional): Change signature.
5860         * tree-ssa-propagate.c (fold_predicate_in): Update call to
5861         vrp_evaluate_conditional.
5862         * tree-vrp.c (vrp_evaluate_conditional_warnv): Remove.
5863         (vrp_evaluate_conditional): Split the cond argument.
5864         (vrp_visit_cond_stmt): Use vrp_evaluate_conditional_warnv_with_ops.
5865         (simplify_stmt_for_jump_threading): Update call to
5866         vrp_evaluate_conditional.
5867
5868 2008-04-24  Ira Rosen  <irar@il.ibm.com>
5869
5870         PR tree-optimization/35982
5871         * tree-vect-analyze.c (vect_check_interleaving): Check that the
5872         interleaved data-refs are of the same type.
5873
5874 2008-04-24  Danny Smith  <dannysmith@users.net>
5875
5876         * c-format.c (check_format_info_main): Use strncmp rather than a
5877         magic prefix to handle multichar length specs.
5878         * config/i386/msformat-c.c (format_length_info ms_printf_length_specs):
5879         Don't prefix "I64" and "I32" with '\0'.
5880
5881 2008-04-24  Jakub Jelinek  <jakub@redhat.com>
5882
5883         PR target/36015
5884         * config/i386/i386.c (init_cumulative_args): Don't pass anything
5885         in registers for -m32 only if stdarg_p (fntype).
5886
5887 2008-04-24  Uros Bizjak  <ubizjak@gmail.com>
5888
5889         PR rtl-optimization/36006
5890         * expmed.c (store_fixed_bit_field): Copy op0 rtx before moving
5891         temp to op0 in order to avoid invalid rtx sharing.
5892
5893 2008-04-23  Paolo Bonzini  <bonzini@gnu.org>
5894
5895         * tree-cfg.c (verify_expr): Check with is_gimple_address.  Don't
5896         check TREE_INVARIANT.
5897         * tree-gimple.c (is_gimple_address): New.
5898         (is_gimple_invariant_address): Simplify using decl_address_invariant_p.
5899         * tree-gimple.h (is_gimple_address): New.
5900         * tree.h (decl_address_invariant_p): New.
5901         * tree.c (make_node_stat): Don't set TREE_INVARIANT.
5902         (build_string): Likewise.
5903         (decl_address_invariant_p): New, from is_gimple_invariant_address.
5904         (tree_invariant_p_1): Likewise.
5905         (save_expr): Use it.
5906         (tree_invariant_p): New.
5907         (skip_simple_arithmetic): Use it.
5908         (stabilize_reference_1): Use it.
5909         (recompute_tree_invariant_for_addr_expr): Don't update TREE_INVARIANT,
5910         simplify.
5911         (build1_stat): Drop code to compute TREE_INVARIANT.
5912         (build2_stat): Drop code to compute TREE_INVARIANT.
5913         (build3_stat): Drop code to compute TREE_INVARIANT.
5914         (build4_stat): Drop code to compute TREE_INVARIANT.
5915         (build5_stat): Drop code to compute TREE_INVARIANT.
5916         (build7_stat): Drop code to compute TREE_INVARIANT.
5917         (merge_dllimport_decl_attributes): Don't mention TREE_INVARIANT.
5918         * tree.h (struct tree_base): Remove invariant_flag.
5919         (TREE_INVARIANT): Remove.
5920         * builtins.c (build_string_literal): Don't set TREE_INVARIANT.
5921         (fold_builtin_expect): Check TREE_CONSTANT.
5922         * tree-ssa-ccp.c (fold_stmt_r): Adjust comment.
5923         * c-tree.h (c_expr_to_decl): Drop third parameter.
5924         * c-typeck.c (build_external_ref): Don't set TREE_INVARIANT.
5925         (build_c_cast): Don't set TREE_INVARIANT.
5926         (pop_init_level): Don't set TREE_INVARIANT.
5927         (c_objc_common_truthvalue_conversion): Don't set TREE_INVARIANT.
5928         * gimplify.c (gimplify_init_ctor_preeval): Add assertion, test
5929         TREE_CONSTANT.
5930         (gimplify_init_constructor): Don't set TREE_INVARIANT.
5931         (gimplify_addr_expr): Adjust comment.
5932         * tree-mudflap.c (mf_build_string):
5933         * print-tree.c (print_node): Don't print TREE_INVARIANT.
5934         * tree-nested.c (convert_nonlocal_reference): Adjust comment.
5935         * c-common.c (fix_string_type): Don't set TREE_INVARIANT.
5936         * langhooks-def.h (lhd_expr_to_decl): Drop third parameter.
5937         * langhooks.c (lhd_expr_to_decl): Drop third parameter.
5938         * langhooks.h (struct lang_hooks): Drop third parameter from
5939         expr_to_decl.
5940
5941 2008-04-23  Richard Guenther  <rguenther@suse.de>
5942
5943         PR tree-optimization/27799
5944         PR tree-optimization/32921
5945         PR tree-optimization/32624
5946         * tree-ssa-structalias.c (merge_smts_into): Only merge the
5947         SMTs aliases and the tag itself into the solution.
5948         * tree-ssa-alias.c (compute_flow_sensitive_aliasing): Do not
5949         merge the points-to solution back into the SMT aliases.
5950         (may_alias_p): Use alias_set_subset_of instead of
5951         aliases_conflict_p.  A pointer which points to
5952         memory with alias set zero may access any variable.
5953
5954 2008-04-23  Richard Guenther  <rguenther@suse.de>
5955
5956         * alias.c (alias_set_subset_of): Correctly handle asking
5957         if zero is a subset of an alias set with zero child.
5958         * tree-ssa-alias.c (have_common_aliases_p): Simplify logic.
5959         (compute_flow_insensitive_aliasing): Correctly walk all
5960         pointers.  Do not unnecessarily union sets.
5961
5962 2008-04-23  Richard Guenther  <rguenther@suse.de>
5963
5964         PR middle-end/36021
5965         * c-common.c (handle_alloc_size_attribute): Use type_num_arguments.
5966
5967 2008-04-22  Tomas Bily  <tbily@suse.cz>
5968
5969         * tree-cfg.c (verify_expr): Check for NON_LVALUE_EXPR as
5970         unreachable case.
5971         * tree-vrp.c (extract_range_from_unary_expr): Removed unused
5972         NON_LVALUE_EXPR.
5973         * tree-ssa-threadedge.c (simplify_control_stmt_condition): Likewise.
5974         * tree-ssa-structalias.c (get_constraint_for): Likewise.
5975         * tree-inline.c (estimate_num_insns_1): Likewise.
5976         * varasm.c (const_hash_1, compare_constant, copy_constant)
5977         (compute_reloc_for_constant, output_addressed_constants): Likewise.
5978         * emit-rtl.c (component_ref_for_mem_expr)
5979         (set_mem_attributes_minus_bitpos): Likewise.
5980         * expr.c (highest_pow2_factor, expand_expr_real_1, )
5981         (is_aligning_offset): Likewise.
5982         * dwarf2out.c (loc_descriptor_from_tree_1, add_bound_info): Likewise.
5983         * tree-ssa-loop-ivopts.c (may_be_nonaddressable_p): Likewise.
5984         * dojump.c (do_jump): Likewise.
5985         * builtins.c (get_pointer_alignment, get_memory_rtx)
5986         (integer_valued_real_p, fold_builtin_next_arg): Likewise.
5987         * tree-scalar-evolution.c (instantiate_parameters_1): Likewise.
5988
5989 2008-04-23  Jakub Jelinek  <jakub@redhat.com>
5990
5991         PR rtl-optimization/36017
5992         * builtins.c (expand_errno_check): Clear CALL_EXPR_TAILCALL before
5993         expanding the library call.
5994
5995 2008-04-22  Ian Lance Taylor  <iant@google.com>
5996
5997         * fold-const.c (pointer_may_wrap_p): Call int_size_in_bytes rather
5998         than size_in_bytes.
5999
6000 2008-04-22  Pat Haugen  <pthaugen@us.ibm.com>
6001
6002         * config/rs6000/rs6000.c (rs6000_register_move_cost): Increase cost
6003         of LR/CTR moves for Power6.
6004
6005 2008-04-22  Kenneth Zadeck  <zadeck@naturalbridge.com>
6006
6007         PR middle-end/36003
6008         * passes.c (init_optimization_passes): Remove
6009         pass_fast_rtl_byte_dce.
6010         
6011 2008-04-22  Uros Bizjak  <ubizjak@gmail.com>
6012
6013         PR target/29096
6014         * config/i386/xmmintrin.h (_mm_cvtpi16_ps): Rearrange calls to
6015         builtin functions to generate faster code.
6016         (_mm_cvtpu16_ps): Ditto.
6017         (_mm_cvtpi32x2_ps): Ditto.
6018
6019 2008-04-22  Nick Clifton  <nickc@redhat.com>
6020
6021         * common.opt (ftree-loop-distribution): Add Optimization
6022         attribute.
6023
6024         * config/frv/frv.c (frv_stack_info): Use crtl instead of cfun.
6025         (frv_expand_builtin_va_start): Likewise.
6026
6027         * config/arm/arm.c (thumb_find_work_register): Fix location of
6028         argument register count.
6029
6030 2008-04-22  Maxim Kuvyrkov  <maxim@codesourcery.com>
6031
6032         Support scheduling for ColdFire V1 and V3 microarchitecture.
6033         Improve scheduling of multiplication instructions.
6034
6035         * config/m68k/m68k.md (cpu): Add cfv1 and cfv3.  Rename cf_v2 to cfv1.
6036         (mac): New instruction attribute.
6037         * config/m68k/m68k.c (override_options): Handle cfv1, cfv3 and mac.
6038         (m68k_sched_mac): New variable.
6039         (m68k_sched_attr_type2, m68k_sched_md_init_global): Update.
6040         Handle cfv1 and cfv3.
6041         (max_insn_size): New static variable.
6042         (struct _sched_ib): New type.
6043         (sched_ib): New static variable.
6044         (sched_ib_size, sched_ib_filled, sched_ib_insn): Convert variables
6045         to fields of 'struct _sched_ib sched_ib'.  Update all uses.
6046         (m68k_sched_variable_issue): Add modeling of cfv3 instruction buffer.
6047         Update.
6048         (m68k_sched_md_init_global, m68k_sched_md_finish_global,
6049         m68k_sched_md_init, m68k_sched_md_finish): Handle cfv1 and cfv3.  Init
6050         new variables.  Update.
6051         (m68k_sched_dfa_pre_advance_cycle, m68k_sched_dfa_post_advance_cycle):
6052         Add modeling of cfv3 instruction buffer.  Update.
6053         * config/m68k/m68k-protos.h (m68k_sched_mac): Declare.
6054         * config/m68k/m68k.h (TUNE_CFV3): New macro.
6055         * config/m68k/cf.md: Change substrings 'cf_v2' to 'cfv12' or 'cfv123'.
6056         (cf_* reservations): Rename to cfv12 or cfv123 to indicate cores
6057         a particular reservation applies to.
6058         (type2): Reorganize attribute values.  Rename alu to alu_reg,
6059         alu_l to alu, move_l to omove.  Join move to alu.  Split mul
6060         to mul_l and mul_w.
6061         (cf_ib_*): Simplify description of instruction buffer.
6062         (cf_ib_w0, cf_ib_w4, cf_ib_w5, cf_ib_w6): Remove.
6063         (cf_mem): Split into cf_mem1 and cf_mem2.
6064         (cf_v2_move_??): Rename to cfv12_alu_??.
6065         (cf_v2_move_l_??): Rename to cfv12_omove_??.
6066         (cf_v2_mul_??): Remove reservations.
6067         (cfv12_mul_l_??, cfv12_mul_w_??, cfv12_mac_w_??, cfv12_mac_l_??,
6068         cfv12_emac_??, cfv12_emac_w_i0): New reservations.
6069         (cfv12_rts, cfv12_call, cfv12_bcc, cfv12_bra, cfv12_jmp): Move to
6070         appropriate place.
6071         (cfv3_alu_10, cfv3_omove_10, cfv3_alu_i0, cfv3_omove_i0, cfv3_alu_01,
6072         cfv3_alu_0i, cfv3_alu_11, cfv3_omove_11, cfv3_alu_i1, cfv3_omove_i1,
6073         cfv3_alu_1i, cfv3_omove_1i, cfv3_pea_11, cfv3_pea_i1, cfv3_mul_w_10,
6074         cfv3_mul_l_10, cfv3_mul_w_i0, cfv3_mac_w_10, cfv3_mac_l_10,
6075         cfv3_mac_w_i0, cfv3_emac_10, cfv3_emac_w_i0, cfv3_rts, cfv3_call,
6076         cfv3_bcc, cfv3_bra, cfv3_jmp): New reservations.
6077         (cfv3_*_1, cfv3_*_2, cfv3_*_3): New instruction reservations that are
6078         expansions of the above reservations for instructions of sizes
6079         1, 2 and 3 words.
6080
6081 2008-04-22  Maxim Kuvyrkov  <maxim@codesourcery.com>
6082
6083         * rtl-factoring.c (collect_patterns_seqs): Handle CC0 targets.
6084
6085 2008-04-21  Adam Nemet  <anemet@caviumnetworks.com>
6086
6087         * coverage.c: Include tree-pass.h.
6088         (coverage_counter_alloc): Print da_file_name to the dump file.
6089
6090 2008-04-21  Kenneth Zadeck  <zadeck@naturalbridge.com>
6091
6092         * sbitmap.c (sbitmap_range_empty_p): New function.
6093         * sbitmap.h (sbitmap_range_empty_p): New function.
6094         * bitmap.h: Now includes obstack.h.
6095
6096 2008-04-21  Richard Sandiford  <rsandifo@nildram.co.uk>
6097             Kenneth Zadeck  <zadeck@naturalbridge.com>
6098
6099         * dbgcnt.def (ra_byte_scan): Added.
6100         * dbgcnt.c (dbg_cnt): Added code to print message to dump_file
6101         when the last hit happens for a counter.  
6102         * timevar.def (TV_DF_BYTE_LR): New variable.
6103         * tree-pass.h (pass_fast_rtl_byte_dce): New pass.
6104         * passes.c (pass_fast_rtl_byte_dce): New pass.
6105         * fwprop.c (update_df): Added mode to call df_ref_create.
6106         Renamed DF_REF_WIDTH and DF_REF_OFFSET to DF_REF_EXTRACT_WIDTH and
6107         DF_REF_EXTRACT_OFFSET.
6108         * df.h (DF_BYTE_LR, DF_BYTE_LR_BB_INFO, DF_BYTE_LR_IN, 
6109         DF_BYTE_LR_OUT, df_byte_lr): New macro.
6110         (df_mm): New enum.
6111         (df_ref_extract): Added mode field.
6112         (DF_REF_WIDTH, DF_REF_OFFSET) Renamed to DF_REF_EXTRACT_WIDTH and
6113         DF_REF_EXTRACT_OFFSET.
6114         (DF_REF_EXTRACT_MODE): New macro.
6115         (df_byte_lr_bb_info): New structure.
6116         (df_print_byte_regset, df_compute_accessed_bytes, 
6117         df_byte_lr_add_problem, df_byte_lr_get_regno_start,
6118         df_byte_lr_get_regno_len, df_byte_lr_simulate_defs,
6119         df_byte_lr_simulate_uses,
6120         df_byte_lr_simulate_artificial_refs_at_top,
6121         df_byte_lr_simulate_artificial_refs_at_end,
6122         df_compute_accessed_bytes): New function.
6123         (df_ref_create): Add parameter.
6124         (df_byte_lr_get_bb_info): New inline function.
6125         * df-scan.c (df_ref_record, df_uses_record,
6126         df_ref_create_structure): Added mode parameter.
6127         (df_ref_create, df_notes_rescan, df_ref_record, df_def_record_1, 
6128         df_defs_record, df_uses_record, df_get_conditional_uses,
6129         df_get_call_refs, df_insn_refs_collect, df_bb_refs_collect, 
6130         df_entry_block_defs_collect, df_exit_block_uses_collect):
6131         Added mode parameter to calls to df_ref_record, df_uses_record,
6132         df_ref_create_structure.
6133         (df_ref_equal_p, df_ref_compare): Added test for modes.
6134         (df_ref_create_structure): Added code to set mode.  Renamed
6135         DF_REF_WIDTH and DF_REF_OFFSET to DF_REF_EXTRACT_WIDTH and
6136         DF_REF_EXTRACT_OFFSET.
6137         * df-core.c (df_print_byte_regset): New function.
6138         * df-byte-scan.c: New file.
6139         * df-problems.c (df_rd_transfer_function): Removed unnecessary
6140         calls to BITMAP_FREE.  
6141         (df_byte_lr_problem_data, df_problem problem_BYTE_LR): New structure.
6142         (df_byte_lr_get_regno_start, df_byte_lr_get_regno_len,
6143         df_byte_lr_set_bb_info, df_byte_lr_free_bb_info, 
6144         df_byte_lr_check_regs, df_byte_lr_expand_bitmap, 
6145         df_byte_lr_alloc, df_byte_lr_reset, df_byte_lr_bb_local_compute,
6146         df_byte_lr_local_compute, df_byte_lr_init,
6147         df_byte_lr_confluence_0, df_byte_lr_confluence_n, 
6148         df_byte_lr_transfer_function, df_byte_lr_free, 
6149         df_byte_lr_top_dump, df_byte_lr_bottom_dump,
6150         df_byte_lr_add_problem, df_byte_lr_simulate_defs, 
6151         df_byte_lr_simulate_uses,
6152         df_byte_lr_simulate_artificial_refs_at_top,
6153         df_byte_lr_simulate_artificial_refs_at_end): New function.
6154         * dce.c (byte_dce_process_block): New function.
6155         (dce_process_block): au is now passed in rather than computed
6156         locally.  Changed loops that look at artificial defs to not look
6157         for conditional or partial ones, because there never are any.  
6158         (fast_dce): Now is able to drive byte_dce_process_block or 
6159         dce_process_block depending on the kind of dce being done.
6160         (rest_of_handle_fast_dce): Add parameter to fast_dce.
6161         (rest_of_handle_fast_byte_dce): New function.
6162         (rtl_opt_pass pass_fast_rtl_byte_dce): New pass.
6163         * Makefile.in (df-byte-scan.o, debugcnt.o): Added dependencies.
6164
6165 2008-04-21  Daniel Franke  <franke.daniel@gmail.com>
6166
6167         PR fortran/35019
6168         * gcc.h: Added fortran options that take arguments to
6169         DEFAULT_SWITCH_TAKES_ARG and DEFAULT_WORD_SWITCH_TAKES_ARG
6170         macros.
6171
6172 2008-04-20  Eric Botcazou  <ebotcazou@adacore.com>
6173
6174         * tree-sra.c (sra_walk_expr) <VIEW_CONVERT_EXPR>: Disable
6175         scalarization if on the LHS and not a full access.
6176
6177 2008-04-20  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
6178
6179         * Makefile.in (s-gtyp-input): Remove tmp-gi.list before writing it.
6180
6181 2008-04-18  Rafael Espindola  <espindola@google.com>
6182
6183         * tree-vrp.c (find_case_label_index): Fix the binary search.
6184         (find_case_label_range): New.
6185         (vrp_visit_switch_stmt): Use find_case_label_range.
6186         (simplify_switch_using_ranges): Use find_case_label_range.
6187
6188 2008-04-18  Eric Botcazou  <ebotcazou@adacore.com>
6189
6190         * gimplify.c (gimplify_modify_expr_rhs) <COND_EXPR>: Gimplify the LHS
6191         using the is_gimple_lvalue predicate instead of is_gimple_min_lval.
6192
6193 2008-04-18  Tom Tromey  <tromey@redhat.com>
6194
6195         PR libcpp/15500:
6196         * doc/cpp.texi (Implementation-defined behavior): Mention
6197         -finput-charset.
6198
6199 2008-04-18  Ian Lance Taylor  <iant@google.com>
6200
6201         * fold-const.c (pointer_may_wrap_p): New static function.
6202         (fold_comparison): Add another test for pointer overflow.  Use
6203         pointer_may_wrap_p to disable some false positives.
6204
6205 2008-04-18  Kris Van Hees <kris.van.hees@oracle.com>
6206           
6207         * c-common.c (CHAR16_TYPE, CHAR32_TYPE): New macros.
6208         (fname_as_string): Match updated cpp_interpret_string prototype.
6209         (fix_string_type): Support char16_t* and char32_t*.
6210         (c_common_nodes_and_builtins): Add char16_t and char32_t (and
6211         derivative) nodes.  Register as builtin if C++0x.
6212         (c_parse_error): Support CPP_CHAR{16,32}.
6213         * c-common.h (RID_CHAR16, RID_CHAR32): New elements. 
6214         (enum c_tree_index) <CTI_CHAR16_TYPE, CTI_SIGNED_CHAR16_TYPE,
6215         CTI_UNSIGNED_CHAR16_TYPE, CTI_CHAR32_TYPE, CTI_SIGNED_CHAR32_TYPE,
6216         CTI_UNSIGNED_CHAR32_TYPE, CTI_CHAR16_ARRAY_TYPE,
6217         CTI_CHAR32_ARRAY_TYPE>: New elements.
6218         (char16_type_node, signed_char16_type_node, unsigned_char16_type_node,
6219         char32_type_node, signed_char32_type_node, char16_array_type_node,
6220         char32_array_type_node): New defines.
6221         * c-lex.c (cb_ident): Match updated cpp_interpret_string prototype.
6222         (c_lex_with_flags): Support CPP_CHAR{16,32} and CPP_STRING{16,32}.
6223         (lex_string): Support CPP_STRING{16,32}, match updated
6224         cpp_interpret_string and cpp_interpret_string_notranslate prototypes.
6225         (lex_charconst): Support CPP_CHAR{16,32}.
6226         * c-parser.c (c_parser_postfix_expression): Support CPP_CHAR{16,32}
6227         and CPP_STRING{16,32}.
6228
6229 2008-04-18  Paolo Bonzini  <bonzini@gnu.org>
6230
6231         PR bootstrap/35457
6232         * aclocal.m4: Regenerate.
6233         * configure: Regenerate.
6234
6235 2008-04-18  Jan Hubicka  <jh@suse.cz>
6236
6237         * except.c (dw2_size_of_call_site_table,
6238         sjlj_size_of_call_site_table): Use vector API for call_site_record.
6239
6240         * cgraphbuild.c (build_cgraph_edges): Update.
6241         * tree-pass.h: Update comment.
6242         * final.c (leaf_function_p): Update.
6243         (leaf_renumber_regs): Update.
6244         (rest_of_clean_state): Update.
6245         * omp-low.c (expand_omp_parallel): Update.
6246         * ipa-reference.c (analyze_function): Update.
6247         * reorg.c (find_end_label): Update.
6248         (optimize_skip): Update.
6249         (fill_simple_delay_slots): Update.
6250         (fill_simple_delay_slots): Update.
6251         (make_return_insns): Update.
6252         (dbr_schedule): Update.
6253         * gimple-low.c (record_vars_into): Update.
6254         * cfgbuild.c (make_edges): Update.
6255         * function.c (assign_stack_local): Update.
6256         (assign_parm_adjust_stack_rtl): Update.
6257         (locate_and_pad_parm): Update.
6258         (allocate_struct_function): Do not initialize stack_alignment_needed
6259         and preferred_stack_boundary here.
6260         (stack_protect_prologue): Update.
6261         (stack_protect_epilogue): Update.
6262         (expand_function_start): Initialize stack_alignment_needed,
6263         preferred_stack_boundary and max_jumptable_ents.
6264         (expand_function_end): Update.
6265         (free_after_compilation): Do not NULLify epilogue_delay_list.
6266         * function.h (struct rtl_data): Add stack_protect_guard,
6267         stack_alignment_needed,
6268         preferred_stack_boundary, epilogue_delay_list.
6269         (struct function): Remove value_histograms, stack_alignment_needed,
6270         preferred_stack_boundary, epilogue_delay_list, max_jumptable_ents,
6271         last_label_uid,
6272         unexpanded_var_list, stack_protect_guard.
6273         (current_function_epilogue_delay_list): Remove.
6274         * ipa-type-escape.c (analyze_function): Update.
6275         * gimplify.c (pop_gimplify_context): Update comment.
6276         * calls.c (expand_call): Update.
6277         (emit_library_call_value_1): Update.
6278         * except.c (set_nothrow_function_flags): Update.
6279         * cfgexpand.c (get_decl_align_unit): Update.
6280         (create_stack_guard): Update.
6281         (estimated_stack_frame_size): Update.
6282         (expand_used_vars): Update.
6283         (tree_expand_cfg): Free histogram earliers, init expansion variables.
6284         * explow.c (allocate_dynamic_stack_space): Update.
6285         * tree-ssa-live.c (remove_unused_locals): Update.
6286         * varasm.c (mark_constant_pool): Update.
6287         * tree-inline.c (remap_decls): Update.
6288         (initialize_cfun): Update.
6289         (declare_return_variable): Update.
6290         (inline_forbidden_p): Update.
6291         (expand_call_inline): Update.
6292         (declare_inline_vars): Update.
6293         (tree_function_versioning): Update.
6294         * tree-flow.h (value_histograms): New.
6295         (VALUE_HISTOGRAMS): New macro.
6296         * basic-block.h (control_flow_graph): Add max_jumptable_ents,
6297         last_label_uid.
6298         * tree-cfg.c (set_bb_for_stmt): Update.
6299         (replace_by_duplicate_decl): Update.
6300         (move_block_to_fn): Update.
6301         (new_label_mapper): Update.
6302         (dump_function_to_file): Update.
6303         * ipa-struct-reorg.c (build_data_structure): Update.
6304         * cfgrtl.c (print_rtl_with_bb): Update.
6305         * reload1.c (reload): Update.
6306         (reload): Update.
6307         * config/i386/i386.c (setup_incoming_varargs_64,
6308         ix86_compute_frame_layout): Update.
6309         * config/arc/arc.c (arc_output_function_epilogue): Update.
6310
6311 2008-04-18  Marius Strobl <marius@FreeBSD.org>
6312
6313         * gthr-posix.h (__gthread_active_p): Use the Solaris implementation
6314         for FreeBSD as well.
6315         * gthr-posix95.h: Likewise.
6316
6317 2008-04-17  Richard Sandiford  <rsandifo@nildram.co.uk>
6318
6319         PR rtl-optimization/35838
6320         * dse.c (find_shift_sequence): Use subreg_lowpart_offset to work
6321         out the byte offset of the first subreg.
6322
6323 2008-04-17  Uros Bizjak  <ubizjak@gmail.com>
6324
6325         * config/i386/i386.md (addti3 splitter): Pass arrays of 3 operands
6326         to split_ti instead of three separate calls with single member arrays.
6327         (subti3 splitter): Ditto.
6328         (adddi3 splitter): Ditto with split_di.
6329         (subdi3 splitter): Ditto.
6330         (negti2 splitter): Pass arrays of 2 operands to split_ti instead of
6331         two separate calls with single member arrays.  Swap match_dup
6332         operands 1 and 2 to better fit into the array.
6333         (negdi2 splitter): Ditto with split_di.
6334         (movdfcc splitter):  Pass arrays of 2 operands to split_di instead of
6335         two separate calls with single member arrays.  Swap match_dup operands
6336         6 and 7 to better fit into the array.
6337
6338 2008-04-17  H.J. Lu  <hongjiu.lu@intel.com>
6339
6340         * config/i386/i386.c (sse_builtin_type): New.
6341         (bdesc_sse_args): Likewise.
6342         (bdesc_sse_3arg): Removed.
6343         (bdesc_2arg): Remove IX86_BUILTIN_AESKEYGENASSIST128.
6344         (bdesc_1arg): Remove IX86_BUILTIN_ROUNDPD and
6345         IX86_BUILTIN_ROUNDPS.
6346         (ix86_init_mmx_sse_builtins): Handle bdesc_sse_args.  Remove
6347         bdesc_sse_3arg.  Remove IX86_BUILTIN_ROUNDPD and
6348         IX86_BUILTIN_ROUNDPS.
6349         (ix86_expand_sse_4_operands_builtin): Removed.
6350         (ix86_expand_sse_operands_builtin): New.
6351         (ix86_expand_unop_builtin): Remove CODE_FOR_sse4_1_roundpd
6352         and CODE_FOR_sse4_1_roundps.
6353         (ix86_expand_builtin): Remove IX86_BUILTIN_AESKEYGENASSIST128.
6354         Handle bdesc_sse_args.  Remove bdesc_sse_3arg.
6355
6356 2008-04-17  Alan Modra  <amodra@bigpond.net.au>
6357
6358         PR target/35907
6359         * config/rs6000/rs6000.c (rs6000_emit_epilogue): Restore vr and vrsave
6360         regs before frame pop when needed.  If use_backchain_to_restore_sp
6361         then load backchain into a temp reg to restore vr and vrsave.  Add
6362         code to restore vr after frame pop if possible.
6363
6364 2008-04-17  Richard Guenther  <rguenther@suse.de>
6365
6366         * tree-vn.c (expressions_equal_p): Do not check type
6367         equality or compatibility before calling operand_equal_p.
6368         * fold-const.c (operand_equal_p): Check equivalence of
6369         integer constants before bailing out due to signedness or
6370         precision differences.
6371         * tree-ssa-sccvn.c (copy_reference_ops_from_ref): Ignore
6372         spurious differences in type qualification.  Ignore types
6373         for COMPONENT_REFs at all.
6374
6375 2008-04-17  Christian Bruel  <christian.bruel@st.com>
6376
6377         * config/sh/sh.c (expand_cbranchdi4): Use original operands for
6378         msw_skip comparison.
6379         
6380 2008-04-16  Jakub Jelinek  <jakub@redhat.com>
6381
6382         PR c/35739
6383         * tree-nrv.c (tree_nrv): Don't optimize if result_type is GIMPLE
6384         reg type.
6385
6386         PR tree-optimization/35899
6387         * tree-inline.c (expand_call_inline): Use GIMPLE_STMT_OPERAND
6388         rather than TREE_OPERAND.
6389
6390 2008-04-16  Uros Bizjak  <ubizjak@gmail.com>
6391
6392         PR target/35944
6393         * config/i386/i386.md (fmodxf3): Copy operand 1 and operand 2 into
6394         temporary registers.  Change operand predicate to general_operand.
6395         (remainderxf3): Ditto.
6396
6397 2008-04-16  Richard Guenther  <rguenther@suse.de>
6398
6399         * Makefile.in (tree-affine.o): Add $(FLAGS_H) dependency.
6400         * tree-affine.c (aff_combination_expand): Look through some
6401         conversions.
6402
6403 2008-04-15  Doug Kwan  <dougkwan@google.com>
6404
6405         * dwarf2asm.c (dw2_assemble_integer): Cast to unsigned HOST_WIDE_INT
6406         for hex printing.
6407         * tree-pretty-print.c (dump_generic_node): Ditto.
6408         * final.c (output_addr_const): Ditto.
6409         * dwarf2out.c (output_cfi): Ditto.
6410         * c-pretty-print.c (pp_c_integer_constant): Ditto.
6411         * print-rtl.c (print_rtx): Ditto.
6412         * print-tree.c (print_node_brief, print_node): Ditto.
6413         * c-common.c (match_case_to_enum_1): Ditto.
6414         * sched-vis.c (print_value): Ditto.
6415         * config/i386/i386.c (print_operand): Cast to long unsigned int
6416         for hex printing.
6417
6418 2008-04-15  Danny Smith  <dannysmith@users.sourceforge.net>
6419         * libgcc2.c [L_trampoline]: Remove  unnecessary prototype for
6420         MS Windows VirtualProtect function.
6421
6422 2008-04-15  Jan Hubicka  <jh@suse.cz>
6423
6424         * gengtype.c (write_root): Param_is argument is OK.
6425         * expr.c (expand_expr_real_1): Update call of get_exception_*.
6426         * function.h: Include varray.h
6427         (rtl_eh): New stucture based on except.c one.
6428         (call_site_record): New forward declaration and vector type.
6429         * calls.c (emit_call_1): Do not call
6430         note_current_region_may_contain_throw.
6431         * except.c (eh_status): Remove cur_region, try_region since they are
6432         unused.
6433         Move filter, exc_ptr, ttype_data, ehspec_data, action_record_data and
6434         exception_handler_label_map, ehr_stackadj, ehr_handler, ehr_label,
6435         sjlj_fc, sjlj_exit_after to rth_eh in function.h. 
6436         Remove call_site_data_used, call_site_data_size.
6437         Turn call_site_record into vector in function.h.
6438         (note_current_region_may_contain_throw): Remove.
6439         (get_exception_pointer, get_exception_filter): Do not take struct
6440         function argument; update.
6441         (add_ehl_entry, find_exception_handler_labels, ehspec_filter_hash,
6442         add_ttypes_entry, add_ehspec_entry, assign_filter_values,
6443         build_post_landing_pads, dw2_build_landing_pads,
6444         sjlj_assign_call_site_values, sjlj_mark_call_sites,
6445         sjlj_emit_function_enter, sjlj_emit_function_enter, 
6446         sjlj_emit_function_exit, sjlj_emit_dispatch_table,
6447         sjlj_build_landing_pads, finish_eh_generation,
6448         remove_exception_handler_label, remove_eh_handler,
6449         maybe_remove_eh_handler, add_reachable_handler,
6450         reachable_handlers, expand_builtin_eh_return, expand_eh_return,
6451         add_action_record, collect_one_action_chain, add_call_site,
6452         convert_to_eh_region_ranges, sjlj_size_of_call_site_table,
6453         sjlj_output_call_site_table, output_function_exception_table,
6454         * except.h (note_current_region_may_contain_throw): Remove
6455         (get_exception_pointer, get_exception_filter): Do not take struct
6456         function argument.
6457         * Makefile.in (GTFILES): Put varargs before struct function.
6458
6459 2008-04-15  Eric Botcazou  <ebotcazou@adacore.com>
6460
6461         * tree-ssa-structalias.c (get_constraint_for_component_ref): Do not
6462         punt for STRING_CST.
6463         (get_constraint_for): Deal with STRING_CST here instead.
6464
6465 2008-04-15  Richard Guenther  <rguenther@suse.de>
6466
6467         * tree-ssa-propagate.c (substitute_and_fold): Substitute
6468         statements in a basic-block with a backward walk.  Do not
6469         substitute into dead statements but instead remove those.
6470
6471 2008-04-15  Richard Guenther  <rguenther@suse.de>
6472
6473         * params.def (PARAM_MAX_FIELDS_FOR_FIELD_SENSITIVE): Set default
6474         to zero, thus disable creation of SFTs.
6475
6476 2008-04-15  Eric Botcazou  <ebotcazou@adacore.com>
6477
6478         * tree-predcom.c (suitable_reference_p): Return false if the
6479         reference can throw.
6480
6481 2008-04-15  Jakub Jelinek  <jakub@redhat.com>
6482
6483         PR c/35751
6484         * c-decl.c (finish_decl): If extern or static var has variable
6485         size, set TREE_TYPE (decl) to error_mark_node.
6486
6487 2008-04-15  Rafael Espindola  <espindola@google.com>
6488
6489         * fold-const.c (tree_call_nonnegative_warnv_p): Remove local
6490         variable arg1.
6491
6492 2008-04-15  Richard Guenther  <rguenther@suse.de>
6493
6494         * tree-ssa-sccvn.h (vn_reference_lookup): Adjust prototype.
6495         * tree-ssa-sccvn.c (vn_reference_lookup): New parameter maywalk.
6496         (visit_reference_op_load): Do walk vuse-vdef chains on
6497         vn_reference_lookup.
6498         (visit_reference_op_store): But do not here.
6499         * tree-vn.c (vn_lookup): Do not walk vuse-vdef chains on
6500         vn_reference_lookup.
6501         (vn_lookup_with_vuses): But do so here.
6502
6503 2008-04-14  Ian Lance Taylor  <iant@google.com>
6504
6505         * fold-const.c (fold_overflow_warning): Remove assertion.
6506
6507 2008-04-15  Ben Elliston  <bje@au.ibm.com>
6508
6509         * config/alpha/alpha.c (alpha_initialize_trampoline): Remove temp,
6510         temp1 local variables.
6511
6512 2008-04-15  Zuxy Meng  <zuxy.meng@gmail.com>
6513
6514         PR target/35661
6515         * config/i386/winnt.c (i386_pe_section_type_flags): Mark
6516         ".text.unlikely" section as executable.
6517
6518 2008-04-14  James E. Wilson  <wilson@tuliptree.org>
6519
6520         * config/ia64/ia64.c (rtx_needs_barrier): Handle
6521         UNSPEC_FR_SQRT_RECIP_APPROX_RES.
6522         * config/ia64/ia64.c (UNSPEC_FR_SQRT_RECIP_APPROX_RES): Define.
6523         (divsi3_internal, divdi3_internal_lat, divdi3_internal_thr,
6524         divsf3_internal_lat, sqrt_approx, sqrtsf2_internal_thr,
6525         divdf3_internal_lat, sqrtdf2_internal_thr, divxf3_internal_lat,
6526         divxf3_internal_thr, sqrtxf2_internal_thr, recip_approx): Use it.
6527
6528 2008-04-14  Ian Lance Taylor  <iant@google.com>
6529
6530         * flags.h (POINTER_TYPE_OVERFLOW_UNDEFINED): Define.
6531         * fold-const.c (fold_comparison): If appropriate, test
6532         POINTER_TYPE_OVERFLOW_UNDEFINED, and issue an overflow warning.
6533         (fold_binary): Test POINTER_TYPE_OVERFLOW_UNDEFINED when
6534         reassociating a pointer type.
6535         * doc/invoke.texi (Optimize Options): Document that
6536         -fstrict-overflow applies to pointer wraparound.
6537
6538 2008-04-13  Jan Hubicka  <jh@suse.cz>
6539
6540         * m32.c (m32c_pushm_popm): Use crtl->retrun_rtx.
6541
6542 2008-04-12  Andrew Pinski  <pinskia@gmail.com>
6543
6544         * config/rs6000/rs6000.c (compute_save_world_info): Set lr_save_p if
6545         we are going to "save the world".
6546
6547 2008-04-13  Hans-Peter Nilsson  <hp@axis.com>
6548
6549         * config/cris/cris.md ("*andhi_lowpart_non_v32", "*andhi_lowpart_v32")
6550         ("*andqi_lowpart_non_v32", "*andqi_lowpart_v32"): Use "+" for the
6551         operand 0 constraint, not "=".
6552
6553 2008-04-11  James E. Wilson  <wilson@tuliptree.org>
6554
6555         * system.h: Change ASSERT_CHECKING to ENABLE_ASSERT_CHECKING.
6556
6557 2008-04-11  H.J. Lu  <hongjiu.lu@intel.com>
6558
6559         * dse.c (record_store): Use HOST_BITS_PER_WIDE_INT instead
6560         of size of positions_needed * CHAR_BIT.
6561
6562 2008-04-11  H.J. Lu  <hongjiu.lu@intel.com>
6563
6564         PR middle-end/35897
6565         * dse.c (store_info): Change positions_needed to unsigned
6566         HOST_WIDE_INT.
6567         (lowpart_bitmask): New.
6568         (record_store): Cast to unsigned HOST_WIDE_INT for
6569         positions_needed.  Assert width <= size of positions_needed *
6570         CHAR_BIT.  Call lowpart_bitmask to initialize positions_needed.
6571         (check_mem_read_rtx): Use unsigned HOST_WIDE_INT on mask.  Call
6572         lowpart_bitmask to set mask.
6573
6574 2008-04-11  Bernd Schmidt  <bernd.schmidt@analog.com>
6575
6576         * config/bfin/constraints.md: New file.
6577         * config/bfin/bfin.md: Include it.
6578         (adddi3): Use satisfies_constraint functions instead of the old macros.
6579         * config/bfin/bfin.h (REG_CLASS_FROM_LETTER, CONSTRAINT_LEN,
6580         CONST_18UBIT_IMM_P, CONST_16BIT_IMM_P, CONST_16UBIT_IMM_P,
6581         CONST_7BIT_IMM_P, CONST_7NBIT_IMM_P, CONST_5UBIT_IMM_P,
6582         CONST_4BIT_IMM_P, CONST_4UBIT_IMM_P, CONST_3BIT_IMM_P,
6583         CONST_3UBIT_IMM_P, CONST_OK_FOR_K, CONST_OK_FOR_P, CONST_OK_FOR_M,
6584         CONST_OK_FOR_CONSTRAINT_P, CONST_DOUBLE_OK_FOR_LETTER,
6585         EXTRA_CONSTRAINT): Delete.
6586         * config/bfin/predicates.md (highbits_operand, reg_or_7bit_operand,
6587         reg_or_neg7bit_operand): Use satisfies_constraint functions instead
6588         of the old macros.
6589         * config/bfin/bfin.c: Include "tm-constrs.h".
6590         (bfin_secondary_reload, split_load_immediate, bfin_rtx_costs):
6591         Use satisfies_constraint functions instead of the old macros.
6592         * doc/md.texi (Blackfin Constraints): Update file name reference.
6593
6594 2008-04-11  Richard Guenther  <rguenther@suse.de>
6595
6596         PR tree-optimization/35869
6597         * tree-vrp.c (execute_vrp): Move switch statement update after
6598         jump threading.  Schedule another cfg cleanup run.
6599
6600 2008-04-11  Volker Reichelt  <v.reichelt@netcologne.de>
6601
6602         PR c/35744
6603         * attribs.c (decl_attributes): Return early on errorneous node.
6604
6605 2008-04-10  Oleg Ryjkov  <olegr@google.com>
6606
6607         * tree.h (struct tree_base): Added a new flag default_def_flag.
6608         (SSA_NAME_IS_DEFAULT_DEF): Changed to use the new flag.
6609
6610 2008-04-11  Kaz Kojima  <kkojima@gcc.gnu.org>
6611
6612         * config.gcc (need_64bit_hwint): Need 64bit hwint for sh-*-*.
6613
6614 2008-04-10  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
6615
6616         PR target/35768
6617         * pa.md: Define mode iterator P.  Define mode attribute dwc.
6618         (dcacheflush): Update pattern to use iterator P and attribute dwc.
6619         (icacheflush): Likewise.
6620         * pa.h (INITIALIZE_TRAMPOLINE): Use dcacheflushsi/icacheflushsi if
6621         !TARGET_64BIT, and dcacheflushdi/icacheflushdi if TARGET_64BIT.
6622
6623 2008-04-11  Ben Elliston  <bje@au.ibm.com>
6624
6625         * config/spu/spu.c (spu_init_builtins): Mark builtins as nothrow.
6626
6627 2008-04-10  Rafael Espindola  <espindola@google.com>
6628
6629         * tree-vrp.c (extract_range_from_binary_expr): Don't handle
6630         TRUTH_ANDIF_EXPR or TRUTH_ORIF_EXPR.
6631         (extract_range_from_expr): The same.
6632
6633 2008-04-10  Adam Nemet  <anemet@caviumnetworks.com>
6634
6635         * config/mips/mips.md (GPR2): New mode iterator.
6636         (seq): Add comment.
6637         (*seq_<mode>, *seq_<mode>_mips16, *sne_<mode>, *sgt<u>_<mode>,
6638         *sgt<u>_<mode>_mips16, *sge<u>_<mode>, *slt<u>_<mode>,
6639         *slt<u>_<mode>_mips16 *sle<u>_<mode>, *sle<u>_<mode>_mips16):
6640         Rewrite these to take two modes, the mode of comparison and the
6641         mode of the destination.
6642         * config/mips/mips.c (mips_expand_scc): Instead of having
6643         paradoxical subreg as destination, expand "narrowing" scc if mode
6644         of comparison is SI and target is requested in DI mode.
6645         (mips_emit_int_order_test): Update comment.  Make mode of
6646         comparison match CMP0 rather than TARGET.  When creating inverse
6647         target use mode of TARGET.
6648
6649 2008-04-10  Adam Nemet  <anemet@caviumnetworks.com>
6650
6651         * gcov-dump.c (tag_summary): Only print summaries for the first
6652         GCOV_COUNTERS_SUMMABLE counters.
6653
6654 2008-04-10  Uros Bizjak  <ubizjak@gmail.com>
6655
6656         * config/i386/i386.md (absneg): New code iterator.
6657         (absnegprefix): New code attribute.
6658         (<code><mode>2): Macroize expander from abs<mode>2 and neg<mode>2
6659         patterns using absneg code iterator.
6660         (<code>tf2): Macroize expander from abstf2 and negtf2 patterns
6661         using absneg code iterator.
6662         (*<code><mode>2_1): Macroize insn pattern from *abs<mode>2_1 and
6663         *neg<mode>2 patterns using absneg code iterator.
6664         (*<code>extendsfdf2): Macroize insn pattern from *absextendsfdf2 and
6665         *negextendsfdf2 patterns using absneg code iterator.
6666         (*<code>extendsfxf2): Macroize insn pattern from *absextendsfxf2 and
6667         *negextendsfxf2 patterns using absneg code iterator.
6668         (*<code>extendsfdf2): Macroize insn pattern from *absextendsfdf2 and
6669         *negextendsfdf2 patterns using absneg code iterator.
6670         * config/i386/sse.md (<code><mode>2): Macroize expander from
6671         abs<mode>2 and neg<mode>2 patterns using absneg code iterator. 
6672
6673 2008-04-10  Andreas Krebbel  <krebbel1@de.ibm.com>
6674
6675         * config/s390/s390.h: Remove the remains of the recent search
6676         & replace action of current_function_outgoing_args_size.
6677
6678 2008-04-10  Ira Rosen  <irar@il.ibm.com>
6679
6680         PR tree-optimization/35821
6681         * tree-vect-transform.c (vect_create_data_ref_ptr): Add check that
6682         NEW_STMT_LIST is not NULL.
6683
6684 2008-04-09  David Edelsohn  <edelsohn@gnu.org>
6685
6686         PR libstdc++/35597
6687         * toplev.c (process_options): Remove -ffunction-sections debugging
6688         warning.
6689
6690 2008-04-09  Peter Bergner  <bergner@vnet.ibm.com>
6691
6692         PR middle-end/PR28690
6693         * explow.c (break_out_memory_refs): Use simplify_gen_binary rather
6694         than gen_rtx_fmt_ee to perform more canonicalizations.
6695
6696 2008-04-08  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
6697
6698         PR driver/35665
6699         * collect2.c (write_c_file): Don't wrap in "#ifdef __cplusplus".
6700
6701 2008-04-09  Richard Guenther  <rguenther@suse.de>
6702
6703         * tree-cfg.c (verify_stmt): Print complete bogus stmt.
6704         (dump_function_to_file): Dump function arguments with types.
6705
6706 2008-04-08  Richard Guenther  <rguenther@suse.de>
6707
6708         * fold-const.c (fold_widened_comparison): Do not allow
6709         sign-changes that change the result.
6710
6711 2008-04-08  Janis Johnson  <janis187@us.ibm.com>
6712
6713         PR target/35839
6714         * config/rs6000/rs6000.c (rs6000_check_sdmode): Handle additional
6715         kinds of indirect references.
6716
6717 2008-04-08  David Edelsohn  <edelsohn@gnu.org>
6718
6719         * config/rs6000/rs6000.c (rs6000_output_function_epilogue): Update
6720         GNU Fortran language string.
6721
6722 2008-04-08  Rafael Espindola  <espindola@google.com>
6723
6724         * fold-canst.c (tree_call_nonnegative_warnv_p): New.
6725         (tree_invalid_nonnegative_warnv_p): Use tree_call_nonnegative_warnv_p.
6726         * tree.h (tree_call_nonnegative_warnv_p): New.
6727
6728 2008-04-08  Jan Hubicka  <jh@suse.cz>
6729
6730         * function.c (free_after_compilation): Clear out regno_reg_rtx
6731         pointer.
6732
6733 2008-04-08  Peter Bergner  <bergner@vnet.ibm.com>
6734
6735         Revert
6736         2008-04-07  Peter Bergner  <bergner@vnet.ibm.com>
6737
6738         PR middle-end/PR28690
6739         * rtlanal.c: (commutative_operand_precedence): Give SYMBOL_REF's the
6740         same precedence as REG_POINTER and MEM_POINTER operands.
6741
6742 2008-04-08  Richard Guenther  <rguenther@suse.de>
6743
6744         PR middle-end/35834
6745         * tree-ssa-address.c (create_mem_ref): Use POINTER_PLUS_EXPR
6746         for adding index to base.
6747
6748 2008-04-08  Kai Tietz  <kai.tietz@onevision.com>
6749
6750         * config/i386/mingw32.h (ENABLE_EXECUTE_STACK): New.
6751         (MINGW_ENABLE_EXECUTE_STACK): New.
6752         (IN_LIBGCC2): For libgcc include windows.h file for
6753         function declarations.
6754
6755 2008-04-08  Hans-Peter Nilsson  <hp@axis.com>
6756
6757         * config/cris/cris.c (cris_address_cost): For a PLUS, swap tem1
6758         and tem2 if tem1 is not a REG or MULT.
6759
6760 2008-04-08  Jan Hubicka  <jh@suse.cz>
6761
6762         * function.h (incomming_args): Break out of struct function.
6763         (function_subsections): Break out of struct function.
6764         (rtl_data): Add args, subsections fields. Break out outgoing_args_size,
6765         return_rtx and hard_reg_initial_vals from struct function.
6766         Kill inl_max_label_num.
6767         (current_function_pops_args, current_function_args_info,
6768         current_function_args_size, current_function_args_size,
6769         current_function_pretend_args_size,
6770         current_function_outgoing_args_size,
6771         current_function_internal_arg_pointer, current_function_return_rtx):
6772         Kill compatibility accestor macros.
6773         * builtins.c (expand_builtin_apply_args_1): Update.
6774         (expand_builtin_next_arg): Update.
6775         * df-scan.c (df_get_call_refs): Update.
6776         * dbxout.c (dbxout_function_end): Update.
6777         * dwarf2out.c (dwarf2out_switch_text_section): Update.
6778         (output_line_info): Update.
6779         (secname_for_decl): Update.
6780         (dwarf2out_var_location): Update.
6781         * function.c (free_after_compilation): Update.
6782         (assign_parm_find_stack_rtl): Update.
6783         (assign_parms): Update.
6784         (expand_dummy_function_end): Update.
6785         (expand_function_end): Update.
6786         * calls.c (mem_overlaps_already_clobbered_arg_p): Update.
6787         (expand_call): Update.
6788         (emit_library_call_value_1): Update.
6789         (store_one_arg): Update.
6790         * varasm.c (initialize_cold_section_name): Update.
6791         (unlikely_text_section): Update.
6792         (unlikely_text_section_p): Update.
6793         (assemble_start_function): Update.
6794         (assemble_end_function): Update.
6795         (default_section_type_flags): Update.
6796         (switch_to_section): Update.
6797         * integrate.c (set_decl_abstract_flags): Update.
6798         (get_hard_reg_initial_val): Update.
6799         (has_hard_reg_initial_val): Update.
6800         (allocate_initial_values): Update.
6801         * resource.c (init_resource_info): Update.
6802         * config/alpha/alpha.c (NUM_ARGS): Update.
6803         (direct_return): Update.
6804         (alpha_va_start): Update.
6805         (alpha_sa_size): Update.
6806         (alpha_initial_elimination_offset): Update.
6807         (alpha_expand_prologue): Update.
6808         (alpha_start_function): Update.
6809         (alpha_expand_epilogue): Update.
6810         (unicosmk_initial_elimination_offset):
6811         * config/alpha/alpha.md (call expander): Update.
6812         * config/s390/s390.c (s390_register_info): Update.
6813         (s390_register_info): Update.
6814         (s390_frame_info): Update.
6815         (s390_initial_elimination_offset): Update.
6816         (s390_build_builtin_va_list): Update.
6817         (s390_va_start): Update.
6818         * config/spu/spu.c (direct_return): Update.
6819         (spu_expand_prologue): Update.
6820         (spu_initial_elimination_offset): Update.
6821         (spu_build_builtin_va_list): Update.
6822         (spu_va_start): Update.
6823         * config/sparc/sparc.c (sparc_init_modes): Update.
6824         (sparc_compute_frame_size): Update.
6825         (function_value): Update.
6826         * config/m32r/m32r.c (m32r_compute_frame_size): Update.
6827         * config/i386/i386.md (return expander): Update.
6828         * config/i386/i386.c (ix86_va_start): Update.
6829         (ix86_can_use_return_insn_p): Update.
6830         (ix86_compute_frame_layout): Update.
6831         (ix86_expand_epilogue): Update.
6832         * config/sh/sh.c (output_stack_adjust): Update.
6833         (calc_live_regs): Update.
6834         (sh_expand_prologue): Update.
6835         (sh_builtin_saveregs): Update.
6836         (sh_va_start): Update.
6837         (initial_elimination_offset): Update.
6838         (sh_allocate_initial_value): Update.
6839         (sh_function_ok_for_sibcall): Update.
6840         (sh_get_pr_initial_val): Update.
6841         * config/sh/sh.md (return expander): Update.
6842         * config/avr/avr.c (frame_pointer_required_p): UPdate.
6843         * config/crx/crx.c (crx_compute_frame): UPdate.
6844         (crx_initial_elimination_offset): UPdate.
6845         * config/xtensa/xtensa.c (compute_frame_size): Update
6846         (xtensa_builtin_saveregs): Update.
6847         (xtensa_va_start): Update.
6848         (order_regs_for_local_alloc): Update.
6849         * config/stormy16/stormy16.c (xstormy16_compute_stack_layout): Update.
6850         (xstormy16_expand_builtin_va_start): Update.
6851         * config/fr30/fr30.c (fr30_compute_frame_size): Update.
6852         * config/m68hc11/m68hc11.md (return expanders): Update.
6853         * config/m68hc11/m68hc11.c (expand_prologue): Update.
6854         (expand_epilogue): Update.
6855         * config/cris/cris.c (cris_initial_frame_pointer_offset): Update.
6856         (cris_simple_epilogue): Update.
6857         (cris_expand_prologue): Update.
6858         (cris_expand_epilogue): Update.
6859         * config/iq2000/iq2000.c (iq2000_va_start): Update.
6860         (compute_frame_size): Update.
6861         * config/mt/mt.c (mt_compute_frame_size): Update.
6862         * config/mn10300/mn10300.c (expand_prologue): Update.
6863         (expand_epilogue): Update.
6864         (initial_offset): Update.
6865         (mn10300_builtin_saveregs):
6866         * config/mn10300/mn10300.md (return expander): Update.
6867         * config/ia64/ia64.c (ia64_compute_frame_size): Update.
6868         (ia64_initial_elimination_offset): Update.
6869         (ia64_initial_elimination_offset): Update.
6870         (ia64_expand_prologue): Update.
6871         * config/m68k/m68k.md (return expander): Update.
6872         * config/rs6000/rs6000.c (rs6000_va_start): Update.
6873         (rs6000_stack_info): Update.
6874         * config/mcore/mcore.c (layout_mcore_frame): Update.
6875         (mcore_expand_prolog): Update.
6876         * config/arc/arc.c (arc_compute_frame_size): Update.
6877         * config/score/score3.c (score3_compute_frame_size): Update.
6878         * config/score/score7.c (score7_compute_frame_size): Update.
6879         * config/arm/arm.c (use_return_insn): Update.
6880         (thumb_find_work_register): Update.
6881         (arm_compute_save_reg_mask): Update.
6882         (arm_output_function_prologue): Update.
6883         (arm_output_epilogue): Update.
6884         (arm_size_return_regs): Update.
6885         (arm_get_frame_offsets): Update.
6886         (arm_expand_prologue): Update.
6887         (thumb_exit): Update.
6888         (thumb_unexpanded_epilogue): Update.
6889         (thumb1_output_function_prologue): Update.
6890         * config/pa/pa.md (return expander): Update.
6891         * config/pa/pa.c (compute_frame_size): Update.
6892         (hppa_builtin_saveregs): Update.
6893         * config/mips/mips.c (mips_va_start): Update.
6894         (mips16_build_function_stub): Update.
6895         (mips_compute_frame_info): Update.
6896         (mips_restore_gp): Update.
6897         (mips_output_function_prologue): Update.
6898         (mips_expand_prologue): Update.
6899         * config/v850/v850.c (compute_frame_size): Update.
6900         (expand_prologue): * config/mmix/mmix.c (along): update.
6901         (mmix_initial_elimination_offset): update.
6902         (mmix_reorg): update.
6903         (mmix_use_simple_return): update.
6904         (mmix_expand_prologue): update.
6905         (mmix_expand_epilogue): Update.
6906         * config/bfin/bfin.c (bfin_initial_elimination_offset): Update.
6907         (emit_link_insn): Update.
6908
6909 2008-04-08  Anatoly Sokolov <aesok@post.ru>
6910
6911         * config/avr/avr.h (TARGET_CPU_CPP_BUILTINS): Define 
6912         __AVR_HAVE_EIJMP_EICALL__ macro if device have EIJMP and EICALL 
6913         instructions.
6914         * config/avr/avr.c (avr_mcu_types): Set AVR31 architecture for 
6915         atmega103 device.
6916
6917 2008-04-07  Jan Hubicka  <jh@suse.cz>
6918
6919         * function.h (rtl): Rename to x_rtl.
6920         (crtl): New define.
6921         (return_label, naked_return_label, stack_slot_list, parm_birth_insn,
6922         frame_offset, stack_check_probe_note, arg_pointer_save_area,
6923         used_temp_slots avail_temp_slots, temp_slot_level,
6924         nonlocal_goto_handler_labels): Update accesstors.
6925         (rtl): New global variable.
6926         (struct function): Move some fileds to rtl_data.
6927         (get_arg_pointer_save_area): Update prototype.
6928         * builtins.c (expand_builtin_setjmp_receiver): Update call of
6929         get_arg_pointer_save_area.
6930         * expr.c (init_expr): Update
6931         * function.c (get_frame_size): Update
6932         (assign_stack_local): Update
6933         (expand_function_end): Update.
6934         (get_art_pointer_save_area): Update
6935         * function.h 
6936         * emit-rtl.c (rtl): Declare.
6937         (regno_reg_rtx): Declare.
6938         (first_insn, last_insn, cur_insn_uid, last_location, first_label_num):
6939         Update.
6940         (gen_reg_rtx): Update.
6941         * varasm.c (n_deferred_constatns): Update accestor.
6942         (init_varasm_status): Do not allocate varasm_status.
6943         (force_const_mem, get_pool_size, output_constant_pool): Update.
6944         * stmt.c (force_label_rtx): Do not use x_ prefixes.
6945         (expand_nl_goto_receiver): Update get_arg_pointer_save_area.
6946         * m32c/m32.c (m32c_leaf_function_p, m32c_function_needs_enter): Update.
6947         * sparc/sparc.h (INIT_EXPANDERS): Update.
6948         * ia64/ia64.h (INIT_EXPANDERS): Update.
6949
6950 2008-04-07  James E. Wilson  <wilson@tuliptree.org>
6951
6952         * reload.c (push_secondary_reload): Add missing break to for loop.
6953
6954 2008-04-07  Peter Bergner  <bergner@vnet.ibm.com>
6955
6956         PR middle-end/PR28690
6957         * rtlanal.c: Update copyright years.
6958         (commutative_operand_precedence): Give SYMBOL_REF's the same precedence
6959         as REG_POINTER and MEM_POINTER operands.
6960         * emit-rtl.c (gen_reg_rtx_and_attrs): New function.
6961         (set_reg_attrs_from_value): Call mark_reg_pointer as appropriate.
6962         * rtl.h (gen_reg_rtx_and_attrs): Add prototype for new function.
6963         * gcse.c: Update copyright years.
6964         (pre_delete): Call gen_reg_rtx_and_attrs.
6965         (hoist_code): Likewise.
6966         (build_store_vectors): Likewise.
6967         (delete_store): Likewise.
6968         * loop-invariant.c (move_invariant_reg): Likewise.
6969         Update copyright years.
6970
6971 2008-04-07  Uros Bizjak  <ubizjak@gmail.com>
6972
6973         * config/i386/i386.md ("*sse_prologue_save_insn"): Use braced output
6974         control string instead of quoted.
6975
6976 2008-04-07  Kenneth Zadeck  <zadeck@naturalbridge.com>
6977
6978         * doc/rtl.texi: Rewrite of subreg section.
6979
6980 2008-04-07  Kai Tietz  <kai.tietz@onevision.com>
6981
6982         PR/35842
6983         * config/i386/i386.c (legitimize_pic_address): Add treating
6984         of dllimport SYM_REF's.
6985         (legitimize_dllimport_symbol): Add prototype.
6986
6987 2008-04-07  Eric Botcazou  <ebotcazou@adacore.com>
6988
6989         * fold-const.c (fold) <ARRAY_REF>: New case.  Try to fold constant
6990         reference in constructor with non self-referential type.
6991
6992 2008-04-07  Eric Botcazou  <ebotcazou@adacore.com>
6993
6994         Removal of Return with Depressed Stack Pointer support
6995         * tree.h (TYPE_RETURNS_STACK_DEPRESSED): Delete.
6996         (ECF_SP_DEPRESSED): Likewise.
6997         (ECF_LIBCALL_BLOCK, ECF_NOVOPS): Adjust.
6998         * calls.c (emit_call_1): Do not test ECF_SP_DEPRESSED.
6999         (flags_from_decl_or_type): Do not test TYPE_RETURNS_STACK_DEPRESSED.
7000         (expand_call): Do not test ECF_SP_DEPRESSED.
7001         * dse.c (dse_step0): Do not test TYPE_RETURNS_STACK_DEPRESSED.
7002         * function.c (keep_stack_depressed): Delete.
7003         (handle_epilogue_set): Likewise.
7004         (update_epilogue_consts): Likewise.
7005         (emit_equiv_load): Likewise.
7006         (thread_prologue_and_epilogue_insns): Remove support for Return with
7007         Depressed Stack Pointer.
7008         * print-tree.c (print_node): Do not test TYPE_RETURNS_STACK_DEPRESSED.
7009
7010 2008-04-06  Richard Guenther  <rguenther@suse.de>
7011
7012         PR tree-optimization/35400
7013         * tree-vrp.c (vrp_evaluate_conditional): Only query value-range
7014         information from SSA_NAMEs.
7015
7016 2008-04-06  Anatoly Sokolov <aesok@post.ru>
7017
7018         * config/avr/avr.h (avr_mega_p): Remove declaration.
7019         (AVR_MEGA): Remove macro.
7020         * config/avr/avr.c (avr_mega_p): Remove variable.
7021         (avr_override_options): Remove inicializion of avr_mega_p.
7022         Use AVR_HAVE_JMP_CALL instead of AVR_MEGA.
7023         (print_operand): Use AVR_HAVE_JMP_CALL instead of AVR_MEGA.
7024         (avr_jump_mode): (Ditto.).
7025         (avr_output_progmem_section_asm_op): (Ditto.).
7026         (avr_asm_init_sections): (Ditto.).
7027         (avr_asm_init_sections): (Ditto.).
7028         (avr_rtx_costs): (Ditto.).
7029         * config/avr/avr.md: (Ditto.).
7030         * config/avr/avr.h: Use '__AVR_HAVE_JMP_CALL__' instead of 
7031         '__AVR_MEGA__'.
7032
7033 2008-04-06  Richard Guenther  <rguenther@suse.de>
7034
7035         PR tree-optimization/35842
7036         * tree-ssa-address.c (fixed_address_object_p): Adjust to match
7037         is_gimple_invariant_address.
7038
7039 2008-04-06  Francois-Xavier Coudert  <fxcoudert@gcc.gnu.org>
7040
7041         * gcc.c (default_compilers): Sync Fortran extensions list with
7042         that in fortran/lang-specs.h.
7043         * doc/invoke.texi: Likewise.
7044         * dbxout.c (get_lang_number): Use "GNU Fortran" in "GNU F95".
7045         * dwarf2out.c (gen_compile_unit_die): Likewise.
7046
7047 2008-04-06  Tom G. Christensen  <tgc@jupiterrise.com>
7048
7049         * gthr-posix95.h (__gthread_cond_wait_recursive): Add missing &.
7050
7051 2008-04-05  Uros Bizjak  <ubizjak@gmail.com>
7052
7053         PR target/12329
7054         * config/i386/i386.c (ix86_function_regparm): Error if regparm(3)
7055         attribute is used for nested functions.
7056
7057 2008-04-05  Jan Hubicka  <jh@suse.cz>
7058
7059         * emit-rtl.c (init_emit): xcalloc regno_pointer_align.
7060
7061         * tree-dump.c (dump_enable_all): Remove prototype; do not accept
7062         letter argument.
7063         (dump_files): Update.
7064         (enable_rtl_dump_file): Do not accept letter argument.
7065         * tree-pass.h (dump_file_info): Remove letter argument.
7066         * toplev.c (decode_d_option): Update -da handling.
7067         * toplev.h (enable_rtl_dump_file): Update prototype.
7068         * passes.c (register_one_dump_file): Do not accept IPA argument; work
7069         it out based on pass type.
7070         (register_dump_files_1): Likewise.
7071         (init_optimization_passes): Update register_one_dump_file calls.
7072         (execute_one_pass): Sanity check that IPA passes are called at IPA
7073         level and RTL passes at RTL level.
7074         (execute_pass_list): IPA pass can not be after or subpass of
7075         GIMPLE/RTL pass.
7076         (execute_ipa_pass_list): Handle IPA subpasses of IPA subpasses and
7077         disallov RTL subpasses of IPA subpasses.
7078
7079 2008-04-05  Ben Elliston  <bje@au.ibm.com>
7080
7081         * tree-cfg.c (need_fake_edge_p): Return false for calls to
7082         builtins that return exactly once and do not throw. Cache call to
7083         call_expr_flags.
7084
7085 2008-04-04 Andy Hutchinson <hutchinsonandy@aim.com>
7086
7087         PR rtl-optimization/34916
7088         PR middle-end/35519
7089         * combine.c (create_log_links): Do not create duplicate LOG_LINKS
7090         between instruction pairs.
7091
7092 2008-04-04  Naveen.H.S  <naveen.hs@kpitcummins.com>
7093
7094         * doc/invoke.texi: Document -mbitops for SH.
7095         * config/sh/constraints.md (K03, K12, Sbv, Sbw): New constraints.
7096         * config/sh/predicates.md (bitwise_memory_operand): New predicate.
7097         * config/sh/sh.c (print_operand): Add %t operand code.
7098         * config/sh/sh.h (GO_IF_LEGITIMATE_INDEX): Add condition for SH2A.
7099         * config/sh/sh.md (*iorsi3_compact): Fix condition for SH2A.
7100         (extendqisi2_compact): Add the alternative for SH2A 4-byte mov.b.
7101         (extendqihi2): Likewise.
7102         (movqi_i): Likewise.
7103         (insv): Use bset, bclr and bst instructions for SH2A if possible.
7104         (extv): Use bld instruction for SH2A if possible.
7105         (extzv): Likewise.
7106         (bclr_m2a, bclrmem_m2a, bset_m2a, bsetmem_m2a, bst_m2a, bld_m2a,
7107         bldsign_m2a, bld_reg, *bld_regqi, band_m2a, bandreg_m2a,
7108         bor_m2a, borreg_m2a, bxor_m2a, bxorreg_m2a): New insns.
7109         (bset.b, bclr.b): Define peepholes.
7110         * config/sh/sh.opt (mbitops): New option.
7111
7112 2008-04-04  Janis Johnson  <janis187@us.ibm.com>
7113
7114         PR target/35620
7115         * config/rs6000/rs6000.c (rs6000_check_sdmode): Handle indirect ref
7116         and view convert expression.
7117
7118 2008-04-04  Jakub Jelinek  <jakub@redhat.com>
7119
7120         PR target/35364
7121         * tree-cfg.c (remove_useless_stmts_1): Handle OMP_* containers.
7122
7123 2008-04-04  H.J. Lu  <hongjiu.lu@intel.com>
7124
7125         * config.gcc (extra_headers): Add wmmintrin.h for x86 and x86-64.
7126
7127         * config/i386/cpuid.h (bit_AES): New.
7128         (bit_PCLMUL): Likewise.
7129
7130         * config/i386/i386.c (pta_flags): Add PTA_AES and PTA_PCLMUL.
7131         (override_options): Handle PTA_AES and PTA_PCLMUL.  Enable
7132         SSE2 if AES or PCLMUL is enabled.
7133         (ix86_builtins): Add IX86_BUILTIN_AESENC128,
7134         IX86_BUILTIN_AESENCLAST128, IX86_BUILTIN_AESDEC128,
7135         IX86_BUILTIN_AESDECLAST128, IX86_BUILTIN_AESIMC128,
7136         IX86_BUILTIN_AESKEYGENASSIST128 and IX86_BUILTIN_PCLMULQDQ128.
7137         (bdesc_sse_3arg): Add IX86_BUILTIN_PCLMULQDQ128.
7138         (bdesc_2arg): Add IX86_BUILTIN_AESENC128,
7139         IX86_BUILTIN_AESENCLAST128, IX86_BUILTIN_AESDEC128,
7140         IX86_BUILTIN_AESDECLAST128 and IX86_BUILTIN_AESKEYGENASSIST128.
7141         (bdesc_1arg): Add IX86_BUILTIN_AESIMC128.
7142         (ix86_init_mmx_sse_builtins): Define __builtin_ia32_aesenc128,
7143         __builtin_ia32_aesenclast128, __builtin_ia32_aesdec128,
7144         __builtin_ia32_aesdeclast128,__builtin_ia32_aesimc128,
7145         __builtin_ia32_aeskeygenassist128 and
7146         __builtin_ia32_pclmulqdq128.
7147         * config/i386/i386.c (ix86_expand_binop_imm_builtin): New.
7148         (ix86_expand_builtin): Use it for IX86_BUILTIN_PSLLDQI128 and
7149         IX86_BUILTIN_PSRLDQI128.  Handle IX86_BUILTIN_AESKEYGENASSIST128.
7150
7151         * config/i386/i386.h (TARGET_AES): New.
7152         (TARGET_PCLMUL): Likewise.
7153         (TARGET_CPU_CPP_BUILTINS): Handle TARGET_AES and TARGET_PCLMUL.
7154
7155         * config/i386/i386.md (UNSPEC_AESENC): New.
7156         (UNSPEC_AESENCLAST): Likewise.
7157         (UNSPEC_AESDEC): Likewise.
7158         (UNSPEC_AESDECLAST): Likewise.
7159         (UNSPEC_AESIMC): Likewise.
7160         (UNSPEC_AESKEYGENASSIST): Likewise.
7161         (UNSPEC_PCLMUL): Likewise.
7162
7163         * config/i386/i386.opt (maes): New.
7164         (mpclmul): Likewise.
7165
7166         * config/i386/sse.md (aesenc): New pattern.
7167         (aesenclast): Likewise.
7168         (aesdec): Likewise.
7169         (aesdeclast): Likewise.
7170         (aesimc): Likewise.
7171         (aeskeygenassist): Likewise.
7172         (pclmulqdq): Likewise.
7173
7174         * config/i386/wmmintrin.h: New.
7175
7176         * doc/extend.texi: Document AES and PCLMUL built-in function.
7177
7178         * doc/invoke.texi: Document -maes and -mpclmul.
7179
7180 2008-04-04  Paolo Bonzini  <bonzini@gnu.org>
7181
7182         * function.c (free_after_parsing): Replace with
7183         cxx_push_function_context from C++ front-end.
7184         (allocate_struct_function): Don't call langhook.
7185         * langhooks.h (struct lang_hooks_for_functions): Delete.
7186         (struct lang_hooks): Add back missing_noreturn_ok_p here, delete
7187         member "function".
7188         * langhooks-def.h (LANG_HOOKS_MISSING_NORETURN_OK_P): Add.
7189         (LANG_HOOKS_FUNCTION_INIT, LANG_HOOKS_FUNCTION_FINAL,
7190         LANG_HOOKS_FUNCTION_MISSING_NORETURN_OK_P,
7191         LANG_HOOKS_FUNCTION_INITIALIZER): Delete.
7192         (LANG_HOOKS_INITIALIZER): Add LANG_HOOKS_MISSING_NORETURN_OK_P,
7193         remove LANG_HOOKS_FUNCTION_INITIALIZER.
7194         * tree-cfg.c: Adjust call to missing_noreturn_ok_p langhook.
7195
7196         * c-objc-common.h (LANG_HOOKS_FUNCTION_MISSING_NORETURN_OK_P):
7197         Rename to LANG_HOOKS_MISSING_NORETURN_OK_P.
7198         
7199 2008-04-04  Jakub Jelinek  <jakub@redhat.com>
7200
7201         PR c/35440
7202         * c-pretty-print.c (pp_c_initializer_list): Handle CONSTRUCTOR
7203         for all types.
7204
7205 2008-04-04  Richard Guenther  <rguenther@suse.de>
7206
7207         PR middle-end/35823
7208         * fold-const.c (optimize_minmax_comparison): Use the correct
7209         type for the constant in the simplified comparison.
7210
7211 2008-04-04  Zuxy Meng <zuxy.meng@gmail.com>
7212
7213         * config/i386/driver-i386.c (describe_cache): Add l2_sizekb argument.
7214         Pass L2 size as "--param l2-cache-size" to the compiler.
7215         (decode_l2_cache): New function to decode L2 cache parameters using
7216         0x8000006 extended cpuid function.
7217         (detect_caches_amd): Determine parameters of L2 cache using
7218         decode_l2_caches function.
7219         (decode_caches_intel): Decode L2 cache parameters.
7220         (detect_caches_intel): Determine L2 cache parameters using
7221         decode_caches_intel and decode_l2_caches functions.
7222
7223 2008-04-03  Bob Wilson  <bob.wilson@acm.org>
7224
7225         * config/xtensa/xtensa.c (xtensa_secondary_reload_class): Use a
7226         secondary input reload for subword loads from the constant pool.
7227
7228 2008-04-03  Janis Johnson  <janis187@us.ibm.com>
7229
7230         PR target/35713
7231         * config/rs6000/rs6000.c (rs6000_gimplify_va_arg): Use integer
7232           constants of the appropriate size for runtime calculations.
7233
7234         PR c/35712
7235         * dfp.c (decimal_from_decnumber): Retain trailing zeroes for
7236           decimal-float literal constant zero.
7237
7238 2008-04-03  Jakub Jelinek  <jakub@redhat.com>
7239
7240         PR c/35738
7241         * c-parser.c (c_parser_omp_atomic): Call
7242         default_function_array_conversion on the RHS.
7243
7244         PR middle-end/35818
7245         * omp-low.c (scan_sharing_clauses) <case OMP_CLAUSE_SHARED>: Don't
7246         call is_variable_sized if decl has incomplete type.
7247
7248 2008-04-03  H.J. Lu  <hongjiu.lu@intel.com>
7249
7250         * config/i386/i386-protos.h (ix86_aligned_p): Removed.
7251
7252 2008-04-03  Adam Nemet  <anemet@caviumnetworks.com>
7253
7254         * config/mips/mips.md (any_gt, any_ge, any_lt, any_le): New code
7255         iterators.
7256         (u): Add attribute values for gt, gtu, ge, geu, lt, ltu, le and leu.
7257         (sgt<u>): Merge sgt and sgtu into new expander.
7258         (sgt, sgtu): Remove expanders.
7259         (*sgt<u>_<mode>): Merge *sgt_<mode> and *sgtu_<mode> into new pattern.
7260         (*sgt_<mode>, *sgtu_<mode>): Remove patterns.
7261         (*sgt<u>_<mode>_mips16): Merge *sgt_<mode>_mips16 and
7262         *sgtu_<mode>_mips16 into new pattern.
7263         (*sgt_<mode>_mips16, *sgtu_<mode>_mips16): Remove patterns.
7264         (sge<u>): Merge sge and sgeu into new expander.
7265         (sge, sgeu): Remove expanders.
7266         (*sge<u>_<mode>): Merge *sge_<mode> and second *sge_<mode> into
7267         new pattern.
7268         (*sge_<mode>, second *sge_<mode>): Remove patterns.
7269         (slt<u>): Merge slt and sltu into new expander.
7270         (slt, sltu): Remove expanders.
7271         (*slt<u>_<mode>): Merge *slt_<mode> and *sltu_<mode> into new pattern.
7272         (*slt_<mode>, *sltu_<mode>): Remove patterns.
7273         (*slt<u>_<mode>_mips16): Merge *slt_<mode>_mips16 and
7274         *sltu_<mode>_mips16 into new pattern.
7275         (*slt_<mode>_mips16, *sltu_<mode>_mips16): Remove patterns.
7276         (sle<u>): Merge sle and sleu into new expander.
7277         (sle, sleu): Remove expanders.
7278         (*sle<u>_<mode>): Merge *sle_<mode> and *sleu_<mode> into new pattern.
7279         (*sle_<mode>, *sleu_<mode>): Remove patterns.
7280         (*sle<u>_<mode>_mips16): Merge *sle_<mode>_mips16 and
7281         *sleu_<mode>_mips16 into new pattern.
7282         (*sle_<mode>_mips16, *sleu_<mode>_mips16): Remove patterns.
7283
7284 2008-04-03  Jan Hubicka  <jh@suse.cz>
7285
7286         PR tree-optimization/35795
7287         * alpha/alpha.c (alpha_output_mi_thunk_osf): Free after compilation.
7288         * sparc/sparc.c (sparc_output_mi_thunk): Likewise.
7289         * ia64/ia64.c (ia64_output_mi_thunk): Likewise.
7290         * m68k/m68k.c (m68k_output_mi_thunk): Likewise.
7291         * score/score3.c (score3_output_mi_thunk): Likewise.
7292         * score/score7.c (score7_output_mi_thunk): Likewise.
7293         * mips/mips.c (mips_output_mi_thunk): Likewise.
7294
7295 2008-04-03  Richard Guenther  <rguenther@suse.de>
7296
7297         * tree-vrp.c (extract_range_from_unary_expr): Handle all
7298         conversions.  Simplify code.
7299
7300 2008-04-03  Kaz Kojima  <kkojima@gcc.gnu.org>
7301
7302         * config/sh/sh.c (sh_output_mi_thunk): Free cfun.
7303
7304 2008-04-03  Tom Tromey  <tromey@redhat.com>
7305             Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
7306
7307         * config/m68k/t-uclinux (generated_files): Add sysroot-suffix.h.
7308         * config/bfin/t-bfin-linux (generated_files): Add
7309         linux-sysroot-suffix.h.
7310         * doc/install.texi (Prerequisites): Require make 3.80.
7311         * doc/sourcebuild.texi (Front End Directory): Document new
7312         variable.
7313         * Makefile.in (generated_files): New variable.
7314         (ALL_HOST_OBJS): New variable.
7315         ($(ALL_HOST_OBJS)): New target.
7316
7317 2008-04-03  Paolo Bonzini  <bonzini@gnu.org>
7318
7319         * tree-inline.c (copy_generic_body, copy_decl_no_change): Export.
7320         (remap_block): Call id->transform_lang_insert_block instead
7321         of langhook.
7322         (optimize_inline_calls, unsave_expr_now, tree_function_versioning):
7323         Set id.transform_lang_insert_block to NULL.
7324         (clone_body): Move to cp/optimize.c
7325         * tree-inline.h (struct copy_body_data): Change
7326         transform_lang_insert_block to function pointer.
7327         (copy_generic_body, copy_decl_no_change): Export.
7328         * langhooks.h (struct lang_hooks_for_decls): Kill insert_block.
7329         * langhooks-def.h (LANG_HOOKS_INSERT_BLOCK): Kill.
7330         (LANG_HOOKS_DECLS): Remove LANG_HOOKS_INSERT_BLOCK.
7331
7332         * c-tree.h (insert_block): Kill.
7333         * c-decl.c (insert_block): Kill.
7334
7335 2008-04-03  Paolo Bonzini  <bonzini@gnu.org>
7336
7337         * c-objc-common.h (LANG_HOOKS_FUNCTION_ENTER_NESTED,
7338         LANG_HOOKS_FUNCTION_LEAVE_NESTED): Delete.
7339         * c-tree.h (c_push_function_context, c_pop_function_context): Remove
7340         argument.
7341         * c-decl.c (c_push_function_context, c_pop_function_context): Remove
7342         argument, call {push,pop}_function_context from here.
7343         * c-parser.c: Use c_{push,pop}_function_context.
7344
7345         * function.c (push_function_context_to): Move meat ...
7346         (push_function_context): ... here.  Simplify.
7347         * function.c (pop_function_context_from): Move meat ...
7348         (pop_function_context): ... here.  Simplify.
7349         * langhooks.h (struct lang_hooks_for_functions): Remove enter_nested,
7350         leave_nested).
7351         * langhooks-def.h (LANG_HOOKS_FUNCTION_ENTER_NESTED,
7352         LANG_HOOKS_FUNCTION_LEAVE_NESTED): Delete.
7353         (LANG_HOOKS_FUNCTION_INITIALIZER): Delete them from here.
7354         * tree.h (push_function_context_to, pop_function_context_from): Remove.
7355
7356 2008-04-03  Ben Elliston  <bje@au.ibm.com>
7357
7358         * expmed.c (extract_force_align_mem_bit_field): Remove.
7359
7360 2008-04-03  Richard Guenther  <rguenther@suse.de>
7361
7362         PR middle-end/35800
7363         * expr.h (try_casesi): Adjust prototype.
7364         * expr.c (try_casesi): Take fallback label as extra parameter.
7365         Use that for gen_casesi if default_label is NULL.
7366         * stmt.c (expand_case): Pass fallback label to try_casesi,
7367         make sure to fill gaps with a fallback label if default_label
7368         is not present.
7369
7370 2008-04-03  Dominique d'Humieres <dominiq@lps.ens.fr>
7371
7372         PR target/35801
7373         * config/rs6000/rs6000.c (rs6000_output_mi_thunk): Free cfun.
7374
7375 2008-04-03  Ben Elliston  <bje@au.ibm.com>
7376
7377         * expmed.c (extract_split_bit_field): Remove if (0) code.
7378         * tree-ssa-structalias.c (do_sd_constraint): Likewise.
7379         (do_ds_constraint): Likewise.
7380
7381 2008-04-02  Joseph Myers  <joseph@codesourcery.com>
7382
7383         * doc/cppopts.texi (-dU): Document.
7384         * c-common.h (flag_dump_macros): Update comment.
7385         * c-opts.c (handle_OPT_d): Handle -dU.
7386         * c-ppoutput.c (macro_queue, define_queue, undef_queue,
7387         dump_queued_macros, cb_used_define, cb_used_undef): New.
7388         (init_pp_output): Handle -dU.
7389         (cb_line_change): Call dump_queued_macros.
7390         * toplev.c (decode_d_option): Accept -dU as preprocessor option.
7391
7392 2008-04-02  Anatoly Sokolov <aesok@post.ru>
7393
7394         * config/avr/predicates.md (io_address_operand): New predicate. 
7395         * config/avr/avr-protos.h (avr_io_address_p): Remove declaration.
7396         * config/avr/avr.c (avr_io_address_p): Remove function.
7397         (out_movqi_r_mr): Use 'io_address_operand' predicate instead of 
7398         'avr_io_address_p' function.
7399         (out_movhi_r_mr): (Ditto.).
7400         (out_movqi_mr_r): (Ditto.).
7401         (out_movhi_mr_r): (Ditto.).
7402         (avr_address_cost): (Ditto.).
7403
7404 2008-04-02  Uros Bizjak  <ubizjak@gmail.com>
7405
7406         * config/i386/i386.md (*float<SSEMODEI24:mode><X87MODEF:mode>2_1):
7407         Emit gen_floatdi<X87MODEF:mode>2_i387_with_xmm for DImode values
7408         in 32bit mode when XMM registers are available to avoid store
7409         forwarding stalls.
7410         (floatdi<X87MODEF:mode>2_i387_with_xmm): New insn pattern and
7411         corresponding post-reload splitters.
7412
7413 2008-04-02  H.J. Lu  <hongjiu.lu@intel.com>
7414
7415         * config/i386/i386.c (bdesc_sse_3arg): Add __builtin_ia32_shufps
7416         and __builtin_ia32_shufpd.  Provide __builtin_ia32_roundsd and
7417         __builtin_ia32_roundss.
7418         (ix86_init_mmx_sse_builtins): Remove __builtin_ia32_shufps,
7419         __builtin_ia32_shufpd, __builtin_ia32_roundsd and
7420         __builtin_ia32_roundss.
7421         (ix86_expand_builtin): Don't handle IX86_BUILTIN_SHUFPS and
7422         IX86_BUILTIN_SHUFPD here.
7423
7424 2008-04-02  H.J. Lu  <hongjiu.lu@intel.com>
7425
7426         * config/i386/i386.md (plogic): New.
7427         (plogicprefix): Likewise.
7428
7429         * config/i386/mmx.md (mmx_<code><mode>3): New.
7430         (mmx_and<mode>3): Removed.
7431         (mmx_ior<mode>3): Likewise.
7432         (mmx_xor<mode>3): Likewise.
7433
7434         * config/i386/sse.md (<code><mode>3): New.
7435         (*<code><mode>3): Likewise.
7436         (*<code><mode>3): Likewise.
7437         (<code><mode>3): Likewise.
7438         (*sse_<code><mode>3): Likewise.
7439         (*sse2_<code><mode>3): Likewise.
7440         (<code>tf3): Likewise.
7441         (*<code>tf3): Likewise.
7442         (and<mode>3): Likewise.
7443         (*and<mode>3): Likewise.
7444         (ior<mode>3): Removed.
7445         (*ior<mode>3): Likewise.
7446         (xor<mode>3): Likewise.
7447         (*xor<mode>3): Likewise.
7448         (*and<mode>3): Likewise.
7449         (*ior<mode>3): Likewise.
7450         (*xor<mode>3): Likewise.
7451         (and<mode>3): Likewise.
7452         (*sse_and<mode>3): Likewise.
7453         (*sse2_and<mode>3): Likewise.
7454         (andtf3): Likewise.
7455         (*andtf3): Likewise.
7456         (ior<mode>3): Likewise.
7457         (*sse_ior<mode>3): Likewise.
7458         (*sse2_ior<mode>3): Likewise.
7459         (iortf3): Likewise.
7460         (*iortf3): Likewise.
7461         (xor<mode>3): Likewise.
7462         (*sse_xor<mode>3): Likewise.
7463         (*sse2_xor<mode>3): Likewise.
7464         (xortf3): Likewise.
7465         (*xortf3): Likewise.
7466
7467 2008-04-02  Richard Guenther  <rguenther@suse.de>
7468
7469         PR tree-optimization/14495
7470         PR tree-optimization/34793
7471         * tree-vrp.c (struct switch_update): New structure.
7472         (to_remove_edges, to_update_switch_stmts): New VECs.
7473         (simplify_switch_using_ranges): New function.  Remove not taken
7474         case labels and edges.
7475         (simplify_stmt_using_ranges): Call it.
7476         (identify_jump_threads): Mark edges we have queued for removal
7477         so we don't thread them.
7478         (execute_vrp): Remove edges queued for removal, update SWITCH_STMT
7479         case label vector.
7480         * tree-cfg.c (group_case_labels): Deal with missing default label.
7481         (tree_verify_flow_info): Allow missing default label.
7482         * stmt.c (emit_case_bit_tests): Deal with NULL default_label.
7483         (emit_case_nodes): Likewise.
7484         (expand_case): Do not rely on the default label to be present.
7485         * expr.c (try_casesi): Deal with NULL default_label.
7486         (do_tablejump): Likewise.
7487
7488 2008-04-02  Richard Guenther  <rguenther@suse.de>
7489
7490         PR tree-optimization/14495
7491         * tree-vrp.c (vrp_visit_cond_stmt): Do not handle
7492         SWITCH_EXPR here ...
7493         (vrp_visit_switch_stmt): ... but here (new function).
7494         (find_case_label_index): New helper function.
7495         (vrp_visit_stmt): Dispatch to vrp_visit_switch_stmt.
7496
7497 2008-04-02  Paolo Bonzini  <bonzini@gnu.org>
7498
7499         * fwprop.c: Fix ISO-C99ism.
7500
7501 2008-04-02  Paolo Bonzini  <bonzini@gnu.org>
7502
7503         PR bootstrap/35752
7504         * Makefile.in (objdir): Set it here.
7505         * configure.ac: Not here.  Find dynamic linker characteristics.
7506         * exec-tool.in: Use them.
7507         * aclocal.m4: Regenerate.
7508         * configure: Regenerate.
7509
7510 2008-04-02  Paolo Bonzini  <bonzini@gnu.org>
7511
7512         * expr.c (expand_var): Delete it.
7513         * expr.h (expand_var): Delete prototype.
7514         * function.c (expand_function_start): Use expand_decl instead.
7515         * cfgexpand.c (expand_one_static_var, expand_one_var): Don't call
7516         langhook.
7517
7518 2008-04-02  Andy Hutchinson <hutchinsonamdy@aim.com>
7519
7520         PR rtl-optimization/35542
7521         * fwprop.c (forward_propagate_and_simplify): Replace
7522         loc_reg_mentioned_in_p with reg_mentioned_p.
7523
7524 2008-04-02  Paolo Bonzini  <bonzini@gnu.org>
7525
7526         PR rtl-optimization/35281
7527         * fwprop.c (PR_CAN_APPEAR, PR_HANDLE_MEM): New.
7528         (propagate_rtx_1): Handle PR_HANDLE_MEM.
7529         (propagate_rtx): Pass PR_HANDLE_MEM if appropriate.
7530         (varying_mem_p): Move above propagate_rtx.
7531         (all_uses_available_at): Do not check MEMs.
7532
7533 2008-04-02  Rafael Espindola  <espindola@google.com>
7534
7535         * tree-vrp.c (extract_code_and_val_from_cond): Remove.
7536         (register_edge_assert_for_2): Split the cond argument.
7537         (register_edge_assert_for_1): Adjust for the change in
7538         register_edge_assert_for_2.
7539         (register_edge_assert_for): Split the cond argument.
7540         (find_switch_asserts): Adjust for the change in
7541         register_edge_assert_for.
7542
7543 2008-04-02  Kai Tietz  <kai.tietz@onevision.com>
7544
7545         * config.gcc: Add for x86_64-*-mingw* the t-crtfm to tbuild.
7546         * config/i386/cygming.h (ASM_OUTPUT_DWARF_OFFSET): Add 8 byte
7547         offsets for 64-bit mingw.
7548         * config/i386/i386.c (ix86_pass_by_reference): Correct calling
7549         abi for x86_64-pc-mingw.
7550
7551 2008-04-02  Richard Guenther  <rguenther@suse.de>
7552
7553         * tree-vrp.c (extract_range_from_assert): Make sure to not
7554         produce range min/max with TREE_OVERFOW set.
7555         If merging a anti-range and a range keep the anti-range if
7556         the range covers all values of the type.
7557         (register_edge_assert_for_2): Only allow sign-changing
7558         conversions in detecting canonical range checks.  Also
7559         register an assert for the unsigned name if useful.
7560
7561         PR tree-optimization/35787
7562         * tree-vrp.c (vrp_val_max): New function.
7563         (vrp_val_min): Likewise.
7564         (vrp_val_is_max): Move earlier, use vrp_val_{min,max}.
7565         (vrp_val_is_min): Likewise.
7566         (supports_overflow_infinity): Use vrp_val_{min,max}.
7567         (negative_overflow_infinity): Likewise.
7568         (positive_overflow_infinity): Likewise.
7569         (is_negative_overflow_infinity): Use vrp_val_is_{min,max}.
7570         (is_positive_overflow_infinity): Likewise.
7571         (is_overflow_infinity): Likewise.
7572         (avoid_overflow_infinity): Use vrp_val_{min,max} and
7573         vrp_val_is_{min,max}.
7574         (set_and_canonicalize_value_range): Canonicalize anti-ranges
7575         to ranges if possible.  Avoid empty ranges.
7576
7577 2008-04-01  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
7578
7579         PR middle-end/35705
7580         * fold-const.c (get_pointer_modulus_and_residue): Return modulus 1 if
7581         the expression is a function address.
7582
7583 2008-04-01  George Helffrich  <george@gcc.gnu.org>
7584
7585         PR fortran/35154, fortran/23057
7586         * dbxout.c: Emit .stabs debug info for Fortran COMMON block
7587         variables as base symbol name + offset using N_BCOMM/N_ECOMM.
7588         (is_fortran, dbxout_common_name, dbxout_common_check): New functions.
7589         (dbxout_symbol_location): Transform N_LCSYM to N_GSYM for storage
7590         in common.
7591         (dbxout_syms): Check for COMMON-based symbol and wrap in
7592         N_BCOMM/N_ECOMM stab bracket, including as many symbols as possible
7593         in bracket for efficiency.
7594
7595         * dwarf2out.c: Emit DWARF debug info for Fortran COMMON block
7596         using DW_TAG_common_block + member offset.
7597         (add_pubname_string): New function.
7598         (dw_expand_expr): New function to find block name and offset for
7599         COMMON var.
7600         (common_check): New function to check whether symbol in Fortran COMMON.
7601         (gen_variable_die): If COMMON, use DW_TAG_common_block.
7602
7603 2008-04-01  Volker Reichelt  <v.reichelt@netcologne.de>
7604
7605         PR c/35436
7606         * c-format.c (init_dynamic_gfc_info): Ignore invalid locus type.
7607
7608 2008-04-02  Ben Elliston  <bje@au.ibm.com>
7609
7610         * config/v850/v850.md (casesi): Remove if (0) code.
7611         * config/i386/uwin.h (ASM_DECLARE_FUNCTION_NAME): Likewise.
7612         * config/alpha/alpha.c (alpha_initialize_trampoline): Likewise.
7613
7614 2008-04-01  Uros Bizjak  <ubizjak@gmail.com>
7615
7616         * config/i386/i386.md (rex64suffix): New mode attribute.
7617         (floathi<mode>2): Disable expander for SSE math.
7618         (*floathi<mode>2_1): New insn insn_and_split pattern.
7619         (*floathi<mode>2_i387_with_temp): New macroized instruction pattern and
7620         corresponding post-reload splitters.
7621         (*floathi<mode>2_i387): New macroized insn pattern.
7622         (float<SSEMODEI24:mode><X87MODEF:mode>2): New macroized expander.
7623         (*float<SSEMODEI24:mode><X87MODEF:mode>2_1): New macroized
7624         insn_and_split pattern.
7625         (*floatsi<mode>2_vector_mixed_with_temp, *floatsi<mode>2_vector_mixed):
7626         New macroized instruction patterns and corresponding post-reload
7627         splitters.
7628         (*floatsi<mode>2_mixed_with_temp): New macroized instruction pattern
7629         and corresponding post-reload splitters.
7630         (*floatsi<mode>2_mixed_interunit, *floatsi<mode>2_mixed_nointerunit):
7631         New macroized instruction patterns.
7632         (*floatsi<mode>2_vector_sse_with_temp, *floatsi<mode>2_vector_sse): New
7633         macroized instruction patterns and corresponding post-reload splitters.
7634         (*floatsi<mode>2_sse_with_temp): New macroized instruction pattern and
7635         corresponding post-reload splitters.
7636         (*floatsi<mode>2_sse_interunit, *floatsi<mode>2_mixed_nointerunit):
7637         New macroized instruction patterns.
7638         (*floatsi<mode>2_i387_with_temp): New macroized instruction pattern and
7639         corresponding post-reload splitters.
7640         (*floatsi<mode>2_i387): New macroized instruction patterns.
7641
7642 2008-04-01  H.J. Lu  <hongjiu.lu@intel.com>
7643
7644         * config/i386/i386.md (smaxmin): New.
7645         (umaxmin): Likewise.
7646         (maxminiprefix): Likewise.
7647         (maxminfprefix): Likewise.
7648         (<code><mode>3): Likewise.
7649         (smin<mode>3): Removed.
7650         (smax<mode>3): Likewise.
7651
7652         * config/i386/mmx.md (mmx_<code>v2sf3): New.
7653         (mmx_<code>v4hi3): Likewise.
7654         (mmx_<code>v8qi3): Likewise.
7655         (mmx_smaxv2sf3): Removed.
7656         (mmx_sminv2sf3): Likewise.
7657         (mmx_umaxv8qi3): Likewise.
7658         (mmx_smaxv4hi3): Likewise.
7659         (mmx_uminv8qi3): Likewise.
7660         (mmx_sminv4hi3): Likewise.
7661
7662         * config/i386/sse.md (<addsub><mode>3): New.
7663         (*<addsub><mode>3): Likewise.
7664         (<sse>_vm<addsub><mode>3): Likewise.
7665         (<maxmin><mode>3): Likewise.
7666         (*<maxmin><mode>3_finite): Likewise.
7667         (*<maxmin><mode>3): Likewise.
7668         (<sse>_vm<maxmin><mode>3): Likewise.
7669         (sse3_h<addsub>v4sf3): Likewise.
7670         (sse3_h<addsub>v2df3): Likewise.
7671         (<maxmin>v16qi3): Likewise.
7672         (*<maxmin>v16qi3): Likewise.
7673         (<maxmin>v8hi3): Likewise.
7674         (*<maxmin>v8hi3): Likewise.
7675         (*sse4_1_<maxmin><mode>3): Likewise.
7676         (*sse4_1_<maxmin><mode>3): Likewise.
7677         (add<mode>3): Removed.
7678         (*add<mode>3): Likewise.
7679         (<sse>_vmadd<mode>3): Likewise.
7680         (sub<mode>3): Likewise.
7681         (*sub<mode>3): Likewise.
7682         (<sse>_vmsub<mode>3): Likewise.
7683         (smin<mode>3): Likewise.
7684         (*smin<mode>3_finite): Likewise.
7685         (*smin<mode>3): Likewise.
7686         (<sse>_vmsmin<mode>3): Likewise.
7687         (smax<mode>3): Likewise.
7688         (*smax<mode>3_finite): Likewise.
7689         (*smax<mode>3): Likewise.
7690         (<sse>_vmsmax<mode>3): Likewise.
7691         (sse3_haddv4sf3): Likewise.
7692         (sse3_haddv2df3): Likewise.
7693         (sse3_hsubv4sf3): Likewise.
7694         (sse3_hsubv2df3): Likewise.
7695         (umaxv16qi3): Likewise.
7696         (*umaxv16qi3): Likewise.
7697         (smaxv8hi3): Likewise.
7698         (*smaxv8hi3): Likewise.
7699         (*sse4_1_smax<mode>3): Likewise.
7700         (*sse4_1_umax<mode>3): Likewise.
7701         (uminv16qi3): Likewise.
7702         (*uminv16qi3): Likewise.
7703         (sminv8hi3): Likewise.
7704         (*sminv8hi3): Likewise.
7705         (*sse4_1_smin<mode>3): Likewise.
7706         (*sse4_1_umin<mode>3): Likewise.
7707
7708 2008-04-01  Rafael Espindola  <espindola@google.com>
7709
7710         * tree-cfg.c (verify_expr): remove in_phi.
7711         (verify_stmt): Don't call walk_tree with verify_expr. Use
7712         is_gimple_min_invariant instead of is_gimple_val.
7713
7714 2008-04-01  Joseph Myers  <joseph@codesourcery.com>
7715
7716         * doc/include/gpl_v3.texi: Update for manpage generation.
7717         * doc/gcc.texi, doc/gccint.texi: Include gpl_v3.texi instead of
7718         gpl.texi.
7719         * doc/sourcebuild.texi: Document gpl_v3.texi as well as gpl.texi.
7720         * Makefile.in (TEXI_GCC_FILES, TEXI_GCCINT_FILES): Include
7721         gpl_v3.texi instead of gpl.texi.
7722         (gpl.pod): New.
7723
7724 2008-04-01  Jakub Jelinek  <jakub@redhat.com>
7725
7726         PR pch/13675
7727         * c-pch.c (c_common_read_pch): On error close (fd) resp. fclose (f).
7728
7729 2008-04-01  Rafael Espindola  <espindola@google.com>
7730
7731         * tree-vrp.c (extract_code_and_val_from_cond_with_ops): New.
7732         (extract_code_and_val_from_cond): Use
7733         extract_code_and_val_from_cond_with_ops.
7734
7735 2008-04-01  Jan Hubicka  <jh@suse.cz>
7736
7737         * function.c (free_after_compilation): Free epilogue_delay_list.
7738         (prepare_function_start): Assert that previous compilation was freed.
7739
7740 2008-04-01  Jan Hubicka  <jh@suse.cz>
7741             Jim Wilson  <wilson@tuliptree.org>
7742             Andreas Tobler <andreast@gcc.gnu.org>
7743
7744         PR middle-end/35781
7745         * m32c/m32.c (m32c_leaf_function_p, m32c_function_needs_enter): Use
7746         rtl.emit instead cfun->emit.
7747         * sparc/sparc.h (INIT_EXPANDERS): Likewise.
7748         * ia64/ia64.h (INIT_EXPANDERS): Likewise.
7749
7750 2008-04-01  Ben Elliston  <bje@au.ibm.com>
7751
7752         * doc/c-tree.texi (Function Basics): Fix grammatical error.
7753
7754 2008-03-31  Seongbae Park <seongbae.park@gmail.com>
7755
7756         * common.opt (fprofile-dir=, fprofile-use=, fprofile-generate=):
7757         New options
7758         (fprofile-use): Add var flag_profile_use
7759         * coverage.c (coverage_begin_output): Do not open a gcno file for
7760         output only if -ftest-coverage is set.
7761         Do not add getpwd() to gcda file path.
7762         (build_gcov_info): Check the new flag
7763         flag_profile_datafile_relative_path.
7764         (coverage_init): Use profile_data_prefix.
7765         Read profile counter only if flag_profile_use is set.
7766         * opts.c (common_handle_option): New option fprofile-use=,
7767         fprofile-dir=, fprofile-generate=.
7768         * toplev.c (profile_data_prefix): New variable definition.
7769         * toplev.h (profile_data_prefix): New declaration.
7770         * doc/invoke.tex (Option Summary, Optimization Options):
7771         Add new options.
7772
7773 2008-03-31  James E. Wilson  <wilson@tuliptree.org>
7774
7775         * varasm.c (output_constant_pool_1): In LABEL_REF check,
7776         use tmp consistently.
7777
7778         PR target/35695
7779         * config/ia64/div.md (recip_approx_rf): Use UNSPEC not DIV.
7780         * config/ia64/ia64.c (rtx_needs_barrier): Handle
7781         UNSPEC_FR_RECIP_APPROX_RES.
7782         * config/ia64/ia64.md (UNSPEC_FR_RECIP_APPROX_RES): Define.
7783
7784 2008-03-31  Volker Reichelt  <v.reichelt@netcologne.de>
7785
7786         PR c/35750
7787         * c-decl.c (store_parm_decls_oldstyle): Skip invalid parameters.
7788
7789 2008-03-31  Andrew Pinski  <andrew_pinski@playstation.sony.com>
7790
7791         PR middle-end/30186
7792         * fold-const.c (fold_indirect_ref_1): Support accessing non first
7793         element of the vector via a pointer.
7794
7795 2008-03-31  Ian Lance Taylor  <iant@google.com>
7796
7797         * tlink.c (scan_linker_output): Look for symbol name in single quotes.
7798
7799 2008-03-31  Jan Hubicka  <jh@suse.cz>
7800
7801         * builtins.c (expand_builtin_setjmp_receiver): Update call of
7802         get_arg_pointer_save_area.
7803         * expr.c (init_expr): Just clear out rtl.expr.
7804         * function.c (free_after_compilation): Clear out whole RTL structure.
7805         (get_func_frame_size): Merge into ...
7806         (get_frame_size): ... this one.
7807         (assign_stack_local_1): Merge into ...
7808         (assign_stack_local): ... this one.
7809         (expand_function_end): Update call of get_arg_pointer_save_area.
7810         (get_art_pointer_save_area): Remove cfun argument.
7811         * function.h (emit_status): regno_pointer_align does not need length
7812         attribute. Move x_regno_reg_rtx to ...
7813         (regno_reg_rtx): ... new global array.
7814         (reg_rtx_no, seq_stack, REGNO_POINTER_ALIGN): Update accestors.
7815         (pending_stack_adjust, inhibit_defer_pop, saveregs_value,
7816         apply_args_value, forced_labels, stack_pointer_delta):
7817         Update accestors.
7818         (struct varasm_status): Move here from varasm.c
7819         (struct rtl_data): New. Move here some fields from struct function.
7820         (return_label, naked_return_label, stack_slot_list, parm_birth_insn,
7821         frame_offset, stack_check_probe_note, arg_pointer_save_area,
7822         used_temp_slots avail_temp_slots, temp_slot_level,
7823         nonlocal_goto_handler_labels): Update accesstors.
7824         (rtl): New global variable.
7825         (struct function): Move some fileds to rtl_data.
7826         (get_arg_pointer_save_area): Update prototype.
7827         * emit-rtl.c (rtl): Declare.
7828         (regno_reg_rtx): Declare.
7829         (first_insn, last_insn, cur_insn_uid, last_location, first_label_num):
7830         Update.
7831         (gen_reg_rtx): Update.
7832         (init_virtual_regs): Do not tate emit_status argument.
7833         (init_emit): Do not allocate emit.
7834         * varasm.c (varasm_statuc): Move to function.h.
7835         (n_deferred_constatns): Update accestor.
7836         (init_varasm_status): Do not allocate varasm_status.
7837         (force_const_mem, get_pool_size, output_constant_pool): Update.
7838         * stmt.c (force_label_rtx): Do not use x_ prefixes.
7839         (expand_nl_goto_receiver): Update get_arg_pointer_save_area.
7840
7841 2008-03-31  Zdenek Dvorak  <ook@ucw.cz>
7842
7843         PR rtl-optimization/35729
7844         * loop-invariant.c (check_maybe_invariant): Disallow volatile memory
7845         references.
7846
7847 2008-03-31  H.J. Lu  <hongjiu.lu@intel.com>
7848
7849         PR target/32000
7850         * config/i386/i386.md (*movti_internal): Emit unaligned SSE
7851         load/store if memory is unaligned.
7852         (*movti_rex64): Likewise.
7853
7854         * config/i386/predicates.md (misaligned_operand): New.
7855
7856 2008-03-31  Andrew Pinski  <pinskia@gmail.com>
7857
7858         PR tree-opt/35431
7859         * tree-ssa-phiopt.c (conditional_replacement): Return early for
7860         complex types.
7861
7862 2008-03-31  Jan Beulich  <jbeulich@novell.com>
7863
7864         * config/ia64/constraints.md: Add 'j' constraint.
7865         * config/ia64/ia64.md (movsi_internal): Add addp4 case.
7866         (movdi_internal): Likewise.
7867
7868 2008-03-30  Volker Reichelt  <v.reichelt@netcologne.de>
7869
7870         PR c/35748
7871         * c-typeck.c (build_c_cast): Skip invalid fields in unions.
7872
7873 2008-03-30  H.J. Lu  <hongjiu.lu@intel.com>
7874
7875         PR target/35757
7876         * config/i386/i386.c (ix86_expand_sse_4_operands_builtin): Issue
7877         proper error message for the third argument on blendpd and
7878         blendps.
7879
7880         * config/i386/sse.md (blendbits): New.
7881         (sse4_1_blendp<ssemodesuffixf2c>): Use it.
7882
7883 2008-03-30  Eric Botcazou  <ebotcazou@adacore.com>
7884
7885         * fold-const.c (fold_binary) <BIT_IOR_EXPR>: Add missing conversions.
7886
7887 2008-03-30  Richard Guenther  <rguenther@suse.de>
7888
7889         PR middle-end/31023
7890         * fold-const.c (fold_sign_changed_comparison): Do leave
7891         conversions to base-types alone.
7892
7893 2008-03-29  Andrew Pinski  <andrew_pinski@playstation.sony.com>
7894
7895         * config/rs6000/rs6000.c (rs6000_stack_info): Don't force saving of
7896         the link register if one altivec register is be saved.
7897
7898 2008-03-30  Ben Elliston  <bje@au.ibm.com>
7899
7900         * final.c (final_scan_insn): Remove if (0) code.
7901
7902 2008-03-28  Volker Reichelt  <v.reichelt@netcologne.de>
7903
7904         * c-parser.c (c_parser_next_token_is_keyword): Simplify.
7905
7906 2008-03-28  H.J. Lu  <hongjiu.lu@intel.com>
7907
7908         * config/i386/sse.md (*and<mode>3): Pass <MODE>mode instead
7909         of V4SFmode to ix86_binary_operator_ok.
7910
7911 2008-03-28  Uros Bizjak  <ubizjak@gmail.com>
7912
7913         * config/i386/i386.c (override_options): Initialize
7914         ix86_veclib_handler to ix86_veclibabi_svml when
7915         -mveclibabi=svml is used.
7916         (ix86_veclibabi_svml): New function for SVML ABI style
7917         vectorization support.
7918         * doc/invoke.texi (-mveclibabi) [svml]: Document new target option.
7919
7920 2008-03-28  Rafael Espindola  <espindola@google.com>
7921
7922         * fold-const.c (tree_unary_nonnegative_warnv_p): Make it public.
7923         (tree_binary_nonnegative_warnv_p): Make it public.
7924         (tree_single_nonnegative_warnv_p): Make it public.
7925         (tree_invalid_nonnegative_warnv_p): Make it public.
7926         (tree_unary_nonzero_warnv_p): Make it public.
7927         (tree_binary_nonzero_warnv_p): Make it public
7928         (tree_single_nonzero_warnv_p): Make it public.
7929         * tree-vrp.c (vrp_evaluate_conditional_warnv_with_ops): New function.
7930         (extract_range_from_binary_expr): Split the expr argument.
7931         (extract_range_from_unary_expr): Split the expr argument.
7932         (extract_range_from_comparison): Split the expr argument.
7933         (extract_range_from_expr): Use the new aux functions.
7934         (vrp_evaluate_conditional_warnv): Use
7935         vrp_evaluate_conditional_warnv_with_ops.
7936         * tree.h (tree_unary_nonzero_warnv_p): Declare.
7937         (tree_binary_nonzero_warnv_p): Declare.
7938         (tree_single_nonzero_warnv_p): Declare.
7939         (tree_expr_nonzero_warnv_p): Declare.
7940         (tree_unary_nonnegative_warnv_p): Declare.
7941         (tree_binary_nonnegative_warnv_p): Declare.
7942         (tree_single_nonnegative_warnv_p): Declare.
7943         (tree_invalid_nonnegative_warnv_p): Declare.
7944
7945 2008-03-28  Richard Guenther  <rguenther@suse.de>
7946
7947         PR tree-optimization/30317
7948         PR tree-optimization/30911
7949         PR tree-optimization/34793
7950         * tree-vrp.c (set_and_canonicalize_value_range): New function.
7951         (struct assert_locus_d): New member EXPR.
7952         (register_new_assert_for): Add EXPR parameter to support
7953         ASSERT_EXPR <name, expr OP limit>.
7954         (register_edge_assert_for_1): Adjust callers.
7955         (find_assert_locations): Likewise.
7956         (process_assert_insertions_for): Build condition from expression.
7957         (extract_range_from_assert): Handle ASSERT_EXPRs
7958         of the form ASSERT_EXPR <name, expr OP limit>.
7959         (register_edge_assert_for_2): New helper registering
7960         asserts for comparisons.  Recognize range tests of the form
7961         (unsigned)i - CST1 OP CST2.
7962         (register_edge_assert_for_1): Use it.
7963         (register_edge_assert_for): Likewise.
7964         (needs_overflow_infinity): Integer sub-types
7965         do not need overflow infinities.
7966         (vrp_val_is_max): The extreme values of integer sub-types
7967         are those of the base type.
7968         (vrp_val_is_min): Likewise.
7969         * tree.def (ASSERT_EXPR): Document extra allowed conditional
7970         expressions.
7971
7972 2008-03-28  Nick Clifton  <nickc@redhat.com>
7973
7974         PR target/31110
7975         * config/mn10300/mn10300.c (mn10300_secondary_reload_class):
7976         Return GENERAL_REGS for stack adjustment reloads.
7977
7978 2008-03-28  Andrew Pinski  <andrew_pinski@playstation.sony.com>
7979
7980         PR target/31334
7981         * config/rs6000/rs6000.c (rs6000_expand_vector_init): Create a
7982         const_vector when all the vectors are constant.
7983
7984 2008-03-27  Bob Wilson  <bob.wilson@acm.org>
7985
7986         * config/xtensa/xtensa.c (gen_float_relational): Handle unordered
7987         comparisons.
7988         * config/xtensa/xtensa.md (any_cond): Add unordered comparisons.
7989         (any_scc_sf): Add uneq, unlt, unle and unordered operators.
7990         (scc_sf): New.
7991         (s<code>_sf): Use new scc_sf attribute for opcode names.
7992
7993 2008-03-27  Tom Tromey  <tromey@redhat.com>
7994
7995         * doc/sourcebuild.texi, doc/install.texi, configure, aclocal.m4,
7996         configure.ac, Makefile.in, config/t-darwin, config/m32c/t-m32c,
7997         config/spu/t-spu-elf, config/i386/t-interix,
7998         config/i386/t-cygming, config/i386/x-i386, config/i386/t-cygwin,
7999         config/i386/x-darwin, config/i386/x-mingw32,
8000         config/i386/t-netware, config/i386/x-cygwin, config/i386/t-nwld,
8001         config/sh/t-sh, config/sh/t-symbian, config/x-linux,
8002         config/t-sol2, config/x-hpux, config/x-darwin, config/ia64/t-ia64,
8003         config/x-solaris, config/t-vxworks, config/m68k/t-uclinux,
8004         config/rs6000/x-rs6000, config/rs6000/x-darwin64,
8005         config/rs6000/x-darwin, config/rs6000/t-rs6000,
8006         config/score/t-score-elf, config/arm/t-strongarm-pe,
8007         config/arm/t-pe, config/arm/t-arm, config/arm/t-wince-pe,
8008         config/v850/t-v850, config/v850/t-v850e, config/bfin/t-bfin-linux:
8009         Revert automatic dependency patch.
8010
8011 2008-03-27  H.J. Lu  <hongjiu.lu@intel.com>
8012
8013         PR target/35657
8014         * config/i386/i386.c (ix86_function_arg_boundary): Align
8015         decimal floating point to its natural boundary.
8016
8017 2008-03-27  Richard Guenther  <rguenther@suse.de>
8018
8019         PR middle-end/35716
8020         * fold-const.c (fold_comparison): Restrict distinct decl
8021         comparison folding to VAR_DECLs and PARM_DECLs.  Do not
8022         solely rely on operand_equal_p.
8023
8024 2008-03-27  Richard Guenther  <rguenther@suse.de>
8025
8026         PR c/32511
8027         * c-common.c (handle_weak_attribute): Reject combination of
8028         weak and inline.
8029
8030 2008-03-27  Richard Guenther  <rguenther@suse.de>
8031
8032         PR tree-optimization/32810
8033         * tree-ssa-ccp.c (get_symbol_constant_value): Strip useless
8034         conversions from DECL_INITIAL.
8035         (fold_const_aggregate_ref): Likewise from constructor elements.
8036
8037 2008-03-27  Zdenek Dvorak  <ook@ucw.cz>
8038
8039         * tree-affine.h (aff_combination_expand): Declare.
8040         (get_inner_reference_aff): Likewise.
8041         * tree-affine.c (aff_combination_expand): Split out from
8042         tree_to_aff_combination_expand.
8043         (get_inner_reference_aff): New function.
8044         * tree-parloops.c (loop_parallel_p): Free vectorizer info.
8045         * tree-ssa-loop-im.c: Include tree-affine.h and pointer-set.h.
8046         (struct lim_aux_data): sm_done field removed.
8047         (mem_ref_loc_p, mem_ref_locs_p): New types.
8048         (struct mem_ref): Added id, stored, accesses_in_loop,
8049         indep_loop, dep_loop, indep_ref, dep_ref fields.
8050         Removed is_stored, locs and next fields.
8051         (memory_accesses): New variable.
8052         (movement_possibility): Do not allow moving statements
8053         that store to memory.
8054         (outermost_indep_loop, simple_mem_ref_in_stmt, mem_ref_in_stmt):
8055         New functions.
8056         (determine_max_movement): For statements with memory references,
8057         find the outermost loop in that the reference is independent.
8058         (move_computations_stmt): Mark the virtual operands for renaming.
8059         (memref_free, mem_ref_alloc, mem_ref_locs_alloc, mark_ref_stored,
8060         gather_mem_refs_stmt, gather_mem_refs_in_loops, vtoe_hash, vtoe_eq,
8061         vtoe_free, record_vop_access, get_vop_accesses, get_vop_stores,
8062         add_vop_ref_mapping, create_vop_ref_mapping_loop,
8063         create_vop_ref_mapping, analyze_memory_references,
8064         cannot_overlap_p, mem_refs_may_alias_p, rewrite_mem_ref_loc,
8065         get_all_locs_in_loop, ref_always_accessed_p,
8066         refs_independent_p, record_indep_loop, ref_indep_loop_p_1,
8067         ref_indep_loop_p, can_sm_ref_p, find_refs_for_sm,
8068         store_motion_loop, store_motion): New functions.
8069         (struct vop_to_refs_elt): New type.
8070         (record_mem_ref_loc, free_mem_ref_locs, rewrite_mem_refs,
8071         memref_hash, memref_eq, hoist_memory_references): Rewritten.
8072         (schedule_sm): Replaced by...
8073         (execute_sm): ... this.
8074         (determine_lsm_ref, hoist_memory_references,
8075         loop_suitable_for_sm, gather_mem_refs_stmt, gather_mem_refs,
8076         find_more_ref_vops, free_mem_ref, free_mem_refs,
8077         determine_lsm_loop, determine_lsm): Removed.
8078         (tree_ssa_lim_finalize): Free data structures used by store motion.
8079         (tree_ssa_lim): Call analyze_memory_references.  Use
8080         store_motion instead of determine_lsm.
8081
8082 2008-03-27  Paolo Bonzini  <bonzini@gnu.org>
8083
8084         * config.cc (m68hc11, m6811, m68hc12, m6812): Add usegas.h,
8085         rename tmake_file to m68hc11/t-m68hc11.
8086         (mcore): Set inhibit_libc to true.
8087         * config.host (alpha*-dec-*vms*): Set extra_programs.
8088         (interix3*): Don't use host_xmake_file.
8089         * configure.ac: Let config.gcc override inhibit_libc.
8090         * configure: Regenerate.
8091
8092         * config/alpha/x-vms (EXTRA_PROGRAMS): Remove.
8093         * config/t-openbsd-thread: Remove commented out lines.
8094         
8095         * config/x-interix: Remove.
8096
8097         * config/m68hc11/t-m68hc11-gas: Rename to...
8098         * config/m68hc11/t-m68hc11: ... this.  Remove T_CPPFLAGS.
8099
8100         * config/mcore/t-mcore: Remove T_CFLAGS.
8101         * config/mcore/t-mcore-pe: Likewise.
8102
8103 2008-03-27  Paolo Bonzini  <bonzini@gnu.org>
8104
8105         * configure.ac: Replace custom __GNU_SOURCE test with
8106         AC_USE_SYSTEM_EXTENSIONS.  Move it earlier.
8107         * aclocal.m4: Regenerate.
8108         * configure: Regenerate.
8109         * config.in: Regenerate.
8110
8111 2008-03-27  Richard Guenther  <rguenther@suse.de>
8112
8113         * fold-const.c (target.h): Include.
8114         (fold_comparison): Fold comparison of addresses of decls
8115         that bind locally or of constants.  Consolidate address folding code.
8116         * tree-vrp.c (operand_less_p): Deal with non-INTEGER_CST
8117         results from fold_binary_to_constant.
8118         (compare_values_warnv): Likewise.
8119
8120 2008-03-27  Andrew Pinski  <pinskia@gmail.com>
8121
8122         PR middle-end/35429
8123         * fold-const.c (fold_truthop): Check for integeral types when folding
8124         a == 0 && b == 0 and a != 0 || b != 0 .
8125
8126 2008-03-26  Eric Botcazou  <ebotcazou@adacore.com>
8127
8128         * tree.c (get_unwidened): Remove code fiddling with COMPONENT_REF.
8129
8130 2008-03-26  Andreas Schwab  <schwab@suse.de>
8131
8132         * doc/invoke.texi: Fix use of @item vs. @itemx.
8133
8134 2008-03-26  Tom Tromey  <tromey@redhat.com>
8135
8136         * Makefile.in (build/gensupport.o, build/print-rtl.o,
8137         build/read-rtl.o, build/rtl.o, build/gencondmd.o, build/genattr.o,
8138         build/genattrtab.o, build/genautomata.o, build/gencheck.o,
8139         build/gencodes.o, build/genconditions.o, build/genconfig.o,
8140         build/genconstants.o, build/genemit.o, build/genextract.o,
8141         build/genflags.o, build/genmddeps.o, build/genopinit.o,
8142         build/genoutput.o, build/genpeep.o, build/genrecog.o): Depend on
8143         options.h.
8144
8145 2008-03-26  Richard Guenther  <rguenther@suse.de>
8146
8147         Revert
8148         2008-03-26  Richard Guenther  <rguenther@suse.de>
8149
8150         * fold-const.c (target.h): Include.
8151         (fold_comparison): Fold comparison of addresses of two decls
8152         that bind locally.  Consolidate address folding code.
8153
8154 2008-03-26  Kaveh R. Ghazi  <ghazi@caip.rutgers.edu>
8155
8156         * builtins.c (expand_builtin_pow, fold_builtin_cabs,
8157         fold_builtin_sqrt, fold_builtin_cbrt, fold_builtin_logarithm,
8158         fold_builtin_hypot, fold_builtin_pow): Remove uses of dconst3,
8159         dconstsqrt2, dconstthird, dconste and/or dconst10.
8160         * config/i386/i386.c (ix86_emit_swsqrtsf): Likewise.
8161         * emit-rtl.c (dconst3, dconst10, dconstm2, dconstthird,
8162         dconstsqrt2, dconste): Delete.
8163         (init_emit_once): Likewise.  Simplify initializing dconstm1.
8164         Constify variable.
8165         * real.c (get_real_const): New.
8166         * real.h (dconst3, dconst10, dconstm2, dconstthird,
8167         dconstsqrt2, dconste): Delete.
8168         (real_value_const, get_real_const): New.
8169
8170 2008-03-26  H.J. Lu  <hongjiu.lu@intel.com>
8171
8172         * config/i386/cygming.h (BIGGEST_ALIGNMENT): Removed.
8173
8174         * config/i386/i386.c (ix86_function_arg_boundary): Check
8175         BIGGEST_ALIGNMENT instead of 128.
8176         (setup_incoming_varargs_64): Likewise.
8177
8178 2008-03-26  Tom Tromey  <tromey@redhat.com>
8179
8180         * Makefile.in (DEPFILES): Add missing '/'.
8181
8182 2008-03-26  Richard Guenther  <rguenther@suse.de>
8183
8184         * fold-const.c (target.h): Include.
8185         (fold_comparison): Fold comparison of addresses of two decls
8186         that bind locally.  Consolidate address folding code.
8187
8188 2008-03-26  Nick Clifton  <nickc@redhat.com>
8189
8190         PR target/31232
8191         * config/stormy16/stormy16.c (xstormy16_legitimate_address_p): Do
8192         not allow INT+INT as a legitimate addressing mode.
8193
8194 2008-03-26  Richard Guenther  <rguenther@suse.de>
8195
8196         * tree-flow.h (widen_bitfield): Remove declaration.
8197         * tree-ssa-ccp.c (visit_assignment): Remove unneeded code.
8198         (widen_bitfield): Remove function.
8199         * tree-ssa-dom.c (record_equivalences_from_stmt): Remove unneeded
8200         code.
8201
8202 2008-03-25  Andrew Pinski  <andrew_pinski@playstation.sony.com>
8203
8204         PR target/31558
8205         * config/rs6000/rs6000-c.c (rs6000_builtin_type_compatible): Handle
8206         error_mark_node's.
8207
8208 2008-03-25  Richard Sandiford  <rsandifo@nildram.co.uk>
8209
8210         PR rtl-optimization/35232
8211         * reload1.c (reg_reloaded_call_part_clobbered): Clarify comment.
8212         (forget_old_reloads_1, forget_marked_reloads): Don't clear
8213         reg_reloaded_call_part_clobbered here.
8214         (reload_regs_reach_end_p): New function.
8215         (reload_reg_rtx_for_input): New variable.
8216         (reload_reg_rtx_for_output): Likewise.
8217         (emit_input_reload_insns): Use reloadreg rather than rl->reg_rtx
8218         when reassigning a pseudo register.  Load reloadreg from 
8219         reload_reg_rtx_for_input, moving the mode and register
8220         calculation to...
8221         (do_input_reload): ...here.  Use the mode-adjusted reg_rtx
8222         instead of the original when deciding whether an input reload
8223         would be a no-op or whether an output reload can be deleted.
8224         (emit_output_reload_insns): Use the mode-adjusted reg_rtx
8225         when setting up new_spill_reg_store.  Load it from
8226         reload_reg_rtx_for_output, moving the mode and register
8227         calculation to...
8228         (do_output_reload): ...here.  Use the mode-adjusted reg_rtx
8229         instead of the original when deciding whether an output reload
8230         would be a no-op.  Do the same when modifying insn notes.
8231         Use rtx_equal_p instead of == to compare the registers.
8232         (inherit_piecemeal_p): Take a mode and two register numbers
8233         as argument.
8234         (emit_reload_insns): Clear new_spill_reg_store for every hard
8235         register in the reload register.  Remove spill registers
8236         from reg_reloaded_valid before considering whether to record
8237         inheritance information for them.  Use reload_reg_rtx_for_output
8238         instead of reg_rtx when recording output reloads.  Use
8239         reload_reg_rtx_for_input instead of reg_rtx when recording
8240         input reloads.  Set or clear reg_reloaded_call_part_clobbered
8241         at the same time as setting reg_reloaded_valid.
8242         (delete_output_reload): Add a new_reload_reg parameter and use it
8243         instead of rld[j].reg_rtx.
8244         (emit_input_reload_insns, do_input_reload, do_output_reload): Adjust
8245         calls accordingly.
8246
8247 2008-03-25  Tom Tromey  <tromey@redhat.com>
8248
8249         * Makefile.in (build/gensupport.o): Depend on insn-modes.h.
8250         (build/genattr.o): Likewise.
8251         (build/genattrtab.o): Likewise.
8252         (build/gencodes.o): Likewise.
8253         (build/genconfig.o): Likewise.
8254         (build/genconstants.o): Likewise.
8255         (build/genemit.o): Likewise.
8256         (build/genextract.o): Likewise.
8257         (build/genflags.o): Likewise.
8258
8259 2008-03-25  Bob Wilson  <bob.wilson@acm.org>
8260         
8261         * config/xtensa/xtensa.c (xtensa_va_start): Use build_int_cst
8262         instead of size_int for integer types.
8263         (xtensa_gimplify_va_arg_expr): Likewise.  Convert index to sizetype
8264         to match type of MINUS_EXPR.
8265         
8266 2008-03-25  Tom Tromey  <tromey@redhat.com>
8267
8268         * configure: Rebuilt.
8269         * configure.ac (BUILD_DEPMODE): Extract CCDEPMODE from temporary
8270         Makefile.
8271
8272 2008-03-25  Tom Tromey  <tromey@redhat.com>
8273
8274         * config/x-solaris (host-solaris.o): Update.
8275         * config/x-linux (host-linux.o): Update.
8276         * config/x-hpux (host-hpux.o): Update.
8277         * config/x-darwin (host-darwin.o): Update.
8278         * config/v850/t-v850e (v850-c.o): Update.
8279         * config/v850/t-v850 (v850-c.o): Update.
8280         * config/t-vxworks (vxworks.o): Update.
8281         * config/t-sol2 (sol2-c.o, sol2.o): Update.
8282         * config/t-darwin (darwin.o, darwin-c.o, darwin-driver.o): Update.
8283         * config/spu/t-spu-elf (spu-c.o): Update.
8284         (spu.o): Remove.
8285         * config/sh/t-symbian (sh-c.o): Update.
8286         (symbian.o): Update.
8287         * config/sh/t-sh (sh-c.o): Update.
8288         * config/score/t-score-elf (score7.o, score3.o): Update.
8289         * config/rs6000/x-rs6000 (driver-rs6000.o): Update.
8290         * config/rs6000/x-darwin64 (host-ppc64-darwin.o): Update.
8291         * config/rs6000/x-darwin (host-ppc-darwin.o): Update.
8292         * config/rs6000/t-rs6000 (rs6000-c.o): Update.
8293         (rs6000.o): Remove.
8294         * config/m68k/t-uclinux (generated_files): Add sysroot-suffix.h.
8295         * config/m32c/t-m32c (m32c-pragma.o): Update.
8296         * config/ia64/t-ia64 (ia64-c.o): Update.
8297         * config/i386/x-mingw32 (host-mingw32.o): Update.
8298         * config/i386/x-i386 (driver-i386.o): Update.
8299         * config/i386/x-darwin (host-i386-darwin.o): Update.
8300         * config/i386/x-cygwin (host-cygwin.o): Update.
8301         * config/i386/t-nwld (nwld.o): Update.
8302         * config/i386/t-netware (netware.o): Update.
8303         * config/i386/t-interix (winnt.o): Update.
8304         * config/i386/t-cygwin (cygwin1.o, cygwin2.o): Update.
8305         * config/i386/t-cygming (winnt.o, winnt-cxx.o, winnt-stubs.o,
8306         msformat-c.o): Update.
8307         * config/bfin/t-bfin-linux (generated_files): Add
8308         linux-sysroot-suffix.h.
8309         * config/arm/t-wince-pe (pe.o): Update.
8310         * config/arm/t-strongarm-pe (pe.o): Update.
8311         * config/arm/t-pe (pe.o): Update.
8312         * config/arm/t-arm (arm-c.o): Update.
8313         * doc/install.texi (Prerequisites): Require make 3.80.
8314         * Makefile.in: Remove .o targets.
8315         (CCDEPMODE, DEPDIR, depcomp, BUILD_DEPMODE): New variables.
8316         (OBSTACK_H, FIBHEAP_H, PARTITION_H, MD5_H, BCONFIG_H): Remove.
8317         (simple_generated_h, simple_generated_c): Move earlier.
8318         (generated_files): New variable.
8319         (TARGET_H, MACHMODE_H, HOOKS_H, HOSTHOOKS_DEF_H, LANGHOOKS_DEF_H,
8320         TARGET_DEF_H, RTL_BASE_H, RTL_H, PARAMS_H, BUILTINS_DEF, TREE_H,
8321         BASIC_BLOCK_H, GCOV_IO_H, COVERAGE_H, DEMANGLE_H, RECOG_H,
8322         ALIAS_H, EMIT_RTL_H, FLAGS_H, FUNCTION_H, EXPR_H, OPTABS_H,
8323         REGS_H, RA_H, RESOURCE_H, SCHED_INT_H, INTEGRATE_H, CFGLAYOUT_H,
8324         CFGLOOP_H, IPA_UTILS_H, IPA_REFERENCE_H, IPA_TYPE_ESCAPE_H,
8325         CGRAPH_H, DF_H, RESOURCE_H, DDG_H, GCC_H, GGC_H, TIMEVAR_H,
8326         INSN_ATTR_H, C_COMMON_H, C_PRAGMA_H, C_TREE_H, SYSTEM_H,
8327         PREDICT_H, DECNUM_H, MKDEPS_H, SYMTAB_H, TREE_DUMP_H,
8328         TREE_GIMPLE_H, TREE_FLOW_H, TREE_SSA_LIVE_H, PRETTY_PRINT_H,
8329         DIAGNOSTIC_H, C_PRETTY_PRINT_H, SCEV_H, LAMBDA_H, TREE_DATA_REF_H,
8330         VARRAY_H, TREE_INLINE_H, REAL_H, DBGCNT_H, EBIMAP_H): Remove.
8331         (.c.o): Remove.
8332         (COMPILE.base, COMPILE): New variables.
8333         (%.o): New pattern rule.
8334         (ALL_HOST_OBJS): New variable.
8335         (xgcc$(exeext), cpp$(exeext)): Remove extra version.o.
8336         (dummy-checksum.o, cc1-checksum.o): Remove.
8337         (DRIVER_SHLIB): New variable.
8338         (DRIVER_DEFINES): Use it.
8339         (gencondmd.c): Move out of build/.
8340         (s-conditions): Update.
8341         (BUILDCOMPILE.base, BUILDCOMPILE): New variables.
8342         (ALL_BUILD_OBJS): Likewise.
8343         (build/%.o): Use BUILDCOMPILE.
8344         (build/ggc-none.o, build/ggc-none.o, build/min-insn-modes.o,
8345         build/print-rtl.o, build/read-rtl.o, build/rtl.o, build/vec.o,
8346         build/gencondmd.o, build/genattrtab.o, build/genautomata.o,
8347         build/gencheck.o, build/gencodes.o, build/genconditions.o,
8348         build/genconfig.o, build/genconstants.o, build/genemit.o,
8349         build/genextract.o, build/genflags.o, build/genmddeps.o,
8350         build/genopinit.o, build/genoutput.o, build/genpeep.o,
8351         build/genpreds.o, build/genrecog.o, build/gcov-iov.o,
8352         build/gen-protos.o, build/scan.o, build/fix-header.o,
8353         build/scan-decls.o): Simplify.
8354         (collect2.o, c-opts.o, gcc.o, gccspec.o, gcc-options.o,
8355         cppdefault.o, protoize.o, unprotoize.o, intl.o, version.o,
8356         prefix.o, toplev.o): Reduce to variable setting.
8357         (libbackend.o): Use COMPILE.  Remove most dependencies.  Move later.
8358         ($(out_object_file), gcc-options.o): New targets.
8359         ($(ALL_HOST_OBJS)): New target.  Include dependency files.
8360         * configure: Rebuilt.
8361         * configure.ac: Call ZW_CREATE_DEPDIR, ZW_PROG_COMPILER_DEPENDENCIES.
8362         * doc/sourcebuild.texi (Front End Directory): Document new variable.
8363
8364 2008-03-25  Douglas Gregor  <doug.gregor@gmail.com>
8365
8366         * c-common.c (c_sizeof_or_alignof_type): If we're not allowed to
8367         complain when we hit an error, return ERROR_MARK_NODE.
8368
8369 2008-03-25  Naveen.H.S  <naveen.hs@kpitcummins.com>
8370
8371         * config/sh/constraints.md (Pso, Psz): New constraints.
8372         * config/sh/sh.c (print_operand): Add %V and %W operand codes.
8373         * config/sh/sh.md (*andsi3_bclr, *iorsi3_bset): New insns.
8374
8375 2008-03-25  Naveen.H.S  <naveen.hs@kpitcummins.com>
8376
8377         * config/sh/sh.c (sh_expand_t_scc): Emit movrt for SH2A if possible.
8378         * config/sh/sh.md (xorsi3_movrt, movrt): New insns.
8379
8380 2008-03-25  Naveen.H.S  <naveen.hs@kpitcummins.com>
8381
8382         * config/sh/sh.md (prefetch): Add condition for SH2A target.
8383         (prefetch_sh2a): New.   
8384
8385 2008-03-25  Jayant Sonar  <Jayant.sonar@kpitcummins.com>
8386             Naveen.H.S  <naveen.hs@kpitcummins.com>
8387
8388         * config/sh/constraints.md (I28): New constraint.
8389         * config/sh/sh.c (broken_move): Add support for movi20s.
8390         * config/sh/sh.md (movsi_ie): Add the alternative for movi20s.
8391
8392 2008-03-25  Anil Paranjape  <anil.paranjape@kpitcummins.com>
8393             Jayant Sonar  <Jayant.sonar@kpitcummins.com>
8394             Naveen.H.S  <naveen.hs@kpitcummins.com>
8395
8396         * config/sh/sh.c (SH_ATTRIBUTES): Define.
8397         (SYMBOL_FLAG_FUNCVEC_FUNCTION): Define.
8398         (print_operand): Handle resbank in %@ operand code.
8399         (sh_encode_section_info): New.
8400         (push_regs): Add conditions for resbank.
8401         (sh_expand_epilogue): Likewise.
8402         (sh_insert_attributes): Likewise.
8403         (sh_attribute_table): Likewise.
8404         (sh_handle_resbank_handler_attribute): New.
8405         (sh2a_handle_function_vector_handler_attribute): New.
8406         (sh2a_is_function_vector_call): New.
8407         (sh2a_get_function_vector_number): New.
8408         (sh2a_function_vector_p): New.
8409         (sh_cfun_resbank_handler_p): New.
8410         * config/sh/sh.md (calli): Emit jsr/n if possible.
8411         (calli_tbr_rel): New.
8412         (calli_pcrel): Emit jsr/n if possible.
8413         (return_i): Emit rts/n if possible.
8414         (call_valuei_tbr_rel): New.
8415         (call_valuei_pcrel): Add condition for SH2A target.
8416         (call_value): Likewise.
8417         * config/sh/sh-protos.h (sh_cfun_resbank_handler_p): Declare.
8418         (sh2a_get_function_vector_number): Likewise.
8419         (sh2a_is_function_vector_call): Likewise.
8420         * doc/extend.texi: Document TBR relative addressing of SH2A.
8421         (resbank): Add description for SH2A.
8422
8423 2008-03-24  Richard Guenther  <rguenther@suse.de>
8424
8425         PR c/22371
8426         * gimplify.c (gimplify_modify_expr): For frontend type-correct
8427         pointer assignments change conversions according to middle-end rules.
8428         (gimplify_modify_expr_rhs): Deal with NULL TARGET_EXPR_INITIAL.
8429         * configure.ac: Include type checking in yes.
8430         * configure: Regenerate.
8431
8432 2008-03-24  Manuel Lopez-Ibanez  <manu@gcc.gnu.org>
8433
8434         * diagnostic.c (diagnostic_count_diagnostic): Delete.
8435         (diagnostic_report_diagnostic): Update. Handle ICEs here.
8436         
8437 2008-03-24  Nathan Sidwell  <nathan@codesourcery.com>
8438
8439         * gthr-vxworks.h (UNUSED): Define.
8440
8441 2008-03-23  H.J. Lu  <hongjiu.lu@intel.com>
8442
8443         * config/i386/i386.h (STATIC_CHAIN_REGNUM): Use R10_REG and CX_REG.
8444
8445 2008-03-23  Zuxy Meng <zuxy.meng@gmail.com>
8446
8447         * doc/extend.texi (Function Attributes): Add missing comma in the
8448         example of the "alloc_size" attribute.
8449         
8450 2008-03-23  Uros Bizjak  <ubizjak@gmail.com>
8451
8452         Revert:
8453         2008-03-05  H.J. Lu  <hongjiu.lu@intel.com>
8454
8455         * config/i386/i386-modes.def: Use 4 byte alignment on DI for
8456         32bit host.
8457
8458         2008-03-19  Uros Bizjak  <ubizjak@gmail.com>
8459
8460         PR target/35496
8461         * stor-layout.c (update_alignment_for_field): Set minimum alignment
8462         of the underlying type of a MS bitfield layout to the natural
8463         alignment of the type.
8464
8465         2008-03-22  Uros Bizjak  <ubizjak@gmail.com>
8466
8467         * config/i386/i386.c (assign_386_stack_local): Align DImode slots
8468         to their natural alignment to avoid store forwarding stalls.
8469
8470 2008-03-22  Richard Guenther  <rguenther@suse.de>
8471
8472         * tree-cfg.c (verify_expr): Recurse again for invariant addresses.
8473         For PHI nodes verify the address is invariant.
8474         * tree-ssa-ccp.c (ccp_decl_initial_min_invariant): Remove.
8475         (get_symbol_constant_value): Use is_gimple_min_invariant.
8476         (maybe_fold_stmt_indirect): Likewise.
8477
8478 2008-03-22  Richard Sandiford  <rsandifo@nildram.co.uk>
8479
8480         PR rtl-optimization/33927
8481         * Makefile.in (dse.o): Depend on $(TM_P_H).
8482         * expr.h (extract_low_bits): Declare.
8483         * expmed.c (extract_low_bits): New function.
8484         * rtlhooks.c (gen_lowpart_general): Generalize SUBREG handling.
8485         * dse.c: Include tm_p.h.
8486         (find_shift_sequence): Remove the read_reg argument and return the
8487         read value.  Emit the instructions instead of returning them.
8488         Iterate on new_mode rather than calculating it each time.
8489         Check MODES_TIEABLE_P.  Use simplify_gen_subreg to convert the
8490         source to NEW_MODE and extract_low_bits to convert the shifted
8491         value to READ_MODE.
8492         (replace_read): Allow the load and store to have different mode
8493         classes.  Use extract_low_bits when SHIFT == 0.  Create the shift
8494         or extraction instructions before trying the replacement.  Update
8495         dump-file code accordingly, avoiding use of REGNO (store_info->rhs).
8496
8497 2008-03-22  Uros Bizjak  <ubizjak@gmail.com>
8498
8499         * config/i386/i386.c (assign_386_stack_local): Align DImode slots
8500         to their natural alignment to avoid store forwarding stalls.
8501
8502 2008-03-21  Andrew Pinski  <andrew_pinski@playstation.sony.com>
8503
8504         PR target/27946
8505         * config/rs6000/rs6000.md (floatdidf2): Discouraging fprs and
8506         encouraging but not allowing gprs for input;
8507         change the input constraint to !f#r.
8508         (fix_truncdfdi2): Discouraging fprs and encouraging but not allowing
8509         gprs for output;
8510         change the output constraint to !f#r.
8511
8512 2008-03-21  Uros Bizjak  <ubizjak@gmail.com>
8513
8514         PR target/13958
8515         * config/i386/i386.md ("*floatunssi<mode2>_1"): New pattern with
8516         corresponding post-reload splitters.
8517         ("floatunssi<mode>2"): Expand to unsigned_float x87 insn pattern
8518         when x87 FP math is selected.
8519         * config/i386/i386-protos.h (ix86_expand_convert_uns_sixf_sse):
8520         New function prototype.
8521         * config/i386/i386.c (ix86_expand_convert_uns_sixf_sse): New
8522         unreachable function to ease macroization of insn patterns.
8523
8524 2008-03-21  Martin Jambor  <mjambor@suse.cz>
8525
8526         * tree-data-ref.c (dump_data_dependence_relation): Avoid data
8527         reference dumps if ddr is NULL or dependence is unknown.
8528
8529 2008-03-20  Kaz Kojima  <kkojima@gcc.gnu.org>
8530
8531         * config/sh/linux-atomic.asm (ATOMIC_TEST_AND_SET): Take
8532         unsigned extension into account.
8533         (ATOMIC_COMPARE_AND_SWAP): Likewise.
8534         (ATOMIC_FETCH_AND_OP, ATOMIC_FETCH_AND_COMBOP): Likewise.
8535         Do computations on a scratch register.
8536
8537 2008-03-21  Richard Guenther  <rguenther@suse.de>
8538
8539         * tree-scalar-evolution.c (chrec_contains_symbols_defined_in_loop):
8540         Use is_gimple_min_invariant instead of TREE_INVARIANT.
8541         * tree-ssa-loop-ivopts.c (force_expr_to_var_cost): Likewise.
8542         * tree-ssa-dom.c (record_equality): Likewise.
8543         * tree-inline.c (copy_body_r): Likewise.
8544         * tree-ssa-pre.c (make_values_for_stmt): Remove test for
8545         TREE_INVARIANT.
8546
8547 2008-03-20  Kaz Kojima  <kkojima@gcc.gnu.org>
8548
8549         * config/sh/sh.c (split_branches): Pass zero to redirect_jump
8550         as 'delete_unused' argument.
8551
8552 2008-03-20  Richard Guenther  <rguenther@suse.de>
8553
8554         * tree-ssa-forwprop.c (forward_propagate_addr_expr_1): Remove
8555         special casing of constant qualifiers.
8556         * tree-ssa.c (useless_type_conversion_p_1): Instead do not
8557         care about them in general.
8558         * tree-ssa-ccp.c (ccp_fold): Addresses are constant or not
8559         regardless of their type.
8560         (fold_stmt_r): Forcefully fold *& if we end up with that.
8561
8562 2008-03-20  Paul Brook  <paul@codesourcery.com>
8563
8564         * config.gcc (arm*-*-uclinux*): Remove duplicate arm/uclinux-elf.h.
8565         * config/arm/uclinux-eabi.h (SUBTARGET_EXTRA_LINK_SPEC): Add extra
8566         linker flags.
8567         * config/arm/bpabi.h (SUBTARGET_EXTRA_LINK_SPEC): Provide default
8568         definition.
8569         (LINK_SPEC): Use SUBTARGET_EXTRA_LINK_SPEC.
8570         * config/arm/unwind-arm.h (_Unwind_decode_target2): Add uClinux.
8571
8572 2008-03-20  Volker Reichelt  <v.reichelt@netcologne.de>
8573
8574         * common.opt (Wmudflap): New option.
8575         * tree-mudflap.c (mf_xform_derefs_1): Guard warning by OPT_Wmudflap.
8576         (mx_register_decls): Likewise.
8577         (mudflap_finish_file): Likewise.
8578         * doc/invoke.texi: Document -Wno-mudflap.
8579
8580 2008-03-20  Kai Tietz  <kai.tietz@onevision.com>
8581
8582         * c-format.c (replace_format_name_to_system_name): New.
8583         (cmp_attribs): New.
8584         (convert_format_name_to_system_name): New.
8585         (decode_format_attr): Add use of convert_format_name_to_system_name.
8586         (format_types_orig): Add gnu_ prefix to names.
8587         (check_format_info_main): Special treating of \0 escaped names for
8588         supporting multi-character format specifiers as I32, I64.
8589         (TARGET_OVERRIDES_FORMAT_ATTRIBUTES): Use of user defined attributes.
8590         (gnu_target_overrides_format_attributes): New.
8591         * c-format.h: Add structure target_ovr_attr to hold
8592         system specific formatter names.
8593         * config.gcc: Add for x86&x86_64 cygwin and mingw32 targets the
8594         msformat-c.o file to c_target_objs and cxx_target_objs.
8595         * config/i386/mingw32.h (TARGET_OVERRIDES_FORMAT_ATTRIBUTES): New.
8596         (TARGET_OVERRIDES_FORMAT_ATTRIBUTES_COUNT): New.
8597         (TARGET_N_FORMAT_TYPES): New.
8598         * config/i386/msformat-c.c: New.
8599         * config/i386/t-cygming: Add build rule for msformat-c.o.
8600         * doc/extend.texi: Add new format names gnu_* and ms_* and
8601         further details.
8602         * doc/tm.texi: (TARGET_OVERRIDES_FORMAT_ATTRIBUTES): New.
8603
8604 2008-03-20  Ira Rosen  <irar@il.ibm.com>
8605
8606         * doc/invoke.texi (-O3): Add -ftree-vectorize to the list of
8607         optimizations turned on under -O3.
8608         (ftree-vectorize): Add that the flag is turned on with -O3.
8609
8610 2008-03-20  Ben Elliston  <bje@au.ibm.com>
8611
8612         * regmove.c (try_auto_increment): Fix spelling error in comment.
8613         * final.c (final_scan_insn): Likewise.
8614
8615 2008-03-20  Uros Bizjak  <ubizjak@gmail.com>
8616
8617         PR target/14552
8618         * config/i386/mmx.md (*mov<mode>_internal_rex64"): Adjust register
8619         allocator preferences for "y" and "r" class registers.
8620         ("*mov<mode>_internal"): Ditto.
8621         ("*movv2sf_internal_rex64"): Ditto.
8622         ("*movv2sf_internal"): Ditto.
8623
8624 2008-03-19  Michael Matz  <matz@suse.de>
8625
8626         PR middle-end/35616
8627         * calls.c (expand_call): Check overlap of arguments with call
8628         address for sibcalls.
8629
8630 2008-03-19  Uros Bizjak  <ubizjak@gmail.com>
8631
8632         PR target/35496
8633         * stor-layout.c (update_alignment_for_field): Set minimum alignment
8634         of the underlying type of a MS bitfield layout to the natural
8635         alignment of the type.
8636
8637 2008-03-19  Jan Hubicka  <jh@suse.cz>
8638
8639         PR other/35094
8640         * toplev.c (decode_d_option): Handle all CPP flags.
8641         * tree-vrp.c: Update tree_pass descriptors.
8642         * regrename.c: Update tree_pass descriptors.
8643         * fwprop.c: Update tree_pass descriptors.
8644         * doc/invoke.texi: Remove documentation of dropped -d? flags.
8645         * tree-into-ssa.c: Update tree_pass descriptors.
8646         * tree-dump.c: Update tree_pass descriptors.
8647         * tree-complex.c: Update tree_pass descriptors.
8648         * tree-dump.h: Update tree_pass descriptors.
8649         * see.c: Update tree_pass descriptors.
8650         * cgraphbuild.c: Update tree_pass descriptors.
8651         * tracer.c: Update tree_pass descriptors.
8652         * tree-loop-distribution.c: Update tree_pass descriptors.
8653         * cgraph.c: Update tree_pass descriptors.
8654         * postreload-gcse.c: Update tree_pass descriptors.
8655         * postreload.c: Update tree_pass descriptors.
8656         * tree-ssa-loop-ch.c: Update tree_pass descriptors.
8657         * tree-tailcall.c: Update tree_pass descriptors.
8658         * tree-pass.h (tree_opt_pass): Rename to ...
8659         (opt_pass) ... this one; add "type" field and remove letter field.
8660         (gimple_opt_pass, rtl_opt_pass, simple_ipa_opt_pass): New.
8661         (execute_pass_list, execute_ipa_pass_list, all_passes, all_ipa_passes,
8662         all_lowering_passes): Update declaration.
8663         * ipa-cp.c: Update tree_pass descriptors.
8664         * final.c: Update tree_pass descriptors.
8665         * omp-low.c: Update tree_pass descriptors.
8666         * tree-ssa-dse.c: Update tree_pass descriptors.
8667         * ipa-reference.c: Update tree_pass descriptors.
8668         * tree-ssa-uncprop.c: Update tree_pass descriptors.
8669         * auto-inc-dec.c: Update tree_pass descriptors.
8670         * reorg.c: Update tree_pass descriptors.
8671         * cgraphunit.c: Update tree_pass descriptors.
8672         * tree-ssa-copyrename.c: Update tree_pass descriptors.
8673         * tree-ssa-ccp.c: Update tree_pass descriptors.
8674         * df-core.c: Update tree_pass descriptors.
8675         * mode-switching.c: Update tree_pass descriptors.
8676         * tree-nomudflap.c: Update tree_pass descriptors.
8677         * modulo-sched.c: Update tree_pass descriptors.
8678         * ipa-pure-const.c: Update tree_pass descriptors.
8679         * cse.c: Update tree_pass descriptors.
8680         * web.c: Update tree_pass descriptors.
8681         * tree-stdarg.c: Update tree_pass descriptors.
8682         * tree-ssa-math-opts.c: Update tree_pass descriptors.
8683         * tree-ssa-dom.c: Update tree_pass descriptors.
8684         * tree-nrv.c: Update tree_pass descriptors.
8685         * tree-ssa-alias.c: Update tree_pass descriptors.
8686         * loop-init.c: Update tree_pass descriptors.
8687         * gimple-low.c: Update tree_pass descriptors.
8688         * ipa-inline.c: Update tree_pass descriptors.
8689         * tree-ssa-sink.c: Update tree_pass descriptors.
8690         * global.c: Update tree_pass descriptors.
8691         * ifcvt.c: Update tree_pass descriptors.
8692         * jump.c: Update tree_pass descriptors.
8693         * predict.c: Update tree_pass descriptors.
8694         * tree-ssa-loop.c: Update tree_pass descriptors.
8695         * recog.c: Update tree_pass descriptors.
8696         * dse.c: Update tree_pass descriptors.
8697         * tree-ssa-ifcombine.c: Update tree_pass descriptors.
8698         * tree-eh.c: Update tree_pass descriptors.
8699         * regmove.c: Update tree_pass descriptors.
8700         * local-alloc.c
8701         * function.c: Update tree_pass descriptors.
8702         * tree-vectorizer.c: Update tree_pass descriptors.
8703         * gcse.c: Update tree_pass descriptors.
8704         * ipa-type-escape.c: Update tree_pass descriptors.
8705         * tree-if-conv.c: Update tree_pass descriptors.
8706         * init-regs.c: Update tree_pass descriptors.
8707         * ipa.c: Update tree_pass descriptors.
8708         * tree-ssa-phiopt.c: Update tree_pass descriptors.
8709         * rtl-factoring.c: Update tree_pass descriptors.
8710         * lower-subreg.c: Update tree_pass descriptors.
8711         * bt-load.c: Update tree_pass descriptors.
8712         * tree-dfa.c: Update tree_pass descriptors.
8713         * except.c: Update tree_pass descriptors.
8714         * emit-rtl.c: Update tree_pass descriptors.
8715         * cfgexpand.c: Update tree_pass descriptors.
8716         * tree-cfgcleanup.c: Update tree_pass descriptors.
8717         * cfgcleanup.c: Update tree_pass descriptors.
8718         * tree-ssa-pre.c: Update tree_pass descriptors.
8719         * tree-sra.c: Update tree_pass descriptors.
8720         * tree-mudflap.c: Update tree_pass descriptors.
8721         * tree-ssa-copy.c: Update tree_pass descriptors.
8722         * cfglayout.c: Update tree_pass descriptors.
8723         * tree-ssa-forwprop.c: Update tree_pass descriptors.
8724         * tree-ssa-dce.c: Update tree_pass descriptors.
8725         * tree-ssa.c: Update tree_pass descriptors.
8726         * regclass.c: Update tree_pass descriptors.
8727         * integrate.c: Update tree_pass descriptors.
8728         * tree-optimize.c: Update tree_pass descriptors.
8729         * tree-ssa-phiprop.c: Update tree_pass descriptors.
8730         * tree-object-size.c: Update tree_pass descriptors.
8731         * combine.c: Update tree_pass descriptors.
8732         * tree-outof-ssa.c: Update tree_pass descriptors.
8733         * bb-reorder.c: Update tree_pass descriptors.
8734         * stack-ptr-mod.c: Update tree_pass descriptors.
8735         * var-tracking.c: Update tree_pass descriptors.
8736         * tree-profile.c: Update tree_pass descriptors.
8737         * tree-vect-generic.c: Update tree_pass descriptors.
8738         * reg-stack.c: Update tree_pass descriptors.
8739         * sched-rgn.c: Update tree_pass descriptors.
8740         * tree-ssa-structalias.c: Update tree_pass descriptors.
8741         * tree-cfg.c: Update tree_pass descriptors.
8742         * passes.c (current_pass): Update declaration.
8743         (finish_optimization_passes): Update.
8744         (all_passes, all_ipa_passes, all_lowering_passes): Update declaration.
8745         (register_one_dump_file, register_dump_files_1, next_pass_1):
8746         Update arguments.
8747         (init_optimization_passes): Update handling of new types.
8748         (execute_one_pass, execute_pass_list, execute_ipa_pass_list): Update.
8749         * ipa-struct-reorg.c: Update tree_pass descriptors.
8750         * tree-ssa-reassoc.c: Update tree_pass descriptors.
8751         * combine-stack-adj.c: Update tree_pass descriptors.
8752         * cfgrtl.c: Update tree_pass descriptors.
8753         * dce.c: Update tree_pass descriptors.
8754         * tree-ssanames.c: Update tree_pass descriptors.
8755
8756 2008-03-19  Richard Guenther  <rguenther@suse.de>
8757
8758         PR middle-end/35609
8759         * tree-ssa.c (walk_data): New structure.
8760         (warn_uninitialized_var): If not always_executed warn with "maybe"
8761         instead of "is".
8762         (execute_early_warn_uninitialized): Compute post-dominators.
8763         Initialize always_executed before processing each basic block.
8764
8765 2008-03-18  Mikulas Patocka  <mikulas@artax.karlin.mff.cuni.cz>
8766
8767         PR target/35504
8768         * config/i386/i386.c (x86_this_parameter): Calculate correct location
8769         of "this" pointer when "regparm = N" or "fastcall" is in effect.
8770
8771 2008-03-18  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
8772
8773         * doc/include/texinfo.tex: Update to version 2008-03-17.10.
8774
8775 2008-03-18  Paolo Bonzini  <bonzini@gnu.org>
8776
8777         * expr.c (store_expr): Assume lang_hooks.reduce_bit_field_operations
8778         is true.
8779         (expand_expr_real_1) <REDUCE_BIT_FIELD>: Don't look at ignore.
8780         (expand_expr_real_1): Assume lang_hooks.reduce_bit_field_operations
8781         is true.  Add "&& !ignore" condition to reduce_bit_field.  Modify
8782         target after ignore has been set, and move there also the commputation
8783         of subtarget and original_target.
8784         * langhooks-def.h (LANG_HOOKS_REDUCE_BIT_FIELD_OPERATIONS): Delete.
8785         (LANG_HOOKS_INITIALIZER): Remove it.
8786         * langhooks.h (struct lang_hooks): Remove reduce_bit_field_operations.
8787
8788 2008-03-18  Richard Guenther  <rguenther@suse.de>
8789
8790         * tree-ssa-sccvn.c (visit_reference_op_load): If the lookup
8791         found an expression with constants, note that in the VN for the lhs.
8792         * tree-ssa-pre.c (eliminate): Visit COND_EXPR statements and
8793         fold them to constants if possible.  Run cleanup_cfg if done so.
8794         (execute_pre): Return todo.
8795         (do_pre): Likewise.
8796         (execute_fre): Likewise.
8797         * tree-ssa-forwprop.c (can_propagate_from): Allow propagation
8798         of constants.
8799         (get_prop_source_stmt): Look through pointer conversions.
8800
8801 2008-03-18  Jan Hubicka  <jh@suse.cz>
8802
8803         * tree-pretty-print.c: Include predict.h.
8804         (dump_generic_node): Dump predictor.
8805         * tree.h (PREDICT_EXPR_OUTCOME, PREDICT_EXPR_PREDICTION): Update.
8806         * tree-gimple.c (is_gimple_stmt): Add PREDICT_EXPR.
8807         * gimple-low.c (lower_stmt): Likewise.
8808         * expr.c (expand_expr_real): Likewise.
8809         * predict.c (tree_bb_level_predictions): Use PREDICT_EXPRs and remove
8810         them.
8811         (build_predict_expr, build_predict_expr): New.
8812         * predict.h (predictor_name, build_predict_expr): Update.
8813         * c-typeck.c (c_finish_bc_stmt): Add prediction.
8814         * gimplify.c (gimplify_expr): Add PREDICT_EXPR.
8815         * predict.def (PRED_CONTINUE): Update hitrate.
8816         * tree.def (PREDICT_EXPR): Define.
8817         * tree-ssa-dce.c (mark_stmt_if_obviously_necessary): Mark PREDICT_EXPR;
8818         do not handle BIND_EXPR.
8819         * tree-inline.c (estimate_num_insns_1): PREDICT_EXPR is free.
8820         * tree-cfg.c (verify_gimple_stmt): PREDICT_EXPR is valid.
8821         * tree-ssa-operands.c (get_expr_operands): PREDICT_EXPR takes no
8822         operands.
8823
8824 2008-03-18  Michael Matz  <matz@suse.de>
8825
8826         * gcov-io.h (__gcov_merge_ior, __gcov_fork): Mark hidden.
8827
8828 2008-03-18  Richard Guenther  <rguenther@suse.de>
8829
8830         * tree-gimple.h (is_gimple_invariant_address): Declare.
8831         (is_gimple_constant): Likewise.
8832         * tree-gimple.c (is_gimple_constant): New function.
8833         (is_gimple_invariant_address): Likewise.
8834         (is_gimple_min_invariant): Implement in terms of is_gimple_constant
8835         and is_gimple_invariant_address.
8836         * tree-ssa-loop-niter.c (expand_simple_operations): Revert
8837         previous change.
8838         * tree-data-ref.c (get_references_in_stmt): A SSA_NAME is not
8839         an addressable base.
8840
8841 2008-03-18  Jakub Jelinek  <jakub@redhat.com>
8842
8843         PR middle-end/35611
8844         * gimplify.c (gimplify_expr): Gimplify second operand of
8845         OMP_ATOMIC_LOAD.
8846
8847 2008-03-17  Richard Guenther  <rguenther@suse.de>
8848
8849         PR tree-optimization/19637
8850         * fold-const.c (fold_unary): Remove restrictions of removing
8851         intermediate pointer-conversions (P2)(P1)P0.
8852         * tree-ssa-ccp.c (maybe_fold_stmt_addition): Recover from
8853         conversion to void pointer.
8854         (get_maxval_strlen): Handle addresses of the form &(*p)[0].
8855
8856 2008-03-16  James E. Wilson  <wilson@tuliptree.org>
8857
8858         PR debug/31510
8859         * dbxout.c (dbxout_expand_expr, case VAR_DECL): Return NULL for
8860         emulated thread local variables.
8861
8862 2008-03-16  Richard Guenther  <rguenther@suse.de>
8863
8864         PR middle-end/35607
8865         * tree-ssa-loop-niter.c (expand_simple_operations): Do not
8866         expand TREE_INVARIANT operations that are not gimple invariant.
8867
8868 2008-03-16  Hans-Peter Nilsson  <hp@axis.com>
8869
8870         * doc/extend.texi (Alignment): Say that the ABI controls
8871         the __alignof__ for non-strict-alignment targets rather
8872         than being a recommendation.
8873
8874 2008-03-15  Paul Brook  <paul@codesourcery.com>
8875
8876         * config/arm/arm.c (arm_unwind_emit): Suppress unused unwinding
8877         annotations.
8878         (arm_output_fn_unwind): Mark functions that can not be unwound.
8879
8880 2008-03-15  Paul Brook  <paul@codesourcery.com>
8881
8882         * config/arm/arm.c (arm_rtx_costs_1): Add costs for ARMv6 value
8883         extension instructions.
8884
8885 2008-03-15  Richard Guenther  <rguenther@suse.de>
8886
8887         * tree-ssa-ccp.c (ccp_fold): Also read from constant values
8888         and fold constant aggregate refs.
8889         (fold_const_aggregate_ref): Handle string constants
8890         and constructors in ARRAY_REFs.  Handle INDIRECT_REF.
8891         (evaluate_stmt): Simplify now that ccp_fold folds constant
8892         aggregate refs.
8893
8894 2008-03-15  Paul Brook  <paul@codesourcery.com>
8895
8896         * config/arm/arm.md (insv): Use gen_insv_t2 and gen_insv_zero.
8897         (extzv): Use gen_extzv_t2.
8898         (insv_t2, insv_zero, extv, extzv_t2): New patterns.
8899
8900 2008-03-15  Richard Guenther  <rguenther@suse.de>
8901
8902         * tree-ssa-ccp.c (get_symbol_constant_value): Export.
8903         (fold_const_aggregate_ref): Likewise.
8904         (get_value): Return NULL if we don't have any values.
8905         (ccp_finalize): Set const_val to NULL after freeing it.
8906         * tree-flow.h (get_symbol_constant_value): Declare.
8907         (fold_const_aggregate_ref): Likewise.
8908         * tree-ssa-sccvn.c (try_to_simplify): Use them.
8909
8910 2008-03-15  Richard Guenther  <rguenther@suse.de>
8911
8912         PR middle-end/35593
8913         * tree-ssa-ccp.c (maybe_fold_offset_to_array_ref): Make sure
8914         to not produce negative array indices if not allowed.  Add
8915         parameter to indicate that.
8916         (maybe_fold_offset_to_component_ref): Allow negative array
8917         indices only for the first member of a structure.
8918         (maybe_fold_offset_to_reference): Allow negative array indices.
8919         (maybe_fold_stmt_addition): Likewise.
8920
8921 2008-03-15  Bjoern Haase  <bjoern.m.haase@web.de>
8922             Anatoly Sokolov <aesok@post.ru>
8923
8924         * config/avr/avr.c (avr_arch_types): Add avr6 entry.
8925         (avr_arch): Add ARCH_AVR6.
8926         (avr_mcu_types): Add 'atmega2560' and 'atmega2561' entry.
8927         (initial_elimination_offset): Initialize and use 'avr_pc_size' 
8928         instead of fixed value 2.
8929         (print_operand_address): Use gs() asm specifier instead of pm().
8930         (avr_assemble_integer): (Ditto.).
8931         (avr_output_addr_vec_elt): (Ditto.).
8932         (print_operand): Handle "!" code.
8933         * config/avr/avr.h (TARGET_CPU_CPP_BUILTINS): Add 
8934         __AVR_3_BYTE_PC__, __AVR_2_BYTE_PC__ and __AVR_HAVE_JMP_CALL__.
8935         (AVR_HAVE_EIJMP_EICALL): Define.
8936         (AVR_3_BYTE_PC): Redefine.
8937         (AVR_2_BYTE_PC): (Ditto.).
8938         (PRINT_OPERAND_PUNCT_VALID_P): Add '!' code.
8939         (LINK_SPEC): Add atmega2560 and atmega2561.
8940         (CRT_BINUTILS_SPEC): Add atmega2560 (crtm2560.o) and atmega2561 
8941         (crtm2561.o).
8942         * config/avr/avr.md (call_insn): Use eicall instead of icall 
8943         for 3 byte PC devices.
8944         (call_value_insn): (Ditto.).
8945         (*tablejump_enh): Use eijmp instead of ijmp for 3 byte PC devices.
8946         (indirect_jump): Use only for for 2 byte PC devices.
8947         (*tablejump): (Ditto.).
8948         (*indirect_jump_avr6): Add insn.
8949         (*tablejump_rjmp): Don't use for 3 byte PC devices.
8950         * config/avr/libgcc.S (__prologue_saves__): Use eijmp 
8951         instead of ijmp for 3 byte PC devices.
8952         (__tablejump2__): (Ditto.).
8953         * config/avr/t-avr (MULITLIB_OPTIONS): Add avr6 architecture.
8954         (MULITLIB_DIRNAMES): (Ditto.). 
8955         (MULTILIB_MATCHES): Add atmega2560 and atmega2561 to list.
8956
8957 2008-03-15  Uros Bizjak  <ubizjak@gmail.com>
8958
8959         * config/i386/mmx.md ("sse2_umulv1siv2di3"): Rename from
8960         "sse2_umulsidi3".  Use V1DI mode for operand 0.
8961         ("mmx_psadbw"): Use V1DI mode for operand 0.
8962         * config/i386/i386-modes.def (V1SI): New vector mode.
8963         * config/i386/i386.c (struct builtin_description)
8964         [IX86_BUILTIN_PMULUDQ]: Use CODE_FOR_sse2_umulv1siv1di3.
8965         (v1di_ftype_v8qi_v8qi): Rename from di_ftype_v8qi_v8qi.
8966         (v1di_ftype_v2si_v2si): Rename from di_ftype_v2si_v2si.
8967         (ix86_init_mmx_sse_builtins) [__builtin_ia32_psadbw]: Use
8968         v1di_ftype_v8qi_v8qi type.
8969         [__builtin_ia32_pmuludq]: Use v1di_ftype_v2si_v2si type.
8970
8971         * doc/extend.texi (X86 Built-in Functions) [__builtin_ia32_psadbw,
8972         __builtin_ia32_pmuludq]: Fix the mode of return value.
8973
8974 2008-03-15  Richard Guenther  <rguenther@suse.de>
8975
8976         PR middle-end/35595
8977         * tree-ssa-pre.c (bitmap_find_leader): Handle expression
8978         being a PHI_NODE.
8979
8980 2008-03-14  Bob Wilson  <bob.wilson@acm.org>
8981         
8982         * doc/invoke.texi (Option Summary, Xtensa Options): Document
8983         -mserialize-volatile and -mno-serialize-volatile Xtensa options.
8984         * config/xtensa/xtensa.c (print_operand): Do not emit MEMW instructions
8985         unless TARGET_SERIALIZE_VOLATILE is enabled.
8986         * config/xtensa/xtensa.md (*lsiu, *ssiu): Likewise.
8987         * config/xtensa/xtensa.h (TARGET_DEFAULT): Add MASK_SERIALIZE_VOLATILE.
8988         * config/xtensa/xtensa.opt (mserialize_volatile): New option.
8989
8990 2008-03-14  Richard Guenther  <rguenther@suse.de>
8991
8992         PR tree-optimization/34172
8993         * tree-flow.h (refs_may_alias_p): Declare.
8994         (get_single_def_stmt): Likewise.
8995         (get_single_def_stmt_from_phi): Likewise.
8996         (get_single_def_stmt_with_phi): Likewise.
8997         * tree-dfa.c (refs_may_alias_p): New function.
8998         (get_single_def_stmt): Likewise.
8999         (get_single_def_stmt_from_phi): Likewise.
9000         (get_single_def_stmt_with_phi): Likewise.
9001         * tree-ssa-sccvn.c (get_def_ref_stmt_vuses): New function.
9002         (vn_reference_lookup_1): New helper function.
9003         (vn_reference_lookup): Walk the virtual use-def chain to
9004         continue searching for a match if the def does not alias the
9005         reference we are looking for.
9006
9007 2008-03-14  David Edelsohn  <edelsohn@gnu.org>
9008
9009         * doc/install.texi (Binaries): Remove UCLA archive.  Add HVCC
9010         archive and Perzl.  Update The Written Word listing.
9011
9012 2008-03-14  Richard Guenther  <rguenther@suse.de>
9013
9014         PR tree-optimization/34043
9015         PR tree-optimization/33989
9016         * tree-ssa-pre.c (execute_pre): Allow SCCVN to do insertion
9017         when doing FRE.
9018         (bitmap_find_leader): Use extra argument to verify dominance
9019         relationship inside a basic-block.
9020         (can_PRE_operation): Add VIEW_CONVERT_EXPR.
9021         (find_leader_in_sets): Adjust.
9022         (create_component_ref_by_pieces): Take extra argument for
9023         dominance check, handle lookup failures.
9024         (find_or_generate_expression): Likewise.
9025         (create_expression_by_pieces): Likewise.
9026         (insert_into_preds_of_block): Adjust.
9027         (create_value_expr_from): If asked for, verify all operands
9028         are in the blocks AVAIL_OUT set.
9029         (make_values_for_stmt): Check for SSA_NAMEs that are life
9030         over an abnormal edge.
9031         (compute_avail): Remove such check.
9032         (do_SCCVN_insertion): New function.
9033         (eliminate): If we do not find a leader suitable for replacement
9034         insert a replacement expression from SCCVN if available.
9035         * tree-ssa-sccvn.h (run_scc_vn): Update prototype.
9036         (struct vn_ssa_aux): Add needs_insertion flag.
9037         * tree-ssa-sccvn.c (may_insert): New global flag.
9038         (copy_reference_ops_from_ref): Value-number union member access
9039         based on its size, not type and member if insertion is allowed.
9040         (visit_reference_op_load): For a weak match from union type
9041         punning lookup a view-converted value and insert a SSA_NAME
9042         for that value if that is not found.
9043         (visit_use): Make dumps shorter.  Do not disallow value numbering
9044         SSA_NAMEs that are life over an abnormal edge to constants.
9045         (free_scc_vn): Release inserted SSA_NAMEs.
9046         (run_scc_vn): New flag to specify whether insertion is allowed.
9047         Process SSA_NAMEs in forward order.
9048         * tree-ssa-loop-im.c (for_each_index): Handle invariant
9049         ADDR_EXPRs inside VIEW_CONVERT_EXPR.
9050         * fold-const.c (fold_unary): Fold VIEW_CONVERT_EXPRs from/to
9051         pointer type to/from integral types that do not change the
9052         precision to regular conversions.
9053
9054 2008-03-13  Uros Bizjak  <ubizjak@gmail.com>
9055
9056         * doc/extend.texi (X86 Built-in Functions) [__builtin_ia32_psll?,
9057         __builtin_ia32_psrl?, __builtin_ia32_psra?, __builtin_ia32_psll?i,
9058         __builtin_ia32_psrl?i, __builtin_ia32_psra?i, __builtin_ia32_psll?128,
9059         __builtin_ia32_psrl?128, __builtin_ia32_psra?128]: Fix the mode of
9060         input arguments and the mode of return value.  Built-in functions
9061         that operate on whole 64-bit MMX register now use V1DI mode.
9062
9063 2008-03-13  Alon Dayan  <alond@il.ibm.com>
9064             Olga Golovanevsky  <olga@il.ibm.com>
9065
9066         PR tree-optimization/35041
9067         * ipa-struct-reorg.c (find_pos_in_stmt_1): Add another option
9068         to locate the right position in a statement.
9069
9070 2008-03-13  Uros Bizjak  <ubizjak@gmail.com>
9071
9072         PR target/34000
9073         PR target/35553
9074         * config/i386/xmmintrin.h:  Change all static inline functions to
9075         extern inline and add __gnu_inline__ attribute.
9076         * config/i386/bmintrin.h: Ditto.
9077         * config/i386/smmintrin.h: Ditto.
9078         * config/i386/tmmintrin.h: Ditto.
9079         * config/i386/mmintrin-common.h: Ditto.
9080         * config/i386/ammintrin.h: Ditto.
9081         * config/i386/emmintrin.h: Ditto.
9082         * config/i386/pmmintrin.h: Ditto.
9083         * config/i386/mmintrin.h: Ditto.
9084         * config/i386/mm3dnow.h: Ditto.
9085
9086 2008-03-13  Jakub Jelinek  <jakub@redhat.com>
9087
9088         PR middle-end/35185
9089         * omp-low.c (lower_regimplify, init_tmp_var, save_tmp_var): Removed.
9090         (lower_omp_2): New function.
9091         (lower_omp_1, lower_omp): Rewritten.
9092
9093 2008-03-13  Danny Smith  <dannysmith@users.sourceforge.net>
9094
9095         PR 35054
9096         * doc/extend.texi (Structure-Packing Pragmas): Replace "Win32"
9097         with the phrase "Microsoft Windows compilers".
9098         (Push/Pop Macro Pragmas): New subsection. Document
9099         #pragma push_macro and pragma pop_macro.
9100
9101 2008-03-12  Paul Brook  <paul@codesourcery.com>
9102
9103         * config/arm/arm.c (output_move_double): Prefer LDRD to LDM.
9104
9105 2008-03-12  Paul Brook  <paul@codesourcery.com>
9106
9107         * config/arm/thumb2.md: Extend peephole to cover 3-arg subs.
9108         (thumb2_alusi3_short): Exclude PLUS and MINUS.
9109         (thumb2_addsi_shortim): Rename ...
9110         (thumb2_addsi_short): ... to this.  Allow register operands.
9111         (thumb2_subsi_short): New pattern.
9112         (thumb2_one_cmplsi2_short,
9113         thumb2_negsi2_short): New patterns and peepholes.
9114
9115 2008-03-12  Paul Brook  <paul@codesourcery.com>
9116
9117         * config/arm/arm.c (arm_size_rtx_costs): Use ARM costs for Thumb-2.
9118
9119 2008-03-12  Uros Bizjak  <ubizjak@gmail.com>
9120
9121         * config/i386/i386.md (int_cond): New code iterator.
9122         (fp_cond): Ditto.
9123         ("s<code>"): Macroize expander from seq, sne, sgt, sgtu, slt, sltu,
9124         sge, sgeu, sle and sleu expanders usign int_cond code iterator.
9125         ("s<code>"): Macroize expander from sunordered, sordered, suneq, sunge,
9126         sungt, sunle, sunlt and sltgt expanders usign fp_cond code iterator.
9127         ("b<code>"): Macroize expander from beq, bne, bgt, bgtu, blt, bltu,
9128         bge, bgeu, ble and bleu expanders usign int_cond code iterator.
9129         ("b<code>"): Macroize expander from bunordered, bordered, buneq, bunge,
9130         bungt, bunle, bunlt and bltgt expanders usign fp_cond code iterator.
9131
9132 2008-03-12  Paul Brook  <paul@codesourcery.com>
9133
9134         * config/arm/arm.c (use_return_insn): Use offsets->saved_regs_mask
9135         instead of {arm,thumb}_compute_save_reg_mask.
9136         (output_return_instruction): Ditto.
9137         (thumb_unexpanded_epilogue): Ditto.
9138         (thumb1_expand_prologue): Ditto.
9139         (thumb1_output_function_prologue): Ditto.
9140         (arm_set_return_address): Ditto.
9141         (thumb_set_return_address): Ditto.
9142         (arm_get_frame_offsets): Set offsets->saved_regs_mask.  Push extra
9143         regs to achieve stack alignment.
9144         (thumb1_compute_save_reg_mask): Fix compiler warning.
9145         (arm_output_epilogue): Use offsets->saved_regs_mask.
9146         Adjust stack pointer by poping call clobered registers.
9147         (arm_expand_prologue): Use offsets->saved_regs_mask.
9148         Adjust stack pointer by pushing extra registers.
9149         * config/arm.h (arm_stack_offsets): Add saved_regs_mask.
9150
9151 2008-03-12  Paolo Bonzini  <bonzini@gnu.org>
9152
9153         PR tree-opt/35422
9154         * fold-const.c (fold_unary) <NOP_EXPR>: Distribute a narrowing
9155         conversion to the operands of a multiplication.
9156
9157 2008-03-12  Richard Guenther  <rguenther@suse.de>
9158
9159         * Makefile.in (OBJS-common): Add tree-ssa-phiprop.o
9160         (tree-ssa-phiprop.o): Copy dependencies from tree-ssa-forwprop.o.
9161         * timevar.def (TV_TREE_PHIPROP): Add.
9162         * tree-ssa-phiprop.c: Split from tree-ssa-forwprop.c, added
9163         pass description.  Use TV_TREE_PHIPROP.
9164         * tree-ssa-forwprop.c: Remove phiprop code.
9165
9166 2008-03-12  Jakub Jelinek  <jakub@redhat.com>
9167
9168         PR middle-end/35549
9169         * omp-low.c (maybe_lookup_decl): Constify first argument.
9170         (use_pointer_for_field): Change last argument from bool to
9171         omp_context *.  Disallow shared copy-in/out in nested
9172         parallel if decl is shared in outer parallel too.
9173         (build_outer_var_ref, scan_sharing_clauses,
9174         lower_rec_input_clauses, lower_copyprivate_clauses,
9175         lower_send_clauses, lower_send_shared_vars): Adjust callers.
9176
9177 2008-03-12  Victor Kaplansky  <victork@il.ibm.com>
9178             Ira Rosen  <irar@il.ibm.com>
9179
9180         * tree-vectorizer.c (free_stmt_vec_info): New function.
9181         (destroy_loop_vec_info): Move code to free_stmt_vec_info().
9182         Call free_stmt_vec_info(). Free LOOP_VINFO_STRIDED_STORES..
9183         * tree-vectorizer.h (free_stmt_vec_info): Declare.
9184         * tree-vect-transform.c (vectorizable_conversion): Free
9185         vec_oprnds0 if it was allocated.
9186         (vect_permute_store_chain): Remove unused VECs.
9187         (vectorizable_store): Free VECs that are allocated in the..
9188         function.
9189         (vect_transform_strided_load, vectorizable_load): Likewise.
9190         (vect_remove_stores): Simplify the code.
9191         (vect_transform_loop): Move code to vect_remove_stores().
9192         Call vect_remove_stores() and free_stmt_vec_info().
9193
9194 2008-03-11  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
9195
9196         * pa.h (TARGET_LONG_PIC_SDIFF_CALL): Conditionalize define on
9197         TARGET_HPUX.  Revise comment.
9198         (TARGET_LONG_PIC_PCREL_CALL): Revise comment.
9199         * pa.c (output_call): Update for revised TARGET_LONG_PIC_SDIFF_CALL.
9200         Use sr4 variant of `be' instruction when not generating PIC code.
9201         (attr_length_call): Adjust for above change.
9202
9203 2008-03-11  Andrew Pinski  <andrew_pinski@playstation.sony.com>
9204
9205         * ipa-reference.c (static_execute): Remove module_statics_const and
9206         associated setting code.
9207
9208 2008-03-11  Uros Bizjak  <ubizjak@gmail.com>
9209
9210         PR target/35540
9211         * config/i386/i386.md (paritysi2, paritydi2): Use register_operand
9212         predicate for operand 1.
9213         (paritysi2_cmp): Use register_operand predicate for operand 2.
9214         Use earlyclobber modifier for operand 1.  Remove support for
9215         memory operands.
9216         (paritydi2_cmp): Use register_operand predicate for operand 3.
9217         Use earlyclobber modifier for operand 1.  Remove support for
9218         memory operands.
9219
9220 2008-03-11  Paul Brook  <paul@codesourcery.com>
9221             Vladimir Prus  <vladimir@codesourcery.com>
9222
9223         * config/arm/arm.c (use_return_insn): Check TARGET_APCS_FRAME.
9224         (arm_compute_save_reg0_reg12_mask): Always
9225         check if register 11 must be saved.  Always safe hard frame pointer
9226         when frame_pointer_needeed.
9227         (arm_compute_save_reg_mask): Save IP and PC
9228         only with apcs frames.
9229         (arm_output_epilogue): Adjust Thumb2 codepath to
9230         be also invoked and work for ARM non-apcs frames.
9231         (arm_expand_prologue): Don't bother saving IP
9232         for non-apcs frame, since it's not clobbered by
9233         prologue code.  Implement non-apcs frame
9234         layout.
9235
9236 2008-03-11  Paolo Bonzini  <bonzini@gnu.org>
9237
9238         PR rtl-optimization/35281
9239         * expr.c (convert_move): Use a new pseudo for the intermediate
9240         from_mode->word_mode result.
9241
9242 2008-03-11  Paolo Bonzini  <bonzini@gnu.org>
9243
9244         * langhooks-def.h (LANG_HOOKS_CLEAR_BINDING_STACK): Delete.
9245         * langhooks.h (struct lang_hooks): Delete clear_binding_stack member.
9246         * toplev.c (compile_file): Don't call it.
9247
9248 2008-03-11  Uros Bizjak  <ubizjak@gmail.com>
9249
9250         PR middle-end/35526
9251         * expr.c (store_expr): Call emit_block_move if the mode
9252         of "temp" RTX is BLKmode.
9253
9254 2008-03-11  Andrew Pinski  <andrew_pinski@playstation.sony.com>
9255             Richard Guenther  <rguenther@suse.de>
9256
9257         PR tree-optimization/31358
9258         * tree-ssa-loop-manip.c (create_iv): Call force_gimple_operand for
9259         the step with a NULL_TREE.
9260         * tree-ssa-loop-ivopts.c (find_bivs): Convert the step
9261         to sizetype if type is a pointer type.
9262         (add_candidate_1): Don't convert the base and step to
9263         the generic type if the orginal type is a pointer type.
9264         (add_iv_value_candidates): Use sizetype for the step
9265         if type is a pointer type.
9266         (cand_value_at): Likewise.
9267         * tree-ssa-address.c (add_to_parts): Use POINTER_PLUS_EXPR
9268         for pointer types.
9269         * tree-affine.c (tree_to_aff_combination <POINTER_PLUS_EXPR>):
9270         Don't convert the tem affine to the type.
9271         (add_elt_to_tree): Use sizetype for the step if a pointer.
9272         Use POINTER_PLUS_EXPR for pointers.
9273         (aff_combination_to_tree): Use sizetype for the step if a
9274         pointer.
9275
9276 2008-03-10  Vladimir Makarov  <vmakarov@redhat.com>
9277
9278         * config/i386/sse.md (ssse3_pmaddubswv8hi3, ssse3_pmaddubswv4hi3):
9279         Remove commutativity hint.
9280
9281 2008-03-10  Jakub Jelinek  <jakub@redhat.com>
9282
9283         PR c/35438
9284         PR c/35439
9285         * c-parser.c (c_parser_omp_threadprivate): Don't add vars with
9286         errorneous type.  Check that v is a VAR_DECL.
9287
9288         PR middle-end/35099
9289         * tree-cfg.c (new_label_mapper): Update cfun->last_label_uid.
9290
9291 2008-03-10  H.J. Lu  <hongjiu.lu@intel.com>
9292
9293         PR tree-optimization/35494
9294         * tree-ssa-ccp.c (get_symbol_constant_value): Check if value
9295         may be overriden at link and run time.
9296
9297 2008-03-10  Richard Guenther  <rguenther@suse.de>
9298
9299         PR tree-optimization/34677
9300         * tree-ssa-pre.c (modify_expr_node_pool): Remove.
9301         (poolify_tree): Likewise.
9302         (modify_expr_template): Likewise.
9303         (poolify_modify_stmt): Likewise.
9304         (insert_fake_stores): Handle all component-ref style stores
9305         in addition to INDIRECT_REF.  Also handle complex types.
9306         Do not poolify the inserted load.
9307         (realify_fake_stores): Do not rebuild the tree but only
9308         make it a SSA_NAME copy.
9309         (init_pre): Remove initialzation of modify_expr_template.
9310         Do not allocate modify_expr_node_pool.
9311         (fini_pre): Do not free modify_expr_node_pool.
9312
9313 2008-03-10  Paul Brook  <paul@codesourcery.com>
9314
9315         * config/arm/arm.md (UNSPEC_STACK_ALIGN, UNSPEC_PIC_OFFSET): Renumber
9316         to avoid conflicts.
9317
9318 2008-03-10  Paul Brook  <paul@codesourcery.com>
9319             Mark Shinwell  <shinwell@codesourcery.com>
9320
9321         * config/arm/cortex-r4.md: New.
9322         * config/arm/thumb2.md (divsi3, udivsi3): Annotate with
9323         insn attributes.
9324         * config/arm/arm.md: Include cortex-r4.md.
9325         (insn): Add smmls, sdiv and udiv values.
9326         (generic_sched): Don't use generic scheduling for Cortex-R4.
9327         (arm_issue_rate): New function.
9328         (TARGET_SCHED_ISSUE_RATE): Define.
9329
9330 2008-03-10  Sebastian Pop  <sebastian.pop@amd.com>
9331
9332         * doc/invoke.texi (-ftree-loop-distribution): Add an example.
9333
9334 2008-03-10  Richard Guenther  <rguenther@suse.de>
9335
9336         * tree-ssa-pre.c (get_sccvn_value): Simplify.
9337         (compute_avail): Do not add stmt uses to AVAIL_OUT.
9338
9339 2008-03-10  Paolo Bonzini  <bonzini@gnu.org>
9340
9341         * langhooks-def.h (LANG_HOOKS_REDUCE_BIT_FIELD_OPERATIONS):
9342         Set default to true.
9343
9344 2008-03-09  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
9345
9346         * c.opt (Wsynth): Deprecate.
9347         * doc/invoke.texi (Option Summary, Warning Options): Document
9348         -Wno-format-contains-nul.
9349
9350 2008-03-09  Uros Bizjak  <ubizjak@gmail.com>
9351
9352         PR target/35496
9353         * config/i386/i386.c (ix86_constant_alignment): Compute alignment using
9354         ALIGN_MODE_128 for VECTOR_CST and INTEGER_CST in addition to REAL_CST.
9355
9356 2008-03-09  Ira Rosen  <irar@il.ibm.com>
9357
9358         * config/rs6000/rs6000.c (builtin_description): Rename vector
9359         left shift operations.
9360         * config/rs6000/altivec.md (UNSPEC_VSL): Remove.
9361         (altivec_vsl<VI_char>): Rename to ...
9362         (ashl<mode>3): ... new name.
9363         (mulv4sf3, mulv4si3, negv4sf2): Replace gen_altivec_vslw with
9364         gen_ashlv4si3.
9365         (absv4sf2): Convert to use ashift:V4SI instead of UNSPEC_VSL.
9366
9367 2008-03-08  Richard Guenther  <rguenther@suse.de>
9368
9369         * coverage.h (tree_coverage_counter_addr): Declare.
9370         * coverage.c (tree_coverage_counter_addr): New function.
9371         * tree-profile.c (tree_gen_edge_profiler): Unshare counter
9372         before using again.
9373         (tree_gen_pow2_profiler): Use tree_coverage_counter_addr.
9374         (tree_gen_one_value_profiler): Likewise.
9375         (tree_gen_ic_profiler): Likewise.
9376         (tree_gen_average_profiler): Likewise.
9377         (tree_gen_ior_profiler): Likewise.
9378
9379 2008-03-08  Richard Guenther  <rguenther@suse.de>
9380
9381         * tree-ssa-sccvn.h (vn_binary_op_lookup): Remove.
9382         (vn_binary_op_insert): Likewise.
9383         (vn_unary_op_lookup): Likewise.
9384         (vn_unary_op_insert): Likewise.
9385         (vn_nary_op_lookup): Declare.
9386         (vn_nary_op_insert): Likewise.
9387         * tree-ssa-sccvn.c (struct vn_tables_s): Merge unary
9388         and binary hashes, use a single obstack for unary_op_pool
9389         and binary_op_pool.
9390         (struct vn_binary_op_s, struct vn_unary_op_s): Replace with
9391         a single struct vn_nary_op_s.  Store tree code length and
9392         a variable number of operands.
9393         (struct vn_reference_op_struct): Remove unused op2.
9394         (vn_reference_op_eq): Do not compare op2.
9395         (vn_reference_op_compute_hash): Do not compute hash of op2.
9396         (vn_unary_op_hash, vn_binary_op_hash): Replace with vn_nary_op_hash.
9397         (vn_unary_op_compute_hash, vn_binary_op_compute_hash): Replace
9398         with vn_nary_op_compute_hash.
9399         (vn_unary_op_eq, vn_binary_op_eq): Replace with vn_nary_op_eq.
9400         (vn_unary_op_lookup, vn_binary_op_lookup): Replace with
9401         vn_nary_op_lookup.
9402         (vn_unary_op_insert, vn_binary_op_insert): Replace with
9403         vn_nary_op_insert.
9404         (visit_unary_op): Call nary functions.
9405         (visit_binary_op): Likewise.
9406         (process_scc): Adjust for struct vn_tables_s changes.
9407         (allocate_vn_table): Likewise.
9408         (free_vn_table): Likewise.
9409         * tree-vn.c (vn_add): Call nary functions.
9410         (vn_lookup): Likewise.
9411
9412 2008-03-08  Jakub Jelinek  <jakub@redhat.com>
9413
9414         PR target/35498
9415         * config/rs6000/rs6000.c (rs6000_expand_compare_and_swapqhi): Shift
9416         wdst back after sync_compare_and_swapqhi_internal.
9417
9418 2008-03-08  Uros Bizjak  <ubizjak@gmail.com>
9419
9420         PR target/22152
9421         * config/i386/i386-modes.def (V1DI): New vector mode.
9422         * config/i386/i386.h (VALID_MMX_REG_MODE): Add V1DImode.
9423         * config/i386/mmx.md (MMXMODEI8): New mode iterator.
9424         (MMXMODE248): Ditto.
9425         (MMXMODE): Add V1DI mode.
9426         (mmxvecsize): Change DI mode to V1DI mode.
9427         ("mov<mode>): Use MMXMODEI8 mode iterator.
9428         ("*mov<mode>_internal_rex64"): Ditto.
9429         ("*mov<mode>_internal"): Ditto.
9430         ("mmx_add<mode>3"): Ditto.  Handle V1DImode for TARGET_SSE2.
9431         ("mmx_sub<mode>3"): Ditto.
9432         ("mmx_adddi3"): Remove insn pattern.
9433         ("mmx_subdi3"): Ditto.
9434         ("mmx_ashr<mode>3"): Use SImode and "yN" constraint for operand 2.
9435         ("mmx_lshr<mode>3"): Ditto. Use MMXMODE248 mode iterator.
9436         ("mmx_ashl<mode>3"): Ditto.
9437         ("mmx_lshrdi3"): Remove insn pattern.
9438         ("mmx_ashldi3"): Ditto.
9439         * config/i386/i386.c (classify_argument): Handle V1DImode.
9440         (function_arg_advance_32): Ditto.
9441         (function_arg_32): Ditto.
9442         (struct builtin_description) [IX86_BUILTIN_PADDQ]: Use
9443         mmx_addv1di3 insn pattern.
9444         [IX86_BUILTIN_PSUBQ]: Use mmx_subv1di3 insn pattern.
9445         [IX86_BUILTIN_PSLL?, IX86_BUILTIN_PSRL?, IX86_BUILTIN_PSRA?,
9446         IX86_BUILTIN_PSLL?I, IX86_BUILTIN_PSRL?I, IX86_BUILTIN_PSRA?I,
9447         IX86_BUILTIN_PSLL?I128, IX86_BUILTIN_PSRL?I128, IX86_BUILTIN_PSRA?I128]:
9448         Remove definitions of built-in functions.
9449         (V1DI_type_node): New node.
9450         (v1di_ftype_v1di_int): Ditto.
9451         (v1di_ftype_v1di_v1di): Ditto.
9452         (v2si_ftype_v2si_si): Ditto.
9453         (v4hi_ftype_v4hi_di): Remove node.
9454         (v2si_ftype_v2si_di): Ditto.
9455         (ix86_init_mmx_sse_builtins): Handle V1DImode.
9456         (__builtin_ia32_psll?, __builtin_ia32_psrl?, __builtin_ia32_psra?):
9457         Redefine builtins using def_builtin_const with *_ftype_*_int node.
9458         (__builtin_ia32_psll?i, __builtin_ia32_psrl?i, __builtin_ia32_psra?i):
9459         Add new builtins using def_builtin_const.
9460         (ix86_expand_builtin) [IX86_BUILTIN_PSLL?, IX86_BUILTIN_PSRL?,
9461         IX86_BUILTIN_PSRA?, IX86_BUILTIN_PSLL?I, IX86_BUILTIN_PSRL?I,
9462         IX86_BUILTIN_PSRA?I]: Handle builtin definitions.
9463         * config/i386/mmintrin.h (__v1di): New typedef.
9464         (_mm_add_si64): Cast arguments to __v1di type.
9465         (_mm_sub_si64): Ditto.
9466         (_mm_sll_pi16): Cast __count to __v4hi type.
9467         (_mm_sll_pi32): Cast __count to __v2si type.
9468         (_mm_sll_si64): Cast arguments to __v1di type.
9469         (_mm_srl_pi16): Cast __count to __v4hi type.
9470         (_mm_srl_pi32): Cast __count to __v2si type.
9471         (_mm_srl_si64): Cast arguments to __v1di type.
9472         (_mm_sra_pi16): Cast __count to __v4hi type.
9473         (_mm_sra_pi32): Cast __count to __v2si type.
9474         (_mm_slli_pi16): Use __builtin_ia32_psllwi.
9475         (_mm_slli_pi32): Use __builtin_ia32_pslldi.
9476         (_mm_slli_si64): Use __builtin_ia32_psllqi. Cast __m to __v1di type.
9477         (_mm_srli_pi16): Use __builtin_ia32_psrlwi.
9478         (_mm_srli_pi32): Use __builtin_ia32_psrldi.
9479         (_mm_srli_si64): Use __builtin_ia32_psrlqi. Cast __m to __v1di type.
9480         (_mm_srai_pi16): Use __builtin_ia32_psrawi.
9481         (_mm_srai_pi32): Use __builtin_ia32_psradi.
9482         * config/i386/i386.md (UNSPEC_NOP): Remove unspec definition.
9483         * doc/extend.texi (X86 Built-in Functions) [__builtin_ia32_psll?,
9484         __builtin_ia32_psrl?, __builtin_ia32_psra?, __builtin_ia32_psll?i,
9485         __builtin_ia32_psrl?i, __builtin_ia32_psra?i]: Add new builtins.
9486
9487 2008-03-07  Joseph Myers  <joseph@codesourcery.com>
9488
9489         * doc/include/texinfo.tex: Update to version 2008-03-07.10.
9490
9491 2008-03-07  Peter Bergner  <bergner@vnet.ibm.com>
9492
9493         PR target/35373
9494         * config/rs6000/rs6000.c (rs6000_legitimize_address): Don't generate
9495         reg+const addressing for Altivec modes.  Don't generate reg+reg
9496         addressing for TFmode or TDmode quantities.
9497
9498 2008-03-07  Paolo Bonzini  <bonzini@gnu.org>
9499
9500         * c-common.c (vector_types_convertible_p): Call langhook
9501         instead of comptypes.
9502
9503 2008-03-06  Andrew Pinski  <andrew_pinski@playstation.sony.com>
9504
9505         PR tree-opt/35402
9506         * tree-ssa-ccp.c (get_symbol_constant_value): Handle
9507         integral and scalar float variables which have a
9508         NULL DECL_INITIAL.
9509
9510 2008-03-06  Nathan Froyd  <froydnj@codesourcery.com>
9511
9512         * dwarf2out.c (dwarf2out_frame_debug_expr): Consult the
9513         dwarf_register_span hook when emitting unwind information for
9514         register-to-memory saves.
9515         * config/rs6000/rs6000.c (spe_synthesize_frame): Delete.
9516         (rs6000_frame_related): Remove call to spe_synthesize_frame.
9517
9518 2008-03-06  Jakub Jelinek  <jakub@redhat.com>
9519
9520         * gimplify.c (goa_lhs_expr_p): Allow different ADDR_EXPR nodes
9521         for the same VAR_DECL.
9522
9523 2008-03-06  Tom Tromey  <tromey@redhat.com>
9524
9525         * treelang: Delete.
9526         * doc/standards.texi (Standards): Don't mention treelang.
9527         * doc/invoke.texi (Overall Options): Don't mention treelang.
9528         * doc/install.texi (Prerequisites): Don't mention bison or
9529         treelang.
9530         (Configuration): Don't mention treelang.
9531         (Building): Likewise.
9532         * doc/frontends.texi (G++ and GCC): Don't mention treelang.
9533
9534 2008-03-06  Paolo Bonzini  <bonzini@gnu.org>
9535
9536         * simplify-rtx.c (simplify_subreg): Remove useless shifts from
9537         word-extractions out of a multi-word object.
9538
9539 2008-03-06  Richard Guenther  <rguenther@suse.de>
9540
9541         * tree.def (BIT_FIELD_REF): Constrain result type and its precision.
9542         * tree-cfg.c (verify_expr): Verify BIT_FIELD_REF constraints on
9543         result type and precision.
9544         * expr.c (get_inner_reference): Set unsignedp based on the result
9545         type of BIT_FIELD_REF.
9546         * tree.h (BIT_FIELD_REF_UNSIGNED): Remove.
9547         * tree-sra.c (instantiate_element): Do not set BIT_FIELD_REF_UNSIGNED.
9548         (try_instantiate_multiple_fields): Likewise.  Use the correct type
9549         for BIT_FIELD_REF.
9550         (sra_build_assignment): Likewise.
9551         (sra_build_elt_assignment): Likewise.
9552         (sra_explode_bitfield_assignment): Likewise.
9553         * print-tree.c (print_node): Do not check BIT_FIELD_REF_UNSIGNED.
9554         * tree-vect-transform.c (vect_create_epilog_for_reduction): Do not
9555         set BIT_FIELD_REF_UNSIGNED.
9556         (vectorizable_load): Likewise.
9557
9558 2008-03-06  Andreas Krebbel  <krebbel1@de.ibm.com>
9559
9560         * cse.c (cse_extended_basic_block): Invalidate artificial defs
9561         at bb start.
9562
9563 2008-03-06  Richard Guenther  <rguenther@suse.de>
9564
9565         * alias.c (struct alias_set_entry): Move has_zero_child field
9566         to pack with alias_set.
9567
9568 2008-03-05  H.J. Lu  <hongjiu.lu@intel.com>
9569
9570         * config/i386/i386-modes.def: Use 4 byte alignment on DI for
9571         32bit host.
9572
9573 2008-03-05  Ian Lance Taylor  <iant@google.com>
9574
9575         * alias.h (alias_set_type): Change from HOST_WIDE_INT to int.
9576
9577 2008-03-05  Kenneth Zadeck  <zadeck@naturalbridge.com>
9578
9579         * fwprop.c (update_df): Support width and offset parameters of
9580         df_ref_create.
9581         * ra-conflict.c (mark_reg_store, clear_reg_in_live,
9582         global_conflicts): Change DF_REF_EXTRACT to either
9583         DF_REF_ZERO_EXTRACT or DF_REF_SIGN_EXTRACT.  Change
9584         DF_REF_STRICT_LOWER_PART to DF_REF_STRICT_LOW_PART.
9585         * df-scan.c (df_ref_record, df_defs_record,
9586         df_ref_create_structure, df_def_record_1, df_uses_record,
9587         df_get_conditional_uses, df_get_call_refs, df_insn_refs_collect,
9588         df_bb_refs_collect, df_entry_block_defs_collect,
9589         df_exit_block_uses_collect): Support new width and offset fields.
9590         (ref_extract_pool): New storage pool.
9591         (df_free_ref): New function.
9592         (df_reg_chain_unlink, df_free_collection_rec,
9593         df_sort_and_compress_refs): Call df_free_ref.
9594         (df_ref_equal_p, df_ref_compare): Compare offset and width fields
9595         of df_ref_extract.
9596         (df_ref_create_structure): Allocate df_ref_extract if offset and
9597         width fields are used.
9598         (df_def_record_1): Get offset and width from ZERO_EXTRACT.
9599         (df_uses_record): Get offset and width from ZERO_EXTRACT 
9600         and SIGN_EXTRACT.
9601         * global.c (build_insn_chain): Change DF_REF_EXTRACT to either
9602         DF_REF_ZERO_EXTRACT or DF_REF_SIGN_EXTRACT.  Change
9603         DF_REF_STRICT_LOWER_PART to DF_REF_STRICT_LOW_PART.
9604         * df.h (df_ref_flags): Change DF_REF_EXTRACT to either
9605         DF_REF_ZERO_EXTRACT or DF_REF_SIGN_EXTRACT.  Change
9606         DF_REF_STRICT_LOWER_PART to DF_REF_STRICT_LOW_PART.
9607         (df_ref_extract): New structure.
9608         (DF_REF_WIDTH, DF_REF_OFFSET): New macros.
9609         (df_ref_create): Add width and offset parameters.
9610         
9611 2008-03-05  Richard Guenther  <rguenther@suse.de>
9612
9613         * tree-ssa-structalias.c (get_constraint_for_component_ref):
9614         Use ranges_overlap_p.
9615         (offset_overlaps_with_access): Rename
9616         to ranges_overlap_p and move ...
9617         * tree-flow-inline.h (ranges_overlap_p): ... here.
9618
9619         * tree.h (get_inner_reference, handled_component_p): Update
9620         comments.
9621
9622         * tree.h (record_component_aliases, get_alias_set,
9623         alias_sets_conflict_p, alias_sets_must_conflict_p,
9624         objects_must_conflict_p): Move declarations ...
9625         * alias.h (record_component_aliases, get_alias_set,
9626         alias_sets_conflict_p, alias_sets_must_conflict_p,
9627         objects_must_conflict_p): ... here.
9628         Include coretypes.h.
9629         * Makefile.in (ALIAS_H): Add coretypes.h dependency.
9630
9631 2008-03-05  Aldy Hernandez  <aldyh@redhat.com>
9632
9633         * cfg.c: Include tree-flow.h.
9634         (remove_edge_raw): Call redirect_edge_var_map_clear.
9635         (redirect_edge_succ_nodup): Call redirect_edge_var_map_dup.
9636         * tree-flow-inline.h (redirect_edge_var_map_def): New.
9637         (redirect_edge_var_map_result): New.
9638         * tree-cfgcleanup.c (remove_forwarder_block_with_phi): Replace
9639         PENDING_STMT use with redirect_edge_var_map_*.
9640         * tree-ssa.c (edge_var_maps): New definition.
9641         (redirect_edge_var_map_add): New.
9642         (redirect_edge_var_map_clear): New.
9643         (redirect_edge_var_map_dup): New.
9644         (redirect_edge_var_map_vector): New.
9645         (redirect_edge_var_map_destroy): New.
9646         (ssa_redirect_edge): Replace PENDING_STMT use with
9647         redirect_edge_var_map_*.
9648         (flush_pending_stmts): Same.
9649         (delete_tree_ssa): Destroy edge var map.
9650         * tree-flow.h (struct _edge_var_map): New.
9651         Define edge_var_map vector type.
9652         Declare redirect_edge_var_map_* prototypes.
9653         * Makefile.in (cfg.o): Depend on TREE_FLOW_H.
9654         * tree-cfg.c (reinstall_phi_args): Replace
9655         PENDING_STMT use with redirect_edge_var_map_*.
9656
9657 2008-03-05  Richard Guenther  <rguenther@suse.de>
9658
9659         PR tree-optimization/35472
9660         * tree-ssa-dse.c (dse_optimize_stmt): Do not delete a store
9661         whose single use_stmt has a overlapping set of loaded and
9662         stored symbols as that use_stmt might be a noop assignment then.
9663
9664 2008-03-05  Joel Sherrill <joel.sherrill@oarcorp.com>
9665
9666         * gthr-rtems.h: Implement __gthread_mutex_destroy.
9667
9668 2008-03-05  Richard Guenther  <rguenther@suse.de>
9669
9670         PR c++/35336
9671         * tree.def (BIT_FIELD_REF): Document that operands 1 and 2
9672         should be constants.
9673         * tree-cfg.c (verify_expr): Verify it.
9674         * fold-const.c (fold_truthop): Remove code generating
9675         BIT_FIELD_REFs of structure bases.
9676         (fold_binary): Likewise.
9677         (fold_ternary): Position and size of BIT_FIELD_REFs are
9678         always host integers.
9679         (make_bit_field_ref): Remove.
9680         (optimize_bit_field_compare): Remove.
9681         (all_ones_mask_p): Remove.
9682
9683 2008-03-05  Gabor Loki  <loki@gcc.gnu.org>
9684
9685         PR gcc/33009
9686         * rtl-factoring.c (clear_regs_live_in_seq): Fix backward steps.
9687         (split_block_and_df_analyze): New. Split basic block and rebuild
9688         dataflow.
9689         (block_label_after): Use SPLIT_BLOCK_AND_DF_ANALYZE instead of
9690         SPLIT_BLOCK.
9691         (split_pattern_seq): Likewise.
9692         (erase_matching_seqs): Likewise.
9693         (split_pattern_seq): Skip return insn in case of REG_NORETURN note.
9694
9695 2008-03-04  Geoff Keating  <geoffk@apple.com>
9696
9697         * fold-const.c (tree_single_nonnegative_warnv_p): Fix mixed
9698         declaration and code.
9699         (tree_invalid_nonnegative_warnv_p): Likewise.
9700
9701 2008-03-05  Serge Belyshev  <belyshev@depni.sinp.msu.ru>
9702
9703         * doc/install.texi (Testing): Correct quoting for the RUNTESTFLAGS
9704         examples.  Truncate option-names then causing overfull hbox.
9705
9706 2008-03-04  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
9707
9708         PR target/35222
9709         * configure.ac (CONFIG_SJLJ_EXCEPTIONS): Force SJLJ exceptions
9710         on hpux10.
9711         * configure: Rebuilt.
9712
9713 2008-03-04  Rafael Espindola  <espindola@google.com>
9714
9715         * fold-const.c (tree_simple_nonnegative_warnv_p): New.
9716         (tree_unary_nonnegative_warnv_p): New.
9717         (tree_binary_nonnegative_warnv_p): New.
9718         (tree_single_nonnegative_warnv_p): New.
9719         (tree_invalid_nonnegative_warnv_p): New.
9720         (tree_expr_nonnegative_warnv_p): Redefine in term of the new functions.
9721
9722 2008-03-04  Manuel Lopez-Ibanez  <manu@gcc.gnu.org>
9723
9724         PR 28322
9725         * opts.c (handle_option): Postpone 'unknown option' errors only for
9726         warning options.
9727
9728 2008-03-04  H.J. Lu  <hongjiu.lu@intel.com>
9729
9730         PR target/35453
9731         * config/i386/smmintrin.h (SIDD_XXX): Renamed to ...
9732         (_SIDD_XXX): This.
9733
9734 2008-03-04  Rafael Espindola  <espindola@google.com>
9735
9736         * fold-const.c (tree_unary_nonzero_warnv_p): New.
9737         (tree_binary_nonzero_warnv_p): New.
9738         (tree_single_nonzero_warnv_p): New.
9739         (tree_expr_nonzero_warnv_p): Redefine using the new functions.
9740
9741 2008-03-04  Uros Bizjak  <ubizjak@gmail.com>
9742
9743         PR middle-end/35456
9744         * fold-const.c (fold_cond_expr_with_comparison): Prevent
9745         transformations for modes that have signed zeros.
9746         * ifcvt.c (noce_try_abs): Ditto.
9747
9748 2008-03-04  Joseph Myers  <joseph@codesourcery.com>
9749
9750         * config/i386/i386.c (override_options): Force
9751         -maccumulate-outgoing-args on if TARGET_STACK_PROBE.
9752
9753 2008-03-04  Jan Hubicka  <jh@suse.cz>
9754
9755         PR c++/35262
9756         * ipa-inline.c (cgraph_decide_inlining_of_small_function): Fix typo
9757         in last commit.
9758
9759 2008-03-04  Danny Smith  <dannysmith@users.sourceforge.net>
9760
9761         * config/i386/i386.md (allocate_stack_worker_32): Use  __chkstk
9762         label to probe the stack.
9763
9764 2008-03-04  Danny Smith  <dannysmith@users.sourceforge.net>
9765
9766         * gthr-win32.h [__GTHREAD_HIDE_WIN32API]
9767         (__gthr_win32_mutex_destroy): Declare.
9768         [__GTHREAD_HIDE_WIN32API] (__gthread_mutex_destroy): Use
9769         __gthr_win32_mutex_destroy.
9770         * config/i386/gthr-win32.c  (__gthr_win32_mutex_destroy): Define.
9771
9772 2008-03-03  Jan Hubicka  <jh@suse.cz>
9773
9774         PR c++/35262
9775         * ipa-inline.c (cgraph_decide_inlining_of_small_function): Be more
9776         aggressive on inlining cold calls.
9777
9778 2008-03-03  Richard Guenther  <rguenther@suse.de>
9779
9780         * tree-ssa-sccvn.c (visit_reference_op_store): Do not insert
9781         struct copies into the expression table.
9782         (simplify_unary_expression): Handle VIEW_CONVERT_EXPR.
9783         (try_to_simplify): Likewise.
9784         * fold-const.c (fold_unary): Fold VIEW_CONVERT_EXPR of
9785         integral and pointer arguments which do not change the
9786         precision to NOP_EXPRs.
9787         * tree-ssa-loop-ivopts.c (may_be_nonaddressable_p): Adjust
9788         VIEW_CONVERT_EXPR case.
9789
9790 2008-03-02  Sebastian Pop  <sebastian.pop@amd.com>
9791
9792         * tree-scalar-evolution.c (instantiate_parameters_1): An SSA_NAME
9793         defined in a loop at depth 0 is invariant.
9794         * tree-chrec.c (evolution_function_is_invariant_rec_p): Ditto.
9795         * tree-ssa-loop-ivopts.c (expr_invariant_in_loop_p): Should never
9796         be called at loop depth 0.
9797
9798 2008-03-02  Jakub Jelinek  <jakub@redhat.com>
9799
9800         PR driver/35420
9801         * gcc.c (process_command): Update copyright notice dates.
9802         * gcov.c (print_version): Likewise.
9803         * gcov-dump.c (print_version): Likewise.
9804         * mips-tfile.c (main): Likewise.
9805         * mips-tdump.c (main): Likewise.
9806
9807 2008-03-02  Manuel Lopez-Ibanez  <manu@gcc.gnu.org>
9808
9809         PR 24924
9810         * c-common.c (flag_permissive): Delete.
9811         (constant_expression_warnings): Check flags first.
9812         (constant_expression_error): New.
9813         * c-common.h (flag_permissive): Delete.
9814         (constant_expression_error): Declare.
9815         * flags.h (flag_permissive): Declare. Update description.
9816         * diagnostic.c (pedwarn): Update.
9817         (permerror): New.
9818         * diagnostic.h: (pedantic_error_kind): Rename as pedantic_warning_kind.
9819         (permissive_error_kind): New.
9820         * toplev.c (flag_permissive): Define. Update description.
9821         * toplev.h (permissive_error_kind): Declare.
9822         * c-errors.c (pedwarn_c99): Use pedantic_warning_kind.
9823         (pedwarn_c90): Use pedantic_warning_kind.
9824         * c-opts.c (c_common_post_options): flag_permissive does not affect
9825         flag_pedantic_errors.
9826
9827 2008-03-02  Joseph Myers  <joseph@codesourcery.com>
9828
9829         * libgcc2.c (__addvSI3, __addvsi3, __addvDI3, __subvSI3,
9830         __subvsi3, __subvDI3, __negvSI2, __negvsi2, __negvDI2, __absvSI2,
9831         __absvsi2, __absvDI2): Use unsigned arithmetic.
9832
9833 2008-03-02  Andi Kleen  <ak@suse.de>
9834             Richard Guenther  <rguenther@suse.de>
9835
9836         * struct-equiv.c: Remove file.
9837         * cfg_cleanup.c (condjump_equiv_p): Remove.
9838         * Makefile.in (OBJS-common): Remove struct-equiv.o.
9839         (struct-equiv.o): Remove rule.
9840         * basic-block.h (struct_equiv_checkpoint, STRUCT_EQUIV_*,
9841         insns_match_p, struct_equiv_block_eq, struct_equiv_init, 
9842         rtx_equiv_p, condjump_equiv_p): Remove prototypes.
9843
9844 2008-03-01  Alexandre Oliva  <aoliva@redhat.com>
9845
9846         * ifcvt.c (noce_process_if_block): Try to handle only the then
9847         block if the else block exists but isn't suitable.
9848
9849 2008-03-01  Janne Blomqvist  <jb@gcc.gnu.org>
9850
9851         PR gcc/35063
9852         * gthr-posix.h (__gthread_mutex_destroy): Remove extra declarations.
9853         * gthr-posix95.h (__gthread_mutex_destroy): Likewise. Note this fixes
9854         regression from previous patch.
9855
9856 2008-03-01  Janne Blomqvist  <jb@gcc.gnu.org>
9857
9858         PR gcc/35063
9859         * gthr.h: Add __gthread_mutex_destroy as a function that must be
9860         implemented.
9861         * gthr-vxworks.h (__gthread_mutex_destroy): Null implementation.
9862         * gthr-single.h (__gthread_mutex_destroy): Likewise.
9863         * gthr-rtems.h (__gthread_mutex_destroy): Likewise.
9864         * gthr-mipssde.h (__gthread_mutex_destroy): Likewise.
9865         * gthr-nks.h (__gthread_mutex_destroy): Likewise.
9866         * gthr-solaris.h (__gthread_mutex_destroy): Call mutex_destroy.
9867         * gthr-win32.h (__GTHREAD_MUTEX_DESTROY_FUNCTION): Remove.
9868         (__gthread_mutex_destroy_function): Rename to
9869         __gthread_mutex_destroy.
9870         * gthr-dce.h (__gthread_mutex_destroy): Call
9871         pthread_mutex_destroy.
9872         * gthr-tpf.h (__gthread_mutex_destroy): Likewise.
9873         * gthr-posix.h (__gthread_mutex_destroy): Likewise.
9874         * gthr-posix95.h (__gthread_mutex_destroy): Likewise.
9875
9876 2008-03-01  Alexandre Oliva  <aoliva@redhat.com>
9877
9878         * df-scan.c (df_ref_chain_change_bb): Simplify.
9879         (df_insn_change_bb): Add new_bb argument.  Simplify.  Call
9880         set_block_for_insn if there's any change.
9881         * df.h ((df_insn_change_bb): Fix prototype.
9882         * cfgrtl.c (update_bb_for_insn_chain): Pass bb to
9883         df_insn_change_bb, don't call set_block_for_insn.
9884         * emit-rtl.c (reorder_insns): Likewise.
9885         * haifa-sched.c (move_insn): Likewise.
9886
9887 2008-03-01  Alexandre Oliva  <aoliva@redhat.com>
9888
9889         * rtlanal.c (loc_mentioned_in_p): Test XVECEXPs correctly.
9890
9891 2008-03-01  Alexandre Oliva  <aoliva@redhat.com>
9892
9893         * tree-flow-inline.h (next_readonly_imm_use): Return
9894         NULL_USE_OPERAND_P after the end.
9895
9896 2008-03-01  Richard Guenther  <rguenther@suse.de>
9897
9898         PR tree-optimization/35411
9899         * tree-sra.c (sra_build_assignment): Split conversion to
9900         final type to a separate statement if we are not assigning
9901         to a register.
9902
9903 2008-02-29  Francois-Xavier Coudert  <coudert@clipper.ens.fr>
9904
9905         * fold-const.c (fold_convertible_p): Correct the logic to follow
9906         that in fold_convert().
9907
9908 2008-02-29  Douglas Gregor  <doug.gregor@gmail.com>
9909
9910         PR c++/35315
9911         * tree-inline.c (build_duplicate_type): When we make a
9912         duplicate type, make it unique in the canonical types system.
9913
9914 2008-02-29  Tom Tromey  <tromey@redhat.com>
9915
9916         * toplev.c (input_file_stack, input_file_stack_tick, fs_p,
9917         input_file_stack_history, input_file_stack_restored): Remove.
9918         (push_srcloc, pop_srcloc, restore_input_file_stack): Likewise.
9919         * input.h (struct file_stack): Remove.
9920         (push_srcloc, pop_srcloc, restore_input_file_stack): Likewise.
9921         (input_file_stack, input_file_stack_tick, INPUT_FILE_STACK_BITS):
9922         Likewise.
9923         * diagnostic.h (struct diagnostic_context) <last_module>: Change
9924         type.
9925         (diagnostic_last_module_changed): Add 'map' argument.
9926         (diagnostic_set_last_function): Likewise.
9927         * diagnostic.c (undiagnostic_report_current_module): Iterate using
9928         line map, not input_file_stack.
9929         * c-lex.c (fe_file_change): Don't use push_srcloc or pop_srcloc.
9930
9931 2008-02-29  Paul Brook  <paul@codesourcery.com>
9932
9933         * config/arm/arm.md (arm_addsi3): Add r/k/n alternative.
9934
9935 2008-02-29  Paul Brook  <paul@codesourcery.com>
9936
9937         * config/arm/ieee754-df.S (muldf3): Use RET macros.
9938
9939 2008-02-29  Richard Guenther  <rguenther@suse.de>
9940
9941         * tree-ssa-pre.c (get_sccvn_value): Create missing VNs via
9942         vn_lookup_or_add.
9943         * tree-ssa-sccnv.c (visit_reference_op_store): Use the rhs
9944         value for comparing for a store match.
9945         (simplify_unary_expression): Do nothing for SSA_NAMEs.
9946         (try_to_simplify): Do not do a full-blown reference lookup.
9947
9948 2008-02-29  Kaz Kojima  <kkojima@gcc.gnu.org>
9949
9950         * config/sh/sh.c (sh_scalar_mode_supported_p): New function.
9951         (TARGET_SCALAR_MODE_SUPPORTED_P): Define.
9952
9953         * config/sh/sh.h (OVERRIDE_OPTIONS): Don't warn for profiling.
9954
9955 2008-02-29  Sebastian Pop  <sebastian.pop@amd.com>
9956
9957         * tree-loop-linear.c (try_interchange_loops): Compare memory access
9958         strides against cache sizes.
9959
9960 2008-02-29  Kaz Kojima  <kkojima@gcc.gnu.org>
9961
9962         * config/sh/sh.c (sh_secondary_reload): Handle loading a float
9963         constant to fpul.
9964
9965 2008-02-28  Richard Sandiford  <rsandifo@nildram.co.uk>
9966
9967         * simplify-rtx.c (simplify_unary_operation_1): Extend the handling
9968         of SUBREG_PROMOTED_VAR_P to cope with cases where the extended value
9969         is smaller than the original promoted value.
9970         (simplify_subreg): If OP is a SUBREG, try to preserve its
9971         SUBREG_PROMOTED_VAR_P information.
9972
9973 2008-02-28  Steven Bosscher  <stevenb.gcc@gmail.com>
9974
9975         * tree-ssa-sccvn (vn_ssa_aux_obstack): New obstack.
9976         (VN_INFO_GET): Allocate new objects on the obstack.
9977         (init_scc_vn): Initialize the obstack.  Use XDELETE instead of free
9978         for rpo_numbers_temp, for consistency.
9979         (free_scc_vn): Free the obstack.
9980
9981 2008-02-28  Sebastian Pop  <sebastian.pop@amd.com>
9982
9983         * doc/invoke.texi: Document -ftree-loop-distribution.
9984         * tree-loop-distribution.c: New.
9985         * tree-pass.h (pass_loop_distribution): New.
9986         * graphds.h (struct graph): Add htab_t indices.
9987         * timevar.def (TV_TREE_LOOP_DISTRIBUTION): New.
9988         * tree-vectorizer.c (rename_variables_in_loop): Extern.
9989         (slpeel_tree_duplicate_loop_to_edge_cfg): Init PENDING_STMT to NULL.
9990         * tree-vectorizer.h (tree_duplicate_loop_on_edge): Declared.
9991         * tree-data-ref.c (debug_data_dependence_relations): New.
9992         (dump_data_dependence_relation): Also print data references.
9993         (free_data_ref): Extern.
9994         (same_access_functions): Moved...
9995         (find_vertex_for_stmt): Renamed rdg_vertex_for_stmt.
9996         (dump_rdg_vertex, debug_rdg_vertex, dump_rdg_component,
9997         debug_rdg_component, dump_rdg, debug_rdg, dot_rdg_1, dot_rdg,
9998         struct rdg_vertex_info, rdg_vertex_for_stmt): New.
9999         (create_rdg_edge_for_ddr, create_rdg_vertices): Cleaned up.
10000         (stmts_from_loop): Skip LABEL_EXPR.
10001         (hash_stmt_vertex_info, eq_stmt_vertex_info, hash_stmt_vertex_del):
10002         New.
10003         (build_rdg): Initialize rdg->indices htab.
10004         (free_rdg, stores_from_loop, ref_base_address,
10005         rdg_defs_used_in_other_loops_p, have_similar_memory_accesses,
10006         have_similar_memory_accesses_1, ref_base_address_1,
10007         remove_similar_memory_refs): New.
10008         * tree-data-ref.h: Depend on tree-chrec.h.
10009         (debug_data_dependence_relations, free_data_ref): Declared.
10010         (same_access_functions): ... here.
10011         (ddr_is_anti_dependent, ddrs_have_anti_deps, ddr_dependence_level):
10012         New.
10013         (struct rdg_vertex): Add has_mem_write and has_mem_reads.
10014         (RDGV_HAS_MEM_WRITE, RDGV_HAS_MEM_READS, RDG_STMT,
10015         RDG_MEM_WRITE_STMT, RDG_MEM_READS_STMT): New.
10016         (dump_rdg_vertex, debug_rdg_vertex, dump_rdg_component,
10017         debug_rdg_component, dump_rdg, debug_rdg, dot_rdg,
10018         rdg_vertex_for_stmt): Declared.
10019         (struct rdg_edge): Add level.
10020         (RDGE_LEVEL): New.
10021         (free_rdg, stores_from_loop, remove_similar_memory_refs,
10022         rdg_defs_used_in_other_loops_p, have_similar_memory_accesses):
10023         Declared.
10024         (rdg_has_similar_memory_accesses): New.
10025         * tree-vect-analyze.c: Remove unused static decls.
10026         * lambda.h (dependence_level): New.
10027         * common.opt (ftree-loop-distribution): New.
10028         * tree-flow.h (mark_virtual_ops_in_bb, 
10029         slpeel_tree_duplicate_loop_to_edge_cfg,
10030         rename_variables_in_loop): Declared.
10031         * Makefile.in (TREE_DATA_REF_H): Depend on tree-chrec.h.
10032         (OBJS-common): Add tree-loop-distribution.o.
10033         (tree-loop-distribution.o): New rule.
10034         * tree-cfg.c (mark_virtual_ops_in_bb): New.
10035         (mark_virtual_ops_in_region): Use mark_virtual_ops_in_bb.
10036         * passes.c (init_optimization_passes): Schedule pass_loop_distribution.
10037
10038 2008-02-28  Joseph Myers  <joseph@codesourcery.com>
10039
10040         PR target/33963
10041         * tree.c (handle_dll_attribute): Disallow TYPE_DECLs for types
10042         other than structures and unions.
10043
10044 2008-02-28  Richard Guenther  <rguenther@suse.de>
10045
10046         Revert:
10047         2008-02-26  Richard Guenther  <rguenther@suse.de>
10048
10049         * tree-flow.h (uid_decl_map_hash, uid_decl_map_eq): Move ...
10050         * tree.h (uid_decl_map_hash, uid_decl_map_eq): ... here.
10051         (lookup_decl_from_uid): Declare.
10052         (remove_decl_from_map): Likewise.
10053         * tree-ssa.c (uid_decl_map_eq, uid_decl_map_hash): Move ...
10054         * tree.c (uid_decl_map_eq, uid_decl_map_hash): ... here.
10055         (decl_for_uid_map): New global hashtable mapping DECL_UID
10056         to the decl tree.
10057         (init_ttree): Allocate it.
10058         (insert_decl_to_uid_decl_map): New helper function.
10059         (make_node_stat): Insert new decls into the map.
10060         (copy_node_stat): Likewise.
10061         (lookup_decl_from_uid): New function.
10062         (remove_decl_from_map): Likewise.
10063         (print_decl_for_uid_map_statistics): New helper.
10064         (dump_tree_statistics): Call it.
10065
10066         * tree-flow.h (struct gimple_df): Make referenced_vars a bitmap.
10067         (referenced_var_iterator): Adjust.
10068         (FOR_EACH_REFERENCED_VAR): Adjust.
10069         (FOR_EACH_REFERENCED_VAR_IN_BITMAP): New iterator.
10070         (num_referenced_vars): Adjust.
10071         * tree-flow-inline.h (gimple_referenced_vars): Adjust.
10072         (first_referenced_var): Remove.
10073         (end_referenced_vars_p): Likewise.
10074         (next_referenced_var): Likewise.
10075         (referenced_var_iterator_set): New helper function.
10076         * tree-dfa.c (referenced_var_lookup): Adjust.
10077         (referenced_var_check_and_insert): Likewise.
10078         (remove_referenced_var): Likewise.
10079         * tree-ssa.c (verify_flow_insensitive_alias_info): Use
10080         FOR_EACH_REFERENCED_VAR_IN_BITMAP.
10081         (verify_call_clobbering): Likewise.
10082         (verify_memory_partitions): Likewise.
10083         (init_tree_ssa): Allocate bitmap instead of hashtable for
10084         referenced_vars.
10085         (delete_tree_ssa): Adjust.
10086         * tree-ssa-alias.c (mark_aliases_call_clobbered): Use
10087         FOR_EACH_REFERENCED_VAR_IN_BITMAP.
10088         (compute_tag_properties): Likewise.
10089         (set_initial_properties): Likewise.
10090         (find_partition_for): Likewise.
10091         (update_reference_counts): Likewise.
10092         (dump_may_aliases_for): Likewise.
10093         * tree-ssa-operands.c (add_virtual_operand): Likewise.
10094         (add_call_clobber_ops): Likewise.
10095         (add_call_read_ops): Likewise.
10096         (get_asm_expr_operands): Likewise.
10097         * tree-into-ssa.c (dump_decl_set): Likewise.
10098         (update_ssa): Likewise.
10099         * tree-sra.c (scan_function): Likewise.
10100         (decide_instantiations): Likewise.
10101         (scalarize_parms): Likewise.
10102         * tree-ssa-alias-warnings.c (build_reference_table): Likewise.
10103         (dsa_named_for): Likewise.
10104         * tree-ssa-structalias.c (update_alias_info): Likewise.
10105         (merge_smts_into): Likewise.
10106
10107 2008-02-27  David Daney  <ddaney@avtrex.com>
10108
10109         PR target/34409
10110         * config/mips/iris.h (MIPS_DEBUGGING_INFO): Define.
10111         * config/mips/openbsd.h (MIPS_DEBUGGING_INFO): Same.
10112         * config/mips/sde.h (MIPS_DEBUGGING_INFO): Remove undef.
10113         * config/mips/vxworks.h (MIPS_DEBUGGING_INFO): Same.
10114         * config/mips/mips.h (MIPS_DEBUGGING_INFO): Remove define.
10115
10116 2008-02-27  Uros Bizjak  <ubizjak@gmail.com>
10117
10118         PR target/25477
10119         * config/darwin-ppc-ldouble-patch.def (BUILT_IN_NANL): Add.
10120         (BUILT_IN_NEXTTOWARD): Remove.
10121         (BUILT_IN_NEXTTOWARDF): Ditto.
10122         * config/darwin.c (darwin_patch_builtin): Use ACONCAT instead of
10123         alloca/strcpy/strcat.  Remove commented-out code.  Fix whitespace.
10124
10125 2008-02-27  Tom Tromey  <tromey@redhat.com>
10126
10127         * tree-dump.c (dequeue_and_dump) <FUNCTION_DECL>: Check
10128         DECL_SAVED_TREE, not DECL_LANG_SPECIFIC, when dumping body.
10129
10130 2008-02-27  Jan Beulich  <jbeulich@novell.com>
10131
10132         * c-decl.c (merge_decls): Use DECL_USER_ALIGN() on olddecl to
10133         update the respective field on newdecl.
10134
10135 2008-02-27  Revital Eres  <eres@il.ibm.com>
10136
10137         PR rtl-optimization/34999
10138         * bb-reorder.c (add_labels_and_missing_jumps): Do not handle
10139         crossing edges that ends with a call insn.
10140         (fix_up_fall_thru_edges): Handle crossing edges that ends with a
10141         call insn and clear the EDGE_CROSSING flag of the crossing edge
10142         when fixing fallthru edges.
10143
10144 2008-02-27  Richard Guenther  <rguenther@suse.de>
10145
10146         PR middle-end/35390
10147         * fold-const.c (fold_unary): Return the correct argument,
10148         converted to the result type.
10149
10150 2008-02-27  Richard Guenther  <rguenther@suse.de>
10151
10152         PR middle-end/34971
10153         * expr.c (expand_expr_real_1): Assert on rotates that operate
10154         on partial modes.
10155         * fold-const.c (fold_binary): Use the types precision, not the
10156         bitsize of the mode if folding rotate expressions.  Build rotates
10157         only for full modes.
10158
10159 2008-02-27  Jakub Jelinek  <jakub@redhat.com>
10160
10161         * c-ppoutput.c (scan_translation_unit): Handle CPP_PRAGMA
10162         and CPP_PRAGMA_EOL.
10163         * c-pragma.c (pragma_ns_name): New typedef.
10164         (registered_pp_pragmas): New variable.
10165         (c_pp_lookup_pragma): New function.
10166         (c_register_pragma_1): If flag_preprocess_only, do nothing
10167         for non-expanded pragmas, for expanded ones push pragma's
10168         namespace and name into registered_pp_pragmas vector.
10169         (c_invoke_pragma_handler): Register OpenMP pragmas even when
10170         flag_preprocess_only, don't register GCC pch_preprocess
10171         pragma if flag_preprocess_only.
10172         * c-opts.c (c_common_init): Call init_pragma even if
10173         flag_preprocess_only.
10174         * c-pragma.c (c_pp_lookup_pragma): New prototype.
10175         * config/darwin.h (DARWIN_REGISTER_TARGET_PRAGMAS): Don't call
10176         cpp_register_pragma if flag_preprocess_only.
10177
10178 2008-02-26  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
10179
10180         PR c/28800
10181         * c-parser.c (c_parser_translation_unit): Warn for empty
10182         translation unit, not empty source file.
10183
10184 2008-02-26  Paul Brook  <paul@codesourcery.com>
10185
10186         * config/arm/arm.c (thumb_set_frame_pointer): Ensure SP is first
10187         operand for Thumb-2.
10188         * config/arm/arm.h (reg_class): Add CORE_REGS.
10189         (REG_CLASS_NAMES, REG_CLASS_CONTENTS): Ditto.
10190         (BASE_REG_CLASS): Use CORE_REGS.
10191         (PREFERRED_RELOAD_CLASS): Add STACK_REG.
10192         (REGNO_MODE_OK_FOR_REG_BASE_P): Use REGNO_MODE_OK_FOR_BASE_P.
10193         (REGNO_OK_FOR_INDEX_P): Exclude SP.
10194         (ARM_REG_OK_FOR_INDEX_P): Always define.  Use
10195         ARM_REGNO_OK_FOR_INDEX_P.
10196         (ARM_PRINT_OPERAND_ADDRESS): Swap operands for [reg, sp].
10197         * config/arm/arm.md (arm_addsi3, thumb1_addsi3, arm_subsi3_insn,
10198         arm_movsi_insn, thumb1_movsi_insni, stack_tie): Add "k" alternatives.
10199         (ldm/stm peepholes): Ditto.
10200         * config/arm/thumb2.md (thumb2_movdi): Add "k" alternatives.
10201         * config/arm/vfp.md (arm_movsi_vfp, thumb2_movsi_vfp): Ditto.
10202         * config/arm/iwmmxt.md (iwmmxt_movsi_insn): Ditto.
10203         * config/arm/constraints.md: Enable "k" constraint on ARM.
10204
10205 2008-02-27  Ben Elliston  <bje@au.ibm.com>
10206
10207         * config/rs6000/rs6000.c: Annotate cache line size field in all
10208         instances of struct processor_costs.
10209
10210 2008-02-26  David Edelsohn  <edelsohn@gnu.org>
10211
10212         * dbgcnt.def (cfg_cleanup, cprop1, cprop2, dce_fast, dce_ud, dse1,
10213         dse2, gcse, if_conversion, if_after_combine, if_after_reload,
10214         jump_bypass): New counters.
10215         * cfgcleanup.c (cleanup_cfg): Add dbg_cnt.
10216         * dce.c (gate_ud_dce): Same.
10217         (gate_fast_dce): Same.
10218         * dse.c (gate_dse1): New function.
10219         (gate_dse2): New function.
10220         (gate_dse): Merge results of new gate functions.
10221         * gcse.c (gcse_main): Bracket cprop1 and cprop2 with dbg_cnt.
10222         (gate_handle_jump_bypass): Add dbg_cnt.
10223         (gate_handle_gcse): Add dbg_cnt.
10224         * ifcvt.c (gate_handle_if_conversion): Same.
10225         (gate_handle_if_after_combine): Same.
10226         (gate_handle_if_after_reload): Same.
10227         * Makefile.in: Add DBGCNT_H to cfgcleanup.o and ifcvt.o.
10228
10229 2008-02-26  Edmar Wienskoski  <edmar@freescale.com>
10230
10231         * config/rs6000/rs6000.c (processor_costs): Update e300 cache
10232         line sizes.
10233         * doc/invoke.texi: Add e300c2 and e300c3 to list of cpus.
10234
10235 2008-02-26  Jason Merrill  <jason@redhat.com>
10236
10237         PR c++/35315
10238         * attribs.c (decl_attributes): Leave ATTR_FLAG_TYPE_IN_PLACE 
10239         alone if it's the naming decl for the type's main variant.
10240
10241 2008-02-26  Tom Tromey  <tromey@redhat.com>
10242
10243         * system.h (USE_MAPPED_LOCATION): Poison.
10244         * Makefile.in (GTFILES): Put CPP_ID_DATA_H first.
10245         * tree-cfg.c (make_cond_expr_edges): Remove old location code.
10246         (make_goto_expr_edges): Likewise.
10247         (remove_bb): Likewise.
10248         (execute_warn_function_return): Likewise.
10249         * basic-block.h (struct edge_def) <goto_locus>: Change type to
10250         location_t.
10251         * c-common.c (fname_decl): Remove old location code.
10252         * tree-vect-transform.c (vect_finish_stmt_generation): Remove old
10253         location code.
10254         * rtl.h (ASM_OPERANDS_SOURCE_LOCATION): Remove old-location
10255         variant.
10256         (ASM_INPUT_SOURCE_LOCATION): Likewise.
10257         (gen_rtx_ASM_INPUT): Likewise.
10258         (gen_rtx_ASM_INPUT_loc): Likewise.
10259         (get_rtx_asm_OPERANDS): Remove.
10260         * cfglayout.c (insn_locators_alloc): Remove old location code.
10261         (set_curr_insn_source_location): Likewise.
10262         (curr_insn_locator): Likewise.
10263         * print-tree.c (print_node): Remove old location code.
10264         * tree-mudflap.c (mf_varname_tree): Remove old location code.
10265         (mf_file_function_line_tree): Remove test of USE_MAPPED_LOCATION.
10266         * cfgexpand.c (expand_gimple_cond_expr): Don't use
10267         location_from_locus.
10268         (construct_exit_block): Remove old location code.
10269         * emit-rtl.c (force_next_line_note): Remove old location code.
10270         * profile.c (branch_prob): Remove old location code.
10271         * tree-vectorizer.h (LOC, UNKNOWN_LOC, EXPR_LOC, LOC_FILE,
10272         LOC_LINE): Remove old-location variants.
10273         * langhooks.c (lhd_print_error_function): Remove old location
10274         code.
10275         * configure, config.in: Rebuilt.
10276         * configure.ac (--enable-mapped-location): Remove.
10277         * c-decl.c (c_init_decl_processing): Remove old location code.
10278         (finish_function): Likewise.
10279         * recog.c (decode_asm_operands): Remove old location code.
10280         * c-pch.c (c_common_read_pch): Remove old location code.
10281         * rtl.def (ASM_INPUT, ASM_OPERANDS): Remove old location
10282         variants.
10283         * gimple-low.c (lower_function_body): Remove old location code.
10284         * toplev.c (unknown_location): Remove.
10285         (push_srcloc): Remove old-location variant.
10286         (process_options): Remove old location code.
10287         (lang_dependent_init): Likewise.
10288         * input.h (UNKNOWN_LOCATION): Move definition.
10289         (location_t): Undeprecate.
10290         (source_locus): Remove.
10291         (location_from_locus): Remove.
10292         (struct location_s): Remove.
10293         Remove all old-location code.
10294         (input_line, input_filename): Remove.
10295         * final.c (final_scan_insn): Remove old location code.
10296         * diagnostic.c (diagnostic_build_prefix): Remove
10297         USE_MAPPED_LOCATION test.
10298         * tree.h (gimple_stmt) <locus>: Now a location_t.
10299         (tree_exp) <locus>: Likewise.
10300         (DECL_IS_BUILTIN): Remove old-location variant.
10301         (annotate_with_file_line, annotate_with_locus): Likewise.
10302         (expr_locus, set_expr_locus): Update.
10303         * tree.c (build1_stat): Remove old location code.
10304         (last_annotated_node): Remove.
10305         (annotate_with_file_line): Remove old-location variant.
10306         (annotate_with_locus): Likewise.
10307         (expr_location): Remove old location code.
10308         (set_expr_location): Likewise.
10309         (expr_has_location): Likewise.
10310         (expr_locus): Likewise.
10311         (set_expr_locus): Likewise.
10312         (expr_filename): Don't use location_from_locus.
10313         (expr_lineno): Likewise.
10314         * rtl-error.c (location_for_asm): Remove old location code.
10315         * c-lex.c (cb_line_change): Remove old location code.
10316         (fe_file_change): Likewise.
10317         (cb_def_pragma): Likewise.
10318         (c_lex_with_flags): Likewise.
10319         * gengtype.c (do_typedef): Don't special-case location types.
10320         (define_location_structures): Remove.
10321         (main): Don't call define_location_structures.
10322         * tree-pretty-print.c (dump_implicit_edges): Remove old location
10323         code.
10324
10325 2008-02-26  Manuel Lopez-Ibanez  <manu@gcc.gnu.org>
10326
10327         PR 26264
10328         * builtins.def (BUILT_IN_STDARG_START): Remove.
10329         * builtins.c (expand_builtin): Remove BUILT_IN_STDARG_START.
10330         * tree-stdarg.c (execute_optimize_stdarg): Likewise.
10331         * tree-inline.c (inline_forbidden_p_1): Likewise.
10332         
10333 2008-02-26  Richard Guenther  <rguenther@suse.de>
10334
10335         * tree-flow.h (uid_decl_map_hash, uid_decl_map_eq): Move ...
10336         * tree.h (uid_decl_map_hash, uid_decl_map_eq): ... here.
10337         (lookup_decl_from_uid): Declare.
10338         (remove_decl_from_map): Likewise.
10339         * tree-ssa.c (uid_decl_map_eq, uid_decl_map_hash): Move ...
10340         * tree.c (uid_decl_map_eq, uid_decl_map_hash): ... here.
10341         (decl_for_uid_map): New global hashtable mapping DECL_UID
10342         to the decl tree.
10343         (init_ttree): Allocate it.
10344         (insert_decl_to_uid_decl_map): New helper function.
10345         (make_node_stat): Insert new decls into the map.
10346         (copy_node_stat): Likewise.
10347         (lookup_decl_from_uid): New function.
10348         (remove_decl_from_map): Likewise.
10349         (print_decl_for_uid_map_statistics): New helper.
10350         (dump_tree_statistics): Call it.
10351
10352         * tree-flow.h (struct gimple_df): Make referenced_vars a bitmap.
10353         (referenced_var_iterator): Adjust.
10354         (FOR_EACH_REFERENCED_VAR): Adjust.
10355         (FOR_EACH_REFERENCED_VAR_IN_BITMAP): New iterator.
10356         (num_referenced_vars): Adjust.
10357         * tree-flow-inline.h (gimple_referenced_vars): Adjust.
10358         (first_referenced_var): Remove.
10359         (end_referenced_vars_p): Likewise.
10360         (next_referenced_var): Likewise.
10361         (referenced_var_iterator_set): New helper function.
10362         * tree-dfa.c (referenced_var_lookup): Adjust.
10363         (referenced_var_check_and_insert): Likewise.
10364         (remove_referenced_var): Likewise.
10365         * tree-ssa.c (verify_flow_insensitive_alias_info): Use
10366         FOR_EACH_REFERENCED_VAR_IN_BITMAP.
10367         (verify_call_clobbering): Likewise.
10368         (verify_memory_partitions): Likewise.
10369         (init_tree_ssa): Allocate bitmap instead of hashtable for
10370         referenced_vars.
10371         (delete_tree_ssa): Adjust.
10372         * tree-ssa-alias.c (mark_aliases_call_clobbered): Use
10373         FOR_EACH_REFERENCED_VAR_IN_BITMAP.
10374         (compute_tag_properties): Likewise.
10375         (set_initial_properties): Likewise.
10376         (find_partition_for): Likewise.
10377         (update_reference_counts): Likewise.
10378         (dump_may_aliases_for): Likewise.
10379         * tree-ssa-operands.c (add_virtual_operand): Likewise.
10380         (add_call_clobber_ops): Likewise.
10381         (add_call_read_ops): Likewise.
10382         (get_asm_expr_operands): Likewise.
10383         * tree-into-ssa.c (dump_decl_set): Likewise.
10384         (update_ssa): Likewise.
10385         * tree-sra.c (scan_function): Likewise.
10386         (decide_instantiations): Likewise.
10387         (scalarize_parms): Likewise.
10388         * tree-ssa-alias-warnings.c (build_reference_table): Likewise.
10389         (dsa_named_for): Likewise.
10390         * tree-ssa-structalias.c (update_alias_info): Likewise.
10391         (merge_smts_into): Likewise.
10392
10393 2008-02-26  Manuel Lopez-Ibanez  <manu@gcc.gnu.org>
10394
10395         PR 34351
10396         * doc/invoke.texi (-Wall): Add -Wvolatile-register-var.
10397         * c-opts.c (c_common_handle_option): Wall enables
10398         Wvolatile-register-var.
10399         * common.opt: Move Wvolatile-register-var to...
10400         * c.opt: ...here.
10401         
10402 2008-02-26  Manuel Lopez-Ibanez  <manu@gcc.gnu.org>
10403
10404         * common.opt (Wlarger-than=): New.
10405         * doc/invoke.texi (Warning Options): Replace -Wlarger-than- with
10406         -Wlarger-than=.
10407         * opts.c (common_handle_option): Handle -Wlarger-than=.
10408         * optc-gen.awk: Likewise.
10409         * opth-gen.awk: Likewise.
10410         * stor-layout.c (layout_decl): Use -Wlarger-than= for warning.
10411         * tree-optimize.c (tree_rest_of_compilation): Likewise.
10412         
10413 2008-02-26  Manuel Lopez-Ibanez <manu@gcc.gnu.org>
10414
10415         * c-common.c (match_case_to_enum_1): Add appropriate
10416         OPT_W* parameter to warning.
10417         (c_do_switch_warnings): Likewise.
10418         * c-typeck.c (warning_init): Add one more parameter following
10419         'warning' function.
10420         (push_init_level): Update call to warning_init.
10421         (pop_init_level): Likewise.
10422         (add_pending_init): Likewise.
10423         (output_init_element: Likewise.
10424
10425 2008-02-26  Manuel Lopez-Ibanez  <manu@gcc.gnu.org>
10426
10427         PR 28322
10428         * toplev.c (toplev_main): If there are warnings or error, print
10429         errors for ignored options.
10430         * opts.c (ignored_options): New static variable.
10431         (postpone_unknown_option_error): New.
10432         (print_ignored_options): New.
10433         (handle_option): Postpone errors for unknown -Wno-* options.
10434         * opts.h (print_ignored_options): Declare.
10435         
10436 2008-02-25  Richard Sandiford  <rsandifo@nildram.co.uk>
10437
10438         * config/mips/mips.md (loadgp_blockage, blockage): Change type
10439         to "ghost".
10440
10441 2008-02-25  Richard Guenther  <rguenther@suse.de>
10442
10443         Revert:
10444         2008-02-25  Richard Guenther  <rguenther@suse.de>
10445
10446         * tree-flow.h (uid_decl_map_hash, uid_decl_map_eq): Move ...
10447         * tree.h (uid_decl_map_hash, uid_decl_map_eq): ... here.
10448         (lookup_decl_from_uid): Declare.
10449         * tree-ssa.c (uid_decl_map_eq, uid_decl_map_hash): Move ...
10450         * tree.c (uid_decl_map_eq, uid_decl_map_hash): ... here.
10451         (decl_for_uid_map): New global hashtable mapping DECL_UID
10452         to the decl tree.
10453         (init_ttree): Allocate it.
10454         (insert_decl_to_uid_decl_map): New helper function.
10455         (make_node_stat): Insert new decls into the map.
10456         (copy_node_stat): Likewise.
10457         (lookup_decl_from_uid): New function.
10458         (print_decl_for_uid_map_statistics): New helper.
10459         (dump_tree_statistics): Call it.
10460
10461         * tree-flow.h (struct gimple_df): Make referenced_vars a bitmap.
10462         (referenced_var_iterator): Adjust.
10463         (FOR_EACH_REFERENCED_VAR): Adjust.
10464         (FOR_EACH_REFERENCED_VAR_IN_BITMAP): New iterator.
10465         (num_referenced_vars): Adjust.
10466         * tree-flow-inline.h (gimple_referenced_vars): Adjust.
10467         (first_referenced_var): Remove.
10468         (end_referenced_vars_p): Likewise.
10469         (next_referenced_var): Likewise.
10470         (referenced_var_iterator_set): New helper function.
10471         * tree-dfa.c (referenced_var_lookup): Adjust.
10472         (referenced_var_check_and_insert): Likewise.
10473         (remove_referenced_var): Likewise.
10474         * tree-ssa.c (verify_flow_insensitive_alias_info): Use
10475         FOR_EACH_REFERENCED_VAR_IN_BITMAP.
10476         (verify_call_clobbering): Likewise.
10477         (verify_memory_partitions): Likewise.
10478         (init_tree_ssa): Allocate bitmap instead of hashtable for
10479         referenced_vars.
10480         (delete_tree_ssa): Adjust.
10481         * tree-ssa-alias.c (mark_aliases_call_clobbered): Use
10482         FOR_EACH_REFERENCED_VAR_IN_BITMAP.
10483         (compute_tag_properties): Likewise.
10484         (set_initial_properties): Likewise.
10485         (find_partition_for): Likewise.
10486         (update_reference_counts): Likewise.
10487         (dump_may_aliases_for): Likewise.
10488         * tree-ssa-operands.c (add_virtual_operand): Likewise.
10489         (add_call_clobber_ops): Likewise.
10490         (add_call_read_ops): Likewise.
10491         (get_asm_expr_operands): Likewise.
10492         * tree-into-ssa.c (dump_decl_set): Likewise.
10493         (update_ssa): Likewise.
10494         * tree-sra.c (scan_function): Likewise.
10495         (decide_instantiations): Likewise.
10496         (scalarize_parms): Likewise.
10497         * tree-ssa-alias-warnings.c (build_reference_table): Likewise.
10498         (dsa_named_for): Likewise.
10499         * tree-ssa-structalias.c (update_alias_info): Likewise.
10500         (merge_smts_into): Likewise.
10501
10502 2008-02-25  Janne Blomqvist  <jb@gcc.gnu.org>
10503
10504         PR fortran/29549
10505         * doc/invoke.texi (-fcx-limited-range): Document new option.
10506         * toplev.c (process_options): Handle -fcx-fortran-rules.
10507         * common.opt: Add documentation for -fcx-fortran-rules.
10508
10509 2008-02-25  Janne Blomqvist  <jb@gcc.gnu.org>
10510
10511         PR c/35162
10512         * doc/invoke.texi (-fcx-limited-range): Correct to be in line with
10513         actual behaviour and C99.
10514         
10515 2008-02-26  Ben Elliston  <bje@au.ibm.com>
10516
10517         * config/rs6000/rs6000.h (ASM_CPU_POWER5_SPEC): Define.
10518         (ASM_CPU_POWER6_SPEC): Likewise.
10519         (ASM_CPU_SPEC): Pass %(asm_cpu_power5) for -mcpu=power5.
10520         Likewise, pass %(asm_cpu_power6) for -mcpu=power6.
10521         (EXTRA_SPECS): Add asm_cpu_power5, asm_cpu_power6 spec strings.
10522
10523 2008-02-25  Richard Guenther  <rguenther@suse.de>
10524
10525         * tree-flow.h (uid_decl_map_hash, uid_decl_map_eq): Move ...
10526         * tree.h (uid_decl_map_hash, uid_decl_map_eq): ... here.
10527         (lookup_decl_from_uid): Declare.
10528         * tree-ssa.c (uid_decl_map_eq, uid_decl_map_hash): Move ...
10529         * tree.c (uid_decl_map_eq, uid_decl_map_hash): ... here.
10530         (decl_for_uid_map): New global hashtable mapping DECL_UID
10531         to the decl tree.
10532         (init_ttree): Allocate it.
10533         (insert_decl_to_uid_decl_map): New helper function.
10534         (make_node_stat): Insert new decls into the map.
10535         (copy_node_stat): Likewise.
10536         (lookup_decl_from_uid): New function.
10537         (print_decl_for_uid_map_statistics): New helper.
10538         (dump_tree_statistics): Call it.
10539
10540         * tree-flow.h (struct gimple_df): Make referenced_vars a bitmap.
10541         (referenced_var_iterator): Adjust.
10542         (FOR_EACH_REFERENCED_VAR): Adjust.
10543         (FOR_EACH_REFERENCED_VAR_IN_BITMAP): New iterator.
10544         (num_referenced_vars): Adjust.
10545         * tree-flow-inline.h (gimple_referenced_vars): Adjust.
10546         (first_referenced_var): Remove.
10547         (end_referenced_vars_p): Likewise.
10548         (next_referenced_var): Likewise.
10549         (referenced_var_iterator_set): New helper function.
10550         * tree-dfa.c (referenced_var_lookup): Adjust.
10551         (referenced_var_check_and_insert): Likewise.
10552         (remove_referenced_var): Likewise.
10553         * tree-ssa.c (verify_flow_insensitive_alias_info): Use
10554         FOR_EACH_REFERENCED_VAR_IN_BITMAP.
10555         (verify_call_clobbering): Likewise.
10556         (verify_memory_partitions): Likewise.
10557         (init_tree_ssa): Allocate bitmap instead of hashtable for
10558         referenced_vars.
10559         (delete_tree_ssa): Adjust.
10560         * tree-ssa-alias.c (mark_aliases_call_clobbered): Use
10561         FOR_EACH_REFERENCED_VAR_IN_BITMAP.
10562         (compute_tag_properties): Likewise.
10563         (set_initial_properties): Likewise.
10564         (find_partition_for): Likewise.
10565         (update_reference_counts): Likewise.
10566         (dump_may_aliases_for): Likewise.
10567         * tree-ssa-operands.c (add_virtual_operand): Likewise.
10568         (add_call_clobber_ops): Likewise.
10569         (add_call_read_ops): Likewise.
10570         (get_asm_expr_operands): Likewise.
10571         * tree-into-ssa.c (dump_decl_set): Likewise.
10572         (update_ssa): Likewise.
10573         * tree-sra.c (scan_function): Likewise.
10574         (decide_instantiations): Likewise.
10575         (scalarize_parms): Likewise.
10576         * tree-ssa-alias-warnings.c (build_reference_table): Likewise.
10577         (dsa_named_for): Likewise.
10578         * tree-ssa-structalias.c (update_alias_info): Likewise.
10579         (merge_smts_into): Likewise.
10580
10581 2008-02-25  Andreas Krebbel  <krebbel1@de.ibm.com>
10582
10583         PR target/35258
10584         * cse.c (cse_insn): Avoid creation of overlapping MEMs.
10585         * alias.c (nonoverlapping_memrefs_p): Export for use in other modules.
10586         * alias.h (nonoverlapping_memrefs_p): Likewise.
10587
10588 2008-02-25  Jan Beulich  <jbeulich@novell.com>
10589
10590         * Makefile.in: Also prefix uses of crt0.o and mcrt0.o with $(T).
10591         * config/i386/netware-libgcc.exp: Add __bswap?i2,
10592         __emultls_get_address, __emultls_register_common,
10593         __floatundi?f, and _Unwind_GetIPInfo.
10594         * config/i386/netware.c (gen_stdcall_or_fastcall_decoration):
10595         Sync with config/i386/winnt.c:gen_stdcall_or_fastcall_suffix().
10596         (gen_regparm_prefix): Likewise.
10597         (i386_nlm_encode_section_info): Sync with
10598         config/i386/winnt.c:i386_pe_encode_section_info().
10599         (i386_nlm_maybe_mangle_decl_assembler_name): New.
10600         i386_nlm_mangle_decl_assembler_name): New.
10601         (netware_override_options): New.
10602         * config/i386/netware.h (netware_override_options): Declare.
10603         (OVERRIDE_OPTIONS): Re-define to netware_override_options.
10604         (i386_nlm_mangle_decl_assembler_name): Declare.
10605         (TARGET_MANGLE_DECL_ASSEMBLER_NAME): Define.
10606
10607 2008-02-25  Ben Elliston  <bje@au.ibm.com>
10608
10609         PR other/32948
10610         * c-decl.c (grokdeclarator): Remove unused local variables
10611         `typedef_type' and `type_as_written'.
10612         * bb-reorder.c
10613         (find_rarely_executed_basic_blocks_and_crossing_edges): Remove
10614         unused local variable `has_hot_blocks'.
10615         (fix_crossing_conditional_branches): Remove unused local variable
10616         `prev_bb'.
10617         
10618 2008-02-25  Uros Bizjak  <ubizjak@gmail.com>
10619
10620         PR middle-end/19984
10621         * builtins.def (BUILT_IN_NAN): Define as c99 builtin
10622         using DEF_C99_BUILTIN.
10623         (BUILT_IN_NANF): Ditto.
10624         (BUILT_IN_NANL): Ditto.
10625
10626 2008-02-25  Ayal Zaks  <zaks@il.ibm.com>
10627             Revital Eres  <eres@il.ibm.com>
10628
10629         * modulo-sched.c (calculate_must_precede_follow): Address TODO
10630         regarding the order of two dependent insns in the same row.
10631
10632 2008-02-25  Eric Botcazou  <ebotcazou@adacore.com>
10633
10634         * stor-layout.c (layout_decl): Do not bump the alignment of a
10635         bit-field to more than byte alignment if it is packed.
10636
10637 2008-02-24  David Edelsohn  <edelsohn@gnu.org>
10638
10639         * config/rs6000/rs6000.c (processor_costs): Add cache costs for
10640         e300c2 and e300c3.
10641
10642 2008-02-24  Diego Novillo  <dnovillo@google.com>
10643
10644         http://gcc.gnu.org/ml/gcc-patches/2008-02/msg01094.html
10645
10646         PR 33738
10647         * tree-vrp.c (vrp_evaluate_conditional): With
10648         -Wtype-limits, emit a warning when comparing against a
10649         constant outside the natural range of OP0's type.
10650         * c.opt (Wtype-limits): Move ...
10651         * common.opt (Wtype-limits): ... here.
10652
10653 2008-02-24  Edmar Wienskoski  <edmar@freescale.com>
10654
10655         * config.gcc (powerpc*-*-*): Add new cores e300c2 and e300c3.
10656         * config/rs6000/e300c2c3.md: New file.
10657         * config/rs6000/rs6000.c (processor_costs): Add new costs for
10658         e300c2 and e300c3.
10659         (rs6000_override_options): Add e300c2 and e300c3 cases to
10660         processor_target_table. Do not allow usage of Altivec or Spe
10661         with e300 cores. Initialize rs6000_cost for e300c2 and e300c3.
10662         (rs6000_issue_rate): Set issue rate for e300c2 and e300c3.
10663         * config/rs6000/rs6000.h (processor_type): Add
10664         PROCESSOR_PPCE300C2 and PROCESSOR_PPCE300C3.
10665         (ASM_CPU_SPEC): Add e300c2 and e300c3.
10666         * config/rs6000/rs6000.md (define_attr "cpu"): Add ppce300c2
10667         and ppce300c3. Include e300c2c3.md.
10668
10669 2008-02-23  David Edelsohn  <edelsohn@gnu.org>
10670
10671         * config/rs6000/rs6000.h (CONSTANT_ALIGNMENT): Use STRICT_ALIGNMENT
10672         instead of TARGET_STRICT_ALIGN.
10673
10674 2008-02-23  Joseph Myers  <joseph@codesourcery.com>
10675
10676         * explow.c (memory_address): Assert that the generated address is
10677         valid.
10678
10679 2008-02-23  Francois-Xavier Coudert  <coudert@clipper.ens.fr>
10680
10681         PR target/25477
10682         * config/darwin-protos.h: Add darwin_patch_builtins prototype.
10683         * config/darwin-ppc-ldouble-patch.def: New file.
10684         * config/rs6000/darwin.h (SUBTARGET_INIT_BUILTINS): New macro.
10685         * config/rs6000/rs6000.c (rs6000_init_builtins): Call
10686         SUBTARGET_INIT_BUILTINS if defined.
10687         * config/darwin.c (darwin_patch_builtin, darwin_patch_builtins):
10688         New functions.
10689
10690 2008-02-23  Andrew Pinski  <andrew_pinski@playstation.sony.com>
10691
10692         PR rtl-opt/33512
10693         * simplify-rtx.c (simplify_binary_operation_1): Add simplification
10694         of (and X (ior (not X) Y) and (and (ior (not X) Y) X).
10695
10696 2008-02-23  Andrew Pinski  <andrew_pinski@playstation.sony.com>
10697
10698         PR pch/35027
10699         * c-pch.c (c_common_valid_pch): Make the "too short to be a PCH
10700         file" warning condtional on -Winvalid-PCH.
10701
10702 2008-02-23  Daniel Jacobowitz  <dan@codesourcery.com>
10703
10704         * expmed.c (extract_bit_field): Always use adjust_address for MEM.
10705
10706 2008-02-23  Uros Bizjak  <ubizjak@gmail.com>
10707
10708         PR target/22076
10709         PR target/34256 
10710         * config/i386/mmx.md (*mov<mode>_internal_rex64): Use "!y" to
10711         prevent reload from using MMX registers.
10712         (*mov<mode>_internal): Ditto.
10713         (*movv2sf_internal_rex64): Ditto.
10714         (*movv2sf_internal): Ditto.
10715
10716 2008-02-23  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
10717
10718         PR documentation/31569
10719         * doc/install.texi2html: Use makeinfo --no-number-sections.
10720
10721 2008-02-22  Nathan Froyd  <froydnj@codesourcery.com>
10722
10723         * config/rs6000/rs6000.c (rs6000_legitimize_address): Check to
10724         ensure that we can address an entire entity > 8 bytes.  Don't
10725         generate reg+reg addressing for such data.
10726
10727 2008-02-22  Nathan Froyd  <froydnj@codesourcery.com>
10728
10729         * config/rs6000/rs6000.h (CONSTANT_ALIGNMENT): Don't overalign
10730         strings when optimizing for size, unless the target cares about
10731         alignment.
10732
10733 2008-02-22  Tom Tromey  <tromey@redhat.com>
10734
10735         * regclass.c (current_pass): Remove declaration.
10736
10737 2008-02-22  Anatoly Sokolov <aesok@post.ru>
10738
10739         * config/avr/libgcc.S (__RAMPZ__): Define.
10740         (__do_copy_data): Add for devices with 128KB code memory.
10741
10742 2008-02-22  Nathan Froyd  <froydnj@codesourcery.com>
10743
10744         * config/rs6000/linuxspe.h (SUBSUBTARGET_OVERRIDE_OPTIONS):
10745         Use spe_abi.
10746         * config/rs6000/eabispe.h (SUBSUBTARGET_OVERRIDE_OPTIONS): Likewise.
10747
10748 2008-02-22  Hans-Peter Nilsson  <hp@axis.com>
10749
10750         * config/cris/cris.h (REG_CLASS_FROM_LETTER): Recognize 'b' for
10751         GENNONACR_REGS.
10752
10753 2008-02-22  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
10754
10755         PR c/19999
10756         * c-typeck.c (build_binary_op): Warn about floating point
10757         comparisons if FLOAT_TYPE_P, not only for REAL_TYPE.
10758
10759 2008-02-21  Janis Johnson  <janis187@us.ibm.com>
10760
10761         PR target/34526
10762         * config/rs6000/rs6000.c (rs6000_altivec_abi): Clarify comment.
10763         (rs6000_explicit_options): Split abi into spe_abi and altivec_abi,
10764         add vrsave.
10765         (rs6000_override_options): Set altivec_abi as default, not override,
10766         for 64-bit GNU/Linux; for 32-bit GNU/Linux default to altivec_abi for
10767         TARGET_ALTIVEC; default to TARGET_ALTIVEC_VRSAVE when AltiVec ABI
10768         is used; use new member spe_abi.
10769         (rs6000_handle_option): Set rs6000_explicit_options.vrsave; use
10770         spe_abi and altivec_abi.
10771
10772 2008-02-22  Tomas Bily  <tbily@suse.cz>
10773
10774         * tree-vectorizer.c (vect_is_simple_reduction): Fix comment typo.
10775
10776 2008-02-21  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
10777
10778         PR bootstrap/35273
10779         * config.build (build_file_translate): Set to `CMD //c' only if
10780         it works.
10781         * Makefile.in (build_file_translate): Improve comment.
10782
10783 2008-02-21  Jan Hubicka  <jh@suse.cz>
10784
10785         * predict.def (PRED_TREE_OPCODE_POSITIVE, PRED_TREE_OPCODE_NONEQUAL,
10786         PRED_TREE_OPCODE_POSITIVE, PRED_TREE_OPCODE_NONEQUAL, PRED_CALL,
10787         PRED_TREE_EARLY_RETURN, PRED_NULL_RETURN): Update.
10788
10789 2008-02-21  Michael Matz  <matz@suse.de>
10790
10791         PR target/35264
10792         * config/i386/i386.c (ix86_expand_branch): Add missing breaks.
10793
10794 2008-02-21  Uros Bizjak  <ubizjak@gmail.com>
10795
10796         * config/i386/i386.md (mov<mode>cc): Macroize expander from movsfcc,
10797         movdfcc and movxfcc using X87MODEF mode iterator and SSE_FLOAT_MODE_P
10798         as insn constraint.
10799         * config/i386/sse.md (<sse>_movup<ssemodesuffixf2c>): Macroize insn
10800         from sse_movups adn sse2_movupd using SSEMODEF2P mode iterator and
10801         SSE_VEC_FLOAT_MODE_P as insn constraint.
10802         (<sse>_movmskp<ssemodesuffixf2c>): Ditto from similar patterns.
10803         (sse4a_movnt<mode>): Macroize insn from sse4a_movntsf and
10804         sse4a_movntdf using MODEF mode iterator.
10805         (sse4a_vmmovnt<mode>): Macroize insn form sse4a_vmmovntv2df and
10806         sse4a_vmmovntv4sf using SSEMODEF2P mode iterator.
10807         (sse4_1_blendp<ssemodesuffixf2c>): Ditto from similar patterns.
10808         (sse4_1_blendvp<ssemodesuffixf2c>): Ditto.
10809         (sse4_1_dpp<ssemodesuffixf2c>): Ditto.
10810         (sse4_1_roundp<ssemodesuffixf2c>): Ditto.
10811         (sse4_1_rounds<ssemodesuffixf2c>): Ditto.
10812
10813 2008-02-21  Richard Guenther  <rguenther@suse.de>
10814
10815         * tree.def (PAREN_EXPR): New tree code.
10816         * fold-const.c (fold_unary): Remove PAREN_EXPR around constants
10817         and PAREN_EXPR.
10818         * tree-pretty-print.c (dump_generic_node): Handle PAREN_EXPR.
10819         * expr.c (expand_expr_real_1): Likewise.
10820         * tree-inline.c (estimate_num_insns_1): Likewise.
10821         * tree-complex.c (expand_complex_move): Likewise.
10822         * tree-vectorizer.c (vect_is_simple_use): Treat PAREN_EXPR (x)
10823         as plain x.
10824
10825 2008-02-20  Kaz Kojima  <kkojima@gcc.gnu.org>
10826
10827         PR target/35225
10828         * config/sh/sh.c (find_barrier): Don't go past 'from' argument.
10829
10830 2008-02-20  Kaz Kojima  <kkojima@gcc.gnu.org>
10831
10832         PR target/35190
10833         * config/sh/sh.md (jump_compact): Disable for crossing jumps.
10834
10835         * config/sh/sh.c (find_barrier): Don't go past
10836         NOTE_INSN_SWITCH_TEXT_SECTIONS note.
10837
10838 2008-02-20  DJ Delorie  <dj@redhat.com>
10839
10840         * config/h8300/h8300.md (insv): Force source operand to be a register.
10841
10842         * config/h8300/h8300.c (h8300_expand_epilogue): Emit return insn
10843         as a jump, not as a plain insn.
10844         
10845 2008-02-20  Seongbae Park <seongbae.park@gmail.com>
10846
10847         * doc/invoke.texi (Warning Options): Add new option
10848         -Wframe-larger-than=.
10849         (-Wframe-larger-than): Document.
10850
10851         * flags.h (warn_frame_larger_than, frame_larger_than_size):
10852         Add declarations for new option variables.
10853
10854         * final.c (final_start_function): Check the frame size
10855         before emission and issue a Wframe-larger-than warning.
10856
10857         * opts.c (warn_frame_larger_than, frame_larger_than_size):
10858         Add definitions for new option variables.
10859         (common_handle_option): Handle new option OPT_Wframe_larger_than_.
10860
10861         * common.opt (Wframe-larger-than=): New option.
10862
10863 2008-02-20  Uros Bizjak  <ubizjak@gmail.com>
10864
10865         * config/i386/sse.md (<sse>_vmmul<mode>3): Fix typo in asm template.
10866         (<sse>_div<mode>3): Ditto.
10867         (<sse>_vmdiv<mode>3): Ditto.
10868         (<sse>_vmsqrt<mode>2): Ditto.
10869         (*smax<mode>3): Ditto.
10870         (sse5_frcz<mode>2): Ditto.
10871         (sse5_vmfrcz<mode>2): Ditto.  Use TARGET_SSE5 instead of TARGET_ROUND
10872         as insn constraint.
10873
10874 2008-02-20  Richard Guenther  <rguenther@suse.de>
10875
10876         PR middle-end/35265
10877         * builtins.c (validate_arg): If we want an INTEGER_TYPE,
10878         be happy with INTEGRAL_TYPE_P.
10879
10880 2008-02-20  Richard Guenther  <rguenther@suse.de>
10881
10882         * fold-const.c (split_tree): Associate floatig-point expressions
10883         if flag_associative_math is set.
10884
10885 2008-02-20  Richard Guenther  <rguenther@suse.de>
10886
10887         * tree.h (fold_real_zero_addition_p): Declare.
10888         * fold-const.c (fold_real_zero_addition_p): Export.
10889         * tree-ssa-reassoc.c (eliminate_using_constants): Also handle
10890         floating-point operations with zero and one.
10891
10892 2008-02-20  Paolo Bonzini  <bonzini@gnu.org>
10893
10894         * doc/install.texi: Correct references to CFLAGS, replacing them
10895         with BOOT_CFLAGS.  Document flags used during bootstrap for
10896         target libraries.
10897                                 
10898 2008-02-20  Uros Bizjak  <ubizjak@gmail.com>
10899
10900         * config/i386/i386.h (SSE_VEC_FLOAT_MODE_P): New define.
10901         * config/i386/i386.md (*sse_setcc<mode>): Macroize from *sse_setccsf
10902         and *sse_setccdf using MODEF mode iterator and SSE_FLOAT_MODE_P as
10903         insn constraint.
10904         (smin<mode>3): Ditto from similar patterns.
10905         (smax<mode>3): Ditto.
10906         (*ieee_smin<mode>3): Ditto.
10907         (*ieee_smax<mode>3): Ditto.
10908         * config/i386/sse.md (sse): New mode attribute.
10909         (mov<mode>): Macroize expander from movv4sf and movv2df using
10910         SSEMODEF2P mode iterator.
10911         (<sse>_movnt<mode>): Ditto from similar patterns. Use
10912         SSE_VEC_FLOAT_MODE_P as insn constraint.
10913         (storent<mode>): Ditto.
10914         (storent<mode>): Macroize expander from storentsf and storentdf using
10915         MODEF mode iterator.
10916         (neg<mode>2): Macroize from negv4sf2 and negv2df2 using SSEMODEF2P
10917         mode iterator and SSE_VEC_FLOAT_MODE_P as insn constraint.
10918         (abs<mode>2): Ditto from similar patterns.
10919         (add<mode>3, *add<mode>3, <sse>_vmadd<mode>3): Ditto.
10920         (sub<mode>3, *sub<mode>3, <sse>_vmsub<mode>3): Ditto.
10921         (<sse>_div<mode>3, <sse>_vmdiv<mode>3): Ditto.
10922         (<sse>_vmsqrt<mode>2): Ditto.
10923         (smin<mode>3, *smin<mode>3_finite, *smin<mode>3)
10924         (<sse>_vmsmin<mode>3, *ieee_smin<mode>3): Ditto.
10925         (smax<mode>3, *smax<mode>3_finite, *smax<mode>3)
10926         (<sse>_vmsmax<mode>3, *ieee_smax<mode>3): Ditto.
10927         (<sse>_maskcmp<mode>3): Macroize from sse_maskcmpv4sf3,
10928         sse_maskcmpsf3, sse2_maskcmpv2df3 and sse2_maskcmpdf3 using SSEMODEF4
10929         mode iterator. Use SSE_FLOAT_MODE_P with SSE_VEC_FLOAT_MODE_P as
10930         insn constraint.
10931         (<sse>_comi): Macroize from sse_comi and sse2_comi using MODEF mode
10932         iterator and SSE_FLOAT_MODE_P as insn constraint.
10933         (<sse>_ucomi): Ditto from similar patterns.
10934         (<sse>_vmmaskcmp<mode>3): Macroize from sse_vmmaskcmpv4sf3 and
10935         sse2_vmmaskcmpv2df3 using SSEMODEF2P mode iterator and
10936         SSE_VEC_FLOAT_MODE_P as insn constraint.
10937         (vcond<mode>): Ditto from similar patterns.
10938         (and<mode>3, *and<mode>3): Ditto.
10939         (<sse>_nand<mode>3): Ditto.
10940         (ior<mode>3, *ior<mode>3): Ditto.
10941         (xor<mode>3, *xor<mode>3): Ditto.
10942         (*and<mode>3): Macroize from *andsf3 and *anddf3 using MODEF mode
10943         iterator and SSE_FLOAT_MODE_P as insn constraint.
10944         (*nand<mode>3): Ditto from similar patterns.
10945         (*ior<mode>3): Ditto.
10946         (*xor<mode>3): Ditto.
10947
10948 2008-02-20  Ira Rosen  <irar@il.ibm.com>
10949
10950         * config/spu/spu.md (vec_unpacku_hi_v8hi, vec_unpacku_lo_v8hi,
10951         vec_unpacks_hi_v8hi, vec_unpacks_lo_v8hi, vec_unpacku_hi_v16qi,
10952         vec_unpacku_lo_v16qi, vec_unpacks_lo_v16qi): Implement.
10953
10954 2008-02-19  Jan Hubicka  <jh@suse.cz>
10955
10956         * predict.c (tree_bb_level_predictions): Remove variable next
10957         mistakely introduced by previous commit.
10958
10959 2008-02-19  Jan Hubicka  <jh@suse.cz>
10960
10961         * predict.c (predict_paths_leading_to): Rewrite.
10962         (predict_paths_for_bb): New.
10963         (tree_bb_level_predictions): Update call of predict_paths_leading_to.
10964
10965 2008-02-19  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
10966
10967         PR bootstrap/35218
10968         * Makefile.in (build_file_translate): New.
10969         (gcc-vers.texi): Use it for translating $(abs_srcdir).
10970         * config.build (build_file_translate): Set to `CMD //c' on MinGW.
10971         * configure.ac (build_file_translate): Substitute it.
10972         * configure: Regenerate.
10973
10974 2008-02-19  Jan Hubicka  <jh@suse.cz>
10975
10976         PR rtl-optimization/34408
10977         * see.c (see_def_extension_not_merged): Copy subreg so we don't have
10978         invalid sharing.
10979
10980 2008-02-19  Jan Hubicka  <jh@suse.cz>
10981
10982         PR middle-end/28779
10983         * tree-inline.c (estimate_num_insns_1): Fix counting of cost of
10984         call_expr.
10985
10986 2008-02-19  H.J. Lu  <hongjiu.lu@intel.com>
10987
10988         PR Ada/35186
10989         * config/i386/i386-modes.def: Revert the last DI alignment
10990         change until Ada people can look into it.
10991
10992 2008-02-19  Nick Clifton  <nickc@redhat.com>
10993
10994         * opts.c (print_specific_help): Fix typo in --help text.
10995
10996 2008-02-19  Jakub Jelinek  <jakub@redhat.com>
10997
10998         PR target/35239
10999         * config/i386/cpuid.h (__cpuid, __get_cpuid_max): Use special
11000         32-bit inline asm without asm alternatives for host GCC < 3.0.
11001
11002 2008-02-19  Richard Guenther  <rguenther@suse.de>
11003
11004         PR tree-optimization/34989
11005         * tree-ssa-forwprop.c (forward_propagate_addr_expr_1): Re-structure.
11006         Allow propagation to INDIRECT_REF if we can simplify only.
11007
11008 2008-02-19  Manuel Lopez-Ibanez  <manu@gcc.gnu.org>
11009
11010         * c-common.c (warn_for_collisions_1): Use appropriate option when
11011         warning.
11012
11013 2008-02-19  Nick Clifton  <nickc@redhat.com>
11014
11015         PR other/31349
11016         * opts.c (undocumented_msg): Leave blank unless checking is enabled.
11017         (handle_options): Fix indentation.
11018         (print_filtered_help): If no language-specific options were
11019         displayed tell the user how to list all the options supported by
11020         the language's front-end.
11021         (print_specific_help): Fix indentation and remove duplicate line.
11022         (common_handle_option): Handle the -v option.
11023         For --help enable the display of undocumented options if the -v
11024         switch has been included on the command line.
11025         For --help= check for overlaps in the arguments between the option
11026         classes and the language names and issue a warning when they
11027         cannot be disambiguated.
11028         * c.opt (v): Pass on to the common option handler.
11029
11030 2008-02-19  Revital Eres  <eres@il.ibm.com> 
11031
11032         * modulo-sched.c (sms_schedule): Change dump message when
11033         create_ddg function fails.
11034         (try_scheduling_node_in_cycle): Rename row to cycle.
11035         (print_partial_schedule): Rename CYCLE to ROW.
11036
11037 2008-02-19  Christian Bruel  <christian.bruel@st.com>
11038             Zdenek Dvorak  <ook@ucw.cz>
11039
11040         * tree-ssa-loop-ivopts.c (may_be_unaligned_p): Check step alignment.
11041
11042 2008-02-19  Uros Bizjak  <ubizjak@gmail.com>
11043
11044         PR target/33555
11045         * config/i386/i386.md (*x86_movsicc_0_m1_se): New insn pattern.
11046         (*x86_movdicc_0_m1_se): Ditto.
11047
11048 2008-02-19  Uros Bizjak  <ubizjak@gmail.com>
11049
11050         * config/i386/sfp-machine.h (__gcc_CMPtype): New typedef.
11051         (CMPtype): Define as __gcc_CMPtype.
11052         * config/rs6000/sfp-machine.h (__gcc_CMPtype): New typedef.
11053         (CMPtype): Define as __gcc_CMPtype.
11054
11055 2008-02-19  Hans-Peter Nilsson  <hp@axis.com>
11056
11057         Support valgrind 3.3 for --enable-checking=valgrind.
11058         * system.h: Consolidate ENABLE_VALGRIND_CHECKING-dependent defines
11059         here.
11060         [!VALGRIND_MAKE_MEM_NOACCESS]: Define as VALGRIND_MAKE_NOACCESS.
11061         [!VALGRIND_MAKE_MEM_DEFINED]: Define as VALGRIND_MAKE_READABLE.
11062         [!VALGRIND_MAKE_MEM_UNDEFINED]: Define as VALGRIND_MAKE_WRITABLE.
11063         * ggc-common.c: Remove ENABLE_VALGRIND_CHECKING-dependent defines.
11064         Replace use of VALGRIND_MAKE_READABLE, VALGRIND_MAKE_WRITABLE, and
11065         VALGRIND_MAKE_NOACCESS with VALGRIND_MAKE_MEM_DEFINED,
11066         VALGRIND_MAKE_MEM_UNDEFINED, and VALGRIND_MAKE_MEM_NOACCESS
11067         respectively.
11068         * ggc-zone.c: Similar.
11069         * ggc-page.c: Similar.
11070
11071 2008-02-19  Paul Brook  <paul@codesourcery.com>
11072
11073         PR target/35071
11074         * config/arm/ieee754-df.S: Fix do_it typo.
11075         * config/arm/ieee754-sf.S: Fix do_it typo.
11076
11077 2008-02-18  H.J. Lu  <hongjiu.lu@intel.com>
11078
11079         PR target/35189
11080         * config/i386/i386.c (OPTION_MASK_ISA_MMX_SET): New.
11081         (OPTION_MASK_ISA_3DNOW_SET): Likewise.
11082         (OPTION_MASK_ISA_SSE_SET): Likewise.
11083         (OPTION_MASK_ISA_SSE2_SET): Likewise.
11084         (OPTION_MASK_ISA_SSE3_SET): Likewise.
11085         (OPTION_MASK_ISA_SSSE3_SET): Likewise.
11086         (OPTION_MASK_ISA_SSE4_1_SET): Likewise.
11087         (OPTION_MASK_ISA_SSE4_2_SET): Likewise.
11088         (OPTION_MASK_ISA_SSE4_SET): Likewise.
11089         (OPTION_MASK_ISA_SSE4A_SET): Likewise.
11090         (OPTION_MASK_ISA_SSE5_SET): Likewise.
11091         (OPTION_MASK_ISA_3DNOW_A_UNSET): Likewise.
11092         (OPTION_MASK_ISA_MMX_UNSET): Updated.
11093         (OPTION_MASK_ISA_3DNOW_UNSET): Updated.
11094         (OPTION_MASK_ISA_SSE_UNSET): Likewise.
11095         (OPTION_MASK_ISA_SSE3_UNSET): Likewise.
11096         (OPTION_MASK_ISA_SSSE3_UNSET): Likewise.
11097         (OPTION_MASK_ISA_SSE4_1_UNSET): Likewise.
11098         (OPTION_MASK_ISA_SSE4_2_UNSET): Likewise.
11099         (OPTION_MASK_ISA_SSE4A_UNSET): Likewise.
11100         (OPTION_MASK_ISA_SSE5_UNSET): Likewise.
11101         (OPTION_MASK_ISA_SSE4): Removed.
11102         (ix86_handle_option): Turn on bits in ix86_isa_flags and
11103         ix86_isa_flags_explicit with OPTION_MASK_ISA_XXX_SET for -mXXX.
11104         (override_options): Don't turn on implied SSE/MMX bits in
11105         ix86_isa_flags.
11106
11107 2008-02-18  H.J. Lu  <hongjiu.lu@intel.com>
11108
11109         * config/i386/i386-modes.def: Use 4 byte alignment on DI for
11110         32bit host.
11111
11112 2008-02-18  Joey Ye  <joey.ye@intel.com>
11113
11114         PR middle-end/34921
11115         * tree-nested.c (insert_field_into_struct): Set type alignment
11116         to field alignment if the former is less than the latter.
11117
11118 2008-02-18  Jakub Jelinek  <jakub@redhat.com>
11119
11120         * BASE-VER: Set to 4.4.0.
11121
11122 2008-02-17 Ralf Wildenhues <Ralf.Wildenhues@gmx.de>
11123
11124         * doc/c-tree.texi: Use @dots{} and @enddots{} where appropriate.
11125         * doc/cfg.texi: Likewise.
11126         * doc/extend.texi: Likewise.
11127         * doc/gty.texi: Likewise.
11128         * doc/invoke.texi: Likewise.
11129         * doc/loop.texi: Likewise.
11130         * doc/md.texi: Likewise.
11131         * doc/passes.texi: Likewise.
11132         * doc/rtl.texi: Likewise.
11133         * doc/sourcebuild.texi: Likewise.
11134         * doc/tm.texi: Likewise.
11135         * doc/tree-ssa.texi: Likewise.
11136
11137 2008-02-17  Richard Guenther  <rguenther@suse.de>
11138
11139         PR middle-end/35227
11140         * tree-complex.c (init_parameter_lattice_values): Handle parameters
11141         without default definition.
11142
11143 2008-02-17  Richard Guenther  <rguenther@suse.de>
11144
11145         PR tree-optimization/35231
11146         * tree-vrp.c (register_edge_assert_for): Do not assume A == 0
11147         if A | B != 1.
11148
11149 2008-02-17  Uros Bizjak  <ubizjak@gmail.com>
11150
11151         Revert:
11152         2008-02-15  Uros Bizjak  <ubizjak@gmail.com>    
11153         * config/i386/sfp-machine.h (CMPtype): Define as typedef using
11154         libgcc_cmp_return mode.
11155
11156 2008-02-16  Manuel Lopez-Ibanez  <manu@gcc.gnu.org>
11157
11158         PR c/28368
11159         * doc/invoke.texi (-std): Clarify description of -std= and -ansi.
11160
11161 2008-02-16  Ralf Corsepius  <ralf.corsepius@rtems.org>
11162
11163         * config/m68k/t-rtems (M68K_MLIB_CPU): Add 5208, 5307, 5407, 5475
11164         multilibs.
11165
11166 2008-02-16  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
11167
11168         * doc/c-tree.texi: Use `@.' where appropriate.
11169         * doc/extend.texi: Likewise.
11170         * doc/install.texi: Likewise.
11171         * doc/invoke.texi: Likewise.
11172         * doc/loop.texi: Likewise.
11173         * doc/makefile.texi: Likewise.
11174         * doc/md.texi: Likewise.
11175         * doc/passes.texi: Likewise.
11176         * doc/standards.texi: Likewise.
11177         * doc/tm.texi: Likewise.
11178
11179 2008-02-15  Jakub Jelinek  <jakub@redhat.com>
11180
11181         PR middle-end/35196
11182         * omp-low.c (expand_omp_for_generic): Don't initialize fd->v
11183         in entry_bb.
11184         (expand_omp_for_static_nochunk): Initialize fd->v in seq_start_bb
11185         rather than in entry_bb.
11186
11187 2008-02-15  Uros Bizjak  <ubizjak@gmail.com>
11188
11189         * config/i386/sfp-machine.h (CMPtype): Define as typedef using
11190         libgcc_cmp_return mode.
11191
11192 2008-02-15  Jakub Jelinek  <jakub@redhat.com>
11193
11194         PR middle-end/35130
11195         * tree-nested.c (convert_call_expr): Put FRAME.* vars into
11196         OMP_CLAUSE_SHARED rather than OMP_CLAUSE_FIRSTPRIVATE clause.
11197
11198 2008-02-15  Richard Guenther  <rguenther@suse.de>
11199             Zdenek Dvorak  <ook@ucw.cz>
11200
11201         PR tree-optimization/35164
11202         * tree-flow.h (stmt_references_abnormal_ssa_name): Declare.
11203         * tree-dfa.c (stmt_references_abnormal_ssa_name): New function.
11204         * tree-ssa-forwprop.c (tree_ssa_forward_propagate_single_use_vars):
11205         Only propagate addresses which do not have abnormal SSA_NAMEs
11206         in their operands.
11207
11208 2008-02-15  Joseph Myers  <joseph@codesourcery.com>
11209
11210         PR target/35088
11211         * config/m68k/m68k.h (DWARF_CIE_DATA_ALIGNMENT): Define.
11212
11213 2008-02-15  Jan Hubicka  <jh@suse.cz>
11214
11215         PR middle-end/35149
11216         * ipa.c (cgraph_remove_unreachable_nodes): Clear local.inlinable flag.
11217
11218 2008-02-15  Uros Bizjak  <ubizjak@gmail.com>
11219
11220         PR middle-end/34621
11221         * function.c (pad_to_arg_alignment): Remove test for STACK_BOUNDARY
11222         when calculating alignment_pad.
11223
11224 2008-02-15  Uros Bizjak  <ubizjak@gmail.com>
11225
11226         * config/i386/i386.h (CLEAR_RATIO): Use MIN macro.
11227         (WIDEST_HARDWARE_FP_SIZE): Use LONG_DOUBLE_TYPE_SIZE define.
11228         * config/i386/darwin.h (PREFERRED_STACK_BOUNDARY): Use MAX macro
11229         and STACK_BOUNDARY define.
11230
11231 2008-02-14  Danny Smith  <dannysmith@users.sourceforge.net>
11232
11233         PR preprocessor/35061
11234         * c-pragma.c (handle_pragma_pop_macro): Check that
11235         pushed_macro_table has been allocated.
11236
11237 2008-02-14  Eric Botcazou  <ebotcazou@adacore.com>
11238
11239         PR middle-end/35136
11240         * gimplify.c (force_gimple_operand_bsi): Revert 2008-02-12 change.
11241         (force_gimple_operand): Likewise.
11242         * tree-ssa-loop-ivopts.c (may_be_nonaddressable_p): Add new cases
11243         for TARGET_MEM_REF and CONVERT_EXPR/NON_LVALUE_EXPR/NOP_EXPR.
11244         Also recurse on the operand for regular VIEW_CONVERT_EXPRs.
11245         (find_interesting_uses_address): Check addressability and alignment
11246         of the base expression only after substituting bases of IVs into it.
11247
11248 2008-02-14  Michael Matz  <matz@suse.de>
11249
11250         PR target/34930
11251         * function.c (instantiate_virtual_regs_in_insn): Reload address
11252         before falling back to reloading the whole operand.
11253
11254 2008-02-14  Andreas Krebbel  <krebbel1@de.ibm.com>
11255
11256         * config/s390/s390.c (s390_mainpool_start): Emit the pool
11257         before the first section switch note.
11258
11259 2008-02-14 Ralf Wildenhues <Ralf.Wildenhues@gmx.de>
11260
11261         * doc/bugreport.texi: Update copyright years.
11262         * doc/c-tree.texi: Likewise.
11263         * doc/cfg.texi: Likewise.
11264         * doc/cpp.texi: Likewise.
11265         * doc/cppinternals.texi: Likewise.
11266         * doc/fragments.texi: Likewise.
11267         * doc/frontends.texi: Likewise.
11268         * doc/gcc.texi: Likewise.
11269         * doc/gty.texi: Likewise.
11270         * doc/hostconfig.texi: Likewise.
11271         * doc/implement-c.texi: Likewise.
11272         * doc/libgcc.texi: Likewise.
11273         * doc/loop.texi: Likewise.
11274         * doc/makefile.texi: Likewise.
11275         * doc/options.texi: Likewise.
11276         * doc/passes.texi: Likewise.
11277         * doc/rtl.texi: Likewise.
11278         * doc/sourcebuild.texi: Likewise.
11279         * doc/standards.texi: Likewise.
11280         * doc/tree-ssa.texi: Likewise.
11281         * doc/trouble.texi: Likewise.
11282
11283         * doc/extend.texi: Use @: or add comma where appropriate.
11284         * doc/invoke.texi: Likewise.
11285         * doc/tm.texi: Likewise.
11286
11287 2008-02-14  Alan Modra  <amodra@bigpond.net.au>
11288
11289         PR target/34393
11290         * config/rs6000/rs6000.md (restore_stack_block): Force operands[1]
11291         to a reg.
11292
11293 2008-02-14  Jesper Nilsson  <jesper.nilsson@axis.com>
11294
11295         * doc/md.texi (clz, ctz): Add reference.
11296         * doc/rtl.texi (clz, ctz): Likewise.
11297
11298 2008-02-13  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
11299
11300         PR other/35148
11301         * Makefile.in (gcc-vers.texi): Use abs_srcdir for the value of
11302         srcdir.
11303
11304 2008-02-13  Andreas Krebbel  <krebbel1@de.ibm.com>
11305
11306         * config/s390/s390.c (struct constant_pool): New field
11307         emit_pool_after added.
11308         (s390_mainpool_start): Set the emit_pool_after flag according
11309         to the section switch notes.
11310         (s390_mainpool_finish): Consider emit_pool_after when emitting
11311         the literal pool at the end of the function.
11312         (s390_chunkify_start): Force literal pool splits at section
11313         switch notes.
11314
11315 2008-02-13  Michael Matz  <matz@suse.de>
11316
11317         PR debug/35065
11318         * var-tracking.c (clobber_variable_part): Correctly traverse the
11319         list.
11320
11321 2008-02-13  Manuel Lopez-Ibanez  <manu@gcc.gnu.org>
11322
11323         PR 29673
11324         * doc/invoke.texi (Debugging Options): Remove -fdump-tree-inlined.
11325         Add -fdump-ipa-inline.
11326         * tree-dump.c (dump_files): Remove tree-inlined dump.
11327         * tree-pass.h (tree_dump_index): Remove TDI_inlined.
11328         
11329 2008-02-12  Richard Guenther  <rguenther@suse.de>
11330
11331         PR tree-optimization/35171
11332         * tree-vect-patterns.c (vect_recog_dot_prod_pattern): Deal with
11333         default defs.
11334
11335 2008-02-12  Richard Guenther  <rguenther@suse.de>
11336
11337         PR middle-end/35163
11338         * fold-const.c (fold_widened_comparison): Use get_unwidened in
11339         value-preserving mode.  Disallow final truncation.
11340
11341 2008-02-12  Eric Botcazou  <ebotcazou@adacore.com>
11342
11343         PR middle-end/35136
11344         * gimplify.c (force_gimple_operand_bsi): Move SSA renaming
11345         code from here to...
11346         (force_gimple_operand): ...here.
11347
11348 2008-02-12  Jakub Jelinek  <jakub@redhat.com>
11349
11350         PR c++/35144
11351         * tree-sra.c (sra_build_assignment): fold_convert SRC if copying
11352         non-compatible pointers.
11353         (generate_element_copy): If SRC and DST are RECORD_TYPEs with
11354         different FIELD_DECLs, try harder by comparing field offsets, sizes
11355         and types.
11356
11357         PR inline-asm/35160
11358         * function.c (match_asm_constraints_1): Don't replace the same input
11359         multiple times.
11360
11361 2008-02-12  Anatoly Sokolov <aesok@post.ru>
11362
11363         * config/avr/avr.h (AVR_HAVE_RAMPZ): Define.
11364         * config/avr/avr.c (expand_prologue): Save RAMPZ register.
11365         (expand_epilogue): Restore RAMPZ register.
11366         * config/avr/avr.md (RAMPZ_ADDR): New constant.
11367
11368 2008-02-11  Kai Tietz  <kai.tietz@onevision.com>
11369
11370         * config/i386/cygwin.asm: (__alloca): Correct calling
11371         convention and alignment.
11372         (__chkstk): Force 8 byte stack alignment.
11373
11374 2008-02-11  Uros Bizjak  <ubizjak@gmail.com>
11375             Richard Guenther  <rguenther@suse.de>
11376
11377         PR tree-optimization/33992
11378         * tree-ssa-loop-im.c (rewrite_bittest): Fixup the type of
11379         the zero we compare against.
11380
11381 2008-02-10  Danny Smith  <dannysmith@users.sourceforge.net>
11382
11383         PR libfortran/35063
11384         * gthr-win32.h (__gthread_mutex_destroy_function): New function
11385         to CloseHandle after unlocking to prevent accumulation of handle
11386         count.
11387
11388 2008-02-09  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
11389
11390         PR middle_end/34150
11391         * pa.c (legitimize_pic_address): Add REG_EQUAL note on sets with a
11392         pic_label_operand source.  Similarly, add a REG_LABEL_OPERAND note
11393         and update LABEL_NUSES during and after reload.
11394
11395 2008-02-08  Steven Bosscher  <stevenb.gcc@gmail.com>
11396
11397         PR middle-end/34627
11398         * combine.c (simplify_if_then_else): Make sure the comparison is
11399         against const0_rtx when simplifying to (abs x) or (neg (abs X)).
11400
11401 2008-02-08  Richard Sandiford  <rsandifo@nildram.co.uk>
11402
11403         PR bootstrap/35051
11404         * double-int.h: Don't include gmp.h for GENERATOR_FILEs.
11405         (mpz_set_double_int, mpz_get_double_int): Hide from GENERATOR_FILEs.
11406         * real.h: Don't include gmp.h or mpfr.h for GENERATOR_FILEs.
11407         (real_from_mpfr, mpfr_from_real): Hide from GENERATOR_FILEs.
11408         * tree.h (get_type_static_bounds): Likewise.
11409
11410 2008-02-08  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
11411
11412         * doc/invoke.texi (Option Summary, C++ Dialect Options)
11413         (Objective-C and Objective-C++ Dialect Options, Warning Options):
11414         Make -Wfoo language annotations match what the compiler outputs.
11415
11416 2008-02-08  Sa Liu  <saliu@de.ibm.com>
11417
11418         * config/spu/spu-builtins.def: Fixed wrong parameter type in spu 
11419         intrinsics spu_convts, spu_convtu, spu_convtf.
11420
11421 2008-02-08  Hans-Peter Nilsson  <hp@axis.com>
11422
11423         * doc/extend.texi (Function Attributes) <noinline>: Mention
11424         asm ("") as method to keep calls.
11425
11426 2008-02-07  Manuel Lopez-Ibanez  <manu@gcc.gnu.org>
11427
11428         PR other/32754
11429         * doc/options.texi (Options): Replace references to opts.sh with
11430         optc-gen.awk.
11431         * opts-common.c: Likewise.
11432         * optc-gen.awk: Likewise.
11433         
11434 2008-02-07  Andreas Krebbel  <krebbel1@de.ibm.com>
11435
11436         * config/s390/s390.h (FUNCTION_ARG_REGNO_P): Fix fprs for 64 bit.
11437
11438 2008-02-07  Richard Henderson  <rth@redhat.com>
11439
11440         PR rtl-opt/33410
11441         * config/alpha/alpha.c (alpha_emit_xfloating_compare): Use an
11442         EXPR_LIST for the REG_EQUAL instead of a comparison with a 
11443         funny mode.
11444
11445 2008-02-07  Uros Bizjak  <ubizjak@gmail.com>
11446
11447         PR tree-optimization/35085
11448         * tree-ssa-reassoc.c (rewrite_expr_tree): Enable destructive update
11449         for operand entry oe2 in addition to operand entry oe3 in order to
11450         expose more opportunities for vectorizer sum reduction.
11451
11452 2008-02-06  Kaveh R. Ghazi  <ghazi@caip.rutgers.edu>
11453
11454         PR other/35107
11455         * Makefile.in (LIBS): Remove $(GMPLIBS).
11456         (cc1-dummy, cc1): Add $(GMPLIBS).
11457
11458 2008-02-06  Jan Hubicka  <jh@suse.cz>
11459
11460         PR target/23322
11461         * i386.md (moddf_integer): Do not produce partial memory stalls for
11462         targets where it hurts.
11463
11464 2008-02-06  Uros Bizjak  <ubizjak@gmail.com>
11465
11466         PR target/35083
11467         * optabs.c (expand_float): Do not check for decimal modes when
11468         expanding unsigned integer through signed conversion.
11469
11470 2008-02-06  Nick Clifton  <nickc@redhat.com>
11471
11472         * config/stormy16/stormy16.md (eqbranchsi): Replace a match_dup
11473         inside the clobber with a match_operand and duplicated operand
11474         number in the constraint.
11475         (ineqbranchsi): Delete redundant comment.
11476
11477 2008-02-06  Ralf Corsepius  <ralf.corsepius@rtems.org>
11478
11479         * config/arm/rtems-elf.h (TARGET_OS_CPP_BUILTINS): Add 
11480         builtin_define ("__USE_INIT_FINI__").
11481         * config/h8300/t-rtems (MULTILIB_OPTION,MULTILIB_DIRNAMES): Add
11482         -msx multilibs.
11483         * gthr-rtems.h: Remove __GTHREAD_MUTEX_INIT.
11484
11485 2008-02-06  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
11486
11487         PR documentation/30330
11488         * doc/invoke.texi (C++ Dialect Options)
11489         (Objective-C and Objective-C++ Dialect Options, Warning Options):
11490         For each warning option -Wfoo that allows -Wno-foo, ensure both
11491         -Wfoo and -Wno-foo are listed in the option index.  Fix index
11492         entry of -Wswitch-default, index -Wnormalized= including the
11493         `=', and -Wlarger-than-@var{len} including @var{len}.
11494
11495 2008-02-05  Uros Bizjak  <ubizjak@gmail.com>
11496
11497         * config/i386/i386.md (floatunssisf2): Use
11498         ix86_expand_convert_uns_sisf_sse also for TARGET_SSE.
11499         (floatunssi<mode>2): Rename from floatunssisf2 and floatunssidf2.
11500         Macroize expander using MODEF mode iterator.
11501
11502 2008-02-05  Diego Novillo  <dnovillo@google.com>
11503
11504         http://gcc.gnu.org/ml/gcc-patches/2008-02/msg00140.html
11505
11506         PR 33738
11507         * tree-vrp.c (vrp_evaluate_conditional): Revert fix for PR 33738.
11508
11509 2008-02-05  Kaveh R. Ghazi  <ghazi@caip.rutgers.edu>
11510
11511         PR other/35070
11512         * toplev.c (print_version): Honor `indent' for GMP/MPFR warnings.
11513
11514 2008-02-05  H.J. Lu  <hongjiu.lu@intel.com>
11515
11516         PR target/35084
11517         * config/i386/i386.c (ix86_function_sseregparm): Add an arg
11518         to indicate if a message should be generated.
11519         (init_cumulative_args): Updated.
11520         (function_value_32): Likewise.
11521
11522 2008-02-05  Joseph Myers  <joseph@codesourcery.com>
11523
11524         * doc/include/texinfo.tex: Update to version 2008-02-04.16.
11525
11526 2008-02-05  Uros Bizjak  <ubizjak@gmail.com>
11527
11528         PR target/35083
11529         * config/i386/i386.md (floatunsisf2): Enable for TARGET_SSE_MATH only.
11530         Call ix86_expand_convert_uns_sisf_sse for TARGET_SSE2.
11531
11532 2008-02-04  Diego Novillo  <dnovillo@google.com>
11533
11534         http://gcc.gnu.org/ml/gcc-patches/2008-02/msg00110.html
11535
11536         PR 33738
11537         * tree-vrp.c (vrp_evaluate_conditional): With
11538         -Wtype-limits, emit a warning when comparing against a
11539         constant outside the natural range of OP0's type.
11540
11541 2008-02-04  Richard Guenther  <rguenther@suse.de>
11542
11543         PR middle-end/33631
11544         * expr.c (count_type_elements): Give for unions instead of
11545         guessing.
11546
11547 2008-02-04  Richard Guenther  <rguenther@suse.de>
11548
11549         PR middle-end/35043
11550         * gimplify.c (gimplify_init_ctor_eval): Convert array indices
11551         to TYPE_DOMAINs base type instead of using bitsizetype here.
11552
11553 2008-02-03  Jason Merrill  <jason@redhat.com>
11554
11555         * print-tree.c (print_node) [CONSTRUCTOR]: Print elements.
11556
11557 2008-02-04  Ralf Wildenhues  <Ralf.Wildenhues@gmx.de>
11558
11559         PR other/29972
11560         * doc/invoke.texi (C++ Dialect Options, Optimize Options)
11561         (HPPA Options, i386 and x86-64 Options, IA-64 Options)
11562         (RS/6000 and PowerPC Options): Fix typos and markup.
11563         * doc/passes.texi (Tree-SSA passes): Likewise.
11564
11565 2008-02-02  Michael Matz  <matz@suse.de>
11566
11567         PR target/35045
11568         * postreload-gcse.c (record_last_reg_set_info_regno): Renamed
11569         from record_last_reg_set_info.
11570         (record_last_reg_set_info): Take an RTX argument, iterate over all
11571         constituent hardregs.
11572         (record_last_set_info, record_opr_changes): Change calls to
11573         new signature or to record_last_reg_set_info_regno.
11574
11575 2008-02-02  Gerald Pfeifer  <gerald@pfeifer.com>
11576
11577         * doc/extend.texi (X86 Built-in Functions): Fix grammar.
11578
11579 2008-02-01  Hans-Peter Nilsson  <hp@axis.com>
11580
11581         PR rtl-optimization/34773
11582         * reg-notes.def (EQUAL): Mention significance of combination of
11583         REG_EQUAL and REG_RETVAL.
11584         * fwprop.c (try_fwprop_subst): Don't add REG_EQUAL to an
11585         insn that has a REG_RETVAL.
11586
11587 2008-02-01  Roger Sayle  <roger@eyesopen.com>
11588
11589         PR bootstrap/33781
11590         * configure.ac (--enable-fixed-point): Disable unless explicitly
11591         requested on IRIX.
11592         * configure: Regenerate.
11593
11594 2008-02-01  Richard Guenther  <rguenther@suse.de>
11595
11596         PR other/35042
11597         * invoke.texi (-finline-limit): Remove no longer true parts
11598         of the documentation.  Note that there is no default value.
11599
11600 2008-02-01  Andrew Pinski  <pinskia@gmail.com>
11601             Mark Mitchell  <mark@codesourcery.com>
11602             Ben Elliston  <bje@au.ibm.com>
11603
11604         PR c/29326
11605         * doc/extend.texi (Other Builtins): Document.
11606
11607 2008-01-31  Tom Browder <tom.browder@gmail.com>
11608
11609         * doc/c-tree.texi (Types): Fix grammar.
11610         (Expression trees): Ditto.
11611         * doc/passes.texi (Tree-SSA passes): Ditto.
11612         
11613         * doc/configterms.texi (Configure Terms): Fix typo.
11614         * doc/cpp.texi (Common Predefined Macros): Ditto.
11615         * doc/md.texi (Machine Constraints): Ditto.
11616         
11617         * doc/makefile.texi (Makefile): Add comma.
11618
11619 2008-01-31  Tom Browder  <tom.browder@gmail.com>
11620             Gerald Pfeifer  <gerald@pfeifer.com>
11621         
11622         * doc/sourcebuild.texi (Front End): Remove references to CVS
11623         and CVSROOT/modules.
11624         (Texinfo Manuals): Replace reference to CVS by one to SVN.
11625         (Back End): Remove reference to CVS.
11626
11627 2008-01-31  Richard Sandiford  <rsandifo@nildram.co.uk>
11628
11629         PR target/34900
11630         * config/mips/mips.c (gen_load_const_gp): New function, taking a
11631         comment from...
11632         (mips16_gp_pseudo_reg): ...here.
11633         * config/mips/mips.md (load_const_gp): Replace with...
11634         (load_const_gp_<mode>): ...this :P-based insn.
11635
11636 2008-01-31  Manuel Lopez-Ibanez  <manu@gcc.gnu.org>
11637
11638         * doc/invoke.texi (-ansi): Mention explicitly corresponding -std=
11639         options. Minor fixes.
11640         (-std): Move reference to standards closer to where language
11641         standards are first mentioned.
11642         
11643 2008-01-31  Richard Sandiford  <rsandifo@nildram.co.uk>
11644
11645         PR rtl-optimization/34995
11646         * reload.c (alternative_allows_const_pool_ref): Take an rtx
11647         parameter and return a bool.  If the rtx parameter is nonnull,
11648         check that it satisfies an EXTRA_MEMORY_CONSTRAINT.
11649         (find_reloads): Update call accordingly.  Pass the new operand
11650         if it needed no address reloads, otherwise pass null.
11651
11652 2008-01-30  Richard Henderson  <rth@redhat.com>
11653
11654         PR c/34993
11655         * tree.c (build_type_attribute_qual_variant): Skip TYPE_DOMAIN
11656         for unbounded arrays.
11657
11658 2008-01-30  Silvius Rus  <rus@google.com>
11659
11660         * config/i386/xmmintrin.h (_mm_prefetch): Add const to first arg.
11661
11662 2008-01-30  Jan Hubicka  <jh@suse.cz>
11663
11664         PR target/34982
11665         * i386.c (init_cumulative_args): Use real function declaration when
11666         calling locally.
11667
11668 2008-01-30  Richard Sandiford  <rsandifo@nildram.co.uk>
11669
11670         PR rtl-optimization/34998
11671         * global.c (build_insn_chain): Treat non-subreg_lowpart
11672         SUBREGs of pseudos as clobbering all the words covered by the
11673         SUBREG, not just all the bytes.
11674         * ra-conflict.c (clear_reg_in_live): Likewise.  Take the
11675         original df_ref rather than an extract parameter.
11676         (global_conflicts): Update call accordingly.
11677
11678 2008-01-30  Andreas Krebbel  <krebbel1@de.ibm.com>
11679
11680         * config/s390/fixdfdi.h (__fixunstfdi, __fixtfdi): Rearrange
11681         the overflow check to make it easier to read.
11682         (__fixtfdi): Change the type of the ll member in union
11683         long_double to UDItype_x.
11684
11685 2008-01-30  Jakub Jelinek  <jakub@redhat.com>
11686
11687         PR middle-end/34969
11688         * cgraph.h (cgraph_update_edges_for_call_stmt): New prototype.
11689         * cgraph.c (cgraph_update_edges_for_call_stmt): New function.
11690         * tree-inline.c (fold_marked_statements): Call
11691         cgraph_update_edges_for_call_stmt if folding a call statement.
11692         * cgraphunit.c (verify_cgraph_node): Set cfun to this_cfun for
11693         debug_generic_stmt calls, reset it back afterwards.
11694
11695         PR c/35017
11696         * c-decl.c (start_decl): Don't pedwarn about TREE_READONLY
11697         static decls.
11698         * c-typeck.c (build_external_ref): Don't pedwarn about
11699         static vars in current function's scope.
11700
11701 2008-01-29  Joseph Myers  <joseph@codesourcery.com>
11702
11703         * config.gcc (i[34567]86-*-nto-qnx*): Remove deprecation.
11704
11705 2008-01-29  Bernhard Fischer  <aldot@gcc.gnu.org>
11706
11707         PR c/35002
11708         * ipa-struct-reorg.c: Fix spelling.
11709         * params.def: Ditto.
11710
11711 2008-01-29  Richard Guenther  <rguenther@suse.de>
11712
11713         PR middle-end/35006
11714         * tree-inline.h (struct copy_body_data): Add remapping_type_depth
11715         field.
11716         * tree-inline.c (remap_type): Increment remapping_type_depth
11717         around remapping types.
11718         (copy_body_r): Only add referenced variables if they are referenced
11719         from code, not types.
11720
11721 2008-01-29  Douglas Gregor  <doug.gregor@gmail.com>
11722
11723         PR c++/34055
11724         PR c++/34103
11725         PR c++/34219
11726         PR c++/34606
11727         PR c++/34753
11728         PR c++/34754
11729         PR c++/34755
11730         PR c++/34919
11731         PR c++/34961
11732         * c-pretty-print.c (pp_c_type_qualifier_list): Don't try to print
11733         qualifiers for an ERROR_MARK_NODE or a NULL_TREE.
11734
11735 2008-01-28  Andy Hutchinson   <hutchinsonandy@netscape.net>
11736
11737         PR target/34412
11738         * config/avr/avr.c (expand_prologue): Use correct QI mode frame 
11739         pointer for tiny stack.
11740
11741 2008-01-28  Bernhard Fischer  <aldot@gcc.gnu.org>
11742
11743         * doc/tree-ssa.texi: Add cindex PHI nodes and improve wording.
11744
11745 2008-01-28  Bernhard Fischer  <aldot@gcc.gnu.org>
11746
11747         * config/vx-common.h: Fix typo in comment.
11748
11749 2008-01-28  Ian Lance Taylor  <iant@google.com>
11750
11751         PR c++/34862
11752         PR c++/33407
11753         * tree-ssa-copyrename.c (copy_rename_partition_coalesce): Don't
11754         coalesce pointers if they have different DECL_NO_TBAA_P values.
11755         * tree-ssa-copy.c (may_propagate_copy): Don't propagate copies
11756         between variables with different DECL_NO_TBAA_P values.
11757
11758 2008-01-28  Nathan Froyd  <froydnj@codesourcery.com>
11759
11760         PR 31535
11761         * config/rs6000/rs6000.c (small_data_operand): Vectors and floats
11762         are not legitimate small data references on SPE targets.
11763
11764 2008-01-28  David Daney  <ddaney@avtrex.com>
11765
11766         * doc/install.texi (mips-*-*): Recommend binutils 2.18.
11767
11768 2008-01-28  David Daney  <ddaney@avtrex.com>
11769
11770         * doc/install.texi (--disable-libgcj-bc):  Reword documentation.
11771
11772 2008-01-27  Joseph Myers  <joseph@codesourcery.com>
11773
11774         * config.gcc (strongarm*-*, ep9312*-*, xscale*-*, parisc*-*,
11775         m680[012]0-*, *-*-beos*, *-*-kaos*, *-*-linux*aout*,
11776         *-*-linux*libc1*, *-*-solaris2.[0-6], *-*-solaris2.[0-6].*,
11777         *-*-sysv*, *-*-windiss*, alpha*-*-unicosmk*, cris-*-aout,
11778         hppa1.1-*-pro*, hppa1.1-*-osf*, hppa1.1-*-bsd*,
11779         i[34567]86-sequent-ptx4*, i[34567]86-*-nto-qnx*,
11780         i[34567]86-*-sco3.2v5*, i[34567]86-*-uwin*, powerpc-*-chorusos*,
11781         vax-*-bsd*, vax-*-ultrix*): Mark obsolete.
11782
11783 2008-01-27  Bernhard Fischer  <aldot@gcc.gnu.org>
11784
11785         * basic-block.h (condjump_equiv_p): Fix comment.
11786
11787 2008-01-27  Bernhard Fischer  <aldot@gcc.gnu.org>
11788
11789         * tree-pretty-print.c (print_generic_decl, print_generic_stmt,
11790         print_generic_stmt_indented): Fix comment.
11791
11792 2008-01-27  Bernhard Fischer  <aldot@gcc.gnu.org>
11793
11794         * configure.ac (__stack_chk_fail): Add detecion for availability
11795         of SSP in uClibc by checking if __UCLIBC_HAS_SSP__ is defined.
11796         * configure: Regenerate.
11797
11798 2008-01-26  Maxim Kuvyrkov  <maxim@codesourcery.com>
11799
11800         PR middle-end/34688
11801         * final.c (output_addr_const): Handle TRUNCATE.
11802
11803 2008-01-26  Zdenek Dvorak  <ook@ucw.cz>
11804
11805         PR target/34711
11806         * tree-ssa-loop-ivopts.c (comp_cost): New type.
11807         (zero_cost, infinite_cost): New constants.
11808         (struct cost_pair): Change type of cost to comp_cost.
11809         (struct iv_ca): Change type of cand_use_cost and cost to comp_cost.
11810         (new_cost, add_costs, sub_costs, compare_costs, infinite_cost_p):
11811         New functions.
11812         (set_use_iv_cost, force_expr_to_var_cost, force_var_cost,
11813         split_address_cost, ptr_difference_cost, difference_cost,
11814         get_computation_cost_at, get_computation_cost,
11815         determine_use_iv_cost_generic, determine_use_iv_cost_address,
11816         determine_use_iv_cost_condition, determine_use_iv_costs,
11817         cheaper_cost_pair, iv_ca_recount_cost, iv_ca_set_no_cp,
11818         iv_ca_set_cp, iv_ca_cost, iv_ca_new, iv_ca_dump, iv_ca_extend,
11819         iv_ca_narrow, iv_ca_prune, try_improve_iv_set, find_optimal_iv_set):
11820         Change type of cost to comp_cost.
11821         (determine_iv_cost): Increase cost of non-original ivs, instead
11822         of decreasing the cost of original ones.
11823         (get_address_cost): Indicate the complexity of the addressing mode 
11824         in comp_cost.
11825         (try_add_cand_for): Prefer using ivs not specific to some object.
11826         * tree-flow.h (force_expr_to_var_cost): Declaration removed.
11827
11828 2008-01-26  Peter Bergner  <bergner@vnet.ibm.com>
11829             Janis Johnson  <janis187@us.ibm.com>
11830
11831         PR target/34814
11832         * doc/tm.texi (TARGET_EXPAND_TO_RTL_HOOK): Document.
11833         (TARGET_INSTANTIATE_DECLS): Likewise.
11834         * target.h (expand_to_rtl_hook): New target hook.
11835         (instantiate_decls): Likewise.
11836         * function.c (instantiate_decl): Make non-static.  Rename to...
11837         (instantiate_decl_rtl): ... this.
11838         (instantiate_expr): Use instantiate_decl_rtl.
11839         (instantiate_decls_1): Likewise.
11840         (instantiate_decls): Likewise.
11841         (instantiate_virtual_regs: Call new instantiate_decls taget hook.
11842         * function.h (instantiate_decl_rtl): Add prototype.
11843         * cfgexpand.c (target.h): New include.
11844         (tree_expand_cfg): Call new expand_to_rtl_hook target hook.
11845         * target-def.h (TARGET_EXPAND_TO_RTL_HOOK): New define.
11846         (TARGET_INSTANTIATE_DECLS): Likewise.
11847         (TARGET_INITIALIZER): New target hooks added.
11848         * config/rs6000/rs6000-protos.h (rs6000_secondary_memory_needed_rtx):
11849         New prototype.
11850         * config/rs6000/rs6000.c (tree-flow.h): New include.
11851         (machine_function): Add sdmode_stack_slot field.
11852         (rs6000_alloc_sdmode_stack_slot): New function.
11853         (rs6000_instantiate_decls): Likewise.
11854         (rs6000_secondary_memory_needed_rtx): Likewise.
11855         (rs6000_check_sdmode): Likewise.
11856         (TARGET_EXPAND_TO_RTL_HOOK): Target macro defined.
11857         (TARGET_INSTANTIATE_DECLS): Likewise.
11858         (rs6000_hard_regno_mode_ok): Allow SDmode.
11859         (num_insns_constant): Likewise.  Handle _Decimal32 constants.
11860         (rs6000_emit_move): Handle SDmode.
11861         (function_arg_advance): Likewise.
11862         (function_arg): Likewise.
11863         (rs6000_gimplify_va_arg): Likewise.  Add special handling of
11864         SDmode var args for 32-bit compiles.
11865         (rs6000_secondary_reload_class): Handle SDmode.
11866         (rs6000_output_function_epilogue): Likewise.
11867         (rs6000_function_value): Simplify if statement.
11868         (rs6000_libcall_value): Likewise.
11869         * config/rs6000/rs6000.h (SLOW_UNALIGNED_ACCESS): Handle SDmode.
11870         (SECONDARY_MEMORY_NEEDED_RTX): Add define.
11871         * config/rs6000/dfp.md (movsd): New define_expand and splitter.
11872         (movsd_hardfloat): New define_insn.
11873         (movsd_softfloat): Likewise.
11874         (movsd_store): Likewise.
11875         (movsd_load): Likewise.
11876         (extendsddd2): Likewise.
11877         (extendsdtd2): Likewise.
11878         (truncddsd2): Likewise.
11879         (movdd_hardfloat64): Fixup comment.
11880         (UNSPEC_MOVSD_LOAD): New constant.
11881         (UNSPEC_MOVSD_STORE): Likewise.
11882
11883 2008-01-26  Jakub Jelinek  <jakub@redhat.com>
11884
11885         PR c++/34965
11886         * c-pretty-print.c (pp_c_exclusive_or_expression): Handle
11887         TRUTH_XOR_EXPR.
11888         (pp_c_logical_and_expression): Handle TRUTH_AND_EXPR.
11889         (pp_c_logical_or_expression): Handle TRUTH_OR_EXPR.
11890         (pp_c_expression): Handle TRUTH_AND_EXPR, TRUTH_OR_EXPR
11891         and TRUTH_XOR_EXPR.
11892
11893 2008-01-26  David Edelsohn  <edelsohn@gnu.org>
11894
11895         PR target/34794
11896         * config.gcc: Separate AIX 5.3 from AIX 6.1.
11897         * config/rs6000/rs6000-c.c (rs6000_cpu_cpp_builtins): Define
11898         __LONGDOUBLE128 too.
11899         * config/rs6000/aix61.h: New file.
11900
11901 2008-01-26  Richard Sandiford  <rsandifo@nildram.co.uk>
11902
11903         PR rtl-optimization/34959
11904         * optabs.c (expand_unop): In libcall notes, give ffs, clz, ctz,
11905         popcount and parity rtxes the same mode as their operand.
11906         Truncate or extend the result to the return value's mode
11907         if necessary.
11908
11909 2008-01-26  Richard Sandiford  <rsandifo@nildram.co.uk>
11910
11911         PR target/34981
11912         * config/mips/mips-protos.h (mips_expand_call): Return an rtx.
11913         * config/mips/mips.h (FIRST_PSEUDO_REGISTER): Rename FAKE_CALL_REGNO
11914         to GOT_VERSION_REGNUM.
11915         (CALL_REALLY_USED_REGISTERS): Set the GOT_VERSION_REGNUM entry to 0.
11916         (EPILOGUE_USES): Include GOT_VERSION_REGNUM if TARGET_USE_GOT.
11917         * config/mips/mips.c (mips_emit_call_insn): New function.
11918         (mips_call_tls_get_addr): Call mips_expand_call directly.
11919         (mips16_copy_fpr_return_value): Use mips_emit_call_insn rather than
11920         emit_call_insn.
11921         (mips16_build_call_stub): Likewise.  Return the call insn or null.
11922         (mips_expand_call): Update the call to mips16_build_call_stub
11923         accordingly and a remove redundant condition.  Assert that MIPS16
11924         stubs do not use lazy binding.  Use mips_emit_call_insn and return
11925         the call insn.
11926         (mips_extra_live_on_entry): Include GOT_VERSION_REGNUM if
11927         TARGET_USE_GOT.
11928         (mips_hard_regno_mode_ok_p): Allow SImode for GOT_VERSION_REGNUM.
11929         (mips_avoid_hazard): Remove hazard_set handling.
11930         * config/mips/mips.md (UNSPEC_EH_RECEIVER): Rename to...
11931         (UNSPEC_RESTORE_GP): ...this.
11932         (UNSPEC_SET_GOT_VERSION, UNSPEC_UPDATE_GOT_VERSION): New constants.
11933         (FAKE_CALL_REGNO): Rename to...
11934         (GOT_VERSION_REGNUM): ...this.
11935         (type): Add "ghost" value.  Add an associated insn reservation.
11936         (hazard_set): Remove.
11937         (exception_receiver): Rename to...
11938         (restore_gp): ...this and update the unspec identifier accordingly.
11939         (exception_receiver, nonlocal_got_receiver): New expanders.
11940         (load_call<mode>): Use GOT_VERSION_REGNUM.  Don't set
11941         FAKE_CALL_REGNO.  Remove hazard_set attribute.
11942         (set_got_version, update_got_version): New patterns.
11943
11944 2008-01-26  Danny Smith  <dannysmith@users.sourceforge.net>
11945
11946         PR target/34970
11947         * config/i386/cygming.h (ASM_OUTPUT_LABELREF): Define.
11948
11949 2008-01-25  Joseph Myers  <joseph@codesourcery.com>
11950
11951         PR other/31955
11952         * doc/install.texi2html: Generate gcc-vers.texi.
11953
11954 2008-01-25  DJ Delorie  <dj@redhat.com>
11955
11956         * config/m32c/m32c.h (ASM_PREFERRED_EH_DATA_FORMAT): Define.
11957
11958 2008-01-25  Joseph Myers  <joseph@codesourcery.com>
11959
11960         * config/c4x: Remove directory.
11961         * config.gcc (crx-*, mt-*): Mark obsolete.
11962         (c4x-*, tic4x-*, c4x-*-rtems*, tic4x-*-rtems*, c4x-*, tic4x-*,
11963         h8300-*-rtemscoff*, ns32k-*-netbsdelf*, ns32k-*-netbsd*,
11964         sh-*-rtemscoff*): Remove cases.
11965         * defaults.h (C4X_FLOAT_FORMAT): Remove.
11966         * real.c (encode_c4x_single, decode_c4x_single,
11967         encode_c4x_extended, decode_c4x_extended, c4x_single_format,
11968         c4x_extended_format): Remove.
11969         * real.h (c4x_single_format, c4x_extended_format): Remove.
11970         * doc/extend.texi (interrupt, naked): Remove mention of attributes
11971         on C4x.
11972         (Pragmas): Remove comment about c4x pragmas.
11973         * doc/install.texi (c4x): Remove target-specific instructions.
11974         * doc/invoke.texi (TMS320C3x/C4x Options): Remove.
11975         * doc/md.texi (Machine Constraints): Remove C4x documentation.
11976         * doc/tm.texi (MEMBER_TYPE_FORCES_BLK, c_register_pragma): Do not
11977         refer to C4x source files as examples.
11978         (C4X_FLOAT_FORMAT): Remove documentation.
11979
11980 2008-01-25  Bernd Schmidt  <bernd.schmidt@analog.com>
11981
11982         * config/bfin/bfin.c (override_options): Reorder tests so that
11983         flag_pic gets enabled for -msep-data.
11984
11985 2008-01-25  Richard Guenther  <rguenther@suse.de>
11986
11987         PR middle-end/32244
11988         * expr.c (expand_expr_real_1): Reduce result of LSHIFT_EXPR
11989         to its bitfield precision if required.
11990
11991 2008-01-25  Jakub Jelinek  <jakub@redhat.com>
11992
11993         PR middle-end/33880
11994         * tree-nested.c (walk_omp_for): New function.
11995         (convert_nonlocal_reference, convert_local_reference): Call
11996         walk_omp_for on OMP_FOR.
11997         (convert_call_expr): Call walk_body on OMP_FOR's
11998         OMP_FOR_PRE_INIT_BODY.
11999
12000 2008-01-25  Richard Guenther  <rguenther@suse.de>
12001
12002         PR tree-optimization/34966
12003         * tree-ssa-math-opts.c (execute_cse_sincos_1): For all but
12004         default defs and PHI_NODEs we have to insert after the
12005         defining statement.
12006
12007 2008-01-24  Nick Clifton  <nickc@redhat.com>
12008
12009         * config/stormy16/stormy16-lib2.c (MIN_UNITS_PER_WORD):
12010         Provide a default definition.
12011         (LIBGCC2_UNITS_PER_WORD): Likewise.
12012
12013         * config/stormy16/stormy16.c: Include df.h for the prototype
12014         for df_regs_ever_live_p.
12015         (xstormy16_expand_builtin_va_start): Convert the stack offset
12016         into a component_ref and then use POINTER_PLUS_EXPR to add it
12017         to the incoming_virtual_args_rtx.
12018         (xstormy16_gimplify_va_arg_expr): Rename to
12019         xstormy16_gimplify_va_arg_expr.
12020         Use POINTER_PLUS_EXPR when performing pointer arithmetic.
12021         (TARGET_GIMPLIFY_VA_ARG_EXPR): Use renamed
12022         xstormy16_gimplify_va_arg_expr.
12023         Fix up some formatting issues.
12024
12025         * config/stormy16/stormy16.c: (xstormy16_carry_plus_operand):
12026         Move to predicates.md.
12027         (xs_hi_general_operand): Likewise.
12028         (xs_hi_nonmemory_operand): Likewise.
12029         * config/stormy16/predicates.md:
12030         (xstormy16_carry_plus_operand): New predicate.
12031         (xs_hi_general_operand): New predicate.
12032         (xs_hi_nonmemory_operand): New predicate.
12033         * config/stormy16/stormy16-protos.h:
12034         (xstormy16_carry_plus_operand): Delete prototype.
12035         (xs_hi_general_operand): Likewise.
12036         (xs_hi_nonmemory_operand): Likewise.
12037
12038         * config/storm16/stormy16.md (addhi3): Remove earlyclobber
12039         modifiers as they are no longer needed and they can trigger
12040         reload spill failures.
12041
12042         * config/storm16/stormy16.md (ineqbranchsi): Replace match_dup
12043         with a match_operand in order to help reload.
12044
12045         * config/storm16/stormy16.md (movhi_internal): Replace 'r'
12046         constraint with 'e' for the 8th alternative as this version of
12047         the mov.w instruction only accepts the lower 8 registers.
12048
12049 2008-01-25  Uros Bizjak  <ubizjak@gmail.com>
12050
12051         PR target/34856
12052         * simplifx-rtx.c (simplify_const_binary_operation) [VEC_CONCAT]:
12053         Consider only CONST_INT, CONST_DOUBLE and CONST_FIXED as constant
12054         vector elements.
12055
12056 2008-01-25  Jakub Jelinek  <jakub@redhat.com>
12057
12058         PR middle-end/33333
12059         * gimplify.c (gimplify_omp_for): Gimplify OMP_FOR_PRE_BODY.
12060
12061 2008-01-25  Golovanevsky Olga  <olga@il.ibm.com>
12062
12063         * ipa-struct-reorg.c (remove_str_allocs_in_func, remove_str_allocs):
12064         New functions.
12065         (remove_structure): Update allocations list before removing structure.
12066         
12067 2008-01-25  Golovanevsky Olga  <olga@il.ibm.com>
12068
12069         * ipa-struct-reorg.c (is_safe_cond_expr, 
12070         create_new_stmts_for_cond_expr): Use integer_zerop function,
12071         that recognize not only zero-pointer, but zero-integer too.
12072
12073 2008-01-25  Ben Elliston  <bje@au.ibm.com>
12074
12075         PR other/22232
12076         * fixproto: Escape "." in sed expression that strips leading "./".
12077
12078 2008-01-24  H.J. Lu  <hongjiu.lu@intel.com>
12079
12080         PR driver/34904
12081         * gcc.c (SWITCH_OK): Removed.
12082         (SWITCH_LIVE): Changed to bit.
12083         (SWITCH_FALSE): Likewise.
12084         (SWITCH_IGNORE): Likewise.
12085         (switchstr): Change live_cond to unsigned int.
12086         (process_command): Replace SWITCH_OK with 0.
12087         (do_self_spec): Likewise.
12088         (set_collect_gcc_options): Check the SWITCH_IGNORE bit.
12089         (give_switch): Likewise.
12090         (used_arg): Likewise.
12091         (do_spec_1): Set the SWITCH_IGNORE bit.
12092         (check_live_switch): Check both SWITCH_LIVE and SWITCH_FALSE
12093         bits.  Set the SWITCH_LIVE bit.
12094
12095 2008-01-24  Andreas Krebbel  <krebbel1@de.ibm.com>
12096
12097         * config/s390/s390.h (MOVE_RATIO): Define new target macro.
12098
12099 2008-01-24  Richard Sandiford  <rsandifo@nildram.co.uk>
12100
12101         PR tree-optimization/34472
12102         * ipa-struct-reorg.c (safe_cond_expr_check): Change the DATA
12103         parameter to a "bool *" and set *DATA to false if there is
12104         an unsafe access.  Do not delete the structure here.
12105         (check_cond_exprs): Delete it here instead.
12106         (check_cond_exprs, exclude_cold_structs): Do not increase
12107         I when removing a structure.
12108
12109 2008-01-24  Uros Bizjak  <ubizjak@gmail.com>
12110
12111         PR target/34856
12112         * config/i386/i386.c (ix86_expand_vector_init): Consider only
12113         CONST_INT, CONST_DOUBLE and CONST_FIXED as constant vector elements.
12114
12115 2008-01-24  Jakub Jakub Jelinek  <jakub@redhat.com>
12116
12117         PR middle-end/34934
12118         * tree-stdarg.c (reachable_at_most_once): Use VEC vector instead of
12119         a fixed vector for stack.
12120
12121 2008-01-24  Ben Elliston  <bje@au.ibm.com>
12122
12123         PR c++/25701
12124         * doc/gcc.texi (Software development): Add a direntry for g++.
12125         
12126 2008-01-23  Hans-Peter Nilsson  <hp@axis.com>
12127
12128         * config/cris/cris.h (CC1PLUS_SPEC, OPTIMIZATION_OPTIONS): Drop
12129         stale and straggling -fforce-addr comments above.
12130
12131         * config/cris/cris.h (CRIS_SUBTARGET_VERSION, TARGET_VERSION): Don't
12132         define.
12133         * config/cris/linux.h (CRIS_SUBTARGET_VERSION): Don't define.
12134         * config/cris/aout.h (CRIS_SUBTARGET_VERSION): Don't define.
12135
12136 2008-01-23  Michael Matz  <matz@suse.de>
12137
12138         PR debug/34895
12139         * dwarf2out.c (force_type_die): Use modified_type_die instead of
12140         gen_type_die.
12141
12142 2008-01-23  Andreas Krebbel  <krebbel1@de.ibm.com>
12143
12144         * ipa-struct-reorg.c (create_new_malloc): Use pointer type as
12145         malloc result type.
12146
12147 2008-01-23 Anatoly Sokolov <aesok@post.ru>
12148
12149         * config/avr/avr.c (avr_current_arch): New variable.
12150         (avr_arch_types): Add 'avr31' and 'avr51' entries.
12151         (avr_arch): Add 'ARCH_AVR31' and 'ARCH_AVR51'.
12152         (avr_mcu_types): Add 'avr31' and 'avr51' architectures.
12153         (avr_override_options): Init 'avr_current_arch'. 
12154         (base_arch_s): Move from here...
12155         * config/avr/avr.h (base_arch_s): ... here. Add new members 
12156         'have_elpm', 'have_elpmx', 'have_eijmp_eicall', 'reserved'. Rename 
12157         'mega' to 'have_jmp_call'.
12158         (TARGET_CPU_CPP_BUILTINS): Define "__AVR_HAVE_JMP_CALL__", 
12159         "__AVR_HAVE_RAMPZ__",   "__AVR_HAVE_ELPM__" and  "__AVR_HAVE_ELPMX__"
12160         macros.
12161         (LINK_SPEC, CRT_BINUTILS_SPECS, ASM_SPEC): Add 'avr31' and 'avr51' 
12162         architectures.
12163         * config/avr/t-avr (MULTILIB_OPTIONS, MULTILIB_DIRNAMES, 
12164         MULTILIB_MATCHES): (Ditto.).
12165
12166 2008-01-23  Richard Guenther  <rguenther@suse.de>
12167
12168         PR middle-end/31529
12169         * cgraphunit.c (cgraph_reset_node): Always mark the node
12170         not reachable if it is not queued already.
12171
12172 2008-01-23  Bernd Schmidt  <bernd.schmidt@analog.com>
12173
12174         * config/bfin/bfin-protos.h (WA_RETS, ENABLE_WA_RETS): New macros.
12175         * config/bfin/bfin.c (bfin_cpus): Add WA_RETS everywhere.
12176         (cputype_selected): New static variable.
12177         (bfin_handle_option): Set it if -mcpu is used.
12178         (override_option): Select default set of workarounds if no cpu type
12179         selected on the command line.
12180         (workaround_rts_anomaly): Only run if ENABLE_WA_RETS.
12181
12182         From  Michael Frysinger  <michael.frysinger@analog.com>
12183         * config/bfin/bfin-protos.h (enum bfin_cpu_type): Add
12184         BFIN_CPU_BF547, BFIN_CPU_BF523, BFIN_CPU_BF524, and BFIN_CPU_BF526.
12185
12186         * config/bfin/elf.h (LIB_SPEC): Use proper linker script
12187         for bf547, bf523, bf524, and bf526.
12188         * config/bfin/bfin.c (bfin_cpus[]): Add bf547,  bf523, bf524, and
12189         bf526.
12190         * config/bfin/bfin.h (TARGET_CPU_CPP_BUILTINS): Define
12191         __ADSPBF523__ for bf523, __ADSPBF524__ for bf524,
12192         __ADSPBF526__ for bf526, __ADSPBF52x__ for all three, as well as
12193         __ADSPBF547__ and __ADSPBF54x__ for bf547.
12194         * doc/invoke.texi (Blackfin Options): Document that
12195         -mcpu now accept bf547, bf523, bf524, and bf526.
12196
12197 2008-01-22  Eric Botcazou  <ebotcazou@adacore.com>
12198
12199         PR rtl-optimization/34628
12200         * combine.c (try_combine): Stop and undo after the first combination
12201         if an autoincrement side-effect on the first insn has effectively
12202         been lost.
12203
12204 2008-01-22  David Edelsohn  <edelsohn@gnu.org>
12205
12206         PR target/34529
12207         * config/rs6000/rs6000.c (rs6000_legitimate_offset_address_p):
12208         Offset addresses are not valid for Altivec or paired float modes.
12209
12210 2008-01-22  Jakub Jelinek  <jakub@redhat.com>
12211
12212         PR c++/34607
12213         * c-parser.c (c_parser_omp_for_loop): Don't call c_finish_omp_for
12214         if DECL_INITIAL (decl) is error_mark_node.
12215
12216         PR c++/34914
12217         * c-common.c (handle_vector_size_attribute): Only allow
12218         integral, scalar float and fixed point types.  Handle OFFSET_TYPE
12219         the same way as pointer, array etc. types.
12220         * tree.c (reconstruct_complex_type): Handle OFFSET_TYPE.
12221
12222         PR c++/34917
12223         * tree.c (build_type_attribute_qual_variant): Call
12224         build_qualified_type if attributes are equal, but quals are not.
12225
12226 2008-01-22  Manuel Lopez-Ibanez  <manu@gcc.gnu.org>
12227
12228         PR 32102
12229         * doc/invoke.texi (-Wall): -Wall enables -Wstrict-overflow=1.
12230         * flags.h (warn_strict_aliasing): Remove.
12231         (warn_strict_overflow): Remove.
12232         * opts.c (warn_strict_aliasing): Remove.
12233         (warn_strict_overflow): Remove.
12234         * c-opts.c (c_common_handle_option): -Wall only sets
12235         -Wstrict-aliasing or -Wstrict-overflow if they are uninitialized.
12236         (c_common_post_options): Give default values to -Wstrict-aliasing
12237         and -Wstrict-overflow if they are uninitialized.
12238         * common.opt (Wstrict-aliasing): Specify Var and Init.
12239         (Wstrict-overflow): Likewise.
12240
12241 2008-01-22  Kenneth Zadeck  <zadeck@naturalbridge.com>
12242
12243         PR rtl-optimization/26854
12244         PR rtl-optimization/34400
12245         PR rtl-optimization/34884
12246         * ddg.c (create_ddg_dep_from_intra_loop_link): Use
12247         DF_RD->gen.
12248         * df.h (df_changeable_flags.DF_RD_NO_TRIM): Deleted
12249         (df_rd_bb_info.expanded_lr_out): Deleted
12250         * loop_invariant.c (find_defs): Deleted DF_RD_NO_TRIM flag.
12251         * loop_iv.c (iv_analysis_loop_init): Ditto.  * df-problems.c
12252         (df_rd_free_bb_info, df_rd_alloc, df_rd_confluence_n,
12253         df_rd_bb_local_compute, df_rd_transfer_function, df_rd_free):
12254         Removed code to allocate, initialize or free expanded_lr_out.
12255         (df_rd_bb_local_compute_process_def): Restructured to make more
12256         understandable.
12257         (df_rd_confluence_n): Removed code to no apply invalidate_by_call
12258         sets if the sets are being trimmed.
12259
12260 2008-01-22  H.J. Lu  <hongjiu.lu@intel.com>
12261
12262         PR bootstrap/32287
12263         * configure.ac (ld_vers): Support GNU linker version xx.xx.*
12264         (as_vers): Likewise.
12265         * configure: Regenerated.
12266
12267 2008-01-22  Manuel Lopez-Ibanez  <manu@gcc.gnu.org>
12268
12269         PR middle-end/33092
12270         * tree-pass.h (pass_build_alias): New pass.
12271         * tree-ssa-alias.c (gate_build_alias): New.
12272         (pass_build_alias): New.
12273         * passes.c (init_optimization_passes): Add pass_build_alias after
12274         pass_create_structure_vars.
12275
12276 2008-01-22  Wolfgang Gellerich  <gellerich@de.ibm.com>
12277
12278         * config/s390/s390.h (S390_TDC_POSITIVE_NORMALIZED_NUMBER):
12279         Renamed to S390_TDC_POSITIVE_NORMALIZED_BFP_NUMBER.
12280         (S390_TDC_NEGATIVE_NORMALIZED_NUMBER): Renamed to
12281         S390_TDC_NEGATIVE_NORMALIZED_BFP_NUMBER.
12282         (S390_TDC_POSITIVE_DENORMALIZED_NUMBER): Renamed to
12283         S390_TDC_POSITIVE_DENORMALIZED_BFP_NUMBER.
12284         (S390_TDC_NEGATIVE_DENORMALIZED_NUMBER): Renamed to
12285         S390_TDC_NEGATIVE_DENORMALIZED_BFP_NUMBER.
12286         (S390_TDC_POSITIVE_NORMALIZED_BFP_NUMBER): New constant.
12287         (S390_TDC_NEGATIVE_NORMALIZED_BFP_NUMBER): New constant.
12288         (S390_TDC_POSITIVE_DENORMALIZED_BFP_NUMBER): New constant.
12289         (S390_TDC_NEGATIVE_DENORMALIZED_BFP_NUMBER): New constant.
12290         * config/s390/s390.md (FP_ALL): New mode iterator.
12291         (_d): New mode attribute.
12292         ("*signbit<mode>2>"): Changed mode of first operand.
12293         ("isinf<mode>2"): Changed mode of first operand.
12294         ("*TDC_insn"): Adaptation for DFP modes.
12295
12296 2008-01-22  Ben Elliston  <bje@au.ibm.com>
12297
12298         * tree.c (check_qualified_type): Improve function description.
12299
12300 2008-01-21  Jason Merrill  <jason@redhat.com>
12301
12302         PR c++/34196
12303         * tree.h (TRY_CATCH_IS_CLEANUP): New macro.
12304         * tree-eh.c (honor_protect_cleanup_actions): Strip TRY_CATCH_EXPR
12305         if it is set.
12306
12307 2008-01-21  DJ Delorie  <dj@redhat.com>
12308
12309         * doc/tm.texi (HARD_REGNO_NREGS): Note that this macro must not
12310         return zero.
12311
12312 2008-01-21  Richard Guenther  <rguenther@suse.de>
12313
12314         PR middle-end/34856
12315         * tree-cfg.c (verify_expr): Allow all invariant expressions
12316         instead of just constant class ones as reference argument.
12317         * tree-ssa-loop-im.c (for_each_index): Handle CONSTRUCTOR
12318         like any other constant.
12319         * tree-ssa-sccvn.c (copy_reference_ops_from_ref): Likewise.
12320
12321 2008-01-21  H.J. Lu  <hongjiu.lu@intel.com>
12322
12323         * regmove.c (fixup_match_1): Update call crossed frequencies.
12324
12325 2008-01-21  Richard Guenther  <rguenther@suse.de>
12326
12327         PR c/34885
12328         * tree-inline.c (setup_one_parameter): Deal with mismatched
12329         types using a VIEW_CONVERT_EXPR.
12330
12331 2008-01-21  Alon Dayan  <alond@il.ibm.com>
12332             Olga Golovanevsky  <olga@il.ibm.com>
12333         
12334         PR tree-optimization/34701
12335         * ipa-struct-reorg.c (gen_size): Fix the malloc parameter calculation
12336         when the structure size is not a power of 2.
12337
12338 2008-01-20  Kenneth Zadeck  <zadeck@naturalbridge.com>
12339
12340         * doc/install.texi: Add doc for --enable-checking=df.
12341         
12342 2008-01-20  Kaz Kojima  <kkojima@gcc.gnu.org>
12343
12344         PR rtl-optimization/34808
12345         * emit-rtl.c (try_split): Handle REG_RETVAL notes.
12346
12347 2008-01-20  Richard Sandiford  <rsandifo@nildram.co.uk>
12348
12349         * global.c (find_reg): Only compute EH_RETURN_DATA_REGNO once per
12350         input.
12351
12352 2008-01-19  Kenneth Zadeck  <zadeck@naturalbridge.com>
12353
12354         PR rtl-optimization/26854
12355         PR rtl-optimization/34400
12356         * ddg.c (create_ddg_dep_from_intra_loop_link): Do not use
12357         DF_RD->gen.
12358         * df.h (df_changeable_flags.DF_RD_NO_TRIM): New.
12359         (df_rd_bb_info.expanded_lr_out): New.
12360         * loop_invariant.c (find_defs): Added DF_RD_NO_TRIM flag.
12361         * loop_iv.c (iv_analysis_loop_init): Ditto.
12362         * df-problems.c (df_rd_free_bb_info, df_rd_alloc, df_rd_confluence_n,
12363         df_rd_bb_local_compute, df_rd_transfer_function, df_rd_free):
12364         Added code to allocate, initialize or free expanded_lr_out.
12365         (df_rd_bb_local_compute_process_def): Restructured to make
12366         more understandable.
12367         (df_rd_confluence_n): Add code to do nothing with fake edges and
12368         code to no apply invalidate_by_call sets if the sets are being trimmed.
12369         (df_lr_local_finalize): Renamed to df_lr_finalize.
12370         (df_live_local_finalize): Renamed to df_live_finalize.
12371
12372 2008-01-20  Richard Sandiford  <rsandifo@nildram.co.uk>
12373
12374         PR target/34831
12375         * config/mips/mips.md (div<mode>3): Use <recip_condition> when
12376         deciding whether to use reciprocal instructions.
12377
12378 2008-01-19  Uros Bizjak  <ubizjak@gmail.com>
12379
12380         * dwarf2out.c (dwarf2out_switch_text_section): Do not call
12381         dwarf2out_note_section_used if cold_text_section is NULL.
12382
12383 2008-01-19  Jakub Jelinek  <jakub@redhat.com>
12384
12385         PR gcov-profile/34610
12386         * tree-cfg.c (make_edges): Mark both outgoing edges from
12387         OMP_CONTINUE and from OMP_FOR as EDGE_ABNORMAL.
12388         * omp-low.c (expand_omp_for): Clear EDGE_ABNORMAL bits
12389         from OMP_FOR and OMP_CONTINUE outgoing edges.
12390
12391         * tree-profile.c (tree_profiling): Return early if
12392         cfun->after_tree_profile != 0.  Set cfun->after_tree_profile
12393         at the end.
12394         * omp-low.c (expand_omp_parallel): Copy after_tree_profile
12395         from cfun to child_cfun.
12396         * function.h (struct function): Add after_tree_profile bit.
12397
12398 2008-01-19 Anatoly Sokolov <aesok@post.ru>
12399
12400         * config/avr/avr.S (_exit): Disable interrupt.
12401
12402 2008-01-18  Kenneth Zadeck  <zadeck@naturalbridge.com>
12403             Steven Bosscher  <stevenb.gcc@gmail.com>
12404
12405         PR rtl-optimization/26854
12406         PR rtl-optimization/34400
12407         * df-problems.c (df_live_scratch): New scratch bitmap.
12408         (df_live_alloc): Allocate df_live_scratch when doing df_live.
12409         (df_live_reset): Clear the proper bitmaps.
12410         (df_live_bb_local_compute): Only process the artificial defs once
12411         since the order is not important.
12412         (df_live_init): Init the df_live sets only with the variables
12413         found live by df_lr.
12414         (df_live_transfer_function): Use the df_lr sets to prune the
12415         df_live sets as they are being computed.  
12416         (df_live_free): Free df_live_scratch.
12417
12418 2008-01-18  Ian Lance Taylor  <iant@google.com>
12419
12420         * common.opt: Add fmerge-debug-strings.
12421         * dwarf2out.c (DEBUG_STR_SECTION_FLAGS): Test
12422         flag_merge_debug_strings rather than flag_merge_constants.
12423         * doc/invoke.texi (Option Summary): Mention
12424         -fmerge-debug-strings.
12425         (Debugging Options): Document -fmerge-debug-strings.
12426
12427 2008-01-18  Ian Lance Taylor  <iant@google.com>
12428
12429         PR c++/33407
12430         * tree.h (DECL_IS_OPERATOR_NEW): Define.
12431         (struct tree_function_decl): Add new field operator_new_flag.
12432         * tree-inline.c (expand_call_inline): When inlining a call to
12433         operator new, force the return value to go into a variable, and
12434         set DECL_NO_TBAA_P on that variable.
12435         * c-decl.c (merge_decls): Merge DECL_IS_OPERATOR_NEW flag.
12436
12437 2008-01-18  Uros Bizjak  <ubizjak@gmail.com>
12438
12439         PR debug/34484
12440         * dwarf2out.c (dwarf2out_switch_text_section): Do not guard with
12441         DWARF2_DEBUGGING_INFO.
12442         (dwarf2out_note_section_used): Ditto.  Add prototype.
12443         (have_multiple_function_sections, text_section_used,
12444         cold_text_section_used, *cold_text_sections): Move declarations
12445         before their uses.
12446
12447 2008-01-17  Bob Wilson  <bob.wilson@acm.org>
12448
12449         * config/xtensa/unwind-dw2-xtensa.h (_Unwind_FrameState): Remove pc
12450         field and add signal_ra.
12451         * config/xtensa/unwind-dw2-xtensa.c (uw_frame_state_for): Remove
12452         assignments to frame state pc.  Move end of stack check after
12453         MD_FALLBACK_FRAME_STATE_FOR.
12454         (uw_update_context_1): Use frame state signal_regs if set, instead
12455         of checking signal_frame flag.
12456         (uw_update_context): Use frame state signal_ra if set.
12457         * config/xtensa/linux.h (MD_UNWIND_SUPPORT): Define.
12458         * config/xtensa/linux-unwind.h: New file.
12459
12460 2008-01-18  Bernhard Fischer  <aldot@gcc.gnu.org>
12461
12462         * modulo-sched.c (get_sched_window): Fix comment typo.
12463
12464 2008-01-17  Andrew MacLeod  <amacleod@redhat.com>
12465
12466         PR tree-optimization/34648
12467         * tree-ssa-sccvn.c (visit_use): Expressions which can throw are varying.
12468
12469 2008-01-17  Anatoly Sokolov <aesok@post.ru>
12470
12471         * config/avr/avr.h (LINK_SPEC): Support -mrelax and -mpmem-wrap-around.
12472         * config/avr/avr.opt (mrelax, mpmem-wrap-around): Add.
12473
12474 2008-01-17  Seongbae Park  <seongbae.park@gmail.com>
12475
12476         PR rtl-optimization/34400
12477         * df-core.c (df_worklist_dataflow_overeager,
12478         df_worklist_dataflow_doublequeue): New functions.
12479         (df_worklist_dataflow): Two different worklist solvers.
12480         * params.def (PARAM_DF_DOUBLE_QUEUE_THRESHOLD_FACTOR):
12481         New param.
12482
12483 2008-01-16  Sebastian Pop  <sebastian.pop@amd.com>
12484
12485         PR testsuite/34821
12486         * doc/invoke.texi: Document the dependence on pthread for fopenmp
12487         and ftree-parallelize-loops.
12488
12489 2008-01-17  Mircea Namolaru  <namolaru@il.ibm.com>
12490
12491         PR rtl-optimization/34826
12492         * loop-doloop (doloop_modify): Update the REG_BR_PROB note.
12493
12494 2008-01-17  Andreas Krebbel  <krebbel1@de.ibm.com>
12495
12496         * global.c (find_reg): Mark the eh regs as used if necessary.
12497         * ra-conflict.c (global_conflicts): Set no_eh_reg flag.
12498         * ra.h (struct allocno): no_eh_reg field added.  Changed
12499         no_stack_reg type to bitfield.
12500
12501 2008-01-17  Eric Botcazou  <ebotcazou@adacore.com>
12502
12503         * tree.c (substitute_in_expr): Add missing 'break'.
12504
12505 2008-01-17  Richard Guenther  <rguenther@suse.de>
12506
12507         PR tree-optimization/34825
12508         * tree-ssa-math-opts.c (is_division_by): Do not recognize
12509         x / x as division to handle.
12510
12511 2008-01-16  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
12512
12513         * pa64-hpux.h (LIB_SPEC): Add "-lpthread" in shared links if "-mt" or
12514         "-pthread" is specified.
12515         * pa-hpux11.h (LIB_SPEC): Likewise.
12516
12517 2008-01-16  Janis Johnson  <janis187@us.ibm.com>
12518             Peter Bergner  <bergner@vnet.ibm.com>
12519
12520         PR rtl-optimization/33796
12521         * sparseset.c (sparseset_alloc): Use xcalloc rather than xmalloc.
12522
12523 2008-01-16  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
12524
12525         PR libgfortran/34699
12526         * pa-hpux.h (LINK_SPEC): Only search /lib/pa1.1 and /usr/lib/pa1.1 on
12527         static links.
12528         * pa-hpux10.h (LINK_SPEC): Likewise.
12529         * pa-hpux11.h (LINK_SPEC): Don't search /lib/pa1.1 and /usr/lib/pa1.1.
12530
12531 2008-01-16  Richard Guenther  <rguenther@suse.de>
12532
12533         PR middle-end/32628
12534         * fold-const.c (fold_convert_const_int_from_int): Do not
12535         set overflow if that occured only because of a sign extension
12536         change when converting from/to a sizetype with the same
12537         precision and signedness.
12538
12539 2008-01-16  Uros Bizjak  <ubizjak@gmail.com>
12540
12541         PR debug/34249
12542         * dwarf2out.c (output_call_frame_info): Move output of FDE initial
12543         location address to the correct place.  Update copyright year.
12544
12545 2008-01-16  Sebastian Pop  <sebastian.pop@amd.com>
12546
12547         * lambda-code.c (lambda_transform_legal_p): Handle the case of
12548         no dependences in the dependence_relations vector.
12549
12550 2008-01-16  Jan Hubicka  <jh@suse.cz>
12551
12552         PR rtl-optimization/31396
12553         * regstat.c (regstat_bb_compute_ri): Compute FREQ_CALLS_CROSSED.
12554         * cfg.c (dump_reg_info): Print it.
12555         * regs.h (struct reg_info_t): add freq_calls_crossed.
12556         (REG_FREQ_CALLS_CROSSED): New macro.
12557         * global.c (global_alloc): Compute freq_calls_crossed for allocno.
12558         (find_reg): Update call of CALLER_SAVE_PROFITABLE.
12559         * regmove.c (optimize_reg_copy_1, optimize_reg_copy_2, fixup_match_2,
12560         regmove_optimize): Update call crossed frequencies.
12561         * local-alloc.c (struct qty): Add freq_calls_crossed.
12562         (alloc_qty): Copute freq_calls_crossed.
12563         (update_equiv_regs, combine_regs): Update REG_FREQ_CALLS_CROSSED.
12564         (find_free_reg): Update call of CALLER_SAVE_PROFITABLE.
12565         * ra.h (struct allocno): Add freq_calls_crossed.
12566
12567 2008-01-16  Sebastian Pop  <sebastian.pop@amd.com>
12568
12569         * gcc.c (LINK_COMMAND_SPEC): Add includes and link options for
12570         libgomp when compiling with ftree-parallelize-loops.
12571         (GOMP_SELF_SPECS): Add -pthread for ftree-parallelize-loops.
12572
12573 2008-01-16  Richard Guenther  <rguenther@suse.de>
12574
12575         PR tree-optimization/34769
12576         * tree-data-ref.c (initialize_matrix_A): Revert fix for PR34458.
12577         * tree.c (int_cst_value): Instead make this function more
12578         permissive in what it accepts as valid input.  Document this
12579         function always sign-extends the value.
12580
12581 2008-01-16  Jakub Jelinek  <jakub@redhat.com>
12582             Richard Guenther  <rguenther@suse.de>
12583
12584         PR c/34668
12585         * gimplify.c (fold_indirect_ref_rhs): Rename to ...
12586         (gimple_fold_indirect_ref_rhs): ... this.
12587         (gimple_fold_indirect_ref): New function with foldings
12588         that preserve lvalueness.
12589         (gimplify_modify_expr_rhs): Call gimple_fold_indirect_ref_rhs.
12590         * tree-flow.h (gimple_fold_indirect_ref): Declare.
12591         * tree-inline.c (copy_body_r): Use gimple_fold_indirect_ref
12592         to fold an INDIRECT_REF, fall back to the old use of
12593         fold_indirect_ref_1.
12594
12595 2008-01-16  Sebastian Pop  <sebastian.pop@amd.com>
12596
12597         * tree-data-ref.c (subscript_dependence_tester_1): Call 
12598         free_conflict_function.
12599         (compute_self_dependence): Same.
12600
12601 2008-01-16  Uros Bizjak  <ubizjak@gmail.com>
12602
12603         PR debug/34249
12604         * debug.h (dwarf2out_switch_text_section): Move declaration from ...
12605         * dwarf2out.c (dwarf2out_switch_text_section): ... here.  Make
12606         function global.
12607         * final.c (final_scan_insn) [NOTE_INSN_SWITCH_TEXT_SECTIONS]:
12608         Depending on dwarf2out_do_frame, call dwarf2out_switch_text_section
12609         for DWARF2_UNWIND_INFO targets.
12610
12611 2008-01-16  Richard Guenther  <rguenther@suse.de>
12612
12613         PR c/34768
12614         * c-typeck.c (common_pointer_type): Do not merge inconsistent
12615         type qualifiers for function types.
12616
12617 2008-01-15  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
12618
12619         * tree-parloops.c (gen_parallel_loop): Fix ommision of declaration for
12620         loop_iterator li from previous commit.
12621
12622 2008-01-15  Sebastian Pop  <sebastian.pop@amd.com>
12623
12624         * tree-parloops.c (gen_parallel_loop): Free loop bound estimations.
12625
12626 2008-01-12  Sebastian Pop  <sebastian.pop@amd.com>
12627
12628         * tree-parloops.c (loop_has_blocks_with_irreducible_flag): New.
12629         (parallelize_loops): Don't parallelize irreducible components.
12630
12631 2008-01-14  Manuel Lopez-Ibanez  <manu@gcc.gnu.org>
12632
12633         PR c++/24924
12634         * c-opts (c_common_post_options): Do not enable CPP
12635         flag_pedantic_errors by default.
12636         
12637 2008-01-14  Eric Botcazou  <ebotcazou@adacore.com>
12638
12639         PR rtl-optimization/31944
12640         * cse.c (remove_pseudo_from_table): New function.
12641         (merge_equiv_classes): Use above function to remove pseudo-registers.
12642         (invalidate): Likewise.
12643
12644 2008-01-13  Richard Guenther  <rguenther@suse.de>
12645
12646         PR middle-end/34601
12647         * emit-rtl.c (set_reg_attrs_for_decl_rtl): Use DECL_MODE
12648         instead of TYPE_MODE to deal with calls from expand_one_error_var.
12649
12650 2008-01-13  Uros Bizjak  <ubizjak@gmail.com>
12651
12652         * gcse.c (cprop_jump): Call validate_unshare_change instead of
12653         validate_change to unshare the source of the PC set.
12654
12655 2008-01-12  Jan Hubicka  <jh@suse.cz>
12656
12657         PR middle-end/32135
12658         * tree-ssa-ccp.c (maybe_fold_offset_to_array_ref): Do not construct
12659         references above array bounds.  This might trigger bounds checks for
12660         pointers to arrays.
12661
12662 2008-01-12  Sebastian Pop  <sebastian.pop@amd.com>
12663
12664         * tree-ssa-ter.c (free_temp_expr_table): Free num_in_part and
12665         new_replaceable_dependencies.
12666
12667 2008-01-12  Doug Kwan  <dougkwan@google.com>
12668
12669         * c-decl.c: (grokdeclarator): Use OPT_Wignored_qualifiers
12670         instead of OPT_Wreturn_type in warning due to ignored return type
12671         qualifiers.
12672         * c-opt.c (c_common_post_option): Add -Wignored-qualifiers to
12673         options included in -Wextra.
12674         * c.opt: New option -Wignored_qualifiers.
12675         * doc/invoke.texi (Warning Options, -Wextra): Add new option
12676         -Wignore_qualifiers.
12677         (-Wignored-qualifiers): Document.
12678         (-Wreturn-type): Remove description of functionality now handled
12679         by -Wignored-qualifiers.
12680
12681 2008-01-12  Eric Botcazou  <ebotcazou@adacore.com>
12682
12683         PR ada/33788
12684         * fold-const.c (fold_unary) <VIEW_CONVERT_EXPR>: Fold an existing
12685         NOP_EXPR if it is between integral types with the same precision.
12686
12687 2008-01-12  Jan Hubicka  <jh@suse.cz>
12688
12689         PR other/28023
12690         * invoke.texi (max-inline-recursive-depth): Fix default value.
12691
12692 2008-01-12  Zdenek Dvorak  <ook@ucw.cz>
12693
12694         * tree-parloops.c (transform_to_exit_first_loop): Cast nit to the
12695         correct type.
12696
12697 2008-01-11  Bob Wilson  <bob.wilson@acm.org>
12698         
12699         * config/xtensa/xtensa.c (override_options): Set flag_shlib.
12700         
12701 2008-01-11  James E. Wilson  <wilson@specifix.com>
12702
12703         PR target/26015
12704         * config/vax/elf.h (FRAME_POINTER_CFA_OFFSET): Define.
12705
12706 2008-01-11  Anatoly Sokolov <aesok@post.ru>
12707
12708         * config/avr/avr.c (expand_prologue, expand_epilogue): Don't 
12709         save/restore frame pointer register and don't use 'call-prologues' 
12710         optimization in function with "OS_task" attribute.
12711
12712 2008-01-11  Eric Botcazou  <ebotcazou@adacore.com>
12713
12714         PR middle-end/31309
12715         * expr.c (copy_blkmode_from_reg): Use a mode suited to the size
12716         when copying to memory.
12717
12718 2008-01-11  Steven Bosscher  <stevenb.gcc@gmail.com>
12719
12720         PR rtl-optimization/30905
12721         * cfgcleanup.c: Include dce.h
12722         (crossjumps_occured): New global variable.
12723         (try_crossjump_bb): Exit loop after finding a fallthru edge.
12724         If something changed, set crossjumps_occured to true.
12725         (try_optimize_cfg): Clear crossjumps_occured at the beginning.
12726         Don't add/remove fake edges to exit here...
12727         (cleanup_cfg): ...but do it here, when crossjumping.
12728         Run a fast DCE when successful crossjumps occured in the latest
12729         iteration of try_optimize_cfg.
12730
12731 2008-01-11  Richard Guenther  <rguenther@suse.de>
12732
12733         * tree-ssa-sccvn.c (struct vn_binary_op_s): Move hashcode near opcode.
12734         (struct vn_unary_op_s): Likewise.
12735         (vn_reference_insert): Free old reference on hash collision.
12736
12737 2008-01-10  Raksit Ashok  <raksit@google.com>
12738
12739         PR rtl-optimization/27971
12740         * combine.c (find_split_point): Split PLUS expressions which are
12741         inside a MEM rtx, and whose first operand is complex.
12742
12743 2008-01-10  DJ Delorie  <dj@redhat.com>
12744
12745         * config/m32c/m32c.c (m32c_hard_regno_nregs_1): Renamed from...
12746         (m32c_hard_regno_nregs): ...this, which is now a wrapper.
12747         (m32c_hard_regno_ok): Call the underlying function.
12748
12749 2008-01-10  Richard Guenther  <rguenther@suse.de>
12750
12751         PR middle-end/34683
12752         * tree-cfg.c (tree_merge_blocks): Do not go through the
12753         full-blown folding and stmt updating path if we just deal
12754         with virtual operands.
12755         * tree-ssa-copy.c (may_propagate_copy): Do not short-cut
12756         test for abnormal SSA_NAMEs.
12757
12758 2008-01-10  Andreas Krebbel  <krebbel1@de.ibm.com>
12759
12760         PR middle-end/34641
12761         * reload.c (push_reload): Add assertions.  All constants from
12762         reg_equiv_constant should have been used for replacing the respective
12763         pseudo earlier.
12764         (find_reloads_address): Invoke find_reloads_address_part for
12765         constant taken from the reg_equiv_constant array.
12766
12767 2008-01-10  Steven Bosscher  <stevenb.gcc@gmail.com>
12768
12769         * tree-ssa-sccvn.h (struct vn_ssa_aux): Make the most accessed
12770         field (valnum) the first in the struct.  Replace bools with
12771         unit bit fields.
12772
12773 2008-01-10  Richard Guenther  <rguenther@suse.de>
12774
12775         PR tree-optimization/34651
12776         * tree-sra.c (sra_build_assignment): Sanitize.  Use the correct
12777         types and ordering for masking and converting.
12778
12779 2008-01-09  Sebastian Pop  <sebastian.pop@amd.com>
12780
12781         PR tree-optimization/34017
12782         * lambda-code.c (lambda_loopnest_to_gcc_loopnest): Generate code
12783         also for PHI_NODE expressions.
12784
12785 2008-01-09  Jan Hubicka  <jh@suse.cz>
12786
12787         PR tree-optimization/34708
12788         * tree-inline.c (estimate_num_insns_1): Compute cost of SWITCH_EXPR
12789         based on number of case labels.
12790         (init_inline_once): Remove switch_cost.
12791         * tree-inline.h (eni_weights_d): Remove switch_cost.
12792
12793 2008-01-09  Richard Guenther  <rguenther@suse.de>
12794         Andrew Pinski  <andrew_pinski@playstation.sony.com>
12795
12796         PR middle-end/30132
12797         * gimplify.c (gimplify_cond_expr): Do not create an addressable
12798         temporary if an rvalue is ok or an lvalue is not required.
12799
12800 2008-01-09  Richard Guenther  <rguenther@suse.de>
12801
12802         PR middle-end/34458
12803         * tree-data-ref.c (initialize_matrix_A): Use tree_low_cst,
12804         adjust return type.
12805
12806 2008-01-09  Richard Guenther  <rguenther@suse.de>
12807
12808         PR middle-end/34679
12809         * tree.c (host_integerp): Check for sizetype only if the
12810         type is an integer type.
12811
12812 2008-01-09  Steven Bosscher  <stevenb.gcc@gmail.com>
12813
12814         PR debug/26364
12815         * opts.c (decode_options): Disable inlining of functions called
12816         once if not in unit-at-a-time mode.
12817
12818 2008-01-09  Alexandre Oliva  <aoliva@redhat.com>
12819
12820         * Makefile.in (dse.o): Remove duplicate $(RECOG_H) dependency.
12821
12822 2008-01-08  Richard Guenther  <rguenther@suse.de>
12823
12824         PR middle-end/31863
12825         * tree-ssa-structalias.c (push_fields_onto_fieldstack): Bail
12826         out early if the result will be unused.
12827
12828 2008-01-08  Uros Bizjak  <ubizjak@gmail.com>
12829
12830         PR target/34709
12831         Revert:
12832
12833         2008-01-05  Uros Bizjak  <ubizjak@gmail.com>
12834         * config/i386/i386.c (ix86_builtin_reciprocal): Remove check
12835         for TARGET_RECIP.       
12836         
12837 2008-01-08  Jan Sjodin  <jan.sjodin@amd.com>
12838         
12839         * config/i386/i386.c (k8_cost, amdfam10_cost): Branch costs
12840         for vectorization tuned.
12841         
12842 2008-01-08  Richard Guenther  <rguenther@suse.de>
12843
12844         PR tree-optimization/34683
12845         * tree-ssa-operands.c (operand_build_cmp): Export.
12846         * tree-ssa-operands.h (operand_build_cmp): Declare.
12847         * tree-vn.c (vuses_compare): Remove.
12848         (sort_vuses): Use operand_build_cmp.
12849         (sort_vuses_heap): Likewise.
12850         * tree-ssa-sccvn.c (vuses_to_vec): Use VEC_reserve, not VEC_alloc
12851         to re-use old VEC if available.  Do not sort already sorted VUSEs.
12852         (vdefs_to_vec): Do not sort already sorted VDEFs.
12853
12854 2008-01-08  Jakub Jelinek  <jakub@redhat.com>
12855
12856         PR middle-end/34694
12857         * omp-low.c (copy_var_decl): Copy also DECL_SOURCE_LOCATION.
12858
12859 2008-01-08  Uros Bizjak  <ubizjak@gmail.com>
12860
12861         PR target/34702
12862         * doc/invoke.texi (i386 and x86-64 Options) [mrecip]: Document
12863         limitations of reciprocal sequences on x86 targets.
12864
12865 2008-01-08  Richard Guenther  <rguenther@suse.de>
12866
12867         PR tree-optimization/34683
12868         * tree-flow-inline.h (var_ann): Remove overzealous asserts.
12869
12870 2008-01-07  Jakub Jelinek  <jakub@redhat.com>
12871
12872         PR target/34622
12873         * config/darwin.c (darwin_mergeable_string_section): Don't use
12874         .cstring if int_size_in_bytes != TREE_STRING_LENGTH.
12875
12876 2008-01-07  Uros Bizjak  <ubizjak@gmail.com>
12877
12878         PR target/34682
12879         * config/i386/i386.md (neg<mode>2): Rename from negsf2, negdf2 and
12880         negxf2.  Macroize expander using X87MODEF mode iterator.  Change
12881         predicates of op0 and op1 to register_operand.
12882         (abs<mode>2): Rename from abssf2, absdf2 and negxf2.  Macroize
12883         expander using X87MODEF mode iterator.  Change predicates of
12884         op0 and op1 to register_operand.
12885         ("*absneg<mode>2_mixed", "*absneg<mode>2_sse"): Rename from
12886         corresponding patterns and macroize using MODEF macro.  Change
12887         predicates of op0 and op1 to register_operand and remove
12888         "m" constraint. Disparage "r" alternative with "!".
12889         ("*absneg<mode>2_i387"): Rename from corresponding patterns and
12890         macroize using X87MODEF macro.  Change predicates of op0 and op1
12891         to register_operand and remove "m" constraint.  Disparage "r"
12892         alternative with "!".
12893         (absneg splitter with memory operands): Remove.
12894         ("*neg<mode>2_1", "*abs<mode>2_1"): Rename from corresponding
12895         patterns and macroize using X87MODEF mode iterator.
12896         * config/i386/sse.md (negv4sf2, absv4sf2, neg2vdf2, absv2df2):
12897         Change predicate of op1 to register_operand.
12898         * config/i386/i386.c (ix86_expand_fp_absneg_operator): Remove support
12899         for memory operands.
12900
12901 2008-01-07  Nathan Froyd  <froydnj@codesourcery.com>
12902
12903         * config/rs6000/rs6000.h (ASM_CPU_SPEC): Add clause for mcpu=8548.
12904
12905 2008-01-07  Richard Guenther  <rguenther@suse.de>
12906
12907         * basic-block.h (struct edge_def): Pair dest_idx with goto_locus
12908         fields.
12909
12910 2008-01-07  Richard Guenther  <rguenther@suse.de>
12911
12912         PR tree-optimization/34683
12913         * tree-ssa-sccvn.c (vuses_to_vec): Pre-allocate the vector of
12914         VOPs of the needed size to save memory.  Use VEC_quick_push
12915         to save compile-time.
12916         (vdefs_to_vec): Likewise.
12917
12918 2008-01-07  Sa Liu  <saliu@de.ibm.com>
12919
12920         * config/spu/spu.md (divdf3): Genetate inline code for double
12921         division.  The implementation doesn't handle INF or NAN, therefore it
12922         only applies when -ffinite-math-only is given.
12923
12924 2008-01-06  Paolo Carlini  <pcarlini@suse.de>
12925
12926         PR libstdc++/34680
12927         * c-cppbuiltin.c (c_cpp_builtins): Define __GXX_RTTI, if appropriate.
12928         * doc/cpp.texi ([Common Predefined Macros]): Document.
12929
12930 2008-01-06  Uros Bizjak  <ubizjak@gmail.com>
12931
12932         * config/i386/i386.c (ix86_emit_swsqrtsf): Use negative constants in
12933         order to use commutative addition instead of subtraction.
12934
12935 2008-01-06  Andrew Pinski  <andrew_pinski@playstation.sony.com>
12936             Mircea Namolaru  <namolaru@il.ibm.com>
12937             Vladimir Yanovsky  <yanov@il.ibm.com>
12938             Revital Eres  <eres@il.ibm.com>
12939
12940         PR tree-optimization/34263
12941         * tree-outof-ssa.c (process_single_block_loop_latch,
12942         contains_tree_r): New functions.
12943         (analyze_edges_for_bb): Call process_single_block_loop_latch
12944         function to empty single-basic-block latch block if possible.
12945
12946 2008-01-05  Uros Bizjak  <ubizjak@gmail.com>
12947
12948         * config/i386/i386.c (ix86_builtin_reciprocal): Remove check
12949         for TARGET_RECIP.
12950         (ix86_emit_swsqrtsf): Do not filter out infinity for rsqrt expansion.
12951
12952 2008-01-05  Richard Sandiford  <rsandifo@nildram.co.uk>
12953
12954         * c-omp.c (check_omp_for_incr_expr): Handle CONVERT_EXPR.
12955
12956 2008-01-05  Richard Sandiford  <rsandifo@nildram.co.uk>
12957
12958         * config/mips/mips.c (mips_in_small_data_p): Reinstate size > 0 check.
12959
12960 2008-01-05  Jakub Jelinek  <jakub@redhat.com>
12961
12962         PR tree-optimization/34618
12963         * tree-outof-ssa.c (create_temp): Copy over DECL_GIMPLE_REG_P
12964         flag from T.
12965
12966 2008-01-05  Uros Bizjak  <ubizjak@gmail.com>
12967
12968         PR target/34673
12969         * config/i386/i386.c (ix86_emit_swsqrtsf): Swap input operands
12970         in the call to gen_rtx_NE.  Remove unneeded VECTOR_MODE_P check.
12971         Update copyright year.
12972
12973         * config/i386/i386.md (rsqrtsf2): Enable for TARGET_SSE_MATH.
12974         Update copyright year.
12975         * config/i386/sse.md (rsqrtv4sf2): Ditto. Unconditionally expand
12976         using NR fixup.
12977
12978 2008-01-05  Zhouyi Zhou  <zhouzhouyi@FreeBSD.org>
12979
12980         * tree-vrp.c (find_conditional_asserts): Remove redundant check that
12981         edge does not point to current bb before changing need_assert.
12982
12983 2008-01-04  Richard Guenther  <rguenther@suse.de>
12984
12985         PR middle-end/34029
12986         * tree-cfg.c (verify_expr): Do not look inside ADDR_EXPRs
12987         for verifying purposes if they are is_gimple_min_invariant.
12988
12989 2008-01-04  Aldy Hernandez  <aldyh@redhat.com>
12990
12991         PR tree-optimization/34448
12992         PR tree-optimization/34465
12993         * gimplify.c (gimplify_init_constructor): Add new parameter
12994         notify_temp_creation.  Use it.
12995         (gimplify_modify_expr_rhs): Take volatiles into account when
12996         optimizing constructors.
12997         Do not optimize constructors if gimplify_init_constructor will dump to
12998         memory.
12999         * gcc.dg/tree-ssa/pr32901.c: Tests const volatiles.
13000         * gcc.c-torture/compile/pr34448.c: New.
13001
13002 2008-01-04  Jakub Jelinek  <jakub@redhat.com>
13003
13004         PR gcov-profile/34609
13005         * tree-inline.c (declare_return_variable): Set TREE_ADDRESSABLE on
13006         return_slot if result is TREE_ADDRESSABLE.
13007
13008 2008-01-04  Richard Sandiford  <rsandifo@nildram.co.uk>
13009
13010         * config/mips/mips.md (sqrt_condition): Tweak comment.
13011         (recip_condition): Likewise.  Require TARGET_FLOAT64 for DFmode.
13012
13013 2008-01-03  Tom Tromey  <tromey@redhat.com>
13014
13015         PR c/34457
13016         * c-common.c (c_type_hash): Handle VLAs.
13017
13018 2008-01-03  Jan Hubicka  <jh@suse.cz>
13019
13020         PR tree-optimization/31081
13021         * tree-inline.c (remap_ssa_name): Initialize uninitialized SSA vars to
13022         0 when inlining and not inlining to first basic block.
13023         (remap_decl): When var is initialized to 0, don't set default_def.
13024         (expand_call_inline): Set entry_bb.
13025         * tree-inline.h (copy_body_data): Add entry_bb.
13026
13027 2008-01-03  Jakub Jelinek  <jakub@redhat.com>
13028
13029         PR c++/34619
13030         * cgraphunit.c (cgraph_build_static_cdtor): set_cfun back to NULL
13031         before returning.
13032
13033         PR tree-optimization/29484
13034         * tree-inline.c (inline_forbidden_p_2): New function.
13035         (inline_forbidden_p): Disallow inlining if some static var
13036         has an address of a local LABEL_DECL in its initializer.
13037         * doc/extend.texi (Labels as Values): Document &&foo behaviour
13038         vs. inlining.
13039
13040 2008-01-03  Sebastian Pop  <sebastian.pop@amd.com>
13041
13042         PR tree-optimization/34635
13043         * tree-data-ref.c (add_other_self_distances): Make sure that the
13044         evolution step is constant.
13045
13046 2008-01-03  Jakub Jelinek  <jakub@redhat.com>
13047
13048         PR middle-end/34608
13049         * omp-low.c (expand_omp_parallel): Purge dead EH edges in the child fn.
13050
13051 2008-01-02  Richard Sandiford  <rsandifo@nildram.co.uk>
13052
13053         * tree-sra.c (scalarize_init): Insert the generate_element_init
13054         statements after the generate_element_zero statements.
13055
13056 2008-01-02  Richard Guenther  <rguenther@suse.de>
13057
13058         PR middle-end/34093
13059         PR middle-end/31976
13060         * tree-ssa-operands.c (ssa_operand_alloc): Also allocate a buffer
13061         for very large number of operands instead of ICEing.
13062
13063 2008-01-02  Arthur Norman <acn1@cam.ac.uk>
13064
13065         PR target/34013
13066         * config/i386/i386.c (ix86_expand_prologue): Save red-zone
13067         while stack probing.
13068
13069 2008-01-01  Douglas Gregor  <doug.gregor@gmail.com>
13070
13071         * c-opts.c (sanitize_cpp_opts): Don't warn about "long long" when
13072         in C++0x mode.
13073
13074 2008-01-01  Volker Reichelt  <v.reichelt@netcologne.de>
13075
13076         PR libmudflap/26442
13077         * tree-mudflap.c (mx_register_decls): Guard warning by
13078         !DECL_ARTIFICIAL check.
13079
13080 2008-01-01  Jakub Jelinek  <jakub@redhat.com>
13081
13082         * config/i386/sse.md (sse5_pperm, sse5_pperm_pack_v2di_v4si,
13083         sse5_pperm_pack_v4si_v8hi, sse5_pperm_pack_v8hi_v16qi,
13084         sse5_perm<mode>): Fix constraints.