1 SUBROUTINE esolver (RES,H1,H2,H2INV,INTYPE)
11 REAL RES (LX2,LY2,LZ2,LELV)
12 REAL H1 (LX1,LY1,LZ1,LELV)
13 REAL H2 (LX1,LY1,LZ1,LELV)
14 REAL H2INV (LX1,LY1,LZ1,LELV)
15 common /scruz/ wk1(lx2*ly2*lz2*lelv)
16 $ , wk2(lx2*ly2*lz2*lelv)
17 $ , wk3(lx2*ly2*lz2*lelv)
22 if (icalld.eq.0) teslv=0.0
30 if (.not. ifsplit)
then
31 if (param(42).eq.1)
then
32 CALL uzawa (res,h1,h2,h2inv,intype,icg)
37 WRITE(6,*)
'ERROR: E-solver does not exist PnPn'
53 common /ivrtx/ vertex((2**ldim)*lelt)
54 common /scruz/ xbar(ldim,lelt),ibar(lelt)
65 xbar(ldim,e) = zm1(nxb,nyb,nzb,e)
66 xbar(1 ,e) = xm1(nxb,nyb,nzb,e)
67 xbar(2 ,e) = ym1(nxb,nyb,nzb,e)
85 common /scbuf/ buf(lbuf)
90 open(unit=49,
file=name9)
91 write(6,*)
'Opening ',name9,
' in p_outveci. lda=',lda
105 call icopy(buf(1),ia(e),1)
106 call copy(buf(2),a(1,e),lda)
108 call csend (mtype,dum,wdsize,mid,nullpid)
109 call crecv2 (mtype,buf,len,mid)
111 write(49,49) mid,ibuf(1),(buf(k+1),k=1,lda)
112 49
format(2i12,1p3e16.7)
113 elseif (nid.eq.mid)
then
114 call icopy(buf(1),ia(e),1)
115 call copy(buf(2),a(1,e),lda)
116 call crecv2 (mtype,dum,wdsize,0)
117 call csend (mtype,buf,len,node0,nullpid)
123 write(6,*)
'Done writing to ',name9,
' p_outveci.'
subroutine crecv2(mtype, buf, lenm, jnid)
subroutine csend(mtype, buf, len, jnid, jpid)
real *8 function dnekclock()
integer function gllel(ieg)
integer function gllnid(ieg)
subroutine uzawa_gmres(res, h1, h2, h2inv, intype, iter)
subroutine icopy(a, b, n)
subroutine esolver(RES, H1, H2, H2INV, INTYPE)
subroutine p_outvec_ir(ia, a, lda, name9)
subroutine uzawa(rcg, h1, h2, h2inv, intype, iter)