[LLVM] Fix Maintainers.md formatting (NFC)
[llvm-project.git] / flang / test / Lower / OpenACC / acc-shortloop-ignore.f90
blobc1d581319384946997b56b023d9e44bc9d086b78
1 ! Test that non-standard shortloop clause is accepted and ignored with a
2 ! warning.
4 ! RUN: %flang_fc1 -fopenacc -emit-hlfir %s -o - 2>&1 | FileCheck %s
6 ! CHECK: warning: Non-standard shortloop clause ignored
7 ! CHECK: warning: Non-standard shortloop clause ignored
8 ! CHECK: warning: Non-standard shortloop clause ignored
9 ! CHECK: warning: Non-standard shortloop clause ignored
11 subroutine test_loop(a, b, c)
12 implicit none
13 real, dimension(100) :: a,b,c
14 integer :: i
15 !$acc loop vector shortloop
16 do i=1,100
17 a(i) = b(i) + c(i)
18 enddo
19 end subroutine
20 ! CHECK-LABEL: test_loop
21 ! CHECK: acc.loop vector
23 subroutine test_kernels_loop(a, b, c)
24 implicit none
25 real, dimension(100) :: a,b,c
26 integer :: i
27 !$acc kernels loop vector shortloop
28 do i=1,100
29 a(i) = b(i) + c(i)
30 enddo
31 end subroutine
32 ! CHECK-LABEL: test_kernels_loop
33 ! CHECK: acc.loop combined(kernels) vector
35 subroutine test_parallel_loop(a, b, c)
36 implicit none
37 real, dimension(100) :: a,b,c
38 integer :: i
39 !$acc parallel loop vector shortloop
40 do i=1,100
41 a(i) = b(i) + c(i)
42 enddo
43 end subroutine
44 ! CHECK-LABEL: test_parallel_loop
45 ! CHECK: acc.loop combined(parallel) vector
47 subroutine test_serial_loop(a, b, c)
48 implicit none
49 real, dimension(100) :: a,b,c
50 integer :: i
51 !$acc serial loop vector shortloop
52 do i=1,100
53 a(i) = b(i) + c(i)
54 enddo
55 end subroutine
56 ! CHECK-LABEL: test_serial_loop
57 ! CHECK: acc.loop combined(serial) vector