{-# LANGUAGE ForeignFunctionInterface #-}
module Torch.FFI.THC.Short.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 THCudaShortTensor_copy"
  c_copy :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> IO ()
foreign import ccall "THCTensorCopy.h THCudaShortTensor_copyIgnoringOverlaps"
  c_copyIgnoringOverlaps :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> IO ()
foreign import ccall "THCTensorCopy.h THCudaShortTensor_copyByte"
  c_copyByte :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THByteTensor -> IO ()
foreign import ccall "THCTensorCopy.h THCudaShortTensor_copyChar"
  c_copyChar :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCharTensor -> IO ()
foreign import ccall "THCTensorCopy.h THCudaShortTensor_copyShort"
  c_copyShort :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THShortTensor -> IO ()
foreign import ccall "THCTensorCopy.h THCudaShortTensor_copyInt"
  c_copyInt :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THIntTensor -> IO ()
foreign import ccall "THCTensorCopy.h THCudaShortTensor_copyLong"
  c_copyLong :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THLongTensor -> IO ()
foreign import ccall "THCTensorCopy.h THCudaShortTensor_copyFloat"
  c_copyFloat :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THFloatTensor -> IO ()
foreign import ccall "THCTensorCopy.h THCudaShortTensor_copyDouble"
  c_copyDouble :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THDoubleTensor -> IO ()
foreign import ccall "THCTensorCopy.h THCudaShortTensor_copyHalf"
  c_copyHalf :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THHalfTensor -> IO ()
foreign import ccall "THCTensorCopy.h THCudaShortTensor_copyCudaByte"
  c_copyCudaByte :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaByteTensor -> IO ()
foreign import ccall "THCTensorCopy.h THCudaShortTensor_copyCudaChar"
  c_copyCudaChar :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaCharTensor -> IO ()
foreign import ccall "THCTensorCopy.h THCudaShortTensor_copyCudaShort"
  c_copyCudaShort :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> IO ()
foreign import ccall "THCTensorCopy.h THCudaShortTensor_copyCudaInt"
  c_copyCudaInt :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaIntTensor -> IO ()
foreign import ccall "THCTensorCopy.h THCudaShortTensor_copyCudaLong"
  c_copyCudaLong :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaLongTensor -> IO ()
foreign import ccall "THCTensorCopy.h THCudaShortTensor_copyCudaDouble"
  c_copyCudaDouble :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaDoubleTensor -> IO ()
foreign import ccall "THCTensorCopy.h THCudaShortTensor_copyCuda"
  c_copyCuda :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> IO ()
foreign import ccall "THCTensorCopy.h THShortTensor_copyCuda"
  c_thCopyCuda :: Ptr C'THCState -> Ptr C'THShortTensor -> Ptr C'THCudaShortTensor -> IO ()
foreign import ccall "THCTensorCopy.h THCudaShortTensor_copyCPU"
  c_copyCPU :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THShortTensor -> IO ()
foreign import ccall "THCTensorCopy.h THCudaShortTensor_copyAsyncCPU"
  c_copyAsyncCPU :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THShortTensor -> IO ()
foreign import ccall "THCTensorCopy.h THShortTensor_copyAsyncCuda"
  c_thCopyAsyncCuda :: Ptr C'THCState -> Ptr C'THShortTensor -> Ptr C'THCudaShortTensor -> IO ()
foreign import ccall "THCTensorCopy.h &THCudaShortTensor_copy"
  p_copy :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> IO ())
foreign import ccall "THCTensorCopy.h &THCudaShortTensor_copyIgnoringOverlaps"
  p_copyIgnoringOverlaps :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> IO ())
foreign import ccall "THCTensorCopy.h &THCudaShortTensor_copyByte"
  p_copyByte :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THByteTensor -> IO ())
foreign import ccall "THCTensorCopy.h &THCudaShortTensor_copyChar"
  p_copyChar :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCharTensor -> IO ())
foreign import ccall "THCTensorCopy.h &THCudaShortTensor_copyShort"
  p_copyShort :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THShortTensor -> IO ())
foreign import ccall "THCTensorCopy.h &THCudaShortTensor_copyInt"
  p_copyInt :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THIntTensor -> IO ())
foreign import ccall "THCTensorCopy.h &THCudaShortTensor_copyLong"
  p_copyLong :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THLongTensor -> IO ())
foreign import ccall "THCTensorCopy.h &THCudaShortTensor_copyFloat"
  p_copyFloat :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THFloatTensor -> IO ())
foreign import ccall "THCTensorCopy.h &THCudaShortTensor_copyDouble"
  p_copyDouble :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THDoubleTensor -> IO ())
foreign import ccall "THCTensorCopy.h &THCudaShortTensor_copyHalf"
  p_copyHalf :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THHalfTensor -> IO ())
foreign import ccall "THCTensorCopy.h &THCudaShortTensor_copyCudaByte"
  p_copyCudaByte :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaByteTensor -> IO ())
foreign import ccall "THCTensorCopy.h &THCudaShortTensor_copyCudaChar"
  p_copyCudaChar :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaCharTensor -> IO ())
foreign import ccall "THCTensorCopy.h &THCudaShortTensor_copyCudaShort"
  p_copyCudaShort :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> IO ())
foreign import ccall "THCTensorCopy.h &THCudaShortTensor_copyCudaInt"
  p_copyCudaInt :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaIntTensor -> IO ())
foreign import ccall "THCTensorCopy.h &THCudaShortTensor_copyCudaLong"
  p_copyCudaLong :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaLongTensor -> IO ())
foreign import ccall "THCTensorCopy.h &THCudaShortTensor_copyCudaDouble"
  p_copyCudaDouble :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaDoubleTensor -> IO ())
foreign import ccall "THCTensorCopy.h &THCudaShortTensor_copyCuda"
  p_copyCuda :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> IO ())
foreign import ccall "THCTensorCopy.h &THShortTensor_copyCuda"
  p_thCopyCuda :: FunPtr (Ptr C'THCState -> Ptr C'THShortTensor -> Ptr C'THCudaShortTensor -> IO ())
foreign import ccall "THCTensorCopy.h &THCudaShortTensor_copyCPU"
  p_copyCPU :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THShortTensor -> IO ())
foreign import ccall "THCTensorCopy.h &THCudaShortTensor_copyAsyncCPU"
  p_copyAsyncCPU :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THShortTensor -> IO ())
foreign import ccall "THCTensorCopy.h &THShortTensor_copyAsyncCuda"
  p_thCopyAsyncCuda :: FunPtr (Ptr C'THCState -> Ptr C'THShortTensor -> Ptr C'THCudaShortTensor -> IO ())