{-# LINE 1 "libraries/base/System/CPUTime/Posix/ClockGetTime.hsc" #-}
{-# LANGUAGE CPP, CApiFFI, NumDecimals #-}




{-# LINE 6 "libraries/base/System/CPUTime/Posix/ClockGetTime.hsc" #-}



{-# LINE 9 "libraries/base/System/CPUTime/Posix/ClockGetTime.hsc" #-}

module System.CPUTime.Posix.ClockGetTime
    ( getCPUTime
    , getCpuTimePrecision
    ) where


{-# LINE 48 "libraries/base/System/CPUTime/Posix/ClockGetTime.hsc" #-}

-- This should never happen
getCPUTime :: IO Integer
getCPUTime :: IO Integer
getCPUTime = [Char] -> IO Integer
forall a. HasCallStack => [Char] -> a
error [Char]
"System.CPUTime.Posix.ClockGetTime: Unsupported"

getCpuTimePrecision :: IO Integer
getCpuTimePrecision :: IO Integer
getCpuTimePrecision = [Char] -> IO Integer
forall a. HasCallStack => [Char] -> a
error [Char]
"System.CPUTime.Posix.ClockGetTime: Unsupported"


{-# LINE 57 "libraries/base/System/CPUTime/Posix/ClockGetTime.hsc" #-}