Ignore:
Timestamp:
07/16/14 10:08:16 (10 years ago)
Author:
dubos
Message:

Removed "automatic" physics + bugfix

File:
1 edited

Legend:

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

    r215 r217  
    1111  TYPE(t_field),POINTER :: f_dulon(:), f_dulat(:) 
    1212 
    13   CHARACTER(LEN=255) :: physics_type="automatic" 
     13  CHARACTER(LEN=255) :: physics_type 
    1414!$OMP THREADPRIVATE(physics_type) 
    1515 
     
    2626    IMPLICIT NONE 
    2727 
    28     CALL allocate_field(f_dulon,field_t,type_real,llm, name='dulon') 
    29     CALL allocate_field(f_dulat,field_t,type_real,llm, name='dulat') 
    30     CALL init_pack_before ! Compute physics_inout%ngrid and offsets used by pack/unpack 
    31      
    32     physics_type='automatic' 
     28    physics_inout%dt_phys = dt*itau_physics 
     29    physics_type='none' 
    3330    CALL getin("physics",physics_type) 
    34  
    3531    SELECT CASE(TRIM(physics_type)) 
    36     CASE ('automatic') 
    37        etat0_type='jablonowsky06' 
    38        CALL getin("etat0",etat0_type) 
    39        SELECT CASE(TRIM(etat0_type)) 
    40        CASE('held_suarez') 
    41           phys_type = phys_HS94 
    42        CASE DEFAULT 
    43           IF(is_mpi_root) PRINT*,"NO PHYSICAL PACKAGE USED" 
    44           phys_type = phys_none 
    45        END SELECT 
    46  
     32    CASE ('none') 
     33       IF(is_mpi_root) PRINT*,"NO PHYSICAL PACKAGE USED" 
     34       phys_type = phys_none 
     35    CASE ('held_suarez') 
     36       phys_type = phys_HS94 
    4737    CASE ('dcmip') 
     38       CALL allocate_field(f_dulon,field_t,type_real,llm, name='dulon') 
     39       CALL allocate_field(f_dulat,field_t,type_real,llm, name='dulat') 
     40       CALL init_pack_before ! Compute physics_inout%ngrid and offsets used by pack/unpack 
    4841       CALL init_physics_dcmip 
     42       CALL init_pack_after ! Defines Ai, lon, lat in physics_inout 
    4943       phys_type = phys_DCMIP 
    5044    CASE DEFAULT 
    5145       IF(is_mpi_root) PRINT*, 'init_physics : Bad selector for variable physics <',& 
    52             TRIM(physics_type), '> options are <automatic>, <dcmip>, <dry>' 
     46            TRIM(physics_type), '> options are <none>, <held_suarez>, <dcmip>' 
    5347       STOP 
    5448    END SELECT 
    5549 
    5650    IF(is_mpi_root) PRINT *, 'phys_type = ',phys_type 
    57     physics_inout%dt_phys = dt*itau_physics 
    58     CALL init_pack_after ! Defines Ai, lon, lat in physics_inout 
    5951  END SUBROUTINE init_physics 
    6052 
Note: See TracChangeset for help on using the changeset viewer.