| ! REQUIRES: plugins, examples, shell |
| ! RUN: %flang_fc1 -load %llvmshlibdir/flangOmpReport.so -plugin flang-omp-report -fopenmp %s -o - | FileCheck %s |
| ! Check OpenMP declarative directives |
| subroutine declare_simd_1(a, b) |
| real(8), intent(inout) :: a, b |
| !$omp declare simd(declare_simd_1) aligned(a) |
| end subroutine declare_simd_1 |
| integer, parameter :: N=10000, M=1024 |
| real :: Q(N, N), R(N,M), S(M,M) |
| ! CHECK-NEXT:- file: '{{[^"]*}}omp-declarative-directive.f90' |
| ! CHECK-NEXT: construct: declare simd |
| ! CHECK-NEXT: - clause: aligned |
| ! CHECK-NEXT:- file: '{{[^"]*}}omp-declarative-directive.f90' |
| ! CHECK-NEXT: construct: declare target |
| ! CHECK-NEXT: clauses: [] |