{-# LANGUAGE AllowAmbiguousTypes #-}
module Database.GP.GenericPersistence
  ( selectById,
    select,
    entitiesFromRows,
    sql,
    persist,
    insert,
    insertReturning,
    insertMany,
    update,
    updateMany,
    delete,
    deleteMany,
    setupTableFor,
    Conn(..),
    connect,
    Database(..),
    TxHandling (..),
    ConnectionPool,
    createConnPool,
    withResource,
    Entity (..),
    GToRow,
    GFromRow,
    columnNameFor,
    maybeFieldTypeFor,
    TypeInfo (..),
    typeInfo,
    PersistenceException(..),
    WhereClauseExpr,
    Field,
    field,
    (&&.),
    (||.),
    (=.),
    (>.),
    (<.),
    (>=.),
    (<=.),
    (<>.),
    like,
    --contains,
    between,
    in',  
    isNull,
    not',
    sqlFun,
    allEntries,
    byId,
    orderBy,
    SortOrder (..),
    limit,
    limitOffset,
    NonEmpty(..)
  )
where

import           Control.Exception
--import           Control.Monad                      (when)
import           Data.Convertible                   (Convertible)
import           Database.GP.Conn
import           Database.GP.Entity
import           Database.GP.GenericPersistenceSafe (PersistenceException, sql, setupTableFor)
import qualified Database.GP.GenericPersistenceSafe as GpSafe
import           Database.GP.SqlGenerator
import           Database.GP.TypeInfo
import           Database.HDBC

-- |
-- This module defines RDBMS Persistence operations for Record Data Types that are instances of 'Data'.
-- I call instances of such a data type Entities.
--
-- The Persistence operations are using Haskell generics to provide compile time reflection capabilities.
-- HDBC is used to access the RDBMS.

-- | A function that retrieves an entity from a database.
-- The function takes entity id as parameter.
-- If an entity with the given id exists in the database, it is returned as a Just value.
-- If no such entity exists, Nothing is returned.
-- An error is thrown if there are more than one entity with the given id.
selectById :: forall a id. (Entity a, Convertible id SqlValue) => Conn -> id -> IO (Maybe a)
selectById :: forall a id.
(Entity a, Convertible id SqlValue) =>
Conn -> id -> IO (Maybe a)
selectById Conn
conn id
idx = do
  Either PersistenceException a
eitherExEntity <- Conn -> id -> IO (Either PersistenceException a)
forall a id.
(Entity a, Convertible id SqlValue) =>
Conn -> id -> IO (Either PersistenceException a)
GpSafe.selectById Conn
conn id
idx
  case Either PersistenceException a
eitherExEntity of
    Left (GpSafe.EntityNotFound String
_) -> Maybe a -> IO (Maybe a)
forall a. a -> IO a
forall (f :: * -> *) a. Applicative f => a -> f a
pure Maybe a
forall a. Maybe a
Nothing
    Left PersistenceException
ex                        -> PersistenceException -> IO (Maybe a)
forall a e. Exception e => e -> a
throw PersistenceException
ex
    Right a
entity                   -> Maybe a -> IO (Maybe a)
forall a. a -> IO a
forall (f :: * -> *) a. Applicative f => a -> f a
pure (Maybe a -> IO (Maybe a)) -> Maybe a -> IO (Maybe a)
forall a b. (a -> b) -> a -> b
$ a -> Maybe a
forall a. a -> Maybe a
Just a
entity

-- | This function retrieves all entities of type `a` from a database.
--  The function takes an HDBC connection as parameter.
--  The type `a` is determined by the context of the function call.
-- retrieveAll :: forall a. (Entity a) => Conn -> IO [a]
-- retrieveAll conn = do
--   eitherExRow <- GpSafe.retrieveAll @a conn
--   case eitherExRow of
--     Left ex    -> throw ex
--     Right rows -> pure rows

-- | This function retrieves all entities of type `a` that match some query criteria.
--   The function takes an HDBC connection and a `WhereClauseExpr` as parameters.
--   The type `a` is determined by the context of the function call.
--   The function returns a (possibly empty) list of all matching entities.
--   The `WhereClauseExpr` is typically constructed using any tiny query dsl based on infix operators.
select :: forall a. (Entity a) => Conn -> WhereClauseExpr -> IO [a]
select :: forall a. Entity a => Conn -> WhereClauseExpr -> IO [a]
select Conn
conn WhereClauseExpr
whereClause = do
  Either PersistenceException [a]
eitherExEntities <- forall a.
Entity a =>
Conn -> WhereClauseExpr -> IO (Either PersistenceException [a])
GpSafe.select @a Conn
conn WhereClauseExpr
whereClause
  case Either PersistenceException [a]
eitherExEntities of
    Left PersistenceException
ex        -> PersistenceException -> IO [a]
forall a e. Exception e => e -> a
throw PersistenceException
ex
    Right [a]
entities -> [a] -> IO [a]
forall a. a -> IO a
forall (f :: * -> *) a. Applicative f => a -> f a
pure [a]
entities

fromEitherExOrA :: IO (Either PersistenceException a) -> IO a
fromEitherExOrA :: forall a. IO (Either PersistenceException a) -> IO a
fromEitherExOrA IO (Either PersistenceException a)
ioEitherExUnit = do
  Either PersistenceException a
eitherExUnit <- IO (Either PersistenceException a)
ioEitherExUnit
  case Either PersistenceException a
eitherExUnit of
    Left PersistenceException
ex -> PersistenceException -> IO a
forall a e. Exception e => e -> a
throw PersistenceException
ex
    Right a
a -> a -> IO a
forall a. a -> IO a
forall (f :: * -> *) a. Applicative f => a -> f a
pure a
a

-- | A function that constructs a list of entities from a list of rows.
--   The function takes an HDBC connection and a list of rows as parameters.
--   The type `a` is determined by the context of the function call.
--   The function returns a list of entities.
--   This can be useful if you want to use your own SQL queries.
entitiesFromRows :: forall a. (Entity a) => Conn -> [[SqlValue]] -> IO [a]
entitiesFromRows :: forall a. Entity a => Conn -> [[SqlValue]] -> IO [a]
entitiesFromRows = (IO (Either PersistenceException [a]) -> IO [a]
forall a. IO (Either PersistenceException a) -> IO a
fromEitherExOrA .) (([[SqlValue]] -> IO (Either PersistenceException [a]))
 -> [[SqlValue]] -> IO [a])
-> (Conn -> [[SqlValue]] -> IO (Either PersistenceException [a]))
-> Conn
-> [[SqlValue]]
-> IO [a]
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Conn -> [[SqlValue]] -> IO (Either PersistenceException [a])
forall a.
Entity a =>
Conn -> [[SqlValue]] -> IO (Either PersistenceException [a])
GpSafe.entitiesFromRows

-- | A function that persists an entity to a database.
-- The function takes an HDBC connection and an entity as parameters.
-- The entity is either inserted or updated, depending on whether it already exists in the database.
-- The required SQL statements are generated dynamically using Haskell generics and reflection
persist :: forall a. (Entity a) => Conn -> a -> IO ()
persist :: forall a. Entity a => Conn -> a -> IO ()
persist = (IO (Either PersistenceException ()) -> IO ()
forall a. IO (Either PersistenceException a) -> IO a
fromEitherExOrA .) ((a -> IO (Either PersistenceException ())) -> a -> IO ())
-> (Conn -> a -> IO (Either PersistenceException ()))
-> Conn
-> a
-> IO ()
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Conn -> a -> IO (Either PersistenceException ())
forall a.
Entity a =>
Conn -> a -> IO (Either PersistenceException ())
GpSafe.persist

-- | A function that explicitely inserts an entity into a database.
insert :: forall a. (Entity a) => Conn -> a -> IO ()
insert :: forall a. Entity a => Conn -> a -> IO ()
insert = (IO (Either PersistenceException ()) -> IO ()
forall a. IO (Either PersistenceException a) -> IO a
fromEitherExOrA .) ((a -> IO (Either PersistenceException ())) -> a -> IO ())
-> (Conn -> a -> IO (Either PersistenceException ()))
-> Conn
-> a
-> IO ()
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Conn -> a -> IO (Either PersistenceException ())
forall a.
Entity a =>
Conn -> a -> IO (Either PersistenceException ())
GpSafe.insert

insertReturning :: forall a. (Entity a) => Conn -> a -> IO a
insertReturning :: forall a. Entity a => Conn -> a -> IO a
insertReturning = (IO (Either PersistenceException a) -> IO a
forall a. IO (Either PersistenceException a) -> IO a
fromEitherExOrA .) ((a -> IO (Either PersistenceException a)) -> a -> IO a)
-> (Conn -> a -> IO (Either PersistenceException a))
-> Conn
-> a
-> IO a
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Conn -> a -> IO (Either PersistenceException a)
forall a.
Entity a =>
Conn -> a -> IO (Either PersistenceException a)
GpSafe.insertReturning

-- | A function that inserts a list of entities into a database.
--   The function takes an HDBC connection and a list of entities as parameters.
--   The insert-statement is compiled only once and then executed for each entity.
insertMany :: forall a. (Entity a) => Conn -> [a] -> IO ()
insertMany :: forall a. Entity a => Conn -> [a] -> IO ()
insertMany = (IO (Either PersistenceException ()) -> IO ()
forall a. IO (Either PersistenceException a) -> IO a
fromEitherExOrA .) (([a] -> IO (Either PersistenceException ())) -> [a] -> IO ())
-> (Conn -> [a] -> IO (Either PersistenceException ()))
-> Conn
-> [a]
-> IO ()
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Conn -> [a] -> IO (Either PersistenceException ())
forall a.
Entity a =>
Conn -> [a] -> IO (Either PersistenceException ())
GpSafe.insertMany

-- | A function that explicitely updates an entity in a database.
update :: forall a. (Entity a) => Conn -> a -> IO ()
update :: forall a. Entity a => Conn -> a -> IO ()
update = (IO (Either PersistenceException ()) -> IO ()
forall a. IO (Either PersistenceException a) -> IO a
fromEitherExOrA .) ((a -> IO (Either PersistenceException ())) -> a -> IO ())
-> (Conn -> a -> IO (Either PersistenceException ()))
-> Conn
-> a
-> IO ()
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Conn -> a -> IO (Either PersistenceException ())
forall a.
Entity a =>
Conn -> a -> IO (Either PersistenceException ())
GpSafe.update

-- | A function that updates a list of entities in a database.
--   The function takes an HDBC connection and a list of entities as parameters.
--   The update-statement is compiled only once and then executed for each entity.
updateMany :: forall a. (Entity a) => Conn -> [a] -> IO ()
updateMany :: forall a. Entity a => Conn -> [a] -> IO ()
updateMany = (IO (Either PersistenceException ()) -> IO ()
forall a. IO (Either PersistenceException a) -> IO a
fromEitherExOrA .) (([a] -> IO (Either PersistenceException ())) -> [a] -> IO ())
-> (Conn -> [a] -> IO (Either PersistenceException ()))
-> Conn
-> [a]
-> IO ()
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Conn -> [a] -> IO (Either PersistenceException ())
forall a.
Entity a =>
Conn -> [a] -> IO (Either PersistenceException ())
GpSafe.updateMany

-- | A function that deletes an entity from a database.
--   The function takes an HDBC connection and an entity as parameters.
delete :: forall a. (Entity a) => Conn -> a -> IO ()
delete :: forall a. Entity a => Conn -> a -> IO ()
delete = (IO (Either PersistenceException ()) -> IO ()
forall a. IO (Either PersistenceException a) -> IO a
fromEitherExOrA .) ((a -> IO (Either PersistenceException ())) -> a -> IO ())
-> (Conn -> a -> IO (Either PersistenceException ()))
-> Conn
-> a
-> IO ()
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Conn -> a -> IO (Either PersistenceException ())
forall a.
Entity a =>
Conn -> a -> IO (Either PersistenceException ())
GpSafe.delete

-- | A function that deletes a list of entities from a database.
--   The function takes an HDBC connection and a list of entities as parameters.
--   The delete-statement is compiled only once and then executed for each entity.
deleteMany :: forall a. (Entity a) => Conn -> [a] -> IO ()
deleteMany :: forall a. Entity a => Conn -> [a] -> IO ()
deleteMany = (IO (Either PersistenceException ()) -> IO ()
forall a. IO (Either PersistenceException a) -> IO a
fromEitherExOrA .) (([a] -> IO (Either PersistenceException ())) -> [a] -> IO ())
-> (Conn -> [a] -> IO (Either PersistenceException ()))
-> Conn
-> [a]
-> IO ()
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Conn -> [a] -> IO (Either PersistenceException ())
forall a.
Entity a =>
Conn -> [a] -> IO (Either PersistenceException ())
GpSafe.deleteMany

-- -- | set up a table for a given entity type. The table is dropped (if existing) and recreated.
-- --   The function takes an HDBC connection as parameter.
-- setupTableFor :: forall a. (Entity a) => Conn -> IO ()
-- setupTableFor conn = do
--   runRaw conn $ dropTableStmtFor @a
--   runRaw conn $ createTableStmtFor @a (db conn)
--   when (implicitCommit conn) $ commit conn