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






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

import Prelude


{-# LINE 53 "libraries/base/src/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 62 "libraries/base/src/System/CPUTime/Posix/ClockGetTime.hsc" #-}