Retro68/gcc/gcc/testsuite/gfortran.dg/associative_1.f90
2017-04-10 13:32:00 +02:00

10 lines
350 B
Fortran

! { dg-do compile }
! { dg-options "-O1 -fno-signed-zeros -fno-trapping-math -fdump-tree-optimized" }
! Fortran defaults to associative by default,
! with -fno-signed-zeros -fno-trapping-math this should optimize away all additions
SUBROUTINE S1(a)
REAL :: a
a=1+a-1
END SUBROUTINE S1
! { dg-final { scan-tree-dump-times " \\\+ " 0 "optimized" } }