module Box.Socket.Types
( PostSend (..),
SocketStatus (..),
)
where
import GHC.Generics (Generic)
data PostSend = StayOpen | CloseAfter Double deriving ((forall x. PostSend -> Rep PostSend x)
-> (forall x. Rep PostSend x -> PostSend) -> Generic PostSend
forall x. Rep PostSend x -> PostSend
forall x. PostSend -> Rep PostSend x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cfrom :: forall x. PostSend -> Rep PostSend x
from :: forall x. PostSend -> Rep PostSend x
$cto :: forall x. Rep PostSend x -> PostSend
to :: forall x. Rep PostSend x -> PostSend
Generic, PostSend -> PostSend -> Bool
(PostSend -> PostSend -> Bool)
-> (PostSend -> PostSend -> Bool) -> Eq PostSend
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: PostSend -> PostSend -> Bool
== :: PostSend -> PostSend -> Bool
$c/= :: PostSend -> PostSend -> Bool
/= :: PostSend -> PostSend -> Bool
Eq, Int -> PostSend -> ShowS
[PostSend] -> ShowS
PostSend -> String
(Int -> PostSend -> ShowS)
-> (PostSend -> String) -> ([PostSend] -> ShowS) -> Show PostSend
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> PostSend -> ShowS
showsPrec :: Int -> PostSend -> ShowS
$cshow :: PostSend -> String
show :: PostSend -> String
$cshowList :: [PostSend] -> ShowS
showList :: [PostSend] -> ShowS
Show)
data SocketStatus = SocketOpen | SocketClosed | SocketBroken deriving ((forall x. SocketStatus -> Rep SocketStatus x)
-> (forall x. Rep SocketStatus x -> SocketStatus)
-> Generic SocketStatus
forall x. Rep SocketStatus x -> SocketStatus
forall x. SocketStatus -> Rep SocketStatus x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cfrom :: forall x. SocketStatus -> Rep SocketStatus x
from :: forall x. SocketStatus -> Rep SocketStatus x
$cto :: forall x. Rep SocketStatus x -> SocketStatus
to :: forall x. Rep SocketStatus x -> SocketStatus
Generic, SocketStatus -> SocketStatus -> Bool
(SocketStatus -> SocketStatus -> Bool)
-> (SocketStatus -> SocketStatus -> Bool) -> Eq SocketStatus
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: SocketStatus -> SocketStatus -> Bool
== :: SocketStatus -> SocketStatus -> Bool
$c/= :: SocketStatus -> SocketStatus -> Bool
/= :: SocketStatus -> SocketStatus -> Bool
Eq, Int -> SocketStatus -> ShowS
[SocketStatus] -> ShowS
SocketStatus -> String
(Int -> SocketStatus -> ShowS)
-> (SocketStatus -> String)
-> ([SocketStatus] -> ShowS)
-> Show SocketStatus
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> SocketStatus -> ShowS
showsPrec :: Int -> SocketStatus -> ShowS
$cshow :: SocketStatus -> String
show :: SocketStatus -> String
$cshowList :: [SocketStatus] -> ShowS
showList :: [SocketStatus] -> ShowS
Show)