Class | surface_data |
In: |
prepare_data/surface_data.f90
|
Note that Japanese and English are described in parallel.
GCM で用いる地表面データを生成します. 現在は暫定的に Hosaka et al. (1998) の SST 分布を与えます.
Surface data for GCM is generated. Now, SST profile in Hosaka et al. (1998) is provided tentatively.
SurfDataGet : | 地表面データの取得 |
———— : | ———— |
SurfDataGet : | Get surface data |
Subroutine : | |||
xy_SurfTemp(0:imax-1, 1:jmax) : | real(DP), intent(out), optional
| ||
xy_SurfAlbedo(0:imax-1, 1:jmax) : | real(DP), intent(out), optional
| ||
xy_SurfHumidCoeff(0:imax-1, 1:jmax) : | real(DP), intent(out), optional
| ||
xy_SurfRoughLength(0:imax-1, 1:jmax) : | real(DP), intent(out), optional
| ||
xy_SurfHeatCapacity(0:imax-1, 1:jmax) : | real(DP), intent(out), optional
| ||
xy_GroundTempFlux(0:imax-1, 1:jmax) : | real(DP), intent(out), optional
| ||
xy_SurfCond(0:imax-1, 1:jmax) : | integer, intent(out), optional
|
GCM 用の地表面データを返します.
Return surface data for GCM.
subroutine SurfDataGet( xy_SurfTemp, xy_SurfAlbedo, xy_SurfHumidCoeff, xy_SurfRoughLength, xy_SurfHeatCapacity, xy_GroundTempFlux, xy_SurfCond ) ! ! GCM 用の地表面データを返します. ! ! Return surface data for GCM. ! ! モジュール引用 ; USE statements ! ! 座標データ設定 ! Axes data settings ! use axesset, only: y_Lat ! $ \varphi $ [rad.] . 緯度. Latitude ! 物理定数設定 ! Physical constants settings ! use constants, only: PI ! $ \pi $ . ! 円周率. Circular constant ! 文字列操作 ! Character handling ! use dc_string, only: LChar ! 宣言文 ; Declaration statements ! implicit none real(DP), intent(out), optional:: xy_SurfTemp (0:imax-1, 1:jmax) ! 地表面温度. ! Surface temperature real(DP), intent(out), optional:: xy_SurfAlbedo (0:imax-1, 1:jmax) ! 地表アルベド. ! Surface albedo real(DP), intent(out), optional:: xy_SurfHumidCoeff (0:imax-1, 1:jmax) ! 地表湿潤度. ! Surface humidity coefficient real(DP), intent(out), optional:: xy_SurfRoughLength (0:imax-1, 1:jmax) ! 地表粗度長. ! Surface rough length real(DP), intent(out), optional:: xy_SurfHeatCapacity (0:imax-1, 1:jmax) ! 地表熱容量. ! Surface heat capacity real(DP), intent(out), optional:: xy_GroundTempFlux (0:imax-1, 1:jmax) ! 地中熱フラックス. ! Ground temperature flux integer, intent(out), optional:: xy_SurfCond (0:imax-1, 1:jmax) ! 地表状態 (0: 固定, 1: 可変) . ! Surface condition (0: fixed, 1: variable) ! 作業変数 (Hosaka et al. (1998)) ! Work variables (Hosaka et al. (1998)) ! real(DP):: TempEq ! 赤道上 (正確には LatCenter 上) での温度. ! Temperature on the equator ! (on LatCenter, to be exact) real(DP):: LatCenter ! 温度最高の緯度. ! Latitude on which temperature is maximum. real(DP):: LatFlatWidth ! 温度が平坦化される緯度幅. ! Latitude width in which temperature is flattened integer:: jp integer:: jm real(DP):: LatA, Alpha, Beta, Gamma real(DP):: Phi1, AlphaBeta4, Phi, LatAPlus, LatAMinus real(DP):: SurfTempMx ! 作業変数 ! Work variables ! !!$ integer:: i ! 経度方向に回る DO ループ用作業変数 !!$ ! Work variables for DO loop in longitude integer:: j ! 緯度方向に回る DO ループ用作業変数 ! Work variables for DO loop in latitude !!$ integer:: k ! 鉛直方向に回る DO ループ用作業変数 !!$ ! Work variables for DO loop in vertical direction ! 実行文 ; Executable statement if ( .not. surface_data_inited ) call SurfDataInit select case ( LChar( trim(Pattern) ) ) ! SST 一様 ! SST is homogeneous ! case ( 'homogeneous' ) if ( present(xy_SurfTemp ) ) xy_SurfTemp = SurfTemp if ( present(xy_SurfAlbedo ) ) xy_SurfAlbedo = Albedo if ( present(xy_SurfHumidCoeff ) ) xy_SurfHumidCoeff = HumidCoeff if ( present(xy_SurfRoughLength ) ) xy_SurfRoughLength = RoughLength if ( present(xy_SurfHeatCapacity) ) xy_SurfHeatCapacity = HeatCapacity if ( present(xy_GroundTempFlux ) ) xy_GroundTempFlux = TempFlux if ( present(xy_SurfCond ) ) xy_SurfCond = SurfCond ! Hosaka et al. (1998) において用いられた SST ! SST used in Hosaka et al. (1998) ! case ( 'hosaka et al. (1998)' ) if ( present(xy_SurfAlbedo ) ) xy_SurfAlbedo = Albedo if ( present(xy_SurfHumidCoeff ) ) xy_SurfHumidCoeff = HumidCoeff if ( present(xy_SurfRoughLength ) ) xy_SurfRoughLength = RoughLength if ( present(xy_SurfHeatCapacity) ) xy_SurfHeatCapacity = HeatCapacity if ( present(xy_GroundTempFlux ) ) xy_GroundTempFlux = TempFlux if ( present(xy_SurfCond ) ) xy_SurfCond = SurfCond if ( present( xy_SurfTemp ) ) then TempEq = SurfTemp LatCenter = 0.0_DP LatFlatWidth = 7.0_DP LatA = 30.0_DP Alpha = 60.0_DP Beta = 32.0_DP Gamma = 0.0_DP Phi1 = abs( LatA * PI / 180.0_DP ) AlphaBeta4 = 2.0_DP *( Phi1**3 ) * ( Beta / Alpha ) do j = 1, jmax Phi = abs( y_Lat(j) - LatCenter * PI / 180.0_DP ) xy_SurfTemp (:,j) = TempEq - Alpha / 2.0_DP * ( Phi - max( sqrt( Phi1**2 + AlphaBeta4 ) - sqrt( ( Phi - Phi1 )**2 + AlphaBeta4 ), 0.0_DP ) ) + Gamma * ( Phi**3 ) end do ! 中心 LatCenter +/- LatFlatWidth の間を平坦に ! Flatten between LatCenter +/- LatFlatWidth ! if ( LatFlatWidth < 0.0_DP ) then LatFlatWidth = - LatFlatWidth end if LatAPlus = ( LatCenter + LatFlatWidth ) * PI / 180.0_DP LatAMinus = ( LatCenter - LatFlatWidth ) * PI / 180.0_DP jp = 1 jm = jmax do j = 1, jmax if ( y_Lat(j) <= LatAPlus ) then jp = j if ( j == jmax ) jp = jp - 1 end if if ( y_Lat(j) < LatAMinus ) then jm = j if ( j == jmax ) jm = jm - 1 end if end do SurfTempMx = ( xy_SurfTemp(1,jm) * ( y_Lat(jm+1) - LatAMinus ) + xy_SurfTemp(1,jm+1) * ( LatAMinus - y_Lat(jm) ) ) / ( y_Lat(jm+1) - y_Lat(jm) ) xy_SurfTemp(:,jm+1:jp) = SurfTempMx end if end select end subroutine SurfDataGet
Variable : | |||
surface_data_inited = .false. : | logical, save, public
|
Subroutine : |
依存モジュールの初期化チェック
Check initialization of dependency modules
subroutine InitCheck ! ! 依存モジュールの初期化チェック ! ! Check initialization of dependency modules ! モジュール引用 ; USE statements ! ! NAMELIST ファイル入力に関するユーティリティ ! Utilities for NAMELIST file input ! use namelist_util, only: namelist_util_inited ! 格子点設定 ! Grid points settings ! use gridset, only: gridset_inited ! 物理定数設定 ! Physical constants settings ! use constants, only: constants_inited ! 座標データ設定 ! Axes data settings ! use axesset, only: axesset_inited ! 実行文 ; Executable statement if ( .not. namelist_util_inited ) call MessageNotify( 'E', module_name, '"namelist_util" module is not initialized.' ) if ( .not. gridset_inited ) call MessageNotify( 'E', module_name, '"gridset" module is not initialized.' ) if ( .not. constants_inited ) call MessageNotify( 'E', module_name, '"constants" module is not initialized.' ) if ( .not. axesset_inited ) call MessageNotify( 'E', module_name, '"axesset" module is not initialized.' ) end subroutine InitCheck
Variable : | |||
Pattern : | character(STRING), save
|
Variable : | |||
SurfCond : | integer, save
|
Subroutine : |
This procedure input/output NAMELIST#surface_data_nml .
subroutine SurfDataInit ! モジュール引用 ; USE statements ! ! NAMELIST ファイル入力に関するユーティリティ ! Utilities for NAMELIST file input ! use namelist_util, only: namelist_filename, NmlutilMsg, NmlutilAryValid ! ファイル入出力補助 ! File I/O support ! use dc_iounit, only: FileOpen ! 文字列操作 ! Character handling ! use dc_string, only: LChar ! 宣言文 ; Declaration statements ! implicit none integer:: unit_nml ! NAMELIST ファイルオープン用装置番号. ! Unit number for NAMELIST file open integer:: iostat_nml ! NAMELIST 読み込み時の IOSTAT. ! IOSTAT of NAMELIST read ! NAMELIST 変数群 ! NAMELIST group name ! namelist /surface_data_nml/ Pattern, SurfTemp, Albedo, HumidCoeff, RoughLength, HeatCapacity, TempFlux, SurfCond ! ! デフォルト値については初期化手続 "surface_data#SurfDataInit" ! のソースコードを参照のこと. ! ! Refer to source codes in the initialization procedure ! "surface_data#SurfDataInit" for the default values. ! ! 実行文 ; Executable statement if ( surface_data_inited ) return call InitCheck ! デフォルト値の設定 (まずは Pattern のみ) ! Default values settings (At first, "Pattern" only) ! Pattern = 'Hosaka et al. (1998)' ! NAMELIST の読み込み (まずは Pattern のみ) ! NAMELIST is input (At first, "Pattern" only) ! if ( trim(namelist_filename) /= '' ) then call FileOpen( unit_nml, namelist_filename, mode = 'r' ) ! (in) rewind( unit_nml ) read( unit_nml, nml = surface_data_nml, iostat = iostat_nml ) ! (out) close( unit_nml ) call NmlutilMsg( iostat_nml, module_name ) ! (in) end if ! デフォルト値の設定 ! Default values settings ! select case ( LChar( trim(Pattern) ) ) case ( 'hosaka et al. (1998)' ) SurfTemp = 302.0_DP Albedo = 0.15_DP HumidCoeff = 1.0_DP RoughLength = 1.0e-4_DP HeatCapacity = 0.0_DP TempFlux = 0.0_DP SurfCond = 0 case ( 'homogeneous' ) SurfTemp = 273.0_DP Albedo = 0.15_DP HumidCoeff = 1.0_DP RoughLength = 1.0e-4_DP HeatCapacity = 0.0_DP TempFlux = 0.0_DP SurfCond = 0 case default call MessageNotify( 'E', module_name, 'Pattern=<%c> is invalid.', c1 = trim(Pattern) ) end select ! NAMELIST の読み込み ! NAMELIST is input ! if ( trim(namelist_filename) /= '' ) then call FileOpen( unit_nml, namelist_filename, mode = 'r' ) ! (in) rewind( unit_nml ) read( unit_nml, nml = surface_data_nml, iostat = iostat_nml ) ! (out) close( unit_nml ) call NmlutilMsg( iostat_nml, module_name ) ! (in) end if ! 印字 ; Print ! call MessageNotify( 'M', module_name, '----- Initialization Messages -----' ) call MessageNotify( 'M', module_name, ' Pattern = %c', c1 = trim(Pattern) ) call MessageNotify( 'M', module_name, ' SurfTemp = %f', d = (/ SurfTemp /) ) call MessageNotify( 'M', module_name, ' Albedo = %f', d = (/ Albedo /) ) call MessageNotify( 'M', module_name, ' HumidCoeff = %f', d = (/ HumidCoeff /) ) call MessageNotify( 'M', module_name, ' RoughLength = %f', d = (/ RoughLength /) ) call MessageNotify( 'M', module_name, ' HeatCapacity = %f', d = (/ HeatCapacity /) ) call MessageNotify( 'M', module_name, ' TempFlux = %f', d = (/ TempFlux /) ) call MessageNotify( 'M', module_name, ' SurfCond = %d', i = (/ SurfCond /) ) call MessageNotify( 'M', module_name, '-- version = %c', c1 = trim(version) ) surface_data_inited = .true. end subroutine SurfDataInit
Constant : | |||
module_name = ‘surface_data‘ : | character(*), parameter
|
Constant : | |||
version = ’$Name: dcpam5-20090218-1 $’ // ’$Id: surface_data.f90,v 1.2 2008-11-07 13:39:11 morikawa Exp $’ : | character(*), parameter
|