Skip to content
Snippets Groups Projects
  1. Apr 03, 2006
    • Sebastian Pop's avatar
      re PR tree-optimization/26992 (Internal Compiler Error in dwarf2out.c:7607 build_polynomial_chrec) · 16a2acea
      Sebastian Pop authored
      	PR bootstrap/26992
      	* tree-scalar-evolution.c (compute_overall_effect_of_inner_loop,
      	chrec_is_positive, set_nb_iterations_in_loop): Use a variable for
      	the type of nb_iter.
      	(instantiate_parameters_1): Convert the operands before calling
      	chrec_fold_minus, chrec_fold_plus, or chrec_fold_multiply.
      	* tree-data-ref.c (can_use_analyze_subscript_affine_affine): Same.
      
      From-SVN: r112635
      16a2acea
    • Paul Thomas's avatar
      re PR testsuite/26981 (g++.old-deja/g++.other/init18.C fails) · e15e9be3
      Paul Thomas authored
      2006-04-03  Paul Thomas  <pault@gcc.gnu.org>
      
      	PR fortran/26981
      	* trans.h : Prototype for gfc_conv_missing_dummy.
      	* trans-expr (gfc_conv_missing_dummy): New function
      	(gfc_conv_function_call): Call it and tidy up some of the code.
      	* trans-intrinsic (gfc_conv_intrinsic_function_args): The same.
      
      	PR fortran/26976
      	* array.c (gfc_array_dimen_size): If available, return shape[dimen].
      	* resolve.c (resolve_function): If available, use the argument shape for the
      	function expression.
      	* iresolve.c (gfc_resolve_transfer): Set shape[0] = size.
      
      2006-04-03  Paul Thomas  <pault@gcc.gnu.org>
      
      	PR fortran/26981
      	* gfortran.dg/missing_optional_dummy_1.f90: New test.
      
      	PR fortran/26976
      	* gfortran.dg/compliant_elemental_intrinsics_1.f90: New test.
      	* gfortran.dg/initialization_1.f90: Make assignment compliant.
      	* gfortran.dg/transfer_array_intrinsic_1.f90: Simplify.
      	* gfortran.dg/transfer_array_intrinsic_2.f90: Make assignments compliant and detect
      	bigendian-ness.
      
      From-SVN: r112634
      e15e9be3
    • Roger Sayle's avatar
      builtins.c (dummy_object): Use build_int_cst instead of convert. · b6f65e3c
      Roger Sayle authored
      	* builtins.c (dummy_object): Use build_int_cst instead of convert.
      	* tree-ssa-ccp.c (maybe_fold_stmt_addition): Use fold_convert
      	instead of convert.
      	* dojump.c (do_jump): Likewise.
      	* expr.h (ADD_PARM_SIZE, SUB_PARM_SIZE, ARGS_SIZE_TREE): Likewise.
      	* gimplify.c (gimple_boolify, gimplify_init_constructor,
      	gimplify_boolean_expr): Likewise.
      	* emit-rtl.c (set_mem_attributes_minus_bitpos): Likewise.
      	* varasm.c (array_size_for_constructor): Likewise.
      	* tree-object-size.c (compute_object_offset): Likewise.
      
      From-SVN: r112633
      b6f65e3c
    • GCC Administrator's avatar
      Daily bump. · ce674fb6
      GCC Administrator authored
      From-SVN: r112631
      ce674fb6
  2. Apr 02, 2006
    • Roger Sayle's avatar
      re PR middle-end/26977 (ICE in emit_move_insn) · 9fd20553
      Roger Sayle authored
      	PR middle-end/26977
      	* expr.c (emit_group_store): Check whether simplify_gen_subreg returns
      	NULL_RTX, indicating it couldn't create a valid paradoxical subreg.
      
      From-SVN: r112626
      9fd20553
    • Erik Edelmann's avatar
      trans-array.c (gfc_trans_dealloc_allocated): Take a tree representation of the... · 763ccd45
      Erik Edelmann authored
      trans-array.c (gfc_trans_dealloc_allocated): Take a tree representation of the array to be deallocated as argument instead...
      
      2006-04-02  Erik Edelmann  <eedelman@gcc.gnu.org>
      
              * trans-array.c (gfc_trans_dealloc_allocated): Take a
              tree representation of the array to be deallocated as argument
              instead of its gfc_symbol.
              (gfc_trans_deferred_array): Update call to
              gfc_trans_dealloc_allocated.
              * trans-array.h (gfc_trans_dealloc_allocated): Update prototype.
              * trans-expr.c (gfc_conv_function_call): Update call to
              gfc_trans_dealloc_allocated, get indirect reference to dummy
              arguments.
      
      
      2006-04-02  Erik Edelmann  <eedelman@gcc.gnu.org>
      
              * gfortran.dg/allocatable_dummy_1.f90: Also check that allocatable
              dummy arguments work when the actual argument is itself a dummy
              argument of the caller.
      
      From-SVN: r112625
      763ccd45
    • Sebastian Pop's avatar
      re PR tree-optimization/26939 (loop number of iterations analysis not working) · ace23abf
      Sebastian Pop authored
      	PR tree-optimization/26939
      	* tree-chrec.c (chrec_merge): Use eq_evolutions_p.
      
      From-SVN: r112623
      ace23abf
    • Sebastian Pop's avatar
      tree-scalar-evolution.c (add_to_evolution_1): Pass an extra argument at_stmt. · e2157b49
      Sebastian Pop authored
      	* tree-scalar-evolution.c (add_to_evolution_1): Pass an extra argument
      	at_stmt.  Convert the type of operands before calling 
      	build_polynomial_chrec.
      	(add_to_evolution): Pass an extra argument at_stmt.  Adjust the call to
      	add_to_evolution_1.
      	(follow_ssa_edge_in_rhs): Adjust call to add_to_evolution.
      	(instantiate_parameters_1): Convert the type of operands before calling 
      	build_polynomial_chrec.
      	* tree-chrec.c (chrec_fold_poly_cst, chrec_fold_plus_poly_poly,
      	chrec_fold_multiply_poly_poly, chrec_replace_initial_condition,
      	reset_evolution_in_loop): Insert asserts to check the types of the
      	operands.
      	(chrec_type): Moved...
      	(eq_evolutions_p): Use operand_equal_p.
      	* tree-chrec.h (build_polynomial_chrec): Insert an assert to check
      	the types of the operands.
      	(chrec_type): ...here.
      	* tree-data-ref.c (create_data_ref): Convert the operands before
      	calling chrec_replace_initial_condition.
      	(same_access_functions, analyze_subscript_affine_affine,
      	analyze_miv_subscript, all_chrecs_equal_p): Use eq_evolutions_p.
      	(compute_subscript_distance, analyze_ziv_subscript,
      	analyze_siv_subscript_cst_affine, compute_overlap_steps_for_affine_1_2,
      	analyze_miv_subscript): Convert the operands before calling
      	chrec_fold_minus or chrec_fold_plus.
      
      From-SVN: r112621
      e2157b49
    • Sebastian Pop's avatar
      tree-data-ref.c (compute_all_dependences): Use a pointer to the dependence_relations vector. · a84481aa
      Sebastian Pop authored
      	* tree-data-ref.c (compute_all_dependences): Use a pointer to
      	the dependence_relations vector.
      	(compute_data_dependences_for_loop): Adjust call to
      	compute_all_dependences.
      
      From-SVN: r112620
      a84481aa
    • Roger Sayle's avatar
      gimplify.c (gimplify_scan_omp_clauses): Call gimple_boolify on the condition... · d568d1a8
      Roger Sayle authored
      gimplify.c (gimplify_scan_omp_clauses): Call gimple_boolify on the condition before calling gimplify_expr.
      
      
      	* gimplify.c (gimplify_scan_omp_clauses) <OMP_CLAUSE_IF>: Call
      	gimple_boolify on the condition before calling gimplify_expr.
      
      
      Co-Authored-By: default avatarRichard Henderson <rth@redhat.com>
      
      From-SVN: r112619
      d568d1a8
    • GCC Administrator's avatar
      Daily bump. · 86e689a9
      GCC Administrator authored
      From-SVN: r112617
      86e689a9
  3. Apr 01, 2006
    • Eric Botcazou's avatar
      re PR libfortran/24685 (real(16) formatted input is broken for huge values... · 3e63ffb5
      Eric Botcazou authored
      re PR libfortran/24685 (real(16) formatted input is broken for huge values (gfortran.dg/default_format_2.f90))
      
      	PR libfortran/24685
      	* gfortran.dg/large_real_kind_form_io_2.f90: XFAIL on SPARC/Solaris.
      
      From-SVN: r112611
      3e63ffb5
    • Francois-Xavier Coudert's avatar
      fpu-387.h: Use previously added SSE code in all cases, as it really is the right thing to do. · 24726083
      Francois-Xavier Coudert authored
      	* config/fpu-387.h: Use previously added SSE code in all
      	cases, as it really is the right thing to do.
      
      From-SVN: r112610
      24726083
    • Roger Sayle's avatar
      re PR fortran/25270 (testcases fail with a type mismatch) · 37da9343
      Roger Sayle authored
      	PR fortran/25270
      	* trans-array.c (gfc_trans_allocate_array_storage): In array index
      	calculations use gfc_index_zero_node and gfc_index_one_node instead
      	of integer_zero_node and integer_one_node respectively.
      	(gfc_conv_array_transpose): Likewise.
      	(gfc_conv_ss_startstride): Likewise.
      	(gfc_trans_dummy_array_bias): Likewise.
      
      From-SVN: r112608
      37da9343
    • Roger Sayle's avatar
      dependency.c (gfc_is_inside_range): Delete. · 9ccab91c
      Roger Sayle authored
      	* dependency.c (gfc_is_inside_range): Delete.
      	(gfc_check_element_vs_section): Significant rewrite.
      
      	* gfortran.dg/dependencency_17.f90: New test case.
      
      From-SVN: r112607
      9ccab91c
    • Roger Sayle's avatar
      dependency.c (gfc_dep_compare_expr): Strip parentheses and unary plus... · d765523a
      Roger Sayle authored
      dependency.c (gfc_dep_compare_expr): Strip parentheses and unary plus operators when comparing expressions.
      
      
      	* dependency.c (gfc_dep_compare_expr): Strip parentheses and unary
      	plus operators when comparing expressions.  Handle comparisons of
      	the form "X+C vs. X", "X vs. X+C", "X-C vs. X" and "X vs. X-C" where
      	C is an integer constant.  Handle comparisons of the form "P+Q vs.
      	R+S" and "P-Q vs. R-S".  Handle comparisons of integral extensions
      	specially (increasing functions) so extend(A) > extend(B), when A>B.
      	(gfc_check_element_vs_element): Move test later, so that we ignore
      	the fact that "A < B" or "A > B" when A or B contains a forall index.
      
      	* gfortran.dg/dependency_14.f90: New test case.
      	* gfortran.dg/dependency_15.f90: Likewise.
      	* gfortran.dg/dependency_16.f90: Likewise.
      
      From-SVN: r112605
      d765523a
    • Bob Wilson's avatar
      lib1funcs.asm: Rename abi_entry/abi_return macros to leaf_entry/leaf_return. · b7974b3a
      Bob Wilson authored
      	* config/xtensa/lib1funcs.asm: Rename abi_entry/abi_return macros
      	to leaf_entry/leaf_return.  Change leaf_entry to add 16 bytes to
      	the frame size.  Update to use the new macros.
      	* config/xtensa/ieee754-sf.S: Use new leaf_entry/leaf_return macros.
      	* config/xtensa/ieee754-df.S: Likewise.
      
      From-SVN: r112604
      b7974b3a
    • Richard Henderson's avatar
      tree-cfg.c (make_ctrl_stmt_edges, [...]): Merge into... · 56e84019
      Richard Henderson authored
              * tree-cfg.c (make_ctrl_stmt_edges, make_exit_edges): Merge into...
              (make_edges): ... here.  Control fallthru creation with a local
              variable.  Do not play with fake edges.
              (make_omp_sections_edges): Don't set EDGE_ABNORMAL.
              (make_goto_expr_edges): Don't play with fake edges.  Make for_call
              a boolean.
      
      From-SVN: r112603
      56e84019
    • Joseph Myers's avatar
      dwarf2.h (DW64_CIE_ID): Define. · 0c33762a
      Joseph Myers authored
      	* dwarf2.h (DW64_CIE_ID): Define.
      	* dwarf2out.c (DWARF_CIE_ID): Define.
      	(output_call_frame_info): Output 0xffffffff before standard 8-byte
      	length header.  Use DWARF_CIE_ID.
      	(value_format): Use DW_FORM_data4 or DW_FORM_data8 for
      	dw_val_class_loc_list depending on DWARF_OFFSET_SIZE.
      
      From-SVN: r112601
      0c33762a
    • GCC Administrator's avatar
      Daily bump. · 771cdc94
      GCC Administrator authored
      From-SVN: r112599
      771cdc94
    • Asher Langton's avatar
      re PR fortran/25358 (vector assignment to assumed-size Cray Pointee error) · f0d0757e
      Asher Langton authored
      2006-03-31  Asher Langton  <langton2@llnl.gov>
      
              PR fortran/25358
              *expr.c (gfc_check_assign): Allow cray pointee to be assumes-size.
      
      
      2006-03-31  Asher Langton  <langton2@llnl.gov>
      
              PR fortran/25358
              gfortran.dg/cray_pointers_6.f90: New test.
      
      From-SVN: r112594
      f0d0757e
  4. Mar 31, 2006
    • Kaz Kojima's avatar
      linux-atomic.asm: New file. · b890ea50
      Kaz Kojima authored
      	* config/sh/linux-atomic.asm: New file.
      	* config/sh/t-linux (LIB2FUNCS_EXTRA): Add linux-atomic.asm.
      
      From-SVN: r112593
      b890ea50
    • Mark Mitchell's avatar
      pex-win32.c (<errno.h>): Include. · bd9e7c5c
      Mark Mitchell authored
      	* pex-win32.c (<errno.h>): Include.
      	(fix_argv): Remove.
      	(argv_to_cmdline): New function.
      	(std_suffixes): New variable.
      	(no_suffixes): Likewise.
      	(find_executable): New function.
      	(win32_spawn): Likewise.
      	(spawn_script): Use win32_spawn instead of _spawnv[p].
      	(pex_win32_exec_child): Replace MSVCRT calls with Win32 API calls.
      	(pex_win32_wait): Likewise.
      
      From-SVN: r112592
      bd9e7c5c
    • DJ Delorie's avatar
      cond.md: Set condition flags properly throughout. · 16659fcf
      DJ Delorie authored
      * config/m32c/cond.md: Set condition flags properly throughout.
      * config/m32c/minmax.md: Likewise.
      * config/m32c/prologue.md: Likewise.
      * config/m32c/bitops.md: Likewise.
      * config/m32c/muldiv.md: Likewise.
      * config/m32c/mov.md: Likewise.
      * config/m32c/addsub.md: Likewise.
      * config/m32c/m32c.md: Likewise.
      * config/m32c/jump.md: Likewise.
      * config/m32c/shift.md: Likewise.
      
      * config/m32c/cond.md (cmp<mode>): Call m32c_output_compare to
      conditionally output the pattern for this.
      * config/m32c/m32c.c (flags_needed_for_conditional): New.
      (m32c_compare_redundant): New.
      (m32c_output_compare): New.
      * config/m32c/m32c-protos.h (m32c_output_compare): New.
      
      * config/m32c/m32c.c (m32c_prepare_shift): Fix logic to clobber
      dest, not src.  Allow other 4-byte modes.
      
      From-SVN: r112591
      16659fcf
    • Andreas Tobler's avatar
      posix.cc (_Jv_platform_nanotime): Declare id with clockid_t. · 6b04402b
      Andreas Tobler authored
      2006-03-31  Andreas Tobler  <a.tobler@schweiz.ch>
      
      	* posix.cc (_Jv_platform_nanotime): Declare id with clockid_t.
      
      From-SVN: r112587
      6b04402b
    • Joseph Myers's avatar
      * sv.po: Update. · f5550788
      Joseph Myers authored
      From-SVN: r112580
      f5550788
    • Joseph Myers's avatar
      * sv.po: Update. · d2f8b960
      Joseph Myers authored
      From-SVN: r112579
      d2f8b960
    • Denis Chertykov's avatar
      md.texi: Refer to avr/constraints.md instead of avr/avr.h. · fc262682
      Denis Chertykov authored
      	* doc/md.texi: Refer to avr/constraints.md instead of
      	avr/avr.h.
      
      From-SVN: r112576
      fc262682
    • Andrew Haley's avatar
      re PR libgcj/26858 (NullPointerException not generated for large classes...) · e6b7893e
      Andrew Haley authored
      2006-03-30  Andrew Haley  <aph@redhat.com>
      
              PR java/26858
              * lang.c (java_attribute_table): New.
              (LANG_HOOKS_ATTRIBUTE_TABLE): Define.
              * expr.c (build_field_ref): Add a null pointer check for all
              fields of offset > 4k.  Don't do so for accesses via the this
              pointer, which we know can never be null.
              * class.c (build_java_method_type): Mark arg 1 of all nonstatic
              methods nonnull.
      
      From-SVN: r112574
      e6b7893e
    • Jerry DeLisle's avatar
      re PR libfortran/26890 (SIZE parameter interacts with same variable in IO list... · 9ef47dec
      Jerry DeLisle authored
      re PR libfortran/26890 (SIZE parameter interacts with same variable in IO list character length specification.)
      
      2006-03-30  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
      
      	PR libgfortran/26890
      	* gfortran.dg/read_size_noadvance.f90: New test.
      
      From-SVN: r112571
      9ef47dec
    • Jerry DeLisle's avatar
      re PR libfortran/26890 (SIZE parameter interacts with same variable in IO list... · d57d3424
      Jerry DeLisle authored
      re PR libfortran/26890 (SIZE parameter interacts with same variable in IO list character length specification.)
      
      2006-03-30  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
      
      	PR libgfortran/26890
      	* io/io.h: Add size_used to st_parameter_dt, adjust pad size.
      	*io/transfer.c (data_transfer_init): Initialize size_used to zero.
      	(read_sf): Use size_used.
      	(read_block): Likewise.
      	(read_block_direct): Likewise.
      	(write_block): Likewise.
      	(write_buf): Likewise and eliminate erroneous FAILURE return.
      	(finalize_transfer): Assign value of size_used to *dtp->size.
      
      From-SVN: r112570
      d57d3424
    • Roger Sayle's avatar
      expr.c (emit_group_store): Make bytepos a HOST_WIDE_INT to signed vs. · 5650dfbd
      Roger Sayle authored
      	* expr.c (emit_group_store): Make bytepos a HOST_WIDE_INT to
      	signed vs. unsigned comparison failures on some hosts.
      
      From-SVN: r112567
      5650dfbd
    • Ben Elliston's avatar
      Typo fix. · 738caefc
      Ben Elliston authored
      From-SVN: r112564
      738caefc
    • Mark Mitchell's avatar
      Add missing entry · 9d11d99e
      Mark Mitchell authored
      From-SVN: r112563
      9d11d99e
    • Alan Modra's avatar
      re PR target/26459 (gcc fails to build on powerpc e500-double targets) · ca0e79d9
      Alan Modra authored
      	PR target/26459
      	* config/rs6000/rs6000.h (CANNOT_CHANGE_MODE_CLASS): Limit 2003-12-08
      	change to FLOAT_REGS.
      
      From-SVN: r112561
      ca0e79d9
    • Paul Thomas's avatar
      re PR fortran/21130 (38822 lines of Fortran 90 takes more than 10 minutes to... · 26436493
      Paul Thomas authored
      re PR fortran/21130 (38822 lines of Fortran 90 takes more than 10 minutes to compile on a dual 3GHz P4 Linux box with lots of RAM)
      
      2006-03-30  Paul Thomas <paulthomas2@wanadoo.fr>
                  Bud Davis  <bdavis9659@sbcglobal.net>
      
              PR 21130
              * module.c (load_needed): Traverse entire tree before returning.
      
      
      
      Co-Authored-By: default avatarBud Davis <bdavis9659@sbcglobal.net>
      
      From-SVN: r112558
      26436493
    • Alan Modra's avatar
      rs6000.c (rs6000_explicit_options): Add ieee. · d3603e8c
      Alan Modra authored
      	* config/rs6000/rs6000.c (rs6000_explicit_options): Add ieee.
      	(rs6000_override_options): Use it.
      	(rs6000_handle_option): Set it.  Set rs6000_explicit_options.abi
      	only for -mabi=spe/no-spe and -mabi=altivec.
      
      From-SVN: r112555
      d3603e8c
    • GCC Administrator's avatar
      Daily bump. · 82107c9b
      GCC Administrator authored
      From-SVN: r112553
      82107c9b
  5. Mar 30, 2006
Loading