connection-pool-0.2.2: Connection pool built on top of resource-pool and streaming-commons.

Copyright(c) 2015 Peter Trško
LicenseBSD3
Maintainerpeter.trsko@gmail.com
Stabilityunstable (internal module)
PortabilityGHC specific language extensions.
Safe HaskellSafe
LanguageHaskell2010

Data.ConnectionPool.Internal.HandlerParams

Description

Internal packages are here to provide access to internal definitions for library writers, but they should not be used in application code.

Preferably use qualified import, e.g.:

import qualified Data.ConnectionPool.Internal.HandlerParams as Internal

This module doesn't depend on streaming-commons. Another notable thing is that this package is not OS specific. Please, bear this in mind when doing modifications.

Since version 0.1.3.

Synopsis

Documentation

data HandlerParams Source #

Additional parameters passed to connection handler that aren't part of specific connection context.

Since version 0.1.3.

Constructors

HandlerParams 

Fields

Instances

Data HandlerParams Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> HandlerParams -> c HandlerParams #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c HandlerParams #

toConstr :: HandlerParams -> Constr #

dataTypeOf :: HandlerParams -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c HandlerParams) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c HandlerParams) #

gmapT :: (forall b. Data b => b -> b) -> HandlerParams -> HandlerParams #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> HandlerParams -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> HandlerParams -> r #

gmapQ :: (forall d. Data d => d -> u) -> HandlerParams -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> HandlerParams -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> HandlerParams -> m HandlerParams #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> HandlerParams -> m HandlerParams #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> HandlerParams -> m HandlerParams #

Show HandlerParams Source # 
Generic HandlerParams Source # 

Associated Types

type Rep HandlerParams :: * -> * #

Default HandlerParams Source #
readBufferSize = 32768

Package streaming-commons < 0.1.13 used value 4096, streaming-commons == 0.1.13 used 32768, which is 8 * 4096, based on: issue #22

Methods

def :: HandlerParams #

HasConnectionPool HandlerParams Socket () (ConnectionPool * UnixClient) Source #

Since version 0.2.

HasConnectionPool HandlerParams Socket SockAddr (ConnectionPool * TcpClient) Source #

Since version 0.2.

type Rep HandlerParams Source # 
type Rep HandlerParams = D1 * (MetaData "HandlerParams" "Data.ConnectionPool.Internal.HandlerParams" "connection-pool-0.2.2-6QO2HFAP66s57rNsrMe34b" False) (C1 * (MetaCons "HandlerParams" PrefixI True) (S1 * (MetaSel (Just Symbol "_readBufferSize") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * Int)))

readBufferSize :: Functor f => (Int -> f Int) -> HandlerParams -> f HandlerParams Source #

Lens for accessing read buffer size that handler should use when reading data from connection.

Since version 0.1.3.