UPP  001
 All Data Structures Files Functions Pages
EXCH2.f
1 !!@PROCESS NOCHECK
2 !
3 !--- The 1st line is an inlined compiler directive that turns off -qcheck
4 ! during compilation, even if it's specified as a compiler option in the
5 ! makefile (Tuccillo, personal communication; Ferrier, Feb '02).
6 !
7  SUBROUTINE exch2(A)
8 !$$$ SUBPROGRAM DOCUMENTATION BLOCK
9 ! . . .
10 ! SUBPROGRAM: EXCH EXCHANGE ONE HALO ROW
11 ! PRGRMMR: TUCCILLO ORG: IBM
12 !
13 ! ABSTRACT:
14 ! EXCHANGE ONE HALO ROW
15 ! .
16 !
17 ! PROGRAM HISTORY LOG:
18 ! 00-01-06 TUCCILLO - ORIGINAL
19 !
20 ! USAGE: CALL EXCH(A)
21 ! INPUT ARGUMENT LIST:
22 ! A - ARRAY TO HAVE HALOS EXCHANGED
23 !
24 ! OUTPUT ARGUMENT LIST:
25 ! A - ARRAY WITH HALOS EXCHANGED
26 !
27 ! OUTPUT FILES:
28 ! STDOUT - RUN TIME STANDARD OUT.
29 !
30 ! SUBPROGRAMS CALLED:
31 ! MPI_SENDRECV
32 ! UTILITIES:
33 ! NONE
34 ! LIBRARY:
35 ! COMMON - CTLBLK.comm
36 !
37 ! ATTRIBUTES:
38 ! LANGUAGE: FORTRAN
39 ! MACHINE : IBM RS/6000 SP
40 !$$$
41  use ctlblk_mod, only: num_procs, jend, iup, jsta, idn, mpi_comm_comp, im,&
42  jsta_2l, jend_2u
43 !- - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - -
44  implicit none
45 !
46  include 'mpif.h'
47 !
48  real,intent(inout) :: a ( im,jsta_2l:jend_2u )
49  integer status(mpi_status_size)
50  integer ierr, jstam2, jendp1
51 !
52  if ( num_procs <= 1 ) return
53 !
54  jstam2 = max(jsta_2l,jsta-2)
55  call mpi_sendrecv(a(1,jend-1),2*im,mpi_real,iup,1, &
56  & a(1,jstam2),2*im,mpi_real,idn,1, &
57  & mpi_comm_comp,status,ierr)
58  if ( ierr /= 0 ) then
59  print *, ' problem with first sendrecv in exch2, ierr = ',ierr
60  stop
61  end if
62  jendp1 = min(jend+1,jend_2u)
63  call mpi_sendrecv(a(1,jsta),2*im,mpi_real,idn,1, &
64  & a(1,jendp1),2*im,mpi_real,iup,1, &
65  & mpi_comm_comp,status,ierr)
66  if ( ierr /= 0 ) then
67  print *, ' problem with second sendrecv in exch2, ierr = ',ierr
68  stop
69  end if
70 !
71  end
72