{-# LINE 1 "libraries/base/System/CPUTime.hsc" #-} {-# LANGUAGE Trustworthy #-} {-# LINE 2 "libraries/base/System/CPUTime.hsc" #-} {-# LANGUAGE CPP, NondecreasingIndentation, CApiFFI #-} ----------------------------------------------------------------------------- -- | -- Module : System.CPUTime -- Copyright : (c) The University of Glasgow 2001 -- License : BSD-style (see the file libraries/base/LICENSE) -- -- Maintainer : libraries@haskell.org -- Stability : provisional -- Portability : portable -- -- The standard CPUTime library. -- ----------------------------------------------------------------------------- {-# LINE 19 "libraries/base/System/CPUTime.hsc" #-} {-# LINE 20 "libraries/base/System/CPUTime.hsc" #-} module System.CPUTime ( getCPUTime, -- :: IO Integer cpuTimePrecision -- :: Integer ) where import Data.Ratio import Foreign import Foreign.C -- For struct rusage {-# LINE 34 "libraries/base/System/CPUTime.hsc" #-} {-# LINE 35 "libraries/base/System/CPUTime.hsc" #-} {-# LINE 36 "libraries/base/System/CPUTime.hsc" #-} {-# LINE 37 "libraries/base/System/CPUTime.hsc" #-} {-# LINE 38 "libraries/base/System/CPUTime.hsc" #-} -- For FILETIME etc. on Windows {-# LINE 43 "libraries/base/System/CPUTime.hsc" #-} -- for struct tms {-# LINE 46 "libraries/base/System/CPUTime.hsc" #-} {-# LINE 47 "libraries/base/System/CPUTime.hsc" #-} {-# LINE 48 "libraries/base/System/CPUTime.hsc" #-} #ifdef mingw32_HOST_OS # if defined(i386_HOST_ARCH) # define WINDOWS_CCONV stdcall # elif defined(x86_64_HOST_ARCH) # define WINDOWS_CCONV ccall # else # error Unknown mingw32 arch # endif #else #endif {-# LINE 61 "libraries/base/System/CPUTime.hsc" #-} realToInteger :: Real a => a -> Integer realToInteger ct = round (realToFrac ct :: Double) -- CTime, CClock, CUShort etc are in Real but not Fractional, -- so we must convert to Double before we can round it {-# LINE 66 "libraries/base/System/CPUTime.hsc" #-} -- ----------------------------------------------------------------------------- -- |Computation 'getCPUTime' returns the number of picoseconds CPU time -- used by the current program. The precision of this result is -- implementation-dependent. getCPUTime :: IO Integer getCPUTime = do {-# LINE 76 "libraries/base/System/CPUTime.hsc" #-} -- getrusage() is right royal pain to deal with when targetting multiple -- versions of Solaris, since some versions supply it in libc (2.3 and 2.5), -- while 2.4 has got it in libucb (I wouldn't be too surprised if it was back -- again in libucb in 2.6..) -- -- Avoid the problem by resorting to times() instead. -- {-# LINE 100 "libraries/base/System/CPUTime.hsc" #-} allocaBytes (32) $ \ p_tms -> do {-# LINE 101 "libraries/base/System/CPUTime.hsc" #-} _ <- times p_tms u_ticks <- ((\hsc_ptr -> peekByteOff hsc_ptr 0)) p_tms :: IO CClock {-# LINE 103 "libraries/base/System/CPUTime.hsc" #-} s_ticks <- ((\hsc_ptr -> peekByteOff hsc_ptr 8)) p_tms :: IO CClock {-# LINE 104 "libraries/base/System/CPUTime.hsc" #-} return (( (realToInteger u_ticks + realToInteger s_ticks) * 1000000000000) `div` fromIntegral clockTicks) type CTms = () foreign import ccall unsafe times :: Ptr CTms -> IO CClock {-# LINE 115 "libraries/base/System/CPUTime.hsc" #-} {-# LINE 149 "libraries/base/System/CPUTime.hsc" #-} -- |The 'cpuTimePrecision' constant is the smallest measurable difference -- in CPU time that the implementation can record, and is given as an -- integral number of picoseconds. cpuTimePrecision :: Integer cpuTimePrecision = round ((1000000000000::Integer) % fromIntegral (clockTicks)) foreign import ccall unsafe clk_tck :: CLong clockTicks :: Int clockTicks = fromIntegral clk_tck