FacePatch Derived Type

type, public :: FacePatch


Components

Type Visibility Attributes Name Initial
real(kind=RP), public, DIMENSION(:,:,:), ALLOCATABLE :: points
real(kind=RP), public, DIMENSION(:), ALLOCATABLE :: uKnots
real(kind=RP), public, DIMENSION(:), ALLOCATABLE :: vKnots
real(kind=RP), public, dimension(:), allocatable :: wbu
real(kind=RP), public, dimension(:), allocatable :: wbv
real(kind=RP), public, dimension(:,:), allocatable :: Du
real(kind=RP), public, dimension(:,:), allocatable :: Dv
integer, public, DIMENSION(2) :: noOfKnots

Type-Bound Procedures

procedure, public :: construct => ConstructFacePatch

  • public subroutine ConstructFacePatch(self, uKnots, vKnots, points)

    Arguments

    Type IntentOptional Attributes Name
    class(FacePatch) :: self
    real(kind=RP), DIMENSION(:) :: uKnots
    real(kind=RP), DIMENSION(:) :: vKnots
    real(kind=RP), optional, DIMENSION(:,:,:) :: points

procedure, public :: destruct => DestructFacePatch

  • public elemental subroutine DestructFacePatch(self)

    Arguments

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

procedure, public :: setFacePoints

  • private subroutine setFacePoints(self, points)

    Arguments

    Type IntentOptional Attributes Name
    class(FacePatch) :: self
    real(kind=RP), DIMENSION(:,:,:) :: points