Ignore:
Timestamp:
Jun 15, 2021, 1:18:14 PM (3 years ago)
Author:
crisi
Message:

replace files by symbloic liks from phylmdiso towards phylmd.
Many files at once

File:
1 edited

Legend:

Unmodified
Added
Removed
  • LMDZ6/trunk/libf/phylmdiso/fonte_neige_mod.F90

    r3927 r3940  
    2828  REAL, PRIVATE                               :: tau_calv 
    2929  !$OMP THREADPRIVATE(tau_calv)
    30   REAL, ALLOCATABLE, DIMENSION(:,:), PRIVATE  :: ffonte_global
     30  REAL, ALLOCATABLE, DIMENSION(:,:)           :: ffonte_global
    3131  !$OMP THREADPRIVATE(ffonte_global)
    32   REAL, ALLOCATABLE, DIMENSION(:,:), PRIVATE  :: fqfonte_global
     32  REAL, ALLOCATABLE, DIMENSION(:,:)           :: fqfonte_global
    3333  !$OMP THREADPRIVATE(fqfonte_global)
    34   REAL, ALLOCATABLE, DIMENSION(:,:), PRIVATE  :: fqcalving_global
     34  REAL, ALLOCATABLE, DIMENSION(:,:)           :: fqcalving_global
    3535  !$OMP THREADPRIVATE(fqcalving_global)
    36   REAL, ALLOCATABLE, DIMENSION(:), PRIVATE  :: runofflic_global
     36  REAL, ALLOCATABLE, DIMENSION(:)             :: runofflic_global
    3737  !$OMP THREADPRIVATE(runofflic_global)
    3838#ifdef ISO
     
    6060! The variable run_off_lic_0 is initialized to the field read from
    6161! restart file. The other variables are initialized to zero.
    62 
    6362!
    6463!****************************************************************************************
     
    8483    run_off_lic_0(:) = restart_runoff(:)
    8584
    86 
    8785!****************************************************************************************
    8886! Allocate other variables and initilize to zero
     
    130128    ENDIF
    131129    runofflic_global(:) = 0.0
    132 
    133 
    134130
    135131!****************************************************************************************
     
    348344
    349345    snow_evap = 0.
    350    
     346 
    351347#ifdef ISOVERIF
    352348        write(*,*) 'klon,snow_evap(413)=',klon,snow_evap(413)
     
    406402       ! Y'a-t-il fonte de neige?
    407403       neige_fond = (snow(i)>epsfra .OR. nisurf==is_sic .OR. nisurf==is_lic) .AND. tsurf_new(i)>=RTT
    408        IF (neige_fond) THEN   
     404       IF (neige_fond) THEN
    409405          fq_fonte     = MIN( MAX((tsurf_new(i)-RTT )/chasno,0.0),snow(i))
    410406          ffonte(i)    = fq_fonte * RLMLT/dtime
     
    412408          snow(i)      = MAX(0., snow(i) - fq_fonte)
    413409          bil_eau_s(i) = bil_eau_s(i) + fq_fonte
    414           tsurf_new(i) = tsurf_new(i) - fq_fonte * chasno   
     410          tsurf_new(i) = tsurf_new(i) - fq_fonte * chasno 
    415411#ifdef ISO
    416412        fq_fonte_diag(i)=fq_fonte
Note: See TracChangeset for help on using the changeset viewer.