PR inline-asm/84742
[official-gcc.git] / gcc / testsuite / gfortran.dg / vect / vect-3.f90
blobb8ccbdd8db283ec25b5ae631136cc393e448abc6
1 ! { dg-do compile }
2 ! { dg-require-effective-target vect_float }
3 ! { dg-additional-options "--param vect-max-peeling-for-alignment=0" }
5 SUBROUTINE SAXPY(X, Y, A, N)
6 DIMENSION X(N), Y(N)
7 Y = Y + A * X
8 END
10 ! { dg-final { scan-tree-dump-times "Alignment of access forced using versioning" 3 "vect" { target { vect_no_align && { ! vect_hw_misalign } } } } }
11 ! { dg-final { scan-tree-dump-times "Alignment of access forced using versioning" 1 "vect" { target { {! vect_no_align} && { {! vector_alignment_reachable} && {! vect_hw_misalign} } } } } }