Blame test/mpi/f90/spawn/spawnmult2f90.f90

Packit 0848f5
! This file created from test/mpi/f77/spawn/spawnmult2f.f with f77tof90
Packit 0848f5
! -*- Mode: Fortran; -*- 
Packit 0848f5
!
Packit 0848f5
!  (C) 2003 by Argonne National Laboratory.
Packit 0848f5
!      See COPYRIGHT in top-level directory.
Packit 0848f5
!
Packit 0848f5
! This tests spawn_mult by using the same executable and no command-line
Packit 0848f5
! options.  The attribute MPI_APPNUM is used to determine which
Packit 0848f5
! executable is running.
Packit 0848f5
!
Packit 0848f5
       program main
Packit 0848f5
       use mpi
Packit 0848f5
       integer (kind=MPI_ADDRESS_KIND) aint
Packit 0848f5
Packit 0848f5
       integer errs, err
Packit 0848f5
       integer rank, size, rsize, wsize, i
Packit 0848f5
       integer np(2)
Packit 0848f5
       integer infos(2)
Packit 0848f5
       integer errcodes(2)
Packit 0848f5
       integer parentcomm, intercomm
Packit 0848f5
       integer status(MPI_STATUS_SIZE)
Packit 0848f5
       character*(30) cmds(2)
Packit 0848f5
       integer appnum
Packit 0848f5
       logical flag
Packit 0848f5
       integer ierr
Packit 0848f5
       integer can_spawn
Packit 0848f5
Packit 0848f5
       errs = 0
Packit 0848f5
Packit 0848f5
       call MTest_Init( ierr )
Packit 0848f5
Packit 0848f5
       call MTestSpawnPossible( can_spawn, errs )
Packit 0848f5
        if ( can_spawn .eq. 0 ) then
Packit 0848f5
            call MTest_Finalize( errs )
Packit 0848f5
            goto 300
Packit 0848f5
        endif
Packit 0848f5
Packit 0848f5
       call MPI_Comm_get_parent( parentcomm, ierr )
Packit 0848f5
Packit 0848f5
       if (parentcomm .eq. MPI_COMM_NULL) then
Packit 0848f5
!       Create 2 more processes 
Packit 0848f5
           cmds(1) = "./spawnmult2f90"
Packit 0848f5
           cmds(2) = "./spawnmult2f90"
Packit 0848f5
           np(1)   = 1
Packit 0848f5
           np(2)   = 1
Packit 0848f5
           infos(1)= MPI_INFO_NULL
Packit 0848f5
           infos(2)= MPI_INFO_NULL
Packit 0848f5
           call MPI_Comm_spawn_multiple( 2, cmds, MPI_ARGVS_NULL,            &
Packit 0848f5
      &             np, infos, 0,                                             &
Packit 0848f5
      &             MPI_COMM_WORLD, intercomm, errcodes, ierr )  
Packit 0848f5
        else 
Packit 0848f5
           intercomm = parentcomm
Packit 0848f5
        endif
Packit 0848f5
Packit 0848f5
!       We now have a valid intercomm
Packit 0848f5
Packit 0848f5
        call MPI_Comm_remote_size( intercomm, rsize, ierr )
Packit 0848f5
        call MPI_Comm_size( intercomm, size, ierr )
Packit 0848f5
        call MPI_Comm_rank( intercomm, rank, ierr )
Packit 0848f5
Packit 0848f5
        if (parentcomm .eq. MPI_COMM_NULL) then
Packit 0848f5
!           Master 
Packit 0848f5
            if (rsize .ne. np(1) + np(2)) then
Packit 0848f5
                errs = errs + 1
Packit 0848f5
                print *, "Did not create ", np(1)+np(2),                    &
Packit 0848f5
      &          " processes (got ", rsize, ")" 
Packit 0848f5
            endif
Packit 0848f5
! Allow a multi-process parent
Packit 0848f5
            if (rank .eq. 0) then
