csr_create_new Subroutine

private subroutine csr_create_new(csr_mat, nrows_total, ncols_total, nze_total, nze_local, nrows_local, mp_group, data_type)

Arguments

Type IntentOptional Attributes Name
type(dbcsr_csr_type), intent(out) :: csr_mat
integer, intent(in) :: nrows_total
integer, intent(in) :: ncols_total
integer(kind=int_8) :: nze_total
integer, intent(in) :: nze_local
integer, intent(in) :: nrows_local
integer, intent(in) :: mp_group
integer, intent(in), optional :: data_type

Source Code

   SUBROUTINE csr_create_new(csr_mat, nrows_total, ncols_total, nze_total, &
                             nze_local, nrows_local, mp_group, data_type)
      TYPE(dbcsr_csr_type), INTENT(OUT)                  :: csr_mat
      INTEGER, INTENT(IN)                                :: nrows_total, ncols_total
      INTEGER(KIND=int_8)                                :: nze_total
      INTEGER, INTENT(IN)                                :: nze_local, nrows_local
      INTEGER, INTENT(IN)                                :: mp_group
      INTEGER, INTENT(IN), OPTIONAL                      :: data_type

      TYPE(mp_comm_type)                                 :: my_mp_group

      CALL my_mp_group%set_handle(mp_group)

      CALL csr_create_new_prv(csr_mat, nrows_total, ncols_total, nze_total, &
                              nze_local, nrows_local, my_mp_group, data_type)

   END SUBROUTINE csr_create_new