CollectiveStageDataMessage.F90 Source File


This file depends on

sourcefile~~collectivestagedatamessage.f90~~EfferentGraph sourcefile~collectivestagedatamessage.f90 CollectiveStageDataMessage.F90 sourcefile~abstractcollectivedatamessage.f90 AbstractCollectiveDataMessage.F90 sourcefile~collectivestagedatamessage.f90->sourcefile~abstractcollectivedatamessage.f90 sourcefile~abstractdatareference.f90 AbstractDataReference.F90 sourcefile~collectivestagedatamessage.f90->sourcefile~abstractdatareference.f90 sourcefile~abstractmessage.f90 AbstractMessage.F90 sourcefile~collectivestagedatamessage.f90->sourcefile~abstractmessage.f90 sourcefile~keywordenforcer.f90 KeywordEnforcer.F90 sourcefile~collectivestagedatamessage.f90->sourcefile~keywordenforcer.f90 sourcefile~pfio_utilities.f90 pFIO_Utilities.F90 sourcefile~collectivestagedatamessage.f90->sourcefile~pfio_utilities.f90 sourcefile~abstractcollectivedatamessage.f90->sourcefile~abstractdatareference.f90 sourcefile~abstractcollectivedatamessage.f90->sourcefile~abstractmessage.f90 sourcefile~abstractcollectivedatamessage.f90->sourcefile~keywordenforcer.f90 sourcefile~abstractcollectivedatamessage.f90->sourcefile~pfio_utilities.f90 sourcefile~abstractdatamessage.f90 AbstractDataMessage.F90 sourcefile~abstractcollectivedatamessage.f90->sourcefile~abstractdatamessage.f90 sourcefile~mapl_exceptionhandling.f90 MAPL_ExceptionHandling.F90 sourcefile~abstractcollectivedatamessage.f90->sourcefile~mapl_exceptionhandling.f90 sourcefile~abstractdatareference.f90->sourcefile~pfio_utilities.f90 sourcefile~abstractdatareference.f90->sourcefile~mapl_exceptionhandling.f90 sourcefile~pfio_constants.f90 pFIO_Constants.F90 sourcefile~abstractdatareference.f90->sourcefile~pfio_constants.f90 sourcefile~abstractmessage.f90->sourcefile~mapl_exceptionhandling.f90 sourcefile~pfio_utilities.f90->sourcefile~mapl_exceptionhandling.f90 sourcefile~pfio_utilities.f90->sourcefile~pfio_constants.f90 sourcefile~abstractdatamessage.f90->sourcefile~abstractdatareference.f90 sourcefile~abstractdatamessage.f90->sourcefile~abstractmessage.f90 sourcefile~abstractdatamessage.f90->sourcefile~keywordenforcer.f90 sourcefile~abstractdatamessage.f90->sourcefile~pfio_utilities.f90 sourcefile~abstractdatamessage.f90->sourcefile~mapl_exceptionhandling.f90 sourcefile~errorhandling.f90 ErrorHandling.F90 sourcefile~mapl_exceptionhandling.f90->sourcefile~errorhandling.f90 sourcefile~mapl_throw.f90 MAPL_Throw.F90 sourcefile~mapl_exceptionhandling.f90->sourcefile~mapl_throw.f90 sourcefile~errorhandling.f90->sourcefile~mapl_throw.f90

Files dependent on this one

sourcefile~~collectivestagedatamessage.f90~~AfferentGraph sourcefile~collectivestagedatamessage.f90 CollectiveStageDataMessage.F90 sourcefile~abstractserver.f90 AbstractServer.F90 sourcefile~abstractserver.f90->sourcefile~collectivestagedatamessage.f90 sourcefile~baseserver.f90 BaseServer.F90 sourcefile~baseserver.f90->sourcefile~collectivestagedatamessage.f90 sourcefile~clientthread.f90 ClientThread.F90 sourcefile~clientthread.f90->sourcefile~collectivestagedatamessage.f90 sourcefile~fastclientthread.f90 FastClientThread.F90 sourcefile~fastclientthread.f90->sourcefile~collectivestagedatamessage.f90 sourcefile~messagevector.f90 MessageVector.F90 sourcefile~messagevector.f90->sourcefile~collectivestagedatamessage.f90 sourcefile~messagevisitor.f90 MessageVisitor.F90 sourcefile~messagevisitor.f90->sourcefile~collectivestagedatamessage.f90 sourcefile~mockclientthread.f90 MockClientThread.F90 sourcefile~mockclientthread.f90->sourcefile~collectivestagedatamessage.f90 sourcefile~multicommserver.f90 MultiCommServer.F90 sourcefile~multicommserver.f90->sourcefile~collectivestagedatamessage.f90 sourcefile~multigroupserver.f90 MultiGroupServer.F90 sourcefile~multigroupserver.f90->sourcefile~collectivestagedatamessage.f90 sourcefile~multilayerserver.f90 MultiLayerServer.F90 sourcefile~multilayerserver.f90->sourcefile~collectivestagedatamessage.f90 sourcefile~protocolparser.f90 ProtocolParser.F90 sourcefile~protocolparser.f90->sourcefile~collectivestagedatamessage.f90 sourcefile~serverthread.f90 ServerThread.F90 sourcefile~serverthread.f90->sourcefile~collectivestagedatamessage.f90

Source Code

module pFIO_CollectiveStageDataMessageMod
   use pFIO_AbstractMessageMod
   use pFIO_AbstractCollectiveDataMessageMod
   use pFIO_UtilitiesMod
   use pFIO_AbstractDataReferenceMod
   use mapl_KeywordEnforcerMod
   implicit none
   private

   public :: CollectiveStageDataMessage

   type, extends(AbstractCollectiveDataMessage) :: CollectiveStageDataMessage
   contains
      procedure, nopass :: get_type_id
   end type CollectiveStageDataMessage

   interface CollectiveStageDataMessage
      module procedure new_CollectiveStageDataMessage
   end interface CollectiveStageDataMessage

contains


   function new_CollectiveStageDataMessage( &
        & request_id, collection_id, file_name, var_name, &
        & data_reference, unusable, start,global_start,global_count) result(message)
      type (CollectiveStageDataMessage) :: message
      integer, intent(in) :: request_id
      integer, intent(in) :: collection_id
      character(len=*), intent(in) :: file_name
      character(len=*), intent(in) :: var_name
      class (AbstractDataReference), intent(in) :: data_reference
      class (KeywordEnforcer), optional, intent(in) :: unusable
      integer, optional, intent(in) :: start(:)
      integer, optional, intent(in) :: global_start(:)
      integer, optional, intent(in) :: global_count(:)

      call message%initCollective(request_id,collection_id, &
          file_name,var_name,data_reference,unusable=unusable, &
          start=start,global_start = global_start,global_count=global_count)

   end function new_CollectiveStageDataMessage

   integer function get_type_id() result(type_id)
      type_id = CollectiveStageData_ID
   end function get_type_id

end module pFIO_CollectiveStageDataMessageMod