]> AND Public Git Repository - simgrid.git/blobdiff - teshsuite/smpi/mpich3-test/f90/pt2pt/allpairf90.f90
Logo AND Algorithmique Numérique Distribuée

Public GIT Repository
Add -Wextra to CFLAGS too.
[simgrid.git] / teshsuite / smpi / mpich3-test / f90 / pt2pt / allpairf90.f90
index 92251df6b1f2b1637b029a470d687e061724a57a..325378efc91ac8f3d8abfebdf2f12c1297d51e1f 100644 (file)
@@ -1,5 +1,5 @@
 ! This file created from test/mpi/f77/pt2pt/allpairf.f with f77tof90
-! -*- Mode: Fortran; -*- 
+! -*- Mode: Fortran; -*-
 !
 !  (C) 2012 by Argonne National Laboratory.
 !      See COPYRIGHT in top-level directory.
@@ -14,7 +14,7 @@
       logical mtestGetIntraComm
       logical verbose
       common /flags/ verbose
-      
+
       errs = 0
       verbose = .false.
 !      verbose = .true.
 
          call test_pair_send( comm, errs )
          call test_pair_ssend( comm, errs )
-         !call test_pair_rsend( comm, errs )
+         call test_pair_rsend( comm, errs )
          call test_pair_isend( comm, errs )
-         !call test_pair_irsend( comm, errs )
+         call test_pair_irsend( comm, errs )
          call test_pair_issend( comm, errs )
          call test_pair_psend( comm, errs )
-         !call test_pair_prsend( comm, errs )
+         call test_pair_prsend( comm, errs )
          call test_pair_pssend( comm, errs )
          call test_pair_sendrecv( comm, errs )
          call test_pair_sendrecvrepl( comm, errs )
          call mtestFreeComm( comm )
       enddo
-!         
+!
       call MTest_Finalize( errs )
       call MPI_Finalize(ierr)
 !
@@ -74,7 +74,7 @@
          call init_test_data(send_buf,TEST_SIZE)
 !
          call MPI_Send(send_buf, count, MPI_REAL, next, tag, &
-      &        comm, ierr) 
+      &        comm, ierr)
 !
          call MPI_Recv(recv_buf, TEST_SIZE, MPI_REAL, &
       &                 MPI_ANY_SOURCE, MPI_ANY_TAG, comm, status, ierr)
@@ -88,7 +88,7 @@
          call msg_check( recv_buf, prev, tag, count, status, TEST_SIZE, &
       &                   'send and recv', errs )
 !
-         call MPI_Send(recv_buf, count, MPI_REAL, prev, tag, comm, ierr) 
+         call MPI_Send(recv_buf, count, MPI_REAL, prev, tag, comm, ierr)
       end if
 !
       end
       call clear_test_data(recv_buf,TEST_SIZE)
 !
       if (rank .eq. 0) then
-!        
+!
          call init_test_data(send_buf,TEST_SIZE)
 !
          call MPI_Recv( MPI_BOTTOM, 0, MPI_INTEGER, next, tag,  &
       &                  comm, status, ierr )
 !
          call MPI_Rsend(send_buf, count, MPI_REAL, next, tag, &
-      &                  comm, ierr) 
+      &                  comm, ierr)
 !
-         call MPI_Probe(MPI_ANY_SOURCE, tag, comm, status, ierr) 
+         call MPI_Probe(MPI_ANY_SOURCE, tag, comm, status, ierr)
 !
          if (status(MPI_SOURCE) .ne. next) then
             print *, 'Rsend: Incorrect source, expected', next, &
       &                   'rsend and recv', errs )
 !
          call MPI_Send(recv_buf, count, MPI_REAL, prev, tag, &
-      &                  comm, ierr) 
+      &                  comm, ierr)
       end if
 !
       end
          call init_test_data(send_buf,TEST_SIZE)
 !
          call MPI_Iprobe(MPI_ANY_SOURCE, tag, &
-      &                   comm, flag, status, ierr) 
+      &                   comm, flag, status, ierr)
 !
          if (flag) then
             print *, 'Ssend: Iprobe succeeded! source',  &
          end if
 !
          call MPI_Ssend(send_buf, count, MPI_REAL, next, tag, &
-      &                  comm, ierr) 
+      &                  comm, ierr)
 !
          do while (.not. flag)
             call MPI_Iprobe(MPI_ANY_SOURCE, tag, &
-      &                      comm, flag, status, ierr) 
+      &                      comm, flag, status, ierr)
          end do
