- Apr 07, 2010
-
-
Dodji Seketeli authored
Fix PR debug/43628 gcc/ChangeLog: PR debug/43628 * dwarf2out.c (modified_type_die): Ignore artificial typedefs. gcc/testsuite/ChangeLog: PR debug/43628 * g++.dg/debug/dwarf2/typedef2.C: New test. From-SVN: r158044
-
Kai Tietz authored
i386.c (ix86_handle_cconv_attribute): Ignore calling convention attributes on METHOD_TYPEs for w64 ABI, too. 2010-04-06 Kai Tietz <kai.tietz@onevision.com> * config/i386/i386.c (ix86_handle_cconv_attribute): Ignore calling convention attributes on METHOD_TYPEs for w64 ABI, too. From-SVN: r158042
-
Sebastian Pop authored
2010-04-07 Sebastian Pop <sebastian.pop@amd.com> * tree-if-conv.c: Fix indentation and comments. From-SVN: r158041
-
Sebastian Pop authored
2010-04-07 Sebastian Pop <sebastian.pop@amd.com> * tree-if-conv.c: Sort static functions in topological order. From-SVN: r158040
-
Sebastian Pop authored
2010-04-07 Sebastian Pop <sebastian.pop@amd.com> * tree-if-conv.c: Fix indentation and comments. From-SVN: r158039
-
GCC Administrator authored
From-SVN: r158038
-
- Apr 06, 2010
-
-
Dodji Seketeli authored
2010-04-06 Dodji Seketeli <dodji@redhat.com> * g++.dg/debug/dwarf2/redeclaration-1.C: Moved from c-c++-common/dwarf2/redeclaration-1.C From-SVN: r158031
-
Jason Merrill authored
parser.c (cp_parser_class_specifier): Set class location to that of IDENTIFIER_NODE instead of '{' when possible. * parser.c (cp_parser_class_specifier): Set class location to that of IDENTIFIER_NODE instead of '{' when possible. * semantics.c (begin_class_definition): Do not overide locations with less precise ones. From-SVN: r158030
-
Sebastian Pop authored
From-SVN: r158029
-
Sebastian Pop authored
2010-04-05 Sebastian Pop <sebastian.pop@amd.com> PR middle-end/43519 * graphite-clast-to-gimple.c (max_signed_precision_type): Use lang_hooks.types.type_for_size instead of build_nonstandard_integer_type. When converting an unsigned type to signed, double its precision. (gcc_type_for_interval): Use lang_hooks.types.type_for_size. (gcc_type_for_iv_of_clast_loop): Call max_signed_precision_type. (graphite_create_new_loop_guard): When ub + 1 wraps around, use lb <= ub. From-SVN: r158028
-
Sebastian Pop authored
2010-04-04 Sebastian Pop <sebastian.pop@amd.com> PR middle-end/43519 * graphite-clast-to-gimple.c (graphite_create_new_loop_guard): Use POINTER_PLUS_EXPR for pointer types. * gcc.dg/graphite/id-19.c: New. From-SVN: r158027
-
Sebastian Pop authored
2010-04-04 Sebastian Pop <sebastian.pop@amd.com> PR middle-end/43519 * Makefile.in (graphite-clast-to-gimple.o): Depends on langhooks.h. * graphite-clast-to-gimple.c: Include langhooks.h. (max_signed_precision_type): New. (max_precision_type): Takes two types as arguments. (precision_for_value): New. (precision_for_interval): New. (gcc_type_for_interval): New. (gcc_type_for_value): New. (gcc_type_for_clast_term): New. (gcc_type_for_clast_red): New. (gcc_type_for_clast_bin): New. (gcc_type_for_clast_expr): Split up into several functions. (gcc_type_for_clast_eq): Rewritten. (compute_bounds_for_level): New. (compute_type_for_level_1): New. (compute_type_for_level): New. (gcc_type_for_cloog_iv): Removed. (gcc_type_for_iv_of_clast_loop): Rewritten. (graphite_create_new_loop): Compute the lower and upper bound types with gcc_type_for_clast_expr. (graphite_create_new_loop_guard): Same. (find_cloog_iv_in_expr): Removed. (compute_cloog_iv_types_1): Removed. (compute_cloog_iv_types): Removed. (gloog): Do not call compute_cloog_iv_types. * graphite-sese-to-poly.c (new_gimple_bb): Do not initialize GBB_CLOOG_IV_TYPES. (free_data_refs_aux): Do not free GBB_CLOOG_IV_TYPES. * sese.h (struct gimple_bb): Removed field cloog_iv_types. (GBB_CLOOG_IV_TYPES): Removed. * gcc.dg/graphite/run-id-pr42644.c: Call abort. From-SVN: r158026
-
Sebastian Pop authored
2010-04-01 Sebastian Pop <sebastian.pop@amd.com> * graphite-sese-to-poly.c (rewrite_close_phi_out_of_ssa): Assert that gimple_phi_num_args of the loop close SSA phi node is equal to 1. (detect_commutative_reduction): Same. From-SVN: r158025
-
Sebastian Pop authored
2010-04-06 Sebastian Pop <sebastian.pop@amd.com> * graphite-clast-to-gimple.c (graphite_verify): Remove redundant call to verify_ssa. Invoke verify_loop_closed_ssa with an extra argument. * graphite-scop-detection.c (canonicalize_loop_closed_ssa_form): Same. * graphite-sese-to-poly.c (rewrite_reductions_out_of_ssa): Same. (rewrite_commutative_reductions_out_of_ssa): Same. * passes.c (execute_function_todo): Call verify_ssa for every pass in the LNO. Invoke verify_loop_closed_ssa with an extra argument. * tree-flow.h (verify_loop_closed_ssa): Update declaration. * tree-parloops.c (parallelize_loops): Invoke verify_loop_closed_ssa with an extra argument. * tree-ssa-loop-manip.c (check_loop_closed_ssa_stmt): Same. Call verify_ssa only when the extra argument is true. (gimple_duplicate_loop_to_header_edge): Invoke verify_loop_closed_ssa with an extra argument. (tree_transform_and_unroll_loop): Same. From-SVN: r158021
-
Sebastian Pop authored
2010-04-06 Sebastian Pop <sebastian.pop@amd.com> * passes.c (execute_function_todo): Call verify_loop_closed_ssa for all the passes of the LNO having LOOP_CLOSED_SSA. * tree-if-conv.c (pass_if_conversion): Remove TODO_verify_loops. * tree-loop-distribution.c (pass_loop_distribution): Same. * tree-pass.h (TODO_verify_loops): Removed. * tree-ssa-loop.c (pass_tree_loop_init): Same. (pass_lim): Same. (pass_tree_unswitch): Same. (pass_predcom): Same. (pass_vectorize): Same. (pass_linear_transform): Same. (pass_graphite_transforms): Same. (pass_iv_canon): Same. (pass_complete_unroll): Same. (pass_complete_unrolli): Same. (pass_parallelize_loops): Same. (pass_loop_prefetch): Same. (pass_iv_optimize): Same. From-SVN: r158020
-
Changpeng Fang authored
Fix PR32824. 2010-04-06 Changpeng Fang <changpeng.fang@amd.com> PR middle-end/32824 * passes.c (init_optimization_passes): Move pass_lim before pass_copy_prop and pass_dce_loop. * gcc.dg/vect/pr32824: New. From-SVN: r158018
-
Tobias Burnus authored
2010-04-06 Tobias Burnus <burnus@net-b.de> PR fortran/18918 * array.c (gfc_match_array_spec): Add error for -fcoarray=none. * match.c (gfc_match_critical, sync_statement): Ditto. * gfortran.h (gfc_fcoarray): New enum. (gfc_option_t): Use it. * lang.opt (fcoarray): Add new flag. * invoke.texi (fcoarray): Document it. * options.c (gfc_init_options,gfc_handle_option): Handle * -fcoarray=. (gfc_handle_coarray_option): New function. 2010-04-06 Tobias Burnus <burnus@net-b.de> PR fortran/18918 * gfortran.dg/coarray_2.f90: Add dg-options -fcoarray=single. * gfortran.dg/coarray_3.f90: Ditto. * gfortran.dg/coarray_4.f90: Ditto. * gfortran.dg/coarray_5.f90: Ditto. * gfortran.dg/coarray_6.f90: Ditto. * gfortran.dg/coarray_7.f90: Ditto. * gfortran.dg/coarray_8.f90: Ditto. * gfortran.dg/coarray_9.f90: New -fcoarray=none test. From-SVN: r158016
-
Jakub Jelinek authored
PR target/43667 * config/i386/i386.c (bdesc_multi_arg): Use OPTION_MASK_ISA_XOP instead of OPTION_MASK_ISA_AVX for __builtin_ia32_vpermil2p*. (ix86_expand_args_builtin): Use V*_FTYPE_* enum codes instead of MULTI_* defines for 4 argument vpermil2p* builtins. From-SVN: r158015
-
Tobias Burnus authored
2010-04-06 Tobias Burnus <burnus@net-b.de> PR fortran/18918 * gfortran.h (gfc_array_spec): Add cotype. * array.c (gfc_match_array_spec,gfc_set_array_spec): Use it and defer error diagnostic. * resolve.c (resolve_fl_derived): Add missing check. (resolve_symbol): Add cotype/type check. * parse.c (parse_derived): Fix setting of coarray_comp. 2010-04-06 Tobias Burnus <burnus@net-b.de> PR fortran/18918 * gfortran.dg/coarray_4.f90: Fix test. * gfortran.dg/coarray_6.f90: Add more tests. From-SVN: r158014
-
Uros Bizjak authored
* config/i386/i386-protos.h (x86_maybe_negate_const_int): Declare. * config/i386/i386.c (x86_maybe_negate_const_int): New. (x86_output_mi_thunk): Use x86_maybe_negate_const_int. * config/i386/i386.md (*add<mode>_1, *addsi_1_zext, *addhi_1, *addhi_1_lea, *addqi_1, *addqi_1_lea, *addqi_1_slp, *add<mode>_2, *addsi_2_zext, *addhi_2, *addqi_2, *add<mode>_3, *addsi_3_zext, *addhi_3, *addqi_3,*add<mode>_5, *addhi_5, *addqi_5): Use x86_maybe_negate_const_int to output insn mnemonic. (*adddi_4, *addsi_4, *addhi_4, *addqi_4): Ditto. Remove overflow check from instruction predicate. Update comments. * config/i386/sync.md (sync_add<mode>): Use x86_maybe_negate_const_int to output insn mnemonic. From-SVN: r158013
-
Tobias Burnus authored
2010-04-06 Tobias Burnus <burnus@net-b.de> PR fortran/18918 * array.c (gfc_free_array_spec,gfc_resolve_array_spec, match_array_element_spec,gfc_copy_array_spec, gfc_compare_array_spec): Include corank. (match_array_element_spec,gfc_set_array_spec): Support codimension. * decl.c (build_sym,build_struct,variable_decl, match_attr_spec,attr_decl1,cray_pointer_decl, gfc_match_volatile): Add codimension. (gfc_match_codimension): New function. * dump-parse-tree.c (show_array_spec,show_attr): Support * codimension. * gfortran.h (symbol_attribute,gfc_array_spec): Ditto. (gfc_add_codimension): New function prototype. * match.h (gfc_match_codimension): New function prototype. (gfc_match_array_spec): Update prototype * match.c (gfc_match_common): Update gfc_match_array_spec call. * module.c (MOD_VERSION): Bump. (mio_symbol_attribute): Support coarray attributes. (mio_array_spec): Add corank support. * parse.c (decode_specification_statement,decode_statement, parse_derived): Add coarray support. * resolve.c (resolve_formal_arglist, was_declared, is_non_constant_shape_array, resolve_fl_variable, resolve_fl_derived, resolve_symbol): Add coarray support. * symbol.c (check_conflict, gfc_add_volatile, gfc_copy_attr, gfc_build_class_symbol): Add coarray support. (gfc_add_codimension): New function. 2010-04-06 Tobias Burnus <burnus@net-b.de> PR fortran/18918 * gfortran.dg/coarray_4.f90: New test. * gfortran.dg/coarray_5.f90: New test. * gfortran.dg/coarray_6.f90: New test. From-SVN: r158012
-
Tobias Burnus authored
2010-04-06 Tobias Burnus <burnus@net-b.de> PR fortran/18918 * iso-fortran-env.def: Add the integer parameters * atomic_int_kind, atomic_logical_kind, iostat_inquire_internal_unit, stat_locked, stat_locked_other_image, stat_stopped_image and stat_unlocked of Fortran 2008. * intrinsic.texi (iso_fortran_env): Ditto. * libgfortran.h (libgfortran_stat_codes): New enum. * module.c (use_iso_fortran_env_module): Honour -std= when * loading constants from the intrinsic module. 2010-04-06 Tobias Burnus <burnus@net-b.de> PR fortran/18918 * gfortran.dg/iso_fortran_env_5.f90: New test. * gfortran.dg/iso_fortran_env_6.f90: New test. From-SVN: r158011
-
Tobias Burnus authored
2010-04-06 Tobias Burnus <burnus@net-b.de> PR fortran/39997 * intrinsic.c (add_functions): Add num_images. * decl.c (gfc_match_end): Handle END CRITICAL. * intrinsic.h (gfc_simplify_num_images): Add prototype. * dump-parse-tree.c (show_code_node): Dump CRITICAL, ERROR STOP, and SYNC. * gfortran.h (gfc_statement): Add enum items for those. (gfc_exec_op) Ditto. (gfc_isym_id): Add num_images. * trans-stmt.c (gfc_trans_stop): Handle ERROR STOP. (gfc_trans_sync,gfc_trans_critical): New functions. * trans-stmt.h (gfc_trans_stop,gfc_trans_sync, gfc_trans_critical): Add/update prototypes. * trans.c (gfc_trans_code): Handle CRITICAL, ERROR STOP, and SYNC statements. * trans.h (gfor_fndecl_error_stop_string) Add variable. * resolve.c (resolve_sync): Add function. (gfc_resolve_blocks): Handle CRITICAL. (resolve_code): Handle CRITICAL, ERROR STOP, (resolve_branch): Add CRITICAL constraint check. and SYNC statements. * st.c (gfc_free_statement): Add new statements. * trans-decl.c (gfor_fndecl_error_stop_string): Global variable. (gfc_build_builtin_function_decls): Initialize it. * match.c (gfc_match_if): Handle ERROR STOP and SYNC. (gfc_match_critical, gfc_match_error_stop, sync_statement, gfc_match_sync_all, gfc_match_sync_images, gfc_match_sync_memory): New functions. (match_exit_cycle): Handle CRITICAL constraint. (gfc_match_stopcode): Handle ERROR STOP. * match.h (gfc_match_critical, gfc_match_error_stop, gfc_match_sync_all, gfc_match_sync_images, gfc_match_sync_memory): Add prototype. * parse.c (decode_statement, gfc_ascii_statement, parse_executable): Handle new statements. (parse_critical_block): New function. * parse.h (gfc_compile_state): Add COMP_CRITICAL. * intrinsic.texi (num_images): Document new function. * simplify.c (gfc_simplify_num_images): Add function. 2010-04-06 Tobias Burnus <burnus@net-b.de> PR fortran/39997 * gfortran.dg/coarray_1.f90: New test. * gfortran.dg/coarray_2.f90: New test. * gfortran.dg/coarray_3.f90: New test. 2010-04-06 Tobias Burnus <burnus@net-b.de> PR fortran/39997 * runtime/stop.c (error_stop_string): New function. * gfortran.map (_gfortran_error_stop_string): Add. From-SVN: r158008
-
Jason Merrill authored
PR c++/43648 * name-lookup.c (constructor_name_p): Allow X::~X even for typedefs. From-SVN: r158007
-
Jason Merrill authored
PR c++/43621 * pt.c (maybe_update_decl_type): Check the return value from push_scope. From-SVN: r158006
-
Iain Sandoe authored
2010-04-06 Iain Sandoe <iains@gcc.gnu.org> * MAINTAINERS (Write After Approval): Add myself. From-SVN: r158005
-
Jan Hubicka authored
PR tree-optimization/42906 * tree-ssa-dce.c (mark_control_dependent_edges_necessary): Add IGNORE_SELF argument; set visited_control_parents for fully processed BBs. (find_obviously_necessary_stmts): Update call of mark_control_dependent_edges_necessary. (propagate_necessity): Likewise; handle PHI edges more curefully. * gcc.dg/tree-ssa/dce-1.c: New testcase. From-SVN: r158004
-
Joseph Myers authored
gcc/po: * gcc.pot: Regenerate. libcpp/po: * cpplib.pot: Regenerate. From-SVN: r158003
-
Joseph Myers authored
From-SVN: r157998
-
Uros Bizjak authored
* config/i386/i386.md: Remove comment about 'e' and 'E' operand modifier. From-SVN: r157994
-
Tobias Burnus authored
2010-04-06 Tobias Burnus <burnus@net-b.de> PR fortran/43178 * trans-array.c (gfc_conv_expr_descriptor): Update gfc_trans_scalar_assign call. (has_default_initializer): New function. (gfc_trans_deferred_array): Nullify less often. * trans-expr.c (gfc_conv_subref_array_arg, gfc_trans_subcomponent_assign): Update call to gfc_trans_scalar_assign. (gfc_trans_scalar_assign): Add parameter and pass it on. (gfc_trans_assignment_1): Optionally, do not dealloc before assignment. * trans-openmp.c (gfc_trans_omp_array_reduction): Update call to gfc_trans_scalar_assign. * trans-decl.c (gfc_get_symbol_decl): Do not always apply initializer to static variables. (gfc_init_default_dt): Add dealloc parameter and pass it on. * trans-stmt.c (forall_make_variable_temp, generate_loop_for_temp_to_lhs, generate_loop_for_rhs_to_temp, gfc_trans_forall_1, gfc_trans_where_assign, gfc_trans_where_3 gfc_trans_allocate): Update gfc_trans_assignment call. * trans.h (gfc_trans_scalar_assign, gfc_init_default_dt, gfc_init_default_dt, gfc_trans_assignment): Add bool dealloc parameter to prototype. 2010-04-06 Tobias Burnus <burnus@net-b.de> PR fortran/43178 * gfortran.dg/alloc_comp_basics_1.f90: Update * scan-tree-dump-times. * gfortran.dg/alloc_comp_constructor_1.f90: Ditto. * gfortran.dg/auto_dealloc_1.f90: Ditto. From-SVN: r157993
-
Richard Guenther authored
2010-04-06 Richard Guenther <rguenther@suse.de> PR tree-optimization/43627 * tree-vrp.c (extract_range_from_unary_expr): Widenings of [1, +INF(OVF)] go to [1, +INF(OVF)] of the wider type, not varying. * gcc.dg/tree-ssa/vrp49.c: New testcase. From-SVN: r157992
-
Jakub Jelinek authored
From-SVN: r157990
-
Jakub Jelinek authored
PR target/43638 * config/i386/i386.c (print_operand): Remove 'e' and 'E' code handling. * gcc.target/i386/pr43638.c: New test. From-SVN: r157987
-
Richard Guenther authored
2010-04-06 Richard Guenther <rguenther@suse.de> PR middle-end/43661 * fold-const.c (fold_comparison): Handle X * 0 CMP 0. * gcc.c-torture/compile/pr43661.c: New testcase. From-SVN: r157984
-
Jakub Jelinek authored
* dwarf2.h (DWARF2_Internal_LineInfo): Add li_max_ops_per_insn field. From-SVN: r157983
-
Jakub Jelinek authored
From-SVN: r157980
-
Jakub Jelinek authored
PR preprocessor/43642 * lex.c (lex_raw_string): Change type of TYPE variable to unsigned char. From-SVN: r157979
-
Matthias Klose authored
2010-04-06 Matthias Klose <doko@ubuntu.com> * acinclude.m4 (GLIBCXX_ENABLE_LIBSTDCXX_TIME): Show test result. * configure: Regenerate. * doc/xml/manual/configure.xml, doc/html/manual/configure.html: Document --enable-libstdcxx-time as the short form for --enable-libstdcxx-time=yes. From-SVN: r157975
-
GCC Administrator authored
From-SVN: r157974
-