{-# options_haddock prune #-}

-- |AgentId Data Type, Internal
module Helic.Data.AgentId where

newtype AgentId =
  AgentId { AgentId -> Text
unAgentId :: Text }
  deriving stock (AgentId -> AgentId -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: AgentId -> AgentId -> Bool
$c/= :: AgentId -> AgentId -> Bool
== :: AgentId -> AgentId -> Bool
$c== :: AgentId -> AgentId -> Bool
Eq, Int -> AgentId -> ShowS
[AgentId] -> ShowS
AgentId -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [AgentId] -> ShowS
$cshowList :: [AgentId] -> ShowS
show :: AgentId -> String
$cshow :: AgentId -> String
showsPrec :: Int -> AgentId -> ShowS
$cshowsPrec :: Int -> AgentId -> ShowS
Show, forall x. Rep AgentId x -> AgentId
forall x. AgentId -> Rep AgentId x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep AgentId x -> AgentId
$cfrom :: forall x. AgentId -> Rep AgentId x
Generic)
  deriving newtype (String -> AgentId
forall a. (String -> a) -> IsString a
fromString :: String -> AgentId
$cfromString :: String -> AgentId
IsString)

json ''AgentId