-- GENERATED by C->Haskell Compiler, version 0.28.1 Switcheroo, 1 April 2016 (Haskell)
-- Edit the ORIGNAL .chs file instead!


{-# LINE 1 "./Sound/ProteaAudio.chs" #-}
{-#LANGUAGE ForeignFunctionInterface#-}

module Sound.ProteaAudio (
    initAudio,
    finishAudio,
    loaderAvailable,
    volume,
    sampleFromMemoryWav,
    sampleFromMemoryOgg,
    sampleFromFile,
    soundActive,
    soundStopAll,
    soundLoop,
    soundPlay,
    soundUpdate,
    soundStop,
    Sample()
 ) where
import qualified Foreign.C.String as C2HSImp
import qualified Foreign.C.Types as C2HSImp
import qualified Foreign.Marshal.Utils as C2HSImp
import qualified Foreign.Ptr as C2HSImp



import Foreign
import Foreign.C

newtype Sample = Sample (C2HSImp.CInt)
{-# LINE 23 "./Sound/ProteaAudio.chs" #-}


toSample s = Sample s
fromSample (Sample s) = s

initAudio :: (Int) -> (Int) -> (Int) -> IO ((Bool))
initAudio a1 a2 a3 =
  let {a1' = fromIntegral a1} in 
  let {a2' = fromIntegral a2} in 
  let {a3' = fromIntegral a3} in 
  initAudio'_ a1' a2' a3' >>= \res ->
  let {res' = C2HSImp.toBool res} in
  return (res')

{-# LINE 28 "./Sound/ProteaAudio.chs" #-}

finishAudio :: IO ()
finishAudio =
  finishAudio'_ >>
  return ()

{-# LINE 29 "./Sound/ProteaAudio.chs" #-}

loaderAvailable :: (String) -> IO ((Bool))
loaderAvailable a1 =
  C2HSImp.withCString a1 $ \a1' -> 
  loaderAvailable'_ a1' >>= \res ->
  let {res' = C2HSImp.toBool res} in
  return (res')

{-# LINE 30 "./Sound/ProteaAudio.chs" #-}

sampleFromMemoryWav :: (Ptr CChar) -> (Int) -> (Float) -> IO ((Sample))
sampleFromMemoryWav a1 a2 a3 =
  let {a1' = id a1} in 
  let {a2' = fromIntegral a2} in 
  let {a3' = realToFrac a3} in 
  sampleFromMemoryWav'_ a1' a2' a3' >>= \res ->
  let {res' = toSample res} in
  return (res')

{-# LINE 31 "./Sound/ProteaAudio.chs" #-}

sampleFromMemoryOgg :: (Ptr CChar) -> (Int) -> (Float) -> IO ((Sample))
sampleFromMemoryOgg a1 a2 a3 =
  let {a1' = id a1} in 
  let {a2' = fromIntegral a2} in 
  let {a3' = realToFrac a3} in 
  sampleFromMemoryOgg'_ a1' a2' a3' >>= \res ->
  let {res' = toSample res} in
  return (res')

{-# LINE 32 "./Sound/ProteaAudio.chs" #-}

sampleFromFile :: (String) -> (Float) -> IO ((Sample))
sampleFromFile a1 a2 =
  C2HSImp.withCString a1 $ \a1' -> 
  let {a2' = realToFrac a2} in 
  sampleFromFile'_ a1' a2' >>= \res ->
  let {res' = toSample res} in
  return (res')

{-# LINE 33 "./Sound/ProteaAudio.chs" #-}


volume :: (Float) -> (Float) -> IO ()
volume a1 a2 =
  let {a1' = realToFrac a1} in 
  let {a2' = realToFrac a2} in 
  volume'_ a1' a2' >>
  return ()

{-# LINE 35 "./Sound/ProteaAudio.chs" #-}

soundActive :: IO ((Int))
soundActive =
  soundActive'_ >>= \res ->
  let {res' = fromIntegral res} in
  return (res')

{-# LINE 36 "./Sound/ProteaAudio.chs" #-}

soundStopAll :: IO ()
soundStopAll =
  soundStopAll'_ >>
  return ()

{-# LINE 37 "./Sound/ProteaAudio.chs" #-}


soundLoop :: (Sample) -> (Float) -> (Float) -> (Float) -> (Float) -> IO ()
soundLoop a1 a2 a3 a4 a5 =
  let {a1' = fromSample a1} in 
  let {a2' = realToFrac a2} in 
  let {a3' = realToFrac a3} in 
  let {a4' = realToFrac a4} in 
  let {a5' = realToFrac a5} in 
  soundLoop'_ a1' a2' a3' a4' a5' >>
  return ()

{-# LINE 39 "./Sound/ProteaAudio.chs" #-}

soundPlay :: (Sample) -> (Float) -> (Float) -> (Float) -> (Float) -> IO ()
soundPlay a1 a2 a3 a4 a5 =
  let {a1' = fromSample a1} in 
  let {a2' = realToFrac a2} in 
  let {a3' = realToFrac a3} in 
  let {a4' = realToFrac a4} in 
  let {a5' = realToFrac a5} in 
  soundPlay'_ a1' a2' a3' a4' a5' >>
  return ()

{-# LINE 40 "./Sound/ProteaAudio.chs" #-}

soundUpdate :: (Sample) -> (Float) -> (Float) -> (Float) -> (Float) -> IO ((Bool))
soundUpdate a1 a2 a3 a4 a5 =
  let {a1' = fromSample a1} in 
  let {a2' = realToFrac a2} in 
  let {a3' = realToFrac a3} in 
  let {a4' = realToFrac a4} in 
  let {a5' = realToFrac a5} in 
  soundUpdate'_ a1' a2' a3' a4' a5' >>= \res ->
  let {res' = C2HSImp.toBool res} in
  return (res')

{-# LINE 41 "./Sound/ProteaAudio.chs" #-}

soundStop :: (Sample) -> IO ((Bool))
soundStop a1 =
  let {a1' = fromSample a1} in 
  soundStop'_ a1' >>= \res ->
  let {res' = C2HSImp.toBool res} in
  return (res')

{-# LINE 42 "./Sound/ProteaAudio.chs" #-}


foreign import ccall safe "Sound/ProteaAudio.chs.h initAudio"
  initAudio'_ :: (C2HSImp.CInt -> (C2HSImp.CInt -> (C2HSImp.CInt -> (IO C2HSImp.CInt))))

foreign import ccall safe "Sound/ProteaAudio.chs.h finishAudio"
  finishAudio'_ :: (IO ())

foreign import ccall safe "Sound/ProteaAudio.chs.h loaderAvailable"
  loaderAvailable'_ :: ((C2HSImp.Ptr C2HSImp.CChar) -> (IO C2HSImp.CInt))

foreign import ccall safe "Sound/ProteaAudio.chs.h sampleFromMemoryWav"
  sampleFromMemoryWav'_ :: ((C2HSImp.Ptr C2HSImp.CChar) -> (C2HSImp.CInt -> (C2HSImp.CFloat -> (IO C2HSImp.CInt))))

foreign import ccall safe "Sound/ProteaAudio.chs.h sampleFromMemoryOgg"
  sampleFromMemoryOgg'_ :: ((C2HSImp.Ptr C2HSImp.CChar) -> (C2HSImp.CInt -> (C2HSImp.CFloat -> (IO C2HSImp.CInt))))

foreign import ccall safe "Sound/ProteaAudio.chs.h sampleFromFile"
  sampleFromFile'_ :: ((C2HSImp.Ptr C2HSImp.CChar) -> (C2HSImp.CFloat -> (IO C2HSImp.CInt)))

foreign import ccall safe "Sound/ProteaAudio.chs.h volume"
  volume'_ :: (C2HSImp.CFloat -> (C2HSImp.CFloat -> (IO ())))

foreign import ccall safe "Sound/ProteaAudio.chs.h soundActive"
  soundActive'_ :: (IO C2HSImp.CInt)

foreign import ccall safe "Sound/ProteaAudio.chs.h soundStopAll"
  soundStopAll'_ :: (IO ())

foreign import ccall safe "Sound/ProteaAudio.chs.h soundLoop"
  soundLoop'_ :: (C2HSImp.CInt -> (C2HSImp.CFloat -> (C2HSImp.CFloat -> (C2HSImp.CFloat -> (C2HSImp.CFloat -> (IO ()))))))

foreign import ccall safe "Sound/ProteaAudio.chs.h soundPlay"
  soundPlay'_ :: (C2HSImp.CInt -> (C2HSImp.CFloat -> (C2HSImp.CFloat -> (C2HSImp.CFloat -> (C2HSImp.CFloat -> (IO ()))))))

foreign import ccall safe "Sound/ProteaAudio.chs.h soundUpdate"
  soundUpdate'_ :: (C2HSImp.CInt -> (C2HSImp.CFloat -> (C2HSImp.CFloat -> (C2HSImp.CFloat -> (C2HSImp.CFloat -> (IO C2HSImp.CInt))))))

foreign import ccall safe "Sound/ProteaAudio.chs.h soundStop"
  soundStop'_ :: (C2HSImp.CInt -> (IO C2HSImp.CInt))