module Polysemy.Db.Data.InitDbError where

newtype InitDbError =
  InitDbError { InitDbError -> Text
unInitDbError :: Text }
  deriving stock (InitDbError -> InitDbError -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: InitDbError -> InitDbError -> Bool
$c/= :: InitDbError -> InitDbError -> Bool
== :: InitDbError -> InitDbError -> Bool
$c== :: InitDbError -> InitDbError -> Bool
Eq, Int -> InitDbError -> ShowS
[InitDbError] -> ShowS
InitDbError -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [InitDbError] -> ShowS
$cshowList :: [InitDbError] -> ShowS
show :: InitDbError -> String
$cshow :: InitDbError -> String
showsPrec :: Int -> InitDbError -> ShowS
$cshowsPrec :: Int -> InitDbError -> ShowS
Show, forall x. Rep InitDbError x -> InitDbError
forall x. InitDbError -> Rep InitDbError x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep InitDbError x -> InitDbError
$cfrom :: forall x. InitDbError -> Rep InitDbError x
Generic)
  deriving newtype (String -> InitDbError
forall a. (String -> a) -> IsString a
fromString :: String -> InitDbError
$cfromString :: String -> InitDbError
IsString, Eq InitDbError
InitDbError -> InitDbError -> Bool
InitDbError -> InitDbError -> Ordering
InitDbError -> InitDbError -> InitDbError
forall a.
Eq a
-> (a -> a -> Ordering)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> a)
-> (a -> a -> a)
-> Ord a
min :: InitDbError -> InitDbError -> InitDbError
$cmin :: InitDbError -> InitDbError -> InitDbError
max :: InitDbError -> InitDbError -> InitDbError
$cmax :: InitDbError -> InitDbError -> InitDbError
>= :: InitDbError -> InitDbError -> Bool
$c>= :: InitDbError -> InitDbError -> Bool
> :: InitDbError -> InitDbError -> Bool
$c> :: InitDbError -> InitDbError -> Bool
<= :: InitDbError -> InitDbError -> Bool
$c<= :: InitDbError -> InitDbError -> Bool
< :: InitDbError -> InitDbError -> Bool
$c< :: InitDbError -> InitDbError -> Bool
compare :: InitDbError -> InitDbError -> Ordering
$ccompare :: InitDbError -> InitDbError -> Ordering
Ord)