{-# LANGUAGE DataKinds #-}
{-# LANGUAGE PolyKinds #-}
{-# LANGUAGE UnboxedTuples #-}
module Streamly.Internal.Data.Time.Units
    (
    
      TimeUnit()
    
    , TimeUnit64()
    
    , TimeSpec(..)
    , NanoSecond64(..)
    , MicroSecond64(..)
    , MilliSecond64(..)
    , showNanoSecond64
    
    , AbsTime(..)
    , toAbsTime
    , fromAbsTime
    
    , RelTime
    , toRelTime
    , fromRelTime
    , diffAbsTime
    , addToAbsTime
    
    , RelTime64
    , toRelTime64
    , fromRelTime64
    , diffAbsTime64
    , addToAbsTime64
    , showRelTime64
    )
where
#include "inline.hs"
import Text.Printf (printf)
import Data.Int
import Foreign.Storable (Storable)
import Streamly.Internal.Data.Unbox (Unbox)
import Streamly.Internal.Data.Time.TimeSpec
{-# INLINE tenPower3 #-}
tenPower3 :: Int64
tenPower3 :: Int64
tenPower3 = Int64
1000
{-# INLINE tenPower6 #-}
tenPower6 :: Int64
tenPower6 :: Int64
tenPower6 = Int64
1000000
{-# INLINE tenPower9 #-}
tenPower9 :: Int64
tenPower9 :: Int64
tenPower9 = Int64
1000000000
newtype NanoSecond64 = NanoSecond64 Int64
    deriving ( NanoSecond64 -> NanoSecond64 -> Bool
(NanoSecond64 -> NanoSecond64 -> Bool)
-> (NanoSecond64 -> NanoSecond64 -> Bool) -> Eq NanoSecond64
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: NanoSecond64 -> NanoSecond64 -> Bool
== :: NanoSecond64 -> NanoSecond64 -> Bool
$c/= :: NanoSecond64 -> NanoSecond64 -> Bool
/= :: NanoSecond64 -> NanoSecond64 -> Bool
Eq
             , ReadPrec [NanoSecond64]
ReadPrec NanoSecond64
Int -> ReadS NanoSecond64
ReadS [NanoSecond64]
(Int -> ReadS NanoSecond64)
-> ReadS [NanoSecond64]
-> ReadPrec NanoSecond64
-> ReadPrec [NanoSecond64]
-> Read NanoSecond64
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
$creadsPrec :: Int -> ReadS NanoSecond64
readsPrec :: Int -> ReadS NanoSecond64
$creadList :: ReadS [NanoSecond64]
readList :: ReadS [NanoSecond64]
$creadPrec :: ReadPrec NanoSecond64
readPrec :: ReadPrec NanoSecond64
$creadListPrec :: ReadPrec [NanoSecond64]
readListPrec :: ReadPrec [NanoSecond64]
Read
             , Int -> NanoSecond64 -> ShowS
[NanoSecond64] -> ShowS
NanoSecond64 -> String
(Int -> NanoSecond64 -> ShowS)
-> (NanoSecond64 -> String)
-> ([NanoSecond64] -> ShowS)
-> Show NanoSecond64
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> NanoSecond64 -> ShowS
showsPrec :: Int -> NanoSecond64 -> ShowS
$cshow :: NanoSecond64 -> String
show :: NanoSecond64 -> String
$cshowList :: [NanoSecond64] -> ShowS
showList :: [NanoSecond64] -> ShowS
Show
             , Int -> NanoSecond64
NanoSecond64 -> Int
NanoSecond64 -> [NanoSecond64]
NanoSecond64 -> NanoSecond64
NanoSecond64 -> NanoSecond64 -> [NanoSecond64]
NanoSecond64 -> NanoSecond64 -> NanoSecond64 -> [NanoSecond64]
(NanoSecond64 -> NanoSecond64)
-> (NanoSecond64 -> NanoSecond64)
-> (Int -> NanoSecond64)
-> (NanoSecond64 -> Int)
-> (NanoSecond64 -> [NanoSecond64])
-> (NanoSecond64 -> NanoSecond64 -> [NanoSecond64])
-> (NanoSecond64 -> NanoSecond64 -> [NanoSecond64])
-> (NanoSecond64 -> NanoSecond64 -> NanoSecond64 -> [NanoSecond64])
-> Enum NanoSecond64
forall a.
(a -> a)
-> (a -> a)
-> (Int -> a)
-> (a -> Int)
-> (a -> [a])
-> (a -> a -> [a])
-> (a -> a -> [a])
-> (a -> a -> a -> [a])
-> Enum a
$csucc :: NanoSecond64 -> NanoSecond64
succ :: NanoSecond64 -> NanoSecond64
$cpred :: NanoSecond64 -> NanoSecond64
pred :: NanoSecond64 -> NanoSecond64
$ctoEnum :: Int -> NanoSecond64
toEnum :: Int -> NanoSecond64
$cfromEnum :: NanoSecond64 -> Int
fromEnum :: NanoSecond64 -> Int
$cenumFrom :: NanoSecond64 -> [NanoSecond64]
enumFrom :: NanoSecond64 -> [NanoSecond64]
$cenumFromThen :: NanoSecond64 -> NanoSecond64 -> [NanoSecond64]
enumFromThen :: NanoSecond64 -> NanoSecond64 -> [NanoSecond64]
$cenumFromTo :: NanoSecond64 -> NanoSecond64 -> [NanoSecond64]
enumFromTo :: NanoSecond64 -> NanoSecond64 -> [NanoSecond64]
$cenumFromThenTo :: NanoSecond64 -> NanoSecond64 -> NanoSecond64 -> [NanoSecond64]
enumFromThenTo :: NanoSecond64 -> NanoSecond64 -> NanoSecond64 -> [NanoSecond64]
Enum
             , NanoSecond64
NanoSecond64 -> NanoSecond64 -> Bounded NanoSecond64
forall a. a -> a -> Bounded a
$cminBound :: NanoSecond64
minBound :: NanoSecond64
$cmaxBound :: NanoSecond64
maxBound :: NanoSecond64
Bounded
             , Integer -> NanoSecond64
NanoSecond64 -> NanoSecond64
NanoSecond64 -> NanoSecond64 -> NanoSecond64
(NanoSecond64 -> NanoSecond64 -> NanoSecond64)
-> (NanoSecond64 -> NanoSecond64 -> NanoSecond64)
-> (NanoSecond64 -> NanoSecond64 -> NanoSecond64)
-> (NanoSecond64 -> NanoSecond64)
-> (NanoSecond64 -> NanoSecond64)
-> (NanoSecond64 -> NanoSecond64)
-> (Integer -> NanoSecond64)
-> Num NanoSecond64
forall a.
(a -> a -> a)
-> (a -> a -> a)
-> (a -> a -> a)
-> (a -> a)
-> (a -> a)
-> (a -> a)
-> (Integer -> a)
-> Num a
$c+ :: NanoSecond64 -> NanoSecond64 -> NanoSecond64
+ :: NanoSecond64 -> NanoSecond64 -> NanoSecond64
$c- :: NanoSecond64 -> NanoSecond64 -> NanoSecond64
- :: NanoSecond64 -> NanoSecond64 -> NanoSecond64
$c* :: NanoSecond64 -> NanoSecond64 -> NanoSecond64
* :: NanoSecond64 -> NanoSecond64 -> NanoSecond64
$cnegate :: NanoSecond64 -> NanoSecond64
negate :: NanoSecond64 -> NanoSecond64
$cabs :: NanoSecond64 -> NanoSecond64
abs :: NanoSecond64 -> NanoSecond64
$csignum :: NanoSecond64 -> NanoSecond64
signum :: NanoSecond64 -> NanoSecond64
$cfromInteger :: Integer -> NanoSecond64
fromInteger :: Integer -> NanoSecond64
Num
             , Num NanoSecond64
Ord NanoSecond64
(Num NanoSecond64, Ord NanoSecond64) =>
(NanoSecond64 -> Rational) -> Real NanoSecond64
NanoSecond64 -> Rational
forall a. (Num a, Ord a) => (a -> Rational) -> Real a
$ctoRational :: NanoSecond64 -> Rational
toRational :: NanoSecond64 -> Rational
Real
             , Enum NanoSecond64
Real NanoSecond64
(Real NanoSecond64, Enum NanoSecond64) =>
(NanoSecond64 -> NanoSecond64 -> NanoSecond64)
-> (NanoSecond64 -> NanoSecond64 -> NanoSecond64)
-> (NanoSecond64 -> NanoSecond64 -> NanoSecond64)
-> (NanoSecond64 -> NanoSecond64 -> NanoSecond64)
-> (NanoSecond64 -> NanoSecond64 -> (NanoSecond64, NanoSecond64))
-> (NanoSecond64 -> NanoSecond64 -> (NanoSecond64, NanoSecond64))
-> (NanoSecond64 -> Integer)
-> Integral NanoSecond64
NanoSecond64 -> Integer
NanoSecond64 -> NanoSecond64 -> (NanoSecond64, NanoSecond64)
NanoSecond64 -> NanoSecond64 -> NanoSecond64
forall a.
(Real a, Enum a) =>
(a -> a -> a)
-> (a -> a -> a)
-> (a -> a -> a)
-> (a -> a -> a)
-> (a -> a -> (a, a))
-> (a -> a -> (a, a))
-> (a -> Integer)
-> Integral a
$cquot :: NanoSecond64 -> NanoSecond64 -> NanoSecond64
quot :: NanoSecond64 -> NanoSecond64 -> NanoSecond64
$crem :: NanoSecond64 -> NanoSecond64 -> NanoSecond64
rem :: NanoSecond64 -> NanoSecond64 -> NanoSecond64
$cdiv :: NanoSecond64 -> NanoSecond64 -> NanoSecond64
div :: NanoSecond64 -> NanoSecond64 -> NanoSecond64
$cmod :: NanoSecond64 -> NanoSecond64 -> NanoSecond64
mod :: NanoSecond64 -> NanoSecond64 -> NanoSecond64
$cquotRem :: NanoSecond64 -> NanoSecond64 -> (NanoSecond64, NanoSecond64)
quotRem :: NanoSecond64 -> NanoSecond64 -> (NanoSecond64, NanoSecond64)
$cdivMod :: NanoSecond64 -> NanoSecond64 -> (NanoSecond64, NanoSecond64)
divMod :: NanoSecond64 -> NanoSecond64 -> (NanoSecond64, NanoSecond64)
$ctoInteger :: NanoSecond64 -> Integer
toInteger :: NanoSecond64 -> Integer
Integral
             , Eq NanoSecond64
Eq NanoSecond64 =>
(NanoSecond64 -> NanoSecond64 -> Ordering)
-> (NanoSecond64 -> NanoSecond64 -> Bool)
-> (NanoSecond64 -> NanoSecond64 -> Bool)
-> (NanoSecond64 -> NanoSecond64 -> Bool)
-> (NanoSecond64 -> NanoSecond64 -> Bool)
-> (NanoSecond64 -> NanoSecond64 -> NanoSecond64)
-> (NanoSecond64 -> NanoSecond64 -> NanoSecond64)
-> Ord NanoSecond64
NanoSecond64 -> NanoSecond64 -> Bool
NanoSecond64 -> NanoSecond64 -> Ordering
NanoSecond64 -> NanoSecond64 -> NanoSecond64
forall a.
Eq a =>
(a -> a -> Ordering)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> a)
-> (a -> a -> a)
-> Ord a
$ccompare :: NanoSecond64 -> NanoSecond64 -> Ordering
compare :: NanoSecond64 -> NanoSecond64 -> Ordering
$c< :: NanoSecond64 -> NanoSecond64 -> Bool
< :: NanoSecond64 -> NanoSecond64 -> Bool
$c<= :: NanoSecond64 -> NanoSecond64 -> Bool
<= :: NanoSecond64 -> NanoSecond64 -> Bool
$c> :: NanoSecond64 -> NanoSecond64 -> Bool
> :: NanoSecond64 -> NanoSecond64 -> Bool
$c>= :: NanoSecond64 -> NanoSecond64 -> Bool
>= :: NanoSecond64 -> NanoSecond64 -> Bool
$cmax :: NanoSecond64 -> NanoSecond64 -> NanoSecond64
max :: NanoSecond64 -> NanoSecond64 -> NanoSecond64
$cmin :: NanoSecond64 -> NanoSecond64 -> NanoSecond64
min :: NanoSecond64 -> NanoSecond64 -> NanoSecond64
Ord
             , Ptr NanoSecond64 -> IO NanoSecond64
Ptr NanoSecond64 -> Int -> IO NanoSecond64
Ptr NanoSecond64 -> Int -> NanoSecond64 -> IO ()
Ptr NanoSecond64 -> NanoSecond64 -> IO ()
NanoSecond64 -> Int
(NanoSecond64 -> Int)
-> (NanoSecond64 -> Int)
-> (Ptr NanoSecond64 -> Int -> IO NanoSecond64)
-> (Ptr NanoSecond64 -> Int -> NanoSecond64 -> IO ())
-> (forall b. Ptr b -> Int -> IO NanoSecond64)
-> (forall b. Ptr b -> Int -> NanoSecond64 -> IO ())
-> (Ptr NanoSecond64 -> IO NanoSecond64)
-> (Ptr NanoSecond64 -> NanoSecond64 -> IO ())
-> Storable NanoSecond64
forall b. Ptr b -> Int -> IO NanoSecond64
forall b. Ptr b -> Int -> NanoSecond64 -> IO ()
forall a.
(a -> Int)
-> (a -> Int)
-> (Ptr a -> Int -> IO a)
-> (Ptr a -> Int -> a -> IO ())
-> (forall b. Ptr b -> Int -> IO a)
-> (forall b. Ptr b -> Int -> a -> IO ())
-> (Ptr a -> IO a)
-> (Ptr a -> a -> IO ())
-> Storable a
$csizeOf :: NanoSecond64 -> Int
sizeOf :: NanoSecond64 -> Int
$calignment :: NanoSecond64 -> Int
alignment :: NanoSecond64 -> Int
$cpeekElemOff :: Ptr NanoSecond64 -> Int -> IO NanoSecond64
peekElemOff :: Ptr NanoSecond64 -> Int -> IO NanoSecond64
$cpokeElemOff :: Ptr NanoSecond64 -> Int -> NanoSecond64 -> IO ()
pokeElemOff :: Ptr NanoSecond64 -> Int -> NanoSecond64 -> IO ()
$cpeekByteOff :: forall b. Ptr b -> Int -> IO NanoSecond64
peekByteOff :: forall b. Ptr b -> Int -> IO NanoSecond64
$cpokeByteOff :: forall b. Ptr b -> Int -> NanoSecond64 -> IO ()
pokeByteOff :: forall b. Ptr b -> Int -> NanoSecond64 -> IO ()
$cpeek :: Ptr NanoSecond64 -> IO NanoSecond64
peek :: Ptr NanoSecond64 -> IO NanoSecond64
$cpoke :: Ptr NanoSecond64 -> NanoSecond64 -> IO ()
poke :: Ptr NanoSecond64 -> NanoSecond64 -> IO ()
Storable
             , Int -> MutByteArray -> IO NanoSecond64
Int -> MutByteArray -> NanoSecond64 -> IO ()
Proxy NanoSecond64 -> Int
(Proxy NanoSecond64 -> Int)
-> (Int -> MutByteArray -> IO NanoSecond64)
-> (Int -> MutByteArray -> IO NanoSecond64)
-> (Int -> MutByteArray -> NanoSecond64 -> IO ())
-> (Int -> MutByteArray -> NanoSecond64 -> IO ())
-> Unbox NanoSecond64
forall a.
(Proxy a -> Int)
-> (Int -> MutByteArray -> IO a)
-> (Int -> MutByteArray -> IO a)
-> (Int -> MutByteArray -> a -> IO ())
-> (Int -> MutByteArray -> a -> IO ())
-> Unbox a
$csizeOf :: Proxy NanoSecond64 -> Int
sizeOf :: Proxy NanoSecond64 -> Int
$cpeekAt :: Int -> MutByteArray -> IO NanoSecond64
peekAt :: Int -> MutByteArray -> IO NanoSecond64
$cpeekByteIndex :: Int -> MutByteArray -> IO NanoSecond64
peekByteIndex :: Int -> MutByteArray -> IO NanoSecond64
$cpokeAt :: Int -> MutByteArray -> NanoSecond64 -> IO ()
pokeAt :: Int -> MutByteArray -> NanoSecond64 -> IO ()
$cpokeByteIndex :: Int -> MutByteArray -> NanoSecond64 -> IO ()
pokeByteIndex :: Int -> MutByteArray -> NanoSecond64 -> IO ()
Unbox
             )
newtype MicroSecond64 = MicroSecond64 Int64
    deriving ( MicroSecond64 -> MicroSecond64 -> Bool
(MicroSecond64 -> MicroSecond64 -> Bool)
-> (MicroSecond64 -> MicroSecond64 -> Bool) -> Eq MicroSecond64
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: MicroSecond64 -> MicroSecond64 -> Bool
== :: MicroSecond64 -> MicroSecond64 -> Bool
$c/= :: MicroSecond64 -> MicroSecond64 -> Bool
/= :: MicroSecond64 -> MicroSecond64 -> Bool
Eq
             , ReadPrec [MicroSecond64]
ReadPrec MicroSecond64
Int -> ReadS MicroSecond64
ReadS [MicroSecond64]
(Int -> ReadS MicroSecond64)
-> ReadS [MicroSecond64]
-> ReadPrec MicroSecond64
-> ReadPrec [MicroSecond64]
-> Read MicroSecond64
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
$creadsPrec :: Int -> ReadS MicroSecond64
readsPrec :: Int -> ReadS MicroSecond64
$creadList :: ReadS [MicroSecond64]
readList :: ReadS [MicroSecond64]
$creadPrec :: ReadPrec MicroSecond64
readPrec :: ReadPrec MicroSecond64
$creadListPrec :: ReadPrec [MicroSecond64]
readListPrec :: ReadPrec [MicroSecond64]
Read
             , Int -> MicroSecond64 -> ShowS
[MicroSecond64] -> ShowS
MicroSecond64 -> String
(Int -> MicroSecond64 -> ShowS)
-> (MicroSecond64 -> String)
-> ([MicroSecond64] -> ShowS)
-> Show MicroSecond64
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> MicroSecond64 -> ShowS
showsPrec :: Int -> MicroSecond64 -> ShowS
$cshow :: MicroSecond64 -> String
show :: MicroSecond64 -> String
$cshowList :: [MicroSecond64] -> ShowS
showList :: [MicroSecond64] -> ShowS
Show
             , Int -> MicroSecond64
MicroSecond64 -> Int
MicroSecond64 -> [MicroSecond64]
MicroSecond64 -> MicroSecond64
MicroSecond64 -> MicroSecond64 -> [MicroSecond64]
MicroSecond64 -> MicroSecond64 -> MicroSecond64 -> [MicroSecond64]
(MicroSecond64 -> MicroSecond64)
-> (MicroSecond64 -> MicroSecond64)
-> (Int -> MicroSecond64)
-> (MicroSecond64 -> Int)
-> (MicroSecond64 -> [MicroSecond64])
-> (MicroSecond64 -> MicroSecond64 -> [MicroSecond64])
-> (MicroSecond64 -> MicroSecond64 -> [MicroSecond64])
-> (MicroSecond64
    -> MicroSecond64 -> MicroSecond64 -> [MicroSecond64])
-> Enum MicroSecond64
forall a.
(a -> a)
-> (a -> a)
-> (Int -> a)
-> (a -> Int)
-> (a -> [a])
-> (a -> a -> [a])
-> (a -> a -> [a])
-> (a -> a -> a -> [a])
-> Enum a
$csucc :: MicroSecond64 -> MicroSecond64
succ :: MicroSecond64 -> MicroSecond64
$cpred :: MicroSecond64 -> MicroSecond64
pred :: MicroSecond64 -> MicroSecond64
$ctoEnum :: Int -> MicroSecond64
toEnum :: Int -> MicroSecond64
$cfromEnum :: MicroSecond64 -> Int
fromEnum :: MicroSecond64 -> Int
$cenumFrom :: MicroSecond64 -> [MicroSecond64]
enumFrom :: MicroSecond64 -> [MicroSecond64]
$cenumFromThen :: MicroSecond64 -> MicroSecond64 -> [MicroSecond64]
enumFromThen :: MicroSecond64 -> MicroSecond64 -> [MicroSecond64]
$cenumFromTo :: MicroSecond64 -> MicroSecond64 -> [MicroSecond64]
enumFromTo :: MicroSecond64 -> MicroSecond64 -> [MicroSecond64]
$cenumFromThenTo :: MicroSecond64 -> MicroSecond64 -> MicroSecond64 -> [MicroSecond64]
enumFromThenTo :: MicroSecond64 -> MicroSecond64 -> MicroSecond64 -> [MicroSecond64]
Enum
             , MicroSecond64
MicroSecond64 -> MicroSecond64 -> Bounded MicroSecond64
forall a. a -> a -> Bounded a
$cminBound :: MicroSecond64
minBound :: MicroSecond64
$cmaxBound :: MicroSecond64
maxBound :: MicroSecond64
Bounded
             , Integer -> MicroSecond64
MicroSecond64 -> MicroSecond64
MicroSecond64 -> MicroSecond64 -> MicroSecond64
(MicroSecond64 -> MicroSecond64 -> MicroSecond64)
-> (MicroSecond64 -> MicroSecond64 -> MicroSecond64)
-> (MicroSecond64 -> MicroSecond64 -> MicroSecond64)
-> (MicroSecond64 -> MicroSecond64)
-> (MicroSecond64 -> MicroSecond64)
-> (MicroSecond64 -> MicroSecond64)
-> (Integer -> MicroSecond64)
-> Num MicroSecond64
forall a.
(a -> a -> a)
-> (a -> a -> a)
-> (a -> a -> a)
-> (a -> a)
-> (a -> a)
-> (a -> a)
-> (Integer -> a)
-> Num a
$c+ :: MicroSecond64 -> MicroSecond64 -> MicroSecond64
+ :: MicroSecond64 -> MicroSecond64 -> MicroSecond64
$c- :: MicroSecond64 -> MicroSecond64 -> MicroSecond64
- :: MicroSecond64 -> MicroSecond64 -> MicroSecond64
$c* :: MicroSecond64 -> MicroSecond64 -> MicroSecond64
* :: MicroSecond64 -> MicroSecond64 -> MicroSecond64
$cnegate :: MicroSecond64 -> MicroSecond64
negate :: MicroSecond64 -> MicroSecond64
$cabs :: MicroSecond64 -> MicroSecond64
abs :: MicroSecond64 -> MicroSecond64
$csignum :: MicroSecond64 -> MicroSecond64
signum :: MicroSecond64 -> MicroSecond64
$cfromInteger :: Integer -> MicroSecond64
fromInteger :: Integer -> MicroSecond64
Num
             , Num MicroSecond64
Ord MicroSecond64
(Num MicroSecond64, Ord MicroSecond64) =>
(MicroSecond64 -> Rational) -> Real MicroSecond64
MicroSecond64 -> Rational
forall a. (Num a, Ord a) => (a -> Rational) -> Real a
$ctoRational :: MicroSecond64 -> Rational
toRational :: MicroSecond64 -> Rational
Real
             , Enum MicroSecond64
Real MicroSecond64
(Real MicroSecond64, Enum MicroSecond64) =>
(MicroSecond64 -> MicroSecond64 -> MicroSecond64)
-> (MicroSecond64 -> MicroSecond64 -> MicroSecond64)
-> (MicroSecond64 -> MicroSecond64 -> MicroSecond64)
-> (MicroSecond64 -> MicroSecond64 -> MicroSecond64)
-> (MicroSecond64
    -> MicroSecond64 -> (MicroSecond64, MicroSecond64))
-> (MicroSecond64
    -> MicroSecond64 -> (MicroSecond64, MicroSecond64))
-> (MicroSecond64 -> Integer)
-> Integral MicroSecond64
MicroSecond64 -> Integer
MicroSecond64 -> MicroSecond64 -> (MicroSecond64, MicroSecond64)
MicroSecond64 -> MicroSecond64 -> MicroSecond64
forall a.
(Real a, Enum a) =>
(a -> a -> a)
-> (a -> a -> a)
-> (a -> a -> a)
-> (a -> a -> a)
-> (a -> a -> (a, a))
-> (a -> a -> (a, a))
-> (a -> Integer)
-> Integral a
$cquot :: MicroSecond64 -> MicroSecond64 -> MicroSecond64
quot :: MicroSecond64 -> MicroSecond64 -> MicroSecond64
$crem :: MicroSecond64 -> MicroSecond64 -> MicroSecond64
rem :: MicroSecond64 -> MicroSecond64 -> MicroSecond64
$cdiv :: MicroSecond64 -> MicroSecond64 -> MicroSecond64
div :: MicroSecond64 -> MicroSecond64 -> MicroSecond64
$cmod :: MicroSecond64 -> MicroSecond64 -> MicroSecond64
mod :: MicroSecond64 -> MicroSecond64 -> MicroSecond64
$cquotRem :: MicroSecond64 -> MicroSecond64 -> (MicroSecond64, MicroSecond64)
quotRem :: MicroSecond64 -> MicroSecond64 -> (MicroSecond64, MicroSecond64)
$cdivMod :: MicroSecond64 -> MicroSecond64 -> (MicroSecond64, MicroSecond64)
divMod :: MicroSecond64 -> MicroSecond64 -> (MicroSecond64, MicroSecond64)
$ctoInteger :: MicroSecond64 -> Integer
toInteger :: MicroSecond64 -> Integer
Integral
             , Eq MicroSecond64
Eq MicroSecond64 =>
(MicroSecond64 -> MicroSecond64 -> Ordering)
-> (MicroSecond64 -> MicroSecond64 -> Bool)
-> (MicroSecond64 -> MicroSecond64 -> Bool)
-> (MicroSecond64 -> MicroSecond64 -> Bool)
-> (MicroSecond64 -> MicroSecond64 -> Bool)
-> (MicroSecond64 -> MicroSecond64 -> MicroSecond64)
-> (MicroSecond64 -> MicroSecond64 -> MicroSecond64)
-> Ord MicroSecond64
MicroSecond64 -> MicroSecond64 -> Bool
MicroSecond64 -> MicroSecond64 -> Ordering
MicroSecond64 -> MicroSecond64 -> MicroSecond64
forall a.
Eq a =>
(a -> a -> Ordering)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> a)
-> (a -> a -> a)
-> Ord a
$ccompare :: MicroSecond64 -> MicroSecond64 -> Ordering
compare :: MicroSecond64 -> MicroSecond64 -> Ordering
$c< :: MicroSecond64 -> MicroSecond64 -> Bool
< :: MicroSecond64 -> MicroSecond64 -> Bool
$c<= :: MicroSecond64 -> MicroSecond64 -> Bool
<= :: MicroSecond64 -> MicroSecond64 -> Bool
$c> :: MicroSecond64 -> MicroSecond64 -> Bool
> :: MicroSecond64 -> MicroSecond64 -> Bool
$c>= :: MicroSecond64 -> MicroSecond64 -> Bool
>= :: MicroSecond64 -> MicroSecond64 -> Bool
$cmax :: MicroSecond64 -> MicroSecond64 -> MicroSecond64
max :: MicroSecond64 -> MicroSecond64 -> MicroSecond64
$cmin :: MicroSecond64 -> MicroSecond64 -> MicroSecond64
min :: MicroSecond64 -> MicroSecond64 -> MicroSecond64
Ord
             , Ptr MicroSecond64 -> IO MicroSecond64
Ptr MicroSecond64 -> Int -> IO MicroSecond64
Ptr MicroSecond64 -> Int -> MicroSecond64 -> IO ()
Ptr MicroSecond64 -> MicroSecond64 -> IO ()
MicroSecond64 -> Int
(MicroSecond64 -> Int)
-> (MicroSecond64 -> Int)
-> (Ptr MicroSecond64 -> Int -> IO MicroSecond64)
-> (Ptr MicroSecond64 -> Int -> MicroSecond64 -> IO ())
-> (forall b. Ptr b -> Int -> IO MicroSecond64)
-> (forall b. Ptr b -> Int -> MicroSecond64 -> IO ())
-> (Ptr MicroSecond64 -> IO MicroSecond64)
-> (Ptr MicroSecond64 -> MicroSecond64 -> IO ())
-> Storable MicroSecond64
forall b. Ptr b -> Int -> IO MicroSecond64
forall b. Ptr b -> Int -> MicroSecond64 -> IO ()
forall a.
(a -> Int)
-> (a -> Int)
-> (Ptr a -> Int -> IO a)
-> (Ptr a -> Int -> a -> IO ())
-> (forall b. Ptr b -> Int -> IO a)
-> (forall b. Ptr b -> Int -> a -> IO ())
-> (Ptr a -> IO a)
-> (Ptr a -> a -> IO ())
-> Storable a
$csizeOf :: MicroSecond64 -> Int
sizeOf :: MicroSecond64 -> Int
$calignment :: MicroSecond64 -> Int
alignment :: MicroSecond64 -> Int
$cpeekElemOff :: Ptr MicroSecond64 -> Int -> IO MicroSecond64
peekElemOff :: Ptr MicroSecond64 -> Int -> IO MicroSecond64
$cpokeElemOff :: Ptr MicroSecond64 -> Int -> MicroSecond64 -> IO ()
pokeElemOff :: Ptr MicroSecond64 -> Int -> MicroSecond64 -> IO ()
$cpeekByteOff :: forall b. Ptr b -> Int -> IO MicroSecond64
peekByteOff :: forall b. Ptr b -> Int -> IO MicroSecond64
$cpokeByteOff :: forall b. Ptr b -> Int -> MicroSecond64 -> IO ()
pokeByteOff :: forall b. Ptr b -> Int -> MicroSecond64 -> IO ()
$cpeek :: Ptr MicroSecond64 -> IO MicroSecond64
peek :: Ptr MicroSecond64 -> IO MicroSecond64
$cpoke :: Ptr MicroSecond64 -> MicroSecond64 -> IO ()
poke :: Ptr MicroSecond64 -> MicroSecond64 -> IO ()
Storable
             , Int -> MutByteArray -> IO MicroSecond64
Int -> MutByteArray -> MicroSecond64 -> IO ()
Proxy MicroSecond64 -> Int
(Proxy MicroSecond64 -> Int)
-> (Int -> MutByteArray -> IO MicroSecond64)
-> (Int -> MutByteArray -> IO MicroSecond64)
-> (Int -> MutByteArray -> MicroSecond64 -> IO ())
-> (Int -> MutByteArray -> MicroSecond64 -> IO ())
-> Unbox MicroSecond64
forall a.
(Proxy a -> Int)
-> (Int -> MutByteArray -> IO a)
-> (Int -> MutByteArray -> IO a)
-> (Int -> MutByteArray -> a -> IO ())
-> (Int -> MutByteArray -> a -> IO ())
-> Unbox a
$csizeOf :: Proxy MicroSecond64 -> Int
sizeOf :: Proxy MicroSecond64 -> Int
$cpeekAt :: Int -> MutByteArray -> IO MicroSecond64
peekAt :: Int -> MutByteArray -> IO MicroSecond64
$cpeekByteIndex :: Int -> MutByteArray -> IO MicroSecond64
peekByteIndex :: Int -> MutByteArray -> IO MicroSecond64
$cpokeAt :: Int -> MutByteArray -> MicroSecond64 -> IO ()
pokeAt :: Int -> MutByteArray -> MicroSecond64 -> IO ()
$cpokeByteIndex :: Int -> MutByteArray -> MicroSecond64 -> IO ()
pokeByteIndex :: Int -> MutByteArray -> MicroSecond64 -> IO ()
Unbox
             )
newtype MilliSecond64 = MilliSecond64 Int64
    deriving ( MilliSecond64 -> MilliSecond64 -> Bool
(MilliSecond64 -> MilliSecond64 -> Bool)
-> (MilliSecond64 -> MilliSecond64 -> Bool) -> Eq MilliSecond64
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: MilliSecond64 -> MilliSecond64 -> Bool
== :: MilliSecond64 -> MilliSecond64 -> Bool
$c/= :: MilliSecond64 -> MilliSecond64 -> Bool
/= :: MilliSecond64 -> MilliSecond64 -> Bool
Eq
             , ReadPrec [MilliSecond64]
ReadPrec MilliSecond64
Int -> ReadS MilliSecond64
ReadS [MilliSecond64]
(Int -> ReadS MilliSecond64)
-> ReadS [MilliSecond64]
-> ReadPrec MilliSecond64
-> ReadPrec [MilliSecond64]
-> Read MilliSecond64
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
$creadsPrec :: Int -> ReadS MilliSecond64
readsPrec :: Int -> ReadS MilliSecond64
$creadList :: ReadS [MilliSecond64]
readList :: ReadS [MilliSecond64]
$creadPrec :: ReadPrec MilliSecond64
readPrec :: ReadPrec MilliSecond64
$creadListPrec :: ReadPrec [MilliSecond64]
readListPrec :: ReadPrec [MilliSecond64]
Read
             , Int -> MilliSecond64 -> ShowS
[MilliSecond64] -> ShowS
MilliSecond64 -> String
(Int -> MilliSecond64 -> ShowS)
-> (MilliSecond64 -> String)
-> ([MilliSecond64] -> ShowS)
-> Show MilliSecond64
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> MilliSecond64 -> ShowS
showsPrec :: Int -> MilliSecond64 -> ShowS
$cshow :: MilliSecond64 -> String
show :: MilliSecond64 -> String
$cshowList :: [MilliSecond64] -> ShowS
showList :: [MilliSecond64] -> ShowS
Show
             , Int -> MilliSecond64
MilliSecond64 -> Int
MilliSecond64 -> [MilliSecond64]
MilliSecond64 -> MilliSecond64
MilliSecond64 -> MilliSecond64 -> [MilliSecond64]
MilliSecond64 -> MilliSecond64 -> MilliSecond64 -> [MilliSecond64]
(MilliSecond64 -> MilliSecond64)
-> (MilliSecond64 -> MilliSecond64)
-> (Int -> MilliSecond64)
-> (MilliSecond64 -> Int)
-> (MilliSecond64 -> [MilliSecond64])
-> (MilliSecond64 -> MilliSecond64 -> [MilliSecond64])
-> (MilliSecond64 -> MilliSecond64 -> [MilliSecond64])
-> (MilliSecond64
    -> MilliSecond64 -> MilliSecond64 -> [MilliSecond64])
-> Enum MilliSecond64
forall a.
(a -> a)
-> (a -> a)
-> (Int -> a)
-> (a -> Int)
-> (a -> [a])
-> (a -> a -> [a])
-> (a -> a -> [a])
-> (a -> a -> a -> [a])
-> Enum a
$csucc :: MilliSecond64 -> MilliSecond64
succ :: MilliSecond64 -> MilliSecond64
$cpred :: MilliSecond64 -> MilliSecond64
pred :: MilliSecond64 -> MilliSecond64
$ctoEnum :: Int -> MilliSecond64
toEnum :: Int -> MilliSecond64
$cfromEnum :: MilliSecond64 -> Int
fromEnum :: MilliSecond64 -> Int
$cenumFrom :: MilliSecond64 -> [MilliSecond64]
enumFrom :: MilliSecond64 -> [MilliSecond64]
$cenumFromThen :: MilliSecond64 -> MilliSecond64 -> [MilliSecond64]
enumFromThen :: MilliSecond64 -> MilliSecond64 -> [MilliSecond64]
$cenumFromTo :: MilliSecond64 -> MilliSecond64 -> [MilliSecond64]
enumFromTo :: MilliSecond64 -> MilliSecond64 -> [MilliSecond64]
$cenumFromThenTo :: MilliSecond64 -> MilliSecond64 -> MilliSecond64 -> [MilliSecond64]
enumFromThenTo :: MilliSecond64 -> MilliSecond64 -> MilliSecond64 -> [MilliSecond64]
Enum
             , MilliSecond64
MilliSecond64 -> MilliSecond64 -> Bounded MilliSecond64
forall a. a -> a -> Bounded a
$cminBound :: MilliSecond64
minBound :: MilliSecond64
$cmaxBound :: MilliSecond64
maxBound :: MilliSecond64
Bounded
             , Integer -> MilliSecond64
MilliSecond64 -> MilliSecond64
MilliSecond64 -> MilliSecond64 -> MilliSecond64
(MilliSecond64 -> MilliSecond64 -> MilliSecond64)
-> (MilliSecond64 -> MilliSecond64 -> MilliSecond64)
-> (MilliSecond64 -> MilliSecond64 -> MilliSecond64)
-> (MilliSecond64 -> MilliSecond64)
-> (MilliSecond64 -> MilliSecond64)
-> (MilliSecond64 -> MilliSecond64)
-> (Integer -> MilliSecond64)
-> Num MilliSecond64
forall a.
(a -> a -> a)
-> (a -> a -> a)
-> (a -> a -> a)
-> (a -> a)
-> (a -> a)
-> (a -> a)
-> (Integer -> a)
-> Num a
$c+ :: MilliSecond64 -> MilliSecond64 -> MilliSecond64
+ :: MilliSecond64 -> MilliSecond64 -> MilliSecond64
$c- :: MilliSecond64 -> MilliSecond64 -> MilliSecond64
- :: MilliSecond64 -> MilliSecond64 -> MilliSecond64
$c* :: MilliSecond64 -> MilliSecond64 -> MilliSecond64
* :: MilliSecond64 -> MilliSecond64 -> MilliSecond64
$cnegate :: MilliSecond64 -> MilliSecond64
negate :: MilliSecond64 -> MilliSecond64
$cabs :: MilliSecond64 -> MilliSecond64
abs :: MilliSecond64 -> MilliSecond64
$csignum :: MilliSecond64 -> MilliSecond64
signum :: MilliSecond64 -> MilliSecond64
$cfromInteger :: Integer -> MilliSecond64
fromInteger :: Integer -> MilliSecond64
Num
             , Num MilliSecond64
Ord MilliSecond64
(Num MilliSecond64, Ord MilliSecond64) =>
(MilliSecond64 -> Rational) -> Real MilliSecond64
MilliSecond64 -> Rational
forall a. (Num a, Ord a) => (a -> Rational) -> Real a
$ctoRational :: MilliSecond64 -> Rational
toRational :: MilliSecond64 -> Rational
Real
             , Enum MilliSecond64
Real MilliSecond64
(Real MilliSecond64, Enum MilliSecond64) =>
(MilliSecond64 -> MilliSecond64 -> MilliSecond64)
-> (MilliSecond64 -> MilliSecond64 -> MilliSecond64)
-> (MilliSecond64 -> MilliSecond64 -> MilliSecond64)
-> (MilliSecond64 -> MilliSecond64 -> MilliSecond64)
-> (MilliSecond64
    -> MilliSecond64 -> (MilliSecond64, MilliSecond64))
-> (MilliSecond64
    -> MilliSecond64 -> (MilliSecond64, MilliSecond64))
-> (MilliSecond64 -> Integer)
-> Integral MilliSecond64
MilliSecond64 -> Integer
MilliSecond64 -> MilliSecond64 -> (MilliSecond64, MilliSecond64)
MilliSecond64 -> MilliSecond64 -> MilliSecond64
forall a.
(Real a, Enum a) =>
(a -> a -> a)
-> (a -> a -> a)
-> (a -> a -> a)
-> (a -> a -> a)
-> (a -> a -> (a, a))
-> (a -> a -> (a, a))
-> (a -> Integer)
-> Integral a
$cquot :: MilliSecond64 -> MilliSecond64 -> MilliSecond64
quot :: MilliSecond64 -> MilliSecond64 -> MilliSecond64
$crem :: MilliSecond64 -> MilliSecond64 -> MilliSecond64
rem :: MilliSecond64 -> MilliSecond64 -> MilliSecond64
$cdiv :: MilliSecond64 -> MilliSecond64 -> MilliSecond64
div :: MilliSecond64 -> MilliSecond64 -> MilliSecond64
$cmod :: MilliSecond64 -> MilliSecond64 -> MilliSecond64
mod :: MilliSecond64 -> MilliSecond64 -> MilliSecond64
$cquotRem :: MilliSecond64 -> MilliSecond64 -> (MilliSecond64, MilliSecond64)
quotRem :: MilliSecond64 -> MilliSecond64 -> (MilliSecond64, MilliSecond64)
$cdivMod :: MilliSecond64 -> MilliSecond64 -> (MilliSecond64, MilliSecond64)
divMod :: MilliSecond64 -> MilliSecond64 -> (MilliSecond64, MilliSecond64)
$ctoInteger :: MilliSecond64 -> Integer
toInteger :: MilliSecond64 -> Integer
Integral
             , Eq MilliSecond64
Eq MilliSecond64 =>
(MilliSecond64 -> MilliSecond64 -> Ordering)
-> (MilliSecond64 -> MilliSecond64 -> Bool)
-> (MilliSecond64 -> MilliSecond64 -> Bool)
-> (MilliSecond64 -> MilliSecond64 -> Bool)
-> (MilliSecond64 -> MilliSecond64 -> Bool)
-> (MilliSecond64 -> MilliSecond64 -> MilliSecond64)
-> (MilliSecond64 -> MilliSecond64 -> MilliSecond64)
-> Ord MilliSecond64
MilliSecond64 -> MilliSecond64 -> Bool
MilliSecond64 -> MilliSecond64 -> Ordering
MilliSecond64 -> MilliSecond64 -> MilliSecond64
forall a.
Eq a =>
(a -> a -> Ordering)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> a)
-> (a -> a -> a)
-> Ord a
$ccompare :: MilliSecond64 -> MilliSecond64 -> Ordering
compare :: MilliSecond64 -> MilliSecond64 -> Ordering
$c< :: MilliSecond64 -> MilliSecond64 -> Bool
< :: MilliSecond64 -> MilliSecond64 -> Bool
$c<= :: MilliSecond64 -> MilliSecond64 -> Bool
<= :: MilliSecond64 -> MilliSecond64 -> Bool
$c> :: MilliSecond64 -> MilliSecond64 -> Bool
> :: MilliSecond64 -> MilliSecond64 -> Bool
$c>= :: MilliSecond64 -> MilliSecond64 -> Bool
>= :: MilliSecond64 -> MilliSecond64 -> Bool
$cmax :: MilliSecond64 -> MilliSecond64 -> MilliSecond64
max :: MilliSecond64 -> MilliSecond64 -> MilliSecond64
$cmin :: MilliSecond64 -> MilliSecond64 -> MilliSecond64
min :: MilliSecond64 -> MilliSecond64 -> MilliSecond64
Ord
             , Ptr MilliSecond64 -> IO MilliSecond64
Ptr MilliSecond64 -> Int -> IO MilliSecond64
Ptr MilliSecond64 -> Int -> MilliSecond64 -> IO ()
Ptr MilliSecond64 -> MilliSecond64 -> IO ()
MilliSecond64 -> Int
(MilliSecond64 -> Int)
-> (MilliSecond64 -> Int)
-> (Ptr MilliSecond64 -> Int -> IO MilliSecond64)
-> (Ptr MilliSecond64 -> Int -> MilliSecond64 -> IO ())
-> (forall b. Ptr b -> Int -> IO MilliSecond64)
-> (forall b. Ptr b -> Int -> MilliSecond64 -> IO ())
-> (Ptr MilliSecond64 -> IO MilliSecond64)
-> (Ptr MilliSecond64 -> MilliSecond64 -> IO ())
-> Storable MilliSecond64
forall b. Ptr b -> Int -> IO MilliSecond64
forall b. Ptr b -> Int -> MilliSecond64 -> IO ()
forall a.
(a -> Int)
-> (a -> Int)
-> (Ptr a -> Int -> IO a)
-> (Ptr a -> Int -> a -> IO ())
-> (forall b. Ptr b -> Int -> IO a)
-> (forall b. Ptr b -> Int -> a -> IO ())
-> (Ptr a -> IO a)
-> (Ptr a -> a -> IO ())
-> Storable a
$csizeOf :: MilliSecond64 -> Int
sizeOf :: MilliSecond64 -> Int
$calignment :: MilliSecond64 -> Int
alignment :: MilliSecond64 -> Int
$cpeekElemOff :: Ptr MilliSecond64 -> Int -> IO MilliSecond64
peekElemOff :: Ptr MilliSecond64 -> Int -> IO MilliSecond64
$cpokeElemOff :: Ptr MilliSecond64 -> Int -> MilliSecond64 -> IO ()
pokeElemOff :: Ptr MilliSecond64 -> Int -> MilliSecond64 -> IO ()
$cpeekByteOff :: forall b. Ptr b -> Int -> IO MilliSecond64
peekByteOff :: forall b. Ptr b -> Int -> IO MilliSecond64
$cpokeByteOff :: forall b. Ptr b -> Int -> MilliSecond64 -> IO ()
pokeByteOff :: forall b. Ptr b -> Int -> MilliSecond64 -> IO ()
$cpeek :: Ptr MilliSecond64 -> IO MilliSecond64
peek :: Ptr MilliSecond64 -> IO MilliSecond64
$cpoke :: Ptr MilliSecond64 -> MilliSecond64 -> IO ()
poke :: Ptr MilliSecond64 -> MilliSecond64 -> IO ()
Storable
             , Int -> MutByteArray -> IO MilliSecond64
Int -> MutByteArray -> MilliSecond64 -> IO ()
Proxy MilliSecond64 -> Int
(Proxy MilliSecond64 -> Int)
-> (Int -> MutByteArray -> IO MilliSecond64)
-> (Int -> MutByteArray -> IO MilliSecond64)
-> (Int -> MutByteArray -> MilliSecond64 -> IO ())
-> (Int -> MutByteArray -> MilliSecond64 -> IO ())
-> Unbox MilliSecond64
forall a.
(Proxy a -> Int)
-> (Int -> MutByteArray -> IO a)
-> (Int -> MutByteArray -> IO a)
-> (Int -> MutByteArray -> a -> IO ())
-> (Int -> MutByteArray -> a -> IO ())
-> Unbox a
$csizeOf :: Proxy MilliSecond64 -> Int
sizeOf :: Proxy MilliSecond64 -> Int
$cpeekAt :: Int -> MutByteArray -> IO MilliSecond64
peekAt :: Int -> MutByteArray -> IO MilliSecond64
$cpeekByteIndex :: Int -> MutByteArray -> IO MilliSecond64
peekByteIndex :: Int -> MutByteArray -> IO MilliSecond64
$cpokeAt :: Int -> MutByteArray -> MilliSecond64 -> IO ()
pokeAt :: Int -> MutByteArray -> MilliSecond64 -> IO ()
$cpokeByteIndex :: Int -> MutByteArray -> MilliSecond64 -> IO ()
pokeByteIndex :: Int -> MutByteArray -> MilliSecond64 -> IO ()
Unbox
             )
class TimeUnit a where
    toTimeSpec   :: a -> TimeSpec
    fromTimeSpec :: TimeSpec -> a
class TimeUnit64 a where
    toNanoSecond64   :: a -> NanoSecond64
    fromNanoSecond64 :: NanoSecond64 -> a
instance TimeUnit TimeSpec where
    toTimeSpec :: TimeSpec -> TimeSpec
toTimeSpec = TimeSpec -> TimeSpec
forall a. a -> a
id
    fromTimeSpec :: TimeSpec -> TimeSpec
fromTimeSpec = TimeSpec -> TimeSpec
forall a. a -> a
id
instance TimeUnit NanoSecond64 where
    {-# INLINE toTimeSpec #-}
    toTimeSpec :: NanoSecond64 -> TimeSpec
toTimeSpec (NanoSecond64 Int64
t) = Int64 -> Int64 -> TimeSpec
TimeSpec Int64
s Int64
ns
        where (Int64
s, Int64
ns) = Int64
t Int64 -> Int64 -> (Int64, Int64)
forall a. Integral a => a -> a -> (a, a)
`divMod` Int64
tenPower9
    {-# INLINE fromTimeSpec #-}
    fromTimeSpec :: TimeSpec -> NanoSecond64
fromTimeSpec (TimeSpec Int64
s Int64
ns) =
        Int64 -> NanoSecond64
NanoSecond64 (Int64 -> NanoSecond64) -> Int64 -> NanoSecond64
forall a b. (a -> b) -> a -> b
$ Int64
s Int64 -> Int64 -> Int64
forall a. Num a => a -> a -> a
* Int64
tenPower9 Int64 -> Int64 -> Int64
forall a. Num a => a -> a -> a
+ Int64
ns
instance TimeUnit64 NanoSecond64 where
    {-# INLINE toNanoSecond64 #-}
    toNanoSecond64 :: NanoSecond64 -> NanoSecond64
toNanoSecond64 = NanoSecond64 -> NanoSecond64
forall a. a -> a
id
    {-# INLINE fromNanoSecond64 #-}
    fromNanoSecond64 :: NanoSecond64 -> NanoSecond64
fromNanoSecond64 = NanoSecond64 -> NanoSecond64
forall a. a -> a
id
instance TimeUnit MicroSecond64 where
    {-# INLINE toTimeSpec #-}
    toTimeSpec :: MicroSecond64 -> TimeSpec
toTimeSpec (MicroSecond64 Int64
t) = Int64 -> Int64 -> TimeSpec
TimeSpec Int64
s (Int64
us Int64 -> Int64 -> Int64
forall a. Num a => a -> a -> a
* Int64
tenPower3)
        where (Int64
s, Int64
us) = Int64
t Int64 -> Int64 -> (Int64, Int64)
forall a. Integral a => a -> a -> (a, a)
`divMod` Int64
tenPower6
    {-# INLINE fromTimeSpec #-}
    fromTimeSpec :: TimeSpec -> MicroSecond64
fromTimeSpec (TimeSpec Int64
s Int64
ns) =
        
        Int64 -> MicroSecond64
MicroSecond64 (Int64 -> MicroSecond64) -> Int64 -> MicroSecond64
forall a b. (a -> b) -> a -> b
$ Int64
s Int64 -> Int64 -> Int64
forall a. Num a => a -> a -> a
* Int64
tenPower6 Int64 -> Int64 -> Int64
forall a. Num a => a -> a -> a
+ (Int64
ns Int64 -> Int64 -> Int64
forall a. Integral a => a -> a -> a
`div` Int64
tenPower3)
instance TimeUnit64 MicroSecond64 where
    {-# INLINE toNanoSecond64 #-}
    toNanoSecond64 :: MicroSecond64 -> NanoSecond64
toNanoSecond64 (MicroSecond64 Int64
us) = Int64 -> NanoSecond64
NanoSecond64 (Int64 -> NanoSecond64) -> Int64 -> NanoSecond64
forall a b. (a -> b) -> a -> b
$ Int64
us Int64 -> Int64 -> Int64
forall a. Num a => a -> a -> a
* Int64
tenPower3
    {-# INLINE fromNanoSecond64 #-}
    
    fromNanoSecond64 :: NanoSecond64 -> MicroSecond64
fromNanoSecond64 (NanoSecond64 Int64
ns) = Int64 -> MicroSecond64
MicroSecond64 (Int64 -> MicroSecond64) -> Int64 -> MicroSecond64
forall a b. (a -> b) -> a -> b
$ Int64
ns Int64 -> Int64 -> Int64
forall a. Integral a => a -> a -> a
`div` Int64
tenPower3
instance TimeUnit MilliSecond64 where
    {-# INLINE toTimeSpec #-}
    toTimeSpec :: MilliSecond64 -> TimeSpec
toTimeSpec (MilliSecond64 Int64
t) = Int64 -> Int64 -> TimeSpec
TimeSpec Int64
s (Int64
ms Int64 -> Int64 -> Int64
forall a. Num a => a -> a -> a
* Int64
tenPower6)
        where (Int64
s, Int64
ms) = Int64
t Int64 -> Int64 -> (Int64, Int64)
forall a. Integral a => a -> a -> (a, a)
`divMod` Int64
tenPower3
    {-# INLINE fromTimeSpec #-}
    fromTimeSpec :: TimeSpec -> MilliSecond64
fromTimeSpec (TimeSpec Int64
s Int64
ns) =
        
        Int64 -> MilliSecond64
MilliSecond64 (Int64 -> MilliSecond64) -> Int64 -> MilliSecond64
forall a b. (a -> b) -> a -> b
$ Int64
s Int64 -> Int64 -> Int64
forall a. Num a => a -> a -> a
* Int64
tenPower3 Int64 -> Int64 -> Int64
forall a. Num a => a -> a -> a
+ (Int64
ns Int64 -> Int64 -> Int64
forall a. Integral a => a -> a -> a
`div` Int64
tenPower6)
instance TimeUnit64 MilliSecond64 where
    {-# INLINE toNanoSecond64 #-}
    toNanoSecond64 :: MilliSecond64 -> NanoSecond64
toNanoSecond64 (MilliSecond64 Int64
ms) = Int64 -> NanoSecond64
NanoSecond64 (Int64 -> NanoSecond64) -> Int64 -> NanoSecond64
forall a b. (a -> b) -> a -> b
$ Int64
ms Int64 -> Int64 -> Int64
forall a. Num a => a -> a -> a
* Int64
tenPower6
    {-# INLINE fromNanoSecond64 #-}
    
    fromNanoSecond64 :: NanoSecond64 -> MilliSecond64
fromNanoSecond64 (NanoSecond64 Int64
ns) = Int64 -> MilliSecond64
MilliSecond64 (Int64 -> MilliSecond64) -> Int64 -> MilliSecond64
forall a b. (a -> b) -> a -> b
$ Int64
ns Int64 -> Int64 -> Int64
forall a. Integral a => a -> a -> a
`div` Int64
tenPower6
newtype AbsTime = AbsTime TimeSpec
    deriving (AbsTime -> AbsTime -> Bool
(AbsTime -> AbsTime -> Bool)
-> (AbsTime -> AbsTime -> Bool) -> Eq AbsTime
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: AbsTime -> AbsTime -> Bool
== :: AbsTime -> AbsTime -> Bool
$c/= :: AbsTime -> AbsTime -> Bool
/= :: AbsTime -> AbsTime -> Bool
Eq, Eq AbsTime
Eq AbsTime =>
(AbsTime -> AbsTime -> Ordering)
-> (AbsTime -> AbsTime -> Bool)
-> (AbsTime -> AbsTime -> Bool)
-> (AbsTime -> AbsTime -> Bool)
-> (AbsTime -> AbsTime -> Bool)
-> (AbsTime -> AbsTime -> AbsTime)
-> (AbsTime -> AbsTime -> AbsTime)
-> Ord AbsTime
AbsTime -> AbsTime -> Bool
AbsTime -> AbsTime -> Ordering
AbsTime -> AbsTime -> AbsTime
forall a.
Eq a =>
(a -> a -> Ordering)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> a)
-> (a -> a -> a)
-> Ord a
$ccompare :: AbsTime -> AbsTime -> Ordering
compare :: AbsTime -> AbsTime -> Ordering
$c< :: AbsTime -> AbsTime -> Bool
< :: AbsTime -> AbsTime -> Bool
$c<= :: AbsTime -> AbsTime -> Bool
<= :: AbsTime -> AbsTime -> Bool
$c> :: AbsTime -> AbsTime -> Bool
> :: AbsTime -> AbsTime -> Bool
$c>= :: AbsTime -> AbsTime -> Bool
>= :: AbsTime -> AbsTime -> Bool
$cmax :: AbsTime -> AbsTime -> AbsTime
max :: AbsTime -> AbsTime -> AbsTime
$cmin :: AbsTime -> AbsTime -> AbsTime
min :: AbsTime -> AbsTime -> AbsTime
Ord, Int -> AbsTime -> ShowS
[AbsTime] -> ShowS
AbsTime -> String
(Int -> AbsTime -> ShowS)
-> (AbsTime -> String) -> ([AbsTime] -> ShowS) -> Show AbsTime
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> AbsTime -> ShowS
showsPrec :: Int -> AbsTime -> ShowS
$cshow :: AbsTime -> String
show :: AbsTime -> String
$cshowList :: [AbsTime] -> ShowS
showList :: [AbsTime] -> ShowS
Show)
{-# INLINE_NORMAL toAbsTime #-}
toAbsTime :: TimeUnit a => a -> AbsTime
toAbsTime :: forall a. TimeUnit a => a -> AbsTime
toAbsTime = TimeSpec -> AbsTime
AbsTime (TimeSpec -> AbsTime) -> (a -> TimeSpec) -> a -> AbsTime
forall b c a. (b -> c) -> (a -> b) -> a -> c
. a -> TimeSpec
forall a. TimeUnit a => a -> TimeSpec
toTimeSpec
{-# INLINE_NORMAL fromAbsTime #-}
fromAbsTime :: TimeUnit a => AbsTime -> a
fromAbsTime :: forall a. TimeUnit a => AbsTime -> a
fromAbsTime (AbsTime TimeSpec
t) = TimeSpec -> a
forall a. TimeUnit a => TimeSpec -> a
fromTimeSpec TimeSpec
t
{-# RULES "fromAbsTime/toAbsTime" forall a. toAbsTime (fromAbsTime a) = a #-}
{-# RULES "toAbsTime/fromAbsTime" forall a. fromAbsTime (toAbsTime a) = a #-}
newtype RelTime64 = RelTime64 NanoSecond64
    deriving ( RelTime64 -> RelTime64 -> Bool
(RelTime64 -> RelTime64 -> Bool)
-> (RelTime64 -> RelTime64 -> Bool) -> Eq RelTime64
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: RelTime64 -> RelTime64 -> Bool
== :: RelTime64 -> RelTime64 -> Bool
$c/= :: RelTime64 -> RelTime64 -> Bool
/= :: RelTime64 -> RelTime64 -> Bool
Eq
             , ReadPrec [RelTime64]
ReadPrec RelTime64
Int -> ReadS RelTime64
ReadS [RelTime64]
(Int -> ReadS RelTime64)
-> ReadS [RelTime64]
-> ReadPrec RelTime64
-> ReadPrec [RelTime64]
-> Read RelTime64
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
$creadsPrec :: Int -> ReadS RelTime64
readsPrec :: Int -> ReadS RelTime64
$creadList :: ReadS [RelTime64]
readList :: ReadS [RelTime64]
$creadPrec :: ReadPrec RelTime64
readPrec :: ReadPrec RelTime64
$creadListPrec :: ReadPrec [RelTime64]
readListPrec :: ReadPrec [RelTime64]
Read
             , Int -> RelTime64 -> ShowS
[RelTime64] -> ShowS
RelTime64 -> String
(Int -> RelTime64 -> ShowS)
-> (RelTime64 -> String)
-> ([RelTime64] -> ShowS)
-> Show RelTime64
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> RelTime64 -> ShowS
showsPrec :: Int -> RelTime64 -> ShowS
$cshow :: RelTime64 -> String
show :: RelTime64 -> String
$cshowList :: [RelTime64] -> ShowS
showList :: [RelTime64] -> ShowS
Show
             , Int -> RelTime64
RelTime64 -> Int
RelTime64 -> [RelTime64]
RelTime64 -> RelTime64
RelTime64 -> RelTime64 -> [RelTime64]
RelTime64 -> RelTime64 -> RelTime64 -> [RelTime64]
(RelTime64 -> RelTime64)
-> (RelTime64 -> RelTime64)
-> (Int -> RelTime64)
-> (RelTime64 -> Int)
-> (RelTime64 -> [RelTime64])
-> (RelTime64 -> RelTime64 -> [RelTime64])
-> (RelTime64 -> RelTime64 -> [RelTime64])
-> (RelTime64 -> RelTime64 -> RelTime64 -> [RelTime64])
-> Enum RelTime64
forall a.
(a -> a)
-> (a -> a)
-> (Int -> a)
-> (a -> Int)
-> (a -> [a])
-> (a -> a -> [a])
-> (a -> a -> [a])
-> (a -> a -> a -> [a])
-> Enum a
$csucc :: RelTime64 -> RelTime64
succ :: RelTime64 -> RelTime64
$cpred :: RelTime64 -> RelTime64
pred :: RelTime64 -> RelTime64
$ctoEnum :: Int -> RelTime64
toEnum :: Int -> RelTime64
$cfromEnum :: RelTime64 -> Int
fromEnum :: RelTime64 -> Int
$cenumFrom :: RelTime64 -> [RelTime64]
enumFrom :: RelTime64 -> [RelTime64]
$cenumFromThen :: RelTime64 -> RelTime64 -> [RelTime64]
enumFromThen :: RelTime64 -> RelTime64 -> [RelTime64]
$cenumFromTo :: RelTime64 -> RelTime64 -> [RelTime64]
enumFromTo :: RelTime64 -> RelTime64 -> [RelTime64]
$cenumFromThenTo :: RelTime64 -> RelTime64 -> RelTime64 -> [RelTime64]
enumFromThenTo :: RelTime64 -> RelTime64 -> RelTime64 -> [RelTime64]
Enum
             , RelTime64
RelTime64 -> RelTime64 -> Bounded RelTime64
forall a. a -> a -> Bounded a
$cminBound :: RelTime64
minBound :: RelTime64
$cmaxBound :: RelTime64
maxBound :: RelTime64
Bounded
             , Integer -> RelTime64
RelTime64 -> RelTime64
RelTime64 -> RelTime64 -> RelTime64
(RelTime64 -> RelTime64 -> RelTime64)
-> (RelTime64 -> RelTime64 -> RelTime64)
-> (RelTime64 -> RelTime64 -> RelTime64)
-> (RelTime64 -> RelTime64)
-> (RelTime64 -> RelTime64)
-> (RelTime64 -> RelTime64)
-> (Integer -> RelTime64)
-> Num RelTime64
forall a.
(a -> a -> a)
-> (a -> a -> a)
-> (a -> a -> a)
-> (a -> a)
-> (a -> a)
-> (a -> a)
-> (Integer -> a)
-> Num a
$c+ :: RelTime64 -> RelTime64 -> RelTime64
+ :: RelTime64 -> RelTime64 -> RelTime64
$c- :: RelTime64 -> RelTime64 -> RelTime64
- :: RelTime64 -> RelTime64 -> RelTime64
$c* :: RelTime64 -> RelTime64 -> RelTime64
* :: RelTime64 -> RelTime64 -> RelTime64
$cnegate :: RelTime64 -> RelTime64
negate :: RelTime64 -> RelTime64
$cabs :: RelTime64 -> RelTime64
abs :: RelTime64 -> RelTime64
$csignum :: RelTime64 -> RelTime64
signum :: RelTime64 -> RelTime64
$cfromInteger :: Integer -> RelTime64
fromInteger :: Integer -> RelTime64
Num
             , Num RelTime64
Ord RelTime64
(Num RelTime64, Ord RelTime64) =>
(RelTime64 -> Rational) -> Real RelTime64
RelTime64 -> Rational
forall a. (Num a, Ord a) => (a -> Rational) -> Real a
$ctoRational :: RelTime64 -> Rational
toRational :: RelTime64 -> Rational
Real
             , Enum RelTime64
Real RelTime64
(Real RelTime64, Enum RelTime64) =>
(RelTime64 -> RelTime64 -> RelTime64)
-> (RelTime64 -> RelTime64 -> RelTime64)
-> (RelTime64 -> RelTime64 -> RelTime64)
-> (RelTime64 -> RelTime64 -> RelTime64)
-> (RelTime64 -> RelTime64 -> (RelTime64, RelTime64))
-> (RelTime64 -> RelTime64 -> (RelTime64, RelTime64))
-> (RelTime64 -> Integer)
-> Integral RelTime64
RelTime64 -> Integer
RelTime64 -> RelTime64 -> (RelTime64, RelTime64)
RelTime64 -> RelTime64 -> RelTime64
forall a.
(Real a, Enum a) =>
(a -> a -> a)
-> (a -> a -> a)
-> (a -> a -> a)
-> (a -> a -> a)
-> (a -> a -> (a, a))
-> (a -> a -> (a, a))
-> (a -> Integer)
-> Integral a
$cquot :: RelTime64 -> RelTime64 -> RelTime64
quot :: RelTime64 -> RelTime64 -> RelTime64
$crem :: RelTime64 -> RelTime64 -> RelTime64
rem :: RelTime64 -> RelTime64 -> RelTime64
$cdiv :: RelTime64 -> RelTime64 -> RelTime64
div :: RelTime64 -> RelTime64 -> RelTime64
$cmod :: RelTime64 -> RelTime64 -> RelTime64
mod :: RelTime64 -> RelTime64 -> RelTime64
$cquotRem :: RelTime64 -> RelTime64 -> (RelTime64, RelTime64)
quotRem :: RelTime64 -> RelTime64 -> (RelTime64, RelTime64)
$cdivMod :: RelTime64 -> RelTime64 -> (RelTime64, RelTime64)
divMod :: RelTime64 -> RelTime64 -> (RelTime64, RelTime64)
$ctoInteger :: RelTime64 -> Integer
toInteger :: RelTime64 -> Integer
Integral
             , Eq RelTime64
Eq RelTime64 =>
(RelTime64 -> RelTime64 -> Ordering)
-> (RelTime64 -> RelTime64 -> Bool)
-> (RelTime64 -> RelTime64 -> Bool)
-> (RelTime64 -> RelTime64 -> Bool)
-> (RelTime64 -> RelTime64 -> Bool)
-> (RelTime64 -> RelTime64 -> RelTime64)
-> (RelTime64 -> RelTime64 -> RelTime64)
-> Ord RelTime64
RelTime64 -> RelTime64 -> Bool
RelTime64 -> RelTime64 -> Ordering
RelTime64 -> RelTime64 -> RelTime64
forall a.
Eq a =>
(a -> a -> Ordering)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> a)
-> (a -> a -> a)
-> Ord a
$ccompare :: RelTime64 -> RelTime64 -> Ordering
compare :: RelTime64 -> RelTime64 -> Ordering
$c< :: RelTime64 -> RelTime64 -> Bool
< :: RelTime64 -> RelTime64 -> Bool
$c<= :: RelTime64 -> RelTime64 -> Bool
<= :: RelTime64 -> RelTime64 -> Bool
$c> :: RelTime64 -> RelTime64 -> Bool
> :: RelTime64 -> RelTime64 -> Bool
$c>= :: RelTime64 -> RelTime64 -> Bool
>= :: RelTime64 -> RelTime64 -> Bool
$cmax :: RelTime64 -> RelTime64 -> RelTime64
max :: RelTime64 -> RelTime64 -> RelTime64
$cmin :: RelTime64 -> RelTime64 -> RelTime64
min :: RelTime64 -> RelTime64 -> RelTime64
Ord
             )
{-# INLINE_NORMAL toRelTime64 #-}
toRelTime64 :: TimeUnit64 a => a -> RelTime64
toRelTime64 :: forall a. TimeUnit64 a => a -> RelTime64
toRelTime64 = NanoSecond64 -> RelTime64
RelTime64 (NanoSecond64 -> RelTime64)
-> (a -> NanoSecond64) -> a -> RelTime64
forall b c a. (b -> c) -> (a -> b) -> a -> c
. a -> NanoSecond64
forall a. TimeUnit64 a => a -> NanoSecond64
toNanoSecond64
{-# INLINE_NORMAL fromRelTime64 #-}
fromRelTime64 :: TimeUnit64 a => RelTime64 -> a
fromRelTime64 :: forall a. TimeUnit64 a => RelTime64 -> a
fromRelTime64 (RelTime64 NanoSecond64
t) = NanoSecond64 -> a
forall a. TimeUnit64 a => NanoSecond64 -> a
fromNanoSecond64 NanoSecond64
t
{-# RULES "fromRelTime64/toRelTime64" forall a .
          toRelTime64 (fromRelTime64 a) = a #-}
{-# RULES "toRelTime64/fromRelTime64" forall a .
          fromRelTime64 (toRelTime64 a) = a #-}
{-# INLINE diffAbsTime64 #-}
diffAbsTime64 :: AbsTime -> AbsTime -> RelTime64
diffAbsTime64 :: AbsTime -> AbsTime -> RelTime64
diffAbsTime64 (AbsTime (TimeSpec Int64
s1 Int64
ns1)) (AbsTime (TimeSpec Int64
s2 Int64
ns2)) =
    NanoSecond64 -> RelTime64
RelTime64 (NanoSecond64 -> RelTime64) -> NanoSecond64 -> RelTime64
forall a b. (a -> b) -> a -> b
$ Int64 -> NanoSecond64
NanoSecond64 (Int64 -> NanoSecond64) -> Int64 -> NanoSecond64
forall a b. (a -> b) -> a -> b
$ ((Int64
s1 Int64 -> Int64 -> Int64
forall a. Num a => a -> a -> a
- Int64
s2) Int64 -> Int64 -> Int64
forall a. Num a => a -> a -> a
* Int64
tenPower9) Int64 -> Int64 -> Int64
forall a. Num a => a -> a -> a
+ (Int64
ns1 Int64 -> Int64 -> Int64
forall a. Num a => a -> a -> a
- Int64
ns2)
{-# INLINE addToAbsTime64 #-}
addToAbsTime64 :: AbsTime -> RelTime64 -> AbsTime
addToAbsTime64 :: AbsTime -> RelTime64 -> AbsTime
addToAbsTime64 (AbsTime (TimeSpec Int64
s1 Int64
ns1)) (RelTime64 (NanoSecond64 Int64
ns2)) =
    TimeSpec -> AbsTime
AbsTime (TimeSpec -> AbsTime) -> TimeSpec -> AbsTime
forall a b. (a -> b) -> a -> b
$ Int64 -> Int64 -> TimeSpec
TimeSpec (Int64
s1 Int64 -> Int64 -> Int64
forall a. Num a => a -> a -> a
+ Int64
s) Int64
ns
    where (Int64
s, Int64
ns) = (Int64
ns1 Int64 -> Int64 -> Int64
forall a. Num a => a -> a -> a
+ Int64
ns2) Int64 -> Int64 -> (Int64, Int64)
forall a. Integral a => a -> a -> (a, a)
`divMod` Int64
tenPower9
newtype RelTime = RelTime TimeSpec
    deriving ( RelTime -> RelTime -> Bool
(RelTime -> RelTime -> Bool)
-> (RelTime -> RelTime -> Bool) -> Eq RelTime
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: RelTime -> RelTime -> Bool
== :: RelTime -> RelTime -> Bool
$c/= :: RelTime -> RelTime -> Bool
/= :: RelTime -> RelTime -> Bool
Eq
             , ReadPrec [RelTime]
ReadPrec RelTime
Int -> ReadS RelTime
ReadS [RelTime]
(Int -> ReadS RelTime)
-> ReadS [RelTime]
-> ReadPrec RelTime
-> ReadPrec [RelTime]
-> Read RelTime
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
$creadsPrec :: Int -> ReadS RelTime
readsPrec :: Int -> ReadS RelTime
$creadList :: ReadS [RelTime]
readList :: ReadS [RelTime]
$creadPrec :: ReadPrec RelTime
readPrec :: ReadPrec RelTime
$creadListPrec :: ReadPrec [RelTime]
readListPrec :: ReadPrec [RelTime]
Read
             , Int -> RelTime -> ShowS
[RelTime] -> ShowS
RelTime -> String
(Int -> RelTime -> ShowS)
-> (RelTime -> String) -> ([RelTime] -> ShowS) -> Show RelTime
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> RelTime -> ShowS
showsPrec :: Int -> RelTime -> ShowS
$cshow :: RelTime -> String
show :: RelTime -> String
$cshowList :: [RelTime] -> ShowS
showList :: [RelTime] -> ShowS
Show
             
             
             , Integer -> RelTime
RelTime -> RelTime
RelTime -> RelTime -> RelTime
(RelTime -> RelTime -> RelTime)
-> (RelTime -> RelTime -> RelTime)
-> (RelTime -> RelTime -> RelTime)
-> (RelTime -> RelTime)
-> (RelTime -> RelTime)
-> (RelTime -> RelTime)
-> (Integer -> RelTime)
-> Num RelTime
forall a.
(a -> a -> a)
-> (a -> a -> a)
-> (a -> a -> a)
-> (a -> a)
-> (a -> a)
-> (a -> a)
-> (Integer -> a)
-> Num a
$c+ :: RelTime -> RelTime -> RelTime
+ :: RelTime -> RelTime -> RelTime
$c- :: RelTime -> RelTime -> RelTime
- :: RelTime -> RelTime -> RelTime
$c* :: RelTime -> RelTime -> RelTime
* :: RelTime -> RelTime -> RelTime
$cnegate :: RelTime -> RelTime
negate :: RelTime -> RelTime
$cabs :: RelTime -> RelTime
abs :: RelTime -> RelTime
$csignum :: RelTime -> RelTime
signum :: RelTime -> RelTime
$cfromInteger :: Integer -> RelTime
fromInteger :: Integer -> RelTime
Num
             
             
             , Eq RelTime
Eq RelTime =>
(RelTime -> RelTime -> Ordering)
-> (RelTime -> RelTime -> Bool)
-> (RelTime -> RelTime -> Bool)
-> (RelTime -> RelTime -> Bool)
-> (RelTime -> RelTime -> Bool)
-> (RelTime -> RelTime -> RelTime)
-> (RelTime -> RelTime -> RelTime)
-> Ord RelTime
RelTime -> RelTime -> Bool
RelTime -> RelTime -> Ordering
RelTime -> RelTime -> RelTime
forall a.
Eq a =>
(a -> a -> Ordering)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> a)
-> (a -> a -> a)
-> Ord a
$ccompare :: RelTime -> RelTime -> Ordering
compare :: RelTime -> RelTime -> Ordering
$c< :: RelTime -> RelTime -> Bool
< :: RelTime -> RelTime -> Bool
$c<= :: RelTime -> RelTime -> Bool
<= :: RelTime -> RelTime -> Bool
$c> :: RelTime -> RelTime -> Bool
> :: RelTime -> RelTime -> Bool
$c>= :: RelTime -> RelTime -> Bool
>= :: RelTime -> RelTime -> Bool
$cmax :: RelTime -> RelTime -> RelTime
max :: RelTime -> RelTime -> RelTime
$cmin :: RelTime -> RelTime -> RelTime
min :: RelTime -> RelTime -> RelTime
Ord
             )
{-# INLINE_NORMAL toRelTime #-}
toRelTime :: TimeUnit a => a -> RelTime
toRelTime :: forall a. TimeUnit a => a -> RelTime
toRelTime = TimeSpec -> RelTime
RelTime (TimeSpec -> RelTime) -> (a -> TimeSpec) -> a -> RelTime
forall b c a. (b -> c) -> (a -> b) -> a -> c
. a -> TimeSpec
forall a. TimeUnit a => a -> TimeSpec
toTimeSpec
{-# INLINE_NORMAL fromRelTime #-}
fromRelTime :: TimeUnit a => RelTime -> a
fromRelTime :: forall a. TimeUnit a => RelTime -> a
fromRelTime (RelTime TimeSpec
t) = TimeSpec -> a
forall a. TimeUnit a => TimeSpec -> a
fromTimeSpec TimeSpec
t
{-# RULES "fromRelTime/toRelTime" forall a. toRelTime (fromRelTime a) = a #-}
{-# RULES "toRelTime/fromRelTime" forall a. fromRelTime (toRelTime a) = a #-}
{-# INLINE diffAbsTime #-}
diffAbsTime :: AbsTime -> AbsTime -> RelTime
diffAbsTime :: AbsTime -> AbsTime -> RelTime
diffAbsTime (AbsTime TimeSpec
t1) (AbsTime TimeSpec
t2) = TimeSpec -> RelTime
RelTime (TimeSpec
t1 TimeSpec -> TimeSpec -> TimeSpec
forall a. Num a => a -> a -> a
- TimeSpec
t2)
{-# INLINE addToAbsTime #-}
addToAbsTime :: AbsTime -> RelTime -> AbsTime
addToAbsTime :: AbsTime -> RelTime -> AbsTime
addToAbsTime (AbsTime TimeSpec
t1) (RelTime TimeSpec
t2) = TimeSpec -> AbsTime
AbsTime (TimeSpec -> AbsTime) -> TimeSpec -> AbsTime
forall a b. (a -> b) -> a -> b
$ TimeSpec
t1 TimeSpec -> TimeSpec -> TimeSpec
forall a. Num a => a -> a -> a
+ TimeSpec
t2
showNanoSecond64 :: NanoSecond64 -> String
showNanoSecond64 :: NanoSecond64 -> String
showNanoSecond64 time :: NanoSecond64
time@(NanoSecond64 Int64
ns)
    | NanoSecond64
time NanoSecond64 -> NanoSecond64 -> Bool
forall a. Ord a => a -> a -> Bool
< NanoSecond64
0    = Char
'-' Char -> ShowS
forall a. a -> [a] -> [a]
: NanoSecond64 -> String
showNanoSecond64 (-NanoSecond64
time)
    | Int64
ns Int64 -> Int64 -> Bool
forall a. Ord a => a -> a -> Bool
< Int64
1000 = Int64 -> Double
forall a b. (Integral a, Num b) => a -> b
fromIntegral Int64
ns Double -> ShowS
forall {t}. PrintfType t => Double -> String -> t
`with` String
"ns"
#ifdef mingw32_HOST_OS
    | ns < 1000000 = (fromIntegral ns / 1000) `with` "us"
#else
    | Int64
ns Int64 -> Int64 -> Bool
forall a. Ord a => a -> a -> Bool
< Int64
1000000 = (Int64 -> Double
forall a b. (Integral a, Num b) => a -> b
fromIntegral Int64
ns Double -> Double -> Double
forall a. Fractional a => a -> a -> a
/ Double
1000) Double -> ShowS
forall {t}. PrintfType t => Double -> String -> t
`with` String
"μs"
#endif
    | Int64
ns Int64 -> Int64 -> Bool
forall a. Ord a => a -> a -> Bool
< Int64
1000000000 = (Int64 -> Double
forall a b. (Integral a, Num b) => a -> b
fromIntegral Int64
ns Double -> Double -> Double
forall a. Fractional a => a -> a -> a
/ Double
1000000) Double -> ShowS
forall {t}. PrintfType t => Double -> String -> t
`with` String
"ms"
    | Int64
ns Int64 -> Int64 -> Bool
forall a. Ord a => a -> a -> Bool
< (Int64
60 Int64 -> Int64 -> Int64
forall a. Num a => a -> a -> a
* Int64
1000000000) = (Int64 -> Double
forall a b. (Integral a, Num b) => a -> b
fromIntegral Int64
ns Double -> Double -> Double
forall a. Fractional a => a -> a -> a
/ Double
1000000000) Double -> ShowS
forall {t}. PrintfType t => Double -> String -> t
`with` String
"s"
    | Int64
ns Int64 -> Int64 -> Bool
forall a. Ord a => a -> a -> Bool
< (Int64
60 Int64 -> Int64 -> Int64
forall a. Num a => a -> a -> a
* Int64
60 Int64 -> Int64 -> Int64
forall a. Num a => a -> a -> a
* Int64
1000000000) =
        (Int64 -> Double
forall a b. (Integral a, Num b) => a -> b
fromIntegral Int64
ns Double -> Double -> Double
forall a. Fractional a => a -> a -> a
/ (Double
60 Double -> Double -> Double
forall a. Num a => a -> a -> a
* Double
1000000000)) Double -> ShowS
forall {t}. PrintfType t => Double -> String -> t
`with` String
"min"
    | Int64
ns Int64 -> Int64 -> Bool
forall a. Ord a => a -> a -> Bool
< (Int64
24 Int64 -> Int64 -> Int64
forall a. Num a => a -> a -> a
* Int64
60 Int64 -> Int64 -> Int64
forall a. Num a => a -> a -> a
* Int64
60 Int64 -> Int64 -> Int64
forall a. Num a => a -> a -> a
* Int64
1000000000) =
        (Int64 -> Double
forall a b. (Integral a, Num b) => a -> b
fromIntegral Int64
ns Double -> Double -> Double
forall a. Fractional a => a -> a -> a
/ (Double
60 Double -> Double -> Double
forall a. Num a => a -> a -> a
* Double
60 Double -> Double -> Double
forall a. Num a => a -> a -> a
* Double
1000000000)) Double -> ShowS
forall {t}. PrintfType t => Double -> String -> t
`with` String
"hr"
    | Int64
ns Int64 -> Int64 -> Bool
forall a. Ord a => a -> a -> Bool
< (Int64
365 Int64 -> Int64 -> Int64
forall a. Num a => a -> a -> a
* Int64
24 Int64 -> Int64 -> Int64
forall a. Num a => a -> a -> a
* Int64
60 Int64 -> Int64 -> Int64
forall a. Num a => a -> a -> a
* Int64
60 Int64 -> Int64 -> Int64
forall a. Num a => a -> a -> a
* Int64
1000000000) =
        (Int64 -> Double
forall a b. (Integral a, Num b) => a -> b
fromIntegral Int64
ns Double -> Double -> Double
forall a. Fractional a => a -> a -> a
/ (Double
24 Double -> Double -> Double
forall a. Num a => a -> a -> a
* Double
60 Double -> Double -> Double
forall a. Num a => a -> a -> a
* Double
60 Double -> Double -> Double
forall a. Num a => a -> a -> a
* Double
1000000000)) Double -> ShowS
forall {t}. PrintfType t => Double -> String -> t
`with` String
"days"
    | Bool
otherwise =
        (Int64 -> Double
forall a b. (Integral a, Num b) => a -> b
fromIntegral Int64
ns Double -> Double -> Double
forall a. Fractional a => a -> a -> a
/ (Double
365 Double -> Double -> Double
forall a. Num a => a -> a -> a
* Double
24 Double -> Double -> Double
forall a. Num a => a -> a -> a
* Double
60 Double -> Double -> Double
forall a. Num a => a -> a -> a
* Double
60 Double -> Double -> Double
forall a. Num a => a -> a -> a
* Double
1000000000)) Double -> ShowS
forall {t}. PrintfType t => Double -> String -> t
`with` String
"years"
     where with :: Double -> String -> t
with (Double
t :: Double) (String
u :: String)
               | Double
t Double -> Double -> Bool
forall a. Ord a => a -> a -> Bool
>= Double
1e9  = String -> Double -> String -> t
forall r. PrintfType r => String -> r
printf String
"%.4g %s" Double
t String
u
               | Double
t Double -> Double -> Bool
forall a. Ord a => a -> a -> Bool
>= Double
1e3  = String -> Double -> String -> t
forall r. PrintfType r => String -> r
printf String
"%.0f %s" Double
t String
u
               | Double
t Double -> Double -> Bool
forall a. Ord a => a -> a -> Bool
>= Double
1e2  = String -> Double -> String -> t
forall r. PrintfType r => String -> r
printf String
"%.1f %s" Double
t String
u
               | Double
t Double -> Double -> Bool
forall a. Ord a => a -> a -> Bool
>= Double
1e1  = String -> Double -> String -> t
forall r. PrintfType r => String -> r
printf String
"%.2f %s" Double
t String
u
               | Bool
otherwise = String -> Double -> String -> t
forall r. PrintfType r => String -> r
printf String
"%.3f %s" Double
t String
u
showRelTime64 :: RelTime64 -> String
showRelTime64 :: RelTime64 -> String
showRelTime64 = NanoSecond64 -> String
showNanoSecond64 (NanoSecond64 -> String)
-> (RelTime64 -> NanoSecond64) -> RelTime64 -> String
forall b c a. (b -> c) -> (a -> b) -> a -> c
. RelTime64 -> NanoSecond64
forall a. TimeUnit64 a => RelTime64 -> a
fromRelTime64