-- | Debugging utilities

module Hydra.Util.Debug where

import Control.Exception

newtype DebugException = DebugException String deriving Int -> DebugException -> ShowS
[DebugException] -> ShowS
DebugException -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [DebugException] -> ShowS
$cshowList :: [DebugException] -> ShowS
show :: DebugException -> String
$cshow :: DebugException -> String
showsPrec :: Int -> DebugException -> ShowS
$cshowsPrec :: Int -> DebugException -> ShowS
Show

instance Exception DebugException

throwDebugException :: String -> c
throwDebugException :: forall c. String -> c
throwDebugException = forall a e. Exception e => e -> a
throw forall b c a. (b -> c) -> (a -> b) -> a -> c
. String -> DebugException
DebugException