dbcsr_make_null_dist Subroutine

private subroutine dbcsr_make_null_dist(distribution, nblkrows, nblkcols, group)

Arguments

Type IntentOptional Attributes Name
type(dbcsr_distribution_obj), intent(out) :: distribution
integer, intent(in) :: nblkrows
integer, intent(in) :: nblkcols
type(mp_comm_type), intent(in), optional :: group

Source Code

   SUBROUTINE dbcsr_make_null_dist(distribution, nblkrows, nblkcols, group)
      TYPE(dbcsr_distribution_obj), INTENT(out)          :: distribution
      INTEGER, INTENT(in)                                :: nblkrows, nblkcols
      TYPE(mp_comm_type), INTENT(in), OPTIONAL           :: group

      INTEGER, DIMENSION(:), POINTER, CONTIGUOUS         :: col_dist, row_dist
      TYPE(dbcsr_mp_obj)                                 :: mp_env

      CALL dbcsr_make_null_mp(mp_env, group=group)
      ALLOCATE (row_dist(nblkrows), col_dist(nblkcols))
      row_dist = 0
      col_dist = 0
      CALL dbcsr_distribution_new(distribution, mp_env, &
                                  row_dist, col_dist, reuse_arrays=.TRUE.)
      CALL dbcsr_mp_release(mp_env)
   END SUBROUTINE dbcsr_make_null_dist