94 REAL(wp),
PARAMETER ::
t_ref = 273.15_wp
97 REAL(wp),
PARAMETER ::
h_wv0 = 2.501d6
100 REAL(wp),
PARAMETER ::
c_wv = 1996.0_wp
103 REAL(wp),
PARAMETER ::
h_lw0 = 3.337d5
106 REAL(wp),
PARAMETER ::
c_lw = 4187.0_wp
109 REAL(wp),
PARAMETER ::
c_ice = 2108.0_wp
118 REAL(wp),
PARAMETER ::
rwv = 462
236 REAL(wp) :: const, const1, t1, p1, p2
240 REAL(wp) :: WE_wind , NS_wind
248 REAL(wp) :: sp_hu_avg
252 REAL(wp) :: h_bot , h_top
253 REAL(wp) :: sphu_bot , sphu_top
255 REAL(wp) :: T_ref , t0
256 REAL(wp) :: el , es , e_sl
258 REAL(wp) :: p_wv , p_da
259 REAL(wp) :: n_wv , n_da
260 REAL(wp) :: x_wv , x_da
286 IF ( ( we_wind .EQ. 0.0_wp ) .AND. ( ns_wind .EQ. 0.0_wp ) )
THEN 293 u_atm = sqrt( we_wind**2 + ns_wind**2 )
336 ELSE IF (
z >
h1 .AND.
z <=
h2)
THEN 348 ELSE IF (
z >
h2 .AND.
z <=
h3)
THEN 360 ELSE IF (
z >
h3 .AND.
z <=
h4)
THEN 371 ELSE IF (
z >
h4 .AND.
z <=
h5)
THEN 382 ELSE IF (
z >
h5 .AND.
z <=
h6)
THEN 398 sphu_atm = exp( log(sphu_bot) + ( log(sphu_top) - log(sphu_bot) ) * &
399 (
z-h_bot) / (h_top-h_bot) )
407 el = 611.2_wp * exp( 17.67_wp * (
ta-273.16_wp ) / (
ta - 29.65_wp ) )
410 es = -9.097_wp * ( (273.16_wp /
ta ) - 1.0_wp ) - 3.566_wp * &
411 log10(273.16_wp /
ta) + 0.876_wp * ( 1.0_wp - (
ta / 273.16_wp) )
413 es = 611.22_wp * ( 10.0_wp**es )
416 IF (
ta .GE. t_ref )
THEN 420 ELSEIF (
ta .LE. t0 )
THEN 426 e_sl = es + (
ta - t0 ) / ( t_ref - t0 ) * ( el - es )
463 IF (
u_max .GT. 0.0_wp )
THEN 483 WRITE(*,*)
'Height (asl) = ',
z 484 WRITE(*,*)
'Ambient temperature (K) = ',
ta 485 WRITE(*,*)
'Ambient pressure (Pa) = ',
pa 486 WRITE(*,*)
'Dry atmosphere density (kg m-3) = ',
rho_dry 487 WRITE(*,*)
'Moist atmosphere density (kg m-3) = ',
rho_atm 488 WRITE(*,*)
'Atmosphere viscosity = ',
visc_atm 489 WRITE(*,*)
'Wind speed (m s-1) = ',
u_atm 513 REAL(wp),
INTENT(IN),
DIMENSION(:) :: x1, f1
514 REAL(wp),
INTENT(IN) :: x2
515 REAL(wp),
INTENT(OUT) :: f2
529 IF (x1(n) <= x2) t = n
537 ELSEIF ( t.EQ.n1x )
THEN 543 grad = (f1(t+1)-f1(t))/(x1(t+1)-x1(t))
544 f2 = f1(t) + (x2-x1(t)) * grad
real(wp) visc_atm
Atmospheric kinematic viscosity.
real(wp) pa
Atmospheric pressure.
real(wp) rho_atm
Atmospheric density.
real(wp) cpair
specific heat capacity for dry air
real(wp) rh
Relative humidity for standard atmosphere.
real(wp), parameter h_lw0
enthalpy of liquid water at reference temperature (J kg-1)
real(wp) ta
Atmospheric temperature.
real(wp), parameter wv_mol_wt
molecular weight of water vapor
real(wp) u_atm
Horizonal wind speed.
real(wp) sphu_atm0
Atmospheric specific humidity at sea level (kg/kg)
real(wp) visc_atm0
Atmospheric kinematic viscosity at sea level.
subroutine interp_1d_scalar(x1, f1, x2, f2)
Scalar interpolation.
real(wp) rho_atm0
Atmospheric density at sea level.
real(wp), dimension(:), allocatable pres_atm_month_lat
real(wp), parameter h_wv0
enthalpy of water vapor at reference temperature (J kg-1)
real(wp) cos_theta
Wind angle.
real(wp), dimension(:), allocatable h_levels
subroutine zmet
Meteo parameters.
real(wp) dpdz
Vertical gradient of the pressure.
real(wp), parameter c_ice
specific heat of ice (J K-1 kg-1)
real(wp) rair
perfect gas constant for dry air ( J/(kg K) )
real(wp), parameter t_ref
reference temperature (K)
real(wp), parameter da_mol_wt
molecular weight of dry air
real(wp), dimension(:,:), allocatable temp_atm_month
real(wp) dtdz
Vertical gradient of the temperature.
real(wp), dimension(:,:), allocatable atm_profile
atmospheric profile above the vent. It is an array with n_atm_profile rows and 7 columns: ...
real(wp), dimension(:), allocatable rho_atm_month_lat
real(wp) vent_height
height of the base of the plume
real(wp) z
plume vertical coordinate
integer, parameter wp
working precision
real(wp), parameter c_lw
specific heat of liquid water (J K-1 kg-1)
real(wp), parameter c_wv
specifc heat of water vapor (J K-1 kg-1)
real(wp), dimension(:), allocatable temp_atm_month_lat
subroutine initialize_meteo
Meteo parameters initialization.
real *8 gi
Gravity acceleration.
real(wp), parameter rwv
gas constant for water vapor ( J/(kg K) )
character *10 read_atm_profile
integer verbose_level
Level of verbose output (0 = minimal output on screen)
real(wp) sphu_atm
Atmospheric specific humidity (kg/kg)