Skip to content

Commit e9de46b

Browse files
Fix other spelling errors
1 parent a5e610f commit e9de46b

16 files changed

+16
-16
lines changed

SRC/cgesvdq.f

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -640,7 +640,7 @@ SUBROUTINE CGESVDQ( JOBA, JOBP, JOBR, JOBU, JOBV, M, N, A, LDA,
640640
IF ( WNTVA ) THEN
641641
* .. minimal workspace length for N x N/2 CGEQRF
642642
LWQRF = MAX( N/2, 1 )
643-
* .. minimal workspace lengthfor N/2 x N/2 CGESVD
643+
* .. minimal workspace length for N/2 x N/2 CGESVD
644644
LWSVD2 = MAX( 3 * (N/2), 1 )
645645
LWUNQ2 = MAX( N, 1 )
646646
MINWRK2 = MAX( LWQP3, N/2+LWQRF, N/2+LWSVD2,

SRC/dgesvdq.f

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -641,7 +641,7 @@ SUBROUTINE DGESVDQ( JOBA, JOBP, JOBR, JOBU, JOBV, M, N, A, LDA,
641641
IF ( WNTVA ) THEN
642642
* .. minimal workspace length for N x N/2 DGEQRF
643643
LWQRF = MAX( N/2, 1 )
644-
* .. minimal workspace lengthfor N/2 x N/2 DGESVD
644+
* .. minimal workspace length for N/2 x N/2 DGESVD
645645
LWSVD2 = MAX( 5 * (N/2), 1 )
646646
LWORQ2 = MAX( N, 1 )
647647
MINWRK2 = MAX( LWQP3, N/2+LWQRF, N/2+LWSVD2,

SRC/sgesvdq.f

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -644,7 +644,7 @@ SUBROUTINE SGESVDQ( JOBA, JOBP, JOBR, JOBU, JOBV, M, N, A, LDA,
644644
IF ( WNTVA ) THEN
645645
* .. minimal workspace length for N x N/2 SGEQRF
646646
LWQRF = MAX( N/2, 1 )
647-
* .. minimal workspace lengthfor N/2 x N/2 SGESVD
647+
* .. minimal workspace length for N/2 x N/2 SGESVD
648648
LWSVD2 = MAX( 5 * (N/2), 1 )
649649
LWORQ2 = MAX( N, 1 )
650650
MINWRK2 = MAX( LWQP3, N/2+LWQRF, N/2+LWSVD2,

SRC/zgesvdq.f

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -638,7 +638,7 @@ SUBROUTINE ZGESVDQ( JOBA, JOBP, JOBR, JOBU, JOBV, M, N, A, LDA,
638638
IF ( WNTVA ) THEN
639639
* .. minimal workspace length for N x N/2 ZGEQRF
640640
LWQRF = MAX( N/2, 1 )
641-
* .. minimal workspace lengthfor N/2 x N/2 ZGESVD
641+
* .. minimal workspace length for N/2 x N/2 ZGESVD
642642
LWSVD2 = MAX( 3 * (N/2), 1 )
643643
LWUNQ2 = MAX( N, 1 )
644644
MINWRK2 = MAX( LWQP3, N/2+LWQRF, N/2+LWSVD2,

TESTING/LIN/cchkhe_rk.f

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -493,7 +493,7 @@ SUBROUTINE CCHKHE_RK( DOTYPE, NN, NVAL, NNB, NBVAL, NNS, NSVAL,
493493
CALL CLACPY( UPLO, N, N, AFAC, LDA, AINV, LDA )
494494
SRNAMT = 'CHETRI_3'
495495
*
496-
* Another reason that we need to compute the invesrse
496+
* Another reason that we need to compute the inverse
497497
* is that CPOT03 produces RCONDC which is used later
498498
* in TEST6 and TEST7.
499499
*

TESTING/LIN/cchksy_rk.f

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -505,7 +505,7 @@ SUBROUTINE CCHKSY_RK( DOTYPE, NN, NVAL, NNB, NBVAL, NNS, NSVAL,
505505
CALL CLACPY( UPLO, N, N, AFAC, LDA, AINV, LDA )
506506
SRNAMT = 'CSYTRI_3'
507507
*
508-
* Another reason that we need to compute the invesrse
508+
* Another reason that we need to compute the inverse
509509
* is that CSYT03 produces RCONDC which is used later
510510
* in TEST6 and TEST7.
511511
*

TESTING/LIN/cdrvhe_rk.f

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -414,7 +414,7 @@ SUBROUTINE CDRVHE_RK( DOTYPE, NN, NVAL, NRHS, THRESH, TSTERR,
414414
CALL CLACPY( UPLO, N, N, AFAC, LDA, AINV, LDA )
415415
LWORK = (N+NB+1)*(NB+3)
416416
*
417-
* We need to compute the invesrse to compute
417+
* We need to compute the inverse to compute
418418
* RCONDC that is used later in TEST3.
419419
*
420420
CALL CSYTRI_3( UPLO, N, AINV, LDA, E, IWORK,

TESTING/LIN/cdrvsy_rk.f

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -423,7 +423,7 @@ SUBROUTINE CDRVSY_RK( DOTYPE, NN, NVAL, NRHS, THRESH, TSTERR,
423423
CALL CLACPY( UPLO, N, N, AFAC, LDA, AINV, LDA )
424424
LWORK = (N+NB+1)*(NB+3)
425425
*
426-
* We need to compute the invesrse to compute
426+
* We need to compute the inverse to compute
427427
* RCONDC that is used later in TEST3.
428428
*
429429
CALL CSYTRI_3( UPLO, N, AINV, LDA, E, IWORK,

TESTING/LIN/dchksy_rk.f

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -486,7 +486,7 @@ SUBROUTINE DCHKSY_RK( DOTYPE, NN, NVAL, NNB, NBVAL, NNS, NSVAL,
486486
CALL DLACPY( UPLO, N, N, AFAC, LDA, AINV, LDA )
487487
SRNAMT = 'DSYTRI_3'
488488
*
489-
* Another reason that we need to compute the invesrse
489+
* Another reason that we need to compute the inverse
490490
* is that DPOT03 produces RCONDC which is used later
491491
* in TEST6 and TEST7.
492492
*

TESTING/LIN/ddrvsy_rk.f

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -411,7 +411,7 @@ SUBROUTINE DDRVSY_RK( DOTYPE, NN, NVAL, NRHS, THRESH, TSTERR,
411411
CALL DLACPY( UPLO, N, N, AFAC, LDA, AINV, LDA )
412412
LWORK = (N+NB+1)*(NB+3)
413413
*
414-
* We need to compute the invesrse to compute
414+
* We need to compute the inverse to compute
415415
* RCONDC that is used later in TEST3.
416416
*
417417
CALL DSYTRI_3( UPLO, N, AINV, LDA, E, IWORK,

0 commit comments

Comments
 (0)