{-# language BangPatterns #-}
{-# language DataKinds #-}
module Socket.Stream.Interruptible.Hybrid
( sendMutableBytesUnmanagedBytes
) where
import Control.Concurrent.STM (TVar)
import Data.Bytes.Types (MutableBytes,UnmanagedBytes)
import GHC.Exts (RealWorld)
import Socket (Interruptibility(Interruptible))
import Socket.Stream (Connection,SendException)
import qualified Socket.Stream.Interruptible.MutableBytes.Addr.Send as MBA
sendMutableBytesUnmanagedBytes ::
TVar Bool
-> Connection
-> MutableBytes RealWorld
-> UnmanagedBytes
-> IO (Either (SendException 'Interruptible) ())
sendMutableBytesUnmanagedBytes = MBA.sendBoth