hasql-1.3.0.2: An efficient PostgreSQL driver and a flexible mapping API

Safe HaskellNone
LanguageHaskell2010

Hasql.Encoders

Contents

Description

A DSL for declaration of query parameter encoders.

Synopsis

Params

data Params a Source #

Encoder of some representation of the parameters product.

Has instances of Contravariant, Divisible and Monoid, which you can use to compose multiple parameters together. E.g.,

someParamsEncoder :: Params (Int64, Maybe Text)
someParamsEncoder =
  contramap fst (value int8) <>
  contramap snd (nullableParam text)

As a general solution for tuples of any arity, instead of fst and snd, consider the functions of the contrazip family from the "contravariant-extras" package. E.g., here's how you can achieve the same as the above:

someParamsEncoder :: Params (Int64, Maybe Text)
someParamsEncoder =
  contrazip2 (value int8) (nullableParam text)

Here's how you can implement encoders for custom composite types:

data Person =
  Person { name :: Text, gender :: Gender, age :: Int }

data Gender =
  Male | Female

personParams :: Params Person
personParams =
  contramap name (value text) <>
  contramap gender (value genderValue) <>
  contramap (fromIntegral . age) (value int8)

genderValue :: Value Gender
genderValue =
  contramap genderText text
  where
    genderText gender =
      case gender of
        Male -> "male"
        Female -> "female"

Instances

Divisible Params Source # 

Methods

divide :: (a -> (b, c)) -> Params b -> Params c -> Params a #

conquer :: Params a #

Decidable Params Source # 

Methods

lose :: (a -> Void) -> Params a #

choose :: (a -> Either b c) -> Params b -> Params c -> Params a #

Contravariant Params Source # 

Methods

contramap :: (a -> b) -> Params b -> Params a #

(>$) :: b -> Params b -> Params a #

Semigroup (Params a) Source # 

Methods

(<>) :: Params a -> Params a -> Params a #

sconcat :: NonEmpty (Params a) -> Params a #

stimes :: Integral b => b -> Params a -> Params a #

Monoid (Params a) Source # 

Methods

mempty :: Params a #

mappend :: Params a -> Params a -> Params a #

mconcat :: [Params a] -> Params a #

Default (Params ()) Source #

Maps to unit.

Methods

def :: Params () #

(Default (Value a1), Default (Value a2)) => Default (Params (a1, a2)) Source # 

Methods

def :: Params (a1, a2) #

(Default (Value a1), Default (Value a2), Default (Value a3)) => Default (Params (a1, a2, a3)) Source # 

Methods

def :: Params (a1, a2, a3) #

(Default (Value a1), Default (Value a2), Default (Value a3), Default (Value a4)) => Default (Params (a1, a2, a3, a4)) Source # 

Methods

def :: Params (a1, a2, a3, a4) #

(Default (Value a1), Default (Value a2), Default (Value a3), Default (Value a4), Default (Value a5)) => Default (Params (a1, a2, a3, a4, a5)) Source # 

Methods

def :: Params (a1, a2, a3, a4, a5) #

Default (Value a) => Default (Params (Identity a)) Source # 

Methods

def :: Params (Identity a) #

unit :: Params () Source #

Encode no parameters.

param :: Value a -> Params a Source #

Lift an individual value encoder to a parameters encoder.

nullableParam :: Value a -> Params (Maybe a) Source #

Lift an individual nullable value encoder to a parameters encoder.

Value

data Value a Source #

An individual value encoder. Will be mapped to a single placeholder in the query.

bool :: Value Bool Source #

Encoder of BOOL values.

int2 :: Value Int16 Source #

Encoder of INT2 values.

int4 :: Value Int32 Source #

Encoder of INT4 values.

int8 :: Value Int64 Source #

Encoder of INT8 values.

float4 :: Value Float Source #

Encoder of FLOAT4 values.

float8 :: Value Double Source #

Encoder of FLOAT8 values.

numeric :: Value Scientific Source #

Encoder of NUMERIC values.

char :: Value Char Source #

Encoder of CHAR values. Note that it supports UTF-8 values and identifies itself under the TEXT OID because of that.

text :: Value Text Source #

Encoder of TEXT values.

bytea :: Value ByteString Source #

Encoder of BYTEA values.

date :: Value Day Source #

Encoder of DATE values.

timestamp :: Value LocalTime Source #

Encoder of TIMESTAMP values.

timestamptz :: Value UTCTime Source #

Encoder of TIMESTAMPTZ values.

time :: Value TimeOfDay Source #

Encoder of TIME values.

timetz :: Value (TimeOfDay, TimeZone) Source #

Encoder of TIMETZ values.

interval :: Value DiffTime Source #

Encoder of INTERVAL values.

uuid :: Value UUID Source #

Encoder of UUID values.

inet :: Value (NetAddr IP) Source #

Encoder of INET values.

json :: Value Value Source #

Encoder of JSON values from JSON AST.

jsonBytes :: Value ByteString Source #

Encoder of JSON values from raw JSON.

jsonb :: Value Value Source #

Encoder of JSONB values from JSON AST.

jsonbBytes :: Value ByteString Source #

Encoder of JSONB values from raw JSON.

array :: Array a -> Value a Source #

Unlifts the Array encoder to the plain Value encoder.

enum :: (a -> Text) -> Value a Source #

Given a function, which maps the value into the textual enum label from the DB side, produces a encoder of that value.

unknown :: Value ByteString Source #

Identifies the value with the PostgreSQL's "unknown" type, thus leaving it up to Postgres to infer the actual type of the value.

The value transimitted is any value encoded in the Postgres' Text data format. For reference, see the Formats and Format Codes section of the Postgres' documentation.

Array

data Array a Source #

A generic array encoder.

Here's an example of its usage:

x :: Value [[Int64]]
x =
  array (dimension foldl' (dimension foldl' (element int8)))

Please note that the PostgreSQL IN keyword does not "accept" an array, but rather a syntactical list of values, thus this encoder is not suited for that. Use a **field** = ANY($1) query instead.

element :: Value a -> Array a Source #

Lifts the Value encoder into the Array encoder of a non-nullable value.

nullableElement :: Value a -> Array (Maybe a) Source #

Lifts the Value encoder into the Array encoder of a nullable value.

dimension :: (forall a. (a -> b -> a) -> a -> c -> a) -> Array b -> Array c Source #

An encoder of an array dimension, which thus provides support for multidimensional arrays.

Accepts:

  • An implementation of the left-fold operation, such as Data.Foldable.foldl', which determines the input value.
  • A component encoder, which can be either another dimension, element or nullableElement.

Insert Many

It is not currently possible to pass in an array of encodable values to use in an 'insert many' statement using Hasql. Instead, PostgreSQL's (9.4 or later) unnest function can be used to in an analogous way to haskell's zip function by passing in multiple arrays of values to be zipped into the rows we want to insert:

  insertMultipleLocations :: Statement (Vector (UUID, Double, Double)) ()
  insertMultipleLocations =
    statement sql encoder decoder True
    where
      sql =
        "insert into location (id, x, y) select * from unnest ($1, $2, $3)"
      encoder =
        contramap Vector.unzip3 $
        contrazip3 (vector Encoders.uuid) (vector Encoders.float8) (vector Encoders.float8)
        where
          vector value =
            Encoders.value (Encoders.array (Encoders.dimension foldl' (Encoders.element value)))
      decoder =
        Decoders.unit