/[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

revision 106 by guez, Tue Sep 9 12:54:30 2014 UTC revision 301 by guez, Thu Aug 2 17:23:07 2018 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    
     integer knon ! nombre de points dans le domaine a traiter  
   
     integer, save:: lmt_pas ! frequence de lecture des conditions limites  
     ! (en pas de physique)  
   
30      logical, save:: deja_lu_sur      logical, save:: deja_lu_sur
31      ! jour à lire déjà lu pour une surface précédente      ! jour \`a lire d\'ej\`a lu pour une surface pr\'ec\'edente
32    
33      integer, save:: jour_lu_sur      integer:: jour_lu_sur = - 1
34    
35      ! Champs lus dans le fichier de conditions aux limites :      ! Champs lus dans le fichier de conditions aux limites :
36      real, allocatable, save:: alb_lu(:), rug_lu(:)      real, save:: alb_lu(klon), rug_lu(klon)
37    
38      integer ncid, varid      integer ncid, varid
39    
40      !------------------------------------------------------------      !------------------------------------------------------------
41    
     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  
   
42      if (jour - jour_lu_sur /= 0) deja_lu_sur = .false.      if (jour - jour_lu_sur /= 0) deja_lu_sur = .false.
43    
44      ! Tester d'abord si c'est le moment de lire le fichier      ! Tester d'abord si c'est le moment de lire le fichier
45      if (mod(itime - 1, lmt_pas) == 0 .and. .not. deja_lu_sur) then      if (mod(itap - 1, lmt_pas) == 0 .and. .not. deja_lu_sur) then
46         call NF95_OPEN('limit.nc', NF90_NOWRITE, ncid)         call NF95_OPEN('limit.nc', NF90_NOWRITE, ncid)
47    
48         ! Lecture Albedo         ! Lecture Albedo
49         call NF95_INQ_VARID(ncid, 'ALB', varid)         call NF95_INQ_VARID(ncid, 'ALB', varid)
50         call NF95_GET_VAR(ncid, varid, alb_lu, start=(/1, jour/))         call NF95_GET_VAR(ncid, varid, alb_lu, start=(/1, jour/))
51    
52         ! Lecture rugosité         ! Lecture rugosit\'e
53         call NF95_INQ_VARID(ncid, 'RUG', varid)         call NF95_INQ_VARID(ncid, 'RUG', varid)
54         call NF95_GET_VAR(ncid, varid, rug_lu, start=(/1, jour/))         call NF95_GET_VAR(ncid, varid, rug_lu, start=(/1, jour/))
55    
# Line 80  contains Line 59  contains
59      endif      endif
60    
61      ! Recopie des variables dans les champs de sortie      ! Recopie des variables dans les champs de sortie
62      alb_new(:knon) = alb_lu(knindex(:knon))      albedo = alb_lu(knindex)
63      z0_new(:knon) = rug_lu(knindex(:knon))      z0_new = rug_lu(knindex)
     alb_new(knon + 1:) = 999999.  
     z0_new(knon + 1:) = 999999.  
64    
65    END SUBROUTINE interfsur_lim    END SUBROUTINE interfsur_lim
66    

Legend:
Removed from v.106  
changed lines
  Added in v.301

  ViewVC Help
Powered by ViewVC 1.1.21