Ignore:
Timestamp:
Oct 24, 2024, 5:53:15 PM (25 hours ago)
Author:
abarral
Message:

Turn paramet.h into a module

File:
1 edited

Legend:

Unmodified
Added
Removed
  • LMDZ6/trunk/libf/dyn3d_common/prather.f90

    r5271 r5272  
    33!
    44SUBROUTINE prather (q,w,masse,pbaru,pbarv,nt,dt)
    5 
    65  USE comconst_mod, ONLY: pi
    7 
    86  USE dimensions_mod, ONLY: iim, jjm, llm, ndm
     7  USE paramet_mod_h, ONLY: iip1, iip2, iip3, jjp1, llmp1, llmp2, llmm1, kftd, ip1jm, ip1jmp1, &
     8          ip1jmi1, ijp1llm, ijmllm, mvar, jcfil, jcfllm
    99IMPLICIT NONE
    1010
     
    2121  !
    2222  !=======================================================================
    23 
    24 
    25 
    26   include "paramet.h"
    2723  include "comgeom2.h"
    2824
Note: See TracChangeset for help on using the changeset viewer.