-- GENERATED by C->Haskell Compiler, version 0.26.1 Budburst, 4 April 2015 (Haskell)
-- Edit the ORIGNAL .chs file instead!


{-# LINE 1 "src/Sound/AL/Types.chs" #-}
-----------------------------------------------------------------------------
-- |
-- Copyright   : (C) 2015 Dimitri Sabadie
-- License     : BSD3
--
-- Maintainer  : Dimitri Sabadie <dimitri.sabadie@gmail.com>
-- Stability   : experimental
-- Portability : portable
----------------------------------------------------------------------------

module Sound.AL.Types where
import qualified Foreign.C.Types as C2HSImp



import Foreign.C.Types



type ALboolean = (C2HSImp.CChar)
{-# LINE 17 "src/Sound/AL/Types.chs" #-}

type ALchar = (C2HSImp.CChar)
{-# LINE 18 "src/Sound/AL/Types.chs" #-}

type ALbyte = (C2HSImp.CSChar)
{-# LINE 19 "src/Sound/AL/Types.chs" #-}

type ALubyte = (C2HSImp.CUChar)
{-# LINE 20 "src/Sound/AL/Types.chs" #-}

type ALshort = (C2HSImp.CShort)
{-# LINE 21 "src/Sound/AL/Types.chs" #-}

type ALushort = (C2HSImp.CUShort)
{-# LINE 22 "src/Sound/AL/Types.chs" #-}

type ALint = (C2HSImp.CInt)
{-# LINE 23 "src/Sound/AL/Types.chs" #-}

type ALuint = (C2HSImp.CUInt)
{-# LINE 24 "src/Sound/AL/Types.chs" #-}

type ALsizei = (C2HSImp.CInt)
{-# LINE 25 "src/Sound/AL/Types.chs" #-}

type ALenum = (C2HSImp.CInt)
{-# LINE 26 "src/Sound/AL/Types.chs" #-}

type ALfloat = (C2HSImp.CFloat)
{-# LINE 27 "src/Sound/AL/Types.chs" #-}

type ALdouble = (C2HSImp.CDouble)
{-# LINE 28 "src/Sound/AL/Types.chs" #-}

type ALvoid = (())
{-# LINE 29 "src/Sound/AL/Types.chs" #-}