{-# LANGUAGE DeriveGeneric, DeriveAnyClass #-} module ProjectM36.AtomFunctionError where import GHC.Generics import Control.DeepSeq import Data.Text data AtomFunctionError = AtomFunctionUserError String | AtomFunctionTypeMismatchError | AtomFunctionParseError String | InvalidIntervalOrderingError | InvalidIntervalBoundariesError | AtomFunctionAttributeNameNotFoundError Text | InvalidIntBoundError | InvalidUUIDString Text | RelationAtomExpectedError Text | AtomFunctionEmptyRelationError | AtomTypeDoesNotSupportOrderingError Text | AtomTypeDoesNotSupportIntervalError Text | AtomFunctionBytesDecodingError String deriving (forall x. Rep AtomFunctionError x -> AtomFunctionError forall x. AtomFunctionError -> Rep AtomFunctionError x forall a. (forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a $cto :: forall x. Rep AtomFunctionError x -> AtomFunctionError $cfrom :: forall x. AtomFunctionError -> Rep AtomFunctionError x Generic, AtomFunctionError -> AtomFunctionError -> Bool forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a /= :: AtomFunctionError -> AtomFunctionError -> Bool $c/= :: AtomFunctionError -> AtomFunctionError -> Bool == :: AtomFunctionError -> AtomFunctionError -> Bool $c== :: AtomFunctionError -> AtomFunctionError -> Bool Eq, Int -> AtomFunctionError -> ShowS [AtomFunctionError] -> ShowS AtomFunctionError -> String forall a. (Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a showList :: [AtomFunctionError] -> ShowS $cshowList :: [AtomFunctionError] -> ShowS show :: AtomFunctionError -> String $cshow :: AtomFunctionError -> String showsPrec :: Int -> AtomFunctionError -> ShowS $cshowsPrec :: Int -> AtomFunctionError -> ShowS Show, AtomFunctionError -> () forall a. (a -> ()) -> NFData a rnf :: AtomFunctionError -> () $crnf :: AtomFunctionError -> () NFData)