zfftb Subroutine

subroutine zfftb(n, c, Wsave)

Arguments

Type IntentOptional Attributes Name
integer :: n
real(kind=rk) :: c
real(kind=rk) :: Wsave

Contents

Source Code


Variables

Type Visibility Attributes Name Initial
integer, public :: iw1
integer, public :: iw2

Source Code

      subroutine zfftb(n,c,Wsave)
      use fftpack_kind
      implicit none
      real(rk) :: c , Wsave
      integer :: iw1 , iw2 , n
      dimension c(*) , Wsave(*)
      if ( n==1 ) return
      iw1 = n + n + 1
      iw2 = iw1 + n + n
      call cfftb1(n,c,Wsave,Wsave(iw1),Wsave(iw2))
      end subroutine zfftb