module Rattletrap.Exception.Fail where

import qualified Control.Exception as Exception

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

instance Exception.Exception Fail where
  displayException :: Fail -> String
displayException (Fail String
x) = String
x