Vector2D_t Derived Type

type, public, extends(SELF_DataObj) :: Vector2D_t


Inherits

type~~vector2d_t~~InheritsGraph type~vector2d_t Vector2D_t type~self_dataobj SELF_DataObj type~vector2d_t->type~self_dataobj type~lagrange Lagrange type~self_dataobj->type~lagrange interp EquationParser EquationParser type~self_dataobj->EquationParser eqn type~metadata Metadata type~self_dataobj->type~metadata meta type~lagrange_t Lagrange_t type~lagrange->type~lagrange_t c_ptr c_ptr type~lagrange_t->c_ptr blas_handle

Inherited by

type~~vector2d_t~~InheritedByGraph type~vector2d_t Vector2D_t type~vector2d Vector2D type~vector2d->type~vector2d_t type~vector2d~2 Vector2D type~vector2d~2->type~vector2d_t type~semquad SEMQuad type~semquad->type~vector2d x, nHat type~mappedvector2d_t MappedVector2D_t type~mappedvector2d_t->type~vector2d type~mappedvector2d_t->type~semquad geometry type~mappedscalar2d_t MappedScalar2D_t type~mappedscalar2d_t->type~semquad geometry type~dgmodel2d_t DGModel2D_t type~dgmodel2d_t->type~semquad geometry type~mappedvector2d MappedVector2D type~dgmodel2d_t->type~mappedvector2d solutionGradient, flux type~mappedscalar2d MappedScalar2D type~dgmodel2d_t->type~mappedscalar2d solution, source, fluxDivergence, dSdt, workSol type~mappedvector2d~2 MappedVector2D type~mappedvector2d~2->type~mappedvector2d_t type~mappedvector2d->type~mappedvector2d_t type~mappedscalar2d->type~mappedscalar2d_t type~dgmodel2d~2 DGModel2D type~dgmodel2d~2->type~dgmodel2d_t type~mappedscalar2d~2 MappedScalar2D type~mappedscalar2d~2->type~mappedscalar2d_t type~dgmodel2d DGModel2D type~dgmodel2d->type~dgmodel2d_t type~advection_diffusion_2d_t advection_diffusion_2d_t type~advection_diffusion_2d_t->type~dgmodel2d type~linearshallowwater2d_t LinearShallowWater2D_t type~linearshallowwater2d_t->type~dgmodel2d type~nulldgmodel2d_t NullDGModel2D_t type~nulldgmodel2d_t->type~dgmodel2d type~lineareuler2d_t LinearEuler2D_t type~lineareuler2d_t->type~dgmodel2d type~linearshallowwater2d LinearShallowWater2D type~linearshallowwater2d->type~linearshallowwater2d_t type~advection_diffusion_2d~2 advection_diffusion_2d type~advection_diffusion_2d~2->type~advection_diffusion_2d_t type~lineareuler2d LinearEuler2D type~lineareuler2d->type~lineareuler2d_t type~advection_diffusion_2d advection_diffusion_2d type~advection_diffusion_2d->type~advection_diffusion_2d_t type~nulldgmodel2d NullDGModel2D type~nulldgmodel2d->type~nulldgmodel2d_t type~linearshallowwater2d~2 LinearShallowWater2D type~linearshallowwater2d~2->type~linearshallowwater2d_t type~nulldgmodel2d~2 NullDGModel2D type~nulldgmodel2d~2->type~nulldgmodel2d_t type~lineareuler2d~2 LinearEuler2D type~lineareuler2d~2->type~lineareuler2d_t

Contents

Source Code


Components

TypeVisibilityAttributesNameInitial
integer, public :: M
integer, public :: N
real(kind=prec), public, pointer, contiguous, dimension(:,:,:,:,:):: avgBoundary
real(kind=prec), public, pointer, contiguous, dimension(:,:,:,:,:):: boundary
real(kind=prec), public, pointer, contiguous, dimension(:,:,:,:):: boundaryNormal
type(EquationParser), public, allocatable:: eqn(:)
real(kind=prec), public, pointer, contiguous, dimension(:,:,:,:,:):: extBoundary
real(kind=prec), public, pointer, contiguous, dimension(:,:,:,:,:):: interior
type(Lagrange), public, pointer:: interp
type(Metadata), public, allocatable:: meta(:)
integer, public :: nElem
integer, public :: nVar

Type-Bound Procedures

