{-# LANGUAGE CPP #-}
module Dhall.Import.Manager
(
Manager
, defaultNewManager
) where
import Network.HTTP.Client (Manager, newManager)
import qualified Network.HTTP.Client as HTTP
#ifdef USE_HTTP_CLIENT_TLS
import Network.HTTP.Client.TLS (tlsManagerSettings)
#endif
defaultNewManager :: IO Manager
defaultNewManager :: IO Manager
defaultNewManager = ManagerSettings -> IO Manager
newManager
#ifdef USE_HTTP_CLIENT_TLS
ManagerSettings
tlsManagerSettings
#else
HTTP.defaultManagerSettings
#endif
{ managerResponseTimeout :: ResponseTimeout
HTTP.managerResponseTimeout = Int -> ResponseTimeout
HTTP.responseTimeoutMicro (Int
30 Int -> Int -> Int
forall a. Num a => a -> a -> a
* Int
1000 Int -> Int -> Int
forall a. Num a => a -> a -> a
* Int
1000) }