module Patrol.Exception.Problem where

import qualified Control.Monad.Catch as Catch

newtype Problem
  = Problem String
  deriving (Problem -> Problem -> Bool
(Problem -> Problem -> Bool)
-> (Problem -> Problem -> Bool) -> Eq Problem
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: Problem -> Problem -> Bool
== :: Problem -> Problem -> Bool
$c/= :: Problem -> Problem -> Bool
/= :: Problem -> Problem -> Bool
Eq, Int -> Problem -> ShowS
[Problem] -> ShowS
Problem -> String
(Int -> Problem -> ShowS)
-> (Problem -> String) -> ([Problem] -> ShowS) -> Show Problem
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> Problem -> ShowS
showsPrec :: Int -> Problem -> ShowS
$cshow :: Problem -> String
show :: Problem -> String
$cshowList :: [Problem] -> ShowS
showList :: [Problem] -> ShowS
Show)

instance Catch.Exception Problem