procedure, public :: AverageSides => AverageSides_Vector2D_t

procedure, public :: BoundaryInterp => BoundaryInterp_Vector2D_t

generic, public :: Divergence => Divergence_Vector2D_t

  • public subroutine Divergence_Vector2D_t(this, df)

    Arguments

    TypeIntentOptionalAttributesName
    class(Vector2D_t), intent(in) :: this
    real(kind=prec) :: df(1:this%N+1,1:this%N+1,1:this%nelem,1:this%nvar)

procedure, private :: Divergence_Vector2D_t

  • public subroutine Divergence_Vector2D_t(this, df)

    Arguments

    TypeIntentOptionalAttributesName
    class(Vector2D_t), intent(in) :: this
    real(kind=prec) :: df(1:this%N+1,1:this%N+1,1:this%nelem,1:this%nvar)

procedure, public :: Free => Free_Vector2D_t

  • public subroutine Free_Vector2D_t(this)

    Arguments

    TypeIntentOptionalAttributesName
    class(Vector2D_t), intent(inout) :: this

generic, public :: Gradient => Gradient_Vector2D_t

  • public subroutine Gradient_Vector2D_t(this, df)

    Arguments

    TypeIntentOptionalAttributesName
    class(Vector2D_t), intent(in) :: this
    real(kind=prec), intent(out) :: df(1:this%N+1,1:this%N+1,1:this%nelem,1:this%nvar,1:2,1:2)

procedure, private :: Gradient_Vector2D_t

  • public subroutine Gradient_Vector2D_t(this, df)

    Arguments

    TypeIntentOptionalAttributesName
    class(Vector2D_t), intent(in) :: this
    real(kind=prec), intent(out) :: df(1:this%N+1,1:this%N+1,1:this%nelem,1:this%nvar,1:2,1:2)

generic, public :: GridInterp => GridInterp_Vector2D_t

  • public subroutine GridInterp_Vector2D_t(this, f)

    Arguments

    TypeIntentOptionalAttributesName
    class(Vector2D_t), intent(in) :: this
    real(kind=prec), intent(out) :: f(1:this%M+1,1:this%M+1,1:this%nelem,1:this%nvar,1:2)

procedure, private :: GridInterp_Vector2D_t

  • public subroutine GridInterp_Vector2D_t(this, f)

    Arguments

    TypeIntentOptionalAttributesName
    class(Vector2D_t), intent(in) :: this
    real(kind=prec), intent(out) :: f(1:this%M+1,1:this%M+1,1:this%nelem,1:this%nvar,1:2)

procedure, public :: Init => Init_Vector2D_t

  • public subroutine Init_Vector2D_t(this, interp, nVar, nElem)

    Arguments

    TypeIntentOptionalAttributesName
    class(Vector2D_t), intent(out) :: this
    type(Lagrange), intent(in), target:: interp
    integer, intent(in) :: nVar
    integer, intent(in) :: nElem

procedure, public :: SetDescription => SetDescription_DataObj

  • public subroutine SetDescription_DataObj(this, ivar, description)

    Set the description of the ivar-th variable

    Arguments

    TypeIntentOptionalAttributesName
    class(SELF_DataObj), intent(inout) :: this
    integer, intent(in) :: ivar
    character, intent(in) :: description

generic, public :: SetEquation => SetEquation_DataObj, SetEquation_Vector2D_t

  • public subroutine SetEquation_DataObj(this, ivar, eqnChar)

    Sets the equation parser for the ivar-th variable

    Arguments

    TypeIntentOptionalAttributesName
    class(SELF_DataObj), intent(inout) :: this
    integer, intent(in) :: ivar
    character, intent(in) :: eqnChar
  • public subroutine SetEquation_Vector2D_t(this, idir, ivar, eqnChar)

    Sets the equation parser for the idir direction and ivar-th variable

    Arguments

    TypeIntentOptionalAttributesName
    class(Vector2D_t), intent(inout) :: this
    integer, intent(in) :: idir
    integer, intent(in) :: ivar
    character, intent(in) :: eqnChar

procedure, private :: SetEquation_Vector2D_t

  • public subroutine SetEquation_Vector2D_t(this, idir, ivar, eqnChar)

    Sets the equation parser for the idir direction and ivar-th variable

    Arguments

    TypeIntentOptionalAttributesName
    class(Vector2D_t), intent(inout) :: this
    integer, intent(in) :: idir
    integer, intent(in) :: ivar
    character, intent(in) :: eqnChar

