Ignore:
Timestamp:
Jul 22, 2024, 9:29:09 PM (2 months ago)
Author:
abarral
Message:

Replace most uses of CPP_DUST by the corresponding logical defined in lmdz_cppkeys_wrapper.F90
Convert several files from .F to .f90 to allow Dust to compile w/o rrtm/ecrad
Create lmdz_yoerad.f90
(lint) Remove "!" on otherwise empty line

File:
1 edited

Legend:

Unmodified
Added
Removed
  • LMDZ6/branches/Amaury_dev/libf/dyn3dmem/writedyn_xios.F90

    r5087 r5099  
    11
    22! $Id$
    3 !
     3
    44      SUBROUTINE writedyn_xios( vcov, ucov,teta,ppk,phi,q, &
    55                             masse,ps,phis)
     
    1515     
    1616      implicit none
    17 !
     17
    1818!   Ecriture du fichier histoire au format xios
    19 !
    20 !
     19
     20
    2121!   Entree:
    2222!      vcov: vents v covariants
     
    2828!      ps   :pression au sol
    2929!      phis : geopotentiel au sol
    30 !     
     30
    3131!   L. Fairhead, LMD, 03/21
    32 !
     32
    3333! =====================================================================
    34 !
     34
    3535!   Declarations
    3636      include "dimensions.h"
     
    4040      include "iniprint.h"
    4141
    42 !
    4342!   Arguments
    44 !
    4543
    4644      REAL vcov(ijb_v:ije_v,llm),ucov(ijb_u:ije_u,llm)
     
    5452
    5553!   Variables locales
    56 !
     54
    5755      INTEGER,SAVE,ALLOCATABLE :: ndex2d(:),ndexu(:),ndexv(:)
    5856      INTEGER :: iq, ii, ll
     
    6866!$OMP THREADPRIVATE(first)
    6967
    70 !
    7168!  Initialisations
    72 !
    7369
    7470!      WRITE(*,*)'IN WRITEDYN_XIOS'
     
    10399      call covnat_loc(llm, ucov, vcov, unat, vnat)
    104100
    105 !
    106101!  Appels a histwrite pour l'ecriture des variables a sauvegarder
    107 !
     102
    108103!  Vents U
    109 !
     104
    110105      ijb=ij_begin
    111106      ije=ij_end
     
    114109      CALL writefield_dyn_u('U', unat(ijb:ije,:))
    115110
    116 !
    117111!  Vents V
    118 !
     112
    119113      ije=ij_end
    120114      IF (pole_sud) THEN
     
    130124         CALL writefield_dyn_v('V', vbuffer(ijb:ije,:))
    131125      ENDIF
    132      
    133126
    134      
    135 !
    136127!  Temperature potentielle moyennee
    137 !
     128
    138129      ijb=ij_begin
    139130      ije=ij_end
     
    141132     CALL writefield_dyn_u('THETA', teta(ijb:ije,:))
    142133
    143 !
    144134!  Temperature moyennee
    145 !
    146135
    147136!$OMP DO SCHEDULE(STATIC,OMP_CHUNK)       
     
    154143      CALL writefield_dyn_u('TEMP', tm(ijb:ije,:))
    155144
     145!  Geopotentiel
    156146
    157 !
    158 !  Geopotentiel
    159 !
    160147      CALL writefield_dyn_u('PHI', phi(ijb:ije,:))
    161148
     149! Tracers?
    162150
    163 !
    164 ! Tracers?
    165 !
    166151!        DO iq=1,nqtot
    167152!        ENDDO
    168153
     154!  Masse
    169155
    170 !
    171 !  Masse
    172 !
    173156      CALL writefield_dyn_u('MASSE', masse(ijb:ije,:))
    174157
     158!  Pression au sol
    175159
    176 !
    177 !  Pression au sol
    178 !
    179160      CALL writefield_dyn_u('PS', ps(ijb:ije))
    180161
Note: See TracChangeset for help on using the changeset viewer.