1
2! KGEN-generated Fortran source file
3!
4! Filename    : rrsw_con.f90
5! Generated at: 2015-07-31 20:45:42
6! KGEN version: 0.4.13
7
8
9
10    MODULE rrsw_con
11        USE kgen_utils_mod, ONLY : kgen_dp, check_t, kgen_init_check, kgen_print_check
12        USE shr_kind_mod, ONLY: r8 => shr_kind_r8
13        !      use parkind, only : jpim, jprb
14        IMPLICIT NONE
15        !------------------------------------------------------------------
16        ! rrtmg_sw constants
17        ! Initial version: MJIacono, AER, jun2006
18        !------------------------------------------------------------------
19        !  name     type     purpose
20        ! -----  :  ----   : ----------------------------------------------
21        ! fluxfac:  real   : radiance to flux conversion factor
22        ! heatfac:  real   : flux to heating rate conversion factor
23        !oneminus:  real   : 1.-1.e-6
24        ! pi     :  real   : pi
25        ! grav   :  real   : acceleration of gravity (m/s2)
26        ! planck :  real   : planck constant
27        ! boltz  :  real   : boltzman constant
28        ! clight :  real   : speed of light
29        ! avogad :  real   : avogadro's constant
30        ! alosmt :  real   :
31        ! gascon :  real   : gas constant
32        ! radcn1 :  real   :
33        ! radcn2 :  real   :
34        !------------------------------------------------------------------
35        REAL(KIND=r8) :: oneminus
36        PUBLIC kgen_read_externs_rrsw_con
37    CONTAINS
38
39    ! write subroutines
40    ! No subroutines
41
42    ! module extern variables
43
44    SUBROUTINE kgen_read_externs_rrsw_con(kgen_unit)
45        INTEGER, INTENT(IN) :: kgen_unit
46        READ(UNIT=kgen_unit) oneminus
47    END SUBROUTINE kgen_read_externs_rrsw_con
48
49    END MODULE rrsw_con
50