1- ! RUN: %flang_fc1 -fdebug-unparse -fopenmp %s | FileCheck --ignore-case --check-prefix="UNPARSE" %s
2- ! RUN: %flang_fc1 -fdebug-dump-parse-tree-no-sema -fopenmp %s | FileCheck --check-prefix="PARSE-TREE" %s
1+ ! RUN: %flang_fc1 -fdebug-unparse -fopenmp-version=52 -fopenmp %s | FileCheck --ignore-case --check-prefix="UNPARSE" %s
2+ ! RUN: %flang_fc1 -fdebug-dump-parse-tree-no-sema -fopenmp-version=52 -fopenmp %s | FileCheck --check-prefix="PARSE-TREE" %s
33
44subroutine test_interop_01 ()
55 ! $omp interop device(1)
66 print * ,' pass'
77end subroutine test_interop_01
88
99! UNPARSE: SUBROUTINE test_interop_01
10- ! UNPARSE: !$OMP INTEROP DEVICE(1_4)
10+ ! UNPARSE: !$OMP INTEROP DEVICE(1_4)
1111! UNPARSE: PRINT *, "pass"
1212! UNPARSE: END SUBROUTINE test_interop_01
1313
@@ -58,8 +58,8 @@ end subroutine test_interop_02
5858! PARSE-TREE: | | ExecutionPartConstruct -> ExecutableConstruct -> OpenMPConstruct -> OpenMPStandaloneConstruct -> OpenMPInteropConstruct
5959! PARSE-TREE: | | | Verbatim
6060! PARSE-TREE: | | | OmpClauseList -> OmpClause -> Init -> OmpInitClause
61- ! PARSE-TREE: | | | | InteropTypes -> InteropType -> Kind = TargetSync
62- ! PARSE-TREE: | | | | InteropVar -> OmpObject -> Designator -> DataRef -> Name = 'obj'
61+ ! PARSE-TREE: | | | | Modifier -> OmpInteropType -> Value = TargetSync
62+ ! PARSE-TREE: | | | | OmpObject -> Designator -> DataRef -> Name = 'obj'
6363! PARSE-TREE: | | | OmpClause -> Use -> OmpUseClause -> OmpObject -> Designator -> DataRef -> Name = 'obj1'
6464! PARSE-TREE: | | | OmpClause -> Destroy -> OmpDestroyClause -> OmpObject -> Designator -> DataRef -> Name = 'obj3'
6565! PARSE-TREE: | | ExecutionPartConstruct -> ExecutableConstruct -> ActionStmt -> PrintStmt
@@ -96,8 +96,8 @@ end subroutine test_interop_03
9696! PARSE-TREE: | | ExecutionPartConstruct -> ExecutableConstruct -> OpenMPConstruct -> OpenMPStandaloneConstruct -> OpenMPInteropConstruct
9797! PARSE-TREE: | | | Verbatim
9898! PARSE-TREE: | | | OmpClauseList -> OmpClause -> Init -> OmpInitClause
99- ! PARSE-TREE: | | | | InteropTypes -> InteropType -> Kind = TargetSync
100- ! PARSE-TREE: | | | | InteropVar -> OmpObject -> Designator -> DataRef -> Name = 'obj'
99+ ! PARSE-TREE: | | | | Modifier -> OmpInteropType -> Value = TargetSync
100+ ! PARSE-TREE: | | | | OmpObject -> Designator -> DataRef -> Name = 'obj'
101101! PARSE-TREE: | | | OmpClause -> Depend -> OmpDependClause -> TaskDep
102102! PARSE-TREE: | | | | Modifier -> OmpTaskDependenceType -> Value = Inout
103103! PARSE-TREE: | | | | OmpObjectList -> OmpObject -> Designator -> DataRef -> Name = 'obj'
@@ -146,11 +146,11 @@ end subroutine test_interop_04
146146! PARSE-TREE: | | ExecutionPartConstruct -> ExecutableConstruct -> OpenMPConstruct -> OpenMPStandaloneConstruct -> OpenMPInteropConstruct
147147! PARSE-TREE: | | | Verbatim
148148! PARSE-TREE: | | | OmpClauseList -> OmpClause -> Init -> OmpInitClause
149- ! PARSE-TREE: | | | | InteropModifier -> InteropPreference -> CharLiteralConstant
149+ ! PARSE-TREE: | | | | Modifier -> OmpInteropPreference -> OmpInteropRuntimeIdentifier -> CharLiteralConstant
150150! PARSE-TREE: | | | | | string = 'cuda'
151- ! PARSE-TREE: | | | | InteropTypes -> InteropType -> Kind = TargetSync
152- ! PARSE-TREE: | | | | InteropType -> Kind = Target
153- ! PARSE-TREE: | | | | InteropVar -> OmpObject -> Designator -> DataRef -> Name = 'obj'
151+ ! PARSE-TREE: | | | | Modifier -> OmpInteropType -> Value = TargetSync
152+ ! PARSE-TREE: | | | | Modifier -> OmpInteropType -> Value = Target
153+ ! PARSE-TREE: | | | | OmpObject -> Designator -> DataRef -> Name = 'obj'
154154! PARSE-TREE: | | | OmpClause -> Depend -> OmpDependClause -> TaskDep
155155! PARSE-TREE: | | | | Modifier -> OmpTaskDependenceType -> Value = Inout
156156! PARSE-TREE: | | | | OmpObjectList -> OmpObject -> Designator -> DataRef -> Name = 'arr'
@@ -161,7 +161,6 @@ end subroutine test_interop_04
161161! PARSE-TREE: | | | | string = 'pass'
162162! PARSE-TREE: | EndSubroutineStmt -> Name = 'test_interop_04'
163163
164-
165164subroutine test_interop_05 ()
166165 use omp_lib
167166 integer (omp_interop_kind) :: obj
@@ -190,9 +189,9 @@ end subroutine test_interop_05
190189! PARSE-TREE: | | ExecutionPartConstruct -> ExecutableConstruct -> OpenMPConstruct -> OpenMPStandaloneConstruct -> OpenMPInteropConstruct
191190! PARSE-TREE: | | | Verbatim
192191! PARSE-TREE: | | | OmpClauseList -> OmpClause -> Init -> OmpInitClause
193- ! PARSE-TREE: | | | | InteropModifier -> InteropPreference -> Scalar -> Integer -> Constant -> Expr -> Designator -> DataRef -> Name = 'omp_ifr_sycl'
194- ! PARSE-TREE: | | | | InteropTypes -> InteropType -> Kind = TargetSync
195- ! PARSE-TREE: | | | | InteropVar -> OmpObject -> Designator -> DataRef -> Name = 'obj'
192+ ! PARSE-TREE: | | | | Modifier -> OmpInteropPreference -> OmpInteropRuntimeIdentifier -> Scalar -> Integer -> Constant -> Expr -> Designator -> DataRef -> Name = 'omp_ifr_sycl'
193+ ! PARSE-TREE: | | | | Modifier -> OmpInteropType -> Value = TargetSync
194+ ! PARSE-TREE: | | | | OmpObject -> Designator -> DataRef -> Name = 'obj'
196195! PARSE-TREE: | | | OmpClause -> Device -> OmpDeviceClause
197196! PARSE-TREE: | | | | Modifier -> OmpDeviceModifier -> Value = Device_Num
198197! PARSE-TREE: | | | | Scalar -> Integer -> Expr -> LiteralConstant -> IntLiteralConstant = '0'
0 commit comments