FE-Project
Loading...
Searching...
No Matches
scale_mesh_cubedspheredom3d::meshcubedspheredom3d Type Reference
Inheritance diagram for scale_mesh_cubedspheredom3d::meshcubedspheredom3d:
scale_mesh_base3d::meshbase3d scale_mesh_base::meshbase

Public Member Functions

procedure init (this, negx, negy, negz, rplanet, dom_zmin, dom_zmax, refelem, nlocalmeshperprc, nproc, myrank, fz, shallow_approx)
procedure final (this)
procedure generate (this)
procedure assigndomid (this, nprcx_lc, nprcy_lc, nprcz_lc, tileid_table, panelid_table, pi_table, pj_table, pk_table)
procedure getmesh2d (this, ptr_mesh2d)
procedure set_geometric_with_vcoord (this, lcdomid, gsqrtv_lc, zlev_lc, g13_lc, g23_lc)
Public Member Functions inherited from scale_mesh_base3d::meshbase3d
procedure(meshbase3d_generate), deferred generate meshbase3d_generate
procedure(meshbase3d_getmesh2d), deferred getmesh2d meshbase3d_getmesh2d
procedure(meshbase3d_set_geometric_with_vcoord), deferred set_geometric_with_vcoord meshbase3d_set_geometric_with_vcoord
procedure getlocalmesh (this, id, ptr_lcmesh)
Public Member Functions inherited from scale_mesh_base::meshbase
procedure(meshbase_get_localmesh), deferred getlocalmesh meshbase_get_localmesh
procedure setdiminfo (this, dimid, name, unit, desc, positive_down)

Public Attributes

