PR inline-asm/84742
[official-gcc.git] / gcc / testsuite / gfortran.dg / associative_1.f90
blob977584939ffa7a948328c207f784a116fe0ac127
1 ! { dg-do compile }
2 ! { dg-options "-O1 -fno-signed-zeros -fno-trapping-math -fdump-tree-optimized" }
3 ! Fortran defaults to associative by default,
4 ! with -fno-signed-zeros -fno-trapping-math this should optimize away all additions
5 SUBROUTINE S1(a)
6 REAL :: a
7 a=1+a-1
8 END SUBROUTINE S1
9 ! { dg-final { scan-tree-dump-times " \\\+ " 0 "optimized" } }