module Preql.Wire.Types where

import           Data.Time (TimeOfDay, TimeZone)

data TimeTZ = TimeTZ !TimeOfDay !TimeZone
    deriving (Int -> TimeTZ -> ShowS
[TimeTZ] -> ShowS
TimeTZ -> String
(Int -> TimeTZ -> ShowS)
-> (TimeTZ -> String) -> ([TimeTZ] -> ShowS) -> Show TimeTZ
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [TimeTZ] -> ShowS
$cshowList :: [TimeTZ] -> ShowS
show :: TimeTZ -> String
$cshow :: TimeTZ -> String
showsPrec :: Int -> TimeTZ -> ShowS
$cshowsPrec :: Int -> TimeTZ -> ShowS
Show, TimeTZ -> TimeTZ -> Bool
(TimeTZ -> TimeTZ -> Bool)
-> (TimeTZ -> TimeTZ -> Bool) -> Eq TimeTZ
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: TimeTZ -> TimeTZ -> Bool
$c/= :: TimeTZ -> TimeTZ -> Bool
== :: TimeTZ -> TimeTZ -> Bool
$c== :: TimeTZ -> TimeTZ -> Bool
Eq)