generated from tpl/purs
Drop legacy module
This commit is contained in:
parent
c1d9d4f37f
commit
d2765285e4
@ -30,8 +30,6 @@ type PG a
|
|||||||
hoistPG :: ∀ a m. MonadAff m => MonadError PGError m => PG a -> m a
|
hoistPG :: ∀ a m. MonadAff m => MonadError PGError m => PG a -> m a
|
||||||
hoistPG m = liftAff m >>= either throwError pure
|
hoistPG m = liftAff m >>= either throwError pure
|
||||||
|
|
||||||
-- | Run an action with a connection. The connection is released to the pool
|
|
||||||
-- | when the action returns.
|
|
||||||
withClient ::
|
withClient ::
|
||||||
∀ a m.
|
∀ a m.
|
||||||
MonadError PGError m =>
|
MonadError PGError m =>
|
||||||
@ -58,12 +56,6 @@ withConnection ::
|
|||||||
m a
|
m a
|
||||||
withConnection f p k = withClient f p (lcmap fromClient k)
|
withConnection f p k = withClient f p (lcmap fromClient k)
|
||||||
|
|
||||||
-- | TODO: Update docs
|
|
||||||
-- | Run an action within a transaction. The transaction is committed if the
|
|
||||||
-- | action returns cleanly, and rolled back if the action throws (either a
|
|
||||||
-- | `PGError` or a JavaScript exception in PG context). If you want to
|
|
||||||
-- | change the transaction mode, issue a separate `SET TRANSACTION` statement
|
|
||||||
-- | within the transaction.
|
|
||||||
withTransaction ::
|
withTransaction ::
|
||||||
∀ a m.
|
∀ a m.
|
||||||
MonadAff m =>
|
MonadAff m =>
|
||||||
|
@ -1,22 +0,0 @@
|
|||||||
module Data.PostgreSQL.RowList where
|
|
||||||
|
|
||||||
-- import Prim.RowList (Cons, Nil) as RowList
|
|
||||||
-- import Prim.RowList (kind RowList)
|
|
||||||
--
|
|
||||||
-- infixl 10 type RowList.Cons as :
|
|
||||||
--
|
|
||||||
-- type Apply (f :: RowList Type -> RowList Type) (a ∷ RowList Type) = f a
|
|
||||||
--
|
|
||||||
-- infixr 0 type Apply as $
|
|
||||||
--
|
|
||||||
-- type R = "test" : Int $ "fest" : String $ RowList.Nil
|
|
||||||
--
|
|
||||||
-- instance fromSQLRowRow0 :: FromSQLRow RowList.Nil where
|
|
||||||
-- fromSQLRow [] =
|
|
||||||
-- pure Row0
|
|
||||||
-- fromSQLRow xs = Left $ "Row has " <> show n <> " fields, expecting 0."
|
|
||||||
-- where n = Array.length xs
|
|
||||||
--
|
|
||||||
-- instance toSQLRowRow0 :: ToSQLRow Row0 where
|
|
||||||
-- toSQLRow Row0 = []
|
|
||||||
-- -- | A row with 1 field.
|
|
Loading…
Reference in New Issue
Block a user