psql-0.0.0: PostgreSQL client
Safe HaskellNone
LanguageHaskell2010

PostgreSQL.Types

Contents

Description

The various common types commonly used throughout this package are exported here.

Synopsis

Documentation

data Value Source #

Value

Since: 0.0.0

Constructors

Null 
Value ByteString 

Instances

Instances details
Eq Value Source #

Since: 0.0.0

Instance details

Defined in PostgreSQL.Types

Methods

(==) :: Value -> Value -> Bool #

(/=) :: Value -> Value -> Bool #

Ord Value Source #

Since: 0.0.0

Instance details

Defined in PostgreSQL.Types

Methods

compare :: Value -> Value -> Ordering #

(<) :: Value -> Value -> Bool #

(<=) :: Value -> Value -> Bool #

(>) :: Value -> Value -> Bool #

(>=) :: Value -> Value -> Bool #

max :: Value -> Value -> Value #

min :: Value -> Value -> Value #

Show Value Source #

Since: 0.0.0

Instance details

Defined in PostgreSQL.Types

Methods

showsPrec :: Int -> Value -> ShowS #

show :: Value -> String #

showList :: [Value] -> ShowS #

IsString Value Source #

Since: 0.0.0

Instance details

Defined in PostgreSQL.Types

Methods

fromString :: String -> Value #

Param Value Source #

Since: 0.0.0

Instance details

Defined in PostgreSQL.Param

Methods

paramInfo :: Info (Value -> Value) Source #

newtype RegType Source #

Postgre's regtype

Since: 0.0.0

Constructors

RegType 

Fields

Instances

Instances details
Eq RegType Source #

Since: 0.0.0

Instance details

Defined in PostgreSQL.Types

Methods

(==) :: RegType -> RegType -> Bool #

(/=) :: RegType -> RegType -> Bool #

Ord RegType Source #

Since: 0.0.0

Instance details

Defined in PostgreSQL.Types

Read RegType Source #

Since: 0.0.0

Instance details

Defined in PostgreSQL.Types

Show RegType Source #

Since: 0.0.0

Instance details

Defined in PostgreSQL.Types

IsString RegType Source #

Since: 0.0.0

Instance details

Defined in PostgreSQL.Types

Methods

fromString :: String -> RegType #

Param RegType Source #

Since: 0.0.0

Instance details

Defined in PostgreSQL.Param

newtype PackedParam Source #

Packed parameter

Since: 0.0.0

Constructors

PackedParam (Maybe (Oid, ByteString, Format)) 

Instances

Instances details
Show PackedParam Source #

Since: 0.0.0

Instance details

Defined in PostgreSQL.Types

newtype PackedParamPrepared Source #

Packed parameter for a prepared query

Since: 0.0.0

Instances

Instances details
Show PackedParamPrepared Source #

Since: 0.0.0

Instance details

Defined in PostgreSQL.Types

data ParserError Source #

Error that occurs when parsing a column

Since: 0.0.0

Instances

Instances details
Eq ParserError Source #

Since: 0.0.0

Instance details

Defined in PostgreSQL.Types

Ord ParserError Source #

Since: 0.0.0

Instance details

Defined in PostgreSQL.Types

Show ParserError Source #

Since: 0.0.0

Instance details

Defined in PostgreSQL.Types

data ProcessorError Source #

Error that may occur during processing

Since: 0.0.0

data ResultError Source #

Error that occurs when validating the result

Since: 0.0.0

Instances

Instances details
Eq ResultError Source #

Since: 0.0.0

Instance details

Defined in PostgreSQL.Types

Ord ResultError Source #

Since: 0.0.0

Instance details

Defined in PostgreSQL.Types

Show ResultError Source #

Since: 0.0.0

Instance details

Defined in PostgreSQL.Types

data Error Source #

Since: 0.0.0

Constructors

ErrorDuringProcessing ProcessorError

Occurs when processing the result table

ErrorDuringValidation ResultError

Occurs when validating the result object

Instances

Instances details
Eq Error Source #

Since: 0.0.0

Instance details

Defined in PostgreSQL.Types

Methods

(==) :: Error -> Error -> Bool #

(/=) :: Error -> Error -> Bool #

Ord Error Source #

Since: 0.0.0

Instance details

Defined in PostgreSQL.Types

Methods

compare :: Error -> Error -> Ordering #

(<) :: Error -> Error -> Bool #

(<=) :: Error -> Error -> Bool #

(>) :: Error -> Error -> Bool #

(>=) :: Error -> Error -> Bool #

max :: Error -> Error -> Error #

min :: Error -> Error -> Error #

Show Error Source #

Since: 0.0.0

Instance details

Defined in PostgreSQL.Types

Methods

showsPrec :: Int -> Error -> ShowS #

show :: Error -> String #

showList :: [Error] -> ShowS #

