module Hasql.Pool.Config.Defaults where
import qualified Hasql.Connection as Connection
import Hasql.Pool.Observation (Observation)
import Hasql.Pool.Prelude
size :: Int
size :: Int
size = Int
3
acquisitionTimeout :: DiffTime
acquisitionTimeout :: DiffTime
acquisitionTimeout = DiffTime
10
agingTimeout :: DiffTime
agingTimeout :: DiffTime
agingTimeout = DiffTime
60 DiffTime -> DiffTime -> DiffTime
forall a. Num a => a -> a -> a
* DiffTime
60 DiffTime -> DiffTime -> DiffTime
forall a. Num a => a -> a -> a
* DiffTime
24
idlenessTimeout :: DiffTime
idlenessTimeout :: DiffTime
idlenessTimeout = DiffTime
60 DiffTime -> DiffTime -> DiffTime
forall a. Num a => a -> a -> a
* DiffTime
10
staticConnectionSettings :: Connection.Settings
staticConnectionSettings :: Settings
staticConnectionSettings = Settings
"postgresql://postgres:postgres@localhost:5432/postgres"
dynamicConnectionSettings :: IO Connection.Settings
dynamicConnectionSettings :: IO Settings
dynamicConnectionSettings = Settings -> IO Settings
forall a. a -> IO a
forall (f :: * -> *) a. Applicative f => a -> f a
pure Settings
"postgresql://postgres:postgres@localhost:5432/postgres"
observationHandler :: Observation -> IO ()
observationHandler :: Observation -> IO ()
observationHandler = IO () -> Observation -> IO ()
forall a b. a -> b -> a
const (() -> IO ()
forall a. a -> IO a
forall (f :: * -> *) a. Applicative f => a -> f a
pure ())