summaryrefslogtreecommitdiff
path: root/p/xmonad/debian/patches
diff options
context:
space:
mode:
authorClint Adams <clint@debian.org>2016-01-11 00:19:36 -0500
committerClint Adams <clint@debian.org>2016-01-11 00:26:36 -0500
commita2329e7154b3d8c9e7deda40ef44c73c3305817c (patch)
treee2fb6a79cb2ac3baa8a2b201bfc4f50a6c340753 /p/xmonad/debian/patches
parent1e36501942fc994773e367ff8ad32f6c96326fd7 (diff)
downloadDHG_packages-a2329e7154b3d8c9e7deda40ef44c73c3305817c.tar.gz
xmonad: Upgrading from 0.11.1 to 0.12
Diffstat (limited to 'p/xmonad/debian/patches')
-rw-r--r--p/xmonad/debian/patches/fix-GenerateManpage29
-rw-r--r--p/xmonad/debian/patches/float-mplayer2.patch27
-rw-r--r--p/xmonad/debian/patches/relax-utf8-string-dep13
-rw-r--r--p/xmonad/debian/patches/series3
-rw-r--r--p/xmonad/debian/patches/use_x-terminal-emulator.patch8
5 files changed, 3 insertions, 77 deletions
diff --git a/p/xmonad/debian/patches/fix-GenerateManpage b/p/xmonad/debian/patches/fix-GenerateManpage
deleted file mode 100644
index 76690c00b..000000000
--- a/p/xmonad/debian/patches/fix-GenerateManpage
+++ /dev/null
@@ -1,29 +0,0 @@
-Index: xmonad/util/GenerateManpage.hs
-===================================================================
---- xmonad.orig/util/GenerateManpage.hs 2015-08-19 16:35:34.888424481 +0200
-+++ xmonad/util/GenerateManpage.hs 2015-08-19 16:36:29.285364470 +0200
-@@ -1,3 +1,4 @@
-+{-# LANGUAGE FlexibleContexts #-}
- -- Unlike the rest of xmonad, this file is copyright under the terms of the
- -- GPL.
-
-@@ -26,6 +27,7 @@
- import Text.Regex.Posix
- import Data.Char
- import Data.List
-+import qualified Data.Set as Set
-
- import Distribution.PackageDescription.Parse
- import Distribution.Verbosity
-@@ -68,9 +70,9 @@
- `liftM` readFile "./XMonad/Config.hs"
-
- let manHeader = unwords [".TH xmonad 1","\""++releaseDate++"\"",releaseName,"\"xmonad manual\""]
-- writeOpts = defaultWriterOptions -- { writerLiterateHaskell = True }
-+ writeOpts = def -- { writerLiterateHaskell = True }
-
-- parsed <- readMarkdown defaultParserState { stateLiterateHaskell = True }
-+ Right parsed <- readMarkdown def { readerExtensions = Set.insert Ext_literate_haskell pandocExtensions }
- . unlines
- . replace "___KEYBINDINGS___" keybindings
- . lines
diff --git a/p/xmonad/debian/patches/float-mplayer2.patch b/p/xmonad/debian/patches/float-mplayer2.patch
deleted file mode 100644
index b561d23b9..000000000
--- a/p/xmonad/debian/patches/float-mplayer2.patch
+++ /dev/null
@@ -1,27 +0,0 @@
-Author: Joey Hess <joeyh@debian.org>
-Debian-Bug: http://bugs.debian.org/753551
-Description:
- xmonad floats mplayer by default. However, Debian has switched to
- mplayer2, and so on upgrade, it will stop floating. This can be easily
- fixed in the user's config file, but here is a patch that avoids
- bothering the user with breakage on upgrade.
-
-Index: xmonad-0.11/XMonad/Config.hs
-===================================================================
---- xmonad-0.11.orig/XMonad/Config.hs 2013-01-01 02:31:47.000000000 +0100
-+++ xmonad-0.11/XMonad/Config.hs 2014-07-03 07:40:08.951940477 +0200
-@@ -90,6 +90,7 @@
- manageHook :: ManageHook
- manageHook = composeAll
- [ className =? "MPlayer" --> doFloat
-+ , className =? "mplayer2" --> doFloat
- , className =? "Gimp" --> doFloat ]
-
- ------------------------------------------------------------------------
-@@ -305,4 +306,4 @@
- "-- Mouse bindings: default actions bound to mouse events",
- "mod-button1 Set the window to floating mode and move by dragging",
- "mod-button2 Raise the window to the top of the stack",
-- "mod-button3 Set the window to floating mode and resize by dragging"]
-\ No newline at end of file
-+ "mod-button3 Set the window to floating mode and resize by dragging"]
diff --git a/p/xmonad/debian/patches/relax-utf8-string-dep b/p/xmonad/debian/patches/relax-utf8-string-dep
deleted file mode 100644
index 8a000a80b..000000000
--- a/p/xmonad/debian/patches/relax-utf8-string-dep
+++ /dev/null
@@ -1,13 +0,0 @@
-Index: xmonad-0.11.1/xmonad.cabal
-===================================================================
---- xmonad-0.11.1.orig/xmonad.cabal 2015-06-27 15:12:11.430371165 +0200
-+++ xmonad-0.11.1/xmonad.cabal 2015-06-27 15:12:56.963495179 +0200
-@@ -58,7 +58,7 @@
- else
- build-depends: base < 3
- build-depends: X11>=1.5 && < 1.7, mtl, unix,
-- utf8-string >= 0.3 && < 0.4
-+ utf8-string >= 0.3 && < 1.1
-
- if true
- ghc-options: -funbox-strict-fields -Wall
diff --git a/p/xmonad/debian/patches/series b/p/xmonad/debian/patches/series
index 1121c148a..1863ecb6d 100644
--- a/p/xmonad/debian/patches/series
+++ b/p/xmonad/debian/patches/series
@@ -1,5 +1,2 @@
-fix-GenerateManpage
-float-mplayer2.patch
use_x-terminal-emulator.patch
#haddock-fixes.patch
-relax-utf8-string-dep
diff --git a/p/xmonad/debian/patches/use_x-terminal-emulator.patch b/p/xmonad/debian/patches/use_x-terminal-emulator.patch
index 2878350ac..288d578cf 100644
--- a/p/xmonad/debian/patches/use_x-terminal-emulator.patch
+++ b/p/xmonad/debian/patches/use_x-terminal-emulator.patch
@@ -5,11 +5,9 @@ Forwarded: not-needed
Last-Update: 2012-07-07
---
This patch header follows DEP-3: http://dep.debian.net/deps/dep3/
-Index: xmonad/XMonad/Config.hs
-===================================================================
---- xmonad.orig/XMonad/Config.hs 2015-08-15 14:43:32.443704478 +0200
-+++ xmonad/XMonad/Config.hs 2015-08-15 14:43:32.439704396 +0200
-@@ -152,7 +152,7 @@
+--- a/src/XMonad/Config.hs
++++ b/src/XMonad/Config.hs
+@@ -166,7 +166,7 @@
-- | The preferred terminal program, which is used in a binding below and by
-- certain contrib modules.
terminal :: String