Ignore:
Timestamp:
07/16/12 10:24:35 (12 years ago)
Author:
ymipsl
Message:

Merge advection scheme from sarvesh in standard version

YM

File:
1 edited

Legend:

Unmodified
Added
Removed
  • codes/icosagcm/trunk/src/caldyn_gcm.f90

    r15 r17  
    44  USE transfert_mod 
    55 
     6  PRIVATE  
    67  TYPE(t_field),POINTER :: f_out(:) 
    78  REAL(rstd),POINTER :: out(:,:) 
     
    1213  
    1314  INTEGER :: itau_out 
    14    
     15 
     16  PUBLIC init_caldyn, caldyn 
     17 
    1518CONTAINS 
    1619   
     
    1922  IMPLICIT NONE 
    2023    REAL(rstd),INTENT(IN) :: dt 
    21     REAL(rstd) :: write_period 
     24    INTEGER :: write_period 
     25 
    2226    CALL allocate_caldyn 
    23  
    2427    CALL getin('write_period',write_period) 
    2528     
    2629    itau_out=INT(write_period/dt) 
     30     
     31    CALL allocate_caldyn 
    2732   
    2833  END SUBROUTINE init_caldyn 
     
    3439  USE metric 
    3540  IMPLICIT NONE 
    36     INTEGER :: ind,i,j 
    3741 
    3842    CALL allocate_field(f_out,field_t,type_real,llm)  
Note: See TracChangeset for help on using the changeset viewer.