integer negx
integer negy
integer negz
real(rp), public xmin_gl
real(rp), public xmax_gl
real(rp), public ymin_gl
real(rp), public ymax_gl
real(rp), public zmin_gl
real(rp), public zmax_gl
real(rp), dimension(:), allocatable fz
integer, dimension(:,:,:,:), allocatable rcdomijkp2lcmeshid
real(rp) rplanet
type(meshcubedspheredom2dmesh2d
type(quadrilateralelementrefelem2d
logical shallow_approx
Public Attributes inherited from scale_mesh_base3d::meshbase3d
type(localmesh3d), dimension(:), allocatable lcmesh_list
type(elementbase3d), pointer refelem3d
Public Attributes inherited from scale_mesh_base::meshbase
integer local_mesh_num
integer prc_num
integer local_mesh_num_global
integer, dimension(:,:), allocatable tileid_globalmap
integer, dimension(:,:), allocatable tilefaceid_globalmap
integer, dimension(:,:), allocatable tilepanelid_globalmap
integer, dimension(:), allocatable tileid_global2localmap
integer, dimension(:), allocatable prcrank_globalmap
class(elementbase), pointer refelem
type(meshdiminfo), dimension(:), allocatable diminfo
real(rp) dom_vol
logical isgenerated

Detailed Description

Definition at line 46 of file scale_mesh_cubedspheredom3d.F90.

Member Function/Subroutine Documentation

◆ init()

procedure scale_mesh_cubedspheredom3d::meshcubedspheredom3d::init ( class(meshcubedspheredom3d), intent(inout) this,
integer, intent(in) negx,
integer, intent(in) negy,
integer, intent(in) negz,
real(rp), intent(in) rplanet,
real(rp), intent(in) dom_zmin,
real(rp), intent(in) dom_zmax,
type(hexahedralelement), intent(in), target refelem,
integer, intent(in) nlocalmeshperprc,
integer, intent(in), optional nproc,
integer, intent(in), optional myrank,
real(rp), dimension(negz+1), intent(in), optional fz,
logical, intent(in), optional shallow_approx )

Definition at line 66 of file scale_mesh_cubedspheredom3d.F90.

◆ final()

procedure scale_mesh_cubedspheredom3d::meshcubedspheredom3d::final ( class(meshcubedspheredom3d), intent(inout) this)

Definition at line 67 of file scale_mesh_cubedspheredom3d.F90.

◆ generate()

procedure scale_mesh_cubedspheredom3d::meshcubedspheredom3d::generate ( class(meshcubedspheredom3d), intent(inout), target this)

Definition at line 68 of file scale_mesh_cubedspheredom3d.F90.

◆ assigndomid()

procedure scale_mesh_cubedspheredom3d::meshcubedspheredom3d::assigndomid ( class(meshcubedspheredom3d), intent(inout), target this,
integer, intent(in) nprcx_lc,
integer, intent(in) nprcy_lc,
integer, intent(in) nprcz_lc,
integer, dimension(this%local_mesh_num, this%prc_num), intent(out) tileid_table,
integer, dimension(this%local_mesh_num*this%prc_num), intent(out) panelid_table,
integer, dimension(this%local_mesh_num*this%prc_num), intent(out) pi_table,
integer, dimension(this%local_mesh_num*this%prc_num), intent(out) pj_table,
integer, dimension(this%local_mesh_num*this%prc_num), intent(out) pk_table )

Definition at line 69 of file scale_mesh_cubedspheredom3d.F90.

◆ getmesh2d()

procedure scale_mesh_cubedspheredom3d::meshcubedspheredom3d::getmesh2d ( class(meshcubedspheredom3d), intent(in), target this,
class(meshbase2d), intent(out), pointer ptr_mesh2d )

Definition at line 70 of file scale_mesh_cubedspheredom3d.F90.

◆ set_geometric_with_vcoord()

procedure scale_mesh_cubedspheredom3d::meshcubedspheredom3d::set_geometric_with_vcoord ( class(meshcubedspheredom3d), intent(inout), target this,
integer, intent(in) lcdomid,
real(rp), dimension(this%refelem3d%np,this%lcmesh_list(lcdomid)%nea), intent(in) gsqrtv_lc,
real(rp), dimension(this%refelem3d%np,this%lcmesh_list(lcdomid)%nea), intent(in) zlev_lc,
real(rp), dimension(this%refelem3d%np,this%lcmesh_list(lcdomid)%nea), intent(in) g13_lc,
real(rp), dimension(this%refelem3d%np,this%lcmesh_list(lcdomid)%nea), intent(in) g23_lc )

Definition at line 71 of file scale_mesh_cubedspheredom3d.F90.

Member Data Documentation

◆ negx

integer scale_mesh_cubedspheredom3d::meshcubedspheredom3d::negx

Definition at line 47 of file scale_mesh_cubedspheredom3d.F90.

47 integer :: NeGX

◆ negy

integer scale_mesh_cubedspheredom3d::meshcubedspheredom3d::negy

Definition at line 48 of file scale_mesh_cubedspheredom3d.F90.

48 integer :: NeGY

◆ negz

integer scale_mesh_cubedspheredom3d::meshcubedspheredom3d::negz

Definition at line 49 of file scale_mesh_cubedspheredom3d.F90.

49 integer :: NeGZ

◆ xmin_gl

real(rp), public scale_mesh_cubedspheredom3d::meshcubedspheredom3d::xmin_gl

Definition at line 51 of file scale_mesh_cubedspheredom3d.F90.

51 real(RP), public :: xmin_gl, xmax_gl

◆ xmax_gl

real(rp), public scale_mesh_cubedspheredom3d::meshcubedspheredom3d::xmax_gl

Definition at line 51 of file scale_mesh_cubedspheredom3d.F90.

◆ ymin_gl

real(rp), public scale_mesh_cubedspheredom3d::meshcubedspheredom3d::ymin_gl

Definition at line 52 of file scale_mesh_cubedspheredom3d.F90.

52 real(RP), public :: ymin_gl, ymax_gl

◆ ymax_gl

real(rp), public scale_mesh_cubedspheredom3d::meshcubedspheredom3d::ymax_gl

Definition at line 52 of file scale_mesh_cubedspheredom3d.F90.

◆ zmin_gl

real(rp), public scale_mesh_cubedspheredom3d::meshcubedspheredom3d::zmin_gl

Definition at line 53 of file scale_mesh_cubedspheredom3d.F90.

53 real(RP), public :: zmin_gl, zmax_gl

◆ zmax_gl

real(rp), public scale_mesh_cubedspheredom3d::meshcubedspheredom3d::zmax_gl

Definition at line 53 of file scale_mesh_cubedspheredom3d.F90.

◆ fz

real(rp), dimension(:), allocatable scale_mesh_cubedspheredom3d::meshcubedspheredom3d::fz

Definition at line 55 of file scale_mesh_cubedspheredom3d.F90.

55 real(RP), allocatable :: FZ(:)

◆ rcdomijkp2lcmeshid

integer, dimension(:,:,:,:), allocatable scale_mesh_cubedspheredom3d::meshcubedspheredom3d::rcdomijkp2lcmeshid

Definition at line 57 of file scale_mesh_cubedspheredom3d.F90.

57 integer, allocatable :: rcdomIJKP2LCMeshID(:,:,:,:)

◆ rplanet

real(rp) scale_mesh_cubedspheredom3d::meshcubedspheredom3d::rplanet

Definition at line 59 of file scale_mesh_cubedspheredom3d.F90.

59 real(RP) :: RPlanet

◆ mesh2d

type(meshcubedspheredom2d) scale_mesh_cubedspheredom3d::meshcubedspheredom3d::mesh2d

Definition at line 61 of file scale_mesh_cubedspheredom3d.F90.

61 type(MeshCubedSphereDom2D) :: mesh2D

◆ refelem2d

type(quadrilateralelement) scale_mesh_cubedspheredom3d::meshcubedspheredom3d::refelem2d

Definition at line 62 of file scale_mesh_cubedspheredom3d.F90.

62 type(QuadrilateralElement) :: refElem2D

◆ shallow_approx

logical scale_mesh_cubedspheredom3d::meshcubedspheredom3d::shallow_approx

Definition at line 64 of file scale_mesh_cubedspheredom3d.F90.

64 logical :: shallow_approx

The documentation for this type was generated from the following file: