UPP  001
 All Data Structures Files Functions Pages
EXCH.f
Go to the documentation of this file.
1 
19  SUBROUTINE exch(A)
20 
21  use ctlblk_mod, only: num_procs, jend, iup, jsta, idn, mpi_comm_comp, im,&
22  jsta_2l, jend_2u
23 !- - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - -
24  implicit none
25 !
26  include 'mpif.h'
27 !
28  real,intent(inout) :: a ( im,jsta_2l:jend_2u )
29  integer status(mpi_status_size)
30  integer ierr, jstam1, jendp1
31 !
32 ! write(0,*) 'mype=',me,'num_procs=',num_procs,'im=',im,'jsta_2l=', &
33 ! jsta_2l,'jend_2u=',jend_2u,'jend=',jend,'iup=',iup,'jsta=', &
34 ! jsta,'idn=',idn
35  if ( num_procs <= 1 ) return
36 !
37  jstam1 = max(jsta_2l,jsta-1) ! Moorthi
38  call mpi_sendrecv(a(1,jend),im,mpi_real,iup,1, &
39  & a(1,jstam1),im,mpi_real,idn,1, &
40  & mpi_comm_comp,status,ierr)
41 ! print *,'mype=',me,'in EXCH, after first mpi_sendrecv'
42  if ( ierr /= 0 ) then
43  print *, ' problem with first sendrecv in exch, ierr = ',ierr
44  stop
45  end if
46  jendp1 = min(jend+1,jend_2u) ! Moorthi
47  call mpi_sendrecv(a(1,jsta),im,mpi_real,idn,1, &
48  & a(1,jendp1),im,mpi_real,iup,1, &
49  & mpi_comm_comp,status,ierr)
50 ! print *,'mype=',me,'in EXCH, after second mpi_sendrecv'
51  if ( ierr /= 0 ) then
52  print *, ' problem with second sendrecv in exch, ierr = ',ierr
53  stop
54  end if
55 !
56  end
57 
58 !!@PROCESS NOCHECK
65  subroutine exch_f(a)
66 
67  use ctlblk_mod, only: num_procs, jend, iup, jsta, idn, &
68  & mpi_comm_comp, im, jsta_2l, jend_2u
69 !- - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - -
70  implicit none
71 !
72  include 'mpif.h'
73 !
74  real,intent(inout) :: a ( im,jsta_2l:jend_2u )
75  integer status(mpi_status_size)
76  integer ierr, jstam1, jendp1
77 !
78  if ( num_procs == 1 ) return
79 !
80  jstam1 = max(jsta_2l,jsta-1) ! Moorthi
81  call mpi_sendrecv(a(1,jend),im,mpi_real,iup,1, &
82  & a(1,jstam1),im,mpi_real,idn,1, &
83  & mpi_comm_comp,status,ierr)
84  if ( ierr /= 0 ) then
85  print *, ' problem with first sendrecv in exch, ierr = ',ierr
86  stop
87  end if
88  jendp1=min(jend+1,jend_2u) ! Moorthi
89  call mpi_sendrecv(a(1,jsta),im,mpi_real,idn,1, &
90  & a(1,jendp1),im,mpi_real,iup,1, &
91  & mpi_comm_comp,status,ierr)
92  if ( ierr /= 0 ) then
93  print *, ' problem with second sendrecv in exch, ierr = ',ierr
94  stop
95  end if
96 !
97  end
98 
subroutine exch_f(a)
Definition: EXCH.f:65