module Database.EventStore.Internal.EndPoint where
import Prelude (String)
import Database.EventStore.Internal.Prelude
data EndPoint =
EndPoint
{ EndPoint -> String
endPointIp :: !String
, EndPoint -> Int
endPointPort :: !Int
} deriving EndPoint -> EndPoint -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: EndPoint -> EndPoint -> Bool
$c/= :: EndPoint -> EndPoint -> Bool
== :: EndPoint -> EndPoint -> Bool
$c== :: EndPoint -> EndPoint -> Bool
Eq
instance Show EndPoint where
show :: EndPoint -> String
show (EndPoint String
h Int
p) = String
h forall a. Semigroup a => a -> a -> a
<> String
":" forall a. Semigroup a => a -> a -> a
<> forall a. Show a => a -> String
show Int
p
emptyEndPoint :: EndPoint
emptyEndPoint :: EndPoint
emptyEndPoint = String -> Int -> EndPoint
EndPoint String
"" Int
0
data NodeEndPoints =
NodeEndPoints
{ NodeEndPoints -> EndPoint
tcpEndPoint :: !EndPoint
, NodeEndPoints -> Maybe EndPoint
secureEndPoint :: !(Maybe EndPoint)
} deriving Int -> NodeEndPoints -> ShowS
[NodeEndPoints] -> ShowS
NodeEndPoints -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [NodeEndPoints] -> ShowS
$cshowList :: [NodeEndPoints] -> ShowS
show :: NodeEndPoints -> String
$cshow :: NodeEndPoints -> String
showsPrec :: Int -> NodeEndPoints -> ShowS
$cshowsPrec :: Int -> NodeEndPoints -> ShowS
Show