Skip to content

Commit f916d84

Browse files
authored
Merge pull request #321 from luzpaz/misc-typos
Misc. Typos
2 parents 6d7a68a + b85ebc2 commit f916d84

File tree

13 files changed

+21
-21
lines changed

13 files changed

+21
-21
lines changed

SRC/cgesvdq.f

Lines changed: 3 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -354,7 +354,7 @@
354354
*> 1. The data movement (matrix transpose) is coded using simple nested
355355
*> DO-loops because BLAS and LAPACK do not provide corresponding subroutines.
356356
*> Those DO-loops are easily identified in this source code - by the CONTINUE
357-
*> statements labeled wit 11**. In an optimized version of this code, the
357+
*> statements labeled with 11**. In an optimized version of this code, the
358358
*> nested DO loops should be replaced with calls to an optimized subroutine.
359359
*> 2. This code scales A by 1/SQRT(M) if the largest ABS(A(i,j)) could cause
360360
*> column norm overflow. This is the minial precaution and it is left to the
@@ -390,7 +390,7 @@
390390
*
391391
*> \par Contributors:
392392
* ==================
393-
*>
393+
*>
394394
*> \verbatim
395395
*> Developed and coded by Zlatko Drmac, Department of Mathematics
396396
*> University of Zagreb, Croatia, drmac@math.hr
@@ -953,7 +953,7 @@ SUBROUTINE CGESVDQ( JOBA, JOBP, JOBR, JOBU, JOBV, M, N, A, LDA,
953953
$ CALL CLASET( 'L', NR-1,NR-1, CZERO,CZERO, A(2,1), LDA )
954954
CALL CGESVD( 'N', 'N', NR, N, A, LDA, S, U, LDU,
955955
$ V, LDV, CWORK, LCWORK, RWORK, INFO )
956-
*
956+
*
957957
END IF
958958
*
959959
ELSE IF ( LSVEC .AND. ( .NOT. RSVEC) ) THEN

SRC/clahqr.f

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -153,7 +153,7 @@
153153
*>
154154
*> If INFO > 0 and WANTT is .TRUE., then on exit
155155
*> (*) (initial value of H)*U = U*(final value of H)
156-
*> where U is an orthognal matrix. The final
156+
*> where U is an orthogonal matrix. The final
157157
*> value of H is upper Hessenberg and triangular in
158158
*> rows and columns INFO+1 through IHI.
159159
*>

SRC/ctgsy2.f

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -67,7 +67,7 @@
6767
*> R * B**H + L * E**H = scale * -F
6868
*>
6969
*> This case is used to compute an estimate of Dif[(A, D), (B, E)] =
70-
*> = sigma_min(Z) using reverse communicaton with CLACON.
70+
*> = sigma_min(Z) using reverse communication with CLACON.
7171
*>
7272
*> CTGSY2 also (IJOB >= 1) contributes to the computation in CTGSYL
7373
*> of an upper bound on the separation between to matrix pairs. Then

SRC/dgesvdq.f

Lines changed: 3 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -356,7 +356,7 @@
356356
*> 1. The data movement (matrix transpose) is coded using simple nested
357357
*> DO-loops because BLAS and LAPACK do not provide corresponding subroutines.
358358
*> Those DO-loops are easily identified in this source code - by the CONTINUE
359-
*> statements labeled wit 11**. In an optimized version of this code, the
359+
*> statements labeled with 11**. In an optimized version of this code, the
360360
*> nested DO loops should be replaced with calls to an optimized subroutine.
361361
*> 2. This code scales A by 1/SQRT(M) if the largest ABS(A(i,j)) could cause
362362
*> column norm overflow. This is the minial precaution and it is left to the
@@ -392,7 +392,7 @@
392392
*
393393
*> \par Contributors:
394394
* ==================
395-
*>
395+
*>
396396
*> \verbatim
397397
*> Developed and coded by Zlatko Drmac, Department of Mathematics
398398
*> University of Zagreb, Croatia, drmac@math.hr
@@ -955,7 +955,7 @@ SUBROUTINE DGESVDQ( JOBA, JOBP, JOBR, JOBU, JOBV, M, N, A, LDA,
955955
$ CALL DLASET( 'L', NR-1,NR-1, ZERO,ZERO, A(2,1), LDA )
956956
CALL DGESVD( 'N', 'N', NR, N, A, LDA, S, U, LDU,
957957
$ V, LDV, WORK, LWORK, INFO )
958-
*
958+
*
959959
END IF
960960
*
961961
ELSE IF ( LSVEC .AND. ( .NOT. RSVEC) ) THEN

SRC/dlahqr.f

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -165,7 +165,7 @@
165165
*>
166166
*> If INFO > 0 and WANTT is .TRUE., then on exit
167167
*> (*) (initial value of H)*U = U*(final value of H)
168-
*> where U is an orthognal matrix. The final
168+
*> where U is an orthogonal matrix. The final
169169
*> value of H is upper Hessenberg and triangular in
170170
*> rows and columns INFO+1 through IHI.
171171
*>

SRC/dtgsy2.f

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -71,7 +71,7 @@
7171
*> R * B**T + L * E**T = scale * -F
7272
*>
7373
*> This case is used to compute an estimate of Dif[(A, D), (B, E)] =
74-
*> sigma_min(Z) using reverse communicaton with DLACON.
74+
*> sigma_min(Z) using reverse communication with DLACON.
7575
*>
7676
*> DTGSY2 also (IJOB >= 1) contributes to the computation in DTGSYL
7777
*> of an upper bound on the separation between to matrix pairs. Then

SRC/sgesvdq.f

Lines changed: 3 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -356,7 +356,7 @@
356356
*> 1. The data movement (matrix transpose) is coded using simple nested
357357
*> DO-loops because BLAS and LAPACK do not provide corresponding subroutines.
358358
*> Those DO-loops are easily identified in this source code - by the CONTINUE
359-
*> statements labeled wit 11**. In an optimized version of this code, the
359+
*> statements labeled with 11**. In an optimized version of this code, the
360360
*> nested DO loops should be replaced with calls to an optimized subroutine.
361361
*> 2. This code scales A by 1/SQRT(M) if the largest ABS(A(i,j)) could cause
362362
*> column norm overflow. This is the minial precaution and it is left to the
@@ -392,7 +392,7 @@
392392
*
393393
*> \par Contributors:
394394
* ==================
395-
*>
395+
*>
396396
*> \verbatim
397397
*> Developed and coded by Zlatko Drmac, Department of Mathematics
398398
*> University of Zagreb, Croatia, drmac@math.hr
@@ -958,7 +958,7 @@ SUBROUTINE SGESVDQ( JOBA, JOBP, JOBR, JOBU, JOBV, M, N, A, LDA,
958958
$ CALL SLASET( 'L', NR-1,NR-1, ZERO,ZERO, A(2,1), LDA )
959959
CALL SGESVD( 'N', 'N', NR, N, A, LDA, S, U, LDU,
960960
$ V, LDV, WORK, LWORK, INFO )
961-
*
961+
*
962962
END IF
963963
*
964964
ELSE IF ( LSVEC .AND. ( .NOT. RSVEC) ) THEN

SRC/slahqr.f

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -165,7 +165,7 @@
165165
*>
166166
*> If INFO > 0 and WANTT is .TRUE., then on exit
167167
*> (*) (initial value of H)*U = U*(final value of H)
168-
*> where U is an orthognal matrix. The final
168+
*> where U is an orthogonal matrix. The final
169169
*> value of H is upper Hessenberg and triangular in
170170
*> rows and columns INFO+1 through IHI.
171171
*>

SRC/stgsy2.f

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -71,7 +71,7 @@
7171
*> R * B**T + L * E**T = scale * -F
7272
*>
7373
*> This case is used to compute an estimate of Dif[(A, D), (B, E)] =
74-
*> sigma_min(Z) using reverse communicaton with SLACON.
74+
*> sigma_min(Z) using reverse communication with SLACON.
7575
*>
7676
*> STGSY2 also (IJOB >= 1) contributes to the computation in STGSYL
7777
*> of an upper bound on the separation between to matrix pairs. Then

SRC/zgesvdq.f

Lines changed: 3 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -354,7 +354,7 @@
354354
*> 1. The data movement (matrix transpose) is coded using simple nested
355355
*> DO-loops because BLAS and LAPACK do not provide corresponding subroutines.
356356
*> Those DO-loops are easily identified in this source code - by the CONTINUE
357-
*> statements labeled wit 11**. In an optimized version of this code, the
357+
*> statements labeled with 11**. In an optimized version of this code, the
358358
*> nested DO loops should be replaced with calls to an optimized subroutine.
359359
*> 2. This code scales A by 1/SQRT(M) if the largest ABS(A(i,j)) could cause
360360
*> column norm overflow. This is the minial precaution and it is left to the
@@ -390,7 +390,7 @@
390390
*
391391
*> \par Contributors:
392392
* ==================
393-
*>
393+
*>
394394
*> \verbatim
395395
*> Developed and coded by Zlatko Drmac, Department of Mathematics
396396
*> University of Zagreb, Croatia, drmac@math.hr
@@ -951,7 +951,7 @@ SUBROUTINE ZGESVDQ( JOBA, JOBP, JOBR, JOBU, JOBV, M, N, A, LDA,
951951
$ CALL ZLASET( 'L', NR-1,NR-1, CZERO,CZERO, A(2,1), LDA )
952952
CALL ZGESVD( 'N', 'N', NR, N, A, LDA, S, U, LDU,
953953
$ V, LDV, CWORK, LCWORK, RWORK, INFO )
954-
*
954+
*
955955
END IF
956956
*
957957
ELSE IF ( LSVEC .AND. ( .NOT. RSVEC) ) THEN

0 commit comments

Comments
 (0)