7

更新:尼莫先生的回答帮助解决了这个问题!下面的代码包含修复!请参阅下面的nb Falsenb True调用。

还有一个新的 Haskell 包,称为splice(,它具有最知名的套接字到套接字数据传输循环的特定于操作系统和可移植的实现)

我有以下(Haskell)代码:

#ifdef LINUX_SPLICE
#include <fcntl.h>
{-# LANGUAGE CPP #-}
{-# LANGUAGE ForeignFunctionInterface #-}
#endif

module Network.Socket.Splice (
    Length
  , zeroCopy
  , splice
#ifdef LINUX_SPLICE
  , c_splice
#endif
  ) where

import Data.Word
import Foreign.Ptr

import Network.Socket
import Control.Monad
import Control.Exception
import System.Posix.Types
import System.Posix.IO

#ifdef LINUX_SPLICE
import Data.Int
import Data.Bits
import Unsafe.Coerce
import Foreign.C.Types
import Foreign.C.Error
import System.Posix.Internals
#else
import System.IO
import Foreign.Marshal.Alloc
#endif


zeroCopy :: Bool
zeroCopy =
#ifdef LINUX_SPLICE
  True
#else
  False
#endif


type Length =
#ifdef LINUX_SPLICE
  (#type size_t)
#else
  Int
#endif


-- | The 'splice' function pipes data from
--   one socket to another in a loop.
--   On Linux this happens in kernel space with
--   zero copying between kernel and user spaces.
--   On other operating systems, a portable
--   implementation utilizes a user space buffer
--   allocated with 'mallocBytes'; 'hGetBufSome'
--   and 'hPut' are then used to avoid repeated 
--   tiny allocations as would happen with 'recv'
--   'sendAll' calls from the 'bytestring' package.
splice :: Length -> Socket -> Socket -> IO ()
splice l (MkSocket x _ _ _ _) (MkSocket y _ _ _ _) = do

  let e  = error "splice ended"

#ifdef LINUX_SPLICE

  (r,w) <- createPipe
  print ('+',r,w)
  let s  = Fd x -- source
  let t  = Fd y -- target
  let c  = throwErrnoIfMinus1 "Network.Socket.Splice.splice"
  let u  = unsafeCoerce :: (#type ssize_t) -> (#type size_t)
  let fs = sPLICE_F_MOVE .|. sPLICE_F_MORE
  let nb v = do setNonBlockingFD x v
                setNonBlockingFD y v
  nb False
  finally
    (forever $ do 
       b <- c $ c_splice s nullPtr w nullPtr    l  fs
       if b > 0
         then   c_splice r nullPtr t nullPtr (u b) fs)
         else   e
    (do closeFd r
        closeFd w
        nb True
        print ('-',r,w))

#else

  -- ..    

#endif


#ifdef LINUX_SPLICE
-- SPLICE

-- fcntl.h
-- ssize_t splice(
--   int          fd_in,
--   loff_t*      off_in,
--   int          fd_out,
--   loff_t*      off_out,
--   size_t       len,
--   unsigned int flags
-- );

foreign import ccall "splice"
  c_splice
  :: Fd
  -> Ptr (#type loff_t)
  -> Fd
  -> Ptr (#type loff_t)
  -> (#type size_t)
  -> Word
  -> IO (#type ssize_t)

sPLICE_F_MOVE :: Word
sPLICE_F_MOVE = (#const "SPLICE_F_MOVE")

sPLICE_F_MORE :: Word
sPLICE_F_MORE = (#const "SPLICE_F_MORE")
#endif

注意: 上面的代码现在可以正常工作了!由于 Nemo,以下不再有效!

splice使用两个打开和连接的套接字(它们已经用于使用套接字 APIsendrecv调用或转换为句柄并与hGetLineand一起使用hPut)传输最少量的握手数据,并且我不断得到:

Network.Socket.Splice.splice: resource exhausted (Resource temporarily unavailable)

在第一个c_splice调用站点:c_splice返回-1并将 some 设置为查找时读取errno的值(可能)。EAGAINresource exhausted | resource temporarily unavailable

splice我用不同的Length值测试了调用: 1024, 8192.

4

2 回答 2

13

我不知道 Haskell,但“资源暂时不可用”是EAGAIN.

看起来Haskell 默认将其套接字设置为非阻塞模式。因此,如果您在没有数据时尝试从其中读取,或者在缓冲区已满时尝试写入其中,您将失败并显示EAGAIN.

弄清楚如何将套接字更改为阻塞模式,我敢打赌你会解决你的问题。

[更新]

或者,在尝试读取或写入套接字之前调用select或。poll但是您仍然需要处理EAGAIN,因为在极少数情况下,Linuxselect会指示套接字已准备就绪,而实际上它并没有。

于 2012-04-09T23:13:14.750 回答
0

sendfile()系统调用对您有用吗?如果是这样,您可以使用sendfile 包

于 2012-04-09T23:27:47.673 回答