Safe Haskell | None |
---|---|
Language | Haskell2010 |
Documentation
opaleyeEnvConn :: HasOpaleyeEnv c => Lens' c Connection Source
closeEnv :: OpaleyeEnv -> IO () Source
data OpaleyeError Source
_OpaleyeSqlError :: AsOpaleyeError r => Prism' r SqlError Source
_OpaleyeQueryError :: AsOpaleyeError r => Prism' r QueryError Source
_OpaleyeResultError :: AsOpaleyeError r => Prism' r ResultError Source
type CanOpaleye m c e = (MonadReader c m, MonadError e m, MonadIO m, Applicative m, AsOpaleyeError e, HasOpaleyeEnv c) Source
liftQueryFirst :: (CanOpaleye m c e, Default QueryRunner a b, Applicative m) => Query a -> m (Maybe b) Source
liftQuery :: (CanOpaleye m c e, Default QueryRunner a b) => Query a -> m [b] Source
liftInsert :: CanOpaleye m c e => Table colW colR -> colW -> m Int64 Source
liftInsertReturning :: (CanOpaleye m c e, Default QueryRunner ret hask, Default Unpackspec ret ret) => Table colW colR -> (colR -> ret) -> colW -> m [hask] Source
liftDelete :: CanOpaleye m c e => Table colW colR -> (colR -> Column PGBool) -> m Int64 Source
liftUpdate :: CanOpaleye m c e => Table colW colR -> (colR -> colW) -> (colR -> Column PGBool) -> m Int64 Source
derivePGField :: forall a b. FromField a => (a -> b) -> Field -> Maybe ByteString -> Conversion b Source