mld2p4-smooth-2side:

mlprec/impl/mld_dprecset.F90
 mlprec/mld_d_prec_mod.f90
 mlprec/mld_d_prec_type.f90
 tests/pdegen/Makefile
 tests/pdegen/runs/ppde.inp


Fix dec_map XZERO.
stopcriterion
Salvatore Filippone 9 years ago
parent 6f06a48d25
commit 80c58b32eb

@ -76,7 +76,7 @@
! For this reason, the interface mld_precset to this routine has been built in ! For this reason, the interface mld_precset to this routine has been built in
! such a way that ilev is not visible to the user (see mld_prec_mod.f90). ! such a way that ilev is not visible to the user (see mld_prec_mod.f90).
! !
subroutine mld_dprecseti(p,what,val,info,ilev) subroutine mld_dprecseti(p,what,val,info,ilev,pos)
use psb_base_mod use psb_base_mod
use mld_d_prec_mod, mld_protect_name => mld_dprecseti use mld_d_prec_mod, mld_protect_name => mld_dprecseti
@ -107,6 +107,7 @@ subroutine mld_dprecseti(p,what,val,info,ilev)
integer(psb_ipk_), intent(in) :: val integer(psb_ipk_), intent(in) :: val
integer(psb_ipk_), intent(out) :: info integer(psb_ipk_), intent(out) :: info
integer(psb_ipk_), optional, intent(in) :: ilev integer(psb_ipk_), optional, intent(in) :: ilev
character(len=*), optional, intent(in) :: pos
! Local variables ! Local variables
integer(psb_ipk_) :: ilev_, nlev_ integer(psb_ipk_) :: ilev_, nlev_
@ -671,7 +672,7 @@ contains
end subroutine mld_dprecseti end subroutine mld_dprecseti
subroutine mld_dprecsetsm(p,val,info,ilev) subroutine mld_dprecsetsm(p,val,info,ilev,pos)
use psb_base_mod use psb_base_mod
use mld_d_prec_mod, mld_protect_name => mld_dprecsetsm use mld_d_prec_mod, mld_protect_name => mld_dprecsetsm
@ -679,15 +680,16 @@ subroutine mld_dprecsetsm(p,val,info,ilev)
implicit none implicit none
! Arguments ! Arguments
class(mld_dprec_type), intent(inout) :: p class(mld_dprec_type), target, intent(inout) :: p
class(mld_d_base_smoother_type), intent(in) :: val class(mld_d_base_smoother_type), intent(in) :: val
integer(psb_ipk_), intent(out) :: info integer(psb_ipk_), intent(out) :: info
integer(psb_ipk_), optional, intent(in) :: ilev integer(psb_ipk_), optional, intent(in) :: ilev
character(len=*), optional, intent(in) :: pos
! Local variables ! Local variables
integer(psb_ipk_) :: ilev_, nlev_, ilmin, ilmax integer(psb_ipk_) :: ilev_, nlev_, ilmin, ilmax, ipos_
character(len=*), parameter :: name='mld_precseti' character(len=*), parameter :: name='mld_precseti'
info = psb_success_ info = psb_success_
if (.not.allocated(p%precv)) then if (.not.allocated(p%precv)) then
@ -708,7 +710,19 @@ subroutine mld_dprecsetsm(p,val,info,ilev)
ilmin = 1 ilmin = 1
ilmax = nlev_ ilmax = nlev_
end if end if
if (present(pos)) then
select case(psb_toupper(trim(pos)))
case('PRE')
ipos_ = mld_pre_smooth_
case('POST')
ipos_ = mld_post_smooth_
case default
ipos_ = mld_pre_smooth_
end select
else
ipos_ = mld_pre_smooth_
end if
if ((ilev_<1).or.(ilev_ > nlev_)) then if ((ilev_<1).or.(ilev_ > nlev_)) then
info = -1 info = -1
write(psb_err_unit,*) name,& write(psb_err_unit,*) name,&
@ -716,25 +730,44 @@ subroutine mld_dprecsetsm(p,val,info,ilev)
return return
endif endif
select case(ipos_)
do ilev_ = ilmin, ilmax case(mld_pre_smooth_)
if (allocated(p%precv(ilev_)%sm)) then do ilev_ = ilmin, ilmax
if (allocated(p%precv(ilev_)%sm%sv)) then if (allocated(p%precv(ilev_)%sm)) then
deallocate(p%precv(ilev_)%sm%sv) if (allocated(p%precv(ilev_)%sm%sv)) then
endif deallocate(p%precv(ilev_)%sm%sv)
deallocate(p%precv(ilev_)%sm) endif
end if deallocate(p%precv(ilev_)%sm)
end if
#ifdef HAVE_MOLD #ifdef HAVE_MOLD
allocate(p%precv(ilev_)%sm,mold=val) allocate(p%precv(ilev_)%sm,mold=val)
#else #else
allocate(p%precv(ilev_)%sm,source=val) allocate(p%precv(ilev_)%sm,source=val)
#endif #endif
call p%precv(ilev_)%sm%default() call p%precv(ilev_)%sm%default()
end do p%precv(ilev_)%sm2 => p%precv(ilev_)%sm
end do
case(mld_post_smooth_)
do ilev_ = ilmin, ilmax
if (allocated(p%precv(ilev_)%sm2a)) then
if (allocated(p%precv(ilev_)%sm2a%sv)) then
deallocate(p%precv(ilev_)%sm2a%sv)
endif
deallocate(p%precv(ilev_)%sm2a)
end if
#ifdef HAVE_MOLD
allocate(p%precv(ilev_)%sm2a,mold=val)
#else
allocate(p%precv(ilev_)%sm2a,source=val)
#endif
call p%precv(ilev_)%sm2a%default()
p%precv(ilev_)%sm2 => p%precv(ilev_)%sm2a
end do
end select
end subroutine mld_dprecsetsm end subroutine mld_dprecsetsm
subroutine mld_dprecsetsv(p,val,info,ilev) subroutine mld_dprecsetsv(p,val,info,ilev,pos)
use psb_base_mod use psb_base_mod
use mld_d_prec_mod, mld_protect_name => mld_dprecsetsv use mld_d_prec_mod, mld_protect_name => mld_dprecsetsv
@ -746,10 +779,11 @@ subroutine mld_dprecsetsv(p,val,info,ilev)
class(mld_d_base_solver_type), intent(in) :: val class(mld_d_base_solver_type), intent(in) :: val
integer(psb_ipk_), intent(out) :: info integer(psb_ipk_), intent(out) :: info
integer(psb_ipk_), optional, intent(in) :: ilev integer(psb_ipk_), optional, intent(in) :: ilev
character(len=*), optional, intent(in) :: pos
! Local variables ! Local variables
integer(psb_ipk_) :: ilev_, nlev_, ilmin, ilmax integer(psb_ipk_) :: ilev_, nlev_, ilmin, ilmax, ipos_
character(len=*), parameter :: name='mld_precseti' character(len=*), parameter :: name='mld_precseti'
info = psb_success_ info = psb_success_
@ -772,6 +806,19 @@ subroutine mld_dprecsetsv(p,val,info,ilev)
ilmax = nlev_ ilmax = nlev_
end if end if
if (present(pos)) then
select case(psb_toupper(trim(pos)))
case('PRE')
ipos_ = mld_pre_smooth_
case('POST')
ipos_ = mld_post_smooth_
case default
ipos_ = mld_pre_smooth_
end select
else
ipos_ = mld_pre_smooth_
end if
if ((ilev_<1).or.(ilev_ > nlev_)) then if ((ilev_<1).or.(ilev_ > nlev_)) then
info = -1 info = -1
@ -781,16 +828,20 @@ subroutine mld_dprecsetsv(p,val,info,ilev)
endif endif
do ilev_ = ilmin, ilmax select case(ipos_)
if (allocated(p%precv(ilev_)%sm)) then case(mld_pre_smooth_)
if (allocated(p%precv(ilev_)%sm%sv)) then do ilev_ = ilmin, ilmax
if (.not.same_type_as(p%precv(ilev_)%sm%sv,val)) then if (allocated(p%precv(ilev_)%sm)) then
deallocate(p%precv(ilev_)%sm%sv,stat=info) if (allocated(p%precv(ilev_)%sm%sv)) then
if (info /= 0) then if (.not.same_type_as(p%precv(ilev_)%sm%sv,val)) then
info = 3111 deallocate(p%precv(ilev_)%sm%sv,stat=info)
return if (info /= 0) then
info = 3111
return
end if
end if end if
end if end if
if (.not.allocated(p%precv(ilev_)%sm%sv)) then if (.not.allocated(p%precv(ilev_)%sm%sv)) then
#ifdef HAVE_MOLD #ifdef HAVE_MOLD
allocate(p%precv(ilev_)%sm%sv,mold=val,stat=info) allocate(p%precv(ilev_)%sm%sv,mold=val,stat=info)
@ -802,19 +853,55 @@ subroutine mld_dprecsetsv(p,val,info,ilev)
return return
end if end if
end if end if
call p%precv(ilev_)%sm%sv%default()
else
info = 3111
write(psb_err_unit,*) name,&
&': Error: uninitialized preconditioner component,',&
&' should call MLD_PRECINIT/MLD_PRECSET'
return
end if end if
call p%precv(ilev_)%sm%sv%default()
else end do
info = 3111
write(psb_err_unit,*) name,& case(mld_post_smooth_)
&': Error: uninitialized preconditioner component,',& do ilev_ = ilmin, ilmax
&' should call MLD_PRECINIT/MLD_PRECSET' if (allocated(p%precv(ilev_)%sm2a)) then
return if (allocated(p%precv(ilev_)%sm2a%sv)) then
write(0,*)p%precv(ilev_)%sm2a%sv%get_fmt(),val%get_fmt()
end if if (.not.same_type_as(p%precv(ilev_)%sm2a%sv,val)) then
deallocate(p%precv(ilev_)%sm2a%sv,stat=info)
end do if (info /= 0) then
info = 3111
return
end if
end if
end if
if (.not.allocated(p%precv(ilev_)%sm2a%sv)) then
#ifdef HAVE_MOLD
allocate(p%precv(ilev_)%sm2a%sv,mold=val,stat=info)
#else
allocate(p%precv(ilev_)%sm2a%sv,source=val,stat=info)
#endif
if (info /= 0) then
info = 3111
return
end if
end if
call p%precv(ilev_)%sm2a%sv%default()
write(0,*)p%precv(ilev_)%sm2a%sv%get_fmt(),val%get_fmt()
else
info = 3111
write(psb_err_unit,*) name,&
&': Error: uninitialized preconditioner component,',&
&' should call MLD_PRECINIT/MLD_PRECSET'
return
end if
end do
end select
end subroutine mld_dprecsetsv end subroutine mld_dprecsetsv

