[Clang] Fix buildbot failure introduced by #121788
[llvm-project.git] / flang / test / Parser / OpenMP / nothing.f90
blob22558c493c4448481800682ae24eb36cb39adc73
1 !RUN: %flang_fc1 -fdebug-unparse -fopenmp -fopenmp-version=51 %s | FileCheck --ignore-case --check-prefix="UNPARSE" %s
2 !RUN: %flang_fc1 -fdebug-dump-parse-tree -fopenmp -fopenmp-version=51 %s | FileCheck --check-prefix="PARSE-TREE" %s
4 subroutine f00
5 !$omp nothing
6 end
8 !UNPARSE: SUBROUTINE f00
9 !UNPARSE: !$OMP NOTHING
10 !UNPARSE: END SUBROUTINE
12 !PARSE-TREE: ExecutionPart -> Block
13 !PARSE-TREE: | | ExecutionPartConstruct -> ExecutableConstruct -> OpenMPConstruct -> OpenMPUtilityConstruct -> OmpNothingDirective
15 subroutine f01
16 block
17 import, none
18 integer :: x
19 !$omp nothing ! "nothing" in the execution part
20 x = x+1
21 end block
22 end
24 !UNPARSE: SUBROUTINE f01
25 !UNPARSE: BLOCK
26 !UNPARSE: IMPORT, NONE
27 !UNPARSE: INTEGER x
28 !UNPARSE: !$OMP NOTHING
29 !UNPARSE: x=x+1_4
30 !UNPARSE: END BLOCK
31 !UNPARSE: END SUBROUTINE
33 !PARSE-TREE: BlockStmt ->
34 !PARSE-TREE: BlockSpecificationPart -> SpecificationPart
35 !PARSE-TREE: | ImportStmt
36 !PARSE-TREE: | ImplicitPart ->
37 !PARSE-TREE: | DeclarationConstruct -> SpecificationConstruct -> TypeDeclarationStmt
38 !PARSE-TREE: | | DeclarationTypeSpec -> IntrinsicTypeSpec -> IntegerTypeSpec ->
39 !PARSE-TREE: | | EntityDecl
40 !PARSE-TREE: | | | Name = 'x'
41 !PARSE-TREE: Block
42 !PARSE-TREE: | ExecutionPartConstruct -> ExecutableConstruct -> OpenMPConstruct -> OpenMPUtilityConstruct -> OmpNothingDirective
43 !PARSE-TREE: | ExecutionPartConstruct -> ExecutableConstruct -> ActionStmt -> AssignmentStmt = 'x=x+1_4'
44 !PARSE-TREE: | | Variable = 'x'
45 !PARSE-TREE: | | | Designator -> DataRef -> Name = 'x'
46 !PARSE-TREE: | | Expr = 'x+1_4'
47 !PARSE-TREE: | | | Add
48 !PARSE-TREE: | | | | Expr = 'x'
49 !PARSE-TREE: | | | | | Designator -> DataRef -> Name = 'x'
50 !PARSE-TREE: | | | | Expr = '1_4'
51 !PARSE-TREE: | | | | | LiteralConstant -> IntLiteralConstant = '1'
52 !PARSE-TREE: EndBlockStmt ->
54 subroutine f02
55 integer :: x
56 !$omp nothing
57 end
59 !UNPARSE: SUBROUTINE f02
60 !UNPARSE: INTEGER x
61 !UNPARSE: !$OMP NOTHING
62 !UNPARSE: END SUBROUTINE
64 !PARSE-TREE: SpecificationPart
65 !PARSE-TREE: | ImplicitPart ->
66 !PARSE-TREE: | DeclarationConstruct -> SpecificationConstruct -> TypeDeclarationStmt
67 !PARSE-TREE: | | DeclarationTypeSpec -> IntrinsicTypeSpec -> IntegerTypeSpec ->
68 !PARSE-TREE: | | EntityDecl
69 !PARSE-TREE: | | | Name = 'x'
70 !PARSE-TREE: ExecutionPart -> Block
71 !PARSE-TREE: | ExecutionPartConstruct -> ExecutableConstruct -> OpenMPConstruct -> OpenMPUtilityConstruct -> OmpNothingDirective
73 subroutine f03
74 block
75 !$omp nothing ! "nothing" in the specification part
76 import, none
77 integer :: x
78 x = x+1
79 end block
80 end
82 !UNPARSE: SUBROUTINE f03
83 !UNPARSE: BLOCK
84 !UNPARSE: !$OMP NOTHING
85 !UNPARSE: IMPORT, NONE
86 !UNPARSE: INTEGER x
87 !UNPARSE: x=x+1_4
88 !UNPARSE: END BLOCK
89 !UNPARSE: END SUBROUTINE
91 !PARSE-TREE: ExecutionPart -> Block
92 !PARSE-TREE: | ExecutionPartConstruct -> ExecutableConstruct -> BlockConstruct
93 !PARSE-TREE: | | BlockStmt ->
94 !PARSE-TREE: | | BlockSpecificationPart -> SpecificationPart
95 !PARSE-TREE: | | | OpenMPDeclarativeConstruct -> OpenMPUtilityConstruct -> OmpNothingDirective
96 !PARSE-TREE: | | | ImportStmt
97 !PARSE-TREE: | | | ImplicitPart ->
98 !PARSE-TREE: | | | DeclarationConstruct -> SpecificationConstruct -> TypeDeclarationStmt
99 !PARSE-TREE: | | | | DeclarationTypeSpec -> IntrinsicTypeSpec -> IntegerTypeSpec ->
100 !PARSE-TREE: | | | | EntityDecl
101 !PARSE-TREE: | | | | | Name = 'x'
102 !PARSE-TREE: | | Block
103 !PARSE-TREE: | | | ExecutionPartConstruct -> ExecutableConstruct -> ActionStmt -> AssignmentStmt = 'x=x+1_4'
104 !PARSE-TREE: | | | | Variable = 'x'
105 !PARSE-TREE: | | | | | Designator -> DataRef -> Name = 'x'
106 !PARSE-TREE: | | | | Expr = 'x+1_4'
107 !PARSE-TREE: | | | | | Add
108 !PARSE-TREE: | | | | | | Expr = 'x'
109 !PARSE-TREE: | | | | | | | Designator -> DataRef -> Name = 'x'
110 !PARSE-TREE: | | | | | | Expr = '1_4'
111 !PARSE-TREE: | | | | | | | LiteralConstant -> IntLiteralConstant = '1'
112 !PARSE-TREE: | | EndBlockStmt ->
113 !PARSE-TREE: EndSubroutineStmt ->