Logger_ Derived Type

type, public :: Logger_


Components

Type Visibility Attributes Name Initial
type(string_), public, allocatable :: channel_name(:)
type(Real64Ptr_), public, allocatable :: channel_value(:)
integer(kind=int32), public, allocatable :: channel_id(:)
real(kind=real64), public :: position(1:3) = 0.0d0
logical, public, allocatable :: channel_active(:)
logical, public :: initialized = .False.
integer(kind=int32), public :: counter = 0
integer(kind=int32), public :: point_DOF = 0
integer(kind=int32), public :: elementID = 0
real(kind=real64), public, allocatable :: weight(:)
type(Real64Ptr_), public, allocatable :: source_values(:,:)

Type-Bound Procedures

procedure, public :: init => initLogger

  • public subroutine initLogger(this, MAX_CHANNEL_NUM)

    Arguments

    Type IntentOptional Attributes Name
    class(Logger_), intent(inout) :: this
    integer(kind=int32), intent(in), optional :: MAX_CHANNEL_NUM

procedure, public :: numchannel => numchannelLogger

  • public function numchannelLogger(this) result(ret)

    Arguments

    Type IntentOptional Attributes Name
    class(Logger_), intent(inout) :: this

    Return Value integer(kind=int32)

procedure, public, pass :: setLogger_byDomains

  • public subroutine setLogger_byDomains(this, femdomains, position, dataset, dof, name)

    Arguments

    Type IntentOptional Attributes Name
    class(Logger_), intent(inout) :: this
    type(FEMDomain_), intent(inout) :: femdomains(:)
    real(kind=real64), intent(in) :: position(:)
    real(kind=real64), intent(in), target :: dataset(:)
    integer(kind=int32) :: dof
    character(len=*), intent(in) :: name

procedure, public, pass :: setLogger_byDomain

  • public subroutine setLogger_byDomain(this, femdomain, position, dataset, name)

    Arguments

    Type IntentOptional Attributes Name
    class(Logger_), intent(inout) :: this
    type(FEMDomain_), intent(inout) :: femdomain
    real(kind=real64), intent(in) :: position(:)
    real(kind=real64), intent(in), target :: dataset(:)
    character(len=*), intent(in) :: name

procedure, public, pass :: setLogger_byvalue

  • public subroutine setLogger_byvalue(this, channel_name, channel_value, channel_id, position)

    Arguments

    Type IntentOptional Attributes Name
    class(Logger_), intent(inout) :: this
    character(len=*), intent(in) :: channel_name
    real(kind=real64), intent(in), target :: channel_value
    integer(kind=int32), intent(in), optional :: channel_id
    real(kind=real64), intent(in), optional :: position(:)
  • public subroutine setLogger_byvalue(this, channel_name, channel_value, channel_id, position)

    Arguments

    Type IntentOptional Attributes Name
    class(Logger_), intent(inout) :: this
    character(len=*), intent(in) :: channel_name
    real(kind=real64), intent(in), target :: channel_value
    integer(kind=int32), intent(in), optional :: channel_id
    real(kind=real64), intent(in), optional :: position(:)
  • public subroutine setLogger_byDomain(this, femdomain, position, dataset, name)

    Arguments

    Type IntentOptional Attributes Name
    class(Logger_), intent(inout) :: this
    type(FEMDomain_), intent(inout) :: femdomain
    real(kind=real64), intent(in) :: position(:)
    real(kind=real64), intent(in), target :: dataset(:)
    character(len=*), intent(in) :: name
  • public subroutine setLogger_byDomains(this, femdomains, position, dataset, dof, name)

    Arguments

    Type IntentOptional Attributes Name
    class(Logger_), intent(inout) :: this
    type(FEMDomain_), intent(inout) :: femdomains(:)
    real(kind=real64), intent(in) :: position(:)
    real(kind=real64), intent(in), target :: dataset(:)
    integer(kind=int32) :: dof
    character(len=*), intent(in) :: name

procedure, public :: start => startLogger

  • public subroutine startLogger(this)

    Arguments

    Type IntentOptional Attributes Name
    class(Logger_), intent(inout) :: this

procedure, public :: save => saveLogger

  • public subroutine saveLogger(this, t, debug)

    Arguments

    Type IntentOptional Attributes Name
    class(Logger_), intent(inout) :: this
    real(kind=real64), intent(in), optional :: t
    logical, intent(in), optional :: debug

procedure, public :: reset => resetLogger

  • public subroutine resetLogger(this)

    Arguments

    Type IntentOptional Attributes Name
    class(Logger_), intent(inout) :: this

procedure, public :: vtk => vtkLogger

  • public subroutine vtkLogger(this, name)

    Arguments

    Type IntentOptional Attributes Name
    class(Logger_), intent(in) :: this
    character(len=*), intent(in) :: name

procedure, public :: move => moveLogger

  • public subroutine moveLogger(this, x, y, z)

    Arguments

    Type IntentOptional Attributes Name
    class(Logger_), intent(inout) :: this
    real(kind=real64), intent(in), optional :: x
    real(kind=real64), intent(in), optional :: y
    real(kind=real64), intent(in), optional :: z