Logo AND Algorithmique Numérique Distribuée

Public GIT Repository
Kill trailing whitespaces in teshsuite/smpi/{isp,mpich3-test}.
[simgrid.git] / teshsuite / smpi / mpich3-test / f90 / util / mtestf90.f90
index 56b76b7..8b27f4c 100644 (file)
@@ -1,5 +1,5 @@
 ! This file created from test/mpi/f77/util/mtestf.f with f77tof90
-! -*- Mode: Fortran; -*- 
+! -*- Mode: Fortran; -*-
 !
 !  (C) 2003 by Argonne National Laboratory.
 !      See COPYRIGHT in top-level directory.
         use mpi
         integer errs
         integer rank, toterrs, ierr
-        
+
         call MPI_Comm_rank( MPI_COMM_WORLD, rank, ierr )
 
         call MPI_Allreduce( errs, toterrs, 1, MPI_INTEGER, MPI_SUM,  &
-      &        MPI_COMM_WORLD, ierr ) 
-        
+      &        MPI_COMM_WORLD, ierr )
+
         if (rank .eq. 0) then
-           if (toterrs .gt. 0) then 
+           if (toterrs .gt. 0) then
                 print *, " Found ", toterrs, " errors"
            else
                 print *, " No Errors"
@@ -54,6 +54,9 @@
         save myindex
         data myindex /0/
 
+        if (.false.) then
+           qsmaller = qsmaller
+        endif
         comm = MPI_COMM_NULL
         if (myindex .eq. 0) then
            comm = MPI_COMM_WORLD
         call MPI_Error_class( errcode, errclass, ierr )
         call MPI_Error_string( errcode, string, slen, ierr )
         print *, msg, ": Error class ", errclass, " &
-      &       (", string(1:slen), ")" 
+      &       (", string(1:slen), ")"
         end