/[lmdze]/trunk/phylmd/Interface_surf/interfsur_lim.f90
ViewVC logotype

Diff of /trunk/phylmd/Interface_surf/interfsur_lim.f90

Parent Directory Parent Directory | Revision Log Revision Log | View Patch Patch

trunk/Sources/phylmd/Interface_surf/interfsur_lim.f revision 134 by guez, Wed Apr 29 15:47:56 2015 UTC trunk/phylmd/Interface_surf/interfsur_lim.f90 revision 328 by guez, Thu Jun 13 14:40:06 2019 UTC
# Line 4  module interfsur_lim_m Line 4  module interfsur_lim_m
4    
5  contains  contains
6    
7    SUBROUTINE interfsur_lim(itime, dtime, jour, nisurf, knindex, debut, &    SUBROUTINE interfsur_lim(jour, knindex, albedo, z0_new)
        alb_new, z0_new)  
8    
9      ! Cette routine sert d'interface entre le modèle atmosphérique et      ! Cette routine sert d'interface entre le mod\`ele atmosph\'erique et
10      ! un fichier de conditions aux limites.      ! un fichier de conditions aux limites.
11    
12      ! Laurent FAIRHEAD, February 2000      ! Laurent FAIRHEAD, February 2000
13    
14      use abort_gcm_m, only: abort_gcm      use conf_gcm_m, only: lmt_pas
15      USE dimphy, ONLY: klon      USE dimphy, ONLY: klon
16      use netcdf, only: NF90_NOWRITE      use netcdf, only: NF90_NOWRITE
17      use netcdf95, only: NF95_close, NF95_GET_VAR, NF95_INQ_VARID, NF95_OPEN      use netcdf95, only: NF95_close, NF95_GET_VAR, NF95_INQ_VARID, NF95_OPEN
18        use time_phylmdz, only: itap
19    
     integer, intent(IN):: itime ! numero du pas de temps courant  
     real, intent(IN):: dtime ! pas de temps de la physique (en s)  
20      integer, intent(IN):: jour ! jour a lire dans l'annee      integer, intent(IN):: jour ! jour a lire dans l'annee
21    
     integer, intent(IN):: nisurf  
     ! index de la surface à traiter (1 = sol continental)  
   
   
22      integer, intent(in):: knindex(:) ! (knon)      integer, intent(in):: knindex(:) ! (knon)
23      ! index des points de la surface à traiter      ! index des points de la surface \`a traiter
24    
25      logical, intent(IN):: debut ! premier appel à la physique (initialisation)      real, intent(out):: albedo(:) ! (knon) albedo lu
26      real, intent(out):: alb_new(:) ! (klon) albedo lu      real, intent(out):: z0_new(:) ! (knon) longueur de rugosit\'e lue
     real, intent(out):: z0_new(:) ! (klon) longueur de rugosité lue  
27    
28      ! Local:      ! Local:
29    
30      integer knon ! nombre de points dans le domaine a traiter      integer:: jour_lu_sur = - 1
   
     integer, save:: lmt_pas ! frequence de lecture des conditions limites  
     ! (en pas de physique)  
   
     logical, save:: deja_lu_sur  
     ! jour à lire déjà lu pour une surface précédente  
   
     integer, save:: jour_lu_sur  
31    
32      ! Champs lus dans le fichier de conditions aux limites :      ! Champs lus dans le fichier de conditions aux limites :
33      real, allocatable, save:: alb_lu(:), rug_lu(:)      real, save:: alb_lu(klon), rug_lu(klon)
34    
35      integer ncid, varid      integer ncid, varid
36    
37      !------------------------------------------------------------      !------------------------------------------------------------
38    
     knon = size(knindex)  
   
     if (debut) then  
        lmt_pas = nint(86400./dtime * 1.0) ! pour une lecture une fois par jour  
        jour_lu_sur = jour - 1  
        allocate(alb_lu(klon))  
        allocate(rug_lu(klon))  
     endif  
   
     if (jour - jour_lu_sur /= 0) deja_lu_sur = .false.  
   
39      ! Tester d'abord si c'est le moment de lire le fichier      ! Tester d'abord si c'est le moment de lire le fichier
40      if (mod(itime - 1, lmt_pas) == 0 .and. .not. deja_lu_sur) then      if (mod(itap - 1, lmt_pas) == 0 .and. jour /= jour_lu_sur) then
41         call NF95_OPEN('limit.nc', NF90_NOWRITE, ncid)         call NF95_OPEN('limit.nc', NF90_NOWRITE, ncid)
42    
43         ! Lecture Albedo         ! Lecture Albedo
44         call NF95_INQ_VARID(ncid, 'ALB', varid)         call NF95_INQ_VARID(ncid, 'ALB', varid)
45         call NF95_GET_VAR(ncid, varid, alb_lu, start=(/1, jour/))         call NF95_GET_VAR(ncid, varid, alb_lu, start=(/1, jour/))
46    
47         ! Lecture rugosité         ! Lecture rugosit\'e
48         call NF95_INQ_VARID(ncid, 'RUG', varid)         call NF95_INQ_VARID(ncid, 'RUG', varid)
49         call NF95_GET_VAR(ncid, varid, rug_lu, start=(/1, jour/))         call NF95_GET_VAR(ncid, varid, rug_lu, start=(/1, jour/))
50    
51         call NF95_CLOSE(ncid)         call NF95_CLOSE(ncid)
        deja_lu_sur = .true.  
52         jour_lu_sur = jour         jour_lu_sur = jour
53      endif      endif
54    
55      ! Recopie des variables dans les champs de sortie      ! Recopie des variables dans les champs de sortie
56      alb_new(:knon) = alb_lu(knindex(:knon))      albedo = alb_lu(knindex)
57      z0_new(:knon) = rug_lu(knindex(:knon))      z0_new = rug_lu(knindex)
     alb_new(knon + 1:) = 999999.  
     z0_new(knon + 1:) = 999999.  
58    
59    END SUBROUTINE interfsur_lim    END SUBROUTINE interfsur_lim
60    

Legend:
Removed from v.134  
changed lines
  Added in v.328

  ViewVC Help
Powered by ViewVC 1.1.21