Go to the source code of this file.
|
| subroutine | dmumps_mcast2 (data, ldata, mpitype, root, commw, tag, slavef, keep) |
| subroutine | dmumps_bdc_error (myid, slavef, comm, keep) |
◆ dmumps_bdc_error()
| subroutine dmumps_bdc_error |
( |
integer | myid, |
|
|
integer | slavef, |
|
|
integer | comm, |
|
|
integer, dimension(500), intent(inout) | keep ) |
Definition at line 37 of file dbcast_int.F.
38 INTEGER MYID, SLAVEF, COMM
39 INTEGER, INTENT(INOUT) :: KEEP(500)
40 include 'mpif.h'
41 include 'mumps_tags.h'
42 INTEGER DUMMY (1)
43 dummy(1) = -98765
45 & comm, terreur, slavef, keep )
46 RETURN
subroutine dmumps_mcast2(data, ldata, mpitype, root, commw, tag, slavef, keep)
◆ dmumps_mcast2()
| subroutine dmumps_mcast2 |
( |
integer, dimension(ldata) | data, |
|
|
integer | ldata, |
|
|
integer | mpitype, |
|
|
integer | root, |
|
|
integer | commw, |
|
|
integer | tag, |
|
|
integer | slavef, |
|
|
integer, dimension(500), intent(inout) | keep ) |
Definition at line 14 of file dbcast_int.F.
17 IMPLICIT NONE
18 include 'mpif.h'
19 INTEGER IERR
20 INTEGER LDATA, ROOT, COMMW, TAG, MPITYPE, SLAVEF
21 INTEGER DEST
22 INTEGER, INTENT(INOUT) :: KEEP(500)
23 INTEGER DATA(LDATA)
24 DO 10 dest = 0, slavef - 1
25 IF (dest .NE. root) THEN
26 IF ( ldata .EQ. 1 .and. mpitype .EQ. mpi_integer ) THEN
28 & commw, keep, ierr )
29 ELSE
30 WRITE(*,*) 'Error : bad argument to DMUMPS_MCAST2'
32 END IF
33 ENDIF
34 10 CONTINUE
35 RETURN
subroutine, public dmumps_buf_send_1int(i, dest, tag, comm, keep, ierr)