Skip to content

Commit ba98668

Browse files
authored
[flang][NFC] Strip trailing whitespace from tests (8 of N)
Only some fortran source files in flang/test/Lower have been modified. The other files in the directory will be cleaned up in subsequent commits
1 parent adf4c1d commit ba98668

25 files changed

+70
-70
lines changed

flang/test/Lower/identical-block-merge-disable.f90

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -6,7 +6,7 @@ MODULE DMUMPS_SOL_LR
66
IMPLICIT NONE
77

88
TYPE BLR_STRUC_T
9-
INTEGER, DIMENSION(:), POINTER :: PANELS_L
9+
INTEGER, DIMENSION(:), POINTER :: PANELS_L
1010
INTEGER, DIMENSION(:), POINTER :: PANELS_U
1111
INTEGER, DIMENSION(:), POINTER :: BEGS_BLR_STATIC
1212
END TYPE BLR_STRUC_T
@@ -32,7 +32,7 @@ SUBROUTINE DMUMPS_SOL_FWD_LR_SU( IWHDLR, MTYPE )
3232
ENDIF
3333
ENDIF
3434

35-
END SUBROUTINE DMUMPS_SOL_FWD_LR_SU
35+
END SUBROUTINE DMUMPS_SOL_FWD_LR_SU
3636

3737
END MODULE DMUMPS_SOL_LR
3838

flang/test/Lower/implicit-interface.f90

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -22,7 +22,7 @@ subroutine test_passing_char_array
2222
! CHECK-DAG: %[[c3:.*]] = arith.constant 3 : index
2323
! CHECK-DAG: %[[xbuff:.*]] = fir.convert %[[xarray]] : (!fir.ref<!fir.array<4x!fir.char<1,3>>>) -> !fir.ref<!fir.char<1,?>>
2424
! CHECK: %[[boxchar:.*]] = fir.emboxchar %[[xbuff]], %[[c3]] : (!fir.ref<!fir.char<1,?>>, index) -> !fir.boxchar<1>
25-
! CHECK: fir.call @_QPsub_taking_a_char_array(%[[boxchar]]) {{.*}}: (!fir.boxchar<1>) -> ()
25+
! CHECK: fir.call @_QPsub_taking_a_char_array(%[[boxchar]]) {{.*}}: (!fir.boxchar<1>) -> ()
2626
end subroutine
2727

2828
! TODO more implicit interface cases with/without explicit interface

flang/test/Lower/inline_directive.f90

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -11,7 +11,7 @@ subroutine test_inline()
1111
y = g(x)
1212
!CHECK: %[[VAL_4:.*]] = fir.call @_QFtest_inlinePg(%[[VAL_1]]) fastmath<contract> {inline_attr = #fir.inline_attrs<always_inline>} : (!fir.ref<i32>) -> i32
1313
!CHECK: fir.store %[[VAL_4]] to %[[VAL_3]] : !fir.ref<i32>
14-
14+
1515
!dir$ forceinline
1616
call f(x, y)
1717
!CHECK: fir.call @_QFtest_inlinePf(%[[VAL_1]], %[[VAL_3]]) fastmath<contract> {inline_attr = #fir.inline_attrs<always_inline>} : (!fir.ref<i32>, !fir.ref<i32>) -> ()

flang/test/Lower/io-statement-1.f90

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -19,7 +19,7 @@
1919
! CHECK: call {{.*}}BeginFlush
2020
! CHECK: call {{.*}}EndIoStatement
2121
flush(8)
22-
22+
2323
! CHECK: call {{.*}}BeginRewind
2424
! CHECK: call {{.*}}EndIoStatement
2525
rewind(8)

flang/test/Lower/io-write.f90

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -1,6 +1,6 @@
11
! RUN: bbc -emit-fir -hlfir=false %s -o - | FileCheck %s
22

3-
! Test that IO item calls stackrestore in the right place
3+
! Test that IO item calls stackrestore in the right place
44

55
! CHECK-LABEL: func.func @_QQmain() {
66
character(3) string

flang/test/Lower/location.f90

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -3,7 +3,7 @@
33
program test
44
include 'location0.inc'
55

6-
end
6+
end
77

88
! CHECK-LABEL: func.func @_QQmain() attributes {fir.bindc_name = "TEST"} {
99
! CHECK: fir.call @_FortranAioOutputAscii(%{{.*}}, %{{.*}}, %{{.*}}) fastmath<contract> : (!fir.ref<i8>, !fir.ref<i8>, i64) -> i1 loc(fused<#fir<loc_kind_array[ base, inclusion, inclusion]>>["{{.*}}location1.inc":1:10, "{{.*}}location0.inc":1:1, "{{.*}}location.f90":4:1])

flang/test/Lower/module_definition.f90

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -36,7 +36,7 @@ module m1
3636
! file.
3737
module modEq1
3838
! Equivalence, no initialization
39-
real :: x1(10), x2(10), x3(10)
39+
real :: x1(10), x2(10), x3(10)
4040
! Equivalence with initialization
4141
real :: y1 = 42.
4242
real :: y2(10)

flang/test/Lower/module_use.f90

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -36,7 +36,7 @@ real function modCommon1Use()
3636
! CHECK-DAG: fir.address_of(@named2_) : !fir.ref<!fir.array<4xi8>>
3737
! CHECK-DAG: fir.address_of(@__BLNK__) : !fir.ref<!fir.array<4xi8>>
3838
! CHECK-DAG: fir.address_of(@named1_) : !fir.ref<!fir.array<4xi8>>
39-
modCommon1Use = x_blank + x_named1 + i_named2
39+
modCommon1Use = x_blank + x_named1 + i_named2
4040
end function
4141

4242

flang/test/Lower/module_use_in_same_file.f90

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -35,7 +35,7 @@ real function m2use_rename()
3535
! Module modEq2 defines data that is equivalenced
3636
module modEq2
3737
! Equivalence, no initialization
38-
real :: x1(10), x2(10), x3(10)
38+
real :: x1(10), x2(10), x3(10)
3939
! Equivalence with initialization
4040
real :: y1 = 42.
4141
real :: y2(10)
@@ -109,7 +109,7 @@ real function test_no_equiv_conflicts()
109109
use modEq2
110110
! Same equivalences as in modEq2. Test that lowering does not mixes
111111
! up the equivalence based on the similar offset inside the scope.
112-
real :: x1l(10), x2l(10), x3l(10)
112+
real :: x1l(10), x2l(10), x3l(10)
113113
real :: y1l = 42.
114114
real :: y2l(10)
115115
save :: x1l, x2l, x3l, y1l, y2l

flang/test/Lower/namelist-common-block.f90

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -8,7 +8,7 @@ program nml_common
88
real, pointer :: p(:)
99
namelist /t/i,p
1010
common /c/i,p
11-
11+
1212
allocate(p(2))
1313
call print_t()
1414
contains

0 commit comments

Comments
 (0)