{-# LANGUAGE DerivingStrategies #-} module StaticLS.HIE.File.Except where import Control.Exception import qualified GHC.Iface.Ext.Binary as GHC data HieFileReadException = HieFileReadException | HieFileVersionException GHC.HieHeader deriving stock (Int -> HieFileReadException -> ShowS [HieFileReadException] -> ShowS HieFileReadException -> String (Int -> HieFileReadException -> ShowS) -> (HieFileReadException -> String) -> ([HieFileReadException] -> ShowS) -> Show HieFileReadException forall a. (Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a $cshowsPrec :: Int -> HieFileReadException -> ShowS showsPrec :: Int -> HieFileReadException -> ShowS $cshow :: HieFileReadException -> String show :: HieFileReadException -> String $cshowList :: [HieFileReadException] -> ShowS showList :: [HieFileReadException] -> ShowS Show) instance Exception HieFileReadException