My Project
Functions/Subroutines
icing.f90 File Reference

Go to the source code of this file.

Functions/Subroutines

subroutine icing (NOW)
 

Function/Subroutine Documentation

◆ icing()

subroutine icing ( type(time), intent(in)  NOW)

Definition at line 41 of file icing.f90.

41  USE mod_utils
42  USE mod_force
43  USE all_vars
44  USE mod_time
45  IMPLICIT NONE
46  TYPE(TIME), INTENT(IN) :: NOW
47  REAL(SP), PARAMETER :: Tfreeze = -1.75_sp
48  REAL(SP), DIMENSION(0:MT) :: ICING_WNDSPD
49 
50  IF(dbg_set(dbg_log)) write(ipt,*) "Start Icing Update"
51 
52  ! GET THE FORCING DATA
54 
55  icing_wndspd = sqrt(icing_wndy**2 + icing_wndx**2)
56  icing_wndspd(0) = 0.0_sp
57 
58 
59  IF(dbg_set(dbg_io))THEN
60  WRITE(ipt,*) "min/max(SAT)",minval(icing_satmp(1:mt)),maxval(icing_satmp(1:mt))
61  WRITE(ipt,*) "min/max(WNDSPD)",minval(icing_wndspd(1:mt)),maxval(icing_wndspd(1:mt))
62  WRITE(ipt,*) "min/max(T1(:,1))",minval(t1(1:mt,1)),maxval(t1(1:mt,1))
63  END IF
64 
65  icing_0kts = (tfreeze - icing_satmp) /&
66  (1.0_sp + 0.4_sp *(t1(:,1) -tfreeze))
67 
68  WHERE (icing_0kts < 0.0_sp) icing_0kts = 0.0_sp
69 
70  icing_10kts = (icing_wndspd + 5.0_sp) * icing_0kts
71 
72  icing_0kts = icing_0kts * icing_wndspd
73 
74 
integer mt
Definition: mod_main.f90:78
logical function dbg_set(vrb)
Definition: mod_utils.f90:182
real(sp), dimension(:,:), allocatable, target t1
Definition: mod_main.f90:1307
real(sp), dimension(:), allocatable, target icing_0kts
Definition: mod_main.f90:1208
subroutine, public update_icing(NOW, SAT, WSPDX, WSPDY)
Definition: mod_force.f90:7252
real(sp), dimension(:), allocatable, target icing_wndy
Definition: mod_main.f90:1206
real(sp), dimension(:), allocatable, target icing_10kts
Definition: mod_main.f90:1209
real(sp), dimension(:), allocatable, target icing_satmp
Definition: mod_main.f90:1207
integer, parameter dbg_io
Definition: mod_utils.f90:66
integer ipt
Definition: mod_main.f90:922
integer, parameter dbg_log
Definition: mod_utils.f90:65
real(sp), dimension(:), allocatable, target icing_wndx
Definition: mod_main.f90:1205
Here is the call graph for this function:
Here is the caller graph for this function: