SpatialMeanNode_t Derived Type

type, public :: SpatialMeanNode_t


Components

Type Visibility Attributes Name Initial
integer, public :: ID
integer, public :: nVariables
integer, public :: interval
integer, public :: bufferSize
integer, public :: bufferLine
integer, public :: intervalCount
integer, public :: nActive
integer, public :: dirAxis
integer, public :: nUniqueAll
integer, public :: iVarU
integer, public :: iVarV
integer, public :: iVarW
integer, public, allocatable :: activeLoc(:,:)
integer, public, allocatable :: nMultiply(:)
integer, public, allocatable :: nMultiplyAll(:)
logical, public :: meanData = .false.
real(kind=RP), public :: pmin(3)
real(kind=RP), public :: pmax(3)
real(kind=RP), public :: error = 0.000001
real(kind=RP), public, allocatable :: geom(:)
real(kind=RP), public, allocatable :: meanU(:)
real(kind=RP), public, allocatable :: meanV(:)
real(kind=RP), public, allocatable :: meanW(:)
real(kind=RP), public, allocatable :: values(:,:,:)
character(len=STR_LEN_MONITORS), public, allocatable :: fileName(:)
character(len=STR_LEN_MONITORS), public :: spatialMeanName
character(len=STR_LEN_MONITORS), public, allocatable :: variable(:)

Type-Bound Procedures

procedure, public :: Initialization => SpatialMeanNode_Initialization

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

    Arguments

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

procedure, public :: Update => SpatialMeanNode_Update

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

    Arguments

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

procedure, public :: WriteToFile => SpatialMeanNode_WriteToFile

  • private subroutine SpatialMeanNode_WriteToFile(self, no_of_lines)

    Arguments

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

procedure, public :: LookForUniqueCoordinate => SpatialMeanNode_LookForUniqueCoordinate

  • private subroutine SpatialMeanNode_LookForUniqueCoordinate(self, mesh)

    Arguments

    Type IntentOptional Attributes Name
    class(SpatialMeanNode_t) :: self
    class(HexMesh) :: mesh

procedure, public :: destruct => SpatialMeanNode_Destruct

  • private elemental subroutine SpatialMeanNode_Destruct(self)

    Arguments

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

procedure, public :: copy => SpatialMeanNode_Assign

  • private elemental subroutine SpatialMeanNode_Assign(to, from)

    Arguments

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

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

  • private elemental subroutine SpatialMeanNode_Assign(to, from)

    Arguments

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

Source Code

   type SpatialMeanNode_t
      integer                         :: ID
      integer                         :: nVariables
      integer                         :: interval
      integer                         :: bufferSize
      integer                         :: bufferLine
      integer                         :: intervalCount
      integer                         :: nActive
      integer                         :: dirAxis
      integer                         :: nUniqueAll
      integer                         :: iVarU, iVarV, iVarW
      integer      , allocatable      :: activeLoc(:,:)
      integer      , allocatable      :: nMultiply(:)
      integer      , allocatable      :: nMultiplyAll(:)
      logical                         :: meanData = .false.
      real(kind=RP)                   :: pmin(3), pmax(3)
      real(kind=RP)                   :: error=0.000001 ! tolerance of coordinate
      real(kind=RP), allocatable      :: geom(:)        ! size nUnique
	  real(kind=RP), allocatable      :: meanU(:), meanV(:), meanW(:)
      real(kind=RP), allocatable      :: values(:,:,:)  ! (nUnique, bufferSize, nVariables)
      character(len=STR_LEN_MONITORS),  allocatable :: fileName (:)
      character(len=STR_LEN_MONITORS)               :: spatialMeanName
      character(len=STR_LEN_MONITORS),  allocatable :: variable (:)
      contains
         procedure   :: Initialization          => SpatialMeanNode_Initialization
         procedure   :: Update                  => SpatialMeanNode_Update
         procedure   :: WriteToFile             => SpatialMeanNode_WriteToFile
         procedure   :: LookForUniqueCoordinate => SpatialMeanNode_LookForUniqueCoordinate
         procedure   :: destruct              => SpatialMeanNode_Destruct
         procedure   :: copy                  => SpatialMeanNode_Assign
         generic     :: assignment(=)  => copy
   end type SpatialMeanNode_t