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:
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
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
0 commit comments