diff --git a/gcc/ChangeLog b/gcc/ChangeLog index 62011292123f394303aeeecad362994016c7250a..3c2059ad6490b4a0249286e4961db48f555e3732 100644 --- a/gcc/ChangeLog +++ b/gcc/ChangeLog @@ -1,3 +1,8 @@ +2006-04-04 Eric Christopher <echristo@apple.com> + + * config/i386/i386.c (machopic_output_stub): Output \t + between instructions and operands. + 2006-04-04 David Edelsohn <edelsohn@gnu.org> * config/rs6000/rs6000.c (num_insns_constant_wide): Change @@ -48,7 +53,7 @@ 2006-04-03 Geoffrey Keating <geoffk@apple.com> - * doc/extend.texi (Function Attributes): Rewrite visibility + * doc/extend.texi (Function Attributes): Rewrite visibility attribute documentation. * doc/invoke.texi (C++ Dialect Options): Rewrite -fvisibility-inlines-hidden documentation to describe something @@ -132,12 +137,12 @@ 2006-04-02 Sebastian Pop <pop@cri.ensmp.fr> * tree-scalar-evolution.c (add_to_evolution_1): Pass an extra argument - at_stmt. Convert the type of operands before calling + 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 + (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, @@ -411,7 +416,7 @@ 2006-03-29 Andreas Krebbel <krebbel1@de.ibm.com> - * config.gcc (s390-*-linux-*, s390x-*-linux*): Add t-dfprules to + * config.gcc (s390-*-linux-*, s390x-*-linux*): Add t-dfprules to tmake_file. * config/s390/s390.c (S390_scalar_mode_supported_p): New function. (NR_C_MODES): Add TDmode, DDmode and SDmode. @@ -419,7 +424,7 @@ (s390_hard_regno_mode_ok): Disallow TDmode in integer regs. (s390_function_arg_float): Allow SDmode and DDmode values to be passed in floating point registers. - (s390_function_arg_integer, s390_function_value): Replace MODE_FLOAT + (s390_function_arg_integer, s390_function_value): Replace MODE_FLOAT check with SCALAR_FLOAT_MODE_P. (TARGET_SCALAR_MODE_SUPPORTED_P): Define target macro. @@ -460,7 +465,7 @@ * fold-const.c (fold_binary) <BIT_XOR_EXPR>: Fold (X & Y) ^ Y as the equivalent ~X & Y, and the symmetry related transformations. - (fold_binary) <BIT_AND_EXPR>: Similarly, fold (X ^ Y) & Y as + (fold_binary) <BIT_AND_EXPR>: Similarly, fold (X ^ Y) & Y as ~X & Y, and symmetry related transforms. 2006-03-28 Maxim Kuvyrkov <mkuvyrkov@ispras.ru> @@ -617,7 +622,7 @@ 2006-03-27 Andreas Krebbel <krebbel1@de.ibm.com> - * config/s390/s390-protos.h (s390_hard_regno_mode_ok, + * config/s390/s390-protos.h (s390_hard_regno_mode_ok, s390_class_max_nregs): New function prototypes. * config/s390/s390.c (REGNO_PAIR_OK): New macro. (s390_hard_regno_mode_ok, s390_class_max_nregs): New functions. @@ -653,7 +658,7 @@ Don't test for lambda_vector_lexico_pos. (same_access_functions, add_multivariate_self_dist, add_other_self_distances, dir_from_dist): New. - (build_classic_dir_vector): Replace implementation almost identical to + (build_classic_dir_vector): Replace implementation almost identical to build_classic_dist_vector with a walk of DDR_DIST_VECTS with a call to dir_from_dist. (subscript_dependence_tester_1): New. @@ -667,7 +672,7 @@ (compute_data_dependences_for_loop): Compute the loop nest, and give up if the nest is not well formed. * tree-data-ref.h (loop_p): New. - (struct data_dependence_relation): Replace size_vect field with + (struct data_dependence_relation): Replace size_vect field with loop_nest, a vec of loops. (DDR_SIZE_VECT): Renamed DDR_NB_LOOPS. (DDR_LOOP_NEST): New. @@ -1380,7 +1385,7 @@ splittable_symbolic_operand. (mips_use_anchors_for_symbol_p): New function. * config/mips/mips.h: Protect externs with !USED_FOR_TARGET. - (mips_split_p): Declare. + (mips_split_p): Declare. 2006-03-16 Richard Sandiford <richard@codesourcery.com> @@ -1686,7 +1691,7 @@ * ddg.c (build_intra_loop_deps): Adjust add_forward_dependence call. * lists.c (unused_deps_list): New variable. - (free_list): Add assertions to verify the proper distinguishing + (free_list): Add assertions to verify the proper distinguishing between INSN_LISTs and DEPS_LISTs. (find_list_elem, remove_list_elem, remove_list_node): New static functions. @@ -1772,7 +1777,7 @@ * config/vax/vax.h (PCC_BITFIELD_TYPE_MATTERS): Likewise. (EXTRA_CONSTRAINT): Likewise. * config/vax/vax.md (four unnamed insns): Likewise. - + 2006-03-15 Paul Brook <paul@codesourcery.com> * config/arm/arm.c (minipool_pad): New. @@ -1988,7 +1993,7 @@ 2006-03-13 Kazu Hirata <kazu@codesourcery.com> * doc/invoke.texi (-fdump-rtl-loop): Remove. - (-dL, -fdump-rtl-loop2): Update the dump file names + (-dL, -fdump-rtl-loop2): Update the dump file names * doc/invoke.texi: Update dump file names. @@ -2034,7 +2039,7 @@ 2006-03-10 Jason Merrill <jason@redhat.com> PR c/26004 - * gimplify.c (gimplify_modify_expr_rhs): Don't do return slot opt if + * gimplify.c (gimplify_modify_expr_rhs): Don't do return slot opt if the target was declared 'register'. 2006-03-10 Adam Nemet <anemet@caviumnetworks.com> @@ -2059,7 +2064,7 @@ * config.gcc (sh*-superh-elf, sh*elf (newlib)): Use newlib.h when building with libgloss. (sh*elf): Implement --without-fp option. - (sh64-superh-linux*): Don't multilib. + (sh64-superh-linux*): Don't multilib. 2006-03-10 J"orn Rennecke <joern.rennecke@st.com> @@ -2104,7 +2109,7 @@ (*branch_zero<mode>): Rename to... (*branch_order<mode>): ...this. Remove mode from comparison operator. Use mips_output_order_conditional_branch. Only accept ordered - comparisons. + comparisons. (*branch_zero<mode>_inverted): Rename to... (*branch_order<mode>_inverted): ...this and update as for *branch_order<mode>. @@ -2447,7 +2452,7 @@ (tree_ssa_forward_propagate_single_use_vars): Return TODO_update_smt_usage if we need to update SMT usage. (pass_forwprop): Remove TODO_update_smt_usage. - + 2006-03-03 Diego Novillo <dnovillo@redhat.com> * tree-ssa-operands.c: Tidy whitespace. Fix spelling. diff --git a/gcc/config/i386/i386.c b/gcc/config/i386/i386.c index 84b19b9dac2b6105f055e348c7357ee98256f8dd..af6ec6764ea7620dd98279b8e634fc2be6396339 100644 --- a/gcc/config/i386/i386.c +++ b/gcc/config/i386/i386.c @@ -17154,24 +17154,24 @@ machopic_output_stub (FILE *file, const char *symb, const char *stub) if (MACHOPIC_PURE) { - fprintf (file, "\tcall LPC$%d\nLPC$%d:\tpopl %%eax\n", label, label); - fprintf (file, "\tmovl %s-LPC$%d(%%eax),%%edx\n", lazy_ptr_name, label); - fprintf (file, "\tjmp *%%edx\n"); + fprintf (file, "\tcall\tLPC$%d\nLPC$%d:\tpopl\t%%eax\n", label, label); + fprintf (file, "\tmovl\t%s-LPC$%d(%%eax),%%edx\n", lazy_ptr_name, label); + fprintf (file, "\tjmp\t*%%edx\n"); } else - fprintf (file, "\tjmp *%s\n", lazy_ptr_name); + fprintf (file, "\tjmp\t*%s\n", lazy_ptr_name); fprintf (file, "%s:\n", binder_name); if (MACHOPIC_PURE) { - fprintf (file, "\tlea %s-LPC$%d(%%eax),%%eax\n", lazy_ptr_name, label); - fprintf (file, "\tpushl %%eax\n"); + fprintf (file, "\tlea\t%s-LPC$%d(%%eax),%%eax\n", lazy_ptr_name, label); + fprintf (file, "\tpushl\t%%eax\n"); } else - fprintf (file, "\t pushl $%s\n", lazy_ptr_name); + fprintf (file, "\tpushl\t$%s\n", lazy_ptr_name); - fprintf (file, "\tjmp dyld_stub_binding_helper\n"); + fprintf (file, "\tjmp\tdyld_stub_binding_helper\n"); switch_to_section (darwin_sections[machopic_lazy_symbol_ptr_section]); fprintf (file, "%s:\n", lazy_ptr_name); diff --git a/gcc/testsuite/ChangeLog b/gcc/testsuite/ChangeLog index 1872b3d7eeabbb1524631f1ae95378e4208eecb6..1c07d3bbb4bdea3cc08f582cb2ea9a2f5a974af1 100644 --- a/gcc/testsuite/ChangeLog +++ b/gcc/testsuite/ChangeLog @@ -1,3 +1,9 @@ +2006-04-04 Eric Christopher <echristo@apple.com> + + * gcc.target/i386/387-1.c: Allow regexp to match darwin + stubs. + * gcc.target/i386/387-5.c: Ditto. + 2006-04-04 Carlos O'Donell <carlos@codesourcery.com> * gcc.target/sparc/struct-ret-check.c: New test. @@ -108,7 +114,7 @@ 2006-03-25 Steven G. Kargl <kargls@comcast.net> - PR fortran/26816 + PR fortran/26816 * gfortran.dg/float_1.f90: New test. 2006-03-25 Steven G. Kargl <kargsl@comcast.net> @@ -364,7 +370,7 @@ PR libgfortran/26509 gfortran.dg/write_direct_eor.f90: New test. - + 2006-03-17 David Edelsohn <edelsohn@gnu.org> * gcc.target/powerpc/pr26350.c: New. @@ -463,14 +469,14 @@ * gfortran.dg/write_back.f: New test. * gfortran.dg/write_rewind_1.f: New test. * gfortran.dg/write_rewind_2.f: New test. - + 2006-03-05 Jerry DeLisle <jvdelisle@gcc.gnu.org> PR libgfortran/26554 * gfortran.dg/read_logical.f90: New test. 2006-03-04 Laurent GUERBY <laurent@guerby.net> - + * ada/acats/norun.lst: cdd2a03 now passes. 2006-03-04 Andrew Pinski <pinskia@physics.uc.edu> @@ -544,7 +550,7 @@ 2006-03-01 Paul Thomas <pault@gcc.gnu.org> - * gfortran.dg/logical_dot_product.f90: New test. + * gfortran.dg/logical_dot_product.f90: New test. PR fortran/26393 * gfortran.dg/used_interface_ref.f90: New test. @@ -632,7 +638,7 @@ 2006-02-26 Dorit Nuzman <dorit@il.ibm.com> PR tree-optimizations/26359 - * gcc.dg/vect/vect.exp: Compile tests prefixed with "dump-tree-dceloop" + * gcc.dg/vect/vect.exp: Compile tests prefixed with "dump-tree-dceloop" with -fdump-tree-dceloop-details. * gcc.dg/vect/dump-tree-dceloop-pr26359.c: New test. @@ -922,7 +928,7 @@ 2006-02-13 Josh Conner <jconner@apple.com> PR target/25376 - * gcc.dg/pr25376.c: New test. + * gcc.dg/pr25376.c: New test. * gcc.c-torture/compile/pr23237.c: Only compile test -- don't assemble. @@ -1086,7 +1092,7 @@ * gcc.dg/tree-ssa/pr21086.c: Likewise * gcc.dg/tree-ssa/pr21959.c: Likewise * gcc.dg/tree-ssa/vrp21.c: Likewise - * gcc.dg/tree-ssa/vrp04.c: Likewise + * gcc.dg/tree-ssa/vrp04.c: Likewise * gcc.dg/tree-ssa/pr25485.c: Likewise * gcc.dg/tree-ssa/pr22026.c: Likewise * gcc.dg/tree-ssa/vrp22.c: Likewise @@ -1192,7 +1198,7 @@ * g++.old-deja/g++.brendan/ptolemy1.C (InterpTableEntry::name): Change type to const char*. * g++.old-deja/g++.brendan/ptolemy2.C (InterpTableEntry::name): - Likewise. + Likewise. * g++.old-deja/g++.jason/default2.C (bar::memberfunction): Change second parameter type to const char*. * g++.old-deja/g++.jason/opeq.C (X::X): Likewise. @@ -1225,7 +1231,7 @@ * g++.old-deja/g++.mike/p811.C (X::stringify): Match for deprecated conversion warning. * g++.old-deja/g++.other/init15.C (A::name): Change type to const - char*. + char*. * g++.old-deja/g++.other/inline12.C: Adjust for const correctness. * g++.old-deja/g++.other/sibcall1.C (foo): Likewise. * g++.old-deja/g++.pt/explicit8.C: Likewise. diff --git a/gcc/testsuite/gcc.target/i386/387-1.c b/gcc/testsuite/gcc.target/i386/387-1.c index 9b31dcaed556b5aa7c1fa4cbf240ccd043b2fb17..22830754018dfa8715735adec0599d7df808dc0e 100644 --- a/gcc/testsuite/gcc.target/i386/387-1.c +++ b/gcc/testsuite/gcc.target/i386/387-1.c @@ -2,14 +2,14 @@ /* { dg-do compile { target i?86-*-* x86_64-*-* } } */ /* { dg-require-effective-target ilp32 } */ /* { dg-options "-O -ffast-math -mfpmath=387 -mno-fancy-math-387 -march=i386" } */ -/* { dg-final { scan-assembler "call\t_?sin" } } */ -/* { dg-final { scan-assembler "call\t_?cos" } } */ -/* { dg-final { scan-assembler "call\t_?sqrt" } } */ -/* { dg-final { scan-assembler "call\t_?atan2" } } */ -/* { dg-final { scan-assembler "call\t_?log" } } */ -/* { dg-final { scan-assembler "call\t_?exp" } } */ -/* { dg-final { scan-assembler "call\t_?tan" } } */ -/* { dg-final { scan-assembler "call\t_?fmod" } } */ +/* { dg-final { scan-assembler "call\t(.*)sin" } } */ +/* { dg-final { scan-assembler "call\t(.*)cos" } } */ +/* { dg-final { scan-assembler "call\t(.*)sqrt" } } */ +/* { dg-final { scan-assembler "call\t(.*)atan2" } } */ +/* { dg-final { scan-assembler "call\t(.*)log" } } */ +/* { dg-final { scan-assembler "call\t(.*)exp" } } */ +/* { dg-final { scan-assembler "call\t(.*)tan" } } */ +/* { dg-final { scan-assembler "call\t(.*)fmod" } } */ double f1(double x) { return __builtin_sin(x); } double f2(double x) { return __builtin_cos(x); } diff --git a/gcc/testsuite/gcc.target/i386/387-5.c b/gcc/testsuite/gcc.target/i386/387-5.c index fd3106e02704f9220d11facc8b04432996cd43f8..dc4d470900e7133a551b0de642faf6c425866265 100644 --- a/gcc/testsuite/gcc.target/i386/387-5.c +++ b/gcc/testsuite/gcc.target/i386/387-5.c @@ -2,9 +2,9 @@ /* { dg-do compile { target i?86-*-* x86_64-*-* } } */ /* { dg-require-effective-target ilp32 } */ /* { dg-options "-O -ffast-math -mfpmath=387 -mno-fancy-math-387 -march=i386" } */ -/* { dg-final { scan-assembler "call\t_?atan" } } */ -/* { dg-final { scan-assembler "call\t_?log1p" } } */ -/* { dg-final { scan-assembler "call\t_?drem" } } */ +/* { dg-final { scan-assembler "call\t(.*)atan" } } */ +/* { dg-final { scan-assembler "call\t(.*)log1p" } } */ +/* { dg-final { scan-assembler "call\t(.*)drem" } } */ double f1(double x) { return __builtin_atan(x); } double f2(double x) { return __builtin_log1p(x); }