MappedScalar2D Derived Type

type, public, extends(MappedScalar2D_t) :: MappedScalar2D


Contents

Source Code


Components

TypeVisibilityAttributesNameInitial
integer, public :: M
integer, public :: N
real(kind=prec), public, pointer, contiguous, dimension(:,:,:,:):: avgBoundary
character(len=3), public :: backend ="cpu"
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
type(SEMQuad), public, pointer:: geometry=> null()
logical, public :: geometry_associated =.false.
real(kind=prec), public, pointer, contiguous, dimension(:,:,:,:):: interior
type(Lagrange), public, pointer:: interp
type(c_ptr), public :: jas_gpu
type(Metadata), public, allocatable:: meta(:)
integer, public :: nElem
integer, public :: nVar

Type-Bound Procedures

procedure, public :: AssociateGeometry => AssociateGeometry_MappedScalar2D_t

procedure, public :: AverageSides => AverageSides_Scalar2D_t

procedure, public :: BoundaryInterp => BoundaryInterp_Scalar2D_t

procedure, public :: DissociateGeometry => DissociateGeometry_MappedScalar2D_t

procedure, public :: Free => Free_MappedScalar2D

generic, public :: Gradient => Gradient_Scalar2D_t

  • public subroutine Gradient_Scalar2D_t(this, df)

    Arguments

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

generic, public :: GridInterp => GridInterp_Scalar2D_t

  • public subroutine GridInterp_Scalar2D_t(this, f)

    Arguments

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

procedure, public :: Init => Init_MappedScalar2D

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

    Arguments

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

procedure, private :: MPIExchangeAsync => MPIExchangeAsync_MappedScalar2D

procedure, private :: MappedDGGradient_MappedScalar2D

generic, public :: MappedGradient => MappedGradient_MappedScalar2D_t, MappedGradient_MappedScalar2D

  • public subroutine MappedGradient_MappedScalar2D_t(this, df)

    Calculates the gradient of a function using the strong form of the gradient in mapped coordinates.

    Arguments

    TypeIntentOptionalAttributesName
    class(MappedScalar2D_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)
  • public subroutine MappedGradient_MappedScalar2D(this, df)

    Calculates the gradient of a function using the strong form of the gradient in mapped coordinates.

    Arguments

    TypeIntentOptionalAttributesName
    class(MappedScalar2D), intent(inout) :: this
    type(c_ptr), intent(out) :: df

procedure, private :: MappedGradient_MappedScalar2D

  • public subroutine MappedGradient_MappedScalar2D(this, df)

    Calculates the gradient of a function using the strong form of the gradient in mapped coordinates.

    Arguments

    TypeIntentOptionalAttributesName
    class(MappedScalar2D), intent(inout) :: this
    type(c_ptr), intent(out) :: df

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

  • 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

procedure, public :: SetInteriorFromEquation => SetInteriorFromEquation_MappedScalar2D

  • public subroutine SetInteriorFromEquation_MappedScalar2D(this, geometry, time)

    Sets the this % interior attribute using the eqn attribute, geometry (for physical positions), and provided simulation time.

    Arguments

    TypeIntentOptionalAttributesName
    class(MappedScalar2D), intent(inout) :: this
    type(SEMQuad), intent(in) :: geometry
    real(kind=prec), intent(in) :: time

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 :: SideExchange => SideExchange_MappedScalar2D

procedure, public :: UpdateDevice => UpdateDevice_Scalar2D_t

procedure, public :: UpdateHost => UpdateHost_Scalar2D_t

generic, public :: WriteHDF5 => WriteHDF5_MPI_Scalar2D_t, WriteHDF5_Scalar2D_t

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

    Arguments

    TypeIntentOptionalAttributesName
    class(Scalar2D_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_Scalar2D_t(this, fileId, group)

    Arguments

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

Source Code

  type,extends(MappedScalar2D_t),public :: MappedScalar2D

    type(c_ptr) :: jas_gpu ! jacobian weighted scalar for gradient calculation

  contains
    procedure,public :: Init => Init_MappedScalar2D
    procedure,public :: Free => Free_MappedScalar2D

    procedure,public :: SetInteriorFromEquation => SetInteriorFromEquation_MappedScalar2D

    procedure,public :: SideExchange => SideExchange_MappedScalar2D
    procedure,private :: MPIExchangeAsync => MPIExchangeAsync_MappedScalar2D

    generic,public :: MappedGradient => MappedGradient_MappedScalar2D
    procedure,private :: MappedGradient_MappedScalar2D

    generic,public :: MappedDGGradient => MappedDGGradient_MappedScalar2D
    procedure,private :: MappedDGGradient_MappedScalar2D

  endtype MappedScalar2D