Ignore:
Timestamp:
Sep 29, 2016, 11:26:46 PM (8 years ago)
Author:
Laurent Fairhead
Message:

Merged trunk changes r2593:2640 into testing branch

Location:
LMDZ5/branches/testing
Files:
2 edited

Legend:

Unmodified
Added
Removed
  • LMDZ5/branches/testing

  • LMDZ5/branches/testing/libf/dyn3dmem/dynetat0_loc.f90

    r2408 r2641  
    1212  USE control_mod, ONLY: planet_type
    1313  USE assert_eq_m, ONLY: assert_eq
     14  USE comvert_mod, ONLY: pa,preff
     15  USE comconst_mod, ONLY: cpp, daysec, dtvr, g, im, jm, kappa, lllm, &
     16                          omeg, rad
     17  USE logic_mod, ONLY: fxyhypb, ysinus
     18  USE serre_mod, ONLY: clon, clat, grossismx, grossismy
     19  USE temps_mod, ONLY: annee_ref,day_ref,itau_dyn, &
     20                       start_time,day_ini,hour_ini
     21  USE ener_mod, ONLY: etot0,ptot0,ztot0,stot0,ang0
     22 
    1423  IMPLICIT NONE
    1524  include "dimensions.h"
    1625  include "paramet.h"
    17   include "temps.h"
    18   include "comconst.h"
    19   include "comvert.h"
    2026  include "comgeom.h"
    21   include "ener.h"
    2227  include "description.h"
    23   include "serre.h"
    24   include "logic.h"
    2528  include "iniprint.h"
    2629!===============================================================================
     
    99102  day_ini    = tab_cntrl(30)
    100103  itau_dyn   = tab_cntrl(31)
    101 !  start_time = tab_cntrl(32)   ????
     104  start_time = tab_cntrl(32)
    102105
    103106!-------------------------------------------------------------------------------
Note: See TracChangeset for help on using the changeset viewer.