{-# LANGUAGE ForeignFunctionInterface #-}
module Torch.FFI.THC.Short.TensorMathPointwise where
import Foreign
import Foreign.C.Types
import Data.Word
import Data.Int
import Torch.Types.TH
import Torch.Types.THC
foreign import ccall "THCTensorMathPointwise.h THCudaShortTensor_neg"
  c_neg :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> IO ()
foreign import ccall "THCTensorMathPointwise.h THCudaShortTensor_abs"
  c_abs :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> IO ()
foreign import ccall "THCTensorMathPointwise.h THCudaShortTensor_sign"
  c_sign :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> IO ()
foreign import ccall "THCTensorMathPointwise.h THCudaShortTensor_clamp"
  c_clamp :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> CShort -> CShort -> IO ()
foreign import ccall "THCTensorMathPointwise.h THCudaShortTensor_cross"
  c_cross :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> CInt -> IO ()
foreign import ccall "THCTensorMathPointwise.h THCudaShortTensor_cadd"
  c_cadd :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> CShort -> Ptr C'THCudaShortTensor -> IO ()
foreign import ccall "THCTensorMathPointwise.h THCudaShortTensor_csub"
  c_csub :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> CShort -> Ptr C'THCudaShortTensor -> IO ()
foreign import ccall "THCTensorMathPointwise.h THCudaShortTensor_cmul"
  c_cmul :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> IO ()
foreign import ccall "THCTensorMathPointwise.h THCudaShortTensor_cpow"
  c_cpow :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> IO ()
foreign import ccall "THCTensorMathPointwise.h THCudaShortTensor_cdiv"
  c_cdiv :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> IO ()
foreign import ccall "THCTensorMathPointwise.h THCudaShortTensor_clshift"
  c_clshift :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> IO ()
foreign import ccall "THCTensorMathPointwise.h THCudaShortTensor_crshift"
  c_crshift :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> IO ()
foreign import ccall "THCTensorMathPointwise.h THCudaShortTensor_cmax"
  c_cmax :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> IO ()
foreign import ccall "THCTensorMathPointwise.h THCudaShortTensor_cmin"
  c_cmin :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> IO ()
foreign import ccall "THCTensorMathPointwise.h THCudaShortTensor_cfmod"
  c_cfmod :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> IO ()
foreign import ccall "THCTensorMathPointwise.h THCudaShortTensor_cremainder"
  c_cremainder :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> IO ()
foreign import ccall "THCTensorMathPointwise.h THCudaShortTensor_cmaxValue"
  c_cmaxValue :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> CShort -> IO ()
foreign import ccall "THCTensorMathPointwise.h THCudaShortTensor_cminValue"
  c_cminValue :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> CShort -> IO ()
foreign import ccall "THCTensorMathPointwise.h THCudaShortTensor_cbitand"
  c_cbitand :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> IO ()
foreign import ccall "THCTensorMathPointwise.h THCudaShortTensor_cbitor"
  c_cbitor :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> IO ()
foreign import ccall "THCTensorMathPointwise.h THCudaShortTensor_cbitxor"
  c_cbitxor :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> IO ()
foreign import ccall "THCTensorMathPointwise.h THCudaShortTensor_addcmul"
  c_addcmul :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> CShort -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> IO ()
foreign import ccall "THCTensorMathPointwise.h THCudaShortTensor_addcdiv"
  c_addcdiv :: Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> CShort -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> IO ()
foreign import ccall "THCTensorMathPointwise.h &THCudaShortTensor_neg"
  p_neg :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> IO ())
foreign import ccall "THCTensorMathPointwise.h &THCudaShortTensor_abs"
  p_abs :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> IO ())
foreign import ccall "THCTensorMathPointwise.h &THCudaShortTensor_sign"
  p_sign :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> IO ())
foreign import ccall "THCTensorMathPointwise.h &THCudaShortTensor_clamp"
  p_clamp :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> CShort -> CShort -> IO ())
foreign import ccall "THCTensorMathPointwise.h &THCudaShortTensor_cross"
  p_cross :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> CInt -> IO ())
foreign import ccall "THCTensorMathPointwise.h &THCudaShortTensor_cadd"
  p_cadd :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> CShort -> Ptr C'THCudaShortTensor -> IO ())
foreign import ccall "THCTensorMathPointwise.h &THCudaShortTensor_csub"
  p_csub :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> CShort -> Ptr C'THCudaShortTensor -> IO ())
foreign import ccall "THCTensorMathPointwise.h &THCudaShortTensor_cmul"
  p_cmul :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> IO ())
foreign import ccall "THCTensorMathPointwise.h &THCudaShortTensor_cpow"
  p_cpow :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> IO ())
foreign import ccall "THCTensorMathPointwise.h &THCudaShortTensor_cdiv"
  p_cdiv :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> IO ())
foreign import ccall "THCTensorMathPointwise.h &THCudaShortTensor_clshift"
  p_clshift :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> IO ())
foreign import ccall "THCTensorMathPointwise.h &THCudaShortTensor_crshift"
  p_crshift :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> IO ())
foreign import ccall "THCTensorMathPointwise.h &THCudaShortTensor_cmax"
  p_cmax :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> IO ())
foreign import ccall "THCTensorMathPointwise.h &THCudaShortTensor_cmin"
  p_cmin :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> IO ())
foreign import ccall "THCTensorMathPointwise.h &THCudaShortTensor_cfmod"
  p_cfmod :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> IO ())
foreign import ccall "THCTensorMathPointwise.h &THCudaShortTensor_cremainder"
  p_cremainder :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> IO ())
foreign import ccall "THCTensorMathPointwise.h &THCudaShortTensor_cmaxValue"
  p_cmaxValue :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> CShort -> IO ())
foreign import ccall "THCTensorMathPointwise.h &THCudaShortTensor_cminValue"
  p_cminValue :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> CShort -> IO ())
foreign import ccall "THCTensorMathPointwise.h &THCudaShortTensor_cbitand"
  p_cbitand :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> IO ())
foreign import ccall "THCTensorMathPointwise.h &THCudaShortTensor_cbitor"
  p_cbitor :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> IO ())
foreign import ccall "THCTensorMathPointwise.h &THCudaShortTensor_cbitxor"
  p_cbitxor :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> IO ())
foreign import ccall "THCTensorMathPointwise.h &THCudaShortTensor_addcmul"
  p_addcmul :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> CShort -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> IO ())
foreign import ccall "THCTensorMathPointwise.h &THCudaShortTensor_addcdiv"
  p_addcdiv :: FunPtr (Ptr C'THCState -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> CShort -> Ptr C'THCudaShortTensor -> Ptr C'THCudaShortTensor -> IO ())