Ignore:
Timestamp:
06/15/16 22:35:17 (8 years ago)
Author:
dubos
Message:

Dry/moist output cleanup

File:
1 edited

Legend:

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

    r430 r434  
    3434  SUBROUTINE init_physics 
    3535    USE physics_interface_mod 
     36    USE omp_para 
    3637    IMPLICIT NONE 
    3738    INTEGER :: ngrid 
    3839    CHARACTER(LEN=255) :: testcase_str  
    3940     
     41    testcase_str='undefined' 
    4042    CALL getin("physics_dcmip2016",testcase_str) 
    4143    
     
    5355      CASE DEFAULT 
    5456         PRINT*, 'Bad selector for dcmip2016 test case <', testcase_str, & 
    55               '> options are <dry_baroclinic>, <moist_baroclinic>, <cyclone>, <supercell>' 
     57              '> options are <dry_baroclinic>, <moist_baroclinic_full>, <moist_baroclinic_kessler>, <cyclone>, <supercell>' 
    5658         STOP 
    5759    END SELECT 
     
    5961    PBL=.FALSE. 
    6062    CALL getin("physics_dcmip2016_PBL",PBL) 
     63    IF(is_master) THEN 
     64       IF(PBL) THEN 
     65          PRINT *, 'PBL=.TRUE., Bryan PBL activated' 
     66       ELSE 
     67          PRINT *, 'PBL=.FALSE., Reed & Jablonowski PBL activated' 
     68       END IF 
     69    END IF 
    6170 
    6271    ngrid = physics_inout%ngrid 
Note: See TracChangeset for help on using the changeset viewer.