Class intg_surftemp
In: util/intg_surftemp.f90

�°é�¢æ¸©åº�, ��å£�æ¸�º¦������ç©���

Time integration of surface temperature and soil temperature

Note that Japanese and English are described in parallel.

�°é�¢æ¸©åº�����å£�æ¸�º¦������ç©�����è¡����¾ã��.

Time integration of surface temperature and soiltemperature

Procedures List

IntegralSurfTemp :�°é�¢æ¸©åº�, ��å£�æ¸�º¦������ç©���
————— :—————
IntegralSurfTemp :Time integration of surface temperature and soil temperature

Methods

Included Modules

gridset dc_types dc_message timeset namelist_util dc_iounit dc_string

Public Instance methods

Subroutine :
xy_DSurfTempDt(0:imax-1, 1:jmax) :real(DP), intent(in)
: �°è¡¨�¢æ¸©åº������ (K s-1) Surface temperature tendency (K s-1)
xyz_DSoilTempDt(0:imax-1, 1:jmax, 1:kslmax) :real(DP), intent(in)
: $ DP{Tg}{t} $ . ��å£�æ¸�º¦å¤��� (K s-1) Temperature tendency (K s-1)
xy_SurfTemp(0:imax-1, 1:jmax) :real(DP), intent(inout)
: �°è¡¨�¢æ¸©åº�. Surface temperature
xyz_SoilTemp(0:imax-1, 1:jmax, 1:kslmax) :real(DP), intent(inout)
: ��å£�æ¸�º¦ (K) Soil temperature (K)

�°é�¢æ¸©åº�, ��å£�æ¸�º¦������ç©�����è¡����¾ã��.

Time integration of surface temperature and soil temperature

[Source]

  subroutine IntegralSurfTemp( xy_DSurfTempDt, xyz_DSoilTempDt, xy_SurfTemp   , xyz_SoilTemp )
    !
    ! �°é�¢æ¸©åº�, ��å£�æ¸�º¦������ç©�����è¡����¾ã��. 
    !
    ! Time integration of surface temperature and soil temperature
    !
    !

    ! �¢ã�¸ã�¥ã�¼ã����� ; USE statements
    !

    ! ���»ç���
    ! Time control
    !
    use timeset, only: DelTime, TimesetClockStart, TimesetClockStop

    ! 宣�� ; Declaration statements
    !
    implicit none
    real(DP), intent(in):: xy_DSurfTempDt (0:imax-1, 1:jmax)
                              ! �°è¡¨�¢æ¸©åº������ (K s-1)
                              ! Surface temperature tendency (K s-1)
    real(DP), intent(in):: xyz_DSoilTempDt (0:imax-1, 1:jmax, 1:kslmax)
                              ! $ \DP{Tg}{t} $ . ��å£�æ¸�º¦å¤��� (K s-1)
                              ! Temperature tendency (K s-1)
    real(DP), intent(inout):: xy_SurfTemp (0:imax-1, 1:jmax)
                              ! �°è¡¨�¢æ¸©åº�. 
                              ! Surface temperature
    real(DP), intent(inout):: xyz_SoilTemp(0:imax-1, 1:jmax, 1:kslmax)
                              ! ��å£�æ¸�º¦ (K)
                              ! Soil temperature (K)


    ! �業��
    ! Work variables
    !
    integer:: k               ! ���´æ�¹å�������� DO ���¼ã�����業å���
                              ! Work variables for DO loop in vertical direction


    ! ���� ; Executable statement
    !

    ! ������確è�
    ! Initialization check
    !
    if ( .not. intg_surftemp_inited ) then
      call MessageNotify( 'E', module_name, 'This module has not been initialized.' )
    end if


    ! �����������
    ! Start measurement of computation time
    !
    call TimesetClockStart( module_name )

    ! �°è¡¨�¢æ¸©åº�����ç©���
    ! Time integration of surface temperature
    !
    xy_SurfTemp = xy_SurfTemp + xy_DSurfTempDt * DelTime

    ! ��å£�æ¸�º¦����ç©���
    ! Time integration of subsurface temperature
    !
    xyz_SoilTemp = xyz_SoilTemp + xyz_DSoilTempDt * DelTime

    ! ��������������
    ! Pause measurement of computation time
    !
    call TimesetClockStop( module_name )

  end subroutine IntegralSurfTemp
Subroutine :

intg_surftemp �¢ã�¸ã�¥ã�¼ã������������è¡����¾ã��. NAMELIST#intg_surftemp_nml ����¿è¾¼�¿ã��������ç¶����§è�����¾ã��.

"intg_surftemp" module is initialized. "NAMELIST#intg_surftemp_nml" is loaded in this procedure.

[Source]

  subroutine IntgSurfTempInit
    !
    ! intg_surftemp �¢ã�¸ã�¥ã�¼ã������������è¡����¾ã��. 
    ! NAMELIST#intg_surftemp_nml ����¿è¾¼�¿ã��������ç¶����§è�����¾ã��. 
    !
    ! "intg_surftemp" module is initialized. 
    ! "NAMELIST#intg_surftemp_nml" is loaded in this procedure. 
    !

    ! �¢ã�¸ã�¥ã�¼ã����� ; USE statements
    !

    ! NAMELIST ���¡ã�¤ã���¥å�����¢ã�������¼ã���£ã������
    ! Utilities for NAMELIST file input
    !
    use namelist_util, only: namelist_filename, NmlutilMsg

    ! ���¡ã�¤ã���¥å�ºå��è£���
    ! File I/O support
    !
    use dc_iounit, only: FileOpen

    ! ç¨��¥å�������¡ã��
    ! Kind type parameter
    !
    use dc_types, only: STDOUT ! æ¨�æº��ºå�����ç½����. Unit number of standard output

    ! ��������
    ! Character handling
    !
    use dc_string, only: StoA

    ! 宣�� ; 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 /intg_surftemp_nml/
          !
          ! �����������¤ã���¤ã��������������ç¶� "intg_surftemp#IntgSurfTempInit" 
          ! ���½ã�¼ã�¹ã�³ã�¼ã�������§ã������. 
          !
          ! Refer to source codes in the initialization procedure
          ! "intg_surftemp#IntgSurfTempInit" for the default values. 
          !

    ! ���� ; Executable statement
    !

    if ( intg_surftemp_inited ) return


    ! �����������¤ã��¨­å®�
    ! Default values settings
    !

!!$    ! NAMELIST ����¿è¾¼��
!!$    ! NAMELIST is input
!!$    !
!!$    if ( trim(namelist_filename) /= '' ) then
!!$      call FileOpen( unit_nml, &          ! (out)
!!$        & namelist_filename, mode = 'r' ) ! (in)
!!$
!!$      rewind( unit_nml )
!!$      read( unit_nml, &           ! (in)
!!$        & nml = intg_surftemp_nml, &  ! (out)
!!$        & 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, '-- version = %c', c1 = trim(version) )

    intg_surftemp_inited = .true.

  end subroutine IntgSurfTempInit

Private Instance methods

intg_surftemp_inited
Variable :
intg_surftemp_inited = .false. :logical, save
: ����設������. Initialization flag
module_name
Constant :
module_name = ‘intg_surftemp :character(*), parameter
: �¢ã�¸ã�¥ã�¼ã������ç§�. Module name
version
Constant :
version = ’$Name: $’ // ’$Id: intg_surftemp.f90,v 1.10 2011/07/08 03:55:20 yot Exp $’ :character(*), parameter
: �¢ã�¸ã�¥ã�¼ã�������¼ã�¸ã�§ã�� Module version