module Chiasma.Data.SessionGroupId where

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