Ignore:
Timestamp:
Oct 28, 2024, 2:53:53 PM (7 hours ago)
Author:
abarral
Message:

Turn fxy*.h into modules
Fix clesphys_rrtm.h name

File:
1 edited

Legend:

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

    r5285 r5287  
    99  USE comconst_mod, ONLY: pi
    1010  USE dimensions_mod, ONLY: iim, jjm, llm, ndm
    11 USE paramet_mod_h
     11  USE paramet_mod_h
     12  USE fxy_sin_mod_h, ONLY: fx, fxprim, fy, fyprim
    1213IMPLICIT NONE
    1314  !
     
    2728   REAL :: rlonu(iip1),xprimu(iip1),rlonv(iip1),xprimv(iip1), &
    2829         rlonm025(iip1),xprimm025(iip1), rlonp025(iip1),xprimp025(iip1)
    29 
    30   INCLUDE "fxy_sin.h"
    3130
    3231
Note: See TracChangeset for help on using the changeset viewer.