1*> \brief \b CLASCL2 performs diagonal scaling on a vector.
2*
3*  =========== DOCUMENTATION ===========
4*
5* Online html documentation available at
6*            http://www.netlib.org/lapack/explore-html/
7*
8*> \htmlonly
9*> Download CLASCL2 + dependencies
10*> <a href="http://www.netlib.org/cgi-bin/netlibfiles.tgz?format=tgz&filename=/lapack/lapack_routine/clascl2.f">
11*> [TGZ]</a>
12*> <a href="http://www.netlib.org/cgi-bin/netlibfiles.zip?format=zip&filename=/lapack/lapack_routine/clascl2.f">
13*> [ZIP]</a>
14*> <a href="http://www.netlib.org/cgi-bin/netlibfiles.txt?format=txt&filename=/lapack/lapack_routine/clascl2.f">
15*> [TXT]</a>
16*> \endhtmlonly
17*
18*  Definition:
19*  ===========
20*
21*       SUBROUTINE CLASCL2 ( M, N, D, X, LDX )
22*
23*       .. Scalar Arguments ..
24*       INTEGER            M, N, LDX
25*       ..
26*       .. Array Arguments ..
27*       REAL               D( * )
28*       COMPLEX            X( LDX, * )
29*       ..
30*
31*
32*> \par Purpose:
33*  =============
34*>
35*> \verbatim
36*>
37*> CLASCL2 performs a diagonal scaling on a vector:
38*>   x <-- D * x
39*> where the diagonal REAL matrix D is stored as a vector.
40*>
41*> Eventually to be replaced by BLAS_cge_diag_scale in the new BLAS
42*> standard.
43*> \endverbatim
44*
45*  Arguments:
46*  ==========
47*
48*> \param[in] M
49*> \verbatim
50*>          M is INTEGER
51*>     The number of rows of D and X. M >= 0.
52*> \endverbatim
53*>
54*> \param[in] N
55*> \verbatim
56*>          N is INTEGER
57*>     The number of columns of X. N >= 0.
58*> \endverbatim
59*>
60*> \param[in] D
61*> \verbatim
62*>          D is REAL array, length M
63*>     Diagonal matrix D, stored as a vector of length M.
64*> \endverbatim
65*>
66*> \param[in,out] X
67*> \verbatim
68*>          X is COMPLEX array, dimension (LDX,N)
69*>     On entry, the vector X to be scaled by D.
70*>     On exit, the scaled vector.
71*> \endverbatim
72*>
73*> \param[in] LDX
74*> \verbatim
75*>          LDX is INTEGER
76*>     The leading dimension of the vector X. LDX >= 0.
77*> \endverbatim
78*
79*  Authors:
80*  ========
81*
82*> \author Univ. of Tennessee
83*> \author Univ. of California Berkeley
84*> \author Univ. of Colorado Denver
85*> \author NAG Ltd.
86*
87*> \date November 2015
88*
89*> \ingroup complexOTHERcomputational
90*
91*  =====================================================================
92      SUBROUTINE CLASCL2 ( M, N, D, X, LDX )
93*
94*  -- LAPACK computational routine (version 3.6.0) --
95*  -- LAPACK is a software package provided by Univ. of Tennessee,    --
96*  -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
97*     November 2015
98*
99*     .. Scalar Arguments ..
100      INTEGER            M, N, LDX
101*     ..
102*     .. Array Arguments ..
103      REAL               D( * )
104      COMPLEX            X( LDX, * )
105*     ..
106*
107*  =====================================================================
108*
109*     .. Local Scalars ..
110      INTEGER            I, J
111*     ..
112*     .. Executable Statements ..
113*
114      DO J = 1, N
115         DO I = 1, M
116            X( I, J ) = X( I, J ) * D( I )
117         END DO
118      END DO
119
120      RETURN
121      END
122
123