Safe Haskell | None |
---|---|
Language | Haskell2010 |
Definitions of exception types.
Synopsis
- data DetailedQueryError = DetailedQueryError {
- qeSeverity :: !String
- qeErrorCode :: !ErrorCode
- qeMessagePrimary :: !String
- qeMessageDetail :: !(Maybe String)
- qeMessageHint :: !(Maybe String)
- qeStatementPosition :: !(Maybe Int)
- qeInternalPosition :: !(Maybe Int)
- qeInternalQuery :: !(Maybe String)
- qeContext :: !(Maybe String)
- qeSourceFile :: !(Maybe String)
- qeSourceLine :: !(Maybe Int)
- qeSourceFunction :: !(Maybe String)
- newtype QueryError = QueryError String
- newtype HPQTypesError = HPQTypesError String
- newtype LibPQError = LibPQError String
- data ConversionError = Exception e => ConversionError {
- convColumn :: !Int
- convColumnName :: !String
- convRow :: !Int
- convError :: !e
- data ArrayItemError = Exception e => ArrayItemError {
- arrItemIndex :: !Int
- arrItemError :: !e
- data InvalidValue t = InvalidValue {
- ivValue :: t
- ivValidValues :: Maybe [t]
- data RangeError t = RangeError {}
- data ArrayDimensionMismatch = ArrayDimensionMismatch {
- arrDimExpected :: !Int
- arrDimDelivered :: !Int
- data RowLengthMismatch = RowLengthMismatch {
- lengthExpected :: !Int
- lengthDelivered :: !Int
- data AffectedRowsMismatch = AffectedRowsMismatch {
- rowsExpected :: ![(Int, Int)]
- rowsDelivered :: !Int
Documentation
data DetailedQueryError Source #
SQL query error. Reference: description of PQresultErrorField at http://www.postgresql.org/docs/devel/static/libpq-exec.html.
DetailedQueryError | |
|
Instances
Eq DetailedQueryError Source # | |
Defined in Database.PostgreSQL.PQTypes.Internal.Error (==) :: DetailedQueryError -> DetailedQueryError -> Bool # (/=) :: DetailedQueryError -> DetailedQueryError -> Bool # | |
Ord DetailedQueryError Source # | |
Defined in Database.PostgreSQL.PQTypes.Internal.Error compare :: DetailedQueryError -> DetailedQueryError -> Ordering # (<) :: DetailedQueryError -> DetailedQueryError -> Bool # (<=) :: DetailedQueryError -> DetailedQueryError -> Bool # (>) :: DetailedQueryError -> DetailedQueryError -> Bool # (>=) :: DetailedQueryError -> DetailedQueryError -> Bool # max :: DetailedQueryError -> DetailedQueryError -> DetailedQueryError # min :: DetailedQueryError -> DetailedQueryError -> DetailedQueryError # | |
Show DetailedQueryError Source # | |
Defined in Database.PostgreSQL.PQTypes.Internal.Error showsPrec :: Int -> DetailedQueryError -> ShowS # show :: DetailedQueryError -> String # showList :: [DetailedQueryError] -> ShowS # | |
Exception DetailedQueryError Source # | |
newtype QueryError Source #
Simple SQL query error. Thrown when there is no PGresult object corresponding to query execution.
Instances
Eq QueryError Source # | |
Defined in Database.PostgreSQL.PQTypes.Internal.Error (==) :: QueryError -> QueryError -> Bool # (/=) :: QueryError -> QueryError -> Bool # | |
Ord QueryError Source # | |
Defined in Database.PostgreSQL.PQTypes.Internal.Error compare :: QueryError -> QueryError -> Ordering # (<) :: QueryError -> QueryError -> Bool # (<=) :: QueryError -> QueryError -> Bool # (>) :: QueryError -> QueryError -> Bool # (>=) :: QueryError -> QueryError -> Bool # max :: QueryError -> QueryError -> QueryError # min :: QueryError -> QueryError -> QueryError # | |
Show QueryError Source # | |
Defined in Database.PostgreSQL.PQTypes.Internal.Error showsPrec :: Int -> QueryError -> ShowS # show :: QueryError -> String # showList :: [QueryError] -> ShowS # | |
Exception QueryError Source # | |
Defined in Database.PostgreSQL.PQTypes.Internal.Error toException :: QueryError -> SomeException # fromException :: SomeException -> Maybe QueryError # displayException :: QueryError -> String # |
newtype HPQTypesError Source #
Internal error in this library.
Instances
Eq HPQTypesError Source # | |
Defined in Database.PostgreSQL.PQTypes.Internal.Error (==) :: HPQTypesError -> HPQTypesError -> Bool # (/=) :: HPQTypesError -> HPQTypesError -> Bool # | |
Ord HPQTypesError Source # | |
Defined in Database.PostgreSQL.PQTypes.Internal.Error compare :: HPQTypesError -> HPQTypesError -> Ordering # (<) :: HPQTypesError -> HPQTypesError -> Bool # (<=) :: HPQTypesError -> HPQTypesError -> Bool # (>) :: HPQTypesError -> HPQTypesError -> Bool # (>=) :: HPQTypesError -> HPQTypesError -> Bool # max :: HPQTypesError -> HPQTypesError -> HPQTypesError # min :: HPQTypesError -> HPQTypesError -> HPQTypesError # | |
Show HPQTypesError Source # | |
Defined in Database.PostgreSQL.PQTypes.Internal.Error showsPrec :: Int -> HPQTypesError -> ShowS # show :: HPQTypesError -> String # showList :: [HPQTypesError] -> ShowS # | |
Exception HPQTypesError Source # | |
newtype LibPQError Source #
Internal error in libpq/libpqtypes library.
Instances
Eq LibPQError Source # | |
Defined in Database.PostgreSQL.PQTypes.Internal.Error (==) :: LibPQError -> LibPQError -> Bool # (/=) :: LibPQError -> LibPQError -> Bool # | |
Ord LibPQError Source # | |
Defined in Database.PostgreSQL.PQTypes.Internal.Error compare :: LibPQError -> LibPQError -> Ordering # (<) :: LibPQError -> LibPQError -> Bool # (<=) :: LibPQError -> LibPQError -> Bool # (>) :: LibPQError -> LibPQError -> Bool # (>=) :: LibPQError -> LibPQError -> Bool # max :: LibPQError -> LibPQError -> LibPQError # min :: LibPQError -> LibPQError -> LibPQError # | |
Show LibPQError Source # | |
Defined in Database.PostgreSQL.PQTypes.Internal.Error showsPrec :: Int -> LibPQError -> ShowS # show :: LibPQError -> String # showList :: [LibPQError] -> ShowS # | |
Exception LibPQError Source # | |
Defined in Database.PostgreSQL.PQTypes.Internal.Error toException :: LibPQError -> SomeException # fromException :: SomeException -> Maybe LibPQError # displayException :: LibPQError -> String # |
data ConversionError Source #
Data conversion error. Since it's polymorphic in error type, it nicely reports arbitrarily nested conversion errors.
Exception e => ConversionError | |
|
Instances
Show ConversionError Source # | |
Defined in Database.PostgreSQL.PQTypes.Internal.Error showsPrec :: Int -> ConversionError -> ShowS # show :: ConversionError -> String # showList :: [ConversionError] -> ShowS # | |
Exception ConversionError Source # | |
data ArrayItemError Source #
Array item error. Polymorphic in error type
for the same reason as ConversionError
.
Exception e => ArrayItemError | |
|
Instances
Show ArrayItemError Source # | |
Defined in Database.PostgreSQL.PQTypes.Internal.Error showsPrec :: Int -> ArrayItemError -> ShowS # show :: ArrayItemError -> String # showList :: [ArrayItemError] -> ShowS # | |
Exception ArrayItemError Source # | |
data InvalidValue t Source #
"Invalid value" error for various data types.
InvalidValue | |
|
Instances
data RangeError t Source #
Range error for various data types.
Instances
data ArrayDimensionMismatch Source #
Array dimenstion mismatch error.
ArrayDimensionMismatch | |
|
Instances
data RowLengthMismatch Source #
Row length mismatch error.
RowLengthMismatch | |
|
Instances
Eq RowLengthMismatch Source # | |
Defined in Database.PostgreSQL.PQTypes.Internal.Error (==) :: RowLengthMismatch -> RowLengthMismatch -> Bool # (/=) :: RowLengthMismatch -> RowLengthMismatch -> Bool # | |
Ord RowLengthMismatch Source # | |
Defined in Database.PostgreSQL.PQTypes.Internal.Error compare :: RowLengthMismatch -> RowLengthMismatch -> Ordering # (<) :: RowLengthMismatch -> RowLengthMismatch -> Bool # (<=) :: RowLengthMismatch -> RowLengthMismatch -> Bool # (>) :: RowLengthMismatch -> RowLengthMismatch -> Bool # (>=) :: RowLengthMismatch -> RowLengthMismatch -> Bool # max :: RowLengthMismatch -> RowLengthMismatch -> RowLengthMismatch # min :: RowLengthMismatch -> RowLengthMismatch -> RowLengthMismatch # | |
Show RowLengthMismatch Source # | |
Defined in Database.PostgreSQL.PQTypes.Internal.Error showsPrec :: Int -> RowLengthMismatch -> ShowS # show :: RowLengthMismatch -> String # showList :: [RowLengthMismatch] -> ShowS # | |
Exception RowLengthMismatch Source # | |
data AffectedRowsMismatch Source #
Affected/returned rows mismatch error.
AffectedRowsMismatch | |
|