module Ribosome.Data.ErrorReport(
  ErrorReport(..),
  user,
  log,
  priority,
) where

import System.Log (Priority)

data ErrorReport =
  ErrorReport {
    ErrorReport -> Text
_user :: Text,
    ErrorReport -> [Text]
_log :: [Text],
    ErrorReport -> Priority
_priority :: Priority
  }
  deriving (ErrorReport -> ErrorReport -> Bool
(ErrorReport -> ErrorReport -> Bool)
-> (ErrorReport -> ErrorReport -> Bool) -> Eq ErrorReport
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: ErrorReport -> ErrorReport -> Bool
$c/= :: ErrorReport -> ErrorReport -> Bool
== :: ErrorReport -> ErrorReport -> Bool
$c== :: ErrorReport -> ErrorReport -> Bool
Eq, Int -> ErrorReport -> ShowS
[ErrorReport] -> ShowS
ErrorReport -> String
(Int -> ErrorReport -> ShowS)
-> (ErrorReport -> String)
-> ([ErrorReport] -> ShowS)
-> Show ErrorReport
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [ErrorReport] -> ShowS
$cshowList :: [ErrorReport] -> ShowS
show :: ErrorReport -> String
$cshow :: ErrorReport -> String
showsPrec :: Int -> ErrorReport -> ShowS
$cshowsPrec :: Int -> ErrorReport -> ShowS
Show)

makeClassy ''ErrorReport