Commit 12019aec by H.J. Lu

re PR target/39152 (Revision 144098 breaks 416.gamess in SPEC CPU 2006)

gcc/

2009-02-12  Paolo Bonzini  <bonzini@gnu.org>

	PR target/39152
	* config/i386/i386.md: Replace simplify_replace_rtx with
	replace_rtx in the new peephole2.

gcc/testsuite/

2009-02-12  H.J. Lu  <hongjiu.lu@intel.com>

	PR target/39152
	* gfortran.dg/pr39152.f: New.

From-SVN: r144126
parent 28c11eb3
2009-02-12 Paolo Bonzini <bonzini@gnu.org>
PR target/39152
* config/i386/i386.md: Replace simplify_replace_rtx with
replace_rtx in the new peephole2.
2009-02-12 Nathan Sidwell <nathan@codesourcery.com>
* doc/invoke.texi (Optimize Options): Stop claiming inlining and
......
......@@ -20741,7 +20741,7 @@
(parallel [(set (match_dup 0)
(match_op_dup 3 [(match_dup 0) (match_dup 1)]))
(clobber (reg:CC FLAGS_REG))])]
"operands[4] = simplify_replace_rtx (operands[2], operands[0], operands[1]);")
"operands[4] = replace_rtx (operands[2], operands[0], operands[1]);")
(define_peephole2
[(set (match_operand 0 "register_operand" "")
......
2009-02-12 H.J. Lu <hongjiu.lu@intel.com>
PR target/39152
* gfortran.dg/pr39152.f: New.
2009-02-11 Jason Merrill <jason@redhat.com>
PR c++/39153
......
! { dg-do compile }
! { dg-options "-O2" }
SUBROUTINE CASHES(E,HESS,FC,FA,NORB,NPR)
IMPLICIT DOUBLE PRECISION (A-H,O-Z)
PARAMETER (MXAO=2047)
DIMENSION HESS(NPR),E(NORB,*),FC(*),FA(*)
COMMON /IJPAIR/ IA(MXAO)
COMMON /MCPAR / NFZC,NCORBS,NCI,NORBS,NORBX,NUM
K=0
DO 200 IU = 1,NORB - NCORBS
I = IU + NCORBS
II=IA(I)+I
DO 100 J = 1,NCORBS
IF (I.GT.NORBS) THEN
HESS(K)=FC(II) + FA(II) - E(J,J)
ELSE
HESS(K)=FA(II) - E(I,I) - E(J,J) + FC(JJ) + FA(JJ)
END IF
100 CONTINUE
200 CONTINUE
RETURN
END
Markdown is supported
0% or
You are about to add 0 people to the discussion. Proceed with caution.
Finish editing this message first!
Please register or to comment