* [gentoo-commits] repo/gentoo:master commit in: dev-haskell/haddock-api/files/
@ 2021-03-16 18:50 Sergei Trofimovich
0 siblings, 0 replies; 2+ messages in thread
From: Sergei Trofimovich @ 2021-03-16 18:50 UTC (permalink / raw
To: gentoo-commits
commit: c42727311d2d351a903883c838849aa5bc4210d5
Author: Michael Mair-Keimberger <mmk <AT> levelnine <DOT> at>
AuthorDate: Tue Mar 16 17:58:56 2021 +0000
Commit: Sergei Trofimovich <slyfox <AT> gentoo <DOT> org>
CommitDate: Tue Mar 16 18:50:40 2021 +0000
URL: https://gitweb.gentoo.org/repo/gentoo.git/commit/?id=c4272731
dev-haskell/haddock-api: remove unused patch
Package-Manager: Portage-3.0.17, Repoman-3.0.2
Signed-off-by: Michael Mair-Keimberger <mmk <AT> levelnine.at>
Closes: https://github.com/gentoo/gentoo/pull/19959
Signed-off-by: Sergei Trofimovich <slyfox <AT> gentoo.org>
.../files/haddock-api-2.17.3-ghc-8.0.2_rc1.patch | 16 ----------------
1 file changed, 16 deletions(-)
diff --git a/dev-haskell/haddock-api/files/haddock-api-2.17.3-ghc-8.0.2_rc1.patch b/dev-haskell/haddock-api/files/haddock-api-2.17.3-ghc-8.0.2_rc1.patch
deleted file mode 100644
index 6aafc8f3752..00000000000
--- a/dev-haskell/haddock-api/files/haddock-api-2.17.3-ghc-8.0.2_rc1.patch
+++ /dev/null
@@ -1,16 +0,0 @@
-diff --git a/src/Haddock/Types.hs b/src/Haddock/Types.hs
-index eacf447..458d15f 100644
---- a/src/Haddock/Types.hs
-+++ b/src/Haddock/Types.hs
-@@ -1,2 +1,2 @@
--{-# LANGUAGE DeriveDataTypeable, DeriveFunctor, DeriveFoldable, DeriveTraversable, StandaloneDeriving, TypeFamilies, RecordWildCards #-}
-+{-# LANGUAGE DeriveDataTypeable, DeriveFunctor, DeriveFoldable, DeriveTraversable, StandaloneDeriving, TypeFamilies, RecordWildCards, CPP #-}
- {-# OPTIONS_GHC -fno-warn-orphans #-}
-@@ -450,2 +450,3 @@ instance (NFData a, NFData mod)
-
-+#if !MIN_VERSION_GLASGOW_HASKELL(8,0,1,1)
- instance NFData Name where rnf x = seq x ()
-@@ -453,2 +454,3 @@ instance NFData OccName where rnf x = seq x ()
- instance NFData ModuleName where rnf x = seq x ()
-+#endif
-
^ permalink raw reply related [flat|nested] 2+ messages in thread
* [gentoo-commits] repo/gentoo:master commit in: dev-haskell/haddock-api/files/
@ 2022-07-27 4:14 Sam James
0 siblings, 0 replies; 2+ messages in thread
From: Sam James @ 2022-07-27 4:14 UTC (permalink / raw
To: gentoo-commits
commit: 2e4cf8672b94eba7dc98afef2826aa9773a9aca7
Author: Michael Mair-Keimberger <mmk <AT> levelnine <DOT> at>
AuthorDate: Mon Jul 25 17:19:29 2022 +0000
Commit: Sam James <sam <AT> gentoo <DOT> org>
CommitDate: Wed Jul 27 03:49:37 2022 +0000
URL: https://gitweb.gentoo.org/repo/gentoo.git/commit/?id=2e4cf867
dev-haskell/haddock-api: remove unused patch(es)
Signed-off-by: Michael Mair-Keimberger <mmk <AT> levelnine.at>
Portage 3.0.34 / pkgdev 0.2.1 / pkgcheck 0.10.11
Signed-off-by: Sam James <sam <AT> gentoo.org>
.../files/haddock-api-2.24.0-ghc-8.10.2.patch | 147 ---------------------
.../haddock-api-2.24.0-haddock-library-1.10.patch | 124 -----------------
2 files changed, 271 deletions(-)
diff --git a/dev-haskell/haddock-api/files/haddock-api-2.24.0-ghc-8.10.2.patch b/dev-haskell/haddock-api/files/haddock-api-2.24.0-ghc-8.10.2.patch
deleted file mode 100644
index 84c275fbb348..000000000000
--- a/dev-haskell/haddock-api/files/haddock-api-2.24.0-ghc-8.10.2.patch
+++ /dev/null
@@ -1,147 +0,0 @@
-From e455bc18e15adf05a1f32bc7c4512eedb7ab889f Mon Sep 17 00:00:00 2001
-From: Alex Biehl <alexbiehl@gmail.com>
-Date: Tue, 8 Dec 2020 19:42:52 +0100
-Subject: [PATCH 1/2] Changes for GHC#17566
-
-See https://gitlab.haskell.org/ghc/ghc/merge_requests/2469
----
- haddock-api/src/Haddock/Backends/LaTeX.hs | 2 +-
- haddock-api/src/Haddock/Backends/Xhtml.hs | 2 +-
- .../src/Haddock/Backends/Xhtml/Decl.hs | 4 ++-
- haddock-api/src/Haddock/GhcUtils.hs | 29 +++++++++++++++++--
- haddock-api/src/Haddock/Types.hs | 1 +
- 5 files changed, 32 insertions(+), 6 deletions(-)
-
-diff --git a/haddock-api/src/Haddock/Backends/LaTeX.hs b/haddock-api/src/Haddock/Backends/LaTeX.hs
-index 647812f93..024a6c513 100644
---- a/src/Haddock/Backends/LaTeX.hs
-+++ b/src/Haddock/Backends/LaTeX.hs
-@@ -255,7 +255,7 @@ declNames :: LHsDecl DocNameI
- , [DocName] -- names being declared
- )
- declNames (L _ decl) = case decl of
-- TyClD _ d -> (empty, [tcdName d])
-+ TyClD _ d -> (empty, [tcdNameI d])
- SigD _ (TypeSig _ lnames _ ) -> (empty, map unLoc lnames)
- SigD _ (PatSynSig _ lnames _) -> (text "pattern", map unLoc lnames)
- ForD _ (ForeignImport _ (L _ n) _ _) -> (empty, [n])
-diff --git a/haddock-api/src/Haddock/Backends/Xhtml.hs b/haddock-api/src/Haddock/Backends/Xhtml.hs
-index f80a9c05f..541f40c4f 100644
---- a/src/Haddock/Backends/Xhtml.hs
-+++ b/src/Haddock/Backends/Xhtml.hs
-@@ -407,7 +407,7 @@ ppJsonIndex odir maybe_source_url maybe_wiki_url unicode pkg qual_opt ifaces = d
- exportSubs _ = []
-
- exportName :: ExportItem DocNameI -> [IdP DocNameI]
-- exportName ExportDecl { expItemDecl } = getMainDeclBinder (unLoc expItemDecl)
-+ exportName ExportDecl { expItemDecl } = getMainDeclBinderI (unLoc expItemDecl)
- exportName ExportNoDecl { expItemName } = [expItemName]
- exportName _ = []
-
-diff --git a/haddock-api/src/Haddock/Backends/Xhtml/Decl.hs b/haddock-api/src/Haddock/Backends/Xhtml/Decl.hs
-index ef0ba1b67..30b8d43eb 100644
---- a/src/Haddock/Backends/Xhtml/Decl.hs
-+++ b/src/Haddock/Backends/Xhtml/Decl.hs
-@@ -536,6 +536,8 @@ ppClassDecl summary links instances fixities loc d subdocs
- -- Only the fixity relevant to the class header
- fixs = ppFixities [ f | f@(n,_) <- fixities, n == unLoc lname ] qual
-
-+ nm = tcdNameI decl
-+
- hdr = ppClassHdr summary lctxt (unLoc lname) ltyvars lfds
-
- -- Associated types
-@@ -794,7 +796,7 @@ ppDataDecl summary links instances fixities subdocs loc doc dataDecl pats
- | otherwise = header_ +++ docSection curname pkg qual doc +++ constrBit +++ patternBit +++ instancesBit
-
- where
-- docname = tcdName dataDecl
-+ docname = tcdNameI dataDecl
- curname = Just $ getName docname
- cons = dd_cons (tcdDataDefn dataDecl)
- isH98 = case unLoc (head cons) of
-diff --git a/haddock-api/src/Haddock/GhcUtils.hs b/haddock-api/src/Haddock/GhcUtils.hs
-index 0874e7b4d..43fe3e774 100644
---- a/src/Haddock/GhcUtils.hs
-+++ b/src/Haddock/GhcUtils.hs
-@@ -58,8 +58,7 @@ moduleString = moduleNameString . moduleName
- isNameSym :: Name -> Bool
- isNameSym = isSymOcc . nameOccName
-
--getMainDeclBinder :: (SrcSpanLess (LPat p) ~ Pat p , HasSrcSpan (LPat p)) =>
-- HsDecl p -> [IdP p]
-+getMainDeclBinder :: HsDecl (GhcPass p) -> [IdP (GhcPass p)]
- getMainDeclBinder (TyClD _ d) = [tcdName d]
- getMainDeclBinder (ValD _ d) =
- case collectHsBindBinders d of
-@@ -221,6 +220,31 @@ getGADTConType (ConDeclH98 {}) = panic "getGADTConType"
- -- Should only be called on ConDeclGADT
- getGADTConType (XConDecl nec) = noExtCon nec
-
-+getMainDeclBinderI :: HsDecl DocNameI -> [IdP DocNameI]
-+getMainDeclBinderI (TyClD _ d) = [tcdNameI d]
-+getMainDeclBinderI (ValD _ d) =
-+ case collectHsBindBinders d of
-+ [] -> []
-+ (name:_) -> [name]
-+getMainDeclBinderI (SigD _ d) = sigNameNoLoc d
-+getMainDeclBinderI (ForD _ (ForeignImport _ name _ _)) = [unLoc name]
-+getMainDeclBinderI (ForD _ (ForeignExport _ _ _ _)) = []
-+getMainDeclBinderI _ = []
-+
-+familyDeclLNameI :: FamilyDecl DocNameI -> Located DocName
-+familyDeclLNameI (FamilyDecl { fdLName = n }) = n
-+familyDeclLNameI (XFamilyDecl nec) = noExtCon nec
-+
-+tyClDeclLNameI :: TyClDecl DocNameI -> Located DocName
-+tyClDeclLNameI (FamDecl { tcdFam = fd }) = familyDeclLNameI fd
-+tyClDeclLNameI (SynDecl { tcdLName = ln }) = ln
-+tyClDeclLNameI (DataDecl { tcdLName = ln }) = ln
-+tyClDeclLNameI (ClassDecl { tcdLName = ln }) = ln
-+tyClDeclLNameI (XTyClDecl nec) = noExtCon nec
-+
-+tcdNameI :: TyClDecl DocNameI -> DocName
-+tcdNameI = unLoc . tyClDeclLNameI
-+
- -- -------------------------------------
-
- getGADTConTypeG :: ConDecl (GhcPass p) -> LHsType (GhcPass p)
-@@ -761,4 +785,3 @@ defaultRuntimeRepVars = go emptyVarEnv
-
- go _ ty@(LitTy {}) = ty
- go _ ty@(CoercionTy {}) = ty
--
-diff --git a/haddock-api/src/Haddock/Types.hs b/haddock-api/src/Haddock/Types.hs
-index c2cf08bb2..853f4b1b2 100644
---- a/src/Haddock/Types.hs
-+++ b/src/Haddock/Types.hs
-@@ -789,6 +789,7 @@ type instance XDataDecl DocNameI = NoExtField
- type instance XSynDecl DocNameI = NoExtField
- type instance XFamDecl DocNameI = NoExtField
- type instance XXFamilyDecl DocNameI = NoExtCon
-+type instance XXTyClDecl DocNameI = NoExtCon
-
- type instance XHsIB DocNameI _ = NoExtField
- type instance XHsWC DocNameI _ = NoExtField
-
-From e1fe49e9458a5d5161adc8b5b8bfea6437a9eedf Mon Sep 17 00:00:00 2001
-From: alexbiehl <alexbiehl@gmail.com>
-Date: Tue, 8 Dec 2020 20:03:49 +0100
-Subject: [PATCH 2/2] Import intercalate
-
----
- haddock-api/src/Haddock/Interface/Rename.hs | 1 +
- 1 file changed, 1 insertion(+)
-
-diff --git a/haddock-api/src/Haddock/Interface/Rename.hs b/haddock-api/src/Haddock/Interface/Rename.hs
-index 78c585814..4d9eadac5 100644
---- a/src/Haddock/Interface/Rename.hs
-+++ b/src/Haddock/Interface/Rename.hs
-@@ -29,6 +29,7 @@ import TysWiredIn (eqTyCon_RDR)
- import Control.Applicative
- import Control.Arrow ( first )
- import Control.Monad hiding (mapM)
-+import Data.List (intercalate)
- import qualified Data.Map as Map hiding ( Map )
- import qualified Data.Set as Set
- import Prelude hiding (mapM)
diff --git a/dev-haskell/haddock-api/files/haddock-api-2.24.0-haddock-library-1.10.patch b/dev-haskell/haddock-api/files/haddock-api-2.24.0-haddock-library-1.10.patch
deleted file mode 100644
index 1627b73eba9d..000000000000
--- a/dev-haskell/haddock-api/files/haddock-api-2.24.0-haddock-library-1.10.patch
+++ /dev/null
@@ -1,124 +0,0 @@
---- a/src/Haddock/Backends/Hoogle.hs
-+++ b/src/Haddock/Backends/Hoogle.hs
-@@ -1,3 +1,4 @@
-+{-# LANGUAGE CPP #-}
- {-# LANGUAGE FlexibleContexts #-}
- {-# LANGUAGE TypeFamilies #-}
- -----------------------------------------------------------------------------
-@@ -326,7 +327,11 @@ markupTag dflags = Markup {
- markupAppend = (++),
- markupIdentifier = box (TagInline "a") . str . out dflags,
- markupIdentifierUnchecked = box (TagInline "a") . str . showWrapped (out dflags . snd),
-+#if MIN_VERSION_haddock_library(1,10,0)
-+ markupModule = box (TagInline "a") . str . modLinkName,
-+#else
- markupModule = box (TagInline "a") . str,
-+#endif
- markupWarning = box (TagInline "i"),
- markupEmphasis = box (TagInline "i"),
- markupBold = box (TagInline "b"),
---- a/src/Haddock/Backends/LaTeX.hs
-+++ b/src/Haddock/Backends/LaTeX.hs
-@@ -1,3 +1,4 @@
-+{-# LANGUAGE CPP #-}
- {-# OPTIONS_GHC -fno-warn-name-shadowing #-}
- {-# LANGUAGE RecordWildCards #-}
- {-# LANGUAGE TypeFamilies #-}
-@@ -1206,7 +1207,11 @@ latexMarkup = Markup
- , markupAppend = \l r v -> l v . r v
- , markupIdentifier = \i v -> inlineElem (markupId v (fmap occName i))
- , markupIdentifierUnchecked = \i v -> inlineElem (markupId v (fmap snd i))
-+#if MIN_VERSION_haddock_library(1,10,0)
-+ , markupModule = \m _ -> inlineElem (let (mdl,_ref) = break (=='#') (modLinkName m) in (tt (text mdl)))
-+#else
- , markupModule = \m _ -> inlineElem (let (mdl,_ref) = break (=='#') m in (tt (text mdl)))
-+#endif
- , markupWarning = \p v -> p v
- , markupEmphasis = \p v -> inlineElem (emph (p v empty))
- , markupBold = \p v -> inlineElem (bold (p v empty))
---- a/src/Haddock/Backends/Xhtml/DocMarkup.hs
-+++ b/src/Haddock/Backends/Xhtml/DocMarkup.hs
-@@ -1,3 +1,4 @@
-+{-# LANGUAGE CPP #-}
- -----------------------------------------------------------------------------
- -- |
- -- Module : Haddock.Backends.Html.DocMarkup
-@@ -44,7 +45,11 @@ parHtmlMarkup qual insertAnchors ppId = Markup {
- markupAppend = (+++),
- markupIdentifier = thecode . ppId insertAnchors,
- markupIdentifierUnchecked = thecode . ppUncheckedLink qual,
-+#if MIN_VERSION_haddock_library(1,10,0)
-+ markupModule = \m -> let (mdl,ref) = break (=='#') (modLinkName m)
-+#else
- markupModule = \m -> let (mdl,ref) = break (=='#') m
-+#endif
- -- Accomodate for old style
- -- foo\#bar anchors
- mdl' = case reverse mdl of
---- a/src/Haddock/Interface/LexParseRn.hs
-+++ b/src/Haddock/Interface/LexParseRn.hs
-@@ -1,3 +1,4 @@
-+{-# LANGUAGE CPP #-}
- {-# OPTIONS_GHC -Wwarn #-}
- {-# LANGUAGE BangPatterns #-}
- {-# LANGUAGE ViewPatterns #-}
-@@ -148,7 +149,11 @@ rename dflags gre = rn
- DocDefList list -> DocDefList <$> traverse (\(a, b) -> (,) <$> rn a <*> rn b) list
- DocCodeBlock doc -> DocCodeBlock <$> rn doc
- DocIdentifierUnchecked x -> pure (DocIdentifierUnchecked x)
-+#if MIN_VERSION_haddock_library(1,10,0)
-+ DocModule (ModLink m l) -> DocModule . ModLink m <$> traverse rn l
-+#else
- DocModule str -> pure (DocModule str)
-+#endif
- DocHyperlink (Hyperlink u l) -> DocHyperlink . Hyperlink u <$> traverse rn l
- DocPic str -> pure (DocPic str)
- DocMathInline str -> pure (DocMathInline str)
---- a/src/Haddock/InterfaceFile.hs
-+++ b/src/Haddock/InterfaceFile.hs
-@@ -521,9 +521,16 @@ instance (Binary mod, Binary id) => Binary (DocH mod id) where
- put_ bh (DocIdentifier ae) = do
- putByte bh 4
- put_ bh ae
-+#if MIN_VERSION_haddock_library(1,10,0)
-+ put_ bh (DocModule (ModLink af bf)) = do
-+ putByte bh 5
-+ put_ bh af
-+ put_ bh bf
-+#else
- put_ bh (DocModule af) = do
- putByte bh 5
- put_ bh af
-+#endif
- put_ bh (DocEmphasis ag) = do
- putByte bh 6
- put_ bh ag
-@@ -598,8 +605,14 @@ instance (Binary mod, Binary id) => Binary (DocH mod id) where
- ae <- get bh
- return (DocIdentifier ae)
- 5 -> do
-+#if MIN_VERSION_haddock_library(1,10,0)
-+ af <- get bh
-+ bf <- get bh
-+ return (DocModule (ModLink af bf))
-+#else
- af <- get bh
- return (DocModule af)
-+#endif
- 6 -> do
- ag <- get bh
- return (DocEmphasis ag)
---- a/src/Haddock/Types.hs
-+++ b/src/Haddock/Types.hs
-@@ -466,7 +466,11 @@ instance (NFData a, NFData mod)
- DocParagraph a -> a `deepseq` ()
- DocIdentifier a -> a `deepseq` ()
- DocIdentifierUnchecked a -> a `deepseq` ()
-+#if MIN_VERSION_haddock_library(1,10,0)
-+ DocModule (ModLink a b) -> a `deepseq` b `deepseq` ()
-+#else
- DocModule a -> a `deepseq` ()
-+#endif
- DocWarning a -> a `deepseq` ()
- DocEmphasis a -> a `deepseq` ()
- DocBold a -> a `deepseq` ()
^ permalink raw reply related [flat|nested] 2+ messages in thread
end of thread, other threads:[~2022-07-27 4:14 UTC | newest]
Thread overview: 2+ messages (download: mbox.gz follow: Atom feed
-- links below jump to the message on this page --
2022-07-27 4:14 [gentoo-commits] repo/gentoo:master commit in: dev-haskell/haddock-api/files/ Sam James
-- strict thread matches above, loose matches on Subject: below --
2021-03-16 18:50 Sergei Trofimovich
This is a public inbox, see mirroring instructions
for how to clone and mirror all data and code used for this inbox