Skip to content

Commit 9e647a9

Browse files
authored
Merge pull request #582 from jip/fix
Fix some typos in comments
2 parents d834dfc + 2eeed4b commit 9e647a9

File tree

12 files changed

+111
-130
lines changed

12 files changed

+111
-130
lines changed

TESTING/LIN/ctbt02.f

Lines changed: 7 additions & 9 deletions
Original file line numberDiff line numberDiff line change
@@ -29,13 +29,11 @@
2929
*> \verbatim
3030
*>
3131
*> CTBT02 computes the residual for the computed solution to a
32-
*> triangular system of linear equations A*x = b, A**T *x = b, or
33-
*> A**H *x = b when A is a triangular band matrix. Here A**T denotes
34-
*> the transpose of A, A**H denotes the conjugate transpose of A, and
35-
*> x and b are N by NRHS matrices. The test ratio is the maximum over
36-
*> the number of right hand sides of
37-
*> norm(b - op(A)*x) / ( norm(op(A)) * norm(x) * EPS ),
38-
*> where op(A) denotes A, A**T, or A**H, and EPS is the machine epsilon.
32+
*> triangular system of linear equations op(A)*X = B, when A is a
33+
*> triangular band matrix. The test ratio is the maximum over the
34+
*> number of right hand sides of
35+
*> norm(op(A)*X - B) / ( norm(op(A)) * norm(X) * EPS ),
36+
*> where op(A) = A, A**T, or A**H, and EPS is the machine epsilon.
3937
*> \endverbatim
4038
*
4139
* Arguments:
@@ -142,7 +140,7 @@
142140
*> \verbatim
143141
*> RESID is REAL
144142
*> The maximum over the number of right hand sides of
145-
*> norm(B - op(A)*X) / ( norm(op(A)) * norm(X) * EPS ).
143+
*> norm(op(A)*x - b) / ( norm(op(A)) * norm(x) * EPS ).
146144
*> \endverbatim
147145
*
148146
* Authors:
@@ -221,7 +219,7 @@ SUBROUTINE CTBT02( UPLO, TRANS, DIAG, N, KD, NRHS, AB, LDAB, X,
221219
END IF
222220
*
223221
* Compute the maximum over the number of right hand sides of
224-
* norm(B - op(A)*X) / ( norm(op(A)) * norm(X) * EPS ).
222+
* norm(op(A)*x - b) / ( norm(op(A)) * norm(x) * EPS ).
225223
*
226224
RESID = ZERO
227225
DO 10 J = 1, NRHS

TESTING/LIN/ctpt02.f

Lines changed: 10 additions & 13 deletions
Original file line numberDiff line numberDiff line change
@@ -28,14 +28,11 @@
2828
*> \verbatim
2929
*>
3030
*> CTPT02 computes the residual for the computed solution to a
31-
*> triangular system of linear equations A*x = b, A**T *x = b, or
32-
*> A**H *x = b, when the triangular matrix A is stored in packed format.
33-
*> Here A**T denotes the transpose of A, A**H denotes the conjugate
34-
*> transpose of A, and x and b are N by NRHS matrices. The test ratio
35-
*> is the maximum over the number of right hand sides of
31+
*> triangular system of linear equations op(A)*X = B, when the
32+
*> triangular matrix A is stored in packed format. The test ratio is
3633
*> the maximum over the number of right hand sides of
37-
*> norm(b - op(A)*x) / ( norm(op(A)) * norm(x) * EPS ),
38-
*> where op(A) denotes A, A**T, or A**H, and EPS is the machine epsilon.
34+
*> norm(op(A)*X - B) / ( norm(op(A)) * norm(X) * EPS ),
35+
*> where op(A) = A, A**T, or A**H, and EPS is the machine epsilon.
3936
*> \endverbatim
4037
*
4138
* Arguments:
@@ -53,9 +50,9 @@
5350
*> \verbatim
5451
*> TRANS is CHARACTER*1
5552
*> Specifies the operation applied to A.
56-
*> = 'N': A *x = b (No transpose)
57-
*> = 'T': A**T *x = b (Transpose)
58-
*> = 'C': A**H *x = b (Conjugate transpose)
53+
*> = 'N': A * X = B (No transpose)
54+
*> = 'T': A**T * X = B (Transpose)
55+
*> = 'C': A**H * X = B (Conjugate transpose)
5956
*> \endverbatim
6057
*>
6158
*> \param[in] DIAG
@@ -130,7 +127,7 @@
130127
*> \verbatim
131128
*> RESID is REAL
132129
*> The maximum over the number of right hand sides of
133-
*> norm(op(A)*x - b) / ( norm(op(A)) * norm(x) * EPS ).
130+
*> norm(op(A)*B - B) / ( norm(op(A)) * norm(X) * EPS ).
134131
*> \endverbatim
135132
*
136133
* Authors:
@@ -191,7 +188,7 @@ SUBROUTINE CTPT02( UPLO, TRANS, DIAG, N, NRHS, AP, X, LDX, B, LDB,
191188
RETURN
192189
END IF
193190
*
194-
* Compute the 1-norm of A or A**H.
191+
* Compute the 1-norm of op(A).
195192
*
196193
IF( LSAME( TRANS, 'N' ) ) THEN
197194
ANORM = CLANTP( '1', UPLO, DIAG, N, AP, RWORK )
@@ -208,7 +205,7 @@ SUBROUTINE CTPT02( UPLO, TRANS, DIAG, N, NRHS, AP, X, LDX, B, LDB,
208205
END IF
209206
*
210207
* Compute the maximum over the number of right hand sides of
211-
* norm(op(A)*x - b) / ( norm(op(A)) * norm(x) * EPS ).
208+
* norm(op(A)*X - B) / ( norm(op(A)) * norm(X) * EPS ).
212209
*
213210
RESID = ZERO
214211
DO 10 J = 1, NRHS

TESTING/LIN/ctrt02.f

Lines changed: 11 additions & 13 deletions
Original file line numberDiff line numberDiff line change
@@ -29,13 +29,11 @@
2929
*> \verbatim
3030
*>
3131
*> CTRT02 computes the residual for the computed solution to a
32-
*> triangular system of linear equations A*x = b, A**T *x = b,
33-
*> or A**H *x = b. Here A is a triangular matrix, A**T is the transpose
34-
*> of A, A**H is the conjugate transpose of A, and x and b are N by NRHS
35-
*> matrices. The test ratio is the maximum over the number of right
36-
*> hand sides of
37-
*> norm(b - op(A)*x) / ( norm(op(A)) * norm(x) * EPS ),
38-
*> where op(A) denotes A, A**T, or A**H, and EPS is the machine epsilon.
32+
*> triangular system of linear equations op(A)*X = B, where A is a
33+
*> triangular matrix. The test ratio is the maximum over the number of
34+
*> right hand sides of
35+
*> norm(op(A)*X - B) / ( norm(op(A)) * norm(X) * EPS ),
36+
*> where op(A) = A, A**T, or A**H, and EPS is the machine epsilon.
3937
*> \endverbatim
4038
*
4139
* Arguments:
@@ -53,9 +51,9 @@
5351
*> \verbatim
5452
*> TRANS is CHARACTER*1
5553
*> Specifies the operation applied to A.
56-
*> = 'N': A *x = b (No transpose)
57-
*> = 'T': A**T *x = b (Transpose)
58-
*> = 'C': A**H *x = b (Conjugate transpose)
54+
*> = 'N': A * X = B (No transpose)
55+
*> = 'T': A**T * X = B (Transpose)
56+
*> = 'C': A**H * X = B (Conjugate transpose)
5957
*> \endverbatim
6058
*>
6159
*> \param[in] DIAG
@@ -138,7 +136,7 @@
138136
*> \verbatim
139137
*> RESID is REAL
140138
*> The maximum over the number of right hand sides of
141-
*> norm(op(A)*x - b) / ( norm(op(A)) * norm(x) * EPS ).
139+
*> norm(op(A)*X - B) / ( norm(op(A)) * norm(X) * EPS ).
142140
*> \endverbatim
143141
*
144142
* Authors:
@@ -200,7 +198,7 @@ SUBROUTINE CTRT02( UPLO, TRANS, DIAG, N, NRHS, A, LDA, X, LDX, B,
200198
RETURN
201199
END IF
202200
*
203-
* Compute the 1-norm of A or A**H.
201+
* Compute the 1-norm of op(A).
204202
*
205203
IF( LSAME( TRANS, 'N' ) ) THEN
206204
ANORM = CLANTR( '1', UPLO, DIAG, N, N, A, LDA, RWORK )
@@ -217,7 +215,7 @@ SUBROUTINE CTRT02( UPLO, TRANS, DIAG, N, NRHS, A, LDA, X, LDX, B,
217215
END IF
218216
*
219217
* Compute the maximum over the number of right hand sides of
220-
* norm(op(A)*x - b) / ( norm(op(A)) * norm(x) * EPS )
218+
* norm(op(A)*X - B) / ( norm(op(A)) * norm(X) * EPS )
221219
*
222220
RESID = ZERO
223221
DO 10 J = 1, NRHS

TESTING/LIN/dtbt02.f

Lines changed: 7 additions & 8 deletions
Original file line numberDiff line numberDiff line change
@@ -28,12 +28,11 @@
2828
*> \verbatim
2929
*>
3030
*> DTBT02 computes the residual for the computed solution to a
31-
*> triangular system of linear equations A*x = b or A' *x = b when
32-
*> A is a triangular band matrix. Here A' is the transpose of A and
33-
*> x and b are N by NRHS matrices. The test ratio is the maximum over
34-
*> the number of right hand sides of
35-
*> norm(b - op(A)*x) / ( norm(op(A)) * norm(x) * EPS ),
36-
*> where op(A) denotes A or A' and EPS is the machine epsilon.
31+
*> triangular system of linear equations op(A)*X = B, when A is a
32+
*> triangular band matrix. The test ratio is the maximum over the
33+
*> number of right hand sides of
34+
*> norm(op(A)*X - B) / ( norm(op(A)) * norm(X) * EPS ),
35+
*> where op(A) = A, A**T, or A**H and EPS is the machine epsilon.
3736
*> The norm used is the 1-norm.
3837
*> \endverbatim
3938
*
@@ -136,7 +135,7 @@
136135
*> \verbatim
137136
*> RESID is DOUBLE PRECISION
138137
*> The maximum over the number of right hand sides of
139-
*> norm(B - op(A)*X) / ( norm(op(A)) * norm(X) * EPS ).
138+
*> norm(op(A)*x - b) / ( norm(op(A)) * norm(x) * EPS ).
140139
*> \endverbatim
141140
*
142141
* Authors:
@@ -214,7 +213,7 @@ SUBROUTINE DTBT02( UPLO, TRANS, DIAG, N, KD, NRHS, AB, LDAB, X,
214213
END IF
215214
*
216215
* Compute the maximum over the number of right hand sides of
217-
* norm(B - op(A)*X) / ( norm(op(A)) * norm(X) * EPS ).
216+
* norm(op(A)*x - b) / ( norm(op(A)) * norm(x) * EPS ).
218217
*
219218
RESID = ZERO
220219
DO 10 J = 1, NRHS

TESTING/LIN/dtpt02.f

Lines changed: 10 additions & 11 deletions
Original file line numberDiff line numberDiff line change
@@ -27,12 +27,11 @@
2727
*> \verbatim
2828
*>
2929
*> DTPT02 computes the residual for the computed solution to a
30-
*> triangular system of linear equations A*x = b or A'*x = b when
31-
*> the triangular matrix A is stored in packed format. Here A' is the
32-
*> transpose of A and x and b are N by NRHS matrices. The test ratio is
30+
*> triangular system of linear equations op(A)*X = B, when the
31+
*> triangular matrix A is stored in packed format. The test ratio is
3332
*> the maximum over the number of right hand sides of
34-
*> norm(b - op(A)*x) / ( norm(op(A)) * norm(x) * EPS ),
35-
*> where op(A) denotes A or A' and EPS is the machine epsilon.
33+
*> norm(op(A)*X - B) / ( norm(op(A)) * norm(X) * EPS ),
34+
*> where op(A) = A or A**T, and EPS is the machine epsilon.
3635
*> The norm used is the 1-norm.
3736
*> \endverbatim
3837
*
@@ -51,9 +50,9 @@
5150
*> \verbatim
5251
*> TRANS is CHARACTER*1
5352
*> Specifies the operation applied to A.
54-
*> = 'N': A *x = b (No transpose)
55-
*> = 'T': A'*x = b (Transpose)
56-
*> = 'C': A'*x = b (Conjugate transpose = Transpose)
53+
*> = 'N': A * X = B (No transpose)
54+
*> = 'T': A**T * X = B (Transpose)
55+
*> = 'C': A**H * X = B (Conjugate transpose = Transpose)
5756
*> \endverbatim
5857
*>
5958
*> \param[in] DIAG
@@ -123,7 +122,7 @@
123122
*> \verbatim
124123
*> RESID is DOUBLE PRECISION
125124
*> The maximum over the number of right hand sides of
126-
*> norm(op(A)*x - b) / ( norm(op(A)) * norm(x) * EPS ).
125+
*> norm(op(A)*X - B) / ( norm(op(A)) * norm(X) * EPS ).
127126
*> \endverbatim
128127
*
129128
* Authors:
@@ -183,7 +182,7 @@ SUBROUTINE DTPT02( UPLO, TRANS, DIAG, N, NRHS, AP, X, LDX, B, LDB,
183182
RETURN
184183
END IF
185184
*
186-
* Compute the 1-norm of A or A'.
185+
* Compute the 1-norm of op(A).
187186
*
188187
IF( LSAME( TRANS, 'N' ) ) THEN
189188
ANORM = DLANTP( '1', UPLO, DIAG, N, AP, WORK )
@@ -200,7 +199,7 @@ SUBROUTINE DTPT02( UPLO, TRANS, DIAG, N, NRHS, AP, X, LDX, B, LDB,
200199
END IF
201200
*
202201
* Compute the maximum over the number of right hand sides of
203-
* norm(op(A)*x - b) / ( norm(op(A)) * norm(x) * EPS ).
202+
* norm(op(A)*X - B) / ( norm(op(A)) * norm(X) * EPS ).
204203
*
205204
RESID = ZERO
206205
DO 10 J = 1, NRHS

TESTING/LIN/dtrt02.f

Lines changed: 11 additions & 12 deletions
Original file line numberDiff line numberDiff line change
@@ -28,12 +28,11 @@
2828
*> \verbatim
2929
*>
3030
*> DTRT02 computes the residual for the computed solution to a
31-
*> triangular system of linear equations A*x = b or A'*x = b.
32-
*> Here A is a triangular matrix, A' is the transpose of A, and x and b
33-
*> are N by NRHS matrices. The test ratio is the maximum over the
34-
*> number of right hand sides of
35-
*> norm(b - op(A)*x) / ( norm(op(A)) * norm(x) * EPS ),
36-
*> where op(A) denotes A or A' and EPS is the machine epsilon.
31+
*> triangular system of linear equations op(A)*X = B, where A is a
32+
*> triangular matrix. The test ratio is the maximum over the number of
33+
*> right hand sides of
34+
*> norm(op(A)*X - B) / ( norm(op(A)) * norm(X) * EPS ),
35+
*> where op(A) = A or A**T, and EPS is the machine epsilon.
3736
*> The norm used is the 1-norm.
3837
*> \endverbatim
3938
*
@@ -52,9 +51,9 @@
5251
*> \verbatim
5352
*> TRANS is CHARACTER*1
5453
*> Specifies the operation applied to A.
55-
*> = 'N': A *x = b (No transpose)
56-
*> = 'T': A'*x = b (Transpose)
57-
*> = 'C': A'*x = b (Conjugate transpose = Transpose)
54+
*> = 'N': A * X = B (No transpose)
55+
*> = 'T': A**T * X = B (Transpose)
56+
*> = 'C': A**H * X = B (Conjugate transpose = Transpose)
5857
*> \endverbatim
5958
*>
6059
*> \param[in] DIAG
@@ -132,7 +131,7 @@
132131
*> \verbatim
133132
*> RESID is DOUBLE PRECISION
134133
*> The maximum over the number of right hand sides of
135-
*> norm(op(A)*x - b) / ( norm(op(A)) * norm(x) * EPS ).
134+
*> norm(op(A)*X - B) / ( norm(op(A)) * norm(X) * EPS ).
136135
*> \endverbatim
137136
*
138137
* Authors:
@@ -193,7 +192,7 @@ SUBROUTINE DTRT02( UPLO, TRANS, DIAG, N, NRHS, A, LDA, X, LDX, B,
193192
RETURN
194193
END IF
195194
*
196-
* Compute the 1-norm of A or A'.
195+
* Compute the 1-norm of op(A).
197196
*
198197
IF( LSAME( TRANS, 'N' ) ) THEN
199198
ANORM = DLANTR( '1', UPLO, DIAG, N, N, A, LDA, WORK )
@@ -210,7 +209,7 @@ SUBROUTINE DTRT02( UPLO, TRANS, DIAG, N, NRHS, A, LDA, X, LDX, B,
210209
END IF
211210
*
212211
* Compute the maximum over the number of right hand sides of
213-
* norm(op(A)*x - b) / ( norm(op(A)) * norm(x) * EPS )
212+
* norm(op(A)*X - B) / ( norm(op(A)) * norm(X) * EPS )
214213
*
215214
RESID = ZERO
216215
DO 10 J = 1, NRHS

TESTING/LIN/stbt02.f

Lines changed: 6 additions & 6 deletions
Original file line numberDiff line numberDiff line change
@@ -28,11 +28,11 @@
2828
*> \verbatim
2929
*>
3030
*> STBT02 computes the residual for the computed solution to a
31-
*> triangular system of linear equations op(A)*X = B when A is a
32-
*> triangular band matrix. The test ratio is the maximum over the
31+
*> triangular system of linear equations op(A)*X = B, when A is a
32+
*> triangular band matrix. The test ratio is the maximum over the
3333
*> number of right hand sides of
34-
*> norm(b - op(A)*x) / ( norm(op(A)) * norm(x) * EPS ),
35-
*> where op(A) denotes A or A' and EPS is the machine epsilon.
34+
*> norm(op(A)*X - B) / ( norm(op(A)) * norm(X) * EPS ),
35+
*> where op(A) = A or A**T, and EPS is the machine epsilon.
3636
*> The norm used is the 1-norm.
3737
*> \endverbatim
3838
*
@@ -135,7 +135,7 @@
135135
*> \verbatim
136136
*> RESID is REAL
137137
*> The maximum over the number of right hand sides of
138-
*> norm(B - op(A)*X) / ( norm(op(A)) * norm(X) * EPS ).
138+
*> norm(op(A)*x - b) / ( norm(op(A)) * norm(x) * EPS ).
139139
*> \endverbatim
140140
*
141141
* Authors:
@@ -213,7 +213,7 @@ SUBROUTINE STBT02( UPLO, TRANS, DIAG, N, KD, NRHS, AB, LDAB, X,
213213
END IF
214214
*
215215
* Compute the maximum over the number of right hand sides of
216-
* norm(B - op(A)*X) / ( norm(op(A)) * norm(X) * EPS ).
216+
* norm(op(A)*x - b) / ( norm(op(A)) * norm(x) * EPS ).
217217
*
218218
RESID = ZERO
219219
DO 10 J = 1, NRHS

TESTING/LIN/stpt02.f

Lines changed: 10 additions & 11 deletions
Original file line numberDiff line numberDiff line change
@@ -27,12 +27,11 @@
2727
*> \verbatim
2828
*>
2929
*> STPT02 computes the residual for the computed solution to a
30-
*> triangular system of linear equations A*x = b or A'*x = b when
31-
*> the triangular matrix A is stored in packed format. Here A' is the
32-
*> transpose of A and x and b are N by NRHS matrices. The test ratio is
30+
*> triangular system of linear equations op(A)*X = B, when the
31+
*> triangular matrix A is stored in packed format. The test ratio is
3332
*> the maximum over the number of right hand sides of
34-
*> norm(b - op(A)*x) / ( norm(op(A)) * norm(x) * EPS ),
35-
*> where op(A) denotes A or A' and EPS is the machine epsilon.
33+
*> norm(op(A)*X - B) / ( norm(op(A)) * norm(X) * EPS ),
34+
*> where op(A) = A or A**T, and EPS is the machine epsilon.
3635
*> The norm used is the 1-norm.
3736
*> \endverbatim
3837
*
@@ -51,9 +50,9 @@
5150
*> \verbatim
5251
*> TRANS is CHARACTER*1
5352
*> Specifies the operation applied to A.
54-
*> = 'N': A *x = b (No transpose)
55-
*> = 'T': A'*x = b (Transpose)
56-
*> = 'C': A'*x = b (Conjugate transpose = Transpose)
53+
*> = 'N': A * X = B (No transpose)
54+
*> = 'T': A**T * X = B (Transpose)
55+
*> = 'C': A**H * X = B (Conjugate transpose = Transpose)
5756
*> \endverbatim
5857
*>
5958
*> \param[in] DIAG
@@ -123,7 +122,7 @@
123122
*> \verbatim
124123
*> RESID is REAL
125124
*> The maximum over the number of right hand sides of
126-
*> norm(op(A)*x - b) / ( norm(op(A)) * norm(x) * EPS ).
125+
*> norm(op(A)*X - B) / ( norm(op(A)) * norm(X) * EPS ).
127126
*> \endverbatim
128127
*
129128
* Authors:
@@ -183,7 +182,7 @@ SUBROUTINE STPT02( UPLO, TRANS, DIAG, N, NRHS, AP, X, LDX, B, LDB,
183182
RETURN
184183
END IF
185184
*
186-
* Compute the 1-norm of A or A'.
185+
* Compute the 1-norm of op(A).
187186
*
188187
IF( LSAME( TRANS, 'N' ) ) THEN
189188
ANORM = SLANTP( '1', UPLO, DIAG, N, AP, WORK )
@@ -200,7 +199,7 @@ SUBROUTINE STPT02( UPLO, TRANS, DIAG, N, NRHS, AP, X, LDX, B, LDB,
200199
END IF
201200
*
202201
* Compute the maximum over the number of right hand sides of
203-
* norm(op(A)*x - b) / ( norm(op(A)) * norm(x) * EPS ).
202+
* norm(op(A)*X - B) / ( norm(op(A)) * norm(X) * EPS ).
204203
*
205204
RESID = ZERO
206205
DO 10 J = 1, NRHS

0 commit comments

Comments
 (0)