make_distribution.F90 Source File


This file depends on

sourcefile~~make_distribution.f90~~EfferentGraph sourcefile~make_distribution.f90 make_distribution.F90 sourcefile~base.f90 Base.F90 sourcefile~make_distribution.f90->sourcefile~base.f90 sourcefile~coordinateaxis.f90 CoordinateAxis.F90 sourcefile~make_distribution.f90->sourcefile~coordinateaxis.f90 sourcefile~errorhandling.f90 ErrorHandling.F90 sourcefile~make_distribution.f90->sourcefile~errorhandling.f90 sourcefile~geomspec.f90 GeomSpec.F90 sourcefile~make_distribution.f90->sourcefile~geomspec.f90 sourcefile~latlongeomspec.f90 LatLonGeomSpec.F90 sourcefile~make_distribution.f90->sourcefile~latlongeomspec.f90 sourcefile~mapl_range.f90 MAPL_Range.F90 sourcefile~make_distribution.f90->sourcefile~mapl_range.f90 sourcefile~pfio.f90 pFIO.F90 sourcefile~make_distribution.f90->sourcefile~pfio.f90

Source Code

#include "MAPL_ErrLog.h"

submodule (mapl3g_LatLonGeomSpec) make_distribution_smod
   use mapl3g_CoordinateAxis
   use mapl3g_GeomSpec
   use pfio
   use MAPL_RangeMod
   use MAPLBase_Mod
   use mapl_ErrorHandling
   use esmf
   implicit none (type, external)
   
contains

   module function make_distribution(im, nx) result(distribution)
      integer, allocatable :: distribution(:)
      integer, intent(in) :: im, nx

      allocate(distribution(nx))
      call MAPL_DecomposeDim(im, distribution, nx, min_DE_extent=2)

   end function make_distribution

end submodule make_distribution_smod