Packit 0848f5
               do i=0, rsize-1
Packit 0848f5
                  call MPI_Send( i, 1, MPI_INTEGER, i, 0, intercomm,        &
Packit 0848f5
      &                 ierr ) 
Packit 0848f5
               enddo
Packit 0848f5
!       We could use intercomm reduce to get the errors from the 
Packit 0848f5
!       children, but we'll use a simpler loop to make sure that
Packit 0848f5
!       we get valid data 
Packit 0848f5
              do i=0, rsize-1
Packit 0848f5
                 call MPI_Recv( err, 1, MPI_INTEGER, i, 1, intercomm,       &
Packit 0848f5
      &                       MPI_STATUS_IGNORE, ierr )
Packit 0848f5
                 errs = errs + err
Packit 0848f5
              enddo
Packit 0848f5
            endif
Packit 0848f5
         else 
Packit 0848f5
!       Child 
Packit 0848f5
!       FIXME: This assumes that stdout is handled for the children
Packit 0848f5
!       (the error count will still be reported to the parent)
Packit 0848f5
           if (size .ne. 2) then
Packit 0848f5
              errs = errs + 1
Packit 0848f5
              print *, "(Child) Did not create ", 2,                        &
Packit 0848f5
      &             " processes (got ",size, ")"
Packit 0848f5
              call mpi_comm_size( MPI_COMM_WORLD, wsize, ierr )
Packit 0848f5
              if (wsize .eq. 2) then 
Packit 0848f5
                 errs = errs + 1
Packit 0848f5
                 print *, "(Child) world size is 2 but ",                   &
Packit 0848f5
      &          " local intercomm size is not 2"
Packit 0848f5
              endif
Packit 0848f5
           endif
Packit 0848f5
           
Packit 0848f5
         call MPI_Recv( i, 1, MPI_INTEGER, 0, 0, intercomm, status, ierr    &
Packit 0848f5
      &     )
Packit 0848f5
         if (i .ne. rank) then
Packit 0848f5
            errs = errs + 1
Packit 0848f5
            print *, "Unexpected rank on child ", rank, "(",i,")"
Packit 0848f5
         endif
Packit 0848f5
!
Packit 0848f5
!       Check for correct APPNUM
Packit 0848f5
         call mpi_comm_get_attr( MPI_COMM_WORLD, MPI_APPNUM, aint,         &
Packit 0848f5
      &        flag, ierr )
Packit 0848f5
!        My appnum should be my rank in comm world
Packit 0848f5
         if (flag) then
Packit 0848f5
            appnum = aint
Packit 0848f5
            if (appnum .ne. rank) then
Packit 0848f5
                errs = errs + 1
Packit 0848f5
                print *, "appnum is ", appnum, " but should be ", rank
Packit 0848f5
             endif     
Packit 0848f5
         else
Packit 0848f5
             errs = errs + 1
Packit 0848f5
             print *, "appnum was not set"
Packit 0848f5
         endif
Packit 0848f5
Packit 0848f5
!       Send the errs back to the master process 
Packit 0848f5
        call MPI_Ssend( errs, 1, MPI_INTEGER, 0, 1, intercomm, ierr )
Packit 0848f5
        endif
Packit 0848f5
Packit 0848f5
!       It isn't necessary to free the intercomm, but it should not hurt
Packit 0848f5
        call MPI_Comm_free( intercomm, ierr )
Packit 0848f5
Packit 0848f5
!       Note that the MTest_Finalize get errs only over COMM_WORLD 
Packit 0848f5
        if (parentcomm .eq. MPI_COMM_NULL) then
Packit 0848f5
            call MTest_Finalize( errs )
Packit 0848f5
        endif
Packit 0848f5
Packit 0848f5
 300    continue
Packit 0848f5
        call MPI_Finalize( ierr )
Packit 0848f5
        end