@ -91,72 +91,79 @@ module mld_d_prec_mod
contains contains
subroutine mld_d_iprecsetsm(p,val,info) subroutine mld_d_iprecsetsm(p,val,info,pos)
type(mld_dprec_type), intent(inout) :: p type(mld_dprec_type), intent(inout) :: p
class(mld_d_base_smoother_type), intent(in) :: val class(mld_d_base_smoother_type), intent(in) :: val
integer(psb_ipk_), intent(out) :: info integer(psb_ipk_), intent(out) :: info
character(len=*), optional, intent(in) :: pos
call p%set(val,info) call p%set(val,info,pos=pos)
end subroutine mld_d_iprecsetsm end subroutine mld_d_iprecsetsm
subroutine mld_d_iprecsetsv(p,val,info) subroutine mld_d_iprecsetsv(p,val,info,pos)
type(mld_dprec_type), intent(inout) :: p type(mld_dprec_type), intent(inout) :: p
class(mld_d_base_solver_type), intent(in) :: val class(mld_d_base_solver_type), intent(in) :: val
integer(psb_ipk_), intent(out) :: info integer(psb_ipk_), intent(out) :: info
character(len=*), optional, intent(in) :: pos
call p%set(val,info) call p%set(val,info, pos=pos)
end subroutine mld_d_iprecsetsv end subroutine mld_d_iprecsetsv
subroutine mld_d_iprecseti(p,what,val,info) subroutine mld_d_iprecseti(p,what,val,info,pos)
type(mld_dprec_type), intent(inout) :: p type(mld_dprec_type), intent(inout) :: p
integer(psb_ipk_), intent(in) :: what integer(psb_ipk_), intent(in) :: what
integer(psb_ipk_), intent(in) :: val integer(psb_ipk_), intent(in) :: val
integer(psb_ipk_), intent(out) :: info integer(psb_ipk_), intent(out) :: info
character(len=*), optional, intent(in) :: pos
call p%set(what,val,info) call p%set(what,val,info)
end subroutine mld_d_iprecseti end subroutine mld_d_iprecseti
subroutine mld_d_iprecsetr(p,what,val,info) subroutine mld_d_iprecsetr(p,what,val,info,pos)
type(mld_dprec_type), intent(inout) :: p type(mld_dprec_type), intent(inout) :: p
integer(psb_ipk_), intent(in) :: what integer(psb_ipk_), intent(in) :: what
real(psb_dpk_), intent(in) :: val real(psb_dpk_), intent(in) :: val
integer(psb_ipk_), intent(out) :: info integer(psb_ipk_), intent(out) :: info
character(len=*), optional, intent(in) :: pos
call p%set(what,val,info) call p%set(what,val,info)
end subroutine mld_d_iprecsetr end subroutine mld_d_iprecsetr
subroutine mld_d_iprecsetc(p,what,val,info) subroutine mld_d_iprecsetc(p,what,val,info,pos)
type(mld_dprec_type), intent(inout) :: p type(mld_dprec_type), intent(inout) :: p
integer(psb_ipk_), intent(in) :: what integer(psb_ipk_), intent(in) :: what
character(len=*), intent(in) :: val character(len=*), intent(in) :: val
integer(psb_ipk_), intent(out) :: info integer(psb_ipk_), intent(out) :: info
character(len=*), optional, intent(in) :: pos
call p%set(what,val,info) call p%set(what,val,info)
end subroutine mld_d_iprecsetc end subroutine mld_d_iprecsetc
subroutine mld_d_cprecseti(p,what,val,info) subroutine mld_d_cprecseti(p,what,val,info,pos)
type(mld_dprec_type), intent(inout) :: p type(mld_dprec_type), intent(inout) :: p
character(len=*), intent(in) :: what character(len=*), intent(in) :: what
integer(psb_ipk_), intent(in) :: val integer(psb_ipk_), intent(in) :: val
integer(psb_ipk_), intent(out) :: info integer(psb_ipk_), intent(out) :: info
character(len=*), optional, intent(in) :: pos
call p%set(what,val,info) call p%set(what,val,info)
end subroutine mld_d_cprecseti end subroutine mld_d_cprecseti
subroutine mld_d_cprecsetr(p,what,val,info) subroutine mld_d_cprecsetr(p,what,val,info,pos)
type(mld_dprec_type), intent(inout) :: p type(mld_dprec_type), intent(inout) :: p
character(len=*), intent(in) :: what character(len=*), intent(in) :: what
real(psb_dpk_), intent(in) :: val real(psb_dpk_), intent(in) :: val
integer(psb_ipk_), intent(out) :: info integer(psb_ipk_), intent(out) :: info
character(len=*), optional, intent(in) :: pos
call p%set(what,val,info) call p%set(what,val,info)
end subroutine mld_d_cprecsetr end subroutine mld_d_cprecsetr
subroutine mld_d_cprecsetc(p,what,val,info) subroutine mld_d_cprecsetc(p,what,val,info,pos)
type(mld_dprec_type), intent(inout) :: p type(mld_dprec_type), intent(inout) :: p
character(len=*), intent(in) :: what character(len=*), intent(in) :: what
character(len=*), intent(in) :: val character(len=*), intent(in) :: val
integer(psb_ipk_), intent(out) :: info integer(psb_ipk_), intent(out) :: info
character(len=*), optional, intent(in) :: pos
call p%set(what,val,info) call p%set(what,val,info)
end subroutine mld_d_cprecsetc end subroutine mld_d_cprecsetc

