Ignore:
Timestamp:
Jul 22, 2024, 9:29:09 PM (7 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

Location:
LMDZ6/branches/Amaury_dev/libf/phylmd/inlandsis
Files:
9 edited

Legend:

Unmodified
Added
Removed
  • LMDZ6/branches/Amaury_dev/libf/phylmd/inlandsis/VARdSV.F90

    r5087 r5099  
    9797      INTEGER ::  iso1  !rajout hjp for ini - check if ivg,iso is possible
    9898
    99 !
    100 
    10199END MODULE VARdSV
  • LMDZ6/branches/Amaury_dev/libf/phylmd/inlandsis/VARphy.F90

    r5087 r5099  
    88! Etienne, 08112020: merging YOMCST_SISVAT,  PHY_SV and VARphy
    99! but redundancies remain
    10 !
     10
    1111!  ATTENTION!!!!: ce fichier include est compatible format fixe/format libre
    1212!                 veillez à n'utiliser que des ! pour les commentaires
    1313!                 et à bien positionner les & des lignes de continuation
    1414!                 (les placer en colonne 6 et en colonne 73)
    15 !
    16 !
     15
     16
    1717! A1.0 Fundamental constants
    1818!----------------------------
  • LMDZ6/branches/Amaury_dev/libf/phylmd/inlandsis/VARxSV.F90

    r3900 r5099  
    201201      INTEGER,DIMENSION(nb_wri),SAVE ::   lwriSV  ! OUTPUT point vec Index         
    202202!$OMP THREADPRIVATE(lwriSV)
    203 !                                                                             
     203
    204204      INTEGER, DIMENSION(:),ALLOCATABLE,SAVE ::   ii__SV  ! WORK   point   i Coordinate     
    205205!$OMP THREADPRIVATE(ii__SV)
     
    329329! +--SISVAT OUTPUT       Variables                                           
    330330! +  -----------------------------                                           
    331                                                                                
    332 !                                                                             
     331
    333332      ALLOCATE(ii__SV(klonv))  ! WORK   point   i Coordinate     
    334333      ALLOCATE(jj__SV(klonv))  ! WORK   point   j Coordinate     
  • LMDZ6/branches/Amaury_dev/libf/phylmd/inlandsis/VARySV.F90

    r3900 r5099  
    8686      ALLOCATE(alb6sv(klonv,6))! 6-band  Albedo     
    8787
    88       !
    8988      ALLOCATE(albssv(klonv))  ! Soil               Albedo [-]   
    9089      ALLOCATE(SoSosv(klonv))  !? Surface Absorbed Solar Radiat. 
  • LMDZ6/branches/Amaury_dev/libf/phylmd/inlandsis/inlandsis.F

    r5082 r5099  
    10311031! Surface Emissivity (Etienne: simplified calculation for landice)
    10321032! =============================================================
    1033 !
     1033
    10341034       DO ikl=1,knonv
    10351035            LSnMsk     =     min( 1,isnoSV(ikl))
  • LMDZ6/branches/Amaury_dev/libf/phylmd/inlandsis/sisvat_ts2.F

    r5082 r5099  
    126126
    127127!        write(*,*)'T check'
    128 !     
     128
    129129!        DO  ig = 1,knonv 
    130130!            DO  jk = 1,isnoSV(ig) !nsno       
     
    132132!                TsisSV(ig,jk) = TsisSV(ig,isnoSV(ig))
    133133!              ENDIF 
    134 !
     134
    135135!              IF (TsisSV(ig,jk) <= 1.) THEN          !hj check
    136136!                TsisSV(ig,jk) = 273.15
  • LMDZ6/branches/Amaury_dev/libf/phylmd/inlandsis/sisvat_tso.F

    r5093 r5099  
    467467
    468468        if(ist__s==1) then ! to reduce computer time                                                 
    469                                           !
     469
    470470        DO it_srf=1,nt_srf                                     !
    471471              dt_ver       = dt_ver     +dt_srf                !
     
    481481            DO ikl=1,knonv
    482482              ist    = max(0,isotSV(ikl)-100*isnoSV(ikl))      ! 0 if    H2O
    483                                                                !
     483
    484484              Psi(ikl) =                                       !
    485485     .                psidSV(ist)                              ! DR97, Eqn 3.34
  • LMDZ6/branches/Amaury_dev/libf/phylmd/inlandsis/sisvat_zsn.F

    r5082 r5099  
    162162     .                      isnoSV(ikl)-isn +1 ))       !          Snow Pack
    163163     .                * min(unun,                                !
    164 !
     164
    165165!                       1st additional Condition to accept OKthin
    166166     .                  max(zero,                                ! combination
    167167     .                      sign(unun,G1snSV(ikl,      isn  )    ! G1 with same
    168168     .                               *G1snSV(ikl,max(1,isn-1)))) !  sign => OK
    169 !
     169
    170170!                       2nd additional Condition to accept OKthin
    171171     .                + max(zero,                                ! G1>0
    172172     .                      sign(unun,G1snSV(ikl,      isn   ))) !  =>OK
    173 !
     173
    174174!                       3rd additional Condition to accept OKthin
    175175     .                + max(zero,                                ! dz too small
  • LMDZ6/branches/Amaury_dev/libf/phylmd/inlandsis/surf_inlandsis_mod.F90

    r5087 r5099  
    593593         END DO
    594594
    595         !
    596595        ! +  +++  READ FORCINGS:  END  +++
    597596        ! ++++++++++++++++++++++++++++++++++++++++++++++++++++++++++++++++++++++++++++
     
    751750        ! to LMDZ. In LMDZ it is done in soil.F, which is not used in the case
    752751        ! of SISVAT, therefore it's needed here.
    753         !
     752
    754753        USE mod_phys_lmdz_mpi_data, ONLY : is_mpi_root
    755754        USE mod_phys_lmdz_para
     
    862861        !C |                                                                        |
    863862        !C +------------------------------------------------------------------------+
    864         !
    865         !
     863
    866864
    867865        !C +--Global Variables
     
    933931        !c #kd   END DO
    934932        !c #kd END IF
    935         !
     933
    936934        !      IF (nsol.ne.4)                                              THEN
    937935        !        DO isl= 0,-nsol,-1
     
    941939        !     .                  +  misl_2  * 0.003) * 10**(nisl_2)) * 4.
    942940        !C +...    dz_dSV(0)  =         Hapex-Sahel Calibration:       4 mm
    943         !
     941
    944942        !c +SH     dz_dSV(isl)=(((1-misl_2) * 0.001
    945943        !c +SH.                  +  misl_2  * 0.003) * 10**(nisl_2)) * 1.
    946         !
     944
    947945        !c #05     dz_dSV(isl)=(((1-misl_2) * 0.001
    948946        !c #05.                  +  misl_2  * 0.008) * 10**(nisl_2)) * 0.5
Note: See TracChangeset for help on using the changeset viewer.