<HTML> <BODY BGCOLOR=#ccccdd LINK=#0000aa VLINK=#0000ff ALINK=#ff0000 ><BASE TARGET="bottom_target"><PRE>
<A NAME='DA_PAR_UTIL1'><A href='../../html_code/par_util/da_par_util1.f90.html#DA_PAR_UTIL1' TARGET='top_target'><IMG SRC="../../gif/bar_purple.gif" border=0></A>

module da_par_util1 32,1

   use da_control, only : rootproc, ierr, comm, root
#ifdef DM_PARALLEL

#if ( DWORDSIZE != RWORDSIZE )
!  use mpi, only : mpi_sum, mpi_integer, mpi_complex, mpi_real
#else
!  use mpi, only : mpi_sum, mpi_integer, mpi_double_complex, mpi_real8
#endif

#endif

   !---------------------------------------------------------------------------
   ! Purpose: Routines for local-to-global and global-to-local grid operations.
   !
   ! METHOD:  RSL/MPI
   !---------------------------------------------------------------------------

   implicit none

#ifdef DM_PARALLEL
   include 'mpif.h'
#if ( DWORDSIZE != RWORDSIZE )
   integer, parameter :: true_mpi_real    = mpi_real
   integer, parameter :: true_mpi_complex = mpi_complex
#else
   integer, parameter :: true_mpi_real    = mpi_real8
   integer, parameter :: true_mpi_complex = mpi_double_complex
#endif
#endif

   contains

#include "da_proc_sum_int.inc"
#include "da_proc_sum_ints.inc"
#include "da_proc_sum_real.inc"

end module da_par_util1