@ -175,23 +175,25 @@ module mld_d_prec_type
end interface end interface
interface interface
subroutine mld_dprecsetsm(prec,val,info,ilev) subroutine mld_dprecsetsm(prec,val,info,ilev,pos)
import :: psb_dspmat_type, psb_desc_type, psb_dpk_, & import :: psb_dspmat_type, psb_desc_type, psb_dpk_, &
& mld_dprec_type, mld_d_base_smoother_type, psb_ipk_ & mld_dprec_type, mld_d_base_smoother_type, psb_ipk_
class(mld_dprec_type), intent(inout) :: prec class(mld_dprec_type), target, intent(inout) :: prec
class(mld_d_base_smoother_type), intent(in) :: val class(mld_d_base_smoother_type), intent(in) :: val
integer(psb_ipk_), intent(out) :: info integer(psb_ipk_), intent(out) :: info
integer(psb_ipk_), optional, intent(in) :: ilev integer(psb_ipk_), optional, intent(in) :: ilev
character(len=*), optional, intent(in) :: pos
end subroutine mld_dprecsetsm end subroutine mld_dprecsetsm
subroutine mld_dprecsetsv(prec,val,info,ilev) subroutine mld_dprecsetsv(prec,val,info,ilev,pos)
import :: psb_dspmat_type, psb_desc_type, psb_dpk_, & import :: psb_dspmat_type, psb_desc_type, psb_dpk_, &
& mld_dprec_type, mld_d_base_solver_type, psb_ipk_ & mld_dprec_type, mld_d_base_solver_type, psb_ipk_
class(mld_dprec_type), intent(inout) :: prec class(mld_dprec_type), intent(inout) :: prec
class(mld_d_base_solver_type), intent(in) :: val class(mld_d_base_solver_type), intent(in) :: val
integer(psb_ipk_), intent(out) :: info integer(psb_ipk_), intent(out) :: info
integer(psb_ipk_), optional, intent(in) :: ilev integer(psb_ipk_), optional, intent(in) :: ilev
character(len=*), optional, intent(in) :: pos
end subroutine mld_dprecsetsv end subroutine mld_dprecsetsv
subroutine mld_dprecseti(prec,what,val,info,ilev) subroutine mld_dprecseti(prec,what,val,info,ilev,pos)
import :: psb_dspmat_type, psb_desc_type, psb_dpk_, & import :: psb_dspmat_type, psb_desc_type, psb_dpk_, &
& mld_dprec_type, psb_ipk_ & mld_dprec_type, psb_ipk_
class(mld_dprec_type), intent(inout) :: prec class(mld_dprec_type), intent(inout) :: prec
@ -199,8 +201,9 @@ module mld_d_prec_type
integer(psb_ipk_), intent(in) :: val integer(psb_ipk_), intent(in) :: val
integer(psb_ipk_), intent(out) :: info integer(psb_ipk_), intent(out) :: info
integer(psb_ipk_), optional, intent(in) :: ilev integer(psb_ipk_), optional, intent(in) :: ilev
character(len=*), optional, intent(in) :: pos
end subroutine mld_dprecseti end subroutine mld_dprecseti
subroutine mld_dprecsetr(prec,what,val,info,ilev) subroutine mld_dprecsetr(prec,what,val,info,ilev,pos)
import :: psb_dspmat_type, psb_desc_type, psb_dpk_, & import :: psb_dspmat_type, psb_desc_type, psb_dpk_, &
& mld_dprec_type, psb_ipk_ & mld_dprec_type, psb_ipk_
class(mld_dprec_type), intent(inout) :: prec class(mld_dprec_type), intent(inout) :: prec
@ -208,8 +211,9 @@ module mld_d_prec_type
real(psb_dpk_), intent(in) :: val real(psb_dpk_), intent(in) :: val
integer(psb_ipk_), intent(out) :: info integer(psb_ipk_), intent(out) :: info
integer(psb_ipk_), optional, intent(in) :: ilev integer(psb_ipk_), optional, intent(in) :: ilev
character(len=*), optional, intent(in) :: pos
end subroutine mld_dprecsetr end subroutine mld_dprecsetr
subroutine mld_dprecsetc(prec,what,string,info,ilev) subroutine mld_dprecsetc(prec,what,string,info,ilev,pos)
import :: psb_dspmat_type, psb_desc_type, psb_dpk_, & import :: psb_dspmat_type, psb_desc_type, psb_dpk_, &
& mld_dprec_type, psb_ipk_ & mld_dprec_type, psb_ipk_
class(mld_dprec_type), intent(inout) :: prec class(mld_dprec_type), intent(inout) :: prec
@ -217,8 +221,9 @@ module mld_d_prec_type
character(len=*), intent(in) :: string character(len=*), intent(in) :: string
integer(psb_ipk_), intent(out) :: info integer(psb_ipk_), intent(out) :: info
integer(psb_ipk_), optional, intent(in) :: ilev integer(psb_ipk_), optional, intent(in) :: ilev
character(len=*), optional, intent(in) :: pos
end subroutine mld_dprecsetc end subroutine mld_dprecsetc
subroutine mld_dcprecseti(prec,what,val,info,ilev) subroutine mld_dcprecseti(prec,what,val,info,ilev,pos)
import :: psb_dspmat_type, psb_desc_type, psb_dpk_, & import :: psb_dspmat_type, psb_desc_type, psb_dpk_, &
& mld_dprec_type, psb_ipk_ & mld_dprec_type, psb_ipk_
class(mld_dprec_type), intent(inout) :: prec class(mld_dprec_type), intent(inout) :: prec
@ -226,8 +231,9 @@ module mld_d_prec_type
integer(psb_ipk_), intent(in) :: val integer(psb_ipk_), intent(in) :: val
integer(psb_ipk_), intent(out) :: info integer(psb_ipk_), intent(out) :: info
integer(psb_ipk_), optional, intent(in) :: ilev integer(psb_ipk_), optional, intent(in) :: ilev
character(len=*), optional, intent(in) :: pos
end subroutine mld_dcprecseti end subroutine mld_dcprecseti
subroutine mld_dcprecsetr(prec,what,val,info,ilev) subroutine mld_dcprecsetr(prec,what,val,info,ilev,pos)
import :: psb_dspmat_type, psb_desc_type, psb_dpk_, & import :: psb_dspmat_type, psb_desc_type, psb_dpk_, &
& mld_dprec_type, psb_ipk_ & mld_dprec_type, psb_ipk_
class(mld_dprec_type), intent(inout) :: prec class(mld_dprec_type), intent(inout) :: prec
@ -235,8 +241,9 @@ module mld_d_prec_type
real(psb_dpk_), intent(in) :: val real(psb_dpk_), intent(in) :: val
integer(psb_ipk_), intent(out) :: info integer(psb_ipk_), intent(out) :: info
integer(psb_ipk_), optional, intent(in) :: ilev integer(psb_ipk_), optional, intent(in) :: ilev
character(len=*), optional, intent(in) :: pos
end subroutine mld_dcprecsetr end subroutine mld_dcprecsetr
subroutine mld_dcprecsetc(prec,what,string,info,ilev) subroutine mld_dcprecsetc(prec,what,string,info,ilev,pos)
import :: psb_dspmat_type, psb_desc_type, psb_dpk_, & import :: psb_dspmat_type, psb_desc_type, psb_dpk_, &
& mld_dprec_type, psb_ipk_ & mld_dprec_type, psb_ipk_
class(mld_dprec_type), intent(inout) :: prec class(mld_dprec_type), intent(inout) :: prec
@ -244,6 +251,7 @@ module mld_d_prec_type
character(len=*), intent(in) :: string character(len=*), intent(in) :: string
integer(psb_ipk_), intent(out) :: info integer(psb_ipk_), intent(out) :: info
integer(psb_ipk_), optional, intent(in) :: ilev integer(psb_ipk_), optional, intent(in) :: ilev
character(len=*), optional, intent(in) :: pos
end subroutine mld_dcprecsetc end subroutine mld_dcprecsetc
end interface end interface
@ -478,6 +486,18 @@ contains
write(iout_,*) write(iout_,*)
return return
end if end if
if (allocated(p%precv(1)%sm2a)) then
write(iout_,*) 'Post smoother details'
call p%precv(1)%sm2a%descr(info,iout=iout_)
if (nlev == 1) then
if (p%precv(1)%parms%sweeps > 1) then
write(iout_,*) ' Number of smoother sweeps : ',&
& p%precv(1)%parms%sweeps
end if
write(iout_,*)
return
end if
end if
end if end if
! !

