! -*-f90-*- !*********************************************************************** !* GNU Lesser General Public License !* !* This file is part of the GFDL Flexible Modeling System (FMS). !* !* FMS is free software: you can redistribute it and/or modify it under !* the terms of the GNU Lesser General Public License as published by !* the Free Software Foundation, either version 3 of the License, or (at !* your option) any later version. !* !* FMS is distributed in the hope that it will be useful, but WITHOUT !* ANY WARRANTY; without even the implied warranty of MERCHANTABILITY or !* FITNESS FOR A PARTICULAR PURPOSE. See the GNU General Public License !* for more details. !* !* You should have received a copy of the GNU Lesser General Public !* License along with FMS. If not, see . !*********************************************************************** !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!! ! ! ! ROUTINES TO INITIALIZE/FINALIZE MPP MODULE: mpp_init, mpp_exit ! ! ! !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!! ! subroutine mpp_init( flags, in, out, err, log ) ! integer, optional, intent(in) :: flags, in, out, err, log subroutine mpp_init( flags,localcomm ) integer, optional, intent(in) :: flags integer, optional, intent(in) :: localcomm ! dummy here, used only in MPI integer :: num_pes, len integer :: i, logunit logical :: opened, existed integer :: unit_begin, unit_end, unit_nml, io_status #ifdef _CRAYT3E intrinsic my_pe #else integer :: my_pe #endif if( module_is_initialized )return call START_PES(0) !the argument 0 means extract from environment variable NPES on PVP/SGI, from mpprun -n on t3e pe = my_pe() npes = num_pes() module_is_initialized = .TRUE. !PEsets: make defaults illegal allocate(peset(0:current_peset_max)) peset(:)%count = -1 peset(:)%id = -1 peset(:)%group = -1 peset(:)%start = -1 peset(:)%log2stride = -1 peset(:)%name = " " !0=single-PE, initialized so that count returns 1 peset(0)%count = 1 allocate( peset(0)%list(1) ) peset(0)%list = pe world_peset_num = get_peset( (/(i,i=0,npes-1)/) ) current_peset_num = world_peset_num !initialize current PEset to world !initialize clocks call SYSTEM_CLOCK( count=tick0, count_rate=ticks_per_sec, count_max=max_ticks ) tick_rate = 1./ticks_per_sec clock0 = mpp_clock_id( 'Total runtime', flags=MPP_CLOCK_SYNC ) ! Initialize mpp_datatypes ! NOTE: mpp_datatypes are not implemented in SHMEM; this is an empty list datatypes%head => null() datatypes%tail => null() datatypes%length = 0 ! Create the bytestream (default) mpp_datatype ! NOTE: mpp_byte is unused in SHMEM mpp_byte%counter = -1 mpp_byte%ndims = -1 allocate(mpp_byte%sizes(0)) allocate(mpp_byte%subsizes(0)) allocate(mpp_byte%starts(0)) mpp_byte%etype = -1 mpp_byte%id = -1 mpp_byte%prev => null() mpp_byte%next => null() if( PRESENT(flags) )then debug = flags.EQ.MPP_DEBUG verbose = flags.EQ.MPP_VERBOSE .OR. debug end if !we use shpalloc to ensure all these are remotely accessible len=0; ptr_sync = LOC(pe) !null initialization call mpp_malloc( ptr_sync, size(TRANSFER(sync,word)), len ) len=0; ptr_status = LOC(pe) !null initialization call mpp_malloc( ptr_status, npes*size(TRANSFER(status(0),word)), len ) len=0; ptr_remote = LOC(pe) !null initialization call mpp_malloc( ptr_remote, npes*size(TRANSFER(remote_data_loc(0),word)), len ) len=0; ptr_from = LOC(pe) !null initialization call mpp_malloc( ptr_from, size(TRANSFER(mpp_from_pe,word)), len ) sync(:) = SHMEM_SYNC_VALUE status(0:npes-1) = MPP_READY remote_data_loc(0:npes-1) = MPP_WAIT call mpp_set_stack_size(32768) !default initial value call mpp_init_logfile() call read_input_nml !--- read namelist #ifdef INTERNAL_FILE_NML read (input_nml_file, mpp_nml, iostat=io_status) #else unit_begin = 103 unit_end = 512 do unit_nml = unit_begin, unit_end inquire( unit_nml,OPENED=opened ) if( .NOT.opened )exit end do open(unit_nml,file='input.nml', iostat=io_status) read(unit_nml,mpp_nml,iostat=io_status) close(unit_nml) #endif if (io_status > 0) then call mpp_error(FATAL,'=>mpp_init: Error reading input.nml') endif ! non-root pe messages written to other location than stdout() if(etc_unit_is_stderr) then etc_unit = stderr() else ! 9 is reserved for etc_unit etc_unit=9 inquire(unit=etc_unit,opened=opened) if(opened) call mpp_error(FATAL,'Unit 9 is already in use (etc_unit) in mpp_comm_sma') if (trim(etcfile) /= '/dev/null') then write( etcfile,'(a,i6.6)' )trim(etcfile)//'.', pe endif inquire(file=etcfile, exist=existed) if(existed) then open( unit=etc_unit, file=trim(etcfile), status='REPLACE' ) else open( unit=etc_unit, file=trim(etcfile) ) endif endif !if optional argument logunit=stdout, write messages to stdout instead. !if specifying non-defaults, you must specify units not yet in use. ! if( PRESENT(in) )then ! inquire( unit=in, opened=opened ) ! if( opened )call mpp_error( FATAL, 'MPP_INIT: unable to open stdin.' ) ! in_unit=in ! end if ! if( PRESENT(out) )then ! inquire( unit=out, opened=opened ) ! if( opened )call mpp_error( FATAL, 'MPP_INIT: unable to open stdout.' ) ! out_unit=out ! end if ! if( PRESENT(err) )then ! inquire( unit=err, opened=opened ) ! if( opened )call mpp_error( FATAL, 'MPP_INIT: unable to open stderr.' ) ! err_unit=err ! end if ! log_unit=get_unit() ! if( PRESENT(log) )then ! inquire( unit=log, opened=opened ) ! if( opened .AND. log.NE.out_unit )call mpp_error( FATAL, 'MPP_INIT: unable to open stdlog.' ) ! log_unit=log ! end if !!log_unit can be written to only from root_pe, all others write to stdout ! if( log_unit.NE.out_unit )then ! inquire( unit=log_unit, opened=opened ) ! if( opened )call mpp_error( FATAL, 'MPP_INIT: specified unit for stdlog already in use.' ) ! if( pe.EQ.root_pe )open( unit=log_unit, file=trim(configfile), status='REPLACE' ) ! call mpp_sync() ! if( pe.NE.root_pe )open( unit=log_unit, file=trim(configfile), status='OLD' ) ! end if !messages if( verbose )call mpp_error( NOTE, 'MPP_INIT: initializing MPP module...' ) if( pe.EQ.root_pe )then logunit = stdlog() write( logunit,'(/a)' )'MPP module '//trim(version) write( logunit,'(a,i6)' )'MPP started with NPES=', npes write( logunit,'(a)' )'Using SMA (shmem) library for message passing...' write( logunit, '(a,es12.4,a,i10,a)' ) & 'Realtime clock resolution=', tick_rate, ' sec (', ticks_per_sec, ' ticks/sec)' write( logunit, '(a,es12.4,a,i20,a)' ) & 'Clock rolls over after ', max_ticks*tick_rate, ' sec (', max_ticks, ' ticks)' end if stdoutunit = stdout() call mpp_clock_begin(clock0) return end subroutine mpp_init !####################################################################### !to be called at the end of a run subroutine mpp_exit() integer :: i, j, k, n, nmax, istat, outunit,logunit real :: t, tmin, tmax, tavg, tstd real :: m, mmin, mmax, mavg, mstd, t_total logical :: opened if( .NOT.module_is_initialized )return call mpp_set_current_pelist() call mpp_clock_end(clock0) outunit = stdout() logunit = stdlog() t_total = clocks(clock0)%total_ticks*tick_rate if( clock_num.GT.0 )then if( ANY(clocks(1:clock_num)%detailed) )then call sum_clock_data; call dump_clock_summary end if if( pe.EQ.root_pe )then write( outunit,'(/a,i6,a)' ) 'Tabulating mpp_clock statistics across ', npes, ' PEs...' if( ANY(clocks(1:clock_num)%detailed) ) & write( outunit,'(a)' )' ... see mpp_clock.out.#### for details on individual PEs.' write( outunit,'(/32x,a)' ) ' tmin tmax tavg tstd tfrac grain pemin pemax' end if write( logunit, '(/37x,a)' ) 'time' call FLUSH( outunit ) call mpp_sync() do i = 1,clock_num if( .NOT.ANY(peset(clocks(i)%peset_num)%list(:).EQ.pe) )cycle call mpp_set_current_pelist( peset(clocks(i)%peset_num)%list ) !times between mpp_clock ticks t = clocks(i)%total_ticks*tick_rate tmin = t; call mpp_min(tmin) tmax = t; call mpp_max(tmax) tavg = t; call mpp_sum(tavg); tavg = tavg/mpp_npes() tstd = (t-tavg)**2; call mpp_sum(tstd); tstd = sqrt( tstd/mpp_npes() ) if( pe.EQ.root_pe )write( outunit,'(a32,4f14.6,f7.3,3i6)' ) & clocks(i)%name, tmin, tmax, tavg, tstd, tavg/t_total, & clocks(i)%grain, minval(peset(clocks(i)%peset_num)%list), & maxval(peset(clocks(i)%peset_num)%list) write(logunit,'(a32,f14.6)') clocks(i)%name, clocks(i)%total_ticks*tick_rate end do if( ANY(clocks(1:clock_num)%detailed) .AND. pe.EQ.root_pe )write( outunit,'(/32x,a)' ) & ' tmin tmax tavg tstd mmin mmax mavg mstd mavg/tavg' do i = 1,clock_num !messages: bytelengths and times if( .NOT.clocks(i)%detailed )cycle do j = 1,MAX_EVENT_TYPES n = clocks(i)%events(j)%calls; nmax = n call mpp_max(nmax) if( nmax.NE.0 )then !don't divide by n because n might be 0 m = 0 if( n.GT.0 )m = sum(clocks(i)%events(j)%bytes(1:n)) mmin = m; call mpp_min(mmin) mmax = m; call mpp_max(mmax) mavg = m; call mpp_sum(mavg); mavg = mavg/mpp_npes() mstd = (m-mavg)**2; call mpp_sum(mstd); mstd = sqrt( mstd/mpp_npes() ) t = 0 if( n.GT.0 )t = sum(clocks(i)%events(j)%ticks(1:n))*tick_rate tmin = t; call mpp_min(tmin) tmax = t; call mpp_max(tmax) tavg = t; call mpp_sum(tavg); tavg = tavg/mpp_npes() tstd = (t-tavg)**2; call mpp_sum(tstd); tstd = sqrt( tstd/mpp_npes() ) if( pe.EQ.root_pe )write( outunit,'(a32,4f11.3,5es11.3)' ) & trim(clocks(i)%name)//' '//trim(clocks(i)%events(j)%name), & tmin, tmax, tavg, tstd, mmin, mmax, mavg, mstd, mavg/tavg end if end do end do end if ! close down etc_unit: 9 inquire(unit=etc_unit, opened=opened) if (opened) then call FLUSH (etc_unit) close(etc_unit) endif call mpp_set_current_pelist() call mpp_sync() call mpp_max(mpp_stack_hwm) if( pe.EQ.root_pe )write( outunit,* )'MPP_STACK high water mark=', mpp_stack_hwm return end subroutine mpp_exit !####################################################################### !routine to perform symmetric allocation: !this is required on the t3e/O2k for variables that will be non-local arguments !to a shmem call (see man intro_shmem(3F)). !newlen is the required allocation length for the pointer ptr ! len is the current allocation (0 if unallocated) subroutine mpp_malloc( ptr, newlen, len ) integer, intent(in) :: newlen integer, intent(inout) :: len real :: dummy integer :: words_per_long, outunit integer(LONG_KIND) :: long !argument ptr is a cray pointer, points to a dummy argument in this routine pointer( ptr, dummy ) ! integer(LONG_KIND) :: error_8 if( .NOT.module_is_initialized )call mpp_error( FATAL, 'MPP_MALLOC: You must first call mpp_init.' ) !use existing allocation if it is enough if( newlen.LE.len )return call SHMEM_BARRIER_ALL() !if the pointer is already allocated, deallocate ! if( len.NE.0 )call SHPDEALLC( ptr, error_8, -1 ) !BWA: error_8 instead of error, see PV 682618 (fixed in mpt.1.3.0.1) if( len.NE.0 )call SHPDEALLC( ptr, error, -1 ) !allocate new length: assume that the array is KIND=8 words_per_long = size(transfer(long,word)) call SHPALLOC( ptr, newlen*words_per_long, error, -1 ) len = newlen call SHMEM_BARRIER_ALL() if( debug )then call SYSTEM_CLOCK(tick) outunit = stdout() write( outunit,'(a,i18,a,i5,a,2i8,i16)' )'T=', tick, ' PE=', pe, ' MPP_MALLOC: len, newlen, ptr=', len, newlen, ptr end if return end subroutine mpp_malloc !####################################################################### !set the mpp_stack variable to be at least n LONG words long subroutine mpp_set_stack_size(n) integer, intent(in) :: n character(len=8) :: text call mpp_malloc( ptr_stack, n, mpp_stack_size ) write( text,'(i8)' )n if( pe.EQ.root_pe )call mpp_error( NOTE, 'MPP_SET_STACK_SIZE: stack size set to '//text//'.' ) return end subroutine mpp_set_stack_size !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!! ! ! ! BASIC MESSAGE PASSING ROUTINE: mpp_transmit ! ! ! !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!! !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!! ! ! ! BASIC MESSAGE PASSING ROUTINE: mpp_transmit ! ! ! !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!! subroutine mpp_broadcast_char(data, length, from_pe, pelist ) character(len=*), intent(inout) :: data(:) integer, intent(in) :: length, from_pe integer, intent(in), optional :: pelist(:) integer :: n, i, from_rank, out_unit !pointer to remote data character :: bdata(length) pointer( ptr, bdata ) integer :: words character(len=8) :: text if( .NOT.module_is_initialized )call mpp_error( FATAL, 'mpp_broadcast_text: You must first call mpp_init.' ) n = get_peset(pelist); if( peset(n)%count.EQ.1 )return if( debug )then call SYSTEM_CLOCK(tick) if(mpp_pe() == mpp_root_pe()) then out_unit = stdout() write( out_unit,'(a,i18,a,i5,a,2i5,2i8)' )& 'T=',tick, ' PE=',pe, 'mpp_broadcast_text begin: from_pe, length=', from_pe, length endif end if if( .NOT.ANY(from_pe.EQ.peset(current_peset_num)%list) ) & call mpp_error( FATAL, 'mpp_broadcast_text: broadcasting from invalid PE.' ) if( debug .and. (current_clock.NE.0) )call SYSTEM_CLOCK(start_tick) ptr = LOC(mpp_stack) words = size(bdata(:))*size(transfer(bdata(1),word)) if( words.GT.mpp_stack_size )then write( text, '(i8)' )words call mpp_error( FATAL, 'MPP_BROADCAST user stack overflow: call mpp_set_stack_size('//text//') from all PEs.' ) end if mpp_stack_hwm = max( words, mpp_stack_hwm ) if( mpp_npes().GT.1 )then !dir$ IVDEP do i = 1,length bdata(i) = data(i) end do call mpp_sync(pelist) !eliminate? #ifdef _CRAYT90 call SHMEM_UDCFLUSH !invalidate data cache #endif call SHMEM_BROADCAST_( bdata, bdata, length, from_pe, peset(n)%start, peset(n)%log2stride, peset(n)%count, sync ) call mpp_sync(pelist) !eliminate? !dir$ IVDEP do i = 1,length data(i) = bdata(i) end do end if if( debug .and. (current_clock.NE.0) )call increment_current_clock( EVENT_BROADCAST, length ) return end subroutine mpp_broadcast_char #undef MPP_TRANSMIT_ #define MPP_TRANSMIT_ mpp_transmit_real8 #undef MPP_TRANSMIT_SCALAR_ #define MPP_TRANSMIT_SCALAR_ mpp_transmit_real8_scalar #undef MPP_TRANSMIT_2D_ #define MPP_TRANSMIT_2D_ mpp_transmit_real8_2d #undef MPP_TRANSMIT_3D_ #define MPP_TRANSMIT_3D_ mpp_transmit_real8_3d #undef MPP_TRANSMIT_4D_ #define MPP_TRANSMIT_4D_ mpp_transmit_real8_4d #undef MPP_TRANSMIT_5D_ #define MPP_TRANSMIT_5D_ mpp_transmit_real8_5d #undef MPP_RECV_ #define MPP_RECV_ mpp_recv_real8 #undef MPP_RECV_SCALAR_ #define MPP_RECV_SCALAR_ mpp_recv_real8_scalar #undef MPP_RECV_2D_ #define MPP_RECV_2D_ mpp_recv_real8_2d #undef MPP_RECV_3D_ #define MPP_RECV_3D_ mpp_recv_real8_3d #undef MPP_RECV_4D_ #define MPP_RECV_4D_ mpp_recv_real8_4d #undef MPP_RECV_5D_ #define MPP_RECV_5D_ mpp_recv_real8_5d #undef MPP_SEND_ #define MPP_SEND_ mpp_send_real8 #undef MPP_SEND_SCALAR_ #define MPP_SEND_SCALAR_ mpp_send_real8_scalar #undef MPP_SEND_2D_ #define MPP_SEND_2D_ mpp_send_real8_2d #undef MPP_SEND_3D_ #define MPP_SEND_3D_ mpp_send_real8_3d #undef MPP_SEND_4D_ #define MPP_SEND_4D_ mpp_send_real8_4d #undef MPP_SEND_5D_ #define MPP_SEND_5D_ mpp_send_real8_5d #undef MPP_BROADCAST_ #define MPP_BROADCAST_ mpp_broadcast_real8 #undef MPP_BROADCAST_SCALAR_ #define MPP_BROADCAST_SCALAR_ mpp_broadcast_real8_scalar #undef MPP_BROADCAST_2D_ #define MPP_BROADCAST_2D_ mpp_broadcast_real8_2d #undef MPP_BROADCAST_3D_ #define MPP_BROADCAST_3D_ mpp_broadcast_real8_3d #undef MPP_BROADCAST_4D_ #define MPP_BROADCAST_4D_ mpp_broadcast_real8_4d #undef MPP_BROADCAST_5D_ #define MPP_BROADCAST_5D_ mpp_broadcast_real8_5d #undef MPP_TYPE_ #define MPP_TYPE_ real(DOUBLE_KIND) #undef MPP_TYPE_BYTELEN_ #define MPP_TYPE_BYTELEN_ 8 #undef SHMEM_BROADCAST_ #define SHMEM_BROADCAST_ SHMEM_BROADCAST8 #undef SHMEM_GET_ #define SHMEM_GET_ SHMEM_GET8 #include #ifdef OVERLOAD_C8 #undef MPP_TRANSMIT_ #define MPP_TRANSMIT_ mpp_transmit_cmplx8 #undef MPP_TRANSMIT_SCALAR_ #define MPP_TRANSMIT_SCALAR_ mpp_transmit_cmplx8_scalar #undef MPP_TRANSMIT_2D_ #define MPP_TRANSMIT_2D_ mpp_transmit_cmplx8_2d #undef MPP_TRANSMIT_3D_ #define MPP_TRANSMIT_3D_ mpp_transmit_cmplx8_3d #undef MPP_TRANSMIT_4D_ #define MPP_TRANSMIT_4D_ mpp_transmit_cmplx8_4d #undef MPP_TRANSMIT_5D_ #define MPP_TRANSMIT_5D_ mpp_transmit_cmplx8_5d #undef MPP_RECV_ #define MPP_RECV_ mpp_recv_cmplx8 #undef MPP_RECV_SCALAR_ #define MPP_RECV_SCALAR_ mpp_recv_cmplx8_scalar #undef MPP_RECV_2D_ #define MPP_RECV_2D_ mpp_recv_cmplx8_2d #undef MPP_RECV_3D_ #define MPP_RECV_3D_ mpp_recv_cmplx8_3d #undef MPP_RECV_4D_ #define MPP_RECV_4D_ mpp_recv_cmplx8_4d #undef MPP_RECV_5D_ #define MPP_RECV_5D_ mpp_recv_cmplx8_5d #undef MPP_SEND_ #define MPP_SEND_ mpp_send_cmplx8 #undef MPP_SEND_SCALAR_ #define MPP_SEND_SCALAR_ mpp_send_cmplx8_scalar #undef MPP_SEND_2D_ #define MPP_SEND_2D_ mpp_send_cmplx8_2d #undef MPP_SEND_3D_ #define MPP_SEND_3D_ mpp_send_cmplx8_3d #undef MPP_SEND_4D_ #define MPP_SEND_4D_ mpp_send_cmplx8_4d #undef MPP_SEND_5D_ #define MPP_SEND_5D_ mpp_send_cmplx8_5d #undef MPP_BROADCAST_ #define MPP_BROADCAST_ mpp_broadcast_cmplx8 #undef MPP_BROADCAST_SCALAR_ #define MPP_BROADCAST_SCALAR_ mpp_broadcast_cmplx8_scalar #undef MPP_BROADCAST_2D_ #define MPP_BROADCAST_2D_ mpp_broadcast_cmplx8_2d #undef MPP_BROADCAST_3D_ #define MPP_BROADCAST_3D_ mpp_broadcast_cmplx8_3d #undef MPP_BROADCAST_4D_ #define MPP_BROADCAST_4D_ mpp_broadcast_cmplx8_4d #undef MPP_BROADCAST_5D_ #define MPP_BROADCAST_5D_ mpp_broadcast_cmplx8_5d #undef MPP_TYPE_ #define MPP_TYPE_ complex(DOUBLE_KIND) #undef MPP_TYPE_BYTELEN_ #define MPP_TYPE_BYTELEN_ 16 #undef SHMEM_BROADCAST_ #define SHMEM_BROADCAST_ SHMEM_BROADCAST8 #undef SHMEM_GET_ #define SHMEM_GET_ SHMEM_GET128 #include #endif #ifdef OVERLOAD_R4 #undef MPP_TRANSMIT_ #define MPP_TRANSMIT_ mpp_transmit_real4 #undef MPP_TRANSMIT_SCALAR_ #define MPP_TRANSMIT_SCALAR_ mpp_transmit_real4_scalar #undef MPP_TRANSMIT_2D_ #define MPP_TRANSMIT_2D_ mpp_transmit_real4_2d #undef MPP_TRANSMIT_3D_ #define MPP_TRANSMIT_3D_ mpp_transmit_real4_3d #undef MPP_TRANSMIT_4D_ #define MPP_TRANSMIT_4D_ mpp_transmit_real4_4d #undef MPP_TRANSMIT_5D_ #define MPP_TRANSMIT_5D_ mpp_transmit_real4_5d #undef MPP_RECV_ #define MPP_RECV_ mpp_recv_real4 #undef MPP_RECV_SCALAR_ #define MPP_RECV_SCALAR_ mpp_recv_real4_scalar #undef MPP_RECV_2D_ #define MPP_RECV_2D_ mpp_recv_real4_2d #undef MPP_RECV_3D_ #define MPP_RECV_3D_ mpp_recv_real4_3d #undef MPP_RECV_4D_ #define MPP_RECV_4D_ mpp_recv_real4_4d #undef MPP_RECV_5D_ #define MPP_RECV_5D_ mpp_recv_real4_5d #undef MPP_SEND_ #define MPP_SEND_ mpp_send_real4 #undef MPP_SEND_SCALAR_ #define MPP_SEND_SCALAR_ mpp_send_real4_scalar #undef MPP_SEND_2D_ #define MPP_SEND_2D_ mpp_send_real4_2d #undef MPP_SEND_3D_ #define MPP_SEND_3D_ mpp_send_real4_3d #undef MPP_SEND_4D_ #define MPP_SEND_4D_ mpp_send_real4_4d #undef MPP_SEND_5D_ #define MPP_SEND_5D_ mpp_send_real4_5d #undef MPP_BROADCAST_ #define MPP_BROADCAST_ mpp_broadcast_real4 #undef MPP_BROADCAST_SCALAR_ #define MPP_BROADCAST_SCALAR_ mpp_broadcast_real4_scalar #undef MPP_BROADCAST_2D_ #define MPP_BROADCAST_2D_ mpp_broadcast_real4_2d #undef MPP_BROADCAST_3D_ #define MPP_BROADCAST_3D_ mpp_broadcast_real4_3d #undef MPP_BROADCAST_4D_ #define MPP_BROADCAST_4D_ mpp_broadcast_real4_4d #undef MPP_BROADCAST_5D_ #define MPP_BROADCAST_5D_ mpp_broadcast_real4_5d #undef MPP_TYPE_ #define MPP_TYPE_ real(FLOAT_KIND) #undef MPP_TYPE_BYTELEN_ #define MPP_TYPE_BYTELEN_ 4 #undef SHMEM_BROADCAST_ #define SHMEM_BROADCAST_ SHMEM_BROADCAST4 #undef SHMEM_GET_ #define SHMEM_GET_ SHMEM_GET4 #include #endif #ifdef OVERLOAD_C4 #undef MPP_TRANSMIT_ #define MPP_TRANSMIT_ mpp_transmit_cmplx4 #undef MPP_TRANSMIT_SCALAR_ #define MPP_TRANSMIT_SCALAR_ mpp_transmit_cmplx4_scalar #undef MPP_TRANSMIT_2D_ #define MPP_TRANSMIT_2D_ mpp_transmit_cmplx4_2d #undef MPP_TRANSMIT_3D_ #define MPP_TRANSMIT_3D_ mpp_transmit_cmplx4_3d #undef MPP_TRANSMIT_4D_ #define MPP_TRANSMIT_4D_ mpp_transmit_cmplx4_4d #undef MPP_TRANSMIT_5D_ #define MPP_TRANSMIT_5D_ mpp_transmit_cmplx4_5d #undef MPP_RECV_ #define MPP_RECV_ mpp_recv_cmplx4 #undef MPP_RECV_SCALAR_ #define MPP_RECV_SCALAR_ mpp_recv_cmplx4_scalar #undef MPP_RECV_2D_ #define MPP_RECV_2D_ mpp_recv_cmplx4_2d #undef MPP_RECV_3D_ #define MPP_RECV_3D_ mpp_recv_cmplx4_3d #undef MPP_RECV_4D_ #define MPP_RECV_4D_ mpp_recv_cmplx4_4d #undef MPP_RECV_5D_ #define MPP_RECV_5D_ mpp_recv_cmplx4_5d #undef MPP_SEND_ #define MPP_SEND_ mpp_send_cmplx4 #undef MPP_SEND_SCALAR_ #define MPP_SEND_SCALAR_ mpp_send_cmplx4_scalar #undef MPP_SEND_2D_ #define MPP_SEND_2D_ mpp_send_cmplx4_2d #undef MPP_SEND_3D_ #define MPP_SEND_3D_ mpp_send_cmplx4_3d #undef MPP_SEND_4D_ #define MPP_SEND_4D_ mpp_send_cmplx4_4d #undef MPP_SEND_5D_ #define MPP_SEND_5D_ mpp_send_cmplx4_5d #undef MPP_BROADCAST_ #define MPP_BROADCAST_ mpp_broadcast_cmplx4 #undef MPP_BROADCAST_SCALAR_ #define MPP_BROADCAST_SCALAR_ mpp_broadcast_cmplx4_scalar #undef MPP_BROADCAST_2D_ #define MPP_BROADCAST_2D_ mpp_broadcast_cmplx4_2d #undef MPP_BROADCAST_3D_ #define MPP_BROADCAST_3D_ mpp_broadcast_cmplx4_3d #undef MPP_BROADCAST_4D_ #define MPP_BROADCAST_4D_ mpp_broadcast_cmplx4_4d #undef MPP_BROADCAST_5D_ #define MPP_BROADCAST_5D_ mpp_broadcast_cmplx4_5d #undef MPP_TYPE_ #define MPP_TYPE_ complex(FLOAT_KIND) #undef MPP_TYPE_BYTELEN_ #define MPP_TYPE_BYTELEN_ 8 #undef SHMEM_BROADCAST_ #define SHMEM_BROADCAST_ SHMEM_BROADCAST4 #undef SHMEM_GET_ #define SHMEM_GET_ SHMEM_GET64 #include #endif #ifndef no_8byte_integers #undef MPP_TRANSMIT_ #define MPP_TRANSMIT_ mpp_transmit_int8 #undef MPP_TRANSMIT_SCALAR_ #define MPP_TRANSMIT_SCALAR_ mpp_transmit_int8_scalar #undef MPP_TRANSMIT_2D_ #define MPP_TRANSMIT_2D_ mpp_transmit_int8_2d #undef MPP_TRANSMIT_3D_ #define MPP_TRANSMIT_3D_ mpp_transmit_int8_3d #undef MPP_TRANSMIT_4D_ #define MPP_TRANSMIT_4D_ mpp_transmit_int8_4d #undef MPP_TRANSMIT_5D_ #define MPP_TRANSMIT_5D_ mpp_transmit_int8_5d #undef MPP_RECV_ #define MPP_RECV_ mpp_recv_int8 #undef MPP_RECV_SCALAR_ #define MPP_RECV_SCALAR_ mpp_recv_int8_scalar #undef MPP_RECV_2D_ #define MPP_RECV_2D_ mpp_recv_int8_2d #undef MPP_RECV_3D_ #define MPP_RECV_3D_ mpp_recv_int8_3d #undef MPP_RECV_4D_ #define MPP_RECV_4D_ mpp_recv_int8_4d #undef MPP_RECV_5D_ #define MPP_RECV_5D_ mpp_recv_int8_5d #undef MPP_SEND_ #define MPP_SEND_ mpp_send_int8 #undef MPP_SEND_SCALAR_ #define MPP_SEND_SCALAR_ mpp_send_int8_scalar #undef MPP_SEND_2D_ #define MPP_SEND_2D_ mpp_send_int8_2d #undef MPP_SEND_3D_ #define MPP_SEND_3D_ mpp_send_int8_3d #undef MPP_SEND_4D_ #define MPP_SEND_4D_ mpp_send_int8_4d #undef MPP_SEND_5D_ #define MPP_SEND_5D_ mpp_send_int8_5d #undef MPP_BROADCAST_ #define MPP_BROADCAST_ mpp_broadcast_int8 #undef MPP_BROADCAST_SCALAR_ #define MPP_BROADCAST_SCALAR_ mpp_broadcast_int8_scalar #undef MPP_BROADCAST_2D_ #define MPP_BROADCAST_2D_ mpp_broadcast_int8_2d #undef MPP_BROADCAST_3D_ #define MPP_BROADCAST_3D_ mpp_broadcast_int8_3d #undef MPP_BROADCAST_4D_ #define MPP_BROADCAST_4D_ mpp_broadcast_int8_4d #undef MPP_BROADCAST_5D_ #define MPP_BROADCAST_5D_ mpp_broadcast_int8_5d #undef MPP_TYPE_ #define MPP_TYPE_ integer(LONG_KIND) #undef MPP_TYPE_BYTELEN_ #define MPP_TYPE_BYTELEN_ 8 #undef SHMEM_BROADCAST_ #define SHMEM_BROADCAST_ SHMEM_BROADCAST8 #undef SHMEM_GET_ #define SHMEM_GET_ SHMEM_GET8 #include #endif #undef MPP_TRANSMIT_ #define MPP_TRANSMIT_ mpp_transmit_int4 #undef MPP_TRANSMIT_SCALAR_ #define MPP_TRANSMIT_SCALAR_ mpp_transmit_int4_scalar #undef MPP_TRANSMIT_2D_ #define MPP_TRANSMIT_2D_ mpp_transmit_int4_2d #undef MPP_TRANSMIT_3D_ #define MPP_TRANSMIT_3D_ mpp_transmit_int4_3d #undef MPP_TRANSMIT_4D_ #define MPP_TRANSMIT_4D_ mpp_transmit_int4_4d #undef MPP_TRANSMIT_5D_ #define MPP_TRANSMIT_5D_ mpp_transmit_int4_5d #undef MPP_RECV_ #define MPP_RECV_ mpp_recv_int4 #undef MPP_RECV_SCALAR_ #define MPP_RECV_SCALAR_ mpp_recv_int4_scalar #undef MPP_RECV_2D_ #define MPP_RECV_2D_ mpp_recv_int4_2d #undef MPP_RECV_3D_ #define MPP_RECV_3D_ mpp_recv_int4_3d #undef MPP_RECV_4D_ #define MPP_RECV_4D_ mpp_recv_int4_4d #undef MPP_RECV_5D_ #define MPP_RECV_5D_ mpp_recv_int4_5d #undef MPP_SEND_ #define MPP_SEND_ mpp_send_int4 #undef MPP_SEND_SCALAR_ #define MPP_SEND_SCALAR_ mpp_send_int4_scalar #undef MPP_SEND_2D_ #define MPP_SEND_2D_ mpp_send_int4_2d #undef MPP_SEND_3D_ #define MPP_SEND_3D_ mpp_send_int4_3d #undef MPP_SEND_4D_ #define MPP_SEND_4D_ mpp_send_int4_4d #undef MPP_SEND_5D_ #define MPP_SEND_5D_ mpp_send_int4_5d #undef MPP_BROADCAST_ #define MPP_BROADCAST_ mpp_broadcast_int4 #undef MPP_BROADCAST_SCALAR_ #define MPP_BROADCAST_SCALAR_ mpp_broadcast_int4_scalar #undef MPP_BROADCAST_2D_ #define MPP_BROADCAST_2D_ mpp_broadcast_int4_2d #undef MPP_BROADCAST_3D_ #define MPP_BROADCAST_3D_ mpp_broadcast_int4_3d #undef MPP_BROADCAST_4D_ #define MPP_BROADCAST_4D_ mpp_broadcast_int4_4d #undef MPP_BROADCAST_5D_ #define MPP_BROADCAST_5D_ mpp_broadcast_int4_5d #undef MPP_TYPE_ #define MPP_TYPE_ integer(INT_KIND) #undef MPP_TYPE_BYTELEN_ #define MPP_TYPE_BYTELEN_ 4 #undef SHMEM_BROADCAST_ #define SHMEM_BROADCAST_ SHMEM_BROADCAST4 #undef SHMEM_GET_ #define SHMEM_GET_ SHMEM_GET4 #include #ifndef no_8byte_integers #undef MPP_TRANSMIT_ #define MPP_TRANSMIT_ mpp_transmit_logical8 #undef MPP_TRANSMIT_SCALAR_ #define MPP_TRANSMIT_SCALAR_ mpp_transmit_logical8_scalar #undef MPP_TRANSMIT_2D_ #define MPP_TRANSMIT_2D_ mpp_transmit_logical8_2d #undef MPP_TRANSMIT_3D_ #define MPP_TRANSMIT_3D_ mpp_transmit_logical8_3d #undef MPP_TRANSMIT_4D_ #define MPP_TRANSMIT_4D_ mpp_transmit_logical8_4d #undef MPP_TRANSMIT_5D_ #define MPP_TRANSMIT_5D_ mpp_transmit_logical8_5d #undef MPP_RECV_ #define MPP_RECV_ mpp_recv_logical8 #undef MPP_RECV_SCALAR_ #define MPP_RECV_SCALAR_ mpp_recv_logical8_scalar #undef MPP_RECV_2D_ #define MPP_RECV_2D_ mpp_recv_logical8_2d #undef MPP_RECV_3D_ #define MPP_RECV_3D_ mpp_recv_logical8_3d #undef MPP_RECV_4D_ #define MPP_RECV_4D_ mpp_recv_logical8_4d #undef MPP_RECV_5D_ #define MPP_RECV_5D_ mpp_recv_logical8_5d #undef MPP_SEND_ #define MPP_SEND_ mpp_send_logical8 #undef MPP_SEND_SCALAR_ #define MPP_SEND_SCALAR_ mpp_send_logical8_scalar #undef MPP_SEND_2D_ #define MPP_SEND_2D_ mpp_send_logical8_2d #undef MPP_SEND_3D_ #define MPP_SEND_3D_ mpp_send_logical8_3d #undef MPP_SEND_4D_ #define MPP_SEND_4D_ mpp_send_logical8_4d #undef MPP_SEND_5D_ #define MPP_SEND_5D_ mpp_send_logical8_5d #undef MPP_BROADCAST_ #define MPP_BROADCAST_ mpp_broadcast_logical8 #undef MPP_BROADCAST_SCALAR_ #define MPP_BROADCAST_SCALAR_ mpp_broadcast_logical8_scalar #undef MPP_BROADCAST_2D_ #define MPP_BROADCAST_2D_ mpp_broadcast_logical8_2d #undef MPP_BROADCAST_3D_ #define MPP_BROADCAST_3D_ mpp_broadcast_logical8_3d #undef MPP_BROADCAST_4D_ #define MPP_BROADCAST_4D_ mpp_broadcast_logical8_4d #undef MPP_BROADCAST_5D_ #define MPP_BROADCAST_5D_ mpp_broadcast_logical8_5d #undef MPP_TYPE_ #define MPP_TYPE_ logical(LONG_KIND) #undef MPP_TYPE_BYTELEN_ #define MPP_TYPE_BYTELEN_ 8 #undef SHMEM_BROADCAST_ #define SHMEM_BROADCAST_ SHMEM_BROADCAST8 #undef SHMEM_GET_ #define SHMEM_GET_ SHMEM_GET8 #include #endif #undef MPP_TRANSMIT_ #define MPP_TRANSMIT_ mpp_transmit_logical4 #undef MPP_TRANSMIT_SCALAR_ #define MPP_TRANSMIT_SCALAR_ mpp_transmit_logical4_scalar #undef MPP_TRANSMIT_2D_ #define MPP_TRANSMIT_2D_ mpp_transmit_logical4_2d #undef MPP_TRANSMIT_3D_ #define MPP_TRANSMIT_3D_ mpp_transmit_logical4_3d #undef MPP_TRANSMIT_4D_ #define MPP_TRANSMIT_4D_ mpp_transmit_logical4_4d #undef MPP_TRANSMIT_5D_ #define MPP_TRANSMIT_5D_ mpp_transmit_logical4_5d #undef MPP_RECV_ #define MPP_RECV_ mpp_recv_logical4 #undef MPP_RECV_SCALAR_ #define MPP_RECV_SCALAR_ mpp_recv_logical4_scalar #undef MPP_RECV_2D_ #define MPP_RECV_2D_ mpp_recv_logical4_2d #undef MPP_RECV_3D_ #define MPP_RECV_3D_ mpp_recv_logical4_3d #undef MPP_RECV_4D_ #define MPP_RECV_4D_ mpp_recv_logical4_4d #undef MPP_RECV_5D_ #define MPP_RECV_5D_ mpp_recv_logical4_5d #undef MPP_SEND_ #define MPP_SEND_ mpp_send_logical4 #undef MPP_SEND_SCALAR_ #define MPP_SEND_SCALAR_ mpp_send_logical4_scalar #undef MPP_SEND_2D_ #define MPP_SEND_2D_ mpp_send_logical4_2d #undef MPP_SEND_3D_ #define MPP_SEND_3D_ mpp_send_logical4_3d #undef MPP_SEND_4D_ #define MPP_SEND_4D_ mpp_send_logical4_4d #undef MPP_SEND_5D_ #define MPP_SEND_5D_ mpp_send_logical4_5d #undef MPP_BROADCAST_ #define MPP_BROADCAST_ mpp_broadcast_logical4 #undef MPP_BROADCAST_SCALAR_ #define MPP_BROADCAST_SCALAR_ mpp_broadcast_logical4_scalar #undef MPP_BROADCAST_2D_ #define MPP_BROADCAST_2D_ mpp_broadcast_logical4_2d #undef MPP_BROADCAST_3D_ #define MPP_BROADCAST_3D_ mpp_broadcast_logical4_3d #undef MPP_BROADCAST_4D_ #define MPP_BROADCAST_4D_ mpp_broadcast_logical4_4d #undef MPP_BROADCAST_5D_ #define MPP_BROADCAST_5D_ mpp_broadcast_logical4_5d #undef MPP_TYPE_ #define MPP_TYPE_ logical(INT_KIND) #undef MPP_TYPE_BYTELEN_ #define MPP_TYPE_BYTELEN_ 4 #undef SHMEM_BROADCAST_ #define SHMEM_BROADCAST_ SHMEM_BROADCAST4 #undef SHMEM_GET_ #define SHMEM_GET_ SHMEM_GET4 #include !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!! ! ! ! GLOBAL REDUCTION ROUTINES: mpp_max, mpp_sum, mpp_min ! ! ! !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!! #undef MPP_REDUCE_0D_ #define MPP_REDUCE_0D_ mpp_max_real8_0d #undef MPP_REDUCE_1D_ #define MPP_REDUCE_1D_ mpp_max_real8_1d #undef MPP_TYPE_ #define MPP_TYPE_ real(DOUBLE_KIND) #undef MPP_TYPE_BYTELEN_ #define MPP_TYPE_BYTELEN_ 8 #undef SHMEM_REDUCE_ #define SHMEM_REDUCE_ SHMEM_REAL8_MAX_TO_ALL #include #ifdef OVERLOAD_R4 #undef MPP_REDUCE_0D_ #define MPP_REDUCE_0D_ mpp_max_real4_0d #undef MPP_REDUCE_1D_ #define MPP_REDUCE_1D_ mpp_max_real4_1d #undef MPP_TYPE_ #define MPP_TYPE_ real(FLOAT_KIND) #undef MPP_TYPE_BYTELEN_ #define MPP_TYPE_BYTELEN_ 4 #undef SHMEM_REDUCE_ #define SHMEM_REDUCE_ SHMEM_REAL4_MAX_TO_ALL #include #endif #ifndef no_8byte_integers #undef MPP_REDUCE_0D_ #define MPP_REDUCE_0D_ mpp_max_int8_0d #undef MPP_REDUCE_1D_ #define MPP_REDUCE_1D_ mpp_max_int8_1d #undef MPP_TYPE_ #define MPP_TYPE_ integer(LONG_KIND) #undef MPP_TYPE_BYTELEN_ #define MPP_TYPE_BYTELEN_ 8 #undef SHMEM_REDUCE_ #define SHMEM_REDUCE_ SHMEM_INT8_MAX_TO_ALL #include #endif #undef MPP_REDUCE_0D_ #define MPP_REDUCE_0D_ mpp_max_int4_0d #undef MPP_REDUCE_1D_ #define MPP_REDUCE_1D_ mpp_max_int4_1d #undef MPP_TYPE_ #define MPP_TYPE_ integer(INT_KIND) #undef MPP_TYPE_BYTELEN_ #define MPP_TYPE_BYTELEN_ 4 #undef SHMEM_REDUCE_ #define SHMEM_REDUCE_ SHMEM_INT4_MAX_TO_ALL #include #undef MPP_REDUCE_0D_ #define MPP_REDUCE_0D_ mpp_min_real8_0d #undef MPP_REDUCE_1D_ #define MPP_REDUCE_1D_ mpp_min_real8_1d #undef MPP_TYPE_ #define MPP_TYPE_ real(DOUBLE_KIND) #undef MPP_TYPE_BYTELEN_ #define MPP_TYPE_BYTELEN_ 8 #undef SHMEM_REDUCE_ #define SHMEM_REDUCE_ SHMEM_REAL8_MIN_TO_ALL #include #ifdef OVERLOAD_R4 #undef MPP_REDUCE_0D_ #define MPP_REDUCE_0D_ mpp_min_real4_0d #undef MPP_REDUCE_1D_ #define MPP_REDUCE_1D_ mpp_min_real4_1d #undef MPP_TYPE_ #define MPP_TYPE_ real(FLOAT_KIND) #undef MPP_TYPE_BYTELEN_ #define MPP_TYPE_BYTELEN_ 4 #undef SHMEM_REDUCE_ #define SHMEM_REDUCE_ SHMEM_REAL4_MIN_TO_ALL #include #endif #ifndef no_8byte_integers #undef MPP_REDUCE_0D_ #define MPP_REDUCE_0D_ mpp_min_int8_0d #undef MPP_REDUCE_1D_ #define MPP_REDUCE_1D_ mpp_min_int8_1d #undef MPP_TYPE_ #define MPP_TYPE_ integer(LONG_KIND) #undef MPP_TYPE_BYTELEN_ #define MPP_TYPE_BYTELEN_ 8 #undef SHMEM_REDUCE_ #define SHMEM_REDUCE_ SHMEM_INT8_MIN_TO_ALL #include #endif #undef MPP_REDUCE_0D_ #define MPP_REDUCE_0D_ mpp_min_int4_0d #undef MPP_REDUCE_1D_ #define MPP_REDUCE_1D_ mpp_min_int4_1d #undef MPP_TYPE_ #define MPP_TYPE_ integer(INT_KIND) #undef MPP_TYPE_BYTELEN_ #define MPP_TYPE_BYTELEN_ 4 #undef SHMEM_REDUCE_ #define SHMEM_REDUCE_ SHMEM_INT4_MIN_TO_ALL #include #undef MPP_SUM_ #define MPP_SUM_ mpp_sum_real8 #undef MPP_SUM_SCALAR_ #define MPP_SUM_SCALAR_ mpp_sum_real8_scalar #undef MPP_SUM_2D_ #define MPP_SUM_2D_ mpp_sum_real8_2d #undef MPP_SUM_3D_ #define MPP_SUM_3D_ mpp_sum_real8_3d #undef MPP_SUM_4D_ #define MPP_SUM_4D_ mpp_sum_real8_4d #undef MPP_SUM_5D_ #define MPP_SUM_5D_ mpp_sum_real8_5d #undef MPP_TYPE_ #define MPP_TYPE_ real(DOUBLE_KIND) #undef SHMEM_SUM_ #define SHMEM_SUM_ SHMEM_REAL8_SUM_TO_ALL #undef MPP_TYPE_BYTELEN_ #define MPP_TYPE_BYTELEN_ 8 #include #ifdef OVERLOAD_C8 #undef MPP_SUM_ #define MPP_SUM_ mpp_sum_cmplx8 #undef MPP_SUM_SCALAR_ #define MPP_SUM_SCALAR_ mpp_sum_cmplx8_scalar #undef MPP_SUM_2D_ #define MPP_SUM_2D_ mpp_sum_cmplx8_2d #undef MPP_SUM_3D_ #define MPP_SUM_3D_ mpp_sum_cmplx8_3d #undef MPP_SUM_4D_ #define MPP_SUM_4D_ mpp_sum_cmplx8_4d #undef MPP_SUM_5D_ #define MPP_SUM_5D_ mpp_sum_cmplx8_5d #undef MPP_TYPE_ #define MPP_TYPE_ complex(DOUBLE_KIND) #undef SHMEM_SUM_ #define SHMEM_SUM_ SHMEM_COMP8_SUM_TO_ALL #undef MPP_TYPE_BYTELEN_ #define MPP_TYPE_BYTELEN_ 16 #include #endif #ifdef OVERLOAD_R4 #undef MPP_SUM_ #define MPP_SUM_ mpp_sum_real4 #undef MPP_SUM_SCALAR_ #define MPP_SUM_SCALAR_ mpp_sum_real4_scalar #undef MPP_SUM_2D_ #define MPP_SUM_2D_ mpp_sum_real4_2d #undef MPP_SUM_3D_ #define MPP_SUM_3D_ mpp_sum_real4_3d #undef MPP_SUM_4D_ #define MPP_SUM_4D_ mpp_sum_real4_4d #undef MPP_SUM_5D_ #define MPP_SUM_5D_ mpp_sum_real4_5d #undef MPP_TYPE_ #define MPP_TYPE_ real(FLOAT_KIND) #undef SHMEM_SUM_ #define SHMEM_SUM_ SHMEM_REAL4_SUM_TO_ALL #undef MPP_TYPE_BYTELEN_ #define MPP_TYPE_BYTELEN_ 4 #include #endif #ifdef OVERLOAD_C4 #undef MPP_SUM_ #define MPP_SUM_ mpp_sum_cmplx4 #undef MPP_SUM_SCALAR_ #define MPP_SUM_SCALAR_ mpp_sum_cmplx4_scalar #undef MPP_SUM_2D_ #define MPP_SUM_2D_ mpp_sum_cmplx4_2d #undef MPP_SUM_3D_ #define MPP_SUM_3D_ mpp_sum_cmplx4_3d #undef MPP_SUM_4D_ #define MPP_SUM_4D_ mpp_sum_cmplx4_4d #undef MPP_SUM_5D_ #define MPP_SUM_5D_ mpp_sum_cmplx4_5d #undef MPP_TYPE_ #define MPP_TYPE_ complex(FLOAT_KIND) #undef SHMEM_SUM_ #define SHMEM_SUM_ SHMEM_COMP4_SUM_TO_ALL #undef MPP_TYPE_BYTELEN_ #define MPP_TYPE_BYTELEN_ 8 #include #endif #ifndef no_8byte_integers #undef MPP_SUM_ #define MPP_SUM_ mpp_sum_int8 #undef MPP_SUM_SCALAR_ #define MPP_SUM_SCALAR_ mpp_sum_int8_scalar #undef MPP_SUM_2D_ #define MPP_SUM_2D_ mpp_sum_int8_2d #undef MPP_SUM_3D_ #define MPP_SUM_3D_ mpp_sum_int8_3d #undef MPP_SUM_4D_ #define MPP_SUM_4D_ mpp_sum_int8_4d #undef MPP_SUM_5D_ #define MPP_SUM_5D_ mpp_sum_int8_5d #undef MPP_TYPE_ #define MPP_TYPE_ integer(LONG_KIND) #undef SHMEM_SUM_ #define SHMEM_SUM_ SHMEM_INT8_SUM_TO_ALL #undef MPP_TYPE_BYTELEN_ #define MPP_TYPE_BYTELEN_ 8 #include #endif #undef MPP_SUM_ #define MPP_SUM_ mpp_sum_int4 #undef MPP_SUM_SCALAR_ #define MPP_SUM_SCALAR_ mpp_sum_int4_scalar #undef MPP_SUM_2D_ #define MPP_SUM_2D_ mpp_sum_int4_2d #undef MPP_SUM_3D_ #define MPP_SUM_3D_ mpp_sum_int4_3d #undef MPP_SUM_4D_ #define MPP_SUM_4D_ mpp_sum_int4_4d #undef MPP_SUM_5D_ #define MPP_SUM_5D_ mpp_sum_int4_5d #undef MPP_TYPE_ #define MPP_TYPE_ integer(INT_KIND) #undef SHMEM_SUM_ #define SHMEM_SUM_ SHMEM_INT4_SUM_TO_ALL #undef MPP_TYPE_BYTELEN_ #define MPP_TYPE_BYTELEN_ 4 #include !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!! ! ! ! SCATTER AND GATHER ROUTINES: mpp_alltoall ! ! ! !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!! #undef MPP_ALLTOALL_ #undef MPP_ALLTOALLV_ #undef MPP_TYPE_ #undef MPP_TYPE_BYTELEN_ #undef MPI_TYPE_ #define MPP_ALLTOALL_ mpp_alltoall_int4 #define MPP_ALLTOALLV_ mpp_alltoall_int4_v #define MPP_TYPE_ integer(INT_KIND) #define MPP_TYPE_BYTELEN_ 4 #define MPI_TYPE_ MPI_INTEGER4 #include #undef MPP_ALLTOALL_ #undef MPP_ALLTOALLV_ #undef MPP_TYPE_ #undef MPP_TYPE_BYTELEN_ #undef MPI_TYPE_ #define MPP_ALLTOALL_ mpp_alltoall_int8 #define MPP_ALLTOALLV_ mpp_alltoall_int8_v #define MPP_TYPE_ integer(LONG_KIND) #define MPP_TYPE_BYTELEN_ 8 #define MPI_TYPE_ MPI_INTEGER8 #include #undef MPP_ALLTOALL_ #undef MPP_ALLTOALLV_ #undef MPP_TYPE_ #undef MPP_TYPE_BYTELEN_ #undef MPI_TYPE_ #define MPP_ALLTOALL_ mpp_alltoall_real4 #define MPP_ALLTOALLV_ mpp_alltoall_real4_v #define MPP_TYPE_ real(FLOAT_KIND) #define MPP_TYPE_BYTELEN_ 4 #define MPI_TYPE_ MPI_REAL4 #include #undef MPP_ALLTOALL_ #undef MPP_ALLTOALLV_ #undef MPP_TYPE_ #undef MPP_TYPE_BYTELEN_ #undef MPI_TYPE_ #define MPP_ALLTOALL_ mpp_alltoall_real8 #define MPP_ALLTOALLV_ mpp_alltoall_real8_v #define MPP_TYPE_ real(DOUBLE_KIND) #define MPP_TYPE_BYTELEN_ 8 #define MPI_TYPE_ MPI_REAL8 #include !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!! ! ! ! DATA TRANSFER TYPES: mpp_type_create, mpp_type_free ! ! ! !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!! #define MPP_TYPE_CREATE_ mpp_type_create_int4 #define MPP_TYPE_ integer(INT_KIND) #define MPI_TYPE_ MPI_INTEGER4 #include #define MPP_TYPE_CREATE_ mpp_type_create_int8 #define MPP_TYPE_ integer(LONG_KIND) #define MPI_TYPE_ MPI_INTEGER8 #include #define MPP_TYPE_CREATE_ mpp_type_create_real4 #define MPP_TYPE_ real(FLOAT_KIND) #define MPI_TYPE_ MPI_REAL4 #include #define MPP_TYPE_CREATE_ mpp_type_create_real8 #define MPP_TYPE_ real(DOUBLE_KIND) #define MPI_TYPE_ MPI_REAL8 #include #define MPP_TYPE_CREATE_ mpp_type_create_logical4 #define MPP_TYPE_ logical(INT_KIND) #define MPI_TYPE_ MPI_INTEGER4 #include #define MPP_TYPE_CREATE_ mpp_type_create_logical8 #define MPP_TYPE_ logical(LONG_KIND) #define MPI_TYPE_ MPI_INTEGER8 #include ! Clear preprocessor flags #undef MPI_TYPE_ #undef MPP_TYPE_ #undef MPP_TYPE_CREATE_ subroutine mpp_type_free(dtype) type(mpp_type), pointer, intent(inout) :: dtype call mpp_error(FATAL, 'MPP_TYPE_FREE: Unsupported for SHMEM.') end subroutine mpp_type_free !####################################################################### !these local versions are written for grouping into shmem_integer_wait subroutine shmem_int4_wait_local( ivar, cmp_value ) #ifdef __ia64 !dir$ ATTRIBUTE FORCEINLINE shmem_int4_wait_local #else !dir$ INLINEALWAYS shmem_int4_wait_local #endif integer(INT_KIND), intent(in) :: cmp_value integer(INT_KIND), intent(inout) :: ivar call SHMEM_INT4_WAIT( ivar, cmp_value ) return end subroutine shmem_int4_wait_local subroutine shmem_int8_wait_local( ivar, cmp_value ) #ifdef __ia64 !dir$ ATTRIBUTE FORCEINLINE shmem_int4_wait_local #else !dir$ INLINEALWAYS shmem_int4_wait_local #endif integer(LONG_KIND), intent(in) :: cmp_value integer(LONG_KIND), intent(inout) :: ivar call SHMEM_INT8_WAIT( ivar, cmp_value ) return end subroutine shmem_int8_wait_local