{-# LANGUAGE ForeignFunctionInterface #-}
module Torch.FFI.THC.Double.TensorCopy where
import Foreign
import Foreign.C.Types
import Data.Word
import Data.Int
import Torch.Types.TH
import Torch.Types.THC
foreign import ccall "THCTensorCopy.h THCudaDoubleTensor_copy"
c_copy :: Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THCudaDoubleTensor -> IO ()
foreign import ccall "THCTensorCopy.h THCudaDoubleTensor_copyIgnoringOverlaps"
c_copyIgnoringOverlaps :: Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THCudaDoubleTensor -> IO ()
foreign import ccall "THCTensorCopy.h THCudaDoubleTensor_copyByte"
c_copyByte :: Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THByteTensor -> IO ()
foreign import ccall "THCTensorCopy.h THCudaDoubleTensor_copyChar"
c_copyChar :: Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THCharTensor -> IO ()
foreign import ccall "THCTensorCopy.h THCudaDoubleTensor_copyShort"
c_copyShort :: Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THShortTensor -> IO ()
foreign import ccall "THCTensorCopy.h THCudaDoubleTensor_copyInt"
c_copyInt :: Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THIntTensor -> IO ()
foreign import ccall "THCTensorCopy.h THCudaDoubleTensor_copyLong"
c_copyLong :: Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THLongTensor -> IO ()
foreign import ccall "THCTensorCopy.h THCudaDoubleTensor_copyFloat"
c_copyFloat :: Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THFloatTensor -> IO ()
foreign import ccall "THCTensorCopy.h THCudaDoubleTensor_copyDouble"
c_copyDouble :: Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THDoubleTensor -> IO ()
foreign import ccall "THCTensorCopy.h THCudaDoubleTensor_copyHalf"
c_copyHalf :: Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THHalfTensor -> IO ()
foreign import ccall "THCTensorCopy.h THCudaDoubleTensor_copyCudaByte"
c_copyCudaByte :: Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THCudaByteTensor -> IO ()
foreign import ccall "THCTensorCopy.h THCudaDoubleTensor_copyCudaChar"
c_copyCudaChar :: Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THCudaCharTensor -> IO ()
foreign import ccall "THCTensorCopy.h THCudaDoubleTensor_copyCudaShort"
c_copyCudaShort :: Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THCudaShortTensor -> IO ()
foreign import ccall "THCTensorCopy.h THCudaDoubleTensor_copyCudaInt"
c_copyCudaInt :: Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THCudaIntTensor -> IO ()
foreign import ccall "THCTensorCopy.h THCudaDoubleTensor_copyCudaLong"
c_copyCudaLong :: Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THCudaLongTensor -> IO ()
foreign import ccall "THCTensorCopy.h THCudaDoubleTensor_copyCudaDouble"
c_copyCudaDouble :: Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THCudaDoubleTensor -> IO ()
foreign import ccall "THCTensorCopy.h THCudaDoubleTensor_copyCuda"
c_copyCuda :: Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THCudaDoubleTensor -> IO ()
foreign import ccall "THCTensorCopy.h THDoubleTensor_copyCuda"
c_thCopyCuda :: Ptr C'THCState -> Ptr C'THDoubleTensor -> Ptr C'THCudaDoubleTensor -> IO ()
foreign import ccall "THCTensorCopy.h THCudaDoubleTensor_copyCPU"
c_copyCPU :: Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THDoubleTensor -> IO ()
foreign import ccall "THCTensorCopy.h THCudaDoubleTensor_copyAsyncCPU"
c_copyAsyncCPU :: Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THDoubleTensor -> IO ()
foreign import ccall "THCTensorCopy.h THDoubleTensor_copyAsyncCuda"
c_thCopyAsyncCuda :: Ptr C'THCState -> Ptr C'THDoubleTensor -> Ptr C'THCudaDoubleTensor -> IO ()
foreign import ccall "THCTensorCopy.h &THCudaDoubleTensor_copy"
p_copy :: FunPtr (Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THCudaDoubleTensor -> IO ())
foreign import ccall "THCTensorCopy.h &THCudaDoubleTensor_copyIgnoringOverlaps"
p_copyIgnoringOverlaps :: FunPtr (Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THCudaDoubleTensor -> IO ())
foreign import ccall "THCTensorCopy.h &THCudaDoubleTensor_copyByte"
p_copyByte :: FunPtr (Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THByteTensor -> IO ())
foreign import ccall "THCTensorCopy.h &THCudaDoubleTensor_copyChar"
p_copyChar :: FunPtr (Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THCharTensor -> IO ())
foreign import ccall "THCTensorCopy.h &THCudaDoubleTensor_copyShort"
p_copyShort :: FunPtr (Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THShortTensor -> IO ())
foreign import ccall "THCTensorCopy.h &THCudaDoubleTensor_copyInt"
p_copyInt :: FunPtr (Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THIntTensor -> IO ())
foreign import ccall "THCTensorCopy.h &THCudaDoubleTensor_copyLong"
p_copyLong :: FunPtr (Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THLongTensor -> IO ())
foreign import ccall "THCTensorCopy.h &THCudaDoubleTensor_copyFloat"
p_copyFloat :: FunPtr (Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THFloatTensor -> IO ())
foreign import ccall "THCTensorCopy.h &THCudaDoubleTensor_copyDouble"
p_copyDouble :: FunPtr (Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THDoubleTensor -> IO ())
foreign import ccall "THCTensorCopy.h &THCudaDoubleTensor_copyHalf"
p_copyHalf :: FunPtr (Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THHalfTensor -> IO ())
foreign import ccall "THCTensorCopy.h &THCudaDoubleTensor_copyCudaByte"
p_copyCudaByte :: FunPtr (Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THCudaByteTensor -> IO ())
foreign import ccall "THCTensorCopy.h &THCudaDoubleTensor_copyCudaChar"
p_copyCudaChar :: FunPtr (Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THCudaCharTensor -> IO ())
foreign import ccall "THCTensorCopy.h &THCudaDoubleTensor_copyCudaShort"
p_copyCudaShort :: FunPtr (Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THCudaShortTensor -> IO ())
foreign import ccall "THCTensorCopy.h &THCudaDoubleTensor_copyCudaInt"
p_copyCudaInt :: FunPtr (Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THCudaIntTensor -> IO ())
foreign import ccall "THCTensorCopy.h &THCudaDoubleTensor_copyCudaLong"
p_copyCudaLong :: FunPtr (Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THCudaLongTensor -> IO ())
foreign import ccall "THCTensorCopy.h &THCudaDoubleTensor_copyCudaDouble"
p_copyCudaDouble :: FunPtr (Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THCudaDoubleTensor -> IO ())
foreign import ccall "THCTensorCopy.h &THCudaDoubleTensor_copyCuda"
p_copyCuda :: FunPtr (Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THCudaDoubleTensor -> IO ())
foreign import ccall "THCTensorCopy.h &THDoubleTensor_copyCuda"
p_thCopyCuda :: FunPtr (Ptr C'THCState -> Ptr C'THDoubleTensor -> Ptr C'THCudaDoubleTensor -> IO ())
foreign import ccall "THCTensorCopy.h &THCudaDoubleTensor_copyCPU"
p_copyCPU :: FunPtr (Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THDoubleTensor -> IO ())
foreign import ccall "THCTensorCopy.h &THCudaDoubleTensor_copyAsyncCPU"
p_copyAsyncCPU :: FunPtr (Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THDoubleTensor -> IO ())
foreign import ccall "THCTensorCopy.h &THDoubleTensor_copyAsyncCuda"
p_thCopyAsyncCuda :: FunPtr (Ptr C'THCState -> Ptr C'THDoubleTensor -> Ptr C'THCudaDoubleTensor -> IO ())