module CabalGild.Unstable.Exception.CheckFailure where

import qualified Control.Monad.Catch as Exception

-- | This exception is thrown when the input is not formatted correctly.
data CheckFailure
  = CheckFailure
  deriving (CheckFailure -> CheckFailure -> Bool
(CheckFailure -> CheckFailure -> Bool)
-> (CheckFailure -> CheckFailure -> Bool) -> Eq CheckFailure
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: CheckFailure -> CheckFailure -> Bool
== :: CheckFailure -> CheckFailure -> Bool
$c/= :: CheckFailure -> CheckFailure -> Bool
/= :: CheckFailure -> CheckFailure -> Bool
Eq, Int -> CheckFailure -> ShowS
[CheckFailure] -> ShowS
CheckFailure -> String
(Int -> CheckFailure -> ShowS)
-> (CheckFailure -> String)
-> ([CheckFailure] -> ShowS)
-> Show CheckFailure
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> CheckFailure -> ShowS
showsPrec :: Int -> CheckFailure -> ShowS
$cshow :: CheckFailure -> String
show :: CheckFailure -> String
$cshowList :: [CheckFailure] -> ShowS
showList :: [CheckFailure] -> ShowS
Show)

instance Exception.Exception CheckFailure where
  displayException :: CheckFailure -> String
displayException = String -> CheckFailure -> String
forall a b. a -> b -> a
const String
"input is not formatted"