[Git][haskell-team/DHG_packages][master] Full round of yi related updates for GHC 9.6 and beyond.

Marcel Fourné (@mfourne) gitlab at salsa.debian.org
Thu Oct 24 14:06:17 BST 2024



Marcel Fourné pushed to branch master at Debian Haskell Group / DHG_packages


Commits:
f6423542 by Marcel Fourné at 2024-10-24T15:05:30+02:00
Full round of yi related updates for GHC 9.6 and beyond.

- - - - -


11 changed files:

- p/haskell-yi-core/debian/changelog
- − p/haskell-yi-core/debian/patches/0002-update-for-unix-compat-0.7.patch
- − p/haskell-yi-core/debian/patches/series
- − p/haskell-yi-core/debian/patches/yi-PR-1127
- p/haskell-yi-frontend-pango/debian/changelog
- p/haskell-yi-frontend-vty/debian/changelog
- p/haskell-yi-language/debian/changelog
- p/haskell-yi-misc-modes/debian/changelog
- p/haskell-yi-mode-haskell/debian/changelog
- p/haskell-yi-mode-javascript/debian/changelog
- p/yi/debian/changelog


Changes:

=====================================
p/haskell-yi-core/debian/changelog
=====================================
@@ -1,7 +1,12 @@
-haskell-yi-core (0.19.2-4) UNRELEASED; urgency=medium
+haskell-yi-core (0.19.4-1) unstable; urgency=medium
 
+  [ Ilias Tsitsimpis ]
   * Declare compliance with Debian policy 4.7.0
 
