{-# LINE 1 "src/Bindings/Posix/Locale.hsc" #-}

{-# LINE 2 "src/Bindings/Posix/Locale.hsc" #-}

{-# LINE 3 "src/Bindings/Posix/Locale.hsc" #-}

-- | <http://www.opengroup.org/onlinepubs/9699919799/basedefs/locale.h.html>

module Bindings.Posix.Locale where
import Foreign.Ptr (Ptr,FunPtr,plusPtr)
import Foreign.Ptr (wordPtrToPtr,castPtrToFunPtr)
import Foreign.Storable
import Foreign.C.Types
import Foreign.C.String (CString,CStringLen,CWString,CWStringLen)
import Foreign.Marshal.Alloc (alloca)
import Foreign.Marshal.Array (peekArray,pokeArray)
import Data.Int
import Data.Word

{-# LINE 8 "src/Bindings/Posix/Locale.hsc" #-}

c'LC_MESSAGES = 5
c'LC_MESSAGES :: (Num a) => a

{-# LINE 10 "src/Bindings/Posix/Locale.hsc" #-}
-- #num LC_COLLATE_MASK
-- #num LC_CTYPE_MASK
-- #num LC_MESSAGES_MASK
-- #num LC_MONETARY_MASK
-- #num LC_NUMERIC_MASK
-- #num LC_TIME_MASK
-- #num LC_ALL_MASK

-- #integral_t locale_t

-- #ccall duplocale , <locale_t> -> IO <locale_t>
-- #ccall freelocale , <locale_t> -> IO ()
-- #ccall newlocale , CInt -> CString -> <locale_t> -> IO <locale_t>
-- #ccall uselocale , <locale_t> -> IO <locale_t>