diff --git a/cdn/cdntot.f90 b/cdn/cdntot.f90 index ad16fea5f4aaf678bf48a43f7500c6db5f3062b3..1a943cec586e3ed80c570b03d03859362ca3de5e 100644 --- a/cdn/cdntot.f90 +++ b/cdn/cdntot.f90 @@ -98,8 +98,6 @@ CONTAINS q = q + qis WRITE (6,FMT=8000) jspin,q,qis, (qmt(n),n=1,atoms%ntype) IF (input%film) WRITE (6,FMT=8010) (i,qvac(i),i=1,vacuum%nvac) - WRITE (16,FMT=8000) jspin,q,qis, (qmt(n),n=1,atoms%ntype) - IF (input%film) WRITE (16,FMT=8010) (i,qvac(i),i=1,vacuum%nvac) mtCharge = SUM(qmt(1:atoms%ntype) * atoms%neq(1:atoms%ntype)) names(1) = 'spin' ; WRITE(attributes(1),'(i0)') jspin ; lengths(1,1)=4 ; lengths(1,2)=1 names(2) = 'total' ; WRITE(attributes(2),'(f14.7)') q ; lengths(2,1)=5 ; lengths(2,2)=14 @@ -123,7 +121,6 @@ CONTAINS END DO ! loop over spins DEALLOCATE (lengths) WRITE (6,FMT=8020) qtot - WRITE (16,FMT=8020) qtot IF(l_printData) THEN CALL writeXMLElementFormPoly('totalCharge',(/'value'/),(/qtot/),reshape((/5,20/),(/1,2/))) END IF diff --git a/cdn/cdnval.F90 b/cdn/cdnval.F90 index 20f912f61010049b99d9af12a7540eee3636acd3..cda145f0a1dbfad82902eb983e4c1e1e48af514c 100644 --- a/cdn/cdnval.F90 +++ b/cdn/cdnval.F90 @@ -154,7 +154,6 @@ SUBROUTINE cdnval(eig_id, mpi,kpts,jspin,noco,input,banddos,cell,atoms,enpara,st IF (mpi%irank==0) THEN WRITE (6,FMT=8000) jspin - WRITE (16,FMT=8000) jspin CALL openXMLElementPoly('mtCharges',(/'spin'/),(/jspin/)) END IF 8000 FORMAT (/,/,10x,'valence density: spin=',i2) diff --git a/cdn/m_perp.f90 b/cdn/m_perp.f90 index 280c89b6b42218130e1b2d4bc8aa3f509bb1415c..8226437e96a3fa0f94985aba3c5393cb8f18ea8c 100644 --- a/cdn/m_perp.f90 +++ b/cdn/m_perp.f90 @@ -57,11 +57,9 @@ CONTAINS my = 2*AIMAG(qa21(itype)) mz = chmom(itype,1) - chmom(itype,2) WRITE (6,8025) mx,my - WRITE (16,8025) mx,my !---> determine the polar angles of the moment vector in the local frame CALL pol_angle(mx,my,mz,betah,alphh) WRITE (6,8026) betah,alphh - WRITE (16,8026) betah,alphh 8025 FORMAT(2x,'--> local frame: ','mx=',f9.5,' my=',f9.5) 8026 FORMAT(2x,'-->',10x,' delta beta=',f9.5,& & ' delta alpha=',f9.5) @@ -79,9 +77,7 @@ CONTAINS mz = rho11 - rho22 CALL pol_angle(mx,my,mz,betah,alphh) WRITE (6,8027) noco%beta(itype),noco%alph(itype)-alphdiff - WRITE (16,8027) noco%beta(itype),noco%alph(itype)-alphdiff WRITE (6,8028) betah,alphh-alphdiff - WRITE (16,8028) betah,alphh-alphdiff 8027 FORMAT(2x,'-->',10x,' input noco%beta=',f9.5, ' input noco%alpha=',f9.5) 8028 FORMAT(2x,'-->',10x,'output noco%beta=',f9.5, ' output noco%alpha=',f9.5) @@ -96,7 +92,6 @@ CONTAINS my_mix = 2*AIMAG(rho21) mz_mix = rho11 - rho22 WRITE (6,8031) mx_mix,my_mix - WRITE (16,8031) mx_mix,my_mix 8031 FORMAT(2x,'--> global frame: ','mixed mx=',f9.5,' mixed my=',f9.5) ! if magnetic moment (in local frame!) is negative, direction of quantization ! has to be antiparallel! @@ -109,7 +104,6 @@ CONTAINS ! calculate angles alpha and beta in global frame CALL pol_angle(mx_mix,my_mix,mz_mix,betah,alphh) WRITE (6,8029) betah,alphh-alphdiff - WRITE (16,8029) betah,alphh-alphdiff 8029 FORMAT(2x,'-->',10x,' new noco%beta =',f9.5, ' new noco%alpha =',f9.5) noco%alph(itype) = alphh noco%beta(itype) = betah @@ -129,9 +123,7 @@ CONTAINS b_con_outy = scale*my !---> mix input and output constraint fields WRITE (6,8100) noco%b_con(1,itype),noco%b_con(2,itype) - WRITE (16,8100) noco%b_con(1,itype),noco%b_con(2,itype) WRITE (6,8200) b_con_outx,b_con_outy - WRITE (16,8200) b_con_outx,b_con_outy noco%b_con(1,itype) = noco%b_con(1,itype) + noco%mix_b*b_con_outx noco%b_con(2,itype) = noco%b_con(2,itype) + noco%mix_b*b_con_outy ENDIF diff --git a/cdn/pwden.F90 b/cdn/pwden.F90 index 1d81c4ed1f519bbb179b54674c7bed228572eede..80b7f1f57e6e9a53203227b262a470574704ba1a 100644 --- a/cdn/pwden.F90 +++ b/cdn/pwden.F90 @@ -677,7 +677,6 @@ CONTAINS ENDDO ENDIF WRITE ( 6,'(''bad quality of charge density'',2f13.8)')q0, REAL( cwk(1) ) - WRITE (16,'(''bad quality of charge density'',2f13.8)')q0, REAL( cwk(1) ) CALL juDFT_warn('pwden: bad quality of charge') ENDIF ENDIF diff --git a/cdn/rot_den_mat.f b/cdn/rot_den_mat.f index 0ada86bb5e4a3599b33e9390b672e9f1987d7d95..097fa21fc28716b51726bc5acdcb90ac735d05c3 100644 --- a/cdn/rot_den_mat.f +++ b/cdn/rot_den_mat.f @@ -66,17 +66,14 @@ c---> check wether the diagonal elements of the rotated density c---> are real. DO ispin = 1,2 IF (aimag(rho(ispin,ispin)).GT.eps) THEN - WRITE(16,8000) - WRITE( 6,8000) CALL juDFT_error("rotation of mag. failed",calledby - + ="rot_den_mat") - ENDIF - ENDDO - 8000 FORMAT('After the rotation of the density matrix in the'/ + + ="rot_den_mat",hint='After the rotation of the density matrix in the'/ + 'muffin-tin sphere one diagonal element of the'/ + '(hermitian) density matrix is not real. That means'/ + 'that the density matrix was probably damaged.') - + ENDIF + ENDDO + rho11 = real(rho(1,1)) rho22 = real(rho(2,2)) rho21 = rho(2,1) diff --git a/cdn/vacden.F90 b/cdn/vacden.F90 index a9977298554fa438f86192c34ac172f2df45975a..554bcfe277eb32658cf3e3afa034fbd1f5edb234 100644 --- a/cdn/vacden.F90 +++ b/cdn/vacden.F90 @@ -164,8 +164,7 @@ CONTAINS eps=0.01 ic = CMPLX(0.,1.) ! ------------------ - ! WRITE (16,'(a,i2)') 'nstars=',nstars - + ! -----> set up mapping arrays IF (noco%l_ss) THEN jsp_start = 1 diff --git a/cdn_mt/cdnmt.F90 b/cdn_mt/cdnmt.F90 index 393f8dec5606848f743f486e34a252c513970a7e..ae2d24b0b8e0d1cd0025ba01912c97c41c292b99 100644 --- a/cdn_mt/cdnmt.F90 +++ b/cdn_mt/cdnmt.F90 @@ -225,14 +225,12 @@ CONTAINS !$OMP END PARALLEL WRITE (6,FMT=8000) - WRITE (16,FMT=8000) 8000 FORMAT (/,5x,'l-like charge',/,t6,'atom',t15,'s',t24,'p',& & t33,'d',t42,'f',t51,'total') DO itype = 1,atoms%ntype DO ispin = jsp_start,jsp_end WRITE ( 6,FMT=8100) itype, (qmtl(l,ispin,itype),l=0,3),moments%chmom(itype,ispin) - WRITE (16,FMT=8100) itype, (qmtl(l,ispin,itype),l=0,3),moments%chmom(itype,ispin) 8100 FORMAT (' -->',i3,2x,4f9.5,2x,f9.5) attributes = '' WRITE(attributes(1),'(i0)') itype diff --git a/cdn_mt/magMoms.f90 b/cdn_mt/magMoms.f90 index df75569b0319ffd6e71f045f701ab011724bec4e..49c013f54b59716c240642414a3be3fafa5fbb38 100644 --- a/cdn_mt/magMoms.f90 +++ b/cdn_mt/magMoms.f90 @@ -28,13 +28,11 @@ SUBROUTINE magMoms(dimension,input,atoms,noco,vTot,moments) CHARACTER(LEN=20) :: attributes(4) WRITE (6,FMT=8000) - WRITE (16,FMT=8000) DO iType = 1,atoms%ntype sval = moments%svdn(iType,1) - moments%svdn(iType,input%jspins) stot = moments%stdn(iType,1) - moments%stdn(iType,input%jspins) scor = stot - sval WRITE (6,FMT=8010) iType,stot,sval,scor,moments%svdn(iType,1),moments%stdn(iType,1) - WRITE (16,FMT=8010) iType,stot,sval,scor,moments%svdn(iType,1),moments%stdn(iType,1) END DO 8000 FORMAT (/,/,10x,'spin density at the nucleus:',/,10x,'type',t25,& @@ -43,14 +41,12 @@ SUBROUTINE magMoms(dimension,input,atoms,noco,vTot,moments) 8010 FORMAT (i13,2x,3e20.8,5x,2e20.8) WRITE (6,FMT=8020) - WRITE (16,FMT=8020) - + CALL openXMLElement('magneticMomentsInMTSpheres',(/'units'/),(/'muBohr'/)) iRepAtom = 1 DO iType = 1, atoms%ntype smom = moments%chmom(iType,1) - moments%chmom(iType,input%jspins) WRITE (6,FMT=8030) iType,smom, (moments%chmom(iType,j),j=1,input%jspins) - WRITE (16,FMT=8030) iType,smom, (moments%chmom(iType,j),j=1,input%jspins) attributes = '' WRITE(attributes(1),'(i0)') iType WRITE(attributes(2),'(f15.10)') smom diff --git a/cdn_mt/orbMagMoms.f90 b/cdn_mt/orbMagMoms.f90 index 9c10e1c1c934da3bdca4a21c4f4c58b6b8296ca0..1566b73ed2d951ae1de68ce51194fe489b67aca0 100644 --- a/cdn_mt/orbMagMoms.f90 +++ b/cdn_mt/orbMagMoms.f90 @@ -29,7 +29,6 @@ SUBROUTINE orbMagMoms(input,atoms,noco,clmom) thetai = noco%theta phii = noco%phi WRITE (6,FMT=9020) - WRITE (16,FMT=9020) CALL openXMLElement('orbitalMagneticMomentsInMTSpheres',(/'units'/),(/'muBohr'/)) DO iType = 1, atoms%ntype IF (noco%l_noco) THEN @@ -52,7 +51,6 @@ SUBROUTINE orbMagMoms(input,atoms,noco,clmom) sin(phii)*clmom(2,iType,2)) WRITE (6,FMT=8030) iType,slmom,(clmom(3,iType,j),j=1,2) - WRITE (16,FMT=8030) iType,slmom,(clmom(3,iType,j),j=1,2) attributes = '' WRITE(attributes(1),'(i0)') iType WRITE(attributes(2),'(f15.10)') slmom diff --git a/core/ccdnup.f90 b/core/ccdnup.f90 index 9cf85eeb04957dad770be455860e37b486ad290c..a9a9e96b2939006835aa62b58cffd0acf1de4524 100644 --- a/core/ccdnup.f90 +++ b/core/ccdnup.f90 @@ -66,9 +66,7 @@ CONTAINS CALL intgr3(rhoc,atoms%rmsh(1,jatom),atoms%dx(jatom),nm,rhs) tecs(jatom,jspin) = sume/input%jspins - rhs WRITE (6,FMT=8010) jatom,jspin,tecs(jatom,jspin),sume/input%jspins - WRITE (16,FMT=8010) jatom,jspin,tecs(jatom,jspin),sume/input%jspins - ! write(17) tec - + ! ---> simpson integration dxx = atoms%dx(jatom) d = EXP(atoms%dx(jatom)) @@ -81,10 +79,7 @@ CONTAINS q = q + rad*rhoss(nm1+1) ENDDO q = 2*q*dxx/3 - !+sb WRITE (6,FMT=8000) q/input%jspins - WRITE (16,FMT=8000) q/input%jspins - !-sb qints(jatom,jspin) = q*atoms%neq(jatom) END DO ! end-do-loop input%jspins diff --git a/core/cored.F90 b/core/cored.F90 index 28295ec83f4fed6ab5a4459777da61531e6cc955..58c7d80ff9a203cdfec9e7a3fee579ab053fb565 100644 --- a/core/cored.F90 +++ b/core/cored.F90 @@ -71,7 +71,6 @@ CONTAINS nm = atoms%jri(n) CALL intgr3(rhoc,atoms%rmsh(1,n),atoms%dx(n),nm,rhos) sea = tec(n,jspin) + rhos - WRITE (16,FMT=8030) n,jspin,tec(n,jspin),sea WRITE (6,FMT=8030) n,jspin,tec(n,jspin),sea seig = seig + atoms%neq(n)*sea ENDDO @@ -97,7 +96,6 @@ CONTAINS ncmsh = MIN( ncmsh, DIMENSION%msh ) rn = rnot* (d** (ncmsh-1)) WRITE (6,FMT=8000) z,rnot,dxx,atoms%jri(jatom) - WRITE (16,FMT=8000) z,rnot,dxx,atoms%jri(jatom) DO j = 1,atoms%jri(jatom) rhoss(j) = 0. vrd(j) = vr(j,jatom) @@ -144,7 +142,6 @@ CONTAINS CALL differ(fn,fl,fj,c,z,dxx,rnot,rn,d,ncmsh,vrd, e, a,b,ierr) stateEnergies(korb) = e WRITE (6,FMT=8010) fn,fl,fj,e,weight - WRITE (16,FMT=8010) fn,fl,fj,e,weight IF (ierr/=0) CALL juDFT_error("error in core-level routine" ,calledby ="cored") IF (input%gw==1 .OR. input%gw==3) WRITE (15) NINT(fl),weight,e,& a(1:atoms%jri(jatom)),b(1:atoms%jri(jatom)) @@ -175,8 +172,7 @@ CONTAINS CALL intgr3(rhoc,atoms%rmsh(1,jatom),atoms%dx(jatom),nm,rhs) tec(jatom,jspin) = sume - rhs WRITE (6,FMT=8030) jatom,jspin,tec(jatom,jspin),sume - WRITE (16,FMT=8030) jatom,jspin,tec(jatom,jspin),sume - + ! ---> simpson integration rad = atoms%rmt(jatom) q = rad*rhoss(nm)/2. @@ -189,7 +185,6 @@ CONTAINS q = 2*q*dxx/3 !+sb WRITE (6,FMT=8020) q/input%jspins - WRITE (16,FMT=8020) q/input%jspins !-sb qint(jatom,jspin) = q*atoms%neq(jatom) attributes = '' diff --git a/core/etabinit.F90 b/core/etabinit.F90 index 2b0797dc3192375c4fe12dfc94069b89448cd09f..d58b181cd185a244b88a7e55b1d72e0c9bc59886 100644 --- a/core/etabinit.F90 +++ b/core/etabinit.F90 @@ -59,7 +59,6 @@ CONTAINS d = EXP(atoms%dx(jatom)) rn = rnot* (d** (ncmsh-1)) WRITE (6,FMT=8000) z,rnot,dxx,atoms%jri(jatom) - WRITE (16,FMT=8000) z,rnot,dxx,atoms%jri(jatom) DO j = 1,atoms%jri(jatom) vrd(j) = vr(j,jatom) ENDDO @@ -95,7 +94,6 @@ CONTAINS e, a,b,ierr) IF (ierr/=0) CALL juDFT_error("error in core-levels",calledby="etabinit") WRITE (6,FMT=8010) fn,fl,fj,e,weight - WRITE (16,FMT=8010) fn,fl,fj,e,weight eig(korb) = e ENDDO ic = 0 diff --git a/dos/cdninf.f90 b/dos/cdninf.f90 index 2ef9613ad8cd04b74e8cca1aa754910993942413..8a51e275ae0f7c8a67e6c1e5242fe03b6b7ed27b 100644 --- a/dos/cdninf.f90 +++ b/dos/cdninf.f90 @@ -76,7 +76,6 @@ CONTAINS IF (input%film) THEN WRITE (6,FMT=8000) (bkpt(i),i=1,3) - WRITE (16,FMT=8000) (bkpt(i),i=1,3) 8000 FORMAT (/,3x,'q(atom,l): k=',3f10.5,/,/,t8,'e',t13,'max',t18,& & 'int',t22,'vac',t28,'spheres(s,p,d,f)') IF (banddos%dos) THEN @@ -89,7 +88,6 @@ CONTAINS END IF ELSE WRITE (6,FMT=8010) (bkpt(i),i=1,3) - WRITE (16,FMT=8010) (bkpt(i),i=1,3) 8010 FORMAT (/,3x,'q(atom,l): k=',3f10.5,/,/,t8,'e',t13,'max',t18,& & 'int',t24,'spheres(s,p,d,f)') IF (banddos%dos) THEN @@ -102,7 +100,6 @@ CONTAINS DO iband = 1,nbands IF (sliceplot%slice) THEN WRITE (6,FMT=8030) iband,eig(iband) - WRITE (16,FMT=8030) iband,eig(iband) 8030 FORMAT (' cdnval: slice for i=',i4,' and energy',1e12.4) END IF @@ -136,8 +133,6 @@ CONTAINS IF (input%film) THEN WRITE (6,FMT=8040) eig(iband),chstat(lqmax),itypqmax,& & iqispc,iqvacpc, ((iqalpc(l,ityp),l=0,3),ityp=1,atoms%ntype) - WRITE (16,FMT=8040) eig(iband),chstat(lqmax),itypqmax,& - & iqispc,iqvacpc, ((iqalpc(l,ityp),l=0,3),ityp=1,atoms%ntype) 8040 FORMAT (f10.4,2x,a1,i2,2x,2i3, (t26,6 (4i3,1x))) IF (banddos%dos) THEN IF (banddos%ndir.NE.0) THEN @@ -170,8 +165,6 @@ CONTAINS ELSE WRITE (6,FMT=8080) eig(iband),chstat(lqmax),itypqmax,& & iqispc, ((iqalpc(l,ityp),l=0,3),ityp=1,atoms%ntype) - WRITE (16,FMT=8080) eig(iband),chstat(lqmax),itypqmax,& - & iqispc, ((iqalpc(l,ityp),l=0,3),ityp=1,atoms%ntype) 8080 FORMAT (f10.4,2x,a1,i2,2x,i3, (t26,6 (4i3,1x))) IF (banddos%dos) THEN IF (banddos%ndir.NE.0) THEN diff --git a/eigen/vacfun.f90 b/eigen/vacfun.f90 index f6daf2f87dacd57509393c5f67ea485ea08f14ef..4fad04570b39d16dc208f2012be2f744fc7dfe59 100644 --- a/eigen/vacfun.f90 +++ b/eigen/vacfun.f90 @@ -99,7 +99,6 @@ CONTAINS phase = stars%rgphs(i1,i2,i3) ind2 = stars%ig2(ind3) IF (ind2.EQ.0) THEN - WRITE (16,FMT=8000) ik,jk WRITE (6,FMT=8000) ik,jk 8000 FORMAT (' **** error in map2 for 2-d stars',2i5) CALL juDFT_error("error in map2 for 2-d stars",calledby ="vacfun") diff --git a/eigen_soc/eigenso.F90 b/eigen_soc/eigenso.F90 index 93d287e3ba5f1ae4af9a352559b5010710743780..e19dac8912054981f749235753830a6727ffcb74 100644 --- a/eigen_soc/eigenso.F90 +++ b/eigen_soc/eigenso.F90 @@ -144,8 +144,8 @@ CONTAINS input,noco,cell,oneD,nk,usdus,rsoc,nsz,nmat, eig_so,zso) CALL timestop("eigenso: alineso") IF (mpi%irank.EQ.0) THEN - WRITE (16,FMT=8010) nk,nsz - WRITE (16,FMT=8020) (eig_so(i),i=1,nsz) + WRITE (6,FMT=8010) nk,nsz + WRITE (6,FMT=8020) (eig_so(i),i=1,nsz) ENDIF 8010 FORMAT (1x,/,/,' #k=',i6,':',/,& ' the',i4,' SOC eigenvalues are:') diff --git a/fermi/dosef.f b/fermi/dosef.f index 289d4d3e8ff7b77a6b0b985046c7c0b4d0a55371..8bd4eaf2cee227d07d537b04cf8609e9522fe1af 100644 --- a/fermi/dosef.f +++ b/fermi/dosef.f @@ -52,7 +52,6 @@ c--- > e1 write results of triang ELSE IF ( irank == 0 ) THEN WRITE (6,*) 'reading tetrahedrons from file kpts' - WRITE (16,*) 'reading tetrahedrons from file kpts' END IF OPEN (41,file='kpts',FORM='formatted',STATUS='old') DO i = 1, nkpt+1 @@ -130,11 +128,9 @@ c---> write results of triang atr(i) = atr(i)/as ENDDO IF ( irank == 0 ) THEN - WRITE (16,FMT=8010) ntria,as WRITE (6,FMT=8010) ntria,as DO i = 1,ntria WRITE (6,FMT=8020) i, (itria(j,i),j=1,3),atr(i) - WRITE (16,FMT=8020) i, (itria(j,i),j=1,3),atr(i) ENDDO END IF 8010 FORMAT (/,10x,'triangular decomposition of brillouin zone:',/, @@ -143,7 +139,6 @@ c---> write results of triang + 'no.,corners and (normalized) area of each triangle:',/) 8020 FORMAT (10x,i3,3x,3i3,f14.6) IF ( irank == 0 ) THEN - WRITE (16,FMT=*) 'ef_hist=',ef WRITE (6,FMT=*) 'ef_hist=',ef END IF ei = ef @@ -172,7 +167,7 @@ c IF (emin.GT.emax) GO TO 90 ENDIF IF (ct.NE.zc) THEN - IF ( irank == 0 ) WRITE (16,FMT=*) '2nd dosint' + IF ( irank == 0 ) WRITE (6,FMT=*) '2nd dosint' c---> refine ef to a value of 5 mry * (2**-20) iterate : DO i = 1, 40 ei = 0.5* (emin+emax) @@ -196,7 +191,6 @@ c dez = zc - ct workf = -13.6058*2*ef IF ( irank == 0 ) THEN - WRITE (16,FMT=8030) ef,workf,del,dez WRITE (6,FMT=8030) ef,workf,del,dez END IF 8030 FORMAT(/,10x,'fermi energy=',f10.5,' har',/,10x,'work function=' @@ -245,7 +239,6 @@ c seigv = sfac*seigv chmom = s1 - jspins*s IF ( irank == 0 ) THEN - WRITE (16,FMT=8040) seigv,s1,chmom WRITE (6,FMT=8040) seigv,s1,chmom END IF 8040 FORMAT (/,10x,'sum of valence eigenvalues=',f20.6,5x, @@ -253,7 +246,6 @@ c RETURN c 230 IF ( irank == 0 ) THEN - WRITE (16,FMT=8050) ei,ef,emin,emax,ct,zc WRITE (6,FMT=8050) ei,ef,emin,emax,ct,zc END IF 8050 FORMAT (/,/,10x,'error fertri: initial guess of ef off by 25 mry', diff --git a/force/force_a3.f90 b/force/force_a3.f90 index cef713253269503704167edc3aec804ea7dc301c..987f4dc24e4f7584edf002c60bc34ad99a7a2323 100644 --- a/force/force_a3.f90 +++ b/force/force_a3.f90 @@ -44,7 +44,6 @@ CONTAINS grd1(3,1) = czero ! WRITE (6,*) - WRITE (16,*) spin: DO jsp = 1,input%jspins na = 1 DO n = 1,atoms%ntype @@ -78,8 +77,6 @@ CONTAINS !+Gu a3_2 = vr(atoms%jri(n),lh,n,jsp)/(input%jspins*atoms%rmt(n)) !-Gu - ! WRITE (16,FMT=8000) a3_1,a3_2,zatom(n),rmt(n) - ! 8000 FORMAT (' a3_1,a3_2,zatom(n),rmt(n)',4e12.4) DO i = 1,3 forc_a3(i) = forc_a3(i) + (a3_1+a3_2)*gv(i)*atoms%zatom(n) END DO @@ -91,9 +88,7 @@ CONTAINS ! ! write result WRITE (6,FMT=8010) n - WRITE (16,FMT=8010) n WRITE (6,FMT=8020) (forc_a3(i),i=1,3) - WRITE (16,FMT=8020) (forc_a3(i),i=1,3) 8010 FORMAT (' FORCES: EQUATION A3 FOR ATOM TYPE',i4) 8020 FORMAT (' FX_A3=',2f10.6,' FY_A3=',2f10.6,' FZ_A3=',2f10.6) diff --git a/force/force_a4.f90 b/force/force_a4.f90 index 4a3fffd4b2e0fa84ceb258c4ba3a3a68696bdb25..b0e195b482305dd1b2a18ea1f1d2799ba59e1779 100644 --- a/force/force_a4.f90 +++ b/force/force_a4.f90 @@ -62,7 +62,6 @@ CONTAINS END DO ! CALL intgr0(rhoc(:,n,jsp),atoms%rmsh(1,n),atoms%dx(n),atoms%jri(n),qcore) - ! write(16,1616) qcore 8000 FORMAT (' FORCE_A4: core charge=',1p,e16.8) ! ! @@ -135,9 +134,7 @@ CONTAINS ! write result ! WRITE (6,FMT=8010) n - WRITE (16,FMT=8010) n WRITE (6,FMT=8020) (forc_a4(i),i=1,3) - WRITE (16,FMT=8020) (forc_a4(i),i=1,3) 8010 FORMAT (' FORCES: EQUATION A4 FOR ATOM TYPE',i4) 8020 FORMAT (' FX_A4=',2f10.6,' FY_A4=',2f10.6,' FZ_A4=',2f10.6) ! type loop ends diff --git a/force/force_a4_add.f90 b/force/force_a4_add.f90 index a7bcce1bcc864c87361c59eb73e35b5582d6af58..acae9f062f44269858f4b1852c9459bfb95c1e6b 100644 --- a/force/force_a4_add.f90 +++ b/force/force_a4_add.f90 @@ -169,26 +169,10 @@ CONTAINS ! write to out-file WRITE (6,FMT=8010) n - WRITE (16,FMT=8010) n WRITE (6,FMT=8020) ((force_a4_is(dir,n,jsp)),dir=1,3) ! 8020 - WRITE (16,FMT=8020) ((force_a4_is(dir,n,jsp)),dir=1,3) ! 8020 - ! WRITE (6,FMT=8020) (real(force_a4_is(dir,n,jsp)),dir=1,3) - ! WRITE (16,FMT=8020) (real(force_a4_is(dir,n,jsp)),dir=1,3) WRITE (6,FMT=8015) n - WRITE (16,FMT=8015) n WRITE (6,FMT=8020) ((force_a4_mt(dir,n,jsp)),dir=1,3) ! 8020 - WRITE (16,FMT=8020) ((force_a4_mt(dir,n,jsp)),dir=1,3) ! 8020 - ! WRITE (6,FMT=8020) (real(force_a4_mt(dir,n,jsp)),dir=1,3) - ! WRITE (16,FMT=8020) (real(force_a4_mt(dir,n,jsp)),dir=1,3) - ! IF (film.AND..not.odi%d1) THEN - ! WRITE (6,FMT=8025) n - ! WRITE (16,FMT=8025) n - ! WRITE (6,FMT=8070) ((force_a4_2d(dir,n,jsp)),dir=1,3) - ! WRITE (16,FMT=8070) ((force_a4_2d(dir,n,jsp)),dir=1,3) - ! ! WRITE (6,FMT=8070) (real(force_a4_2d(dir,n,jsp)),dir=1,3) - ! ! WRITE (16,FMT=8070) (real(force_a4_2d(dir,n,jsp)),dir=1,3) - ! END IF -8010 FORMAT (' FORCES: IS ADDITION TO EQUATION A4 FOR ATOM TYPE',i4) + FORMAT (' FORCES: IS ADDITION TO EQUATION A4 FOR ATOM TYPE',i4) 8015 FORMAT (' FORCES: MT ADDITION TO EQUATION A4 FOR ATOM TYPE',i4) ! 8025 FORMAT (' FORCES: VACUUM ADD. TO EQUATION A4 FOR ATOM TYPE',i4) ! 8020 FORMAT (' FX_A4=',2f19.15,' FY_A4=',2f19.15,' FZ_A4=',2f19.15) diff --git a/force/force_a8.F90 b/force/force_a8.F90 index 68cf8c701869bab7806f093b665f6c6837e36dcc..f49bc1090f8a8cc314e56d03a2f1f7668ff02ddb 100644 --- a/force/force_a8.F90 +++ b/force/force_a8.F90 @@ -54,8 +54,7 @@ CONTAINS CALL timestart("force_a8") WRITE (6,*) - WRITE (16,*) - + na = 1 DO n = 1,atoms%ntype IF (atoms%l_geo(n)) THEN @@ -73,7 +72,6 @@ CONTAINS ! components of the density have been multiplied by r**2 ! (see for example subr. checkdop which constructs true MT-density at Rmt) ! factor sqrt(4pi) comes from Y_00 * \int d\Omega = 1/sqrt(4pi) * 4pi - ! write(16,1616) qval*sfp 8000 FORMAT (' FORCE_A8: valence charge=',1p,e16.8) ! PART I of FORCE_A8 @@ -240,9 +238,7 @@ CONTAINS ! write result ! WRITE (6,FMT=8010) n - WRITE (16,FMT=8010) n WRITE (6,FMT=8020) (forc_a8(i),i=1,3) - WRITE (16,FMT=8020) (forc_a8(i),i=1,3) 8010 FORMAT (' FORCES: EQUATION A8 FOR ATOM TYPE',i4) 8020 FORMAT (' FX_A8=',2f10.6,' FY_A8=',2f10.6,' FZ_A8=',2f10.6) @@ -256,51 +252,39 @@ CONTAINS IF (.NOT.input%l_useapw) THEN WRITE (6,*) - WRITE (16,*) DO n=1,atoms%ntype IF (atoms%l_geo(n)) THEN WRITE (6,FMT=8030) n - WRITE (16,FMT=8030) n WRITE (6,FMT=8040) (force%f_a12(i,n),i=1,3) - WRITE (16,FMT=8040) (force%f_a12(i,n),i=1,3) ENDIF 8030 FORMAT (' FORCES: EQUATION A12 FOR ATOM TYPE',i4) 8040 FORMAT (' FX_A12=',2f10.6,' FY_A12=',2f10.6,' FZ_A12=',2f10.6) ENDDO ELSE WRITE (6,*) - WRITE (16,*) DO n=1,atoms%ntype IF (atoms%l_geo(n)) THEN WRITE (6,FMT=8070) n - WRITE (16,FMT=8070) n WRITE (6,FMT=8080) (force%f_b4(i,n),i=1,3) - WRITE (16,FMT=8080) (force%f_b4(i,n),i=1,3) ENDIF 8070 FORMAT (' FORCES: EQUATION B4 FOR ATOM TYPE',i4) 8080 FORMAT (' FX_B4=',2f10.6,' FY_B4=',2f10.6,' FZ_B4=',2f10.6) ENDDO WRITE (6,*) - WRITE (16,*) DO n=1,atoms%ntype IF (atoms%l_geo(n)) THEN WRITE (6,FMT=8090) n - WRITE (16,FMT=8090) n WRITE (6,FMT=8100) (force%f_b8(i,n),i=1,3) - WRITE (16,FMT=8100) (force%f_b8(i,n),i=1,3) ENDIF 8090 FORMAT (' FORCES: EQUATION B8 FOR ATOM TYPE',i4) 8100 FORMAT (' FX_B8=',2f10.6,' FY_B8=',2f10.6,' FZ_B8=',2f10.6) ENDDO ENDIF WRITE (6,*) - WRITE (16,*) DO n=1,atoms%ntype IF (atoms%l_geo(n)) THEN WRITE (6,FMT=8050) n - WRITE (16,FMT=8050) n WRITE (6,FMT=8060) (force%f_a21(i,n),i=1,3) - WRITE (16,FMT=8060) (force%f_a21(i,n),i=1,3) ENDIF 8050 FORMAT (' FORCES: EQUATION A21 FOR ATOM TYPE',i4) 8060 FORMAT (' FX_A21=',2f10.6,' FY_A21=',2f10.6,' FZ_A21=',2f10.6) diff --git a/force/force_sf.F90 b/force/force_sf.F90 index 3c6184c8d6df8e395937ed431cc404bda46fe2cc..c75402d10b9812f11d1b4be08b3b21c00df96ac4 100644 --- a/force/force_sf.F90 +++ b/force/force_sf.F90 @@ -554,12 +554,9 @@ force_sf(:,:) = force_is(:,:) - force_mt(:,:) force(:,:,isp) = force(:,:,isp) + real(force_sf(:,:)) WRITE (6,*) - WRITE (16,*) DO itype = 1,atoms%ntype WRITE (6,FMT=8010) itype - WRITE (16,FMT=8010) itype WRITE (6,FMT=8020) (force_sf(dir,itype),dir=1,3) - WRITE (16,FMT=8020) (force_sf(dir,itype),dir=1,3) END DO ! itype isdone = .false. mtdone = .false. diff --git a/force/force_w.f90 b/force/force_w.f90 index afed9bae0f037e3e0ce865d2293f3bcf99803e72..01d5c0cd845cf7a4f43191ee22d874f646ae2561 100644 --- a/force/force_w.f90 +++ b/force/force_w.f90 @@ -38,8 +38,6 @@ IF (input%jspins.EQ.2) THEN DO jsp = 1,input%jspins WRITE (6,FMT=8000) jsp,n, (atoms%pos(i,nat1),i=1,3),& - & (results%force(i,n,jsp),i=1,3) - WRITE (16,FMT=8000) jsp,n, (atoms%pos(i,nat1),i=1,3),& & (results%force(i,n,jsp),i=1,3) END DO END IF @@ -53,7 +51,6 @@ ! write total forces ! WRITE (6,8005) - WRITE (16,8005) 8005 FORMAT (/,' ***** TOTAL FORCES ON ATOMS ***** ',/) IF (input%l_f) CALL openXMLElement('totalForcesOnRepresentativeAtoms',(/'units'/),(/'Htr/bohr'/)) nat1 = 1 @@ -70,9 +67,7 @@ WRITE (6,FMT=8010) n, (atoms%pos(i,nat1),i=1,3),& & (forcetot(i,n),i=1,3) - WRITE (16,FMT=8010) n, (atoms%pos(i,nat1),i=1,3),& - & (forcetot(i,n),i=1,3) - 8010 FORMAT (' TOTAL FORCE FOR ATOM TYPE=',i3,2x,'X=',f7.3,3x,'Y=',& + 8010 FORMAT (' TOTAL FORCE FOR ATOM TYPE=',i3,2x,'X=',f7.3,3x,'Y=',& & f7.3,3x,'Z=',f7.3,/,22x,' FX_TOT=',f9.6,& & ' FY_TOT=',f9.6,' FZ_TOT=',f9.6) diff --git a/global/checkdop.F90 b/global/checkdop.F90 index 45eb6abc090602afe3ff2ea0c44589e9ba10b884..e9f010562d8d4ece9e8157369e233d4cd82b29ff 100644 --- a/global/checkdop.F90 +++ b/global/checkdop.F90 @@ -86,10 +86,8 @@ ! ---> vacuum part IF (l_cdn) THEN WRITE (6,FMT=9000) ivac - WRITE (16,FMT=9000) ivac ELSE WRITE (6,FMT=8000) ivac - WRITE (16,FMT=8000) ivac ENDIF DO j = 1,np IF (.NOT.oneD%odi%d1) THEN @@ -117,17 +115,14 @@ rcc=MATMUL(cell%bmat,p(:,j))/tpi_const WRITE (6,FMT=8020) rcc,(p(i,j),i=1,3),v1(j),v2(j) - WRITE (16,FMT=8020) rcc,(p(i,j),i=1,3),v1(j),v2(j) ELSE !CALL cotra0(p(1,j),rcc,cell%amat) rcc=MATMUL(cell%amat,p(:,j)) WRITE (6,FMT=8020) (p(i,j),i=1,3),rcc,v1(j),v2(j) - WRITE (16,FMT=8020) (p(i,j),i=1,3),rcc,v1(j),v2(j) ENDIF ENDDO CALL fitchk(v1(:np),v2(:np),av,rms,dms) WRITE (6,FMT=8030) av,rms,dms - WRITE (16,FMT=8030) av,rms,dms RETURN ENDIF ! ----> interstitial part @@ -147,10 +142,8 @@ ! ----> m.t. part IF (l_cdn) THEN WRITE (6,FMT=9010) n - WRITE (16,FMT=9010) n ELSE WRITE (6,FMT=8010) n - WRITE (16,FMT=8010) n ENDIF ir2 = 1.0 IF (l_cdn) ir2 = 1.0 / ( atoms%rmt(n)*atoms%rmt(n) ) @@ -203,12 +196,10 @@ rcc=MATMUL(cell%bmat,p(:,j))/tpi_const WRITE (6,FMT=8020) rcc, (p(i,j),i=1,3),v1(j),v2(j) - WRITE (16,FMT=8020) rcc, (p(i,j),i=1,3),v1(j),v2(j) END IF ENDDO CALL fitchk(v1(:np),v2(:np),av,rms,dms) WRITE (6,FMT=8030) av,rms,dms - WRITE (16,FMT=8030) av,rms,dms 8000 FORMAT (/,' int.-vac. boundary (potential): ivac=',i2,/,t10,& & 'int-coord',t36,'cart-coord',t57,' inter. ',t69,' vacuum ') 8010 FORMAT (/,' int.-m.t. boundary (potential): atom type=',i2,/,& diff --git a/global/convn.f90 b/global/convn.f90 index 4ca9104da1345d3312fa73826aebecba2c545f7b..90887fea81ce8b0b6afff11a98cd5381f491ec9a 100644 --- a/global/convn.f90 +++ b/global/convn.f90 @@ -57,22 +57,18 @@ !---> output and make sure ncv(n).le.ncvd 30 CONTINUE WRITE (6,FMT=8010) - WRITE (16,FMT=8010) DO 40 n = 1,atoms%ntype nc = atoms%ncv(n) l = nc - 1 WRITE (6,FMT=8020) n,nc,l - WRITE (16,FMT=8020) n,nc,l 40 CONTINUE l = dimension%ncvd - 1 WRITE (6,FMT=8030) dimension%ncvd,l - WRITE (16,FMT=8030) dimension%ncvd,l DO 50 n = 1,atoms%ntype atoms%ncv(n) = min0(atoms%ncv(n),dimension%ncvd) 50 CONTINUE RETURN 60 WRITE (6,FMT=8040) n,sck - WRITE (16,FMT=8040) n,sck CALL juDFT_error("ncv",calledby="convn") 8000 FORMAT (10i5) 8010 FORMAT (/,/,10x,'convergence parameters for the pseudocharge',& diff --git a/global/triang.f b/global/triang.f index 27d57218c0989af7c5f36b36497d1db962ac4504..74a29f8b9bea4540f56b9d1798e7623695632491 100644 --- a/global/triang.f +++ b/global/triang.f @@ -221,8 +221,6 @@ c ENDDO ENDDO ELSE -c write(16,1000) ((v(i,j),i=1,2),j=1,nt) -! CALL juDFT_error("triang",calledby="triang") ENDIF c 99001 FORMAT (' $$$ error in triang: collinear k-points'/(5x,2F12.6)) diff --git a/hybrid/read_core.F90 b/hybrid/read_core.F90 index 9f0bfeaf86d34e491b111af5325ec6f4b8800810..1f696eee69805ffb6ff46e2a03876770486a8618 100644 --- a/hybrid/read_core.F90 +++ b/hybrid/read_core.F90 @@ -401,7 +401,6 @@ rn = rnot* (d** (ncmsh-1)) IF ( mpi%irank == 0 ) THEN WRITE(6 ,FMT=8000) z,rnot,dxx,atoms%jri(itype) - WRITE(16,FMT=8000) z,rnot,dxx,atoms%jri(itype) END IF DO j = 1,atoms%jri(itype) vrd(j) = vr0(j,itype,jspin) @@ -453,7 +452,6 @@ IF ( mpi%irank == 0 ) THEN WRITE (6,FMT=8010) fn,fl,fj,e,weight - WRITE (16,FMT=8010) fn,fl,fj,e,weight END IF IF (ierr.NE.0) STOP 'error in core-level routine' diff --git a/init/boxdim.f b/init/boxdim.f index 3e4598280ef86dd13a90eb9a0f8261b812a1e9dd..bb2b6919fc3484d19d99b12ae1d913ace661c83f 100644 --- a/init/boxdim.f +++ b/init/boxdim.f @@ -82,7 +82,7 @@ c---> check on the zeros of some determinants c DO j = 1 , 3 IF ( det(j,j) .lt. eps ) THEN - WRITE (16, + WRITE (6, + '('' problem with det('',i1,'','',i1,'')'')') j,j CALL juDFT_error(" boxdim: determinant",calledby ="boxdim") END IF diff --git a/init/inpeig.f90 b/init/inpeig.f90 index 7e37bd7212dc2d673199d706cffff3f56ec4ad16..61038344b0f291e393f0c0ebcd1e563dc55c423f 100644 --- a/init/inpeig.f90 +++ b/init/inpeig.f90 @@ -142,10 +142,8 @@ kpts%wtkpt(:) = kpts%wtkpt(:)/wt WRITE (6,FMT=8120) kpts%nkpt - WRITE (16,FMT=8120) kpts%nkpt DO nk = 1,kpts%nkpt WRITE (6,FMT=8040) kpts%bk(:,nk),kpts%wtkpt(nk) - WRITE (16,FMT=8040) kpts%bk(:,nk),kpts%wtkpt(nk) ENDDO 8120 FORMAT (1x,/,' number of k-points for this window =',i5,/,t12,& & 'coordinates',t34,'weights') diff --git a/init/old_inp/inped.F90 b/init/old_inp/inped.F90 index 1df6afaef5bb83635c62b11b1553b8a42991b4ee..b4eb0092ed128402943c0f2db11de27bc2129153 100644 --- a/init/old_inp/inped.F90 +++ b/init/old_inp/inped.F90 @@ -114,7 +114,6 @@ 8010 FORMAT (/,/,4x,10a8,/,/) !---> the menu for namgrp can be found in subroutine spgset WRITE (6,FMT=8030) cell%latnam,sym%namgrp,sym%invs,sym%zrfs,sym%invs2,input%jspins - WRITE (16,FMT=8030) cell%latnam,sym%namgrp,sym%invs,sym%zrfs,sym%invs2,input%jspins 8030 FORMAT (' lattice=',a3,/,' name of space group=',a4,/,' inversion symmetry= ',l1& ,/,' z-reflection symmetry=',l1,/,' vacuum-inversion symm=',l1,/,' jspins=',i1) @@ -161,13 +160,10 @@ a2(:) = input%scaleCell*a2(:) a3(:) = input%scaleCell*a3(:) WRITE (6,FMT=8050) input%scaleCell - WRITE (16,FMT=8050) input%scaleCell 8050 FORMAT (' unit cell scaled by ',f10.6) WRITE (6,FMT=8060) cell%z1 - WRITE (16,FMT=8060) cell%z1 8060 FORMAT (' the vacuum begins at z=',f10.6) WRITE (6,FMT=8070) dtild/2. - WRITE (16,FMT=8070) dtild/2. 8070 FORMAT (' dtilda/2= ',f10.6) ! set up bravais matrices of real and reciprocal lattices cell%amat(:,1) = a1(:) @@ -271,8 +267,6 @@ ! idsprs set to be zero. - WRITE (16,FMT=8122) 1,obsolete%lwb,obsolete%ndvgrd,0,obsolete%chng - WRITE (16,'(/)') WRITE (6,FMT=8122) 1,obsolete%lwb,obsolete%ndvgrd,0,obsolete%chng WRITE (6,'(/)') 8122 FORMAT ('igrd=',i1,',lwb=',l1,',ndvgrd=',i1,',idsprs=',i1, ',chng=',d10.3) @@ -280,11 +274,7 @@ ENDIF !-guta ! specification of atoms - IF (atoms%ntype.GT.atoms%ntype) THEN - WRITE (6,FMT='(a)') 'ntype > ntypd !!!' - WRITE (16,FMT='(a)') 'ntype > ntypd !!!' - CALL juDFT_error("ntypd",calledby ="inped") - END IF + cell%volint = cell%vol DO n = 1,atoms%ntype @@ -292,13 +282,11 @@ CALL trans(namat_const(n),str_up,str_do) IF ( (TRIM(ADJUSTL(noel(n))).NE.TRIM(ADJUSTL(str_up))) .OR.& & (TRIM(ADJUSTL(noel(n))).NE.TRIM(ADJUSTL(str_do))) ) THEN - WRITE(16,*) 'Element ',noel(n),' does not match Z = ',atoms%nz(n) WRITE( 6,*) 'Element ',noel(n),' does not match Z = ',atoms%nz(n) CALL juDFT_warn ("Element name and nuclear number do not match!" ,calledby ="inped") ENDIF ENDIF WRITE (6,8140) noel(n),atoms%nz(n),atoms%ncst(n),atoms%lmax(n),atoms%jri(n),atoms%rmt(n),atoms%dx(n) - WRITE (16,8140) noel(n),atoms%nz(n),atoms%ncst(n),atoms%lmax(n),atoms%jri(n),atoms%rmt(n),atoms%dx(n) 8140 FORMAT (a3,i3,3i5,2f10.6) IF (atoms%jri(n)>atoms%jmtd) CALL juDFT_error("jmtd",calledby ="inped") atoms%zatom(n) = atoms%nz(n) @@ -337,7 +325,6 @@ !---> i.e. they are given in internal units scaled by 'scpos' ! WRITE (6,FMT=8170) (atoms%taual(i,na),i=1,3),1.0 - WRITE (16,FMT=8170) (atoms%taual(i,na),i=1,3),1.0 8170 FORMAT (4f10.6) ! !---> for films, the z-coordinates are given in absolute values: @@ -397,12 +384,9 @@ !---> nwd = number of energy windows; lepr = 0 (1) for energy !---> parameters given on absolute (floating) scale - WRITE (16,FMT=*) 'nwd=',1,'lepr=',obsolete%lepr IF (ALL(obsolete%lepr .NE. (/0,1/))) CALL judft_error("Wrong choice of lepr",calledby="inped") WRITE (6,FMT=8320) input%l_f,input%eonly,1,llr(obsolete%lepr) - WRITE (16,FMT=8320) input%l_f,input%eonly,1,llr(obsolete%lepr) WRITE (6,FMT=8330) atoms%ntype, (atoms%lnonsph(n),n=1,atoms%ntype) - WRITE (16,FMT=8330) atoms%ntype, (atoms%lnonsph(n),n=1,atoms%ntype) 8320 FORMAT (1x,/,/,/,' input of parameters for eigenvalues:',/,t5,& & 'calculate Pulay-forces = ',l1,/,t5,'eigenvalues ',& & 'only = ',l1,/,t5,'number of energy windows =',i2,/,t5,& @@ -414,7 +398,6 @@ ! IF (obsolete%lepr.EQ.1) THEN WRITE ( 6,'(//,'' Floating energy parameters: relative'', '' window(s):'')') - WRITE (16,'(//,'' Floating energy parameters: relative'', '' window(s):'')') ENDIF !---> energy window @@ -426,18 +409,15 @@ ENDIF ! WRITE (6,FMT=8350) input%ellow,input%elup,input%zelec - WRITE (16,FMT=8350) input%ellow,input%elup,input%zelec 8350 FORMAT (1x,/,/,' energy window from',f8.3,' to', f8.3,' hartrees; nr. of electrons=',f6.1) !---> input of wavefunction cutoffs: input is a scaled quantity !---> related to the absolute value by rscale (e.g. a muffin-tin !---> radius) WRITE (6,FMT=8290) input%rkmax - WRITE (16,FMT=8290) input%rkmax 8290 FORMAT (1x,/,' wavefunction cutoff =',f10.5) ! IF ((input%tria) .AND. (input%gauss)) THEN WRITE (6,FMT='(a)') 'choose: either gaussian or triangular!' - WRITE (16,FMT='(a)') 'choose: either gaussian or triangular!' CALL juDFT_error("integration method",calledby ="inped") END IF WRITE (6,FMT=8230) input%gauss,input%delgau @@ -446,9 +426,7 @@ 8240 FORMAT (/,10x,'number of valence electrons=',f10.5,/,10x, 'temperature broadening =',f10.5) WRITE (6,FMT=*) 'itmax=',input%itmax,' broy_sv=',input%maxiter,' imix=',input%imix WRITE (6,FMT=*) 'alpha=',input%alpha,' spinf=',input%spinf - WRITE (16,FMT=*) 'itmax=',input%itmax,' broy_sv=',input%maxiter,' imix=',input%imix - WRITE (16,FMT=*) 'alpha=',input%alpha,' spinf=',input%spinf - + IF ((.NOT.sym%invs).AND.input%secvar) THEN WRITE(6,*)'The second variation is not implemented in the' WRITE(6,*)'complex version of the program.' @@ -468,7 +446,6 @@ IF (sliceplot%slice) THEN input%cdinf = .FALSE. WRITE (6,FMT=8390) sliceplot%kk,sliceplot%e1s,sliceplot%e2s - WRITE (16,FMT=8390) sliceplot%kk,sliceplot%e1s,sliceplot%e2s END IF 8390 FORMAT (' slice: k=',i3,' e1s=',f10.6,' e2s=',f10.6) ! diff --git a/init/prp_qfft.f90 b/init/prp_qfft.f90 index 8662ae1589ee27023fed40333c65d94eef53eeb4..9fe9eaa757f3299e3964ceab0b0ae1a733dc4ad9 100644 --- a/init/prp_qfft.f90 +++ b/init/prp_qfft.f90 @@ -140,9 +140,6 @@ WRITE (6,'('' rkmax and true gmax recalculated '')') WRITE (6,2100) input%rkmax, rknew, rknew*rknew WRITE (6,2200) gmaxp*rknew, gmaxp*rknew*gmaxp*rknew - WRITE (16,'('' rkmax and true gmax recalculated '')') - WRITE (16,2100) input%rkmax, rknew, rknew*rknew - WRITE (16,2200) gmaxp*rknew, gmaxp*rknew*gmaxp*rknew input%rkmax = rknew ENDIF ! @@ -184,9 +181,6 @@ IF ( stars%ng3_fft.EQ.0 ) THEN WRITE(6,'('' presumably ng3 too small '')') WRITE(6,'('' sk3max, gmaxp*rkmax '', 2f10.6)') & - & stars%sk3(stars%ng3),gmaxp*input%rkmax - WRITE(16,'('' presumably ng3 too small '')') - WRITE(16,'('' sk3max, gmaxp*rkmax '', 2f10.6)')& & stars%sk3(stars%ng3),gmaxp*input%rkmax CALL juDFT_error("presumably ng3 too small","prp_qfft") ENDIF @@ -194,8 +188,6 @@ IF ( stars%ng3_fft.GT.stars%ng3 ) THEN WRITE(6,'('' nq3_fft > n3d '')') WRITE(6,'('' nq3_fft, n3d '',2i10)') stars%ng3_fft, stars%ng3 - WRITE(16,'('' nq3_fft > n3d '')') - WRITE(16,'('' nq3_fft, n3d '',2i10)') stars%ng3_fft, stars%ng3 CALL juDFT_error("nq3_fft > n3d",calledby="prp_qfft") ENDIF ! @@ -209,11 +201,6 @@ WRITE (6,'('' inconsistency in def.s see also strgn1'')') WRITE (6,'('' mq1d,mq2d,mq3d,kv1,kv2,kv3 '',6i5)')& & stars%kq1_fft,stars%kq2_fft,stars%kq3_fft,2*stars%kv3(1,istr),2*stars%kv3(2,istr),& - & 2*stars%kv3(3,istr) - WRITE (16,'('' not all nq3_fft stars in chg. den. FFT box'')') - WRITE (16,'('' inconsistency in def.s see also strgn1'')') - WRITE (16,'('' mq1d,mq2d,mq3d,kv1,kv2,kv3 '',6i5)')& - & stars%kq1_fft,stars%kq2_fft,stars%kq3_fft,2*stars%kv3(1,istr),2*stars%kv3(2,istr),& & 2*stars%kv3(3,istr) CALL juDFT_error("not all nq3_fft stars in chg. den. FFT box",& & calledby ="prp_qfft") diff --git a/init/prp_xcfft.f90 b/init/prp_xcfft.f90 index 9a9f7d88c21472f0335cbd086c6dbdc164a609ff..a0a6ba947f7914eec53d2dd5028799f20b41e85a 100644 --- a/init/prp_xcfft.f90 +++ b/init/prp_xcfft.f90 @@ -140,8 +140,6 @@ IF (gmxxc_new.LT.xcpot%gmaxxc) THEN WRITE (6,'('' gmaxxc recalculated '')') WRITE (6,2100) xcpot%gmaxxc, gmxxc_new, gmxxc_new*gmxxc_new - WRITE (16,'('' gmaxxc recalculated '')') - WRITE (16,2100) xcpot%gmaxxc, gmxxc_new, gmxxc_new*gmxxc_new xcpot%gmaxxc = gmxxc_new ENDIF ! @@ -162,8 +160,6 @@ & stars%kxc3_fft.gt.stars%kxc3_fft) THEN WRITE (6,'('' box dim. for fft too small'')') WRITE (6,2110) stars%kxc1_fft,stars%kxc2_fft,stars%kxc3_fft,stars%kxc1_fft,stars%kxc2_fft,stars%kxc3_fft - WRITE(16,'('' box dim. for fft too small'')') - WRITE(16,2110) stars%kxc1_fft,stars%kxc2_fft,stars%kxc3_fft,stars%kxc1_fft,stars%kxc2_fft,stars%kxc3_fft CALL juDFT_error("mxc[1,2,3]d>kxc[1,2,3]d ",calledby& & ="prp_xcfft") ENDIF @@ -183,17 +179,12 @@ WRITE (6,'('' presumably ng3 too small '')') WRITE (6,'('' sk3max, gmaxxc '', 2f10.6)')& & stars%sk3(stars%ng3),xcpot%gmaxxc - WRITE(16,'('' presumably ng3 too small '')') - WRITE(16,'('' sk3max, gmaxxc '', 2f10.6)')& - & stars%sk3(stars%ng3),xcpot%gmaxxc CALL juDFT_error("nxc3_fft==0",calledby ="prp_xcfft") ENDIF ! IF ( stars%nxc3_fft.GT.stars%ng3 ) THEN WRITE (6,'('' nxc3_fft > n3d '')') WRITE (6,'('' nxc3_fft, n3d '',2i10)') stars%nxc3_fft, stars%ng3 - WRITE (16,'('' nxc3_fft > n3d '')') - WRITE (16,'('' nxc3_fft, n3d '',2i10)') stars%nxc3_fft, stars%ng3 CALL juDFT_error("nxc3_fft>n3d ",calledby ="prp_xcfft") ENDIF ! @@ -208,12 +199,6 @@ WRITE(6,'('' kxc1_fft,kxc2_fft,kxc3_fft,kv1,kv2,kv3 '',6i5)')& & stars%kxc1_fft,stars%kxc2_fft,stars%kxc3_fft,2*stars%kv3(1,istr),& & 2*stars%kv3(2,istr),2*stars%kv3(3,istr) - write(16,'('' not all nxc3_fft stars in xc-pot/eng fft box''& - & )') - WRITE(16,'('' inconsistency in def.s see also strgn1'')') - WRITE(16,'('' kxc1_fft,kxc2_fft,kxc3_fft,kv1,kv2,kv3 '',6i5)')& - & stars%kxc1_fft,stars%kxc2_fft,stars%kxc3_fft,2*stars%kv3(1,istr),& - & 2*stars%kv3(2,istr),2*stars%kv3(3,istr) CALL juDFT_error("2*stars([1,2,3],istr)>mxc[1,2,3]d",calledby& & ="prp_xcfft") ENDIF diff --git a/init/strgn.f90 b/init/strgn.f90 index faf5d0d9ccfb6c378eb4ab78ec60b0ef949ff353..667aa1bdf01f5ca4e290c67c649b75232c3dd3ec 100644 --- a/init/strgn.f90 +++ b/init/strgn.f90 @@ -195,7 +195,6 @@ CONTAINS IF (stars%mx3.GT.stars%mx3) THEN WRITE ( 6,FMT=8000) stars%mx3,stars%mx3 - WRITE (16,FMT=8000) stars%mx3,stars%mx3 CALL juDFT_error("mx3.gt.k3d",calledby="strgn") ENDIF 8000 FORMAT(' mx3.gt.k3d:',2i6) @@ -468,9 +467,7 @@ CONTAINS ! !--> listing ! - WRITE (16,FMT=8010) stars%gmax,stars%ng3,stars%ng2 8010 FORMAT (' gmax=',f10.6,/,' nq3= ',i5,/,' nq2= ',i5,/) - WRITE (16,FMT=8020) stars%mx1,stars%mx2 8020 FORMAT (' mx1= ',i5,/,' mx2= ',i5,/) WRITE (6,FMT=8030) 8030 FORMAT (/,/,/,' s t a r l i s t',/) @@ -798,9 +795,7 @@ CONTAINS ! !--> listing - WRITE (16,FMT=8010) stars%gmax,stars%ng3 8010 FORMAT (' gmax=',f10.6,/,' nq3= ',i7,/) - WRITE (16,FMT=8020) stars%mx1,stars%mx2,stars%mx3 8020 FORMAT (' mx1= ',i5,/,' mx2= ',i5,' mx3= ',i5,/) WRITE (6,FMT=8030) 8030 FORMAT (/,/,/,' s t a r l i s t',/) diff --git a/main/fleur.F90 b/main/fleur.F90 index b8002d6d058770d2e5f7972ea5575da62d8018c0..4e477fa09ba5ed45be8eb7e2b0a5990d9ff4bd5a 100644 --- a/main/fleur.F90 +++ b/main/fleur.F90 @@ -189,7 +189,6 @@ CONTAINS CALL timestart("Iteration") IF (mpi%irank.EQ.0) THEN WRITE (6,FMT=8100) iter - WRITE (16,FMT=8100) iter 8100 FORMAT (/,10x,' iter= ',i5) ENDIF !mpi%irank.eq.0 input%total = .TRUE. @@ -419,7 +418,6 @@ CONTAINS IF(mpi%irank == 0) THEN WRITE (6,FMT=8130) iter - WRITE (16,FMT=8130) iter 8130 FORMAT (/,5x,'******* it=',i3,' is completed********',/,/) WRITE(*,*) "Iteration:",iter," Distance:",results%last_distance CALL timestop("Iteration") diff --git a/main/fleur_init.F90 b/main/fleur_init.F90 index 3ad22d9541f5a6d7589b73bf59de0951b7f67f1c..7bd0a33326bb8a53d02165068c790e2fc9de8879 100644 --- a/main/fleur_init.F90 +++ b/main/fleur_init.F90 @@ -126,11 +126,7 @@ OPEN (6,file='out',form='formatted',status='unknown') ENDIF CALL writeOutHeader() - IF (judft_was_argument("-info")) THEN - OPEN (16,status='SCRATCH') - ELSE - OPEN (16,file='inf',form='formatted',status='unknown') - ENDIF + OPEN (16,status='SCRATCH') ENDIF input%l_wann = .FALSE. diff --git a/main/mix.F90 b/main/mix.F90 index c3303e46632c7042476cef53d8cb2d4e736cb6d5..469cd5b8af621d5d96fcc78c6a37218bfc45f52d 100644 --- a/main/mix.F90 +++ b/main/mix.F90 @@ -140,13 +140,13 @@ contains !imix=:generalozed anderson mixing select case( input%imix ) case( 0 ) - write( 16, fmt='(a,2f10.5)' ) 'STRAIGHT MIXING',input%alpha + write( 6, fmt='(a,2f10.5)' ) 'STRAIGHT MIXING',input%alpha case( 3 ) - write( 16, fmt='(a,f10.5)' ) 'BROYDEN FIRST MIXING',input%alpha + write( 6, fmt='(a,f10.5)' ) 'BROYDEN FIRST MIXING',input%alpha case( 5 ) - write( 16, fmt='(a,f10.5)' ) 'BROYDEN SECOND MIXING',input%alpha + write( 6, fmt='(a,f10.5)' ) 'BROYDEN SECOND MIXING',input%alpha case( 7 ) - write( 16, fmt='(a,f10.5)' ) 'ANDERSON GENERALIZED',input%alpha + write( 6, fmt='(a,f10.5)' ) 'ANDERSON GENERALIZED',input%alpha case default call juDFT_error( "mix: input%imix =/= 0,3,5,7 ", calledby ="mix" ) end select @@ -187,10 +187,8 @@ contains WRITE(attributes(2),'(f20.10)') 1000*SQRT(ABS(dist(js)/cell%vol)) CALL writeXMLElementForm('chargeDensity',(/'spin ','distance'/),attributes,reshape((/4,8,1,20/),(/2,2/))) IF( hybrid%l_calhf ) THEN - WRITE (16,FMT=7901) js,inDen%iter,1000*SQRT(ABS(dist(js)/cell%vol)) WRITE ( 6,FMT=7901) js,inDen%iter,1000*SQRT(ABS(dist(js)/cell%vol)) ELSE - WRITE (16,FMT=7900) js,inDen%iter,1000*SQRT(ABS(dist(js)/cell%vol)) WRITE ( 6,FMT=7900) js,inDen%iter,1000*SQRT(ABS(dist(js)/cell%vol)) END IF END DO @@ -209,13 +207,9 @@ contains CALL writeXMLElementFormPoly('spinDensity',(/'distance'/),& (/1000*SQRT(ABS(dist(5)/cell%vol))/),reshape((/19,20/),(/1,2/))) IF( hybrid%l_calhf ) THEN - WRITE (16,FMT=8001) inDen%iter,1000*SQRT(ABS(dist(4)/cell%vol)) - WRITE (16,FMT=8011) inDen%iter,1000*SQRT(ABS(dist(5)/cell%vol)) WRITE ( 6,FMT=8001) inDen%iter,1000*SQRT(ABS(dist(4)/cell%vol)) WRITE ( 6,FMT=8011) inDen%iter,1000*SQRT(ABS(dist(5)/cell%vol)) ELSE - WRITE (16,FMT=8000) inDen%iter,1000*SQRT(ABS(dist(4)/cell%vol)) - WRITE (16,FMT=8010) inDen%iter,1000*SQRT(ABS(dist(5)/cell%vol)) WRITE ( 6,FMT=8000) inDen%iter,1000*SQRT(ABS(dist(4)/cell%vol)) WRITE ( 6,FMT=8010) inDen%iter,1000*SQRT(ABS(dist(5)/cell%vol)) END IF diff --git a/main/totale.f90 b/main/totale.f90 index 2cb56ebc00154058d28a2832a9616f30cbe67d86..baa8b4196446f7c51fd187643605d89bad2be4e0 100644 --- a/main/totale.f90 +++ b/main/totale.f90 @@ -84,7 +84,6 @@ CONTAINS !CALL den%init(stars,atoms,sphhar,vacuum,noco,oneD,input%jspins,.FALSE.,POTDEN_TYPE_DEN) WRITE (6,FMT=8000) - WRITE (16,FMT=8000) 8000 FORMAT (/,/,/,5x,'t o t a l e n e r g y') ! ! ---> sum of eigenvalues (core, semicore and valence states) @@ -92,28 +91,24 @@ CONTAINS eigSum = results%seigscv + results%seigc results%tote = eigSum WRITE (6,FMT=8010) results%tote - WRITE (16,FMT=8010) results%tote 8010 FORMAT (/,10x,'sum of eigenvalues =',t40,f20.10) ! ! ---> add contribution of coulomb potential ! results%tote = results%tote + 0.5e0*results%te_vcoul WRITE (6,FMT=8020) results%te_vcoul - WRITE (16,FMT=8020) results%te_vcoul 8020 FORMAT (/,10x,'density-coulomb potential integral =',t40,f20.10) ! ! ---> add contribution of effective potential ! results%tote = results%tote - results%te_veff WRITE (6,FMT=8030) results%te_veff - WRITE (16,FMT=8030) results%te_veff 8030 FORMAT (/,10x,'density-effective potential integral =',t40,f20.10) ! ! ---> add contribution of exchange-correlation energy ! results%tote = results%tote + results%te_exc WRITE (6,FMT=8040) results%te_exc - WRITE (16,FMT=8040) results%te_exc 8040 FORMAT (/,10x,'charge density-ex.-corr.energy density integral=', t40,f20.10) ! ! ---> Fock exchange contribution @@ -126,9 +121,7 @@ CONTAINS !END IF ENDIF WRITE (6,FMT=8100) 0.5e0*results%te_hfex%valence - WRITE (16,FMT=8100) 0.5e0*results%te_hfex%valence WRITE (6,FMT=8101) 0.5e0*results%te_hfex%core - WRITE (16,FMT=8101) 0.5e0*results%te_hfex%core 8100 FORMAT (/,10x,'Fock-exchange energy (valence)=',t40,f20.10) 8101 FORMAT (10x,'Fock-exchange energy (core)=',t40,f20.10) @@ -175,26 +168,21 @@ CONTAINS ! zintn_r(n) = atoms%neq(n)*atoms%zatom(n)*sfp_const*rhs/2. WRITE (6,FMT=8045) zintn_r(n) - WRITE (16,FMT=8045) zintn_r(n) CALL intgr3(mt(1,n),atoms%rmsh(1,n),atoms%dx(n),atoms%jri(n),totz) vmd(n) = atoms%rmt(n)*vCoul%mt(atoms%jri(n),0,n,1)/sfp_const + atoms%zatom(n) - totz*sfp_const vmd(n) = -atoms%neq(n)*atoms%zatom(n)*vmd(n)/ (2.*atoms%rmt(n)) WRITE (6,FMT=8050) n,vmd(n) - WRITE (16,FMT=8050) n,vmd(n) results%tote = results%tote + vmd(n) ENDDO IF (atoms%n_u.GT.0) THEN WRITE ( 6,FMT=8090) results%e_ldau - WRITE (16,FMT=8090) results%e_ldau results%tote = results%tote - results%e_ldau ! gu test ENDIF ! print 'HF' before total energy to make it grepable IF ( .NOT. hybrid%l_calhf ) THEN WRITE ( 6,FMT=8060) results%tote - WRITE (16,FMT=8060) results%tote ELSE WRITE ( 6,FMT=8061) results%tote - WRITE (16,FMT=8061) results%tote END IF CALL force_w(input,atoms,sym,results,cell,oneD,vacuum) @@ -205,18 +193,12 @@ CONTAINS ! print 'HF' before all energies to make them grepable IF ( .NOT. hybrid%l_calhf ) THEN WRITE ( 6,FMT=8065) results%ts - WRITE (16,FMT=8065) results%ts WRITE ( 6,FMT=8070) results%tote-results%ts - WRITE (16,FMT=8070) results%tote-results%ts WRITE ( 6,FMT=8080) results%tote-0.5e0*results%ts - WRITE (16,FMT=8080) results%tote-0.5e0*results%ts ELSE WRITE ( 6,FMT=8066) results%ts - WRITE (16,FMT=8066) results%ts WRITE ( 6,FMT=8071) results%tote-results%ts - WRITE (16,FMT=8071) results%tote-results%ts WRITE ( 6,FMT=8081) results%tote-0.5e0*results%ts - WRITE (16,FMT=8081) results%tote-0.5e0*results%ts END IF WRITE(attributes(1),'(f20.10)') results%tote diff --git a/mix/potdis.f90 b/mix/potdis.f90 index f6602f3e26d1f2cb2c079de31746dcee81158778..5c6bf4865dad2042e112a907687c4beb86d97608 100644 --- a/mix/potdis.f90 +++ b/mix/potdis.f90 @@ -221,7 +221,6 @@ CONTAINS dis(:) = SQRT(dis(:)/cell%vol)*1000. WRITE (6,FMT=8000) iter,dis(1) - WRITE (16,FMT=8000) iter,dis(1) 8000 FORMAT (/,'----> distance of the potential for it=',i3,':',f11.6, ' mhtr/bohr**3') WRITE(6,*) "Details of potential differences for each atom type" WRITE(6,*) "Atom: total difference: difference of first sphhar" @@ -231,7 +230,6 @@ CONTAINS WRITE(6,*) "Difference of interstitial:",pdis(0,0,1) IF (input%jspins.EQ.2) THEN WRITE (6,FMT=8010) iter,dis(2) - WRITE (16,FMT=8010) iter,dis(2) 8010 FORMAT (/,'----> distance of spin potential for it=',i3,':', f11.6,' mhtr/bohr**3') WRITE(6,*) "Details of potential differences for each atom type" WRITE(6,*) "Atom: total difference: difference of first sphhar" diff --git a/mix/stdmix.f90 b/mix/stdmix.f90 index 2be6037b28631f33698b7f56b85a1bc8c13227c5..5753af965591801569aab32be856503bf423739f 100644 --- a/mix/stdmix.f90 +++ b/mix/stdmix.f90 @@ -34,10 +34,10 @@ CONTAINS REAL,PARAMETER:: tol_6=1.0e-6 ! .. ! - WRITE (16,FMT='(a)') 'STRAIGHT MIXING' - IF (input%jspins.EQ.1) WRITE (16,FMT='(a,2f10.5)')& + WRITE (6,FMT='(a)') 'STRAIGHT MIXING' + IF (input%jspins.EQ.1) WRITE (6,FMT='(a,2f10.5)')& & 'charge density mixing parameter:',input%alpha - IF (input%jspins.EQ.2) WRITE (16,FMT='(a,2f10.5)')& + IF (input%jspins.EQ.2) WRITE (6,FMT='(a,2f10.5)')& & 'spin density mixing parameter:',input%alpha*input%spinf IF ( ABS(input%spinf-1.0e0).LE.tol_6 .OR. input%jspins.EQ.1 ) THEN ! --> perform simple mixing diff --git a/optional/cdnsp.f90 b/optional/cdnsp.f90 index 936768e45d1a7bb73b51b991a48c1096c0831595..f38b2966e457630b38ce9dc7e5d467399f85a7a5 100644 --- a/optional/cdnsp.f90 +++ b/optional/cdnsp.f90 @@ -72,7 +72,6 @@ DO j = 1,atoms%jri(n) den%mt(j,0,n,1) = den%mt(j,0,n,1) - rhoc(j,n,1)/sfp ENDDO - ! WRITE (16,FMT='(8f10.4)') (den%mt(i,0,n,1),i=1,16) CALL intgr3(den%mt(1,0,n,1),atoms%rmsh(1,n),atoms%dx(n),atoms%jri(n),qval) p = (atoms%bmu(n)+sfp*qval)/ (2.*sfp*qval) pp = 1. - p diff --git a/types/types_cdnval.f90 b/types/types_cdnval.f90 index 340d895caa94981c8bd93d478aacea104cd6701c..7ba6bb12ab0f2b94511ef7cf946a59b480bb3b0e 100644 --- a/types/types_cdnval.f90 +++ b/types/types_cdnval.f90 @@ -516,13 +516,13 @@ SUBROUTINE cdnvalJob_init(thisCdnvalJob,mpi,input,kpts,noco,results,jspin,slicep IF (sliceplot%slice.AND.thisCdnvalJob%noccbd(ikpt).GT.0) THEN thisCdnvalJob%nStart(ikpt) = 1 thisCdnvalJob%nEnd(ikpt) = -1 - IF (mpi%irank==0) WRITE (16,FMT=*) 'NNNE',sliceplot%nnne - IF (mpi%irank==0) WRITE (16,FMT=*) 'sliceplot%kk',sliceplot%kk + IF (mpi%irank==0) WRITE (6,FMT=*) 'NNNE',sliceplot%nnne + IF (mpi%irank==0) WRITE (6,FMT=*) 'sliceplot%kk',sliceplot%kk nslibd = 0 IF (sliceplot%kk.EQ.0) THEN IF (mpi%irank==0) THEN - WRITE (16,FMT='(a)') 'ALL K-POINTS ARE TAKEN IN SLICE' - WRITE (16,FMT='(a,i2)') ' sliceplot%slice: k-point nr.',ikpt + WRITE (6,FMT='(a)') 'ALL K-POINTS ARE TAKEN IN SLICE' + WRITE (6,FMT='(a,i2)') ' sliceplot%slice: k-point nr.',ikpt END IF iBand = 1 @@ -540,11 +540,11 @@ SUBROUTINE cdnvalJob_init(thisCdnvalJob,mpi,input,kpts,noco,results,jspin,slicep END IF thisCdnvalJob%nEnd(ikpt) = iBand nslibd = MAX(0,thisCdnvalJob%nEnd(ikpt) - thisCdnvalJob%nStart(ikpt) + 1) - IF (mpi%irank==0) WRITE (16,'(a,i3)') ' eigenvalues in sliceplot%slice:', nslibd + IF (mpi%irank==0) WRITE (6,'(a,i3)') ' eigenvalues in sliceplot%slice:', nslibd ELSE IF (sliceplot%kk.EQ.ikpt) THEN - IF (mpi%irank==0) WRITE (16,FMT='(a,i2)') ' sliceplot%slice: k-point nr.',ikpt + IF (mpi%irank==0) WRITE (6,FMT='(a,i2)') ' sliceplot%slice: k-point nr.',ikpt IF ((sliceplot%e1s.EQ.0.0) .AND. (sliceplot%e2s.EQ.0.0)) THEN - IF (mpi%irank==0) WRITE (16,FMT='(a,i5,f10.5)') 'slice: eigenvalue nr.',& + IF (mpi%irank==0) WRITE (6,FMT='(a,i5,f10.5)') 'slice: eigenvalue nr.',& sliceplot%nnne,results%eig(sliceplot%nnne,ikpt,jsp) nslibd = 1 thisCdnvalJob%nStart(ikpt) = sliceplot%nnne @@ -565,7 +565,7 @@ SUBROUTINE cdnvalJob_init(thisCdnvalJob,mpi,input,kpts,noco,results,jspin,slicep END IF thisCdnvalJob%nEnd(ikpt) = iBand nslibd = MAX(0,thisCdnvalJob%nEnd(ikpt) - thisCdnvalJob%nStart(ikpt) + 1) - IF (mpi%irank==0) WRITE (16,FMT='(a,i3)')' eigenvalues in sliceplot%slice:',nslibd + IF (mpi%irank==0) WRITE (6,FMT='(a,i3)')' eigenvalues in sliceplot%slice:',nslibd END IF END IF thisCdnvalJob%noccbd(ikpt) = nslibd diff --git a/types/types_enpara.F90 b/types/types_enpara.F90 index f6c7da66d71d274ac1e73fdce6d86c8f753f7858..8cccf869f456f0d39644a172d0382728a057284b 100644 --- a/types/types_enpara.F90 +++ b/types/types_enpara.F90 @@ -191,7 +191,6 @@ CONTAINS vbar = v%mt(j,0,n,jsp)/rj IF (mpi%irank.EQ.0) THEN WRITE ( 6,'('' spin'',i2,'', atom type'',i3,'' ='',f12.6,'' r='',f8.5)') jsp,n,vbar,rj - WRITE (16,'('' spin'',i2,'', atom type'',i3,'' ='',f12.6,'' r='',f8.5)') jsp,n,vbar,rj ENDIF DO l = 0,atoms%lmax(n) IF ( .NOT.l_done(l,n,jsp) ) THEN @@ -226,7 +225,6 @@ CONTAINS vz0 = v%vacz(1,ivac,jsp) IF (mpi%irank.EQ.0) THEN WRITE ( 6,'('' spin'',i2,'', vacuum '',i3,'' ='',f12.6)') jsp,ivac,vz0 - WRITE (16,'('' spin'',i2,'', vacuum '',i3,'' ='',f12.6)') jsp,ivac,vz0 ENDIF ENDIF enpara%evac(ivac,jsp) = enpara%evac0(ivac,jsp) + vz0 diff --git a/vgen/int_nv.F90 b/vgen/int_nv.F90 index 607b44b83e5c28e9265cbf36687d6a20515625a8..db3aa1aae5de84bf9097cf32e45548f0ff1f0ec6 100644 --- a/vgen/int_nv.F90 +++ b/vgen/int_nv.F90 @@ -44,7 +44,6 @@ CONTAINS tis = cell%omtil * REAL( DOT_PRODUCT(vpot%pw_w(:stars%ng3,ispin),den%pw(:stars%ng3,ispin))) WRITE (6,FMT=8020) tis - WRITE (16,FMT=8020) tis 8020 FORMAT (/,10x,'interstitial :',t40,f20.10) RESULT = RESULT + tis @@ -64,7 +63,6 @@ CONTAINS nat = nat + atoms%neq(n) ENDDO WRITE (6,FMT=8030) tmt - WRITE (16,FMT=8030) tmt 8030 FORMAT (/,10x,'muffin tin spheres :',t40,f20.10) RESULT = RESULT + tmt ! @@ -98,7 +96,6 @@ CONTAINS tvact = tvact + cell%area*tvac*facv ENDDO WRITE (6,FMT=8040) tvact - WRITE (16,FMT=8040) tvact 8040 FORMAT (/,10x,'vacuum :',t40,f20.10) RESULT = RESULT + tvact ELSEIF (oneD%odi%d1) THEN @@ -126,7 +123,6 @@ CONTAINS CALL intgz0(dpz,vacuum%delz,vacuum%nmz,tvac,tail) tvact = tvact + cell%area*tvac WRITE (6,FMT=8041) tvact - WRITE (16,FMT=8041) tvact 8041 FORMAT (/,10x,'vacuum :',t40,f20.10) RESULT = RESULT + tvact !+odim diff --git a/vgen/psqpw.F90 b/vgen/psqpw.F90 index 2659d1c587116f15cc8d0a2b716ccee7f222ce87..059e7118bb942ecb32db703f134e22654e48531e 100644 --- a/vgen/psqpw.F90 +++ b/vgen/psqpw.F90 @@ -181,7 +181,6 @@ contains psint = psq(1) * stars%nstr(1) * cell%omtil end if write( 6, fmt=8000 ) psint - write( 16, fmt=8000 ) psint 8000 format (/,10x,'integral of pseudo charge density inside the slab='& & ,5x,2f11.6) if ( .not. input%film .or. potdenType == POTDEN_TYPE_POTYUK ) return @@ -207,7 +206,6 @@ contains fact = ( qvac + psint ) / ( stars%nstr(1) * cell%vol ) psq(1) = psq(1) - fact write( 6, fmt=8010 ) fact * 1000 - write( 16, fmt=8010 ) fact * 1000 8010 format (/,10x,' 1000 * normalization const. ='& & ,5x,2f11.6) end if ! mpi%irank == 0 diff --git a/vgen/vgen_coulomb.F90 b/vgen/vgen_coulomb.F90 index b3e918191e85fb3eab8aa5fa40348b93484445de..c311c77e54b796bdd22551cdf072705ffaf6362f 100644 --- a/vgen/vgen_coulomb.F90 +++ b/vgen/vgen_coulomb.F90 @@ -206,7 +206,6 @@ contains call timestart( "den-pot integrals" ) ! CALCULATE THE INTEGRAL OF n*Vcoulomb write( 6, fmt=8020 ) - write( 16, fmt=8020 ) 8020 format (/,10x,'density-coulomb potential integrals',/) ! interstitial first ! convolute ufft and pot: F(G) = \sum_(G') U(G - G') V(G') @@ -216,7 +215,6 @@ contains vCoul, den, results%te_vcoul ) write( 6, fmt=8030 ) results%te_vcoul - write( 16, fmt=8030 ) results%te_vcoul 8030 format (/,10x,'total density-coulomb potential integral :', t40,f20.10) call timestop( "den-pot integrals" ) diff --git a/vgen/vvacxc.f90 b/vgen/vvacxc.f90 index 3c429834d4dd8291e9f5a6d8c950f5825f4ae6f3..b1f126e287a17f5cafb492280ade6a34be0c65d9 100644 --- a/vgen/vvacxc.f90 +++ b/vgen/vvacxc.f90 @@ -154,7 +154,6 @@ CONTAINS ENDDO ! WRITE (6,FMT=8020) ivac, (vxc%vacz(vacuum%nmz,ivac,js),js=1,input%jspins) - WRITE (16,FMT=8020) ivac, (vxc%vacz(vacuum%nmz,ivac,js),js=1,input%jspins) 8020 FORMAT (/,5x,'vacuum zero for vacuum',i3,' = ',2f10.5) ! ! calculate the ex.-corr. energy density now beyond warping region diff --git a/vgen/vvacxcg.f90 b/vgen/vvacxcg.f90 index 347b431639effd0de98fa266cef74906d70c8b0c..986ce4458f4b5805ab048bc51b143b886ad3e36d 100644 --- a/vgen/vvacxcg.f90 +++ b/vgen/vvacxcg.f90 @@ -540,7 +540,6 @@ CONTAINS ! WRITE (6,fmt=8020) ivac, (vxc%vacz(vacuum%nmz,ivac,js),js=1,input%jspins) - WRITE(16,fmt=8020) ivac, (vxc%vacz(vacuum%nmz,ivac,js),js=1,input%jspins) 8020 FORMAT(/,5x,'vacuum zero for vacuum',i3,' = ',2f14.10) ! ! calculate the ex-corr. energy density now beyond warping region diff --git a/xc-pot/grdchlh.f90 b/xc-pot/grdchlh.f90 index d8d671bd306de1ebee911b25fbe088184c718cd0..b256389f0ea83cdd53b6d073e00f2201929fa60d 100644 --- a/xc-pot/grdchlh.f90 +++ b/xc-pot/grdchlh.f90 @@ -29,7 +29,6 @@ CONTAINS IF (ied-ist < 3) RETURN IF (ndvgrd < 3 .OR. ndvgrd>6) THEN - WRITE (16,fmt=126) ndvgrd CALL juDFT_error("ndvgrd<3 .or. ndvgrd>6",calledby="grdchlh") ENDIF 126 FORMAT (/,' ndvgrd should be ge.4 .or. le.6. ndvgrd=',i3) @@ -104,7 +103,7 @@ CONTAINS nred = REAL(ndvgrd)/2 + 0.1 IF (ied-nred.LE.ist) THEN - WRITE(16,fmt='(/'' ied-nred < ist. ied,nred,ist='',3i4)') ied,nred,ist + WRITE(6,fmt='(/'' ied-nred < ist. ied,nred,ist='',3i4)') ied,nred,ist CALL juDFT_error("ied-nred.le.ist",calledby="grdchlh") ENDIF