Ignore:
Timestamp:
Apr 8, 2016, 8:46:54 AM (9 years ago)
Author:
emillour
Message:

Mars:

  • Fix for the 1D model initializations.

EM

File:
1 edited

Legend:

Unmodified
Added
Removed
  • trunk/LMDZ.MARS/libf/phymars/dyn1d/testphys1d.F

    r1528 r1535  
    1212      use slope_mod, only: theta_sl, psi_sl
    1313      use phyredem, only: physdem0,physdem1
    14       use comgeomphy, only: initcomgeomphy
     14      use comgeomphy, only: initcomgeomphy, airephy, cuphy, cvphy,
     15     &                      rlond, rlatd
    1516      use planete_h, only: year_day, periheli, aphelie, peri_day,
    1617     &                     obliquit, emin_turb, lmixmin
    1718      use comcstfi_h, only: pi, rad, omeg, g, mugaz, rcp, r, cpp
    18       use time_phylmdz_mod, only: daysec, dtphys, day_step
     19      use time_phylmdz_mod, only: daysec, dtphys, day_step,
     20     &                            ecritphy, iphysiq
    1921      use dimradmars_mod, only: tauscaling,tauvis
    2022      USE comvert_mod, ONLY: ap,bp,aps,bps,pa,preff,sig
    2123      USE logic_mod, ONLY: hybrid
     24      use regular_lonlat_mod, only: init_regular_lonlat
    2225      USE phys_state_var_init_mod, ONLY: phys_state_var_init
    2326      IMPLICIT NONE
     
    117120! initialize "serial/parallel" related stuff
    118121!      CALL init_phys_lmdz(iim,jjp1,llm,1,(/(jjm-1)*iim+2/))
    119       CALL init_phys_lmdz(iim,jjm+1,llm,1,(/(jjm-1)*iim+2/))
     122      CALL init_phys_lmdz(1,1,llm,1,(/1/))
    120123      call initcomgeomphy
    121124
     
    419422      write(*,*) " day_step = ",day_step
    420423
     424      iphysiq=1 ! in 1D model physics are called every time step
     425      ecritphy=day_step ! default value for ecritphy, output every time step
     426
    421427      ndt=10 ! default value for ndt
    422428      PRINT *,'Number of sols to run ?'
     
    477483!  and allocates some arrays
    478484!Mars possible matter with dtphys in input and include!!!
     485! Initializations below should mimick what is done in iniphysiq for 3D GCM
     486      call init_regular_lonlat(1,1,longitude,latitude,
     487     &                   (/0.,0./),(/0.,0./))
    479488      call phys_state_var_init(1,llm,nq,
    480489     .          day0,time,daysec,dtphys,rad,g,r,cpp)
     
    526535c   mesh surface (not a very usefull quantity in 1D)
    527536      area(1)=1.E+0
     537      airephy(1)=area(1)
    528538
    529539c   surface geopotential is not used (or useful) since in 1D
Note: See TracChangeset for help on using the changeset viewer.