SUBROUTINE phyetat0 (fichnom,tab0,Lmodif,nsoil,nq, . day_ini,time, . tsurf,tsoil,emis,q2,qsurf,cloudfrac,totcloudfrac,hice) implicit none c====================================================================== c Auteur(s) Z.X. Li (LMD/CNRS) date: 19930818 c Adaptation à Mars : Yann Wanherdrick c Objet: Lecture de l etat initial pour la physique c====================================================================== #include "netcdf.inc" #include "dimensions.h" #include "dimphys.h" #include "comgeomfi.h" #include "surfdat.h" #include "planete.h" #include "comcstfi.h" #include"advtrac.h" c====================================================================== INTEGER nbsrf !Mars nbsrf a 1 au lieu de 4 PARAMETER (nbsrf=1) ! nombre de sous-fractions pour une maille !====================================================================== ! Arguments: ! --------- ! inputs: character*(*) fichnom ! "startfi.nc" file integer tab0 integer Lmodif integer nsoil ! # of soil layers integer nq integer day_ini real time ! outputs: real tsurf(ngridmx,nbsrf) ! surface temperature real tsoil(ngridmx,nsoil,nbsrf) ! soil temperature real emis(ngridmx) ! surface emissivity real q2(ngridmx, llm+1) ! real qsurf(ngridmx,nq) ! tracers on surface ! real co2ice(ngridmx) ! co2 ice cover real cloudfrac(ngridmx,nlayermx) real hice(ngridmx), totcloudfrac(ngridmx) !====================================================================== ! Local variables: ! INTEGER radpas ! REAL co2_ppm ! REAL solaire real xmin,xmax ! to display min and max of a field c INTEGER ig,iq,lmax INTEGER nid, nvarid INTEGER ierr, i, nsrf ! integer isoil ! INTEGER length ! PARAMETER (length=100) CHARACTER*7 str7 CHARACTER*2 str2 CHARACTER*1 yes c REAL p_rad,p_omeg,p_g,p_cpp,p_mugaz,p_daysec INTEGER nqold ! flag which identifies if 'startfi.nc' file is using old names (qsurf01,...) logical :: oldtracernames=.false. integer :: count character(len=30) :: txt ! to store some text c c Ouvrir le fichier contenant l etat initial: c ierr = NF_OPEN (fichnom, NF_NOWRITE,nid) IF (ierr.NE.NF_NOERR) THEN write(6,*)' Pb d''ouverture du fichier '//fichnom CALL ABORT ENDIF ! Preliminary stuff: check if tracers follow old naming convention (qsurf01, ! qsurf02, ...) count=0 do iq=1,nqmx txt= " " write(txt,'(a5,i2.2)')'qsurf',iq ierr=NF_INQ_VARID(nid,txt,nvarid) if (ierr.ne.NF_NOERR) then ! did not find old tracer name exit ! might as well stop here else ! found old tracer name count=count+1 endif enddo if (count.eq.nqmx) then write(*,*) "phyetat0:tracers seem to follow old naming ", & "convention (qsurf01,qsurf02,...)" write(*,*) " => will work for now ... " write(*,*) " but you should run newstart to rename them" oldtracernames=.true. endif c modifications possibles des variables de tab_cntrl PRINT* write(*,*) 'TABFI de phyeta0',Lmodif,tab0 call tabfi (nid,Lmodif,tab0,day_ini,lmax,p_rad, . p_omeg,p_g,p_cpp,p_mugaz,p_daysec,time) c c Lecture des latitudes (coordonnees): c ierr = NF_INQ_VARID (nid, "latitude", nvarid) IF (ierr.NE.NF_NOERR) THEN PRINT*, 'phyetat0: Le champ est absent' CALL abort ENDIF #ifdef NC_DOUBLE ierr = NF_GET_VAR_DOUBLE(nid, nvarid, lati) #else ierr = NF_GET_VAR_REAL(nid, nvarid, lati) #endif IF (ierr.NE.NF_NOERR) THEN PRINT*, 'phyetat0: Lecture echouee pour ' CALL abort ENDIF c c Lecture des longitudes (coordonnees): c ierr = NF_INQ_VARID (nid, "longitude", nvarid) IF (ierr.NE.NF_NOERR) THEN PRINT*, 'phyetat0: Le champ est absent' CALL abort ENDIF #ifdef NC_DOUBLE ierr = NF_GET_VAR_DOUBLE(nid, nvarid, long) #else ierr = NF_GET_VAR_REAL(nid, nvarid, long) #endif IF (ierr.NE.NF_NOERR) THEN PRINT*, 'phyetat0: Lecture echouee pour ' CALL abort ENDIF c c Lecture des aires des mailles: c ierr = NF_INQ_VARID (nid, "area", nvarid) IF (ierr.NE.NF_NOERR) THEN PRINT*, 'phyetat0: Le champ est absent' CALL abort ENDIF #ifdef NC_DOUBLE ierr = NF_GET_VAR_DOUBLE(nid, nvarid, area) #else ierr = NF_GET_VAR_REAL(nid, nvarid, area) #endif IF (ierr.NE.NF_NOERR) THEN PRINT*, 'phyetat0: Lecture echouee pour ' CALL abort ENDIF xmin = 1.0E+20 xmax = -1.0E+20 xmin = MINVAL(area) xmax = MAXVAL(area) PRINT*,'Aires des mailles :', xmin, xmax c c Lecture du geopotentiel au sol: c ierr = NF_INQ_VARID (nid, "phisfi", nvarid) IF (ierr.NE.NF_NOERR) THEN PRINT*, 'phyetat0: Le champ est absent' CALL abort ENDIF #ifdef NC_DOUBLE ierr = NF_GET_VAR_DOUBLE(nid, nvarid, phisfi) #else ierr = NF_GET_VAR_REAL(nid, nvarid, phisfi) #endif IF (ierr.NE.NF_NOERR) THEN PRINT*, 'phyetat0: Lecture echouee pour ' CALL abort ENDIF xmin = 1.0E+20 xmax = -1.0E+20 xmin = MINVAL(phisfi) xmax = MAXVAL(phisfi) PRINT*,'Geopotentiel au sol :', xmin, xmax c c Lecture de l''albedo du sol nu: c ierr = NF_INQ_VARID (nid, "albedodat", nvarid) IF (ierr.NE.NF_NOERR) THEN PRINT*, 'phyetat0: Le champ est absent' CALL abort ENDIF #ifdef NC_DOUBLE ierr = NF_GET_VAR_DOUBLE(nid, nvarid, albedodat) #else ierr = NF_GET_VAR_REAL(nid, nvarid, albedodat) #endif IF (ierr.NE.NF_NOERR) THEN PRINT*, 'phyetat0: Lecture echouee pour ' CALL abort ENDIF xmin = 1.0E+20 xmax = -1.0E+20 xmin = MINVAL(albedodat) xmax = MAXVAL(albedodat) PRINT*,'Albedo du sol nu :', xmin, xmax c c Lecture de l''inertie thermique du sol: c ! ierr = NF_INQ_VARID (nid, "inertiedat", nvarid) ! IF (ierr.NE.NF_NOERR) THEN ! PRINT*, 'phyetat0: Le champ est absent' ! CALL abort ! ENDIF !#ifdef NC_DOUBLE ! ierr = NF_GET_VAR_DOUBLE(nid, nvarid, inertiedat) !#else ! ierr = NF_GET_VAR_REAL(nid, nvarid, inertiedat) !#endif ! IF (ierr.NE.NF_NOERR) THEN ! PRINT*, 'phyetat0: Lecture echouee pour ' ! CALL abort ! ENDIF ! xmin = 1.0E+20 ! xmax = -1.0E+20 ! xmin = MINVAL(inertiedat) ! xmax = MAXVAL(inertiedat) ! PRINT*,'Inertie thermique du sol :', xmin, xmax c c ZMEA c ierr = NF_INQ_VARID (nid, "ZMEA", nvarid) IF (ierr.NE.NF_NOERR) THEN PRINT*, 'phyetat0: Le champ est absent' CALL abort ENDIF #ifdef NC_DOUBLE ierr = NF_GET_VAR_DOUBLE(nid, nvarid, zmea) #else ierr = NF_GET_VAR_REAL(nid, nvarid, zmea) #endif IF (ierr.NE.NF_NOERR) THEN PRINT*, 'phyetat0: Lecture echouee pour ' CALL abort ENDIF xmin = 1.0E+20 xmax = -1.0E+20 DO i = 1, ngridmx xmin = MIN(zmea(i),xmin) xmax = MAX(zmea(i),xmax) ENDDO PRINT*,':', xmin, xmax c c ZSTD c ierr = NF_INQ_VARID (nid, "ZSTD", nvarid) IF (ierr.NE.NF_NOERR) THEN PRINT*, 'phyetat0: Le champ est absent' CALL abort ENDIF #ifdef NC_DOUBLE ierr = NF_GET_VAR_DOUBLE(nid, nvarid, zstd) #else ierr = NF_GET_VAR_REAL(nid, nvarid, zstd) #endif IF (ierr.NE.NF_NOERR) THEN PRINT*, 'phyetat0: Lecture echouee pour ' CALL abort ENDIF xmin = 1.0E+20 xmax = -1.0E+20 DO i = 1, ngridmx xmin = MIN(zstd(i),xmin) xmax = MAX(zstd(i),xmax) ENDDO PRINT*,':', xmin, xmax c c ZSIG c ierr = NF_INQ_VARID (nid, "ZSIG", nvarid) IF (ierr.NE.NF_NOERR) THEN PRINT*, 'phyetat0: Le champ est absent' CALL abort ENDIF #ifdef NC_DOUBLE ierr = NF_GET_VAR_DOUBLE(nid, nvarid, zsig) #else ierr = NF_GET_VAR_REAL(nid, nvarid, zsig) #endif IF (ierr.NE.NF_NOERR) THEN PRINT*, 'phyetat0: Lecture echouee pour ' CALL abort ENDIF xmin = 1.0E+20 xmax = -1.0E+20 DO i = 1, ngridmx xmin = MIN(zsig(i),xmin) xmax = MAX(zsig(i),xmax) ENDDO PRINT*,':', xmin, xmax c c ZGAM c ierr = NF_INQ_VARID (nid, "ZGAM", nvarid) IF (ierr.NE.NF_NOERR) THEN PRINT*, 'phyetat0: Le champ est absent' CALL abort ENDIF #ifdef NC_DOUBLE ierr = NF_GET_VAR_DOUBLE(nid, nvarid, zgam) #else ierr = NF_GET_VAR_REAL(nid, nvarid, zgam) #endif IF (ierr.NE.NF_NOERR) THEN PRINT*, 'phyetat0: Lecture echouee pour ' CALL abort ENDIF xmin = 1.0E+20 xmax = -1.0E+20 DO i = 1, ngridmx xmin = MIN(zgam(i),xmin) xmax = MAX(zgam(i),xmax) ENDDO PRINT*,':', xmin, xmax c c ZTHE c ierr = NF_INQ_VARID (nid, "ZTHE", nvarid) IF (ierr.NE.NF_NOERR) THEN PRINT*, 'phyetat0: Le champ est absent' CALL abort ENDIF #ifdef NC_DOUBLE ierr = NF_GET_VAR_DOUBLE(nid, nvarid, zthe) #else ierr = NF_GET_VAR_REAL(nid, nvarid, zthe) #endif IF (ierr.NE.NF_NOERR) THEN PRINT*, 'phyetat0: Lecture echouee pour ' CALL abort ENDIF xmin = 1.0E+20 xmax = -1.0E+20 DO i = 1, ngridmx xmin = MIN(zthe(i),xmin) xmax = MAX(zthe(i),xmax) ENDDO PRINT*,':', xmin, xmax c c CO2 ice cover c ! Ehouarn: from now on, there is no "co2ice" standalone field; it is supposed ! to be with stored in qsurf(i_co2_ice) ! ierr = NF_INQ_VARID (nid, "co2ice", nvarid) ! IF (ierr.NE.NF_NOERR) THEN ! PRINT*, 'phyetat0: Le champ est absent' ! CALL abort ! ENDIF !#ifdef NC_DOUBLE ! ierr = NF_GET_VAR_DOUBLE(nid, nvarid, co2ice) !#else ! ierr = NF_GET_VAR_REAL(nid, nvarid, co2ice) !#endif ! IF (ierr.NE.NF_NOERR) THEN ! PRINT*, 'phyetat0: Lecture echouee pour ' ! CALL abort ! ENDIF ! xmin = 1.0E+20 ! xmax = -1.0E+20 ! xmin = MINVAL(co2ice) ! xmax = MAXVAL(co2ice) ! PRINT*,'CO2 ice cover :', xmin, xmax c c Lecture des temperatures du sol: c ierr = NF_INQ_VARID (nid, "tsurf", nvarid) IF (ierr.NE.NF_NOERR) THEN PRINT*, 'phyetat0: Le champ est absent' PRINT*, ' Mais je vais essayer de lire TS**' IF (nbsrf.GT.99) THEN PRINT*, "Trop de sous-mailles" CALL abort ENDIF DO nsrf = 1, nbsrf WRITE(str2,'(i2.2)') nsrf ierr = NF_INQ_VARID (nid, "TS"//str2, nvarid) IF (ierr.NE.NF_NOERR) THEN PRINT*, "phyetat0: Le champ est absent" CALL abort ENDIF #ifdef NC_DOUBLE ierr = NF_GET_VAR_DOUBLE(nid, nvarid, tsurf(1,nsrf)) #else ierr = NF_GET_VAR_REAL(nid, nvarid, tsurf(1,nsrf)) #endif IF (ierr.NE.NF_NOERR) THEN PRINT*, "phyetat0: Lecture echouee pour " CALL abort ENDIF xmin = 1.0E+20 xmax = -1.0E+20 xmin = MINVAL(tsurf) xmax = MAXVAL(tsurf) PRINT*,'Temperature du sol TS**:', nsrf, xmin, xmax ENDDO ELSE PRINT*, 'phyetat0: Le champ est present' PRINT*, ' J ignore donc les autres temperatures TS**' #ifdef NC_DOUBLE ierr = NF_GET_VAR_DOUBLE(nid, nvarid, tsurf(1,1)) #else ierr = NF_GET_VAR_REAL(nid, nvarid, tsurf(1,1)) #endif IF (ierr.NE.NF_NOERR) THEN PRINT*, "phyetat0: Lecture echouee pour " CALL abort ENDIF xmin = 1.0E+20 xmax = -1.0E+20 xmin = MINVAL(tsurf) xmax = MAXVAL(tsurf) PRINT*,'Temperature du sol ', xmin, xmax IF (nbsrf >= 2) THEN DO nsrf = 2, nbsrf DO i = 1, ngridmx tsurf(i,nsrf) = tsurf(i,1) ENDDO ENDDO ENDIF ENDIF c c Lecture des temperatures du sol profond: c ! IF (nsoil.GT.99 .OR. nbsrf.GT.99) THEN ! PRINT*, "Trop de couches ou sous-mailles" ! CALL abort ! ENDIF ! DO nsrf = 1, nbsrf ! DO isoil=1, nsoil ! WRITE(str7,'(i2.2,"srf",i2.2)') isoil, nsrf ! ierr = NF_INQ_VARID (nid, 'tsoil', nvarid) ! IF (ierr.NE.NF_NOERR) THEN ! PRINT*, "phyetat0: Le champ est absent" ! PRINT*, " Il prend donc la valeur de surface" ! DO i=1, ngridmx ! tsoil(i,isoil,nsrf)=tsurf(i,nsrf) ! ENDDO ! ELSE !#ifdef NC_DOUBLE ! ierr = NF_GET_VAR_DOUBLE(nid, nvarid, tsoil(1,1,nsrf)) !#else ! ierr = NF_GET_VAR_REAL(nid, nvarid, tsoil(1,1,nsrf)) !#endif ! IF (ierr.NE.NF_NOERR) THEN ! PRINT*, "Lecture echouee pour " ! CALL abort ! ENDIF ! ENDIF ! ENDDO ! ENDDO ! xmin = 1.0E+20 ! xmax = -1.0E+20 ! xmin = MINVAL(tsoil) ! xmax = MAXVAL(tsoil) ! PRINT*,'Temperatures du sol profond ', xmin, xmax c c Surface emissivity c ierr = NF_INQ_VARID (nid, "emis", nvarid) IF (ierr.NE.NF_NOERR) THEN PRINT*, 'phyetat0: Le champ est absent' CALL abort ENDIF #ifdef NC_DOUBLE ierr = NF_GET_VAR_DOUBLE(nid, nvarid, emis) #else ierr = NF_GET_VAR_REAL(nid, nvarid, emis) #endif IF (ierr.NE.NF_NOERR) THEN PRINT*, 'phyetat0: Lecture echouee pour ' CALL abort ENDIF xmin = 1.0E+20 xmax = -1.0E+20 xmin = MINVAL(emis) xmax = MAXVAL(emis) PRINT*,'Surface emissivity :', xmin, xmax c c Cloud fraction (added by BC 2010) c ierr = NF_INQ_VARID (nid, "cloudfrac", nvarid) IF (ierr.NE.NF_NOERR) THEN PRINT*, 'phyetat0: Le champ est absent' cloudfrac(:,:)=0.5 ! CALL abort ENDIF #ifdef NC_DOUBLE ierr = NF_GET_VAR_DOUBLE(nid, nvarid, cloudfrac) #else ierr = NF_GET_VAR_REAL(nid, nvarid, cloudfrac) #endif IF (ierr.NE.NF_NOERR) THEN PRINT*, 'phyetat0: Lecture echouee pour ' CALL abort ENDIF xmin = 1.0E+20 xmax = -1.0E+20 xmin = MINVAL(cloudfrac) xmax = MAXVAL(cloudfrac) PRINT*,'Cloud fraction :', xmin, xmax c c Total cloud fraction (added by BC 2010) c ierr = NF_INQ_VARID (nid, "totcloudfrac", nvarid) ! ierr = NF_INQ_VARID (nid, "totalfrac", nvarid) IF (ierr.NE.NF_NOERR) THEN PRINT*, 'phyetat0: Le champ est absent' totcloudfrac(:)=0.5 ! CALL abort ENDIF #ifdef NC_DOUBLE ierr = NF_GET_VAR_DOUBLE(nid, nvarid, totcloudfrac) #else ierr = NF_GET_VAR_REAL(nid, nvarid, totcloudfrac) #endif IF (ierr.NE.NF_NOERR) THEN PRINT*, 'phyetat0: Lecture echouee pour ' !CALL abort ENDIF xmin = 1.0E+20 xmax = -1.0E+20 xmin = MINVAL(totcloudfrac) xmax = MAXVAL(totcloudfrac) PRINT*,'Cloud fraction :', xmin, xmax c c Height of oceanic ice (added by BC 2010) c ierr = NF_INQ_VARID (nid, "hice", nvarid) IF (ierr.NE.NF_NOERR) THEN PRINT*, 'phyetat0: Le champ est absent' CALL abort ENDIF #ifdef NC_DOUBLE ierr = NF_GET_VAR_DOUBLE(nid, nvarid, hice) #else ierr = NF_GET_VAR_REAL(nid, nvarid, hice) #endif IF (ierr.NE.NF_NOERR) THEN PRINT*, 'phyetat0: Lecture echouee pour ' CALL abort ENDIF xmin = 1.0E+20 xmax = -1.0E+20 xmin = MINVAL(hice) xmax = MAXVAL(hice) PRINT*,'Height of oceanic ice :', xmin, xmax c c pbl wind variance c ierr = NF_INQ_VARID (nid, "q2", nvarid) IF (ierr.NE.NF_NOERR) THEN PRINT*, 'phyetat0: Le champ est absent' CALL abort ENDIF #ifdef NC_DOUBLE ierr = NF_GET_VAR_DOUBLE(nid, nvarid, q2) #else ierr = NF_GET_VAR_REAL(nid, nvarid, q2) #endif IF (ierr.NE.NF_NOERR) THEN PRINT*, 'phyetat0: Lecture echouee pour ' CALL abort ENDIF xmin = 1.0E+20 xmax = -1.0E+20 xmin = MINVAL(q2) xmax = MAXVAL(q2) PRINT*,'pbl wind variance :', xmin, xmax c c tracer on surface c IF(nq.GE.1) THEN nqold=nq DO iq=1,nq ! str7(1:5)='qsurf' ! WRITE(str7(6:7),'(i2.2)') iq ! ierr = NF_INQ_VARID (nid,str7,nvarid) IF (oldtracernames) THEN txt=" " write(txt,'(a5,i2.2)')'qsurf',iq ELSE txt=tnom(iq) ! if (txt.eq."h2o_vap") then ! There is no surface tracer for h2o_vap; ! "h2o_ice" should be loaded instead ! txt="h2o_ice" ! write(*,*) 'phyetat0: loading surface tracer', ! & ' h2o_ice instead of h2o_vap' ! endif ENDIF ! of IF (oldtracernames) THEN ierr=NF_INQ_VARID(nid,txt,nvarid) IF (ierr.NE.NF_NOERR) THEN write(*,*) 'PHYETAT0: WARNING : surface tracer',trim(txt), & ' not found in file' write(*,*) trim(txt), ' set to 0' do ig=1,ngridmx qsurf(ig,iq)=0. end do nqold=min(iq-1,nqold) ELSE #ifdef NC_DOUBLE ierr = NF_GET_VAR_DOUBLE(nid, nvarid,qsurf(1,iq)) #else ierr = NF_GET_VAR_REAL(nid, nvarid,qsurf(1,iq)) #endif IF (ierr.NE.NF_NOERR) THEN PRINT*, 'phyetat0: Lecture echouee pour <',trim(txt),'>' CALL abort ENDIF ENDIF xmin = 1.0E+20 xmax = -1.0E+20 xmin = MINVAL(qsurf(1:ngridmx,iq)) xmax = MAXVAL(qsurf(1:ngridmx,iq)) PRINT*,'tracer on surface <',trim(txt),'>:',xmin,xmax ENDDO if ((nqold.lt.nq).and.(nqold.ge.1)) then c case when new tracer are added in addition to old ones write(*,*)'qsurf 1 to ', nqold,'were already present' write(*,*)'qsurf ', nqold+1,' to ', nqmx,'are new' write(*,*)' and initialized to zero' qsurf(:,nqold+1:nqmx)=0.0 ! yes=' ' ! do while ((yes.ne.'y').and.(yes.ne.'n')) ! write(*,*) 'Would you like to reindex qsurf # 1 ->',nqold ! write(*,*) 'to #',nqmx-nqold+1,'->', nqmx,' (y or n) ?' ! read(*,fmt='(a)') yes ! end do ! if (yes.eq.'y') then ! write(*,*) 'OK, let s reindex qsurf' ! do ig=1,ngridmx ! do iq=nqmx,nqmx-nqold+1,-1 ! qsurf(ig,iq)=qsurf(ig,iq-nqmx+nqold) ! end do ! do iq=nqmx-nqold,1,-1 ! qsurf(ig,iq)= 0. ! end do ! end do ! end if end if ! of if ((nqold.lt.nq).and.(nqold.ge.1)) ENDIF ! of IF(nq.GE.1) ! Call to soil_settings, in order to read soil temperatures, ! as well as thermal inertia and volumetric heat capacity call soil_settings(nid,ngridmx,nsoil,tsurf,tsoil) c c Fermer le fichier: c ierr = NF_CLOSE(nid) c RETURN END