Subroutine : | recursive
|
xy_Ps(0:imax-1, 1:jmax) : | real(DP), intent(in)
: | $ p_s (t-\Delta t) $ . �°è¡¨�¢æ���. Surface pressure
|
|
xyz_Temp(0:imax-1, 1:jmax, 1:kmax) : | real(DP), intent(in)
: | $ T $ . æ¸�º¦. Temperature
|
|
xyz_QVap(0:imax-1, 1:jmax, 1:kmax) : | real(DP), intent(in)
: | $ q $ . ��. Specific humidity
|
|
xyr_Temp(0:imax-1, 1:jmax, 0:kmax) : | real(DP), intent(out), optional
: | $ hat{T} $ . æ¸�º¦ (���´æ�°ã������). Temperature (half level)
|
|
xyz_VirTemp(0:imax-1, 1:jmax, 1:kmax) : | real(DP), intent(out), optional
: | $ hat{T} $ . ä»�¸©åº� Virtual temperature
|
|
xyr_VirTemp(0:imax-1, 1:jmax, 0:kmax) : | real(DP), intent(out), optional
: | $ hat{T} $ . ä»�¸©åº� (���´æ�°ã������). Virtual temperature (half
level)
|
|
xy_SurfVirTemp(0:imax-1, 1:jmax) : | real(DP), intent(out), optional
: | $ hat{T} $ . ä»�¸©åº� (����è¡���). Virtual temperature (surface)
|
|
xyz_Press(0:imax-1, 1:jmax, 1:kmax) : | real(DP), intent(out), optional
: | $ p $ . æ°��� (�´æ�°ã������). Air pressure (full level)
|
|
xyr_Press(0:imax-1, 1:jmax, 0:kmax) : | real(DP), intent(out), optional
: | $ hat{p} $ . æ°��� (���´æ�°ã������). Air pressure (half level)
|
|
xy_SurfHeight(0:imax-1,1:jmax) : | real(DP), intent(in ), optional
: | $ z_s $ . �°è¡¨�¢é�åº�. Surface height.
|
|
xy_SurfTemp(0:imax-1,1:jmax) : | real(DP), intent(in ), optional
: | $ T_s $ . ����è¡��¢æ¸©åº�. Surface temperature.
|
|
xyz_Height(0:imax-1, 1:jmax, 1:kmax) : | real(DP), intent(out), optional
: | é«�åº� (�´æ�°ã������). Height (full level)
|
|
xyr_Height(0:imax-1, 1:jmax, 0:kmax) : | real(DP), intent(out), optional
: | é«�åº� (���´æ�°ã������). Height (half level)
|
|
xyz_Exner(0:imax-1, 1:jmax, 1:kmax) : | real(DP), intent(out), optional
: | Exner �¢æ�� (�´æ�°ã������). Exner function (full level)
|
|
xyr_Exner(0:imax-1, 1:jmax, 0:kmax) : | real(DP), intent(out), optional
: | Exner �¢æ�� (���´æ�°ã������). Exner function (half level)
|
|
æ¸�º¦�����´æ�°Ï������������, æ°��§ã���åº������,
�����¹ã���¼é�¢æ�°ã���ç®���è¡����¾ã��.
Interpolate temperature on half sigma level, and calculate pressure and
height, and calculate exner function.
recursive subroutine AuxVars( xy_Ps, xyz_Temp, xyz_QVap, xyr_Temp, xyz_VirTemp, xyr_VirTemp, xy_SurfVirTemp, xyz_Press, xyr_Press, xy_SurfHeight, xy_SurfTemp, xyz_Height, xyr_Height, xyz_Exner, xyr_Exner )
!
! æ¸�º¦�����´æ�°Ï������������, æ°��§ã���åº������,
! �����¹ã���¼é�¢æ�°ã���ç®���è¡����¾ã��.
!
! Interpolate temperature on half sigma level,
! and calculate pressure and height,
! and calculate exner function.
! �¢ã�¸ã�¥ã�¼ã����� ; USE statements
!
! 座æ����¼ã�¿è¨å®�
! Axes data settings
!
use axesset, only: z_Sigma, r_Sigma, z_DelSigma, r_DelSigma
! $ \Delta \sigma $ (���´æ��).
! $ \Delta \sigma $ (Half)
! ����å®��°è¨å®�
! Physical constants settings
!
use constants, only: Grav, GasRDry, CpDry, EpsV
! $ \epsilon_v $ .
! æ°´è�¸æ���å��閴�.
! Molecular weight of water vapor
! ���»ç���
! Time control
!
use timeset, only: TimesetClockStart, TimesetClockStop
! 宣�� ; Declaration statements
!
implicit none
real(DP), intent(in):: xy_Ps (0:imax-1, 1:jmax)
! $ p_s (t-\Delta t) $ . �°è¡¨�¢æ���. Surface pressure
real(DP), intent(in):: xyz_Temp (0:imax-1, 1:jmax, 1:kmax)
! $ T $ . æ¸�º¦. Temperature
real(DP), intent(in):: xyz_QVap (0:imax-1, 1:jmax, 1:kmax)
! $ q $ . ��. Specific humidity
real(DP), intent(out), optional:: xyr_Temp (0:imax-1, 1:jmax, 0:kmax)
! $ \hat{T} $ . æ¸�º¦ (���´æ�°ã������).
! Temperature (half level)
real(DP), intent(out), optional:: xyz_VirTemp(0:imax-1, 1:jmax, 1:kmax)
! $ \hat{T} $ . ä»�¸©åº�
! Virtual temperature
real(DP), intent(out), optional:: xyr_VirTemp(0:imax-1, 1:jmax, 0:kmax)
! $ \hat{T} $ . ä»�¸©åº� (���´æ�°ã������).
! Virtual temperature (half level)
real(DP), intent(out), optional:: xy_SurfVirTemp(0:imax-1, 1:jmax)
! $ \hat{T} $ . ä»�¸©åº� (����è¡���).
! Virtual temperature (surface)
real(DP), intent(out), optional:: xyz_Press (0:imax-1, 1:jmax, 1:kmax)
! $ p $ . æ°��� (�´æ�°ã������).
! Air pressure (full level)
real(DP), intent(out), optional:: xyr_Press (0:imax-1, 1:jmax, 0:kmax)
! $ \hat{p} $ . æ°��� (���´æ�°ã������).
! Air pressure (half level)
real(DP), intent(in ), optional:: xy_SurfHeight(0:imax-1,1:jmax)
! $ z_s $ . �°è¡¨�¢é�åº�.
! Surface height.
real(DP), intent(in ), optional:: xy_SurfTemp(0:imax-1,1:jmax)
! $ T_s $ . ����è¡��¢æ¸©åº�.
! Surface temperature.
real(DP), intent(out), optional:: xyz_Height (0:imax-1, 1:jmax, 1:kmax)
! é«�åº� (�´æ�°ã������).
! Height (full level)
real(DP), intent(out), optional:: xyr_Height (0:imax-1, 1:jmax, 0:kmax)
! é«�åº� (���´æ�°ã������).
! Height (half level)
real(DP), intent(out), optional:: xyz_Exner (0:imax-1, 1:jmax, 1:kmax)
! Exner �¢æ�� (�´æ�°ã������).
! Exner function (full level)
real(DP), intent(out), optional:: xyr_Exner (0:imax-1, 1:jmax, 0:kmax)
! Exner �¢æ�� (���´æ�°ã������).
! Exner function (half level)
! ä½�æ¥å���
! Work variables
!
real(DP):: xyz_PressWork (0:imax-1, 1:jmax, 1:kmax)
! $ p $ . æ°��� (�´æ�°ã������).
! Air pressure (full level)
real(DP):: xyr_PressWork (0:imax-1, 1:jmax, 0:kmax)
! $ \hat{p} $ . æ°��� (���´æ�°ã������).
! Air pressure (half level)
real(DP):: xyr_TempWork (0:imax-1, 1:jmax, 0:kmax)
! $ \hat{T} $ . æ¸�º¦ (���´æ�°ã������).
! Temperature (half level)
real(DP):: xyz_VirTempWork(0:imax-1, 1:jmax, 1:kmax)
! $ T_v $ . ä»�¸©åº�.
! Virtual temperature
real(DP):: xyr_VirTempWork(0:imax-1, 1:jmax, 0:kmax)
! $ \hat{T}_v $ . ä»�¸©åº� (���´æ�°ã������).
! Virtual temperature (half level)
integer:: k ! ���´æ�¹å�������� DO ���¼ã�����æ¥å���
! Work variables for DO loop in vertical direction
! ���� ; Executable statement
!
! ������確è�
! Initialization check
!
if ( .not. auxiliary_inited ) then
call MessageNotify( 'E', module_name, 'This module has not been initialized.' )
end if
! �����������
! Start measurement of computation time
!
call TimesetClockStart( module_name )
! æ¸�º¦�����
! Interpolate temperature
!
if ( present( xyr_Temp ) ) then
call AuxVarsInternalRoutine( xy_Ps, xyz_Temp, xyr_Temp = xyr_Temp )
end if
! ä»�¸©åº����ç®�
! Calculate virtual temperature
!
if ( present( xy_SurfVirTemp ) ) then
if ( .not. present( xy_SurfTemp ) ) then
call MessageNotify( 'E', module_name, 'xy_SurfTemp has to be given in arguments to calculate xy_SurfVirTemp.' )
end if
xy_SurfVirTemp = xy_SurfTemp * ( 1.0_DP + ((( 1.0_DP / EpsV ) - 1.0_DP ) * xyz_QVap(:,:,1) ) )
end if
! ä»�¸©åº����ç®�
! Calculate virtual temperature
!
if ( present( xyz_VirTemp ) ) then
xyz_VirTemp = xyz_Temp * ( 1.0_DP + ((( 1.0_DP / EpsV ) - 1.0_DP ) * xyz_QVap) )
end if
! ä»�¸©åº������
! Interpolate virtual temperature
!
if ( present( xyr_VirTemp ) ) then
if ( present( xyz_VirTemp ) ) then
xyz_VirTempWork = xyz_VirTemp
else
xyz_VirTempWork = xyz_Temp * ( 1.0_DP + ((( 1.0_DP / EpsV ) - 1.0_DP ) * xyz_QVap) )
end if
call AuxVarsInternalRoutine( xy_Ps, xyz_VirTempWork, xyr_Temp = xyr_VirTemp )
end if
! æ°��§ã���ç®�
! Calculate pressure
!
if ( present( xyz_Press ) ) then
call AuxVarsInternalRoutine( xy_Ps, xyz_Temp, xyz_Press = xyz_Press )
end if
if ( present( xyr_Press ) ) then
call AuxVarsInternalRoutine( xy_Ps, xyz_Temp, xyr_Press = xyr_Press )
end if
! ������
! Calculate height
!
if ( present( xyz_Height ) ) then
if ( .not. present( xy_SurfHeight ) ) then
call MessageNotify( 'E', module_name, 'xy_SurfHeight has to be given in arguments to calculate xyz_Height.' )
end if
!!$ if ( present( xyr_Temp ) ) then
!!$ xyr_TempWork = xyr_Temp
!!$ else
!!$ call AuxVarsInternalRoutine( &
!!$ & xy_Ps, xyz_Temp, & ! (in )
!!$ & xyr_Temp = xyr_TempWork & ! (out) optional
!!$ & )
!!$ end if
if ( present( xyz_VirTemp ) .and. present( xyr_VirTemp ) ) then
xyz_VirTempWork = xyz_VirTemp
xyr_VirTempWork = xyr_VirTemp
else
! è¨�ç®�����è¨�æ¸������æ�
! Pause measurement of computation time
call TimesetClockStop( module_name )
call AuxVars( xy_Ps, xyz_Temp, xyz_QVap, xyz_VirTemp = xyz_VirTempWork, xyr_VirTemp = xyr_VirTempWork )
! �����������
! Start measurement of computation time
call TimesetClockStart( module_name )
end if
!!$ xyz_Height(:,:,1) = &
!!$ & xy_SurfHeight(:,:) &
!!$ & + GasRDry / Grav * xyz_Temp(:,:,1) * ( 1. - z_Sigma(1) )
!!$ do k = 2, kmax
!!$ xyz_Height(:,:,k) = &
!!$ & xyz_Height(:,:,k-1) &
!!$ & + GasRDry / Grav * xyr_TempWork(:,:,k-1) &
!!$ & * r_DelSigma(k-1) / r_Sigma(k-1)
!!$ end do
xyz_Height(:,:,1) = xy_SurfHeight + GasRDry / Grav * xyz_VirTempWork(:,:,1) * ( 1.0_DP - z_Sigma(1) )
do k = 2, kmax
xyz_Height(:,:,k) = xyz_Height(:,:,k-1) + GasRDry / Grav * xyr_VirTempWork(:,:,k-1) * r_DelSigma(k-1) / r_Sigma(k-1)
end do
end if
if ( present( xyr_Height ) ) then
if ( .not. present( xy_SurfHeight ) ) then
call MessageNotify( 'E', module_name, 'xy_SurfHeight has to be given in arguments to calculate xyr_Height.' )
end if
if ( present( xyz_VirTemp ) ) then
xyz_VirTempWork = xyz_VirTemp
else
! è¨�ç®�����è¨�æ¸������æ�
! Pause measurement of computation time
call TimesetClockStop( module_name )
call AuxVars( xy_Ps, xyz_Temp, xyz_QVap, xyz_VirTemp = xyz_VirTempWork )
! �����������
! Start measurement of computation time
call TimesetClockStart( module_name )
end if
xyr_Height(:,:,0) = xy_SurfHeight
do k = 1, kmax
!!$ xyr_Height(:,:,k) = xyr_Height(:,:,k-1) &
!!$ & + GasRDry / Grav * xyz_Temp(:,:,k) &
!!$ & * z_DelSigma(k) / z_Sigma(k)
xyr_Height(:,:,k) = xyr_Height(:,:,k-1) + GasRDry / Grav * xyz_VirTempWork(:,:,k) * z_DelSigma(k) / z_Sigma(k)
end do
end if
! �����¹ã���¼é�¢æ�°ã���ç®�
! Calculate exner function
!
if ( present( xyz_Exner ) ) then
if ( present( xyz_Press ) ) then
xyz_PressWork = xyz_Press
else
call AuxVarsInternalRoutine( xy_Ps, xyz_Temp, xyz_Press = xyz_PressWork )
end if
xyz_Exner = ( xyz_PressWork / RefPress ) ** ( GasRDry / CpDry )
end if
if ( present( xyr_Exner ) ) then
if ( present( xyr_Press ) ) then
xyr_PressWork = xyr_Press
else
call AuxVarsInternalRoutine( xy_Ps, xyz_Temp, xyr_Press = xyr_PressWork )
end if
xyr_Exner = ( xyr_PressWork / RefPress ) ** ( GasRDry / CpDry )
end if
! è¨�ç®�����è¨�æ¸������æ�
! Pause measurement of computation time
!
call TimesetClockStop( module_name )
end subroutine AuxVars