1 !RUN: %flang_fc1 -fdebug-unparse -fopenmp -fopenmp-version=50 %s | FileCheck --ignore-case --check-prefix="UNPARSE" %s
2 !RUN: %flang_fc1 -fdebug-dump-parse-tree -fopenmp -fopenmp-version=50 %s | FileCheck --check-prefix="PARSE-TREE" %s
5 !$omp loop bind(parallel)
12 !UNPARSE: SUBROUTINE f00
13 !UNPARSE: !$OMP LOOP BIND(PARALLEL)
14 !UNPARSE: DO i=1_4,10_4
17 !UNPARSE: !$OMP END LOOP
18 !UNPARSE: END SUBROUTINE
20 !PARSE-TREE: ExecutionPartConstruct -> ExecutableConstruct -> OpenMPConstruct -> OpenMPLoopConstruct
21 !PARSE-TREE: | OmpBeginLoopDirective
22 !PARSE-TREE: | | OmpLoopDirective -> llvm::omp::Directive = loop
23 !PARSE-TREE: | | OmpClauseList -> OmpClause -> Bind -> OmpBindClause -> Binding = Parallel
24 !PARSE-TREE: | DoConstruct