Skip to content
Snippets Groups Projects
  1. Oct 20, 2003
    • Zack Weinberg's avatar
      i386.c (print_reg): Abort if REGNO (x) is a virtual register, but only if file == asm_out_file. · 480feac0
      Zack Weinberg authored
      	* config/i386/i386.c (print_reg): Abort if REGNO (x) is a
      	virtual register, but only if file == asm_out_file.
      	* config/i386/i386.h (HI_REGISTER_NAMES): Use "argp", not "",
      	for ARG_POINTER_REGNUM.
      
      From-SVN: r72712
      480feac0
    • Zack Weinberg's avatar
      c-common.c (registered_builtin_types): New static. · d1d3865f
      Zack Weinberg authored
      	* c-common.c (registered_builtin_types): New static.
      	(c_common_type_for_mode): Consult registered_builtin_types.
      	(c_register_builtin_type): Add type to registered_builtin_types.
      	* optabs.c (init_floating_libfuncs): Initialize libfuncs for
      	all MODE_FLOAT modes, not just the ones corresponding to
      	float_type_node, double_type_node, and long_double_type_node.
      
      From-SVN: r72711
      d1d3865f
    • Phil Edwards's avatar
      configure.ac: Fix comment typo. · 65fc9769
      Phil Edwards authored
      2003-10-20  Phil Edwards  <phil@codesourcery.com>
      
      	* configure.ac:  Fix comment typo.
      	* configure.host:  Add vxworks to host_os switch.
      	* crossconfig.m4:  Remove old commented os_include_dir variables
      	left over from autotools transition.
      	(*-vxworks):  New stanza.
      	(*-windiss):  Add missing symbols.
      	* configure:  Regenerate.
      	* config/os/vxworks/ctype_base.h, config/os/vxworks/ctype_inline.h,
      	config/os/vxworks/ctype_noninline.h, config/os/vxworks/os_defines.h:
      	New files.
      	* config/os/windiss/os_defines.h:  Define __C9X__.
      
      From-SVN: r72710
      65fc9769
    • Mark Mitchell's avatar
      config.gcc: Add support for arm926ejs, arm1026ejs, arm1136js, arm1136jfs, and armv6j. · 68f98568
      Mark Mitchell authored
      	* config.gcc: Add support for arm926ejs, arm1026ejs, arm1136js,
      	arm1136jfs, and armv6j.
      	* config/arm/arm.c (FL_ARCH6J): New macro.
      	(FL_VFPV2): Likewise.
      	(all_cores): Add entries for arm926ejs, arm1026ejs, arm1136js,
      	and arm1136jfs.
      	(all_architectures): Add entry for armv6j.
      	(arm_override_options): Add entries for arm926ejs, arm1026ejs,
      	arm1136js, and arm1136jfs.
      	* config/arm/arm.h (TARGET_CPU_arm926ej_s): New macro.
      	(TARGET_CPU_arm1026ej_s): Likewise.
      	(TARGET_CPU_arm1136j_s): Likewise.
      	(TARGET_CPU_arm1136jf_s): Likewise.
      	* doc/invoke.texi: Document new ARM cores and architecture
      	variants.
      
      From-SVN: r72709
      68f98568
    • Richard Henderson's avatar
      alpha.h (PREDICATE_CODES): Add normal_memory_operand. · df2ddbb3
      Richard Henderson authored
              * config/alpha/alpha.h (PREDICATE_CODES): Add normal_memory_operand.
              * config/alpha/alpha-protos.h: Remove PREDICATE_CODES prototypes.
      
      From-SVN: r72708
      df2ddbb3
    • Dorit Naishlos's avatar
      rs6000.h: (rs6000_sched_insert_nops): support new flag -minsert-sched-nops. · cbe26ab8
      Dorit Naishlos authored
              * config/rs6000/rs6000.h: (rs6000_sched_insert_nops):
              support new flag -minsert-sched-nops.
              (DEFAULT_SCHED_FINISH_NOP_INSERTION_SCHEME): Define.
              * config/rs6000/rs6000.c: (rs6000_sched_insert_nops):
              support new flag -minsert-sched-nops.
              (is_cracked_insn, is_microcoded_insn): New functions.
              (rs6000_sched_finish): New function.
              (rs6000_issue_rate): Return 5 for power4.
              (get_next_active_insn, insn_terminates_group_p): New
              functions.
              (is_costly_group, force_new_group): New functions.
              (redefine_groups, pad_groups): New functions.
              (rs6000_variable_issue): Use new functions.
              * doc/invoke.texi (-minsert-sched-nops): Document new
              option.
      
      From-SVN: r72707
      cbe26ab8
    • Nicolas Pitre's avatar
      * MAINTAINERS: Add myself to 'Write After Approval' section. · 8d36c499
      Nicolas Pitre authored
      From-SVN: r72706
      8d36c499
    • Kriang Lerdsuwanakij's avatar
      PR c++/9781, c++/10583, c++/11862 · 11325dcd
      Kriang Lerdsuwanakij authored
      	PR c++/9781, c++/10583, c++/11862
      	* decl.c (cp_finish_decl): Exit immediately if decl is an
      	error_mark_node.
      	* pt.c (push_template_decl_real): Return error_mark_node for
      	invalid template declaration of variable.
      
      	* g++.dg/parse/crash13.C: New test.
      
      From-SVN: r72701
      11325dcd
    • Zdenek Dvorak's avatar
      * gcc.dg/old-style-asm-1.c: Count jump_insns instead of labels. · adccacc4
      Zdenek Dvorak authored
      From-SVN: r72698
      adccacc4
    • David S. Miller's avatar
      sparc.md (type attribute): Add new insn types fpa, fpm_pack, fgm_mul,... · 59823ba4
      David S. Miller authored
      sparc.md (type attribute): Add new insn types fpa, fpm_pack, fgm_mul, fgm_pdist, and fgm_cmp for VIS.
      
      	* config/sparc/sparc.md (type attribute): Add new insn types
      	fpa, fpm_pack, fgm_mul, fgm_pdist, and fgm_cmp for VIS.
      	(patterns emitting VIS insns): Use them.
      	* config/sparc/ultra1_2.md: Add VIS scheduling rules.
      	* config/sparc/ultra3.md: Likewise.
      
      From-SVN: r72697
      59823ba4
    • Falk Hueffner's avatar
      re PR target/12654 (Incorrect comparison code generated for Alpha) · e006ced2
      Falk Hueffner authored
      	PR target/12654
      	* config/alpha/alpha.c (alpha_emit_conditional_branch): Don't do
      	comparison against constant by adjusting the argument except for
      	EQ and NE.
      
      From-SVN: r72696
      e006ced2
    • Arnaud Charlet's avatar
      * MAINTAINERS (Various maintainers: Ada front end): Added myself. · 8b7ebc31
      Arnaud Charlet authored
      From-SVN: r72695
      8b7ebc31
    • Mark Mitchell's avatar
      config.gcc: Add support for arm926ejs, arm1026ejs, arm1136js, arm1136jfs, and armv6j. · 81f9037c
      Mark Mitchell authored
      	* config.gcc: Add support for arm926ejs, arm1026ejs, arm1136js,
      	arm1136jfs, and armv6j.
      	* config/arm/arm.c (FL_ARCH6J): New macro.
      	(FL_VFPV2): Likewise.
      	(all_cores): Add entries for arm926ejs, arm1026ejs, arm1136js,
      	and arm1136jfs.
      	(all_architectures): Add entry for armv6j.
      	(arm_override_options): Add entries for arm926ejs, arm1026ejs,
      	arm1136js, and arm1136jfs.
      	* config/arm/arm.h (TARGET_CPU_arm926ej_s): New macro.
      	(TARGET_CPU_arm1026ej_s): Likewise.
      	(TARGET_CPU_arm1136j_s): Likewise.
      	(TARGET_CPU_arm1136jf_s): Likewise.
      	* doc/invoke.texi: Document new ARM cores and architecture
      	variants.
      
      From-SVN: r72694
      81f9037c
    • Eric Botcazou's avatar
      builtins-18.c: Wrap C99 tests with HAVE_C99_RUNTIME. · 5a13d728
      Eric Botcazou authored
      	* gcc.dg/builtins-18.c: Wrap C99 tests with HAVE_C99_RUNTIME.
      	Define HAVE_C99_RUNTIME except on Solaris.
      	* gcc.dg/builtins-20.c: Likewise.
      
      From-SVN: r72693
      5a13d728
    • Andreas Tobler's avatar
      ffi_darwin.c (ffi_prep_args): Declare bytes again. · 0df6970d
      Andreas Tobler authored
      2003-10-19  Andreas Tobler  <a.tobler@schweiz.ch>
      
              * src/powerpc/ffi_darwin.c (ffi_prep_args): Declare bytes again.
              Used when FFI_DEBUG = 1.
      
      From-SVN: r72691
      0df6970d
    • GCC Administrator's avatar
      Daily bump. · 31762a1c
      GCC Administrator authored
      From-SVN: r72689
      31762a1c
  2. Oct 19, 2003
    • Joseph Myers's avatar
      * MAINTAINERS: Update my email address. · afe1910c
      Joseph Myers authored
      From-SVN: r72687
      afe1910c
    • Zdenek Dvorak's avatar
      Makefile.in (toplev.o): Add value-prof.h dependency. · fca9dc00
      Zdenek Dvorak authored
      	* Makefile.in (toplev.o): Add value-prof.h dependency.
      	(value-prof.o): Add REGS_H dependency.
      	* common.opt (fprofile-values, fvpt): New.
      	* flags.h (flag_value_profile_transformations): Declare.
      	* opts.c (common_handle_option): Handle -fprofile_values and
      	-fvpt.
      	* profile.c (branch_prob): Don't remove death notes here.
      	* timevar.def (TV_VPT): New.
      	* value-prof.c: Include regs.h.
      	(insn_divmod_values_to_profile, gen_divmod_fixed_value, gen_mod_pow2,
      	gen_mod_subtract, divmod_fixed_value_transform,mod_pow2_value_transform,
      	mod_subtract_transform, value_profile_transformations): New.
      	(insn_values_to_profile): Call insn_divmod_values_to_profile.
      	(find_values_to_profile): Add dumps.
      	* value-prof.h (value_profile_transformations): Declare.
      	* toplev.c: Include value-prof.h.
      	(rest_of_handle_value_profile_transformations): New.
      	(enum dump_file_index): Add DFI_vpt.
      	(dump_file): Add vpt dump.
      	(flag_value_profile_transformations): New.
      	(lang_independent_options): Add flag_profile_values and
      	flag_value_profile_transformations.
      	(rest_of_compilation): Call
      	rest_of_handle_value_profile_transformations.
      	(process_options): Let -fvpt imply -fprofile-values.
      	* doc/invoke.texi (-fvpt): Document.
      
      From-SVN: r72685
      fca9dc00
    • David Edelsohn's avatar
      re PR libstdc++/12506 (build failure of libstdc++ due to Makefile error) · 47395a24
      David Edelsohn authored
              PR other/12506
              * configure.host (aix4,aix*): Define os_include_dir to os/generic.
      
      From-SVN: r72684
      47395a24
    • Zdenek Dvorak's avatar
      * gcc.dg/old-style-asm-1.c: Use scan-assembler-times. · 29ee7b16
      Zdenek Dvorak authored
      From-SVN: r72682
      29ee7b16
    • Jan Hubicka's avatar
      re PR rtl-optimization/12612 (ICE when using log function with -O3 -ffast-math) · cb0bc263
      Jan Hubicka authored
      	* i386.c (print_reg): Do not abort on certain registers.
      
      	PR optimization/12612
      	* reg-stack.c (subst_stack_regs_pat):  Use st(1) for clobbers.
      	* i386.md (fpatan, fyl2x, fscale patterns and expanders): Use
      	match_scratch; avoid bogus paralles.
      
      	PR target/12674
      	* i386.c (ix86_function_regparm): Disable implicit register passing
      	conventions when profiling.
      
      From-SVN: r72681
      cb0bc263
    • Eric Botcazou's avatar
      re PR rtl-optimization/8178 (__builtin_ffs broken with -march=k6) · 707e58b1
      Eric Botcazou authored
      
      	PR optimization/8178
      	* config/i386/i386.md (*movsi_zero): Delete.
      	(*ffs_no_cmove): Use ix86_expand_clear to zero the third operand.
      
      Co-Authored-By: default avatarRichard Henderson <rth@redhat.com>
      
      From-SVN: r72680
      707e58b1
    • Andreas Tobler's avatar
      locale.cc (locale::_S_initialize): Re-apply workaround a confusion of the use... · 8f4c7b67
      Andreas Tobler authored
      locale.cc (locale::_S_initialize): Re-apply workaround a confusion of the use of the gthr API when...
      
      
      2003-10-18  Andreas Tobler  <a.tobler@schweiz.ch>
      
      	* src/locale.cc (locale::_S_initialize): Re-apply workaround a
      	confusion of the use of the gthr API when __gthread_active_p()
      	returns true.
      
      From-SVN: r72679
      8f4c7b67
    • Richard Sandiford's avatar
      Fix typo. · f74c81d5
      Richard Sandiford authored
      From-SVN: r72678
      f74c81d5
    • Richard Henderson's avatar
      alpha.c (fix_operator): New. · 64bb2e1d
      Richard Henderson authored
              * config/alpha/alpha.c (fix_operator): New.
              (divmod_operator): Tidy.
              (alpha_emit_xfloating_cvt): Handle UNSIGNED_FIX.
              * config/alpha/alpha.h (FIXUNS_TRUNC_LIKE_FIX_TRUNC): Remove.
              (PREDICATE_CODES): Update.
              * config/alpha/alpha.md (fix_truncdfsi_ieee): Use match_operator.
              (fix_truncdfsi_internal, fix_truncdfdi_ieee): Likewise.
              (fix_truncsfsi_ieee, fix_truncsfsi_internal): Likewise.
              (fix_truncsfdi_ieee): Likewise.
              (fix_truncdfdi2, fix_truncsfdi2): Turn into define_expand.
              (fixuns_truncdfdi2, fixuns_truncsfdi2, fixuns_trunctfdi2): New.
              * config/alpha/alpha-protos.h: Update.
      
      From-SVN: r72677
      64bb2e1d
    • Richard Sandiford's avatar
      mips.h (INITIALIZE_TRAMPOLINE): Simplify. · 91999e1d
      Richard Sandiford authored
      	* config/mips/mips.h (INITIALIZE_TRAMPOLINE): Simplify.
      	* config/mips/mips.c (mips_load_got): Assume Pmode == ptr_mode.
      	* config/mips/mips.md (extendsidi2, *extendsidi2): Merge. Don't accept
      	contant operands.
      
      From-SVN: r72671
      91999e1d
    • Kazu Hirata's avatar
      extend.texi: Fix typos. · 9c2d4260
      Kazu Hirata authored
      	* doc/extend.texi: Fix typos.
      	* doc/invoke.texi: Likewise.
      
      From-SVN: r72668
      9c2d4260
    • Nicolas Pitre's avatar
      arm.c (arm_override_options): Use arm_tune_xscale for XScale optimizations not arm_arch_xscale. · 591af218
      Nicolas Pitre authored
      * config/arm/arm.c (arm_override_options): Use arm_tune_xscale for
      XScale optimizations not arm_arch_xscale.
      * config/arm/arm.h (CONSTANT_ALIGNMENT_FACTOR, MOVE_RATIO): Likewise.
      
      From-SVN: r72667
      591af218
    • GCC Administrator's avatar
      Daily bump. · 72f1978f
      GCC Administrator authored
      [[Split portion of a mixed commit.]]
      
      From-SVN: r72665.2
      72f1978f
    • GCC Administrator's avatar
      Daily bump. · 2f81172d
      GCC Administrator authored
      [[Split portion of a mixed commit.]]
      
      From-SVN: r72664.2
      2f81172d
  3. Oct 18, 2003
    • Ulrich Weigand's avatar
      s390-protos.h (shift_count_operand): Add prototype. · ac32b25e
      Ulrich Weigand authored
      	* config/s390/s390-protos.h (shift_count_operand): Add prototype.
      	* config/s390/s390.c (shift_count_operand): New function.
      	(s390_extra_constraint): Use it to implement 'Y' constraint.
      	(print_shift_count_operand): New function.
      	(print_operand): Use it to implement '%Y'.
      	* config/s390/s390.h (EXTRA_ADDRESS_CONSTRAINT): Add 'Y' constraint.
      	(PREDICATE_CODES): Add shift_count_operand.
      	* config/s390/s390.md ("rotldi3"): Merge alternatives,
      	using "shift_count_operand" predicate and "Y" constraint,
      	and "%Y" to output the combined shift count.
      	("rotlsi3"): Likewise.
      	("ashldi3", "*ashldi3_31", "*ashldi3_64"): Likewise.
      	("ashrdi3", "*ashrdi3_31", "*ashrdi3_64", "*ashrdi3_cc_31",
      	"*ashrdi3_cc_64", "*ashrdi3_cconly_31", "*ashrdi3_cconly_64"): Likewise.
      	("ashlsi3", "ashrsi3", "*ashrsi3_cc", "*ashrsi3_cconly"): Likewise.
      	("lshrdi3", "*lshrdi3_31", "*lshrdi3_64"): Likewise.
      	("lshrsi3"): Likewise.
      
      From-SVN: r72661
      ac32b25e
    • Gunther Nikl's avatar
      m68k.c (m68k_output_function_epilogue): Add missing argument to asm_fprintf statement. · 3f12a2e0
      Gunther Nikl authored
      	* config/m68k/m68k.c (m68k_output_function_epilogue): Add missing
      	argument to asm_fprintf statement.
      
      From-SVN: r72656
      3f12a2e0
    • Jan Hubicka's avatar
      * integrate.c (copy_decl_for_inlining): Revert previous patch. · 99ceae26
      Jan Hubicka authored
      From-SVN: r72653
      99ceae26
    • Fariborz Jahanian's avatar
      Separate TARGET_POWERPC64 patterns for TARGET_64BIT or TARGET_32BIT. · 6074164e
      Fariborz Jahanian authored
      Approved by David Edehlson.
      
      From-SVN: r72651
      6074164e
    • Fariborz Jahanian's avatar
      Separate TARGET_POWERPC64 patterns for TARGET_64BIT or TARGET_32BIT. · 683bdff7
      Fariborz Jahanian authored
      Approved by David Edelsohn.
      
      From-SVN: r72650
      683bdff7
    • Alexandre Oliva's avatar
      final.c (final_scan_insn): Run FINAL_PRESCAN_INSNS on asm insns as well. · ad7e39ca
      Alexandre Oliva authored
      * final.c (final_scan_insn): Run FINAL_PRESCAN_INSNS on asm insns
      as well.
      
      From-SVN: r72649
      ad7e39ca
    • Richard Sandiford's avatar
      rtl.h (rtl_size): Declare. · e1de1560
      Richard Sandiford authored
      	* rtl.h (rtl_size): Declare.
      	(rtunion): Remove rtwint.
      	(rtx_def): Replace 'fld' with a union of an rtunion or a HOST_WIDE_INT.
      	(RTX_HDR_SIZE, RTX_SIZE): New macros.
      	(RTL_CHECK1): Adjust for new rtx_def layout.
      	(RTL_CHECK2, RTL_CHECKC1, RTL_CHECKC2): Likewise.
      	(XWINT, XCWINT): Likewise.  Access the rtx structure directly.
      	(X0WINT): Remove.
      	(X0ANY): New macro.
      	* rtl.def: Adjust comments for new rtx_def layout.
      	* ggc.h (ggc_alloc_rtx): Take the rtx code as argument, not the
      	number of slots.
      	* rtl.c (rtx_size): New array.
      	(rtx_alloc): Adjust call to ggc_alloc_rtx.  Use RTX_HDR_SIZE.
      	(copy_rtx): Use RTX_HDR_SIZE.  Adjust for new rtx_def layout.
      	(shallow_copy_rtx): Adjust call to ggc_alloc_rtx.  Use RTX_SIZE.
      	* integrate.c (copy_rtx_and_substitute): Use X0ANY to copy '0' fields.
      	* emit-rtl.c (copy_most_rtx): Likewise.
      	(copy_rtx_if_shared): Use RTX_SIZE.
      	(copy_insn_1): Use RTX_HDR_SIZE.  Adjust for new rtx_def layout.
      	* gengenrtl.c (gendef): Adjust ggc_alloc_rtx call.  Use RTX_HDR_SIZE.
      	* gengtype.c (write_rtx_next): Use RTX_HDR_SIZE.
      	(adjust_field_rtx_def): Expect "rtx_def" to be a union rather than
      	an array.  Adjust output for new rtx_def layout.
      	* ggc-page.c (RTL_SIZE): Use RTX_HDR_SIZE.
      	* reload1.c (eliminate_regs): Use RTX_SIZE.
      	* rtlanal.c (loc_mentioned_in_p): Adjust for new rtx_def layout.
      	* gdbinit.in (pi): Likewise.
      
      From-SVN: r72647
      e1de1560
    • Jan Hubicka's avatar
      * integrate.c (copy_decl_for_inlining): Fix copying of copies. · 8a2b3848
      Jan Hubicka authored
      From-SVN: r72646
      8a2b3848
    • Roger Sayle's avatar
      libgcc.texi: Group multi-word types... · dafee8e3
      Roger Sayle authored
      	* libgcc.texi: Group multi-word types, such as "long double" and
      	"unsigned int", using braces in @deftypefn and @deftypefnx nodes.
      	Document __unord?f2 as returning a non-zero value, not just one.
      
      From-SVN: r72645
      dafee8e3
    • Kriang Lerdsuwanakij's avatar
      re PR c++/12495 (ICE in cp/typeck.c:907) · 5f04800c
      Kriang Lerdsuwanakij authored
      	PR c++/12495
      	* pt.c (lookup_template_class): Handle when current_class_type
      	is a local class.
      
      	* g++.dg/template/crash21.C: New test.
      
      From-SVN: r72643
      5f04800c
Loading