{-# LINE 1 "Network/Socket/ByteString/Lazy.hsc" #-}
{-# LANGUAGE BangPatterns, CPP, ForeignFunctionInterface, PackageImports #-}
{-# LINE 2 "Network/Socket/ByteString/Lazy.hsc" #-}

-- |
-- Module      : Network.Socket.ByteString.Lazy
-- Copyright   : (c) Bryan O'Sullivan 2009
-- License     : BSD-style
--
-- Maintainer  : bos@serpentine.com
-- Stability   : experimental
-- Portability : POSIX, GHC
--
-- This module provides access to the BSD /socket/ interface.  This
-- module is generally more efficient than the 'String' based network
-- functions in 'Network.Socket'.  For detailed documentation, consult
-- your favorite POSIX socket reference. All functions communicate
-- failures by converting the error number to 'System.IO.IOError'.
--
-- This module is made to be imported with 'Network.Socket' like so:
--
-- > import Network.Socket hiding (send, sendTo, recv, recvFrom)
-- > import Network.Socket.ByteString.Lazy
-- > import Prelude hiding (getContents)
--
module Network.Socket.ByteString.Lazy
  (

{-# LINE 27 "Network/Socket/ByteString/Lazy.hsc" #-}
    -- * Send data to a socket
      send,
      sendAll,

{-# LINE 31 "Network/Socket/ByteString/Lazy.hsc" #-}

    -- * Receive data from a socket
      getContents,
      recv
  ) where

import "network" Network.Socket.ByteString