@ -11,12 +11,16 @@ FINCLUDES=$(FMFLAG). $(FMFLAG)$(MLDINCDIR) $(FMFLAG)$(PSBINCDIR) $(FIFLAG).
EXEDIR=./runs EXEDIR=./runs
all: spde3d ppde3d spde2d ppde2d all: spde3d ppde3d spde2d ppde2d ppde3d-gs
ppde3d: ppde3d.o data_input.o ppde3d: ppde3d.o data_input.o
$(F90LINK) ppde3d.o data_input.o -o ppde3d $(MLD_LIB) $(PSBLAS_LIB) $(LDLIBS) $(F90LINK) ppde3d.o data_input.o -o ppde3d $(MLD_LIB) $(PSBLAS_LIB) $(LDLIBS)
/bin/mv ppde3d $(EXEDIR) /bin/mv ppde3d $(EXEDIR)
ppde3d-gs: ppde3d-gs.o data_input.o
$(F90LINK) ppde3d-gs.o data_input.o -o ppde3d-gs $(MLD_LIB) $(PSBLAS_LIB) $(LDLIBS)
/bin/mv ppde3d-gs $(EXEDIR)
spde3d: spde3d.o data_input.o spde3d: spde3d.o data_input.o
$(F90LINK) spde3d.o data_input.o -o spde3d $(MLD_LIB) $(PSBLAS_LIB) $(LDLIBS) $(F90LINK) spde3d.o data_input.o -o spde3d $(MLD_LIB) $(PSBLAS_LIB) $(LDLIBS)
/bin/mv spde3d $(EXEDIR) /bin/mv spde3d $(EXEDIR)
@ -30,15 +34,15 @@ spde2d: spde2d.o data_input.o
$(F90LINK) spde2d.o data_input.o -o spde2d $(MLD_LIB) $(PSBLAS_LIB) $(LDLIBS) $(F90LINK) spde2d.o data_input.o -o spde2d $(MLD_LIB) $(PSBLAS_LIB) $(LDLIBS)
/bin/mv spde2d $(EXEDIR) /bin/mv spde2d $(EXEDIR)
ppde3d.o spde3d.o ppde2d.o spde2d.o: data_input.o ppde3d-gs.o ppde3d.o spde3d.o ppde2d.o spde2d.o: data_input.o
check: all check: all
cd runs && ./ppde2d <ppde.inp && ./spde2d<ppde.inp cd runs && ./ppde2d <ppde.inp && ./spde2d<ppde.inp
clean: clean:
/bin/rm -f data_input.o ppde3d.o spde3d.o ppde2d.o spde2d.o *$(.mod)\ /bin/rm -f data_input.o ppde3d-gs.o ppde3d.o spde3d.o ppde2d.o spde2d.o *$(.mod)\
$(EXEDIR)/ppde3d $(EXEDIR)/spde3d $(EXEDIR)/ppde2d $(EXEDIR)/spde2d $(EXEDIR)/ppde3d $(EXEDIR)/spde3d $(EXEDIR)/ppde2d $(EXEDIR)/spde2d $(EXEDIR)/ppde3d-gs
verycleanlib: verycleanlib:
(cd ../..; make veryclean) (cd ../..; make veryclean)