-!           
+!
          if (status(MPI_SOURCE) .ne. next) then
             print *, 'Ssend: Incorrect source, expected', next, &
       &               ', got', status(MPI_SOURCE)
       &                 status, ierr)
 !
          call msg_check( recv_buf, next, tag, count, status, &
-      &        TEST_SIZE, 'ssend and recv', errs ) 
+      &        TEST_SIZE, 'ssend and recv', errs )
 !
       else if (prev .eq. 0) then
 !
       &                   'ssend and recv', errs )
 !
          call MPI_Ssend(recv_buf, count, MPI_REAL, prev, tag, &
-      &                  comm, ierr) 
+      &                  comm, ierr)
       end if
 !
       end
          call init_test_data(send_buf,TEST_SIZE)
 !
          call MPI_Isend(send_buf, count, MPI_REAL, next, tag, &
-      &                  comm, requests(2), ierr) 
+      &                  comm, requests(2), ierr)
 !
          call MPI_Waitall(2, requests, statuses, ierr)
 !
       &                   'isend and irecv', errs )
 !
          call MPI_Isend(recv_buf, count, MPI_REAL, prev, tag, &
-      &                  comm, requests(1), ierr) 
+      &                  comm, requests(1), ierr)
 !
          call MPI_Wait(requests(1), status, ierr)
 !
       &                      dupcom, status, ierr )
 !
          call MPI_Irsend(send_buf, count, MPI_REAL, next, tag, &
-      &                   comm, requests(2), ierr) 
+      &                   comm, requests(2), ierr)
 !
          index = -1
          do while (index .ne. 1)
       &                   'irsend and irecv', errs )
 !
          call MPI_Irsend(recv_buf, count, MPI_REAL, prev, tag, &
-      &                   comm, requests(1), ierr) 
+      &                   comm, requests(1), ierr)
 !
          call MPI_Waitall(1, requests, statuses, ierr)
 !
          call init_test_data(send_buf,TEST_SIZE)
 !
          call MPI_Issend(send_buf, count, MPI_REAL, next, tag, &
-      &                   comm, requests(2), ierr) 
+      &                   comm, requests(2), ierr)
 !
          flag = .FALSE.
          do while (.not. flag)
       &                   'issend and recv', errs )
 
          call MPI_Issend(recv_buf, count, MPI_REAL, prev, tag, &
-      &                   comm, requests(1), ierr) 
+      &                   comm, requests(1), ierr)
 !
          flag = .FALSE.
          do while (.not. flag)
          call init_test_data(send_buf,TEST_SIZE)
 !
          call MPI_Send_init(send_buf, count, MPI_REAL, next, tag, &
-      &                      comm, requests(1), ierr) 
+      &                      comm, requests(1), ierr)
 !
-         call MPI_Startall(2, requests, ierr) 
+         call MPI_Startall(2, requests, ierr)
          call MPI_Waitall(2, requests, statuses, ierr)
 !
          call msg_check( recv_buf, next, tag, count, statuses(1,2), &
       else if (prev .eq. 0) then
 !
          call MPI_Send_init(send_buf, count, MPI_REAL, prev, tag, &
-      &                      comm, requests(1), ierr) 
-         call MPI_Start(requests(2), ierr) 
+      &                      comm, requests(1), ierr)
+         call MPI_Start(requests(2), ierr)
          call MPI_Wait(requests(2), status, ierr)
 !
          call msg_check( recv_buf, prev, tag, count, status, TEST_SIZE, &
             send_buf(i) = recv_buf(i)
          end do
 !
-         call MPI_Start(requests(1), ierr) 
+         call MPI_Start(requests(1), ierr)
          call MPI_Wait(requests(1), status, ierr)
 !
          call MPI_Request_free(requests(1), ierr)
       if (rank .eq. 0) then
 !
          call MPI_Rsend_init(send_buf, count, MPI_REAL, next, tag, &
-      &                       comm, requests(1), ierr) 
+      &                       comm, requests(1), ierr)
 !
          call init_test_data(send_buf,TEST_SIZE)
 !
       else if (prev .eq. 0) then
 !
          call MPI_Rsend_init(send_buf, count, MPI_REAL, prev, tag, &
-      &                       comm, requests(1), ierr) 
+      &                       comm, requests(1), ierr)
 !
          call MPI_Start(requests(2), ierr)
 !
       if (rank .eq. 0) then
 !
          call MPI_Ssend_init(send_buf, count, MPI_REAL, next, tag, &
-      &                       comm, requests(2), ierr) 
+      &                       comm, requests(2), ierr)
 !
          call init_test_data(send_buf,TEST_SIZE)
 !
       else if (prev .eq. 0) then
 !
          call MPI_Ssend_init(send_buf, count, MPI_REAL, prev, tag, &
-      &                       comm, requests(2), ierr) 
+      &                       comm, requests(2), ierr)
 !
          call MPI_Start(requests(1), ierr)
 !
 
          call MPI_Sendrecv(send_buf, count, MPI_REAL, next, tag, &
       &                     recv_buf, count, MPI_REAL, next, tag, &
-      &                     comm, status, ierr) 
+      &                     comm, status, ierr)
 
          call msg_check( recv_buf, next, tag, count, status, TEST_SIZE, &
       &                   'sendrecv', errs )
       &                   'recv/send', errs )
 
          call MPI_Send(recv_buf, count, MPI_REAL, prev, tag, &
-      &                 comm, ierr) 
+      &                 comm, ierr)
       end if
 !
       end
 !
          call MPI_Sendrecv_replace(recv_buf, count, MPI_REAL, &
       &                             next, tag, next, tag, &
-      &                             comm, status, ierr)  
+      &                             comm, status, ierr)
 
          call msg_check( recv_buf, next, tag, count, status, TEST_SIZE, &
       &                   'sendrecvreplace', errs )
       &                   'recv/send for replace', errs )
 
          call MPI_Send(recv_buf, count, MPI_REAL, prev, tag, &
-      &                 comm, ierr) 
+      &                 comm, ierr)
       end if
 !
       end
          errs       = errs + 1
          foundError = .true.
       end if
-         
+
       call verify_test_data(recv_buf, count, n, name, errs )
 
       end
             print *, 'Nonnull request in ', msg
          endif
  10   continue
-!      
+!
       end
 !------------------------------------------------------------------------------
 !
             errs = errs + 1
          endif
  20   continue
-!      
+!
 100   format('Invalid data', f6.1, ' at ', i4, ' of ', i4, ' in ', a)
 !
       end
 !
-!    This routine is used to prevent the compiler from deallocating the 
-!    array "a", which may happen in some of the tests (see the text in 
-!    the MPI standard about why this may be a problem in valid Fortran 
+!    This routine is used to prevent the compiler from deallocating the
+!    array "a", which may happen in some of the tests (see the text in
+!    the MPI standard about why this may be a problem in valid Fortran
 !    codes).  Without this, for example, tests fail with the Cray ftn
 !    compiler.
 !