Skip to content
Snippets Groups Projects
Commit d08650ac authored by dterei's avatar dterei
Browse files

Use Safe Haskell when GHC >= 7.2

parent e7cb3d93
No related branches found
No related tags found
No related merge requests found
#if __GLASGOW_HASKELL__ >= 701
{-# LANGUAGE Safe #-}
#endif
-- | -- |
-- The "Control.Monad" module provides the 'Functor', 'Monad' and -- The "Control.Monad" module provides the 'Functor', 'Monad' and
-- 'MonadPlus' classes, together with some useful operations on monads. -- 'MonadPlus' classes, together with some useful operations on monads.
......
#if __GLASGOW_HASKELL__ >= 701
{-# LANGUAGE Trustworthy #-}
#endif
module Data.Array ( module Data.Array (
-- * Immutable non-strict arrays -- * Immutable non-strict arrays
-- $intro -- $intro
......
#if __GLASGOW_HASKELL__ >= 701
{-# LANGUAGE Safe #-}
#endif
-- | -- |
-- This module defines bitwise operations for signed and unsigned -- This module defines bitwise operations for signed and unsigned
-- integers. -- integers.
......
#if __GLASGOW_HASKELL__ >= 701
{-# LANGUAGE Safe #-}
#endif
module Data.Char ( module Data.Char (
-- * Characters and strings -- * Characters and strings
Char Char
......
#if __GLASGOW_HASKELL__ >= 701
{-# LANGUAGE Safe #-}
#endif
module Data.Complex ( module Data.Complex (
-- * Rectangular form -- * Rectangular form
Complex((:+)) Complex((:+))
......
#if __GLASGOW_HASKELL__ >= 701
{-# LANGUAGE Safe #-}
#endif
module Data.Int ( module Data.Int (
-- * Signed integer types -- * Signed integer types
......
#if __GLASGOW_HASKELL__ >= 701
{-# LANGUAGE Safe #-}
#endif
module Data.Ix ( module Data.Ix (
-- * The 'Ix' class -- * The 'Ix' class
Ix Ix
......
#if __GLASGOW_HASKELL__ >= 701
{-# LANGUAGE Safe #-}
#endif
module Data.List ( module Data.List (
-- * Basic functions -- * Basic functions
......
#if __GLASGOW_HASKELL__ >= 701
{-# LANGUAGE Safe #-}
#endif
module Data.Maybe ( module Data.Maybe (
-- * The @Maybe@ type and operations -- * The @Maybe@ type and operations
......
#if __GLASGOW_HASKELL__ >= 701
{-# LANGUAGE Safe #-}
#endif
module Data.Ratio ( module Data.Ratio (
Ratio Ratio
, Rational , Rational
......
#if __GLASGOW_HASKELL__ >= 701
{-# LANGUAGE Safe #-}
#endif
module Data.Word ( module Data.Word (
-- * Unsigned integral types -- * Unsigned integral types
......
#if __GLASGOW_HASKELL__ >= 701
{-# LANGUAGE Safe #-}
#endif
module Foreign.C ( module Foreign.C (
-- | The module "Foreign.C" combines the interfaces of all -- | The module "Foreign.C" combines the interfaces of all
......
#if __GLASGOW_HASKELL__ >= 701
{-# LANGUAGE Safe #-}
#endif
-- | The module "Foreign.C.Error" facilitates C-specific error -- | The module "Foreign.C.Error" facilitates C-specific error
-- handling of @errno@. -- handling of @errno@.
module Foreign.C.Error ( module Foreign.C.Error (
......
#if __GLASGOW_HASKELL__ >= 701
{-# LANGUAGE Safe #-}
#endif
-- | -- |
-- Utilities for primitive marshalling of C strings. -- Utilities for primitive marshalling of C strings.
-- --
......
#if __GLASGOW_HASKELL__ >= 701
{-# LANGUAGE Safe #-}
#endif
module Foreign.C.Types module Foreign.C.Types
( -- * Representations of C types ( -- * Representations of C types
-- $ctypes -- $ctypes
......
{-# LANGUAGE CPP #-}
#if __GLASGOW_HASKELL__ >= 701
{-# LANGUAGE Safe #-}
#endif
{- | {- |
The module "Foreign.Marshal.Alloc" provides operations to allocate and The module "Foreign.Marshal.Alloc" provides operations to allocate and
deallocate blocks of raw memory (i.e., unstructured chunks of memory deallocate blocks of raw memory (i.e., unstructured chunks of memory
......
{-# LANGUAGE CPP #-}
#if __GLASGOW_HASKELL__ >= 701
{-# LANGUAGE Safe #-}
#endif
{- | {- |
The module "Foreign.Marshal.Array" provides operations for marshalling Haskell The module "Foreign.Marshal.Array" provides operations for marshalling Haskell
lists into monolithic arrays and vice versa. Most functions come in two lists into monolithic arrays and vice versa. Most functions come in two
...@@ -61,7 +66,11 @@ module Foreign.Marshal.Array ( ...@@ -61,7 +66,11 @@ module Foreign.Marshal.Array (
) where ) where
import qualified "base" Foreign.Marshal.Array as Base import qualified "base" Foreign.Marshal.Array as Base
import "base" Foreign.Marshal.Array hiding (peekArray) import "base" Foreign.Marshal.Array hiding (peekArray)
#if __GLASGOW_HASKELL__ >= 701
import "base" Foreign.Safe hiding (peekArray)
#else
import "base" Foreign hiding (peekArray) import "base" Foreign hiding (peekArray)
#endif
-- |Convert an array of given length into a Haskell list. -- |Convert an array of given length into a Haskell list.
-- --
......
{-# LANGUAGE CPP #-}
#if __GLASGOW_HASKELL__ >= 701
{-# LANGUAGE Safe #-}
#endif
module Foreign.Marshal.Error ( module Foreign.Marshal.Error (
throwIf, -- :: (a -> Bool) -> (a -> String) -> IO a -> IO a throwIf, -- :: (a -> Bool) -> (a -> String) -> IO a -> IO a
throwIf_, -- :: (a -> Bool) -> (a -> String) -> IO a -> IO () throwIf_, -- :: (a -> Bool) -> (a -> String) -> IO a -> IO ()
......
{-# LANGUAGE CPP #-}
#if __GLASGOW_HASKELL__ >= 701
{-# LANGUAGE Safe #-}
#endif
module Foreign.Marshal.Utils ( module Foreign.Marshal.Utils (
-- * General marshalling utilities -- * General marshalling utilities
......
#if __GLASGOW_HASKELL__ >= 701
{-# LANGUAGE Safe #-}
#endif
-- | The module "Foreign.Ptr" provides typed pointers to foreign -- | The module "Foreign.Ptr" provides typed pointers to foreign
-- entities. We distinguish two kinds of pointers: pointers to data -- entities. We distinguish two kinds of pointers: pointers to data
-- and pointers to functions. It is understood that these two kinds -- and pointers to functions. It is understood that these two kinds
......
0% Loading or .
You are about to add 0 people to the discussion. Proceed with caution.
Finish editing this message first!
Please register or to comment