Exception Error Source #

Since: 0.0.0

Instance details

Defined in PostgreSQL.Types

Monad m => MonadError Errors (QueryT m) Source #

Since: 0.0.0

Instance details

Defined in PostgreSQL.Query

Methods

throwError :: Errors -> QueryT m a #

catchError :: QueryT m a -> (Errors -> QueryT m a) -> QueryT m a #

newtype ColumnNum Source #

Numberic column identifier

Since: 0.0.0

Constructors

ColumnNum 

Fields

Instances

Instances details
Bounded ColumnNum Source # 
Instance details

Defined in PostgreSQL.Types

Enum ColumnNum Source # 
Instance details

Defined in PostgreSQL.Types

Eq ColumnNum Source # 
Instance details

Defined in PostgreSQL.Types

Integral ColumnNum Source # 
Instance details

Defined in PostgreSQL.Types

Num ColumnNum Source # 
Instance details

Defined in PostgreSQL.Types

Ord ColumnNum Source # 
Instance details

Defined in PostgreSQL.Types

Read ColumnNum Source # 
Instance details

Defined in PostgreSQL.Types

Real ColumnNum Source # 
Instance details

Defined in PostgreSQL.Types

Show ColumnNum Source # 
Instance details

Defined in PostgreSQL.Types

newtype RowNum Source #

Numberic row identifier

Since: 0.0.0

Constructors

RowNum 

Fields

Instances

Instances details
Bounded RowNum Source # 
Instance details

Defined in PostgreSQL.Types

Enum RowNum Source # 
Instance details

Defined in PostgreSQL.Types

Eq RowNum Source # 
Instance details

Defined in PostgreSQL.Types

Methods

(==) :: RowNum -> RowNum -> Bool #

(/=) :: RowNum -> RowNum -> Bool #

Integral RowNum Source # 
Instance details

Defined in PostgreSQL.Types

Num RowNum Source # 
Instance details

Defined in PostgreSQL.Types

Ord RowNum Source # 
Instance details

Defined in PostgreSQL.Types

Read RowNum Source # 
Instance details

Defined in PostgreSQL.Types

Real RowNum Source # 
Instance details

Defined in PostgreSQL.Types

Show RowNum Source # 
Instance details

Defined in PostgreSQL.Types

Re-exports

data Format #

Constructors

Text 
Binary 

Instances

Instances details
Enum Format 
Instance details

Defined in Database.PostgreSQL.LibPQ

Eq Format 
Instance details

Defined in Database.PostgreSQL.LibPQ

Methods

(==) :: Format -> Format -> Bool #

(/=) :: Format -> Format -> Bool #

Ord Format 
Instance details

Defined in Database.PostgreSQL.LibPQ

Show Format 
Instance details

Defined in Database.PostgreSQL.LibPQ

newtype Oid #

Constructors

Oid CUInt 

Instances

Instances details
Eq Oid 
Instance details

Defined in Database.PostgreSQL.LibPQ

Methods

(==) :: Oid -> Oid -> Bool #

(/=) :: Oid -> Oid -> Bool #

Ord Oid 
Instance details

Defined in Database.PostgreSQL.LibPQ

Methods

compare :: Oid -> Oid -> Ordering #

(<) :: Oid -> Oid -> Bool #

(<=) :: Oid -> Oid -> Bool #

(>) :: Oid -> Oid -> Bool #

(>=) :: Oid -> Oid -> Bool #

max :: Oid -> Oid -> Oid #

min :: Oid -> Oid -> Oid #

Read Oid 
Instance details

Defined in Database.PostgreSQL.LibPQ

Show Oid 
Instance details

Defined in Database.PostgreSQL.LibPQ

Methods

showsPrec :: Int -> Oid -> ShowS #

show :: Oid -> String #

showList :: [Oid] -> ShowS #

Storable Oid 
Instance details

Defined in Database.PostgreSQL.LibPQ

Methods

sizeOf :: Oid -> Int #

alignment :: Oid -> Int #

peekElemOff :: Ptr Oid -> Int -> IO Oid #

pokeElemOff :: Ptr Oid -> Int -> Oid -> IO () #

peekByteOff :: Ptr b -> Int -> IO Oid #

pokeByteOff :: Ptr b -> Int -> Oid -> IO () #

peek :: Ptr Oid -> IO Oid #

poke :: Ptr Oid -> Oid -> IO () #

AutoColumn Oid Source #

Since: 0.0.0

Instance details

Defined in PostgreSQL.Result.Column

Param Oid Source #

Since: 0.0.0

Instance details

Defined in PostgreSQL.Param

Methods

paramInfo :: Info (Oid -> Value) Source #

data Connection #

Instances

Instances details
Eq Connection 
Instance details

Defined in Database.PostgreSQL.LibPQ.Internal