|
|
@ -36,7 +36,7 @@
|
|
|
|
!
|
|
|
|
!
|
|
|
|
module amg_d_pde_mod
|
|
|
|
module amg_d_pde_mod
|
|
|
|
use psb_base_mod, only : psb_dpk_, psb_ipk_, psb_desc_type,&
|
|
|
|
use psb_base_mod, only : psb_dpk_, psb_ipk_, psb_desc_type,&
|
|
|
|
& psb_dspmat_type, psb_d_vect_type, dzero,&
|
|
|
|
& psb_dspmat_type, psb_d_vect_type, dzero, done,&
|
|
|
|
& psb_d_base_sparse_mat, psb_d_base_vect_type, psb_i_base_vect_type
|
|
|
|
& psb_d_base_sparse_mat, psb_d_base_vect_type, psb_i_base_vect_type
|
|
|
|
|
|
|
|
|
|
|
|
interface
|
|
|
|
interface
|
|
|
@ -92,9 +92,9 @@ contains
|
|
|
|
type(psb_dspmat_type) :: a
|
|
|
|
type(psb_dspmat_type) :: a
|
|
|
|
type(psb_d_vect_type) :: xv,bv
|
|
|
|
type(psb_d_vect_type) :: xv,bv
|
|
|
|
type(psb_desc_type) :: desc_a
|
|
|
|
type(psb_desc_type) :: desc_a
|
|
|
|
type(psb_ctxt_type) :: ctxt
|
|
|
|
|
|
|
|
integer(psb_ipk_) :: info
|
|
|
|
integer(psb_ipk_) :: info
|
|
|
|
character(len=*) :: afmt
|
|
|
|
type(psb_ctxt_type) :: ctxt
|
|
|
|
|
|
|
|
character :: afmt*5
|
|
|
|
procedure(d_func_3d), optional :: f
|
|
|
|
procedure(d_func_3d), optional :: f
|
|
|
|
class(psb_d_base_sparse_mat), optional :: amold
|
|
|
|
class(psb_d_base_sparse_mat), optional :: amold
|
|
|
|
class(psb_d_base_vect_type), optional :: vmold
|
|
|
|
class(psb_d_base_vect_type), optional :: vmold
|
|
|
@ -107,16 +107,20 @@ contains
|
|
|
|
type(psb_d_csc_sparse_mat) :: acsc
|
|
|
|
type(psb_d_csc_sparse_mat) :: acsc
|
|
|
|
type(psb_d_coo_sparse_mat) :: acoo
|
|
|
|
type(psb_d_coo_sparse_mat) :: acoo
|
|
|
|
type(psb_d_csr_sparse_mat) :: acsr
|
|
|
|
type(psb_d_csr_sparse_mat) :: acsr
|
|
|
|
real(psb_dpk_) :: zt(nb),x,y,z
|
|
|
|
real(psb_dpk_) :: zt(nb),x,y,z,xph,xmh,yph,ymh,zph,zmh
|
|
|
|
integer(psb_ipk_) :: m,n,nnz,nr,nt,glob_row,nlr,i,j,ii,ib,k, partition_
|
|
|
|
integer(psb_ipk_) :: nnz,nr,nlr,i,j,ii,ib,k, partition_
|
|
|
|
|
|
|
|
integer(psb_lpk_) :: m,n,glob_row,nt
|
|
|
|
integer(psb_ipk_) :: ix,iy,iz,ia,indx_owner
|
|
|
|
integer(psb_ipk_) :: ix,iy,iz,ia,indx_owner
|
|
|
|
! For 3D partition
|
|
|
|
! For 3D partition
|
|
|
|
integer(psb_ipk_) :: npx,npy,npz, npdims(3),iamx,iamy,iamz,mynx,myny,mynz
|
|
|
|
! Note: integer control variables going directly into an MPI call
|
|
|
|
|
|
|
|
! must be 4 bytes, i.e. psb_mpk_
|
|
|
|
|
|
|
|
integer(psb_mpk_) :: npdims(3), npp, minfo
|
|
|
|
|
|
|
|
integer(psb_ipk_) :: npx,npy,npz, iamx,iamy,iamz,mynx,myny,mynz
|
|
|
|
integer(psb_ipk_), allocatable :: bndx(:),bndy(:),bndz(:)
|
|
|
|
integer(psb_ipk_), allocatable :: bndx(:),bndy(:),bndz(:)
|
|
|
|
! Process grid
|
|
|
|
! Process grid
|
|
|
|
integer(psb_ipk_) :: np, iam
|
|
|
|
integer(psb_ipk_) :: np, iam
|
|
|
|
integer(psb_ipk_) :: icoeff
|
|
|
|
integer(psb_ipk_) :: icoeff
|
|
|
|
integer(psb_ipk_), allocatable :: irow(:),icol(:),myidx(:)
|
|
|
|
integer(psb_lpk_), allocatable :: irow(:),icol(:),myidx(:)
|
|
|
|
real(psb_dpk_), allocatable :: val(:)
|
|
|
|
real(psb_dpk_), allocatable :: val(:)
|
|
|
|
! deltah dimension of each grid cell
|
|
|
|
! deltah dimension of each grid cell
|
|
|
|
! deltat discretization time
|
|
|
|
! deltat discretization time
|
|
|
@ -142,7 +146,7 @@ contains
|
|
|
|
|
|
|
|
|
|
|
|
deltah = 1.d0/(idim+1)
|
|
|
|
deltah = 1.d0/(idim+1)
|
|
|
|
sqdeltah = deltah*deltah
|
|
|
|
sqdeltah = deltah*deltah
|
|
|
|
deltah2 = 2.d0* deltah
|
|
|
|
deltah2 = 2.0_psb_dpk_* deltah
|
|
|
|
|
|
|
|
|
|
|
|
if (present(partition)) then
|
|
|
|
if (present(partition)) then
|
|
|
|
if ((1<= partition).and.(partition <= 3)) then
|
|
|
|
if ((1<= partition).and.(partition <= 3)) then
|
|
|
@ -158,9 +162,9 @@ contains
|
|
|
|
! initialize array descriptor and sparse matrix storage. provide an
|
|
|
|
! initialize array descriptor and sparse matrix storage. provide an
|
|
|
|
! estimate of the number of non zeroes
|
|
|
|
! estimate of the number of non zeroes
|
|
|
|
|
|
|
|
|
|
|
|
m = idim*idim*idim
|
|
|
|
m = (1_psb_lpk_*idim)*idim*idim
|
|
|
|
n = m
|
|
|
|
n = m
|
|
|
|
nnz = ((n*9)/(np))
|
|
|
|
nnz = 7*((n+np-1)/np)
|
|
|
|
if(iam == psb_root_) write(psb_out_unit,'("Generating Matrix (size=",i0,")...")')n
|
|
|
|
if(iam == psb_root_) write(psb_out_unit,'("Generating Matrix (size=",i0,")...")')n
|
|
|
|
|
|
|
|
|
|
|
|
select case(partition_)
|
|
|
|
select case(partition_)
|
|
|
@ -248,7 +252,7 @@ contains
|
|
|
|
! Now, let's generate the list of indices I own
|
|
|
|
! Now, let's generate the list of indices I own
|
|
|
|
nr = 0
|
|
|
|
nr = 0
|
|
|
|
do i=bndx(iamx),bndx(iamx+1)-1
|
|
|
|
do i=bndx(iamx),bndx(iamx+1)-1
|
|
|
|
do j=bndy(iamy),bndx(iamy+1)-1
|
|
|
|
do j=bndy(iamy),bndy(iamy+1)-1
|
|
|
|
do k=bndz(iamz),bndz(iamz+1)-1
|
|
|
|
do k=bndz(iamz),bndz(iamz+1)-1
|
|
|
|
nr = nr + 1
|
|
|
|
nr = nr + 1
|
|
|
|
call ijk2idx(myidx(nr),i,j,k,idim,idim,idim)
|
|
|
|
call ijk2idx(myidx(nr),i,j,k,idim,idim,idim)
|
|
|
@ -376,7 +380,7 @@ contains
|
|
|
|
if (ix == 1) then
|
|
|
|
if (ix == 1) then
|
|
|
|
zt(k) = g(dzero,y,z)*(-val(icoeff)) + zt(k)
|
|
|
|
zt(k) = g(dzero,y,z)*(-val(icoeff)) + zt(k)
|
|
|
|
else
|
|
|
|
else
|
|
|
|
icol(icoeff) = (ix-2)*idim*idim+(iy-1)*idim+(iz)
|
|
|
|
call ijk2idx(icol(icoeff),ix-1,iy,iz,idim,idim,idim)
|
|
|
|
irow(icoeff) = glob_row
|
|
|
|
irow(icoeff) = glob_row
|
|
|
|
icoeff = icoeff+1
|
|
|
|
icoeff = icoeff+1
|
|
|
|
endif
|
|
|
|
endif
|
|
|
@ -385,7 +389,7 @@ contains
|
|
|
|
if (iy == 1) then
|
|
|
|
if (iy == 1) then
|
|
|
|
zt(k) = g(x,dzero,z)*(-val(icoeff)) + zt(k)
|
|
|
|
zt(k) = g(x,dzero,z)*(-val(icoeff)) + zt(k)
|
|
|
|
else
|
|
|
|
else
|
|
|
|
icol(icoeff) = (ix-1)*idim*idim+(iy-2)*idim+(iz)
|
|
|
|
call ijk2idx(icol(icoeff),ix,iy-1,iz,idim,idim,idim)
|
|
|
|
irow(icoeff) = glob_row
|
|
|
|
irow(icoeff) = glob_row
|
|
|
|
icoeff = icoeff+1
|
|
|
|
icoeff = icoeff+1
|
|
|
|
endif
|
|
|
|
endif
|
|
|
@ -394,15 +398,15 @@ contains
|
|
|
|
if (iz == 1) then
|
|
|
|
if (iz == 1) then
|
|
|
|
zt(k) = g(x,y,dzero)*(-val(icoeff)) + zt(k)
|
|
|
|
zt(k) = g(x,y,dzero)*(-val(icoeff)) + zt(k)
|
|
|
|
else
|
|
|
|
else
|
|
|
|
icol(icoeff) = (ix-1)*idim*idim+(iy-1)*idim+(iz-1)
|
|
|
|
call ijk2idx(icol(icoeff),ix,iy,iz-1,idim,idim,idim)
|
|
|
|
irow(icoeff) = glob_row
|
|
|
|
irow(icoeff) = glob_row
|
|
|
|
icoeff = icoeff+1
|
|
|
|
icoeff = icoeff+1
|
|
|
|
endif
|
|
|
|
endif
|
|
|
|
|
|
|
|
|
|
|
|
! term depending on (x,y,z)
|
|
|
|
! term depending on (x,y,z)
|
|
|
|
val(icoeff)=2.d0*(a1(x,y,z)+a2(x,y,z)+a3(x,y,z))/sqdeltah &
|
|
|
|
val(icoeff)=(2*done)*(a1(x,y,z)+a2(x,y,z)+a3(x,y,z))/sqdeltah &
|
|
|
|
& + c(x,y,z)
|
|
|
|
& + c(x,y,z)
|
|
|
|
icol(icoeff) = (ix-1)*idim*idim+(iy-1)*idim+(iz)
|
|
|
|
call ijk2idx(icol(icoeff),ix,iy,iz,idim,idim,idim)
|
|
|
|
irow(icoeff) = glob_row
|
|
|
|
irow(icoeff) = glob_row
|
|
|
|
icoeff = icoeff+1
|
|
|
|
icoeff = icoeff+1
|
|
|
|
! term depending on (x,y,z+1)
|
|
|
|
! term depending on (x,y,z+1)
|
|
|
@ -410,7 +414,7 @@ contains
|
|
|
|
if (iz == idim) then
|
|
|
|
if (iz == idim) then
|
|
|
|
zt(k) = g(x,y,done)*(-val(icoeff)) + zt(k)
|
|
|
|
zt(k) = g(x,y,done)*(-val(icoeff)) + zt(k)
|
|
|
|
else
|
|
|
|
else
|
|
|
|
icol(icoeff) = (ix-1)*idim*idim+(iy-1)*idim+(iz+1)
|
|
|
|
call ijk2idx(icol(icoeff),ix,iy,iz+1,idim,idim,idim)
|
|
|
|
irow(icoeff) = glob_row
|
|
|
|
irow(icoeff) = glob_row
|
|
|
|
icoeff = icoeff+1
|
|
|
|
icoeff = icoeff+1
|
|
|
|
endif
|
|
|
|
endif
|
|
|
@ -419,7 +423,7 @@ contains
|
|
|
|
if (iy == idim) then
|
|
|
|
if (iy == idim) then
|
|
|
|
zt(k) = g(x,done,z)*(-val(icoeff)) + zt(k)
|
|
|
|
zt(k) = g(x,done,z)*(-val(icoeff)) + zt(k)
|
|
|
|
else
|
|
|
|
else
|
|
|
|
icol(icoeff) = (ix-1)*idim*idim+(iy)*idim+(iz)
|
|
|
|
call ijk2idx(icol(icoeff),ix,iy+1,iz,idim,idim,idim)
|
|
|
|
irow(icoeff) = glob_row
|
|
|
|
irow(icoeff) = glob_row
|
|
|
|
icoeff = icoeff+1
|
|
|
|
icoeff = icoeff+1
|
|
|
|
endif
|
|
|
|
endif
|
|
|
@ -428,7 +432,7 @@ contains
|
|
|
|
if (ix==idim) then
|
|
|
|
if (ix==idim) then
|
|
|
|
zt(k) = g(done,y,z)*(-val(icoeff)) + zt(k)
|
|
|
|
zt(k) = g(done,y,z)*(-val(icoeff)) + zt(k)
|
|
|
|
else
|
|
|
|
else
|
|
|
|
icol(icoeff) = (ix)*idim*idim+(iy-1)*idim+(iz)
|
|
|
|
call ijk2idx(icol(icoeff),ix+1,iy,iz,idim,idim,idim)
|
|
|
|
irow(icoeff) = glob_row
|
|
|
|
irow(icoeff) = glob_row
|
|
|
|
icoeff = icoeff+1
|
|
|
|
icoeff = icoeff+1
|
|
|
|
endif
|
|
|
|
endif
|
|
|
@ -438,7 +442,7 @@ contains
|
|
|
|
if(info /= psb_success_) exit
|
|
|
|
if(info /= psb_success_) exit
|
|
|
|
call psb_geins(ib,myidx(ii:ii+ib-1),zt(1:ib),bv,desc_a,info)
|
|
|
|
call psb_geins(ib,myidx(ii:ii+ib-1),zt(1:ib),bv,desc_a,info)
|
|
|
|
if(info /= psb_success_) exit
|
|
|
|
if(info /= psb_success_) exit
|
|
|
|
zt(:)=0.d0
|
|
|
|
zt(:)=dzero
|
|
|
|
call psb_geins(ib,myidx(ii:ii+ib-1),zt(1:ib),xv,desc_a,info)
|
|
|
|
call psb_geins(ib,myidx(ii:ii+ib-1),zt(1:ib),xv,desc_a,info)
|
|
|
|
if(info /= psb_success_) exit
|
|
|
|
if(info /= psb_success_) exit
|
|
|
|
end do
|
|
|
|
end do
|
|
|
|