source: LMDZ6/trunk/libf/phylmd/perturb_radlwsw.f90 @ 5390

Last change on this file since 5390 was 5390, checked in by yann meurdesoif, 7 days ago
  • Remove UTF8 character that inihibit fortran parsing with GPU morphosis
  • Add missing END SUBROUTINE instead of simple END, that inhibit correct parsing with regulat expression parser (quick and dirty parsing)

YM

File size: 669 bytes
Line 
1      SUBROUTINE perturb_radlwsw(zxtsol,iflag_radia)
2!
3!Case-specific radiative setup
4!
5USE flux_arp_mod_h
6            use dimphy
7      IMPLICIT none
8!
9! Arguments :
10!------------
11      REAL,DIMENSION(klon), INTENT(INOUT) :: zxtsol
12      INTEGER, INTENT(IN)                 :: iflag_radia
13!
14!======================================================================
15!
16      IF (iflag_radia == 2) THEN
17!
18! Iflag_radia = 2 : DICE case :
19!               on force zxtsol=tg pour le rayonnement (MPL 20130806)
20!Sonia : Cas dice lmdz1d force en flux : on impose Tg pour imposer le LWUP
21!
22        zxtsol(:) =  tg
23      ENDIF
24!
25      RETURN
26      END SUBROUTINE perturb_radlwsw
27
Note: See TracBrowser for help on using the repository browser.