MappedGeometry Derived Type

type, public :: MappedGeometry


Components

Type Visibility Attributes Name Initial
integer, public :: Nx
integer, public :: Ny
integer, public :: Nz
real(kind=RP), public, DIMENSION(:,:,:,:), ALLOCATABLE :: jGradXi
real(kind=RP), public, DIMENSION(:,:,:,:), ALLOCATABLE :: jGradEta
real(kind=RP), public, DIMENSION(:,:,:,:), ALLOCATABLE :: jGradZeta
real(kind=RP), public, DIMENSION(:,:,:,:), ALLOCATABLE :: x
real(kind=RP), public, DIMENSION(:,:,:), ALLOCATABLE :: jacobian
real(kind=RP), public, DIMENSION(:,:,:), ALLOCATABLE :: invJacobian
real(kind=RP), public :: volume
real(kind=RP), public, dimension(:,:,:), allocatable :: dWall
real(kind=RP), public, dimension(:,:,:,:), allocatable :: normal
real(kind=RP), public, dimension(:,:,:,:), allocatable :: ncXi
real(kind=RP), public, dimension(:,:,:,:), allocatable :: ncEta
real(kind=RP), public, dimension(:,:,:,:), allocatable :: ncZeta
real(kind=RP), public, dimension(:,:,:,:), allocatable :: t1cXi
real(kind=RP), public, dimension(:,:,:,:), allocatable :: t1cEta
real(kind=RP), public, dimension(:,:,:,:), allocatable :: t1cZeta
real(kind=RP), public, dimension(:,:,:,:), allocatable :: t2cXi
real(kind=RP), public, dimension(:,:,:,:), allocatable :: t2cEta
real(kind=RP), public, dimension(:,:,:,:), allocatable :: t2cZeta
real(kind=RP), public, dimension(:,:,:), allocatable :: JfcXi
real(kind=RP), public, dimension(:,:,:), allocatable :: JfcEta
real(kind=RP), public, dimension(:,:,:), allocatable :: JfcZeta

Type-Bound Procedures

procedure, public :: construct => ConstructMappedGeometry

  • private subroutine ConstructMappedGeometry(self, spAxi, spAeta, spAzeta, mapper)

    Arguments

    Type IntentOptional Attributes Name
    class(MappedGeometry), intent(inout) :: self
    type(NodalStorage_t), intent(in) :: spAxi
    type(NodalStorage_t), intent(in) :: spAeta
    type(NodalStorage_t), intent(in) :: spAzeta
    type(TransfiniteHexMap), intent(in) :: mapper

procedure, public :: destruct => DestructMappedGeometry

  • private pure subroutine DestructMappedGeometry(self)

    Arguments

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