+  [ Marcel Fourné ]
+  * New upstream release for GHC 9.6 (Closes: #1084785)
+  * Drop patches applied upstream
+
  -- Ilias Tsitsimpis <iliastsi at debian.org>  Wed, 11 Sep 2024 15:18:43 +0300
 
 haskell-yi-core (0.19.2-3) unstable; urgency=medium


=====================================
p/haskell-yi-core/debian/patches/0002-update-for-unix-compat-0.7.patch deleted
=====================================
@@ -1,97 +0,0 @@
-From c1c665772b815b9be427a8056fde40df4a5efb04 Mon Sep 17 00:00:00 2001
-From: =?UTF-8?q?Marcel=20Fourn=C3=A9?= <haskell at marcelfourne.de>
-Date: Sat, 18 Mar 2023 17:01:38 +0100
-Subject: [PATCH] update for unix-compat 0.7: System.PosixCompat.User is gone.
- Previous behaviour of it was erroring out for mingw32_HOST_OS or using
- System.Posix.User anyway, so let's do that directly ourselves.
-
----
- yi-core/src/System/FriendlyPath.hs | 11 ++++++++++-
- yi-core/src/Yi/Dired.hs            | 10 ++++++++--
- 2 files changed, 18 insertions(+), 3 deletions(-)
-
-diff --git a/src/System/FriendlyPath.hs b/src/System/FriendlyPath.hs
-index d028cc45..20c330b8 100644
---- a/src/System/FriendlyPath.hs
-+++ b/src/System/FriendlyPath.hs
-@@ -1,3 +1,5 @@
-+{-# LANGUAGE CPP #-}
-+
- module System.FriendlyPath
-   ( userToCanonPath
-   , expandTilda
-@@ -7,7 +9,9 @@ module System.FriendlyPath
- import System.CanonicalizePath (canonicalizePath)
- import System.Directory        (getHomeDirectory)
- import System.FilePath         (isAbsolute, normalise, pathSeparator)
--import System.PosixCompat.User (getUserEntryForName, homeDirectory)
-+#ifndef mingw32_HOST_OS
-+import System.Posix.User (getUserEntryForName, homeDirectory)
-+#endif
-
-
- -- canonicalizePath follows symlinks, and does not work if the directory does not exist.
-@@ -20,10 +24,15 @@ userToCanonPath f = canonicalizePath =<< expandTilda f
- expandTilda :: String -> IO FilePath
- expandTilda ('~':path)
-   | null path || (head path == pathSeparator) = (++ path) <$> getHomeDirectory
-+#ifndef mingw32_HOST_OS
-   -- Home directory of another user, e.g. ~root/
-   | otherwise = let username = takeWhile (/= pathSeparator) path
-                     dirname = drop (length username) path
-                 in  (normalise . (++ dirname) . homeDirectory) <$> getUserEntryForName username
-+#else
-+  -- unix-compat no longer helps
-+  | otherwise = ioError $ mkIOError illegalOperationErrorType "Tilda expansion only supported under Unix" Nothing Nothing
-+#endif
- expandTilda path = return path
-
- -- | Is a user-friendly path absolute?
-diff --git a/src/Yi/Dired.hs b/src/Yi/Dired.hs
-index 4cfaf507..331da36c 100644
---- a/src/Yi/Dired.hs
-+++ b/src/Yi/Dired.hs
-@@ -89,11 +89,13 @@ import           System.PosixCompat.Files (FileStatus, fileExist, fileGroup,
-                                            readSymbolicLink, removeLink, rename,
-                                            unionFileModes)
- import           System.PosixCompat.Types (FileMode, GroupID, UserID)
--import           System.PosixCompat.User  (GroupEntry, GroupEntry (..),
-+#ifndef mingw32_HOST_OS
-+import           System.Posix.User        (GroupEntry, GroupEntry (..),
-                                            UserEntry (..), getAllGroupEntries,
-                                            getAllUserEntries,
-                                            getGroupEntryForID,
-                                            getUserEntryForID, groupID, userID)
-+#endif
- import           Text.Printf              (printf)
- import           Yi.Buffer
- import           Yi.Config                (modeTable)
-@@ -665,6 +667,7 @@ diredScanDir dir = do
-                 -> DiredEntries
-                 -> FilePath
-                 -> IO DiredEntries
-+#ifndef mingw32_HOST_OS
-     lineForFile d m f = do
-       let fp = d </> f
-       fileStatus <- getSymbolicLinkStatus fp
-@@ -709,7 +712,6 @@ diredScanDir dir = do
-                            , sizeInBytes = sz
-                            , modificationTimeString = modTimeStr}
-
--
- -- | Needed on Mac OS X 10.4
- scanForUid :: UserID -> [UserEntry] -> UserEntry
- scanForUid uid entries = fromMaybe missingEntry $
-@@ -724,6 +726,10 @@ scanForGid gid entries = fromMaybe missingEntry $
-   where
-     missingEntry = GroupEntry "?" mempty gid mempty
-
-+#else
-+    -- has been the default for Windows anyway, so just directly do it without unix-compat
-+    lineForFile _ m f = return $ M.insert (R.fromString f) DiredNoInfo m
-+#endif
-
- modeString :: FileMode -> R.YiString
- modeString fm = ""
---
-2.42.0


=====================================
p/haskell-yi-core/debian/patches/series deleted
=====================================
@@ -1,2 +0,0 @@
-yi-PR-1127
-0002-update-for-unix-compat-0.7.patch


=====================================
p/haskell-yi-core/debian/patches/yi-PR-1127 deleted
=====================================
@@ -1,102 +0,0 @@
-Description: upstream PR to fix build with GHC 9.0
-Author: Marcel Fourné <debian at marcelfourne.de>
-Origin: other, https://github.com/yi-editor/yi/pull/1127
-Bug: https://github.com/yi-editor/yi/issues/1125
-Forwarded: https://github.com/yi-editor/yi/pull/1127
-Last-Update: 2022-08-25
-
---- haskell-yi-core-0.19.2.orig/src/Yi/Buffer/Misc.hs
-+++ haskell-yi-core-0.19.2/src/Yi/Buffer/Misc.hs
-@@ -1127,7 +1127,7 @@ savingExcursionB f = do
-     moveTo =<< use (markPointA m)
-     return res
- 
--markPointA :: Mark -> Lens' FBuffer Point
-+markPointA :: forall f . Functor f => Mark -> (Point -> f Point) -> (FBuffer -> f FBuffer)
- markPointA mark = lens getter setter where
-   getter b = markPoint $ getMarkValueRaw mark b
-   setter b pos = modifyMarkRaw mark (\v -> v {markPoint = pos}) b
---- haskell-yi-core-0.19.2.orig/src/Yi/Eval.hs
-+++ haskell-yi-core-0.19.2/src/Yi/Eval.hs
-@@ -121,28 +121,6 @@ infixl 1 <&>
- a <&> f = f <$> a
- -- TODO: should we be sticking Text here?
- 
---- | Runs the action, as written by the user.
----
---- The behaviour of this function can be customised by modifying the
---- 'Evaluator' variable.
--execEditorAction :: String -> YiM ()
--execEditorAction = runHook execEditorActionImpl
--
---- | Lists the action names in scope, for use by 'execEditorAction',
---- and 'help' index.
----
---- The behaviour of this function can be customised by modifying the
---- 'Evaluator' variable.
--getAllNamesInScope :: YiM [String]
--getAllNamesInScope = runHook getAllNamesInScopeImpl
--
---- | Describes the named action in scope, for use by 'help'.
----
---- The behaviour of this function can be customised by modifying the
---- 'Evaluator' variable.
--describeNamedAction :: String -> YiM String
--describeNamedAction = runHook describeNamedActionImpl
--
- -- | Config variable for customising the behaviour of
- -- 'execEditorAction' and 'getAllNamesInScope'.
- --
-@@ -157,11 +135,6 @@ data Evaluator = Evaluator
-     -- ^ describe named action (or at least its type.), simplest implementation is at least @return at .
-   } deriving (Typeable)
- 
---- | The evaluator to use for 'execEditorAction' and
---- 'getAllNamesInScope'.
--evaluator :: Field Evaluator
--evaluator = customVariable
--
- -- * Evaluator based on GHCi
- -- | Cached variable for getAllNamesInScopeImpl
- newtype NamesCache = NamesCache [String] deriving (Typeable, Binary)
-@@ -413,3 +386,29 @@ instance Default Evaluator where
- #endif
- 
- instance YiConfigVariable Evaluator
-+-- | Runs the action, as written by the user.
-+--
-+-- The behaviour of this function can be customised by modifying the
-+-- 'Evaluator' variable.
-+execEditorAction :: String -> YiM ()
-+execEditorAction = runHook execEditorActionImpl
-+
-+-- | Lists the action names in scope, for use by 'execEditorAction',
-+-- and 'help' index.
-+--
-+-- The behaviour of this function can be customised by modifying the
-+-- 'Evaluator' variable.
-+getAllNamesInScope :: YiM [String]
-+getAllNamesInScope = runHook getAllNamesInScopeImpl
-+
-+-- | Describes the named action in scope, for use by 'help'.
-+--
-+-- The behaviour of this function can be customised by modifying the
-+-- 'Evaluator' variable.
-+describeNamedAction :: String -> YiM String
-+describeNamedAction = runHook describeNamedActionImpl
-+
-+-- | The evaluator to use for 'execEditorAction' and
-+-- 'getAllNamesInScope'.
-+evaluator :: Field Evaluator
-+evaluator = customVariable
---- haskell-yi-core-0.19.2.orig/src/Yi/Syntax/Layout.hs
-+++ haskell-yi-core-0.19.2/src/Yi/Syntax/Layout.hs
-@@ -70,7 +70,7 @@ layoutHandler isSpecial parens isIgnored
- 
-           parse :: IState t -> [(AlexState lexState, Tok t)] -> [(State t lexState, Tok t)]
-           parse iSt@(IState levels doOpen lastLine)
--                toks@((aSt, tok @ Tok {tokPosn = Posn _nextOfs line col}) : tokss)
-+                toks@((aSt, tok at Tok {tokPosn = Posn _nextOfs line col}) : tokss)
- 
-             -- ignore this token
-             | isIgnored tok


=====================================
p/haskell-yi-frontend-pango/debian/changelog
=====================================
@@ -1,7 +1,11 @@
-haskell-yi-frontend-pango (0.19.1-4) UNRELEASED; urgency=medium
+haskell-yi-frontend-pango (0.19.2-1) unstable; urgency=medium
 
+  [ Ilias Tsitsimpis ]
   * Declare compliance with Debian policy 4.7.0
 
+  [ Marcel Fourné ]
+  * New upstream version for GHC 9.6
+
  -- Ilias Tsitsimpis <iliastsi at debian.org>  Wed, 11 Sep 2024 15:18:43 +0300
 
 haskell-yi-frontend-pango (0.19.1-3) unstable; urgency=medium


=====================================
p/haskell-yi-frontend-vty/debian/changelog
=====================================
@@ -1,7 +1,11 @@
-haskell-yi-frontend-vty (0.19.0-4) UNRELEASED; urgency=medium
+haskell-yi-frontend-vty (0.19.1-1) unstable ; urgency=medium
 
+  [ Ilias Tsitsimpis ]
   * Declare compliance with Debian policy 4.7.0
 
+  [ Marcel Fourné ]
+  * New upstream version for GHC 9.6
+
  -- Ilias Tsitsimpis <iliastsi at debian.org>  Wed, 11 Sep 2024 15:18:43 +0300
 
 haskell-yi-frontend-vty (0.19.0-3) unstable; urgency=medium


=====================================
p/haskell-yi-language/debian/changelog
=====================================
@@ -1,3 +1,9 @@
+haskell-yi-language (0.19.1-1) unstable; urgency=medium
+
+  * New upstream version for GHC 9.6
+
+ -- Marcel Fourné <email at marcelfourne.de>  Thu, 24 Oct 2024 14:51:24 +0200
+
 haskell-yi-language (0.19.0-4) unstable; urgency=medium
 
   * Declare compliance with Debian policy 4.7.0


=====================================
p/haskell-yi-misc-modes/debian/changelog
=====================================
@@ -1,7 +1,11 @@
-haskell-yi-misc-modes (0.19.0-4) UNRELEASED; urgency=medium
+haskell-yi-misc-modes (0.19.1-1) unstable; urgency=medium
 
+  [ Ilias Tsitsimpis ]
   * Declare compliance with Debian policy 4.7.0
 
+  [ Marcel Fourné ]
+  * New upstream version for GHC 9.6
+
  -- Ilias Tsitsimpis <iliastsi at debian.org>  Wed, 11 Sep 2024 15:18:43 +0300
 
 haskell-yi-misc-modes (0.19.0-3) unstable; urgency=medium


=====================================
p/haskell-yi-mode-haskell/debian/changelog
=====================================
@@ -1,7 +1,11 @@
-haskell-yi-mode-haskell (0.19.0-4) UNRELEASED; urgency=medium
+haskell-yi-mode-haskell (0.19.1-1) unstable; urgency=medium
 
+  [ Ilias Tsitsimpis ]
   * Declare compliance with Debian policy 4.7.0
 
+  [ Marcel Fourné ]
+  * New upstream version for GHC 9.6
+
  -- Ilias Tsitsimpis <iliastsi at debian.org>  Wed, 11 Sep 2024 15:18:43 +0300
 
 haskell-yi-mode-haskell (0.19.0-3) unstable; urgency=medium


=====================================
p/haskell-yi-mode-javascript/debian/changelog
=====================================
@@ -1,7 +1,11 @@
-haskell-yi-mode-javascript (0.19.0-4) UNRELEASED; urgency=medium
+haskell-yi-mode-javascript (0.19.1-1) unstable; urgency=medium
 
+  [ Ilias Tsitsimpis ]
   * Declare compliance with Debian policy 4.7.0
 
+  [ Marcel Fourné ]
+  * New upstream version for GHC 9.6
+
  -- Ilias Tsitsimpis <iliastsi at debian.org>  Wed, 11 Sep 2024 15:18:44 +0300
 
 haskell-yi-mode-javascript (0.19.0-3) unstable; urgency=medium


=====================================
p/yi/debian/changelog
=====================================
@@ -1,8 +1,12 @@
-yi (0.19.0-3) UNRELEASED; urgency=medium
+yi (0.19.2-1) unstable; urgency=medium
 
+  [ Ilias Tsitsimpis ]
   * Declare compliance with Debian policy 4.6.2
   * Declare compliance with Debian policy 4.7.0
 
+  [ Marcel Fourné ]
+  * New upstream version for GHC 9.6
+
  -- Ilias Tsitsimpis <iliastsi at debian.org>  Sun, 27 Aug 2023 12:35:05 +0300
 
 yi (0.19.0-2) unstable; urgency=medium



View it on GitLab: https://salsa.debian.org/haskell-team/DHG_packages/-/commit/f6423542958ebbca89c6bdc8e2c4224c8b54569f

-- 
View it on GitLab: https://salsa.debian.org/haskell-team/DHG_packages/-/commit/f6423542958ebbca89c6bdc8e2c4224c8b54569f
You're receiving this email because of your account on salsa.debian.org.


-------------- next part --------------
An HTML attachment was scrubbed...
URL: <http://alioth-lists.debian.net/pipermail/pkg-haskell-commits/attachments/20241024/f63eb52c/attachment-0001.htm>


More information about the Pkg-haskell-commits mailing list