caxpy Subroutine

subroutine caxpy(n, ca, cx, incx, cy, incy)

Uses

\brief \b CAXPY \par Purpose:

\verbatim

CAXPY constant times a vector plus a vector. \endverbatim \param[in] N \verbatim N is INTEGER number of elements in input vector(s) \endverbatim

\param[in] CA \verbatim CA is COMPLEX On entry, CA specifies the scalar alpha. \endverbatim

\param[in] CX \verbatim CX is COMPLEX array, dimension ( 1 + ( N - 1 )*abs( INCX ) ) \endverbatim

\param[in] INCX \verbatim INCX is INTEGER storage spacing between elements of CX \endverbatim

\param[in,out] CY \verbatim CY is COMPLEX array, dimension ( 1 + ( N - 1 )*abs( INCY ) ) \endverbatim

\param[in] INCY \verbatim INCY is INTEGER storage spacing between elements of CY \endverbatim \author Univ. of Tennessee \author Univ. of California Berkeley \author Univ. of Colorado Denver \author NAG Ltd. \date November 2017 \ingroup complex_blas_level1 \par Further Details:

\verbatim

jack dongarra, linpack, 3/11/78.
modified 12/3/93, array(1) declarations changed to array(*)

\endverbatim

Arguments

Type IntentOptional Attributes Name
integer :: n
complex :: ca
complex :: cx(*)
integer :: incx
complex :: cy(*)
integer :: incy

Contents

Source Code


Source Code

subroutine caxpy(n,ca,cx,incx,cy,incy)
! COMMENT --file caxpy.3m_blas.man
!> \brief \b CAXPY
!
!  =========== DOCUMENTATION ===========
!
! Online html documentation available at
!            http://www.netlib.org/lapack/explore-html/
!
!  Definition:
!  ===========
!
!       SUBROUTINE CAXPY(N,CA,CX,INCX,CY,INCY)
!
!       .. Scalar Arguments ..
!       COMPLEX CA
!       INTEGER INCX,INCY,N
!       ..
!       .. Array Arguments ..
!       COMPLEX CX(*),CY(*)
!       ..
!
!> \par Purpose:
!  =============
!>
!> \verbatim
!>
!>    CAXPY constant times a vector plus a vector.
!> \endverbatim
!
!  Arguments:
!  ==========
!
!> \param[in] N
!> \verbatim
!>          N is INTEGER
!>         number of elements in input vector(s)
!> \endverbatim
!>
!> \param[in] CA
!> \verbatim
!>          CA is COMPLEX
!>           On entry, CA specifies the scalar alpha.
!> \endverbatim
!>
!> \param[in] CX
!> \verbatim
!>          CX is COMPLEX array, dimension ( 1 + ( N - 1 )*abs( INCX ) )
!> \endverbatim
!>
!> \param[in] INCX
!> \verbatim
!>          INCX is INTEGER
!>         storage spacing between elements of CX
!> \endverbatim
!>
!> \param[in,out] CY
!> \verbatim
!>          CY is COMPLEX array, dimension ( 1 + ( N - 1 )*abs( INCY ) )
!> \endverbatim
!>
!> \param[in] INCY
!> \verbatim
!>          INCY is INTEGER
!>         storage spacing between elements of CY
!> \endverbatim
!
!  Authors:
!  ========
!
!> \author Univ. of Tennessee
!> \author Univ. of California Berkeley
!> \author Univ. of Colorado Denver
!> \author NAG Ltd.
!
!> \date November 2017
!
!> \ingroup complex_blas_level1
!
!> \par Further Details:
!  =====================
!>
!> \verbatim
!>
!>     jack dongarra, linpack, 3/11/78.
!>     modified 12/3/93, array(1) declarations changed to array(*)
!> \endverbatim
!>
!  =====================================================================
!
!  -- Reference BLAS level1 routine (version 3.8.0) --
!  -- Reference BLAS is a software package provided by Univ. of Tennessee,    --
!  -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
!     November 2017
!
!     .. Scalar Arguments ..
!     ..
!     .. Array Arguments ..
!     ..
!
!  =====================================================================
!
!     .. Local Scalars ..
!     ..
!     .. External Functions ..
!     ..
!
!        code for both increments equal to 1
!
!
!        code for unequal increments or equal increments
!          not equal to 1
!
!
! END
use m_blas, only : caxpy_=>caxpy
implicit none
      complex :: ca
      integer :: incx,incy,n
      complex :: cx(*)
      complex :: cy(*)
      call caxpy_(n,ca,cx,incx,cy,incy)
end subroutine caxpy