module Happstack.Server.Internal.TimeoutIO
( TimeoutIO(..)
) where
import qualified Data.ByteString.Char8 as B
import qualified Data.ByteString.Lazy.Char8 as L
import Happstack.Server.Internal.TimeoutManager (Handle)
import Network.Socket.SendFile (ByteCount, Offset)
data TimeoutIO = TimeoutIO
{ toHandle :: Handle
, toPutLazy :: L.ByteString -> IO ()
, toPut :: B.ByteString -> IO ()
, toGetContents :: IO L.ByteString
, toSendFile :: FilePath -> Offset -> ByteCount -> IO ()
, toShutdown :: IO ()
, toSecure :: Bool
}