procedure, public :: SetName => SetName_DataObj

  • public subroutine SetName_DataObj(this, ivar, name)

    Set the name of the ivar-th variable

    Arguments

    TypeIntentOptionalAttributesName
    class(SELF_DataObj), intent(inout) :: this
    integer, intent(in) :: ivar
    character, intent(in) :: name

procedure, public :: SetUnits => SetUnits_DataObj

  • public subroutine SetUnits_DataObj(this, ivar, units)

    Set the units of the ivar-th variable

    Arguments

    TypeIntentOptionalAttributesName
    class(SELF_DataObj), intent(inout) :: this
    integer, intent(in) :: ivar
    character, intent(in) :: units

procedure, public :: UpdateDevice => UpdateDevice_Vector2D_t

procedure, public :: UpdateHost => UpdateHost_Vector2D_t

generic, public :: WriteHDF5 => WriteHDF5_MPI_Vector2D_t, WriteHDF5_Vector2D_t

  • public subroutine WriteHDF5_MPI_Vector2D_t(this, fileId, group, elemoffset, nglobalelem)

    Arguments

    TypeIntentOptionalAttributesName
    class(Vector2D_t), intent(in) :: this
    integer(kind=HID_T), intent(in) :: fileId
    character, intent(in) :: group
    integer, intent(in) :: elemoffset
    integer, intent(in) :: nglobalelem
  • public subroutine WriteHDF5_Vector2D_t(this, fileId, group)

    Arguments

    TypeIntentOptionalAttributesName
    class(Vector2D_t), intent(in) :: this
    integer(kind=HID_T), intent(in) :: fileId
    character, intent(in) :: group

procedure, private :: WriteHDF5_MPI_Vector2D_t

  • public subroutine WriteHDF5_MPI_Vector2D_t(this, fileId, group, elemoffset, nglobalelem)

    Arguments

    TypeIntentOptionalAttributesName
    class(Vector2D_t), intent(in) :: this
    integer(kind=HID_T), intent(in) :: fileId
    character, intent(in) :: group
    integer, intent(in) :: elemoffset
    integer, intent(in) :: nglobalelem

procedure, private :: WriteHDF5_Vector2D_t

  • public subroutine WriteHDF5_Vector2D_t(this, fileId, group)

    Arguments

    TypeIntentOptionalAttributesName
    class(Vector2D_t), intent(in) :: this
    integer(kind=HID_T), intent(in) :: fileId
    character, intent(in) :: group

Source Code

  type,extends(SELF_DataObj),public :: Vector2D_t

    real(prec),pointer,contiguous,dimension(:,:,:,:,:) :: interior
    real(prec),pointer,contiguous,dimension(:,:,:,:,:) :: boundary
    real(prec),pointer,contiguous,dimension(:,:,:,:,:) :: extBoundary
    real(prec),pointer,contiguous,dimension(:,:,:,:,:) :: avgBoundary
    real(prec),pointer,contiguous,dimension(:,:,:,:) :: boundaryNormal

  contains

    procedure,public :: Init => Init_Vector2D_t
    procedure,public :: Free => Free_Vector2D_t

    procedure,public :: UpdateHost => UpdateHost_Vector2D_t
    procedure,public :: UpdateDevice => UpdateDevice_Vector2D_t

    procedure,public :: BoundaryInterp => BoundaryInterp_Vector2D_t
    procedure,public :: AverageSides => AverageSides_Vector2D_t

    generic,public :: GridInterp => GridInterp_Vector2D_t
    procedure,private :: GridInterp_Vector2D_t

    generic,public :: Gradient => Gradient_Vector2D_t
    procedure,private :: Gradient_Vector2D_t

    generic,public :: Divergence => Divergence_Vector2D_t
    procedure,private :: Divergence_Vector2D_t

    generic,public :: SetEquation => SetEquation_Vector2D_t
    procedure,private :: SetEquation_Vector2D_t

    generic,public :: WriteHDF5 => WriteHDF5_MPI_Vector2D_t,WriteHDF5_Vector2D_t
    procedure,private :: WriteHDF5_MPI_Vector2D_t
    procedure,private :: WriteHDF5_Vector2D_t

  endtype Vector2D_t