GCC Code Coverage Report


Directory: ./
File: rad/suaerl.f90
Date: 2022-01-11 19:19:34
Exec Total Coverage
Lines: 10 10 100.0%
Branches: 14 16 87.5%

Line Branch Exec Source
1 1 SUBROUTINE SUAERL
2
3 !**** *SUAERL* - INITIALIZE COMMON YOEAER
4
5 ! PURPOSE.
6 ! --------
7 ! INITIALIZE YOEAER, THE COMMON THAT CONTAINS THE
8 ! RADIATIVE CHARACTERISTICS OF THE AEROSOLS
9
10 !** INTERFACE.
11 ! ----------
12 ! ----- -----
13
14 ! EXPLICIT ARGUMENTS :
15 ! --------------------
16 ! NONE
17
18 ! IMPLICIT ARGUMENTS :
19 ! --------------------
20 ! COMMON YOEAER
21
22 ! METHOD.
23 ! -------
24 ! SEE DOCUMENTATION
25
26 ! EXTERNALS.
27 ! ----------
28
29 ! REFERENCE.
30 ! ----------
31 ! ECMWF RESEARCH DEPARTMENT DOCUMENTATION OF THE "IFS MODEL"
32
33 ! AUTHOR.
34 ! -------
35 ! JEAN-JACQUES MORCRETTE *ECMWF*
36
37 ! MODIFICATIONS.
38 ! --------------
39 ! ORIGINAL : 88-02-15
40 ! 99-05-25 JJMorcrette Revised Aerosol LW properties (OPAC)
41 ! M.Hamrud 01-Oct-2003 CY28 Cleaning
42
43 ! ------------------------------------------------------------------
44
45 USE PARKIND1 ,ONLY : JPIM ,JPRB
46 USE YOMHOOK ,ONLY : LHOOK, DR_HOOK
47
48 USE YOESW , ONLY : RAER
49
50 ! ----------------------------------------------------------------
51
52 !* 1. SHORTWAVE COEFFICIENTS
53 ! ----------------------
54
55 ! Initialised in SUAERSn depending on NSW number of SW spectral
56 ! intervals
57
58 ! ----------------------------------------------------------------
59
60 !* 2. LONGWAVE COEFFICIENTS
61 ! ---------------------
62
63 !=======================================================================
64 !-- The (old) five aerosol types were respectively:
65
66 ! 1/ continental average (+desert) 2/ maritime
67 ! 3/ urban 4/ volcanic active
68 ! 5/ stratospheric background
69
70 ! RAER = RESHAPE((/
71 ! & .038520, .037196, .040532, .054934, .038520
72 ! & , .126130, .18313 , .10357 , .064106, .126130
73 ! & , .012579, .013649, .018652, .025181, .012579
74 ! & , .011890, .016142, .021105, .028908, .011890
75 ! & , .013792, .026810, .052203, .066338, .013792 /)
76 ! & ,SHAPE=(/5,5/))
77
78 !=======================================================================
79
80 !-- The six aerosol types are respectively:
81
82 ! 1/ continental average 2/ maritime
83 ! 3/ desert 4/ urban
84 ! 5/ volcanic active 6/ stratospheric background
85
86 ! The quantities given are:
87 ! TAU : ratio of average optical thickness in interval to that at 0.55
88 ! micron
89 ! PIZA: average single scattering albedo
90 ! CGA : average asymmetry factor
91
92 ! computed from Hess and Koepke (con, mar, des, urb)
93 ! from Bonnel et al. (vol, str)
94
95 !-- data are entered for the 6 spectral intervals of the LW scheme (line)
96 ! and the different types of aerosols (column)
97
98 IMPLICIT NONE
99 REAL(KIND=JPRB) :: ZHOOK_HANDLE
100
1/2
✓ Branch 0 taken 1 times.
✗ Branch 1 not taken.
1 IF (LHOOK) CALL DR_HOOK('SUAERL',0,ZHOOK_HANDLE)
101 RAER( :, 1)= (/&
102
2/2
✓ Branch 0 taken 1 times.
✓ Branch 1 taken 6 times.
7 & .036271_JPRB, .030153_JPRB, .017343_JPRB, .015002_JPRB, .008806_JPRB, .006865_JPRB /)
103 RAER( :, 2)= (/&
104
2/2
✓ Branch 0 taken 1 times.
✓ Branch 1 taken 6 times.
7 & .026561_JPRB, .032657_JPRB, .017977_JPRB, .014210_JPRB, .016775_JPRB, .022123_JPRB /)
105 RAER( :, 3)= (/&
106
2/2
✓ Branch 0 taken 1 times.
✓ Branch 1 taken 6 times.
7 & .014897_JPRB, .016359_JPRB, .019789_JPRB, .030777_JPRB, .013341_JPRB, .014321_JPRB /)
107 RAER( :, 4)= (/&
108
2/2
✓ Branch 0 taken 1 times.
✓ Branch 1 taken 6 times.
7 & .001863_JPRB, .002816_JPRB, .002355_JPRB, .002557_JPRB, .001774_JPRB, .001780_JPRB /)
109 RAER( :, 5)= (/&
110
2/2
✓ Branch 0 taken 1 times.
✓ Branch 1 taken 6 times.
7 & .011890_JPRB, .016142_JPRB, .021105_JPRB, .028908_JPRB, .011890_JPRB, .011890_JPRB /)
111 RAER( :, 6)= (/&
112
2/2
✓ Branch 0 taken 6 times.
✓ Branch 1 taken 1 times.
7 & .013792_JPRB, .026810_JPRB, .052203_JPRB, .066338_JPRB, .013792_JPRB, .013792_JPRB /)
113
114 ! ----------------------------------------------------------------
115
116
1/2
✓ Branch 0 taken 1 times.
✗ Branch 1 not taken.
1 IF (LHOOK) CALL DR_HOOK('SUAERL',1,ZHOOK_HANDLE)
117 1 END SUBROUTINE SUAERL
118