SurfaceSampling_t Derived Type

type, public :: SurfaceSampling_t


Components

Type Visibility Attributes Name Initial
logical, public :: active = .false.
logical, public :: isDimensionless
integer, public :: ID
integer, public :: nVariables
integer, public :: marker
integer, public :: rank
integer, public :: interval
integer, public :: bufferSize
integer, public :: bufferLine
integer, public :: intervalCount
integer, public, allocatable :: nData(:)
real(kind=RP), public, allocatable :: values(:,:,:)
character(len=STR_LEN_MONITORS), public :: SamplingName
character(len=STR_LEN_MONITORS), public, allocatable :: fileName(:)
character(len=STR_LEN_MONITORS), public, allocatable :: variable(:)

Type-Bound Procedures

procedure, public :: Initialization => SurfaceSampling_Initialization

  • private subroutine SurfaceSampling_Initialization(self, mesh, ID, solution_file, FirstCall)

    !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!! !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!

    Arguments

    Type IntentOptional Attributes Name
    class(SurfaceSampling_t) :: self
    class(HexMesh) :: mesh
    integer :: ID
    character(len=*) :: solution_file
    logical, intent(in) :: FirstCall

procedure, public :: Update => SurfaceSampling_Update

  • private subroutine SurfaceSampling_Update(self, mesh, bufferPosition, t)

    Arguments

    Type IntentOptional Attributes Name
    class(SurfaceSampling_t) :: self
    class(HexMesh) :: mesh
    integer :: bufferPosition
    real(kind=RP) :: t

procedure, public :: WriteToFile => SurfaceSampling_WriteToFile

  • private subroutine SurfaceSampling_WriteToFile(self, no_of_lines)

    Arguments

    Type IntentOptional Attributes Name
    class(SurfaceSampling_t) :: self
    integer :: no_of_lines

procedure, public :: destruct => SurfaceSampling_Destruct

  • private elemental subroutine SurfaceSampling_Destruct(self)

    Arguments

    Type IntentOptional Attributes Name
    class(SurfaceSampling_t), intent(inout) :: self

procedure, public :: copy => SurfaceSampling_Assign

  • private elemental subroutine SurfaceSampling_Assign(to, from)

    Arguments

    Type IntentOptional Attributes Name
    class(SurfaceSampling_t), intent(inout) :: to
    type(SurfaceSampling_t), intent(in) :: from

generic, public :: assignment(=) => copy

  • private elemental subroutine SurfaceSampling_Assign(to, from)

    Arguments

    Type IntentOptional Attributes Name
    class(SurfaceSampling_t), intent(inout) :: to
    type(SurfaceSampling_t), intent(in) :: from

Source Code

   type SurfaceSampling_t
      logical                         :: active=.false.
      logical                         :: isDimensionless
      integer                         :: ID
	  integer						  :: nVariables
      integer                         :: marker
	  integer                         :: rank
	  integer 						  :: interval
	  integer                         :: bufferSize
	  integer  						  :: bufferLine
	  integer						  :: intervalCount
	  integer, allocatable      	  :: nData(:)
      real(kind=RP), allocatable      :: values(:,:,:)
      character(len=STR_LEN_MONITORS) :: SamplingName
      character(len=STR_LEN_MONITORS), allocatable :: fileName(:)
      character(len=STR_LEN_MONITORS), allocatable :: variable(:)
      contains
         procedure   :: Initialization => SurfaceSampling_Initialization
         procedure   :: Update         => SurfaceSampling_Update
         procedure   :: WriteToFile    => SurfaceSampling_WriteToFile
         procedure   :: destruct       => SurfaceSampling_Destruct
         procedure   :: copy           => SurfaceSampling_Assign
         generic     :: assignment(=)  => copy
   end type SurfaceSampling_t