-- GENERATED by C->Haskell Compiler, version 0.23.1 Snowbounder, 31 Oct 2014 (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 Foreign.C.Types



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

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

type ALbyte = (CChar)
{-# LINE 19 "src\\Sound\\AL\\Types.chs" #-}

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

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

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

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

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

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

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

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

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

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