Ignore:
Timestamp:
Jul 22, 2002, 10:50:58 AM (23 years ago)
Author:
lmdzadmin
Message:

Champs supplementaire dans le coupleur (calving) + dependance des routines
"couplees" aux include
LF

File:
1 edited

Legend:

Unmodified
Added
Removed
  • LMDZ.3.3/branches/rel-LF/libf/phylmd/interface_surf.F90

    r394 r397  
    4343  real, allocatable, dimension(:),save    :: coastalflow, riverflow
    4444!!$PB
    45   REAL, ALLOCATABLE, DIMENSION(:,:), SAVE :: tmp_rriv, tmp_rcoa
     45!!  REAL, ALLOCATABLE, DIMENSION(:,:), SAVE :: tmp_rriv, tmp_rcoa
    4646!! pour simuler la fonte des glaciers antarctiques
    4747  REAL, ALLOCATABLE, DIMENSION(:,:), SAVE :: coeff_iceberg
     
    276276      endif
    277277!!$PB
    278       ALLOCATE (tmp_rriv(iim,jjm+1), stat=error)
    279       if (error /= 0) then
    280         abort_message='Pb allocation tmp_rriv'
    281         call abort_gcm(modname,abort_message,1)
    282       endif
    283       ALLOCATE (tmp_rcoa(iim,jjm+1), stat=error)
    284       if (error /= 0) then
    285         abort_message='Pb allocation tmp_rcoa'
    286         call abort_gcm(modname,abort_message,1)
    287       endif
     278!!      ALLOCATE (tmp_rriv(iim,jjm+1), stat=error)
     279! !     if (error /= 0) then
     280!!        abort_message='Pb allocation tmp_rriv'
     281 !!       call abort_gcm(modname,abort_message,1)
     282!!      endif
     283!!      ALLOCATE (tmp_rcoa(iim,jjm+1), stat=error)
     284!!      if (error /= 0) then
     285!!        abort_message='Pb allocation tmp_rcoa'
     286!!        call abort_gcm(modname,abort_message,1)
     287!!      endif
    288288!!$
    289289    else if (size(coastalflow) /= knon) then
     
    793793  real, dimension(klon) :: cdrag
    794794
    795   include 'temps.inc'
     795#include "temps.inc"
    796796
    797797  if (check) write(*,*)'Entree ', modname
     
    10221022    bidule=0.
    10231023    bidule(1:knon)=riverflow(1:knon)
    1024     call gath2cpl(bidule, tmp_rriv, klon, knon,iim,jjm,ktindex)
     1024!    call gath2cpl(bidule, tmp_rriv, klon, knon,iim,jjm,ktindex)
    10251025    bidule=0.
    10261026    bidule(1:knon)=coastalflow(1:knon)
    1027     call gath2cpl(bidule, tmp_rcoa, klon, knon,iim,jjm,ktindex)
     1027!    call gath2cpl(bidule, tmp_rcoa, klon, knon,iim,jjm,ktindex)
    10281028    alb_new(1:knon) = albedo_out(1:knon,1)
    10291029    alblw(1:knon) = albedo_out(1:knon,2)
     
    11441144  real, allocatable, dimension(:,:,:),save :: tmp_snow, tmp_evap, tmp_tsol
    11451145  real, allocatable, dimension(:,:,:),save :: tmp_fder, tmp_albe, tmp_taux
    1146 !!$  real, allocatable, dimension(:,:,:),save :: tmp_tauy, tmp_rriv, tmp_rcoa
    1147   REAL, ALLOCATABLE, DIMENSION(:,:,:),SAVE :: tmp_tauy
     1146  real, allocatable, dimension(:,:,:),save :: tmp_tauy, tmp_rriv, tmp_rcoa
     1147!!  REAL, ALLOCATABLE, DIMENSION(:,:,:),SAVE :: tmp_tauy
    11481148! variables a passer au coupleur
    11491149  real, dimension(iim, jjm+1) :: wri_sol_ice, wri_sol_sea, wri_nsol_ice
     
    11811181  REAL :: zx_lon(iim,jjm+1), zx_lat(iim,jjm+1), zjulian
    11821182  integer :: idayref, itau_w
    1183   include 'param_cou.h'
    1184   include 'inc_cpl.h'
    1185   include 'temps.inc'
     1183#include "param_cou.h"
     1184#include "inc_cpl.h"
     1185#include "temps.inc"
    11861186!
    11871187! Initialisation
     
    13361336      cpl_tauy(ig,cpl_index) = cpl_tauy(ig,cpl_index) &
    13371337       &                          + tauy(ig)        / FLOAT(nexca)
    1338 !!$      cpl_rriv(ig,cpl_index) = cpl_rriv(ig,cpl_index) &
    1339 !!$       &                          + riverflow(ig)   / FLOAT(nexca)/dtime
    1340 !!$      cpl_rcoa(ig,cpl_index) = cpl_rcoa(ig,cpl_index) &
    1341 !!$       &                          + coastalflow(ig) / FLOAT(nexca)/dtime
     1338      cpl_rriv(ig,cpl_index) = cpl_rriv(ig,cpl_index) &
     1339       &                          + riverflow(ig)   / FLOAT(nexca)/dtime
     1340      cpl_rcoa(ig,cpl_index) = cpl_rcoa(ig,cpl_index) &
     1341       &                          + coastalflow(ig) / FLOAT(nexca)/dtime
    13421342    enddo
    1343     IF (cpl_index .EQ. 1) THEN
    1344         cpl_rriv(:,:) = cpl_rriv(:,:) + tmp_rriv(:,:) / FLOAT(nexca)
    1345         cpl_rcoa(:,:) = cpl_rcoa(:,:) + tmp_rcoa(:,:) / FLOAT(nexca)
    1346     ENDIF
     1343!    IF (cpl_index .EQ. 1) THEN
     1344!        cpl_rriv(:,:) = cpl_rriv(:,:) + tmp_rriv(:,:) / FLOAT(nexca)
     1345!       cpl_rcoa(:,:) = cpl_rcoa(:,:) + tmp_rcoa(:,:) / FLOAT(nexca)
     1346!    ENDIF
    13471347  endif
    13481348
     
    14421442      allocate(tmp_taux(iim,jjm+1,2), stat=error); sum_error = sum_error + error
    14431443      allocate(tmp_tauy(iim,jjm+1,2), stat=error); sum_error = sum_error + error
    1444 !!$      allocate(tmp_rriv(iim,jjm+1,2), stat=error); sum_error = sum_error + error
    1445 !!$      allocate(tmp_rcoa(iim,jjm+1,2), stat=error); sum_error = sum_error + error
     1444      allocate(tmp_rriv(iim,jjm+1,2), stat=error); sum_error = sum_error + error
     1445      allocate(tmp_rcoa(iim,jjm+1,2), stat=error); sum_error = sum_error + error
    14461446      if (sum_error /= 0) then
    14471447        abort_message='Pb allocation variables couplees pour l''ecriture'
     
    14651465    call gath2cpl(cpl_taux(1,cpl_index), tmp_taux(1,1,cpl_index), klon, knon,iim,jjm,                  knindex)
    14661466    call gath2cpl(cpl_tauy(1,cpl_index), tmp_tauy(1,1,cpl_index), klon, knon,iim,jjm,                  knindex)
    1467 !!$    call gath2cpl(cpl_rriv(1,cpl_index), tmp_rriv(1,1,cpl_index), klon, knon,iim,jjm,                  knindex)
    1468 !!$    call gath2cpl(cpl_rcoa(1,cpl_index), tmp_rcoa(1,1,cpl_index), klon, knon,iim,jjm,                  knindex)
     1467    call gath2cpl(cpl_rriv(1,cpl_index), tmp_rriv(1,1,cpl_index), klon, knon,iim,jjm,                  knindex)
     1468    call gath2cpl(cpl_rcoa(1,cpl_index), tmp_rcoa(1,1,cpl_index), klon, knon,iim,jjm,                  knindex)
    14691469
    14701470!
     
    14951495      &            tmp_snow(:,:,2) * tamp_srf(:,:,2) / deno
    14961496!!$PB
    1497 !!$        wri_rriv = tmp_rriv(:,:,1) * tamp_srf(:,:,1) / deno +    &
    1498 !!$      &            tmp_rriv(:,:,2) * tamp_srf(:,:,2) / deno
    1499 !!$        wri_rcoa = tmp_rcoa(:,:,1) * tamp_srf(:,:,1) / deno +    &
    1500 !!$      &            tmp_rcoa(:,:,2) * tamp_srf(:,:,2) / deno
     1497        wri_rriv = tmp_rriv(:,:,1) * tamp_srf(:,:,1) / deno +    &
     1498      &            tmp_rriv(:,:,2) * tamp_srf(:,:,2) / deno
     1499        wri_rcoa = tmp_rcoa(:,:,1) * tamp_srf(:,:,1) / deno +    &
     1500      &            tmp_rcoa(:,:,2) * tamp_srf(:,:,2) / deno
    15011501        wri_taux = tmp_taux(:,:,1) * tamp_srf(:,:,1) / deno +    &
    15021502      &            tmp_taux(:,:,2) * tamp_srf(:,:,2) / deno
     
    15831583      deallocate(tmp_tauy, stat=error); sum_error = sum_error + error
    15841584!!$PB
    1585 !!$      deallocate(tmp_rriv, stat=error); sum_error = sum_error + error
    1586 !!$      deallocate(tmp_rcoa, stat=error); sum_error = sum_error + error
     1585      deallocate(tmp_rriv, stat=error); sum_error = sum_error + error
     1586      deallocate(tmp_rcoa, stat=error); sum_error = sum_error + error
    15871587      if (sum_error /= 0) then
    15881588        abort_message='Pb deallocation variables couplees'
Note: See TracChangeset for help on using the changeset viewer.