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

Use Safe Haskell for GHC >= 7.2

parent 7507614b
No related branches found
No related tags found
No related merge requests found
#if __GLASGOW_HASKELL__ >= 701
{-# LANGUAGE Trustworthy #-}
#endif
module Array ( module Array (
module Ix, -- export all of Ix for convenience module Ix, -- export all of Ix for convenience
Array, array, listArray, (!), bounds, indices, elems, assocs, Array, array, listArray, (!), bounds, indices, elems, assocs,
......
#if __GLASGOW_HASKELL__ >= 701
{-# LANGUAGE Safe #-}
#endif
module Bits (module Data.Bits) where module Bits (module Data.Bits) where
import Data.Bits import Data.Bits
#if __GLASGOW_HASKELL__ >= 701
{-# LANGUAGE Safe #-}
#endif
module CError (module Foreign.C.Error) where module CError (module Foreign.C.Error) where
import Foreign.C.Error import Foreign.C.Error
#if __GLASGOW_HASKELL__ >= 701
{-# LANGUAGE Safe #-}
#endif
module CForeign ( module Foreign.C ) where module CForeign ( module Foreign.C ) where
import Foreign.C import Foreign.C
#if __GLASGOW_HASKELL__ >= 701
{-# LANGUAGE Safe #-}
#endif
module CPUTime ( module CPUTime (
getCPUTime, cpuTimePrecision getCPUTime, cpuTimePrecision
) where ) where
......
#if __GLASGOW_HASKELL__ >= 701
{-# LANGUAGE Safe #-}
#endif
module CString (module Foreign.C.String) where module CString (module Foreign.C.String) where
import Foreign.C.String import Foreign.C.String
#if __GLASGOW_HASKELL__ >= 701
{-# LANGUAGE Safe #-}
#endif
module CTypes (module Foreign.C.Types) where module CTypes (module Foreign.C.Types) where
import Foreign.C.Types import Foreign.C.Types
#if __GLASGOW_HASKELL__ >= 701
{-# LANGUAGE Safe #-}
#endif
module Char ( module Char (
isAscii, isLatin1, isControl, isPrint, isSpace, isUpper, isLower, isAscii, isLatin1, isControl, isPrint, isSpace, isUpper, isLower,
isAlpha, isDigit, isOctDigit, isHexDigit, isAlphaNum, isAlpha, isDigit, isOctDigit, isHexDigit, isAlphaNum,
......
#if __GLASGOW_HASKELL__ >= 701
{-# LANGUAGE Safe #-}
#endif
module Complex ( module Complex (
Complex((:+)), realPart, imagPart, conjugate, Complex((:+)), realPart, imagPart, conjugate,
mkPolar, cis, polar, magnitude, phase mkPolar, cis, polar, magnitude, phase
......
#if __GLASGOW_HASKELL__ >= 701
{-# LANGUAGE Trustworthy #-}
#endif
module Directory ( module Directory (
Permissions( Permissions, readable, writable, executable, searchable ), Permissions( Permissions, readable, writable, executable, searchable ),
createDirectory, removeDirectory, removeFile, createDirectory, removeDirectory, removeFile,
......
#if __GLASGOW_HASKELL__ >= 701
{-# LANGUAGE Trustworthy #-}
#endif
module ForeignPtr (module Foreign.ForeignPtr) where module ForeignPtr (module Foreign.ForeignPtr) where
import Foreign.ForeignPtr import Foreign.ForeignPtr
#if __GLASGOW_HASKELL__ >= 701
{-# LANGUAGE Safe #-}
#endif
{-# OPTIONS_GHC -fno-warn-deprecations #-} {-# OPTIONS_GHC -fno-warn-deprecations #-}
......
#if __GLASGOW_HASKELL__ >= 701
{-# LANGUAGE Safe #-}
#endif
module Int ( module Data.Int ) where module Int ( module Data.Int ) where
import Data.Int import Data.Int
#if __GLASGOW_HASKELL__ >= 701
{-# LANGUAGE Safe #-}
#endif
module Ix ( module Ix (
Ix(range, index, inRange), rangeSize Ix(range, index, inRange), rangeSize
) where ) where
......
#if __GLASGOW_HASKELL__ >= 701
{-# LANGUAGE Safe #-}
#endif
module List ( module List (
elemIndex, elemIndices, elemIndex, elemIndices,
find, findIndex, findIndices, find, findIndex, findIndices,
......
#if __GLASGOW_HASKELL__ >= 701
{-# LANGUAGE Trustworthy #-}
#endif
module Locale ( module Locale (
TimeLocale(..), defaultTimeLocale TimeLocale(..), defaultTimeLocale
) where ) where
......
#if __GLASGOW_HASKELL__ >= 701
{-# LANGUAGE Safe #-}
#endif
module MarshalAlloc (module Foreign.Marshal.Alloc) where module MarshalAlloc (module Foreign.Marshal.Alloc) where
import Foreign.Marshal.Alloc import Foreign.Marshal.Alloc
#if __GLASGOW_HASKELL__ >= 701
{-# LANGUAGE Safe #-}
#endif
module MarshalArray (module Foreign.Marshal.Array) where module MarshalArray (module Foreign.Marshal.Array) where
import Foreign.Marshal.Array import Foreign.Marshal.Array
#if __GLASGOW_HASKELL__ >= 701
{-# LANGUAGE Safe #-}
#endif
module MarshalError ( module MarshalError (
module Foreign.Marshal.Error, module Foreign.Marshal.Error,
IOErrorType, IOErrorType,
......
#if __GLASGOW_HASKELL__ >= 701
{-# LANGUAGE Safe #-}
#endif
module MarshalUtils (module Foreign.Marshal.Utils) where module MarshalUtils (module Foreign.Marshal.Utils) where
import Foreign.Marshal.Utils import Foreign.Marshal.Utils
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