{-# LANGUAGE CPP #-}

module Sound.Libcdio.Common
    ( (<>)
    , CBool
    ) where


#if MIN_VERSION_base(4,11,0)
#else
import Data.Monoid ( (<>) )
#endif


#if MIN_VERSION_base(4,10,0)
import Foreign.C.Types ( CBool )
#else
import qualified Foreign.C.Types as C
type CBool = C.CUChar
#endif