Skip to content
Snippets Groups Projects
Commit 626b563a authored by Herbert Valerio Riedel's avatar Herbert Valerio Riedel :man_dancing:
Browse files

Refactor & modernize `.cabal` to `cabal-version>=1.10`


This sets a sensible cabal category (i.e. `Numerical`), extends
`extra-tmp-{files,files}` to make this package self-contained, updates
the bug-report URL, and cleans up the `{-# LANGUAGE #-}` pragma usage in
the source code.

Signed-off-by: Herbert Valerio Riedel's avatarHerbert Valerio Riedel <hvr@gnu.org>
parent 9793630f
No related branches found
No related tags found
No related merge requests found
{-# LANGUAGE ForeignFunctionInterface, GHCForeignImportPrim, CPP,
MagicHash, UnboxedTuples, UnliftedFFITypes, BangPatterns #-}
{-# OPTIONS_GHC -XNoImplicitPrelude #-}
{-# LANGUAGE BangPatterns, CPP, MagicHash, NoImplicitPrelude, UnboxedTuples
, UnliftedFFITypes, GHCForeignImportPrim #-}
{-# OPTIONS_HADDOCK hide #-}
#include "MachDeps.h"
......
\begin{code}
{-# LANGUAGE BangPatterns, CPP, MagicHash, NoImplicitPrelude #-}
{-# LANGUAGE BangPatterns, CPP, UnboxedTuples, UnliftedFFITypes, MagicHash, NoImplicitPrelude #-}
{-# OPTIONS_HADDOCK hide #-}
-- Commentary of Integer library is located on the wiki:
......
......@@ -3,35 +3,67 @@ version: 0.5.1.0
-- GHC 7.6.1 released with 0.5.0.0
license: BSD3
license-file: LICENSE
category: Numerical
maintainer: libraries@haskell.org
bug-reports: http://hackage.haskell.org/trac/ghc/newticket?component=libraries%20%28other%29
bug-reports: http://ghc.haskell.org/trac/ghc/newticket?component=libraries%20%28other%29&keywords=integer-gmp
synopsis: Integer library based on GMP
description:
This package contains an Integer library based on GMP.
cabal-version: >=1.6
build-type: Configure
build-type: Configure
cabal-version: >=1.10
extra-source-files:
cbits/float.c
cbits/alloc.c
cbits/longlong.c
aclocal.m4
cbits/alloc.c
cbits/float.c
cbits/gmp-wrappers.cmm
cbits/longlong.c
config.guess
config.sub
configure
configure.ac
gmp/config.mk.in
install-sh
integer-gmp.buildinfo.in
extra-tmp-files:
autom4te.cache
config.log
config.status
source-repository head
type: git
location: http://git.haskell.org/packages/integer-gmp.git
Library {
build-depends: ghc-prim
exposed-modules: GHC.Integer
GHC.Integer.GMP.Internals
GHC.Integer.GMP.Prim
GHC.Integer.Logarithms
GHC.Integer.Logarithms.Internals
other-modules: GHC.Integer.Type
extensions: CPP, MagicHash, UnboxedTuples, NoImplicitPrelude,
ForeignFunctionInterface, UnliftedFFITypes
source-repository this
type: git
location: http://git.haskell.org/packages/integer-gmp.git
tag: integer-gmp-0.5.1.0-release
Library
default-language: Haskell2010
other-extensions:
BangPatterns
CPP
GHCForeignImportPrim
MagicHash
NoImplicitPrelude
UnboxedTuples
UnliftedFFITypes
exposed-modules:
GHC.Integer
GHC.Integer.GMP.Internals
GHC.Integer.GMP.Prim
GHC.Integer.Logarithms
GHC.Integer.Logarithms.Internals
other-modules:
GHC.Integer.Type
c-sources: cbits/cbits.c
build-depends: ghc-prim >= 0.3.1 && < 0.4
-- We need to set the package name to integer-gmp
-- (without a version number) as it's magic.
ghc-options: -package-name integer-gmp
}
ghc-options: -Wall -package-name integer-gmp
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