MpiTimerGauge.F90 Source File


This file depends on

sourcefile~~mpitimergauge.f90~~EfferentGraph sourcefile~mpitimergauge.f90 MpiTimerGauge.F90 sourcefile~abstractgauge.f90 AbstractGauge.F90 sourcefile~mpitimergauge.f90->sourcefile~abstractgauge.f90 sourcefile~abstractmeter.f90 AbstractMeter.F90 sourcefile~abstractgauge.f90->sourcefile~abstractmeter.f90 sourcefile~errorhandling.f90 ErrorHandling.F90 sourcefile~abstractmeter.f90->sourcefile~errorhandling.f90 sourcefile~mapl_throw.f90 MAPL_Throw.F90 sourcefile~errorhandling.f90->sourcefile~mapl_throw.f90

Files dependent on this one

sourcefile~~mpitimergauge.f90~~AfferentGraph sourcefile~mpitimergauge.f90 MpiTimerGauge.F90 sourcefile~distributedprofiler.f90 DistributedProfiler.F90 sourcefile~distributedprofiler.f90->sourcefile~mpitimergauge.f90 sourcefile~globalprofilers.f90 GlobalProfilers.F90 sourcefile~globalprofilers.f90->sourcefile~mpitimergauge.f90 sourcefile~mapl_profiler.f90 MAPL_Profiler.F90 sourcefile~mapl_profiler.f90->sourcefile~mpitimergauge.f90 sourcefile~timeprofiler.f90 TimeProfiler.F90 sourcefile~timeprofiler.f90->sourcefile~mpitimergauge.f90

Source Code

#include "unused_dummy.H"

module MAPL_MpiTimerGauge
   use, intrinsic :: iso_fortran_env, only: REAL64
   use MPI, only: MPI_Wtime
   use MAPL_AbstractGauge
   implicit none
   private

   public :: MpiTimerGauge

   type, extends(AbstractGauge) :: MpiTimerGauge
      private
   contains
      procedure :: get_measurement
   end type MpiTimerGauge


contains


   function get_measurement(this) result(measurement)
      real(kind=REAL64) :: measurement
      class(MpiTimerGauge), intent(inout) :: this

      _UNUSED_DUMMY(this)
      measurement = MPI_Wtime()

   end function get_measurement

end module MAPL_MpiTimerGauge