diff --git a/flang/test/Parser/OpenMP/atomic-unparse.f90 b/flang/test/Parser/OpenMP/atomic-unparse.f90 index 16dc7a1a92bf9..9a21d2c6d5486 100644 --- a/flang/test/Parser/OpenMP/atomic-unparse.f90 +++ b/flang/test/Parser/OpenMP/atomic-unparse.f90 @@ -151,7 +151,7 @@ program main if (i .eq. j + 1) then i = j end if - + !$omp atomic compare acquire if (i .eq. j) then i = k @@ -178,7 +178,7 @@ program main if (i .eq. k) then i = j end if - + !ATOMIC !$omp atomic i = j diff --git a/flang/test/Parser/OpenMP/declare-reduction-operator.f90 b/flang/test/Parser/OpenMP/declare-reduction-operator.f90 index 1099daf9de06f..c104e9488f075 100644 --- a/flang/test/Parser/OpenMP/declare-reduction-operator.f90 +++ b/flang/test/Parser/OpenMP/declare-reduction-operator.f90 @@ -11,7 +11,7 @@ subroutine reduce_1 ( n, tts ) real(8) :: x real(8) :: y end type - + integer :: n type(tt) :: tts(n) type(tt2) :: tts2(n) @@ -76,7 +76,7 @@ subroutine reduce_1 ( n, tts ) !PARSE-TREE: | Flags = {} !$omp declare reduction(+ : tt : omp_out = tt(omp_out%x - omp_in%x , omp_out%y - omp_in%y)) initializer(omp_priv = tt(0,0)) - + !CHECK: !$OMP DECLARE REDUCTION(+:tt2: omp_out = tt2(omp_out%x - omp_in%x , omp_out%y & !CHECK: !$OMP&- omp_in%y)) INITIALIZER(omp_priv = tt2(0,0)) @@ -136,7 +136,7 @@ subroutine reduce_1 ( n, tts ) !PARSE-TREE: | | | | | | | LiteralConstant -> IntLiteralConstant = '0' !PARSE-TREE: | Flags = {} !$omp declare reduction(+ :tt2 : omp_out = tt2(omp_out%x - omp_in%x , omp_out%y - omp_in%y)) initializer(omp_priv = tt2(0,0)) - + type(tt) :: diffp = tt( 0, 0 ) type(tt2) :: diffp2 = tt2( 0, 0 ) integer :: i diff --git a/flang/test/Parser/OpenMP/declare-variant.f90 b/flang/test/Parser/OpenMP/declare-variant.f90 index 8d8280d89e7e8..07f65beaaf12a 100644 --- a/flang/test/Parser/OpenMP/declare-variant.f90 +++ b/flang/test/Parser/OpenMP/declare-variant.f90 @@ -121,7 +121,7 @@ subroutine f y = 2 !omp simd call f2(x, y) - !omp end simd + !omp end simd contains subroutine f1 (x, y) real :: x, y diff --git a/flang/test/Parser/OpenMP/defaultmap-unparse.f90 b/flang/test/Parser/OpenMP/defaultmap-unparse.f90 index fa0578014071f..6e4d1fe694c83 100644 --- a/flang/test/Parser/OpenMP/defaultmap-unparse.f90 +++ b/flang/test/Parser/OpenMP/defaultmap-unparse.f90 @@ -13,9 +13,9 @@ program main real :: arrA(N), arrB(N) integer, target :: arrC(N) - type(data01) :: data01_a + type(data01) :: data01_a integer, allocatable :: alloc_arr(:) - integer, pointer :: ptrArr(:) + integer, pointer :: ptrArr(:) arrA = 1.414 arrB = 3.14 @@ -26,8 +26,8 @@ program main alloc_arr = -1 -!CHECK: !$omp target defaultmap(tofrom:scalar) - !$omp target defaultmap(tofrom:scalar) +!CHECK: !$omp target defaultmap(tofrom:scalar) + !$omp target defaultmap(tofrom:scalar) do i = 1, N a = 3.14 enddo @@ -66,7 +66,7 @@ program main !CHECK: !$omp target defaultmap(none:scalar) !$omp target defaultmap(none:scalar) a = 4.78 -!CHECK: !$omp end target +!CHECK: !$omp end target !$omp end target !PARSE-TREE: OmpBeginDirective @@ -98,7 +98,7 @@ program main !PARSE-TREE: OmpClauseList -> OmpClause -> Defaultmap -> OmpDefaultmapClause !PARSE-TREE: ImplicitBehavior = Firstprivate !PARSE-TREE: Modifier -> OmpVariableCategory -> Value = Scalar - + !CHECK: !$omp target defaultmap(tofrom:aggregate) !$omp target defaultmap(tofrom:aggregate) arrC(1) = 10 @@ -113,8 +113,8 @@ program main !PARSE-TREE: OmpClauseList -> OmpClause -> Defaultmap -> OmpDefaultmapClause !PARSE-TREE: ImplicitBehavior = Tofrom !PARSE-TREE: Modifier -> OmpVariableCategory -> Value = Aggregate - -!CHECK: !$omp target defaultmap(tofrom:allocatable) + +!CHECK: !$omp target defaultmap(tofrom:allocatable) !$omp target defaultmap(tofrom:allocatable) alloc_arr(23) = 234 !CHECK: !$omp end target @@ -125,14 +125,14 @@ program main !PARSE-TREE: OmpClauseList -> OmpClause -> Defaultmap -> OmpDefaultmapClause !PARSE-TREE: ImplicitBehavior = Tofrom !PARSE-TREE: Modifier -> OmpVariableCategory -> Value = Allocatable - + !CHECK: !$omp target defaultmap(default:pointer) !$omp target defaultmap(default:pointer) ptrArr=>arrC ptrArr(2) = 5 prtArr(200) = 34 !CHECK: !$omp end target - !$omp end target + !$omp end target !PARSE-TREE: OmpBeginDirective !PARSE-TREE: OmpDirectiveName -> llvm::omp::Directive = target diff --git a/flang/test/Parser/OpenMP/if-clause-unparse.f90 b/flang/test/Parser/OpenMP/if-clause-unparse.f90 index ce058caa54a93..e0334f5a6bb0a 100644 --- a/flang/test/Parser/OpenMP/if-clause-unparse.f90 +++ b/flang/test/Parser/OpenMP/if-clause-unparse.f90 @@ -12,7 +12,7 @@ program if_unparse ! CHECK: !$OMP TARGET UPDATE ! CHECK-SAME: IF(TARGET UPDATE: cond) !$omp target update if(target update: cond) - + ! CHECK: !$OMP TARGET UPDATE ! CHECK-SAME: IF(TARGET UPDATE: cond) !$omp target update if(targetupdate: cond) diff --git a/flang/test/Parser/OpenMP/interop-construct.f90 b/flang/test/Parser/OpenMP/interop-construct.f90 index c080d477d1325..44632e7eb192d 100644 --- a/flang/test/Parser/OpenMP/interop-construct.f90 +++ b/flang/test/Parser/OpenMP/interop-construct.f90 @@ -1,5 +1,5 @@ ! REQUIRES: openmp_runtime -! RUN: %flang_fc1 -fdebug-unparse -fopenmp-version=52 %openmp_flags %s | FileCheck --ignore-case --check-prefix="UNPARSE" %s +! RUN: %flang_fc1 -fdebug-unparse -fopenmp-version=52 %openmp_flags %s | FileCheck --ignore-case --check-prefix="UNPARSE" %s ! RUN: %flang_fc1 -fdebug-dump-parse-tree-no-sema -fopenmp-version=52 %openmp_flags %s | FileCheck --check-prefix="PARSE-TREE" %s SUBROUTINE test_interop_01() @@ -15,7 +15,7 @@ END SUBROUTINE test_interop_01 !PARSE-TREE: | SubroutineStmt !PARSE-TREE: | | Name = 'test_interop_01' !PARSE-TREE: | SpecificationPart -!PARSE-TREE: | | ImplicitPart -> +!PARSE-TREE: | | ImplicitPart -> !PARSE-TREE: | ExecutionPart -> Block !PARSE-TREE: | | ExecutionPartConstruct -> ExecutableConstruct -> OpenMPConstruct -> OpenMPStandaloneConstruct -> OpenMPInteropConstruct -> OmpDirectiveSpecification !PARSE-TREE: | | | OmpDirectiveName -> llvm::omp::Directive = interop @@ -47,7 +47,7 @@ END SUBROUTINE test_interop_02 !PARSE-TREE: | SpecificationPart !PARSE-TREE: | | UseStmt !PARSE-TREE: | | | Name = 'omp_lib' -!PARSE-TREE: | | ImplicitPart -> +!PARSE-TREE: | | ImplicitPart -> !PARSE-TREE: | | DeclarationConstruct -> SpecificationConstruct -> TypeDeclarationStmt !PARSE-TREE: | | | DeclarationTypeSpec -> IntrinsicTypeSpec -> IntegerTypeSpec -> KindSelector -> Scalar -> Integer -> Constant -> Expr -> Designator -> DataRef -> Name = 'omp_interop_kind' !PARSE-TREE: | | | EntityDecl @@ -90,7 +90,7 @@ END SUBROUTINE test_interop_03 !PARSE-TREE: | SpecificationPart !PARSE-TREE: | | UseStmt !PARSE-TREE: | | | Name = 'omp_lib' -!PARSE-TREE: | | ImplicitPart -> +!PARSE-TREE: | | ImplicitPart -> !PARSE-TREE: | | DeclarationConstruct -> SpecificationConstruct -> TypeDeclarationStmt !PARSE-TREE: | | | DeclarationTypeSpec -> IntrinsicTypeSpec -> IntegerTypeSpec -> KindSelector -> Scalar -> Integer -> Constant -> Expr -> Designator -> DataRef -> Name = 'omp_interop_kind' !PARSE-TREE: | | | EntityDecl @@ -133,13 +133,13 @@ END SUBROUTINE test_interop_04 !PARSE-TREE: | SpecificationPart !PARSE-TREE: | | UseStmt !PARSE-TREE: | | | Name = 'omp_lib' -!PARSE-TREE: | | ImplicitPart -> +!PARSE-TREE: | | ImplicitPart -> !PARSE-TREE: | | DeclarationConstruct -> SpecificationConstruct -> TypeDeclarationStmt !PARSE-TREE: | | | DeclarationTypeSpec -> IntrinsicTypeSpec -> IntegerTypeSpec -> KindSelector -> Scalar -> Integer -> Constant -> Expr -> Designator -> DataRef -> Name = 'omp_interop_kind' !PARSE-TREE: | | | EntityDecl !PARSE-TREE: | | | | Name = 'obj' !PARSE-TREE: | | DeclarationConstruct -> SpecificationConstruct -> TypeDeclarationStmt -!PARSE-TREE: | | | DeclarationTypeSpec -> IntrinsicTypeSpec -> IntegerTypeSpec -> +!PARSE-TREE: | | | DeclarationTypeSpec -> IntrinsicTypeSpec -> IntegerTypeSpec -> !PARSE-TREE: | | | AttrSpec -> ArraySpec -> ExplicitShapeSpec !PARSE-TREE: | | | | SpecificationExpr -> Scalar -> Integer -> Expr -> LiteralConstant -> IntLiteralConstant = '1' !PARSE-TREE: | | | ExplicitShapeSpec @@ -185,7 +185,7 @@ END SUBROUTINE test_interop_05 !PARSE-TREE: | SpecificationPart !PARSE-TREE: | | UseStmt !PARSE-TREE: | | | Name = 'omp_lib' -!PARSE-TREE: | | ImplicitPart -> +!PARSE-TREE: | | ImplicitPart -> !PARSE-TREE: | | DeclarationConstruct -> SpecificationConstruct -> TypeDeclarationStmt !PARSE-TREE: | | | DeclarationTypeSpec -> IntrinsicTypeSpec -> IntegerTypeSpec -> KindSelector -> Scalar -> Integer -> Constant -> Expr -> Designator -> DataRef -> Name = 'omp_interop_kind' !PARSE-TREE: | | | EntityDecl diff --git a/flang/test/Parser/OpenMP/lastprivate-clause.f90 b/flang/test/Parser/OpenMP/lastprivate-clause.f90 index 6364b74255521..08ada744a9c96 100644 --- a/flang/test/Parser/OpenMP/lastprivate-clause.f90 +++ b/flang/test/Parser/OpenMP/lastprivate-clause.f90 @@ -1,4 +1,4 @@ -! RUN: %flang_fc1 -fdebug-unparse -fopenmp -fopenmp-version=50 %s | FileCheck --ignore-case --check-prefix="UNPARSE" %s +! RUN: %flang_fc1 -fdebug-unparse -fopenmp -fopenmp-version=50 %s | FileCheck --ignore-case --check-prefix="UNPARSE" %s ! RUN: %flang_fc1 -fdebug-dump-parse-tree -fopenmp -fopenmp-version=50 %s | FileCheck --check-prefix="PARSE-TREE" %s subroutine foo1() diff --git a/flang/test/Parser/OpenMP/masked-unparse.f90 b/flang/test/Parser/OpenMP/masked-unparse.f90 index 786b60416846f..7156f4cf94924 100644 --- a/flang/test/Parser/OpenMP/masked-unparse.f90 +++ b/flang/test/Parser/OpenMP/masked-unparse.f90 @@ -1,7 +1,7 @@ ! RUN: %flang_fc1 -fdebug-unparse -fopenmp %s | FileCheck --ignore-case %s ! RUN: %flang_fc1 -fdebug-dump-parse-tree -fopenmp %s | FileCheck --check-prefix="PARSE-TREE" %s -! Check for parsing of masked directive with filter clause. +! Check for parsing of masked directive with filter clause. subroutine test_masked() @@ -9,7 +9,7 @@ subroutine test_masked() !PARSE-TREE: OmpBeginDirective !PARSE-TREE-NEXT: OmpDirectiveName -> llvm::omp::Directive = masked !CHECK: !$omp masked - !$omp masked + !$omp masked c = c + 1 !$omp end masked !PARSE-TREE: OmpBeginDirective @@ -17,7 +17,7 @@ subroutine test_masked() !PARSE-TREE-NEXT: OmpClauseList -> OmpClause -> Filter -> Scalar -> Integer -> Expr = '1_4' !PARSE-TREE-NEXT: LiteralConstant -> IntLiteralConstant = '1' !CHECK: !$omp masked filter(1_4) - !$omp masked filter(1) + !$omp masked filter(1) c = c + 2 !$omp end masked end subroutine @@ -27,7 +27,7 @@ subroutine test_masked_taskloop_simd() !PARSE-TREE: OmpBeginLoopDirective !PARSE-TREE-NEXT: OmpDirectiveName -> llvm::omp::Directive = masked taskloop simd !CHECK: !$omp masked taskloop simd - !$omp masked taskloop simd + !$omp masked taskloop simd do i=1,10 j = j + 1 end do @@ -41,11 +41,11 @@ subroutine test_masked_taskloop !PARSE-TREE-NEXT: OmpClauseList -> OmpClause -> Filter -> Scalar -> Integer -> Expr = '2_4' !PARSE-TREE-NEXT: LiteralConstant -> IntLiteralConstant = '2' !CHECK: !$omp masked taskloop filter(2_4) - !$omp masked taskloop filter(2) + !$omp masked taskloop filter(2) do i=1,10 j = j + 1 end do - !$omp end masked taskloop + !$omp end masked taskloop end subroutine subroutine test_parallel_masked @@ -70,7 +70,7 @@ subroutine test_parallel_masked_taskloop_simd !PARSE-TREE: OmpBeginLoopDirective !PARSE-TREE-NEXT: OmpDirectiveName -> llvm::omp::Directive = parallel masked taskloop simd !CHECK: !$omp parallel masked taskloop simd - !$omp parallel masked taskloop simd + !$omp parallel masked taskloop simd do i=1,10 j = j + 1 end do @@ -84,9 +84,9 @@ subroutine test_parallel_masked_taskloop !PARSE-TREE-NEXT: OmpClauseList -> OmpClause -> Filter -> Scalar -> Integer -> Expr = '2_4' !PARSE-TREE-NEXT: LiteralConstant -> IntLiteralConstant = '2' !CHECK: !$omp parallel masked taskloop filter(2_4) - !$omp parallel masked taskloop filter(2) + !$omp parallel masked taskloop filter(2) do i=1,10 j = j + 1 end do - !$omp end parallel masked taskloop + !$omp end parallel masked taskloop end subroutine diff --git a/flang/test/Parser/OpenMP/master-unparse.f90 b/flang/test/Parser/OpenMP/master-unparse.f90 index 36935d4fe1a7d..bee6c9662d247 100644 --- a/flang/test/Parser/OpenMP/master-unparse.f90 +++ b/flang/test/Parser/OpenMP/master-unparse.f90 @@ -9,7 +9,7 @@ subroutine test_master() !PARSE-TREE: OmpBeginDirective !PARSE-TREE-NEXT: OmpDirectiveName -> llvm::omp::Directive = master !CHECK: !$omp master - !$omp master + !$omp master c = c + 1 !$omp end master end subroutine @@ -19,7 +19,7 @@ subroutine test_master_taskloop_simd() !PARSE-TREE: OmpBeginLoopDirective !PARSE-TREE-NEXT: OmpDirectiveName -> llvm::omp::Directive = master taskloop simd !CHECK: !$omp master taskloop simd - !$omp master taskloop simd + !$omp master taskloop simd do i=1,10 j = j + 1 end do @@ -35,7 +35,7 @@ subroutine test_master_taskloop do i=1,10 j = j + 1 end do - !$omp end master taskloop + !$omp end master taskloop end subroutine subroutine test_parallel_master @@ -53,7 +53,7 @@ subroutine test_parallel_master_taskloop_simd !PARSE-TREE: OmpBeginLoopDirective !PARSE-TREE-NEXT: OmpDirectiveName -> llvm::omp::Directive = parallel master taskloop simd !CHECK: !$omp parallel master taskloop simd - !$omp parallel master taskloop simd + !$omp parallel master taskloop simd do i=1,10 j = j + 1 end do @@ -69,5 +69,5 @@ subroutine test_parallel_master_taskloop do i=1,10 j = j + 1 end do - !$omp end parallel master taskloop + !$omp end parallel master taskloop end subroutine diff --git a/flang/test/Parser/acc-data-statement.f90 b/flang/test/Parser/acc-data-statement.f90 index 40c76b2561b24..c0b66d4a14337 100644 --- a/flang/test/Parser/acc-data-statement.f90 +++ b/flang/test/Parser/acc-data-statement.f90 @@ -39,7 +39,7 @@ program acc_data_test print *, "After nested data" !$acc end data - ! Negative tests + ! Negative tests ! Basic data construct in program body !$acc data copy(a, b) create(d) bogus() !CHECK: acc-data-statement.f90: @@ -67,7 +67,7 @@ program acc_data_test !CHECK: acc-data-statement.f90: !CHECK-SAME: error: expected OpenACC end block directive !CHECK-NEXT: end if - !CHECK-NEXT: ^ + !CHECK-NEXT: ^ !CHECK-NEXT: in the context: OpenACC construct !CHECK-NEXT: !$acc data copyout(a) !CHECK-NEXT: ^ @@ -85,7 +85,7 @@ program acc_data_test !CHECK: acc-data-statement.f90: !CHECK-SAME: error: expected OpenACC end block directive !CHECK-NEXT: end do - !CHECK-NEXT: ^ + !CHECK-NEXT: ^ !CHECK-NEXT: in the context: OpenACC construct !CHECK-NEXT: !$acc data present(a) !CHECK-NEXT: ^ @@ -137,7 +137,7 @@ program acc_data_test contains subroutine positive_process_array(x) integer, intent(inout) :: x(:) - + ! Data construct in subroutine !$acc data copy(x) x = x + 1 @@ -148,17 +148,17 @@ subroutine positive_process_array(x) function positive_compute_sum(x) result(total) integer, intent(in) :: x(:) integer :: total - + ! Data construct in function !$acc data copyin(x) copy(total) total = sum(x) !$acc end data print *, "Function finished" end function - + subroutine negative_process_array(x) integer, intent(inout) :: x(:) - + ! Data construct in subroutine !$acc data copy(x) x = x + 1 @@ -188,7 +188,7 @@ function negative_compute_sum(x) result(total) !CHECK: acc-data-statement.f90: !CHECK-SAME: error: expected OpenACC end block directive !CHECK-NEXT: end function - !CHECK-NEXT: ^ + !CHECK-NEXT: ^ !CHECK-NEXT: in the context: OpenACC construct !CHECK-NEXT: !$acc data copyin(x) copy(total) !CHECK-NEXT: ^ diff --git a/flang/test/Parser/assume-aligned.f90 b/flang/test/Parser/assume-aligned.f90 index c61c10d61d72f..3d2c358b335d6 100644 --- a/flang/test/Parser/assume-aligned.f90 +++ b/flang/test/Parser/assume-aligned.f90 @@ -8,13 +8,13 @@ SUBROUTINE aa(a, nn) !DIR$ assume_aligned a:16 !CHECK: !DIR$ ASSUME_ALIGNED a:16 !DIR$ assume_aligned a (1):16 -!CHECK: !DIR$ ASSUME_ALIGNED a(1):16 +!CHECK: !DIR$ ASSUME_ALIGNED a(1):16 !DIR$ assume_aligned a(1):16 !CHECK: !DIR$ ASSUME_ALIGNED a(1):16 !DIR$ assume_aligned a(nn):16 -!CHECK: !DIR$ ASSUME_ALIGNED a(nn):16 +!CHECK: !DIR$ ASSUME_ALIGNED a(nn):16 !DIR$ assume_aligned a(44):16 -!CHECK: !DIR$ ASSUME_ALIGNED a(44):16 +!CHECK: !DIR$ ASSUME_ALIGNED a(44):16 DO i=1,nn a(i)=a(i)+1.5 END DO @@ -31,22 +31,22 @@ END SUBROUTINE bb SUBROUTINE f(n) IMPLICIT NONE - TYPE node + TYPE node REAL(KIND=8), POINTER :: a(:,:) - END TYPE NODE - + END TYPE NODE + TYPE(NODE), POINTER :: nodes INTEGER :: i INTEGER, INTENT(IN) :: n - ALLOCATE(nodes) + ALLOCATE(nodes) ALLOCATE(nodes%a(1000,1000)) - !DIR$ ASSUME_ALIGNED nodes%a(1,1) : 16 + !DIR$ ASSUME_ALIGNED nodes%a(1,1) : 16 !CHECK: !DIR$ ASSUME_ALIGNED nodes%a(1,1):16 - DO i=1,n - nodes%a(1,i) = nodes%a(1,i)+1 - END DO + DO i=1,n + nodes%a(1,i) = nodes%a(1,i)+1 + END DO END SUBROUTINE f SUBROUTINE g(a, b) diff --git a/flang/test/Parser/compiler-directives.f90 b/flang/test/Parser/compiler-directives.f90 index ce592692cfc67..77c6b45def9e8 100644 --- a/flang/test/Parser/compiler-directives.f90 +++ b/flang/test/Parser/compiler-directives.f90 @@ -68,7 +68,7 @@ subroutine unroll do i=1,10 enddo !dir$ nounroll - ! CHECK: !DIR$ NOUNROLL + ! CHECK: !DIR$ NOUNROLL do i=1,10 enddo end subroutine @@ -83,7 +83,7 @@ subroutine unroll_and_jam do i=1,10 enddo !dir$ nounroll_and_jam - ! CHECK: !DIR$ NOUNROLL_AND_JAM + ! CHECK: !DIR$ NOUNROLL_AND_JAM do i=1,10 enddo end subroutine @@ -97,16 +97,16 @@ subroutine no_vector subroutine inline integer :: a - !dir$ forceinline - ! CHECK: !DIR$ FORCEINLINE + !dir$ forceinline + ! CHECK: !DIR$ FORCEINLINE a = f(2) - !dir$ inline - ! CHECK: !DIR$ INLINE + !dir$ inline + ! CHECK: !DIR$ INLINE call g() - !dir$ noinline - ! CHECK: !DIR$ NOINLINE + !dir$ noinline + ! CHECK: !DIR$ NOINLINE call g() contains diff --git a/flang/test/Preprocessing/compiler_defined_macros.F90 b/flang/test/Preprocessing/compiler_defined_macros.F90 index f5f955bbc750e..0b80fa22fcfdc 100644 --- a/flang/test/Preprocessing/compiler_defined_macros.F90 +++ b/flang/test/Preprocessing/compiler_defined_macros.F90 @@ -5,7 +5,7 @@ !CHECK: flang_patchlevel = {{[0-9]+$}} !RUN: %flang -E %s | FileCheck --ignore-case %s - + integer, parameter :: flang_major = __flang_major__ integer, parameter :: flang_minor = __flang_minor__ integer, parameter :: flang_patchlevel = __flang_patchlevel__ diff --git a/flang/test/Preprocessing/pp132.f90 b/flang/test/Preprocessing/pp132.f90 index a0fdf46e7066f..95b43b0091be0 100644 --- a/flang/test/Preprocessing/pp132.f90 +++ b/flang/test/Preprocessing/pp132.f90 @@ -18,6 +18,6 @@ subroutine foo !$acc data copyin(super_very_long_name_for_the_variable, another_super_wordy_variable_to_test) !$acc end data - + !$OMP something something end subroutine foo diff --git a/flang/test/Semantics/Inputs/modfile73-a.f90 b/flang/test/Semantics/Inputs/modfile73-a.f90 index 45a93f6c1b097..ea247c98cdff8 100644 --- a/flang/test/Semantics/Inputs/modfile73-a.f90 +++ b/flang/test/Semantics/Inputs/modfile73-a.f90 @@ -1,197 +1,197 @@ MODULE modfile73a PUBLIC re_alloc, defaults -integersp +integersp integerselected_real_kind0 integer:: i8b = selected_int_kind(8) interface subroutine alloc_error_report_interf(str,code) - end + end subroutine alloc_memory_event_interf(bytes,name) - end + end end interface -procedure()alloc_error_report -procedure()alloc_memory_event +procedure()alloc_error_report +procedure()alloc_memory_event interface de_alloc end interface - charactercharacter, DEFAULT_ROUTINE + charactercharacter, DEFAULT_ROUTINE type allocDefaults logical copy logical shrink integer imin characterroutine - end type + end type type(allocDefaults)DEFAULT integer IERR logical ASSOCIATED_ARRAY, NEEDS_ALLOC, NEEDS_COPY, NEEDS_DEALLOC CONTAINS subroutine set_alloc_event_handler(func) - end + end subroutine set_alloc_error_handler(func) - end + end subroutine dummy_alloc_memory_event(bytes,name) - end + end subroutine dummy_alloc_error_report(name,code) - end + end SUBROUTINE alloc_default( old, new, restore, routine, copy, shrink, imin ) -END +END SUBROUTINE realloc_i1( array, i1min, i1max, name, routine, copy, shrink ) -END +END SUBROUTINE realloc_i2( array, i1min,i1max, i2min,i2max, name, routine, copy, shrink ) -END +END SUBROUTINE realloc_i3( array, i1min,i1max, i2min,i2max, i3min,i3max, name, routine, copy, shrink ) -END +END SUBROUTINE realloc_i4( array, i1min,i1max, i2min,i2max, i3min,i3max, i4min,i4max, name, routine, copy, shrink ) -END +END SUBROUTINE realloc_i5( array, i1min,i1max, i2min,i2max, i3min,i3max, i4min, i4max, i5min, i5max, name, routine, copy, shrink ) -END +END SUBROUTINE realloc_E1( array, i1min, i1max, name, routine, copy, shrink ) -END +END SUBROUTINE realloc_r1( array, i1min, i1max, name, routine, copy, shrink ) -END +END SUBROUTINE realloc_r2( array, i1min,i1max, i2min,i2max, name, routine, copy, shrink ) -END +END SUBROUTINE realloc_r3( array, i1min,i1max, i2min,i2max, i3min,i3max, name, routine, copy, shrink ) -END +END SUBROUTINE realloc_r4( array, i1min,i1max, i2min,i2max, i3min,i3max, i4min,i4max, name, routine, copy, shrink ) -END +END SUBROUTINE realloc_r5( array, i1min,i1max, i2min,i2max, i3min,i3max, i4min, i4max, i5min, i5max, name, routine, copy, shrink ) -END +END SUBROUTINE realloc_d1( array, i1min, i1max, name, routine, copy, shrink ) -END +END SUBROUTINE realloc_d2( array, i1min,i1max, i2min,i2max, name, routine, copy, shrink ) -END +END SUBROUTINE realloc_d3( array, i1min,i1max, i2min,i2max, i3min,i3max, name, routine, copy, shrink ) -END +END SUBROUTINE realloc_d4( array, i1min,i1max, i2min,i2max, i3min,i3max, i4min,i4max, name, routine, copy, shrink ) -END +END SUBROUTINE realloc_d5( array, i1min,i1max, i2min,i2max, i3min,i3max, i4min,i4max, i5min,i5max, name, routine, copy, shrink ) -END +END SUBROUTINE realloc_c1( array, i1min, i1max, name, routine, copy, shrink ) -END +END SUBROUTINE realloc_c2( array, i1min,i1max, i2min,i2max, name, routine, copy, shrink ) -END +END SUBROUTINE realloc_c3( array, i1min,i1max, i2min,i2max, i3min,i3max, name, routine, copy, shrink ) -END +END SUBROUTINE realloc_c4( array, i1min,i1max, i2min,i2max, i3min,i3max, i4min,i4max, name, routine, copy, shrink ) -END +END SUBROUTINE realloc_c5( array, i1min,i1max, i2min,i2max, i3min,i3max, i4min, i4max, i5min, i5max, name, routine, copy, shrink ) -END +END SUBROUTINE realloc_z1( array, i1min, i1max, name, routine, copy, shrink ) -END +END SUBROUTINE realloc_z2( array, i1min,i1max, i2min,i2max, name, routine, copy, shrink ) -END +END SUBROUTINE realloc_z3( array, i1min,i1max, i2min,i2max, i3min,i3max, name, routine, copy, shrink ) -END +END SUBROUTINE realloc_z4( array, i1min,i1max, i2min,i2max, i3min,i3max, i4min,i4max, name, routine, copy, shrink ) -END +END SUBROUTINE realloc_z5( array, i1min,i1max, i2min,i2max, i3min,i3max, i4min, i4max, i5min, i5max, name, routine, copy, shrink ) -END +END SUBROUTINE realloc_l1( array, i1min,i1max, name, routine, copy, shrink ) -END +END SUBROUTINE realloc_l2( array, i1min,i1max, i2min,i2max, name, routine, copy, shrink ) -END +END SUBROUTINE realloc_l3( array, i1min,i1max, i2min,i2max, i3min,i3max, name, routine, copy, shrink ) -END +END SUBROUTINE realloc_l4( array, i1min,i1max, i2min,i2max, i3min,i3max, i4min,i4max, name, routine, copy, shrink ) -END +END SUBROUTINE realloc_l5( array, i1min,i1max, i2min,i2max, i3min,i3max, i4min, i4max, i5min, i5max, name, routine, copy, shrink ) -END +END SUBROUTINE realloc_i1s( array, i1max, name, routine, copy, shrink ) -END +END SUBROUTINE realloc_i2s( array, i1max, i2max, name, routine, copy, shrink ) -END +END SUBROUTINE realloc_i3s( array, i1max, i2max, i3max, name, routine, copy, shrink ) -END +END SUBROUTINE realloc_r1s( array, i1max, name, routine, copy, shrink ) -END +END SUBROUTINE realloc_r2s( array, i1max, i2max, name, routine, copy, shrink ) -END +END SUBROUTINE realloc_r3s( array, i1max, i2max, i3max, name, routine, copy, shrink ) -END +END SUBROUTINE realloc_r4s( array, i1max, i2max, i3max, i4max, name, routine, copy, shrink ) -END +END SUBROUTINE realloc_d1s( array, i1max, name, routine, copy, shrink ) -END +END SUBROUTINE realloc_d3s( array, i1max, i2max, i3max, name, routine, copy, shrink ) -END +END SUBROUTINE realloc_d4s( array, i1max, i2max, i3max, i4max, name, routine, copy, shrink ) -END +END SUBROUTINE realloc_l1s( array, i1max, name, routine, copy, shrink ) -END +END SUBROUTINE realloc_l2s( array, i1max, i2max, name, routine, copy, shrink ) -END +END SUBROUTINE realloc_l3s( array, i1max, i2max, i3max, name, routine, copy, shrink ) -END +END SUBROUTINE realloc_s1( array, i1min, i1max, name, routine, copy, shrink ) -END +END SUBROUTINE dealloc_i1( array, name, routine ) -END +END SUBROUTINE dealloc_i2( array, name, routine ) -END +END SUBROUTINE dealloc_i3( array, name, routine ) -END +END SUBROUTINE dealloc_i4( array, name, routine ) - END + END SUBROUTINE dealloc_i5( array, name, routine ) - END + END SUBROUTINE dealloc_E1( array, name, routine ) -END +END SUBROUTINE dealloc_r1( array, name, routine ) -END +END SUBROUTINE dealloc_r2( array, name, routine ) -END +END SUBROUTINE dealloc_r3( array, name, routine ) -END +END SUBROUTINE dealloc_r4( array, name, routine ) -END +END SUBROUTINE dealloc_r5( array, name, routine ) -END +END SUBROUTINE dealloc_d1( array, name, routine ) -END +END SUBROUTINE dealloc_d2( array, name, routine ) -END +END SUBROUTINE dealloc_d3( array, name, routine ) -END +END SUBROUTINE dealloc_d4( array, name, routine ) -END +END SUBROUTINE dealloc_d5( array, name, routine ) -END +END SUBROUTINE dealloc_c1( array, name, routine ) -END +END SUBROUTINE dealloc_c2( array, name, routine ) -END +END SUBROUTINE dealloc_c3( array, name, routine ) -END +END SUBROUTINE dealloc_c4( array, name, routine ) -END +END SUBROUTINE dealloc_c5( array, name, routine ) - END + END SUBROUTINE dealloc_z1( array, name, routine ) -END +END SUBROUTINE dealloc_z2( array, name, routine ) -END +END SUBROUTINE dealloc_z3( array, name, routine ) -END +END SUBROUTINE dealloc_z4( array, name, routine ) -END +END SUBROUTINE dealloc_z5( array, name, routine ) - END + END SUBROUTINE dealloc_l1( array, name, routine ) -END +END SUBROUTINE dealloc_l2( array, name, routine ) -END +END SUBROUTINE dealloc_l3( array, name, routine ) -END +END SUBROUTINE dealloc_l4( array, name, routine ) - END + END SUBROUTINE dealloc_l5( array, name, routine ) - END + END SUBROUTINE dealloc_s1( array, name, routine ) -END +END SUBROUTINE options( final_bounds, common_bounds, old_bounds, new_bounds, copy, shrink ) -END +END SUBROUTINE alloc_err( ierr, name, routine, bounds ) -END +END SUBROUTINE alloc_count( delta_size, type, name, routine ) -END +END END diff --git a/flang/test/Semantics/Inputs/modfile73-b.f90 b/flang/test/Semantics/Inputs/modfile73-b.f90 index 3b9c72ab507b9..743299599c7bd 100644 --- a/flang/test/Semantics/Inputs/modfile73-b.f90 +++ b/flang/test/Semantics/Inputs/modfile73-b.f90 @@ -2,9 +2,9 @@ module modfile73ba use modfile73a, only: re_alloc, de_alloc charactermod_name type lData1D - integer refCount - character id - character name + integer refCount + character id + character name end type type TYPE_NAME type(lData1D), pointer :: data => null() @@ -17,37 +17,37 @@ module modfile73ba end interface CONTAINS subroutine init_(this) - end + end subroutine delete_(this) - end + end subroutine assign_(this, other) - end + end function initialized_(thisinit) - end + end function same_(this1,this2same) - end + end function refcount_(thiscount) - end + end function id_(thisstr) - end + end function name_(this) result(str) type(TYPE_NAME) this character(len_trim(this%data%name)) str - end + end subroutine tag_new_object(this) - end + end subroutine delete_Data(a1d_data) - end -end + end +end module modfile73bb use modfile73a, only: re_alloc, de_alloc charactermod_name type lData1D - integer refCount - character id - character name -logical, pointer :: val => null() + integer refCount + character id + character name +logical, pointer :: val => null() end type TYPE_NAME type(lData1D), pointer :: data => null() @@ -63,27 +63,27 @@ module modfile73bb end interface interface initialized subroutine die(str) - end + end end interface CONTAINS subroutine init_(this) - end + end subroutine delete_(this) - end + end subroutine assign_(this, other) - end + end function initialized_(thisinit) - end + end function same_(this1,this2same) - end + end function refcount_(thiscount) - end + end function id_(thisstr) - end + end function name_(thisstr) - end + end subroutine tag_new_object(this) - end + end subroutine delete_Data(a1d_data) - end + end end diff --git a/flang/test/Semantics/Inputs/modfile73-c.f90 b/flang/test/Semantics/Inputs/modfile73-c.f90 index abf76445d4619..8d4f2d1770362 100644 --- a/flang/test/Semantics/Inputs/modfile73-c.f90 +++ b/flang/test/Semantics/Inputs/modfile73-c.f90 @@ -1,4 +1,4 @@ module modfile73c type OrbitalDistribution_ - end type - end + end type + end