module LLVM.Exception where
import LLVM.Prelude
import Control.Monad.Catch
data EncodeException =
EncodeException !String
deriving (Show, Eq, Ord, Typeable)
instance Exception EncodeException
data DecodeException =
DecodeException !String
deriving (Show, Eq, Ord, Typeable)
instance Exception DecodeException
data ParseFailureException =
ParseFailureException !String
deriving (Show, Eq, Ord, Typeable)
instance Exception ParseFailureException
data LinkException =
LinkException !String
deriving (Show, Eq, Ord, Typeable)
instance Exception LinkException
data FdStreamException =
FdStreamException !String
deriving (Show, Eq, Ord, Typeable)
instance Exception FdStreamException
data TargetMachineEmitException =
TargetMachineEmitException !String
deriving (Show, Eq, Ord, Typeable)
instance Exception TargetMachineEmitException
data LookupTargetException =
LookupTargetException !String
deriving (Show, Eq, Ord, Typeable)
instance Exception LookupTargetException
data VerifyException =
VerifyException !String
deriving (Show, Eq, Ord, Typeable)
instance Exception VerifyException