Ignore:
Timestamp:
08/02/12 23:14:56 (12 years ago)
Author:
ymipsl
Message:

update dcmip4 testcase

YM

File:
1 edited

Legend:

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

    r67 r78  
    1010    USE etat0_dcmip2_mod, ONLY : etat0_dcmip2=>etat0 
    1111    USE etat0_dcmip3_mod, ONLY : etat0_dcmip3=>etat0   
    12     USE etat0_dcmip41_mod, ONLY : etat0_dcmip41=>etat0   
     12    USE etat0_dcmip4_mod, ONLY : etat0_dcmip4=>etat0   
    1313    IMPLICIT NONE 
    1414    TYPE(t_field),POINTER :: f_ps(:) 
     
    3333    CASE ('dcmip3') 
    3434       CALL etat0_dcmip3(f_ps,f_phis,f_theta_rhodz,f_u, f_q) 
    35      CASE ('dcmip41') 
    36        CALL etat0_dcmip41(f_ps,f_phis,f_theta_rhodz,f_u, f_q) 
     35     CASE ('dcmip4') 
     36       CALL etat0_dcmip4(f_ps,f_phis,f_theta_rhodz,f_u, f_q) 
    3737   CASE DEFAULT 
    3838       PRINT*, 'Bad selector for variable etat0 <',etat0_type, & 
Note: See TracChangeset for help on using the changeset viewer.