@ -1,6 +1,6 @@
RGMRES ! Iterative method: BiCGSTAB BiCG CGS RGMRES BiCGSTABL CG RGMRES ! Iterative method: BiCGSTAB BiCG CGS RGMRES BiCGSTABL CG
CSR ! Storage format CSR COO JAD CSR ! Storage format CSR COO JAD
0100 ! IDIM; domain size is idim**3 0030 ! IDIM; domain size is idim**3
2 ! ISTOPC 2 ! ISTOPC
0100 ! ITMAX 0100 ! ITMAX
10 ! ITRACE 10 ! ITRACE
@ -22,9 +22,9 @@ SMOOTHED ! Kind of aggregation: SMOOTHED, NONSMOOTHED, MINENE
DEC ! Type of aggregation DEC SYMDEC GLB DEC ! Type of aggregation DEC SYMDEC GLB
MULT ! Type of multilevel correction: ADD MULT MULT ! Type of multilevel correction: ADD MULT
TWOSIDE ! Side of correction PRE POST TWOSIDE (ignored for ADD) TWOSIDE ! Side of correction PRE POST TWOSIDE (ignored for ADD)
REPL ! Coarse level: matrix distribution DIST REPL DIST ! Coarse level: matrix distribution DIST REPL
BJAC ! Coarse level: solver JACOBI BJAC UMF SLU SLUDIST MUMPS BJAC ! Coarse level: solver JACOBI BJAC UMF SLU SLUDIST MUMPS
MUMPS ! Coarse level: subsolver DSCALE ILU UMF SLU SLUDIST MUMPS GS ! Coarse level: subsolver DSCALE ILU UMF SLU SLUDIST MUMPS
1 ! Coarse level: Level-set N for ILU(N) 1 ! Coarse level: Level-set N for ILU(N)
1.d-4 ! Coarse level: Threshold T for ILU(T,P) 1.d-4 ! Coarse level: Threshold T for ILU(T,P)
4 ! Coarse level: Number of Jacobi sweeps 4 ! Coarse level: Number of Jacobi sweeps

Loading…
Cancel
Save