Merge branches/gcc-4_9-branch rev 225109.
[official-gcc.git] / gcc-4_9-branch / gcc / testsuite / gfortran.dg / vect / vect-2.f90
blobb4358c814304dbaa2aae8a3c9eaaf6071649dfbd
1 ! { dg-do compile }
2 ! { dg-require-effective-target vect_float }
4 SUBROUTINE FOO(A, B, C)
5 DIMENSION A(1000000), B(1000000), C(1000000)
6 READ*, X, Y
7 A = LOG(X); B = LOG(Y); C = A + B
8 PRINT*, C(500000)
9 END
11 ! First loop (A=LOG(X)) is vectorized using peeling to align the store.
12 ! Same for the second loop (B=LOG(Y)).
13 ! Third loop (C = A + B) is vectorized using versioning (for targets that don't
14 ! support unaligned loads) or using peeling to align the store (on targets that
15 ! support unaligned loads).
17 ! { dg-final { scan-tree-dump-times "vectorized 3 loops" 1 "vect" } }
18 ! { dg-final { scan-tree-dump-times "Alignment of access forced using peeling" 3 "vect" { xfail { { vect_no_align && { ! vect_hw_misalign } } || { ! vector_alignment_reachable } } } } }
19 ! { dg-final { scan-tree-dump-times "Alignment of access forced using peeling" 2 "vect" { target { { vect_no_align && { ! vect_hw_misalign } } && { ! vector_alignment_reachable } } } } }
20 ! { dg-final { scan-tree-dump-times "Vectorizing an unaligned access" 2 "vect" { xfail { vect_no_align && { ! vect_hw_misalign } } } } }
21 ! { dg-final { scan-tree-dump-times "Alignment of access forced using versioning." 3 "vect" {target { { vect_no_align && { ! vect_hw_misalign } } || { { ! vector_alignment_reachable } && { ! vect_hw_misalign } } } } } }
22 ! { dg-final { cleanup-tree-dump "vect" } }