{-# LANGUAGE ForeignFunctionInterface #-}
module Torch.FFI.THC.Double.TensorMathReduce where
import Foreign
import Foreign.C.Types
import Data.Word
import Data.Int
import Torch.Types.TH
import Torch.Types.THC
foreign import ccall "THCTensorMathReduce.h THCudaDoubleTensor_renorm"
c_renorm :: Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THCudaDoubleTensor -> CDouble -> CInt -> CDouble -> IO ()
foreign import ccall "THCTensorMathReduce.h THCudaDoubleTensor_std"
c_std :: Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THCudaDoubleTensor -> CInt -> CInt -> CInt -> IO ()
foreign import ccall "THCTensorMathReduce.h THCudaDoubleTensor_norm"
c_norm :: Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THCudaDoubleTensor -> CDouble -> CInt -> CInt -> IO ()
foreign import ccall "THCTensorMathReduce.h THCudaDoubleTensor_var"
c_var :: Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THCudaDoubleTensor -> CInt -> CInt -> CInt -> IO ()
foreign import ccall "THCTensorMathReduce.h THCudaDoubleTensor_stdall"
c_stdall :: Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> CInt -> IO CDouble
foreign import ccall "THCTensorMathReduce.h THCudaDoubleTensor_normall"
c_normall :: Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> CDouble -> IO CDouble
foreign import ccall "THCTensorMathReduce.h THCudaDoubleTensor_varall"
c_varall :: Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> CInt -> IO CDouble
foreign import ccall "THCTensorMathReduce.h THCudaDoubleTensor_sum"
c_sum :: Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THCudaDoubleTensor -> CInt -> CInt -> IO ()
foreign import ccall "THCTensorMathReduce.h THCudaDoubleTensor_prod"
c_prod :: Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THCudaDoubleTensor -> CInt -> CInt -> IO ()
foreign import ccall "THCTensorMathReduce.h THCudaDoubleTensor_mean"
c_mean :: Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THCudaDoubleTensor -> CInt -> CInt -> IO ()
foreign import ccall "THCTensorMathReduce.h THCudaDoubleTensor_sumall"
c_sumall :: Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> IO CDouble
foreign import ccall "THCTensorMathReduce.h THCudaDoubleTensor_prodall"
c_prodall :: Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> IO CDouble
foreign import ccall "THCTensorMathReduce.h THCudaDoubleTensor_meanall"
c_meanall :: Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> IO CDouble
foreign import ccall "THCTensorMathReduce.h THCudaDoubleTensor_min"
c_min :: Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THCudaLongTensor -> Ptr C'THCudaDoubleTensor -> CInt -> CInt -> IO ()
foreign import ccall "THCTensorMathReduce.h THCudaDoubleTensor_max"
c_max :: Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THCudaLongTensor -> Ptr C'THCudaDoubleTensor -> CInt -> CInt -> IO ()
foreign import ccall "THCTensorMathReduce.h THCudaDoubleTensor_minall"
c_minall :: Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> IO CDouble
foreign import ccall "THCTensorMathReduce.h THCudaDoubleTensor_maxall"
c_maxall :: Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> IO CDouble
foreign import ccall "THCTensorMathReduce.h THCudaDoubleTensor_medianall"
c_medianall :: Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> IO CDouble
foreign import ccall "THCTensorMathReduce.h THCudaDoubleTensor_median"
c_median :: Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THCudaLongTensor -> Ptr C'THCudaDoubleTensor -> CInt -> CInt -> IO ()
foreign import ccall "THCTensorMathReduce.h THCudaDoubleTensor_dist"
c_dist :: Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THCudaDoubleTensor -> CDouble -> IO CDouble
foreign import ccall "THCTensorMathReduce.h &THCudaDoubleTensor_renorm"
p_renorm :: FunPtr (Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THCudaDoubleTensor -> CDouble -> CInt -> CDouble -> IO ())
foreign import ccall "THCTensorMathReduce.h &THCudaDoubleTensor_std"
p_std :: FunPtr (Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THCudaDoubleTensor -> CInt -> CInt -> CInt -> IO ())
foreign import ccall "THCTensorMathReduce.h &THCudaDoubleTensor_norm"
p_norm :: FunPtr (Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THCudaDoubleTensor -> CDouble -> CInt -> CInt -> IO ())
foreign import ccall "THCTensorMathReduce.h &THCudaDoubleTensor_var"
p_var :: FunPtr (Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THCudaDoubleTensor -> CInt -> CInt -> CInt -> IO ())
foreign import ccall "THCTensorMathReduce.h &THCudaDoubleTensor_stdall"
p_stdall :: FunPtr (Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> CInt -> IO CDouble)
foreign import ccall "THCTensorMathReduce.h &THCudaDoubleTensor_normall"
p_normall :: FunPtr (Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> CDouble -> IO CDouble)
foreign import ccall "THCTensorMathReduce.h &THCudaDoubleTensor_varall"
p_varall :: FunPtr (Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> CInt -> IO CDouble)
foreign import ccall "THCTensorMathReduce.h &THCudaDoubleTensor_sum"
p_sum :: FunPtr (Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THCudaDoubleTensor -> CInt -> CInt -> IO ())
foreign import ccall "THCTensorMathReduce.h &THCudaDoubleTensor_prod"
p_prod :: FunPtr (Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THCudaDoubleTensor -> CInt -> CInt -> IO ())
foreign import ccall "THCTensorMathReduce.h &THCudaDoubleTensor_mean"
p_mean :: FunPtr (Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THCudaDoubleTensor -> CInt -> CInt -> IO ())
foreign import ccall "THCTensorMathReduce.h &THCudaDoubleTensor_sumall"
p_sumall :: FunPtr (Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> IO CDouble)
foreign import ccall "THCTensorMathReduce.h &THCudaDoubleTensor_prodall"
p_prodall :: FunPtr (Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> IO CDouble)
foreign import ccall "THCTensorMathReduce.h &THCudaDoubleTensor_meanall"
p_meanall :: FunPtr (Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> IO CDouble)
foreign import ccall "THCTensorMathReduce.h &THCudaDoubleTensor_min"
p_min :: FunPtr (Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THCudaLongTensor -> Ptr C'THCudaDoubleTensor -> CInt -> CInt -> IO ())
foreign import ccall "THCTensorMathReduce.h &THCudaDoubleTensor_max"
p_max :: FunPtr (Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THCudaLongTensor -> Ptr C'THCudaDoubleTensor -> CInt -> CInt -> IO ())
foreign import ccall "THCTensorMathReduce.h &THCudaDoubleTensor_minall"
p_minall :: FunPtr (Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> IO CDouble)
foreign import ccall "THCTensorMathReduce.h &THCudaDoubleTensor_maxall"
p_maxall :: FunPtr (Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> IO CDouble)
foreign import ccall "THCTensorMathReduce.h &THCudaDoubleTensor_medianall"
p_medianall :: FunPtr (Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> IO CDouble)
foreign import ccall "THCTensorMathReduce.h &THCudaDoubleTensor_median"
p_median :: FunPtr (Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THCudaLongTensor -> Ptr C'THCudaDoubleTensor -> CInt -> CInt -> IO ())
foreign import ccall "THCTensorMathReduce.h &THCudaDoubleTensor_dist"
p_dist :: FunPtr (Ptr C'THCState -> Ptr C'THCudaDoubleTensor -> Ptr C'THCudaDoubleTensor -> CDouble -> IO CDouble)