{-# LANGUAGE ForeignFunctionInterface #-}
module Torch.FFI.THC.Short.TensorMathPairwise where
import Foreign
import Foreign.C.Types
import Data.Word
import Data.Int
import Torch.Types.TH
import Torch.Types.THC
foreign import ccall "THCTensorMathPairwise.h THCudaShortTensor_add"
c_add :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> CShort -> IO ()
foreign import ccall "THCTensorMathPairwise.h THCudaShortTensor_sub"
c_sub :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> CShort -> IO ()
foreign import ccall "THCTensorMathPairwise.h THCudaShortTensor_add_scaled"
c_add_scaled :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> CShort -> CShort -> IO ()
foreign import ccall "THCTensorMathPairwise.h THCudaShortTensor_sub_scaled"
c_sub_scaled :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> CShort -> CShort -> IO ()
foreign import ccall "THCTensorMathPairwise.h THCudaShortTensor_mul"
c_mul :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> CShort -> IO ()
foreign import ccall "THCTensorMathPairwise.h THCudaShortTensor_div"
c_div :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> CShort -> IO ()
foreign import ccall "THCTensorMathPairwise.h THCudaShortTensor_lshift"
c_lshift :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> CShort -> IO ()
foreign import ccall "THCTensorMathPairwise.h THCudaShortTensor_rshift"
c_rshift :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> CShort -> IO ()
foreign import ccall "THCTensorMathPairwise.h THCudaShortTensor_fmod"
c_fmod :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> CShort -> IO ()
foreign import ccall "THCTensorMathPairwise.h THCudaShortTensor_remainder"
c_remainder :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> CShort -> IO ()
foreign import ccall "THCTensorMathPairwise.h THCudaShortTensor_bitand"
c_bitand :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> CShort -> IO ()
foreign import ccall "THCTensorMathPairwise.h THCudaShortTensor_bitor"
c_bitor :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> CShort -> IO ()
foreign import ccall "THCTensorMathPairwise.h THCudaShortTensor_bitxor"
c_bitxor :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> CShort -> IO ()
foreign import ccall "THCTensorMathPairwise.h THCudaShortTensor_equal"
c_equal :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> IO CInt
foreign import ccall "THCTensorMathPairwise.h &THCudaShortTensor_add"
p_add :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> CShort -> IO ())
foreign import ccall "THCTensorMathPairwise.h &THCudaShortTensor_sub"
p_sub :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> CShort -> IO ())
foreign import ccall "THCTensorMathPairwise.h &THCudaShortTensor_add_scaled"
p_add_scaled :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> CShort -> CShort -> IO ())
foreign import ccall "THCTensorMathPairwise.h &THCudaShortTensor_sub_scaled"
p_sub_scaled :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> CShort -> CShort -> IO ())
foreign import ccall "THCTensorMathPairwise.h &THCudaShortTensor_mul"
p_mul :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> CShort -> IO ())
foreign import ccall "THCTensorMathPairwise.h &THCudaShortTensor_div"
p_div :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> CShort -> IO ())
foreign import ccall "THCTensorMathPairwise.h &THCudaShortTensor_lshift"
p_lshift :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> CShort -> IO ())
foreign import ccall "THCTensorMathPairwise.h &THCudaShortTensor_rshift"
p_rshift :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> CShort -> IO ())
foreign import ccall "THCTensorMathPairwise.h &THCudaShortTensor_fmod"
p_fmod :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> CShort -> IO ())
foreign import ccall "THCTensorMathPairwise.h &THCudaShortTensor_remainder"
p_remainder :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> CShort -> IO ())
foreign import ccall "THCTensorMathPairwise.h &THCudaShortTensor_bitand"
p_bitand :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> CShort -> IO ())
foreign import ccall "THCTensorMathPairwise.h &THCudaShortTensor_bitor"
p_bitor :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> CShort -> IO ())
foreign import ccall "THCTensorMathPairwise.h &THCudaShortTensor_bitxor"
p_bitxor :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> CShort -> IO ())
foreign import ccall "THCTensorMathPairwise.h &THCudaShortTensor_equal"
p_equal :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> IO CInt)