ELL_dp_type Derived Type

type, public, extends(ELL_type) :: ELL_dp_type


Components

Type Visibility Attributes Name Initial
integer, public :: K = 0

maximum number of nonzeros per row

real(kind=dp), public, allocatable :: data(:,:)
integer(kind=ilp), public, allocatable :: index(:,:)

column indices

integer(kind=ilp), public :: ncols = 0

number of columns

integer(kind=ilp), public :: nnz = 0

number of non-zero values

integer(kind=ilp), public :: nrows = 0

number of rows

integer, public :: storage = sparse_full

assumed storage symmetry


Type-Bound Procedures

generic, public :: add => add_value, add_block

  • private subroutine add_value_ell_dp(self, ik, jk, val)

    Arguments

    Type IntentOptional Attributes Name
    class(ELL_dp_type), intent(inout) :: self
    integer(kind=ilp), intent(in) :: ik
    integer(kind=ilp), intent(in) :: jk
    real(kind=dp), intent(in) :: val
  • private subroutine add_block_ell_dp(self, ik, jk, val)

    Arguments

    Type IntentOptional Attributes Name
    class(ELL_dp_type), intent(inout) :: self
    integer(kind=ilp), intent(in) :: ik(:)
    integer(kind=ilp), intent(in) :: jk(:)
    real(kind=dp), intent(in) :: val(:,:)

procedure, public, non_overridable :: add_block => add_block_ell_dp

  • private subroutine add_block_ell_dp(self, ik, jk, val)

    Arguments

    Type IntentOptional Attributes Name
    class(ELL_dp_type), intent(inout) :: self
    integer(kind=ilp), intent(in) :: ik(:)
    integer(kind=ilp), intent(in) :: jk(:)
    real(kind=dp), intent(in) :: val(:,:)

procedure, public, non_overridable :: add_value => add_value_ell_dp

  • private subroutine add_value_ell_dp(self, ik, jk, val)

    Arguments

    Type IntentOptional Attributes Name
    class(ELL_dp_type), intent(inout) :: self
    integer(kind=ilp), intent(in) :: ik
    integer(kind=ilp), intent(in) :: jk
    real(kind=dp), intent(in) :: val

procedure, public, non_overridable :: at => at_value_ell_dp

  • private pure function at_value_ell_dp(self, ik, jk) result(val)

    Arguments

    Type IntentOptional Attributes Name
    class(ELL_dp_type), intent(in) :: self
    integer(kind=ilp), intent(in) :: ik
    integer(kind=ilp), intent(in) :: jk

    Return Value real(kind=dp)

procedure, public :: malloc => malloc_ell

  • private subroutine malloc_ell(self, num_rows, num_cols, num_nz_rows)

    Arguments

    Type IntentOptional Attributes Name
    class(ELL_type) :: self
    integer(kind=ilp), intent(in) :: num_rows

    number of rows

    integer(kind=ilp), intent(in) :: num_cols

    number of columns

    integer(kind=ilp), intent(in) :: num_nz_rows

    number of non zeros per row