[AArch64] Merge stores of D-register values with different modes
[official-gcc.git] / gcc / testsuite / gfortran.dg / extract_recip_1.f
blobf70157c6da25e6dbe309456eecada6a78317f97e
1 ! { dg-do compile }
2 ! { dg-options "-Ofast -fdump-tree-optimized-raw" }
4 SUBROUTINE F(N,X,Y,Z,A,B)
5 DIMENSION X(4,4), Y(4), Z(4)
6 REAL, INTENT(INOUT) :: A, B
8 A = 1 / (Y(N)*Y(N))
10 DO I = 1, NV
11 X(I, I) = 1 + X(I, I)
12 ENDDO
14 Z(1) = B / Y(N)
15 Z(2) = N / Y(N)
16 RETURN
17 END
19 ! { dg-final { scan-tree-dump-times "rdiv_expr" 1 "optimized" } }