commit ghc-shakespeare for openSUSE:Factory

2020-09-07 Thread root
Hello community,

here is the log from the commit of package ghc-shakespeare for openSUSE:Factory 
checked in at 2020-09-07 21:32:29

Comparing /work/SRC/openSUSE:Factory/ghc-shakespeare (Old)
 and  /work/SRC/openSUSE:Factory/.ghc-shakespeare.new.3399 (New)


Package is "ghc-shakespeare"

Mon Sep  7 21:32:29 2020 rev:4 rq:832319 version:2.0.25

Changes:

--- /work/SRC/openSUSE:Factory/ghc-shakespeare/ghc-shakespeare.changes  
2020-08-28 21:38:05.612800990 +0200
+++ 
/work/SRC/openSUSE:Factory/.ghc-shakespeare.new.3399/ghc-shakespeare.changes
2020-09-07 21:32:30.569302129 +0200
@@ -1,0 +2,8 @@
+Fri Aug 28 11:38:38 UTC 2020 - psim...@suse.com
+
+- Update shakespeare to version 2.0.25.
+  ### 2.0.25
+
+  * Support for GHC 9.0 
[#254](https://github.com/yesodweb/shakespeare/pull/254)
+
+---

Old:

  shakespeare-2.0.24.1.tar.gz

New:

  shakespeare-2.0.25.tar.gz



Other differences:
--
++ ghc-shakespeare.spec ++
--- /var/tmp/diff_new_pack.BZ7lUY/_old  2020-09-07 21:32:32.421302978 +0200
+++ /var/tmp/diff_new_pack.BZ7lUY/_new  2020-09-07 21:32:32.425302980 +0200
@@ -19,7 +19,7 @@
 %global pkg_name shakespeare
 %bcond_with tests
 Name:   ghc-%{pkg_name}
-Version:2.0.24.1
+Version:2.0.25
 Release:0
 Summary:A toolkit for making compile-time interpolated templates
 License:MIT

++ shakespeare-2.0.24.1.tar.gz -> shakespeare-2.0.25.tar.gz ++
diff -urN '--exclude=CVS' '--exclude=.cvsignore' '--exclude=.svn' 
'--exclude=.svnignore' old/shakespeare-2.0.24.1/ChangeLog.md 
new/shakespeare-2.0.25/ChangeLog.md
--- old/shakespeare-2.0.24.1/ChangeLog.md   2020-06-18 13:43:03.0 
+0200
+++ new/shakespeare-2.0.25/ChangeLog.md 2020-08-28 09:13:14.0 +0200
@@ -1,5 +1,9 @@
 # ChangeLog for shakespeare
 
+### 2.0.25
+
+* Support for GHC 9.0 [#254](https://github.com/yesodweb/shakespeare/pull/254)
+
 ### 2.0.24.1
 
 * Derive Lift instances wherever possible 
[#252](https://github.com/yesodweb/shakespeare/pull/252)
diff -urN '--exclude=CVS' '--exclude=.cvsignore' '--exclude=.svn' 
'--exclude=.svnignore' old/shakespeare-2.0.24.1/Text/Hamlet/Parse.hs 
new/shakespeare-2.0.25/Text/Hamlet/Parse.hs
--- old/shakespeare-2.0.24.1/Text/Hamlet/Parse.hs   2020-06-18 
13:42:45.0 +0200
+++ new/shakespeare-2.0.25/Text/Hamlet/Parse.hs 2020-08-28 09:13:14.0 
+0200
@@ -625,7 +625,9 @@
 
 instance Lift (String -> CloseStyle) where
 lift _ = [|\s -> htmlCloseStyle s|]
-#if MIN_VERSION_template_haskell(2,16,0)
+#if MIN_VERSION_template_haskell(2,17,0)
+liftTyped = unsafeCodeCoerce . lift
+#elif MIN_VERSION_template_haskell(2,16,0)
 liftTyped = unsafeTExpCoerce . lift
 #endif
 
diff -urN '--exclude=CVS' '--exclude=.cvsignore' '--exclude=.svn' 
'--exclude=.svnignore' old/shakespeare-2.0.24.1/Text/Hamlet.hs 
new/shakespeare-2.0.25/Text/Hamlet.hs
--- old/shakespeare-2.0.24.1/Text/Hamlet.hs 2020-06-18 13:42:45.0 
+0200
+++ new/shakespeare-2.0.25/Text/Hamlet.hs   2020-08-28 09:13:14.0 
+0200
@@ -110,7 +110,11 @@
 case exps of
 [] -> [|return ()|]
 [x] -> return x
-_ -> return $ DoE $ map NoBindS exps
+_ -> return $ DoE
+#if MIN_VERSION_template_haskell(2,17,0)
+Nothing
+#endif
+$ map NoBindS exps
 
 unIdent :: Ident -> String
 unIdent (Ident s) = s
diff -urN '--exclude=CVS' '--exclude=.cvsignore' '--exclude=.svn' 
'--exclude=.svnignore' old/shakespeare-2.0.24.1/Text/Internal/Css.hs 
new/shakespeare-2.0.25/Text/Internal/Css.hs
--- old/shakespeare-2.0.24.1/Text/Internal/Css.hs   2020-06-18 
13:42:45.0 +0200
+++ new/shakespeare-2.0.25/Text/Internal/Css.hs 2020-08-28 09:13:14.0 
+0200
@@ -270,7 +270,7 @@
   where
 cs = either error mconcat $ mapM (contentToBuilderRT cd render') cs'
 goTop scope (TopBlock b:rest) =
-map TopBlock (either error ($[]) $ blockRuntime (addScope scope) 
render' b) ++
+map TopBlock (either error ($ []) $ blockRuntime (addScope scope) 
render' b) ++
 goTop scope rest
 goTop scope (TopAtBlock name s' b:rest) =
 TopAtBlock name s (foldr (either error id . blockRuntime (addScope 
scope) render') [] b) :
@@ -516,16 +516,24 @@
 deriving instance Lift (Attr Unresolved)
 instance Lift (Attr Resolved) where
 lift (Attr k v) = [|Attr $(liftBuilder k) $(liftBuilder v) :: Attr 
Resolved |]
-#if MIN_VERSION_template_haskell(2,16,0)
+#if MIN_VERSION_template_haskell(2,17,0)
+liftTyped = unsafeCodeCoerce . lift
+#elif MIN_VERSION_template_haskell(2,16,0)
 liftTyped = unsafeTExpCoerce . lift
 #endif
 
+#if MIN_VERSION_template_haskell(2,17,0)

commit ghc-shakespeare for openSUSE:Factory

2020-08-28 Thread root
Hello community,

here is the log from the commit of package ghc-shakespeare for openSUSE:Factory 
checked in at 2020-08-28 21:38:05

Comparing /work/SRC/openSUSE:Factory/ghc-shakespeare (Old)
 and  /work/SRC/openSUSE:Factory/.ghc-shakespeare.new.3399 (New)


Package is "ghc-shakespeare"

Fri Aug 28 21:38:05 2020 rev:3 rq:829417 version:2.0.24.1

Changes:

--- /work/SRC/openSUSE:Factory/ghc-shakespeare/ghc-shakespeare.changes  
2020-07-09 13:20:02.721398142 +0200
+++ 
/work/SRC/openSUSE:Factory/.ghc-shakespeare.new.3399/ghc-shakespeare.changes
2020-08-28 21:38:05.612800990 +0200
@@ -1,0 +2,5 @@
+Tue Aug 18 10:46:00 UTC 2020 - Peter Simons 
+
+- Replace %setup -q with the more modern %autosetup macro.
+
+---



Other differences:
--
++ ghc-shakespeare.spec ++
--- /var/tmp/diff_new_pack.ymdZLJ/_old  2020-08-28 21:38:06.140801240 +0200
+++ /var/tmp/diff_new_pack.ymdZLJ/_new  2020-08-28 21:38:06.144801242 +0200
@@ -77,7 +77,7 @@
 This package provides the Haskell %{pkg_name} library development files.
 
 %prep
-%setup -q -n %{pkg_name}-%{version}
+%autosetup -n %{pkg_name}-%{version}
 
 %build
 %ghc_lib_build




commit ghc-shakespeare for openSUSE:Factory

2020-07-09 Thread root
Hello community,

here is the log from the commit of package ghc-shakespeare for openSUSE:Factory 
checked in at 2020-07-09 13:19:34

Comparing /work/SRC/openSUSE:Factory/ghc-shakespeare (Old)
 and  /work/SRC/openSUSE:Factory/.ghc-shakespeare.new.3060 (New)


Package is "ghc-shakespeare"

Thu Jul  9 13:19:34 2020 rev:2 rq:819588 version:2.0.24.1

Changes:

--- /work/SRC/openSUSE:Factory/ghc-shakespeare/ghc-shakespeare.changes  
2020-06-19 17:04:08.916633034 +0200
+++ 
/work/SRC/openSUSE:Factory/.ghc-shakespeare.new.3060/ghc-shakespeare.changes
2020-07-09 13:20:02.721398142 +0200
@@ -1,0 +2,8 @@
+Fri Jun 19 02:00:21 UTC 2020 - psim...@suse.com
+
+- Update shakespeare to version 2.0.24.1.
+  ### 2.0.24.1
+
+  * Derive Lift instances wherever possible 
[#252](https://github.com/yesodweb/shakespeare/pull/252)
+
+---

Old:

  shakespeare-2.0.24.tar.gz

New:

  shakespeare-2.0.24.1.tar.gz



Other differences:
--
++ ghc-shakespeare.spec ++
--- /var/tmp/diff_new_pack.zbyrPW/_old  2020-07-09 13:20:04.893405007 +0200
+++ /var/tmp/diff_new_pack.zbyrPW/_new  2020-07-09 13:20:04.897405020 +0200
@@ -19,7 +19,7 @@
 %global pkg_name shakespeare
 %bcond_with tests
 Name:   ghc-%{pkg_name}
-Version:2.0.24
+Version:2.0.24.1
 Release:0
 Summary:A toolkit for making compile-time interpolated templates
 License:MIT
@@ -39,6 +39,7 @@
 BuildRequires:  ghc-scientific-devel
 BuildRequires:  ghc-template-haskell-devel
 BuildRequires:  ghc-text-devel
+BuildRequires:  ghc-th-lift-devel
 BuildRequires:  ghc-time-devel
 BuildRequires:  ghc-transformers-devel
 BuildRequires:  ghc-unordered-containers-devel

++ shakespeare-2.0.24.tar.gz -> shakespeare-2.0.24.1.tar.gz ++
diff -urN '--exclude=CVS' '--exclude=.cvsignore' '--exclude=.svn' 
'--exclude=.svnignore' old/shakespeare-2.0.24/ChangeLog.md 
new/shakespeare-2.0.24.1/ChangeLog.md
--- old/shakespeare-2.0.24/ChangeLog.md 2020-01-27 15:10:05.0 +0100
+++ new/shakespeare-2.0.24.1/ChangeLog.md   2020-06-18 13:43:03.0 
+0200
@@ -1,5 +1,9 @@
 # ChangeLog for shakespeare
 
+### 2.0.24.1
+
+* Derive Lift instances wherever possible 
[#252](https://github.com/yesodweb/shakespeare/pull/252)
+
 ### 2.0.24
 
 * Fix build errors with GHC 8.10.1-alpha2 
[#245](https://github.com/yesodweb/shakespeare/pull/245)
diff -urN '--exclude=CVS' '--exclude=.cvsignore' '--exclude=.svn' 
'--exclude=.svnignore' old/shakespeare-2.0.24/Text/Hamlet/Parse.hs 
new/shakespeare-2.0.24.1/Text/Hamlet/Parse.hs
--- old/shakespeare-2.0.24/Text/Hamlet/Parse.hs 2020-01-27 14:58:25.0 
+0100
+++ new/shakespeare-2.0.24.1/Text/Hamlet/Parse.hs   2020-06-18 
13:42:45.0 +0200
@@ -1,5 +1,6 @@
 {-# LANGUAGE CPP #-}
 {-# LANGUAGE DeriveDataTypeable #-}
+{-# LANGUAGE DeriveLift #-}
 {-# LANGUAGE FlexibleContexts #-}
 {-# LANGUAGE TemplateHaskell #-}
 {-# LANGUAGE FlexibleInstances #-}
@@ -30,7 +31,7 @@
 import Data.Set (Set)
 import qualified Data.Set as Set
 import Data.Maybe (mapMaybe, fromMaybe, isNothing)
-import Language.Haskell.TH.Syntax (Lift (..))
+import Language.Haskell.TH.Syntax hiding (Module)
 
 data Result v = Error String | Ok v
 deriving (Show, Eq, Read, Data, Typeable)
@@ -614,24 +615,19 @@
   -- | Mapping from short names in \"$doctype\" statements to full doctype.
 , hamletDoctypeNames :: [(String, String)]
 }
+deriving Lift
 
 data NewlineStyle = NoNewlines -- ^ never add newlines
   | NewlinesText -- ^ add newlines between consecutive text 
lines
   | AlwaysNewlines -- ^ add newlines everywhere
   | DefaultNewlineStyle
-deriving Show
-
-instance Lift NewlineStyle where
-lift NoNewlines = [|NoNewlines|]
-lift NewlinesText = [|NewlinesText|]
-lift AlwaysNewlines = [|AlwaysNewlines|]
-lift DefaultNewlineStyle = [|DefaultNewlineStyle|]
+deriving (Show, Lift)
 
 instance Lift (String -> CloseStyle) where
 lift _ = [|\s -> htmlCloseStyle s|]
-
-instance Lift HamletSettings where
-lift (HamletSettings a b c d) = [|HamletSettings $(lift a) $(lift b) 
$(lift c) $(lift d)|]
+#if MIN_VERSION_template_haskell(2,16,0)
+liftTyped = unsafeTExpCoerce . lift
+#endif
 
 
 -- See the html specification for a list of all void elements:
diff -urN '--exclude=CVS' '--exclude=.cvsignore' '--exclude=.svn' 
'--exclude=.svnignore' old/shakespeare-2.0.24/Text/Internal/Css.hs 
new/shakespeare-2.0.24.1/Text/Internal/Css.hs
--- old/shakespeare-2.0.24/Text/Internal/Css.hs 2020-01-27 15:07:29.0 
+0100
+++ new/shakespeare-2.0.24.1/Text/Internal/Css.hs   2020-06-18 
13:42:45.0 +0200
@@ -2,6 +2,8 @@
 -- | This 

commit ghc-shakespeare for openSUSE:Factory

2017-06-03 Thread root
Hello community,

here is the log from the commit of package ghc-shakespeare for openSUSE:Factory 
checked in at 2017-06-04 01:55:17

Comparing /work/SRC/openSUSE:Factory/ghc-shakespeare (Old)
 and  /work/SRC/openSUSE:Factory/.ghc-shakespeare.new (New)


Package is "ghc-shakespeare"

Sun Jun  4 01:55:17 2017 rev:11 rq:494187 version:2.0.13

Changes:

--- /work/SRC/openSUSE:Factory/ghc-shakespeare/ghc-shakespeare.changes  
2017-03-18 20:50:01.498345821 +0100
+++ /work/SRC/openSUSE:Factory/.ghc-shakespeare.new/ghc-shakespeare.changes 
2017-06-04 01:55:20.678212647 +0200
@@ -1,0 +2,5 @@
+Mon Apr 24 12:26:48 UTC 2017 - psim...@suse.com
+
+- Update to version 2.0.13 with cabal2obs.
+
+---

Old:

  shakespeare-2.0.12.1.tar.gz

New:

  shakespeare-2.0.13.tar.gz



Other differences:
--
++ ghc-shakespeare.spec ++
--- /var/tmp/diff_new_pack.yTtVUe/_old  2017-06-04 01:55:21.222135801 +0200
+++ /var/tmp/diff_new_pack.yTtVUe/_new  2017-06-04 01:55:21.226135236 +0200
@@ -19,7 +19,7 @@
 %global pkg_name shakespeare
 %bcond_with tests
 Name:   ghc-%{pkg_name}
-Version:2.0.12.1
+Version:2.0.13
 Release:0
 Summary:A toolkit for making compile-time interpolated templates
 License:MIT

++ shakespeare-2.0.12.1.tar.gz -> shakespeare-2.0.13.tar.gz ++
diff -urN '--exclude=CVS' '--exclude=.cvsignore' '--exclude=.svn' 
'--exclude=.svnignore' old/shakespeare-2.0.12.1/ChangeLog.md 
new/shakespeare-2.0.13/ChangeLog.md
--- old/shakespeare-2.0.12.1/ChangeLog.md   2016-12-28 10:13:50.0 
+0100
+++ new/shakespeare-2.0.13/ChangeLog.md 2017-04-19 16:59:58.0 +0200
@@ -1,3 +1,7 @@
+### 2.0.13
+
+* Expose Text.Internal.Css 
[#205](https://github.com/yesodweb/shakespeare/pull/205)
+
 ### 2.0.12.1
 
 * New contentHash parser breaks hash hrefs 
[#200](https://github.com/yesodweb/shakespeare/issues/200)
diff -urN '--exclude=CVS' '--exclude=.cvsignore' '--exclude=.svn' 
'--exclude=.svnignore' old/shakespeare-2.0.12.1/Text/Cassius.hs 
new/shakespeare-2.0.13/Text/Cassius.hs
--- old/shakespeare-2.0.12.1/Text/Cassius.hs2016-12-28 10:13:50.0 
+0100
+++ new/shakespeare-2.0.13/Text/Cassius.hs  2017-04-19 16:59:33.0 
+0200
@@ -40,13 +40,13 @@
 , cassiusUsedIdentifiers
 ) where
 
-import Text.Css
+import Text.Internal.Css
 import Text.Shakespeare.Base
 import Text.Shakespeare (VarType)
 import Language.Haskell.TH.Quote (QuasiQuoter (..))
 import Language.Haskell.TH.Syntax
 import qualified Data.Text.Lazy as TL
-import Text.CssCommon
+import Text.Internal.CssCommon
 import Text.Lucius (lucius)
 import qualified Text.Lucius
 import Text.IndentToBrace (i2b)
diff -urN '--exclude=CVS' '--exclude=.cvsignore' '--exclude=.svn' 
'--exclude=.svnignore' old/shakespeare-2.0.12.1/Text/Css.hs 
new/shakespeare-2.0.13/Text/Css.hs
--- old/shakespeare-2.0.12.1/Text/Css.hs2016-12-28 10:13:50.0 
+0100
+++ new/shakespeare-2.0.13/Text/Css.hs  1970-01-01 01:00:00.0 +0100
@@ -1,537 +0,0 @@
-{-# LANGUAGE TemplateHaskell #-}
-{-# LANGUAGE GADTs #-}
-{-# LANGUAGE GeneralizedNewtypeDeriving #-}
-{-# LANGUAGE FlexibleInstances #-}
-{-# LANGUAGE PatternGuards #-}
-{-# LANGUAGE CPP #-}
-{-# LANGUAGE TypeFamilies #-}
-{-# LANGUAGE EmptyDataDecls #-}
-module Text.Css where
-
-import Data.List (intersperse, intercalate)
-import Data.Text.Lazy.Builder (Builder, singleton, toLazyText, fromLazyText, 
fromString)
-import qualified Data.Text.Lazy as TL
-import qualified Data.Text.Lazy.Builder as TLB
-import Data.Monoid (Monoid, mconcat, mappend, mempty)
-import Data.Text (Text)
-import qualified Data.Text as T
-import Language.Haskell.TH.Syntax
-import System.IO.Unsafe (unsafePerformIO)
-import Text.ParserCombinators.Parsec (Parser, parse)
-import Text.Shakespeare.Base hiding (Scope)
-import Language.Haskell.TH
-import Control.Applicative ((<$>), (<*>))
-import Control.Arrow ((***), second)
-import Text.IndentToBrace (i2b)
-import Data.Functor.Identity (runIdentity)
-import Text.Shakespeare (VarType (..))
-
-#if MIN_VERSION_base(4,5,0)
-import Data.Monoid ((<>))
-#else
-(<>) :: Monoid m => m -> m -> m
-(<>) = mappend
-{-# INLINE (<>) #-}
-#endif
-
-type CssUrl url = (url -> [(T.Text, T.Text)] -> T.Text) -> Css
-
-type DList a = [a] -> [a]
-
--- FIXME great use case for data kinds
-data Resolved
-data Unresolved
-
-type family Selector a
-type instance Selector Resolved = Builder
-type instance Selector Unresolved = [Contents]
-
-type family ChildBlocks a
-type instance ChildBlocks Resolved = ()
-type instance ChildBlocks Unresolved = [(HasLeadingSpace, Block Unresolved)]
-
-type HasLeadingSpace = Bool
-
-type family Str a
-type instance Str 

commit ghc-shakespeare for openSUSE:Factory

2017-03-18 Thread root
Hello community,

here is the log from the commit of package ghc-shakespeare for openSUSE:Factory 
checked in at 2017-03-18 20:50:00

Comparing /work/SRC/openSUSE:Factory/ghc-shakespeare (Old)
 and  /work/SRC/openSUSE:Factory/.ghc-shakespeare.new (New)


Package is "ghc-shakespeare"

Sat Mar 18 20:50:00 2017 rev:10 rq:450620 version:2.0.12.1

Changes:

--- /work/SRC/openSUSE:Factory/ghc-shakespeare/ghc-shakespeare.changes  
2016-12-06 14:25:47.0 +0100
+++ /work/SRC/openSUSE:Factory/.ghc-shakespeare.new/ghc-shakespeare.changes 
2017-03-18 20:50:01.498345821 +0100
@@ -1,0 +2,5 @@
+Mon Jan  9 06:36:31 UTC 2017 - psim...@suse.com
+
+- Update to version 2.0.12.1 with cabal2obs.
+
+---

Old:

  shakespeare-2.0.11.2.tar.gz

New:

  shakespeare-2.0.12.1.tar.gz



Other differences:
--
++ ghc-shakespeare.spec ++
--- /var/tmp/diff_new_pack.ExkN5Z/_old  2017-03-18 20:50:02.238241003 +0100
+++ /var/tmp/diff_new_pack.ExkN5Z/_new  2017-03-18 20:50:02.242240436 +0100
@@ -1,7 +1,7 @@
 #
 # spec file for package ghc-shakespeare
 #
-# Copyright (c) 2016 SUSE LINUX GmbH, Nuernberg, Germany.
+# Copyright (c) 2017 SUSE LINUX GmbH, Nuernberg, Germany.
 #
 # All modifications and additions to the file contributed by third parties
 # remain the property of their copyright owners, unless otherwise agreed
@@ -19,7 +19,7 @@
 %global pkg_name shakespeare
 %bcond_with tests
 Name:   ghc-%{pkg_name}
-Version:2.0.11.2
+Version:2.0.12.1
 Release:0
 Summary:A toolkit for making compile-time interpolated templates
 License:MIT

++ shakespeare-2.0.11.2.tar.gz -> shakespeare-2.0.12.1.tar.gz ++
diff -urN '--exclude=CVS' '--exclude=.cvsignore' '--exclude=.svn' 
'--exclude=.svnignore' old/shakespeare-2.0.11.2/ChangeLog.md 
new/shakespeare-2.0.12.1/ChangeLog.md
--- old/shakespeare-2.0.11.2/ChangeLog.md   2016-11-17 21:00:16.0 
+0100
+++ new/shakespeare-2.0.12.1/ChangeLog.md   2016-12-28 10:13:50.0 
+0100
@@ -1,3 +1,11 @@
+### 2.0.12.1
+
+* New contentHash parser breaks hash hrefs 
[#200](https://github.com/yesodweb/shakespeare/issues/200)
+
+### 2.0.12
+
+* Parser fails without space between class and ID (Hamlet) 
[#197](https://github.com/yesodweb/shakespeare/issues/197)
+
 ### 2.0.11.2
 
 * Support for template-haskell 2.12.0 
[#196](https://github.com/yesodweb/shakespeare/pull/196)
diff -urN '--exclude=CVS' '--exclude=.cvsignore' '--exclude=.svn' 
'--exclude=.svnignore' old/shakespeare-2.0.11.2/Text/Hamlet/Parse.hs 
new/shakespeare-2.0.12.1/Text/Hamlet/Parse.hs
--- old/shakespeare-2.0.11.2/Text/Hamlet/Parse.hs   2016-11-17 
21:00:16.0 +0100
+++ new/shakespeare-2.0.12.1/Text/Hamlet/Parse.hs   2016-12-28 
10:13:50.0 +0100
@@ -246,12 +246,18 @@
 cc [] = []
 cc (ContentRaw a:ContentRaw b:c) = cc $ ContentRaw (a ++ b) : c
 cc (a:b) = a : cc b
-content' cr = contentHash <|> contentAt <|> contentCaret
-  <|> contentUnder
-  <|> contentReg' cr
-contentHash = do
+
+content' cr = contentHash cr
+  <|> contentAt
+  <|> contentCaret
+  <|> contentUnder
+  <|> contentReg' cr
+contentHash cr = do
 x <- parseHash
 case x of
+Left "#" -> case cr of
+  NotInQuotes -> fail "Expected hash at end of line, 
got Id"
+  _ -> return (ContentRaw "#", False)
 Left str -> return (ContentRaw str, null str)
 Right deref -> return (ContentVar deref, False)
 contentAt = do
@@ -281,13 +287,7 @@
 tagCond = do
 d <- between (char ':') (char ':') parseDeref
 tagClass (Just d) <|> tagAttrib (Just d)
-tagClass x = do
-clazz <- char '.' >> tagAttribValue NotInQuotes
-let hasHash (ContentRaw s) = any (== '#') s
-hasHash _ = False
-if any hasHash clazz
-then fail $ "Invalid class: " ++ show clazz ++ ". Did you want a 
space between a class and an ID?"
-else return (TagClass (x, clazz))
+tagClass x = char '.' >> (TagClass . ((,)x)) <$> tagAttribValue NotInQuotes
 tagAttrib cond = do
 s <- many1 $ noneOf " \t=\r\n><"
 v <- (char '=' >> Just <$> tagAttribValue NotInQuotesAttr) <|> return 
Nothing
diff -urN '--exclude=CVS' '--exclude=.cvsignore' '--exclude=.svn' 
'--exclude=.svnignore' old/shakespeare-2.0.11.2/shakespeare.cabal 
new/shakespeare-2.0.12.1/shakespeare.cabal
--- old/shakespeare-2.0.11.2/shakespeare.cabal  2016-11-17 21:00:16.0 
+0100
+++ 

commit ghc-shakespeare for openSUSE:Factory

2016-12-06 Thread h_root
Hello community,

here is the log from the commit of package ghc-shakespeare for openSUSE:Factory 
checked in at 2016-12-06 14:25:44

Comparing /work/SRC/openSUSE:Factory/ghc-shakespeare (Old)
 and  /work/SRC/openSUSE:Factory/.ghc-shakespeare.new (New)


Package is "ghc-shakespeare"

Changes:

--- /work/SRC/openSUSE:Factory/ghc-shakespeare/ghc-shakespeare.changes  
2016-11-02 12:45:20.0 +0100
+++ /work/SRC/openSUSE:Factory/.ghc-shakespeare.new/ghc-shakespeare.changes 
2016-12-06 14:25:47.0 +0100
@@ -1,0 +2,5 @@
+Tue Nov 22 16:06:46 UTC 2016 - psim...@suse.com
+
+- Update to version 2.0.11.2 with cabal2obs.
+
+---

Old:

  shakespeare-2.0.11.1.tar.gz

New:

  shakespeare-2.0.11.2.tar.gz



Other differences:
--
++ ghc-shakespeare.spec ++
--- /var/tmp/diff_new_pack.mcA1jS/_old  2016-12-06 14:25:49.0 +0100
+++ /var/tmp/diff_new_pack.mcA1jS/_new  2016-12-06 14:25:49.0 +0100
@@ -19,7 +19,7 @@
 %global pkg_name shakespeare
 %bcond_with tests
 Name:   ghc-%{pkg_name}
-Version:2.0.11.1
+Version:2.0.11.2
 Release:0
 Summary:A toolkit for making compile-time interpolated templates
 License:MIT

++ shakespeare-2.0.11.1.tar.gz -> shakespeare-2.0.11.2.tar.gz ++
diff -urN '--exclude=CVS' '--exclude=.cvsignore' '--exclude=.svn' 
'--exclude=.svnignore' old/shakespeare-2.0.11.1/ChangeLog.md 
new/shakespeare-2.0.11.2/ChangeLog.md
--- old/shakespeare-2.0.11.1/ChangeLog.md   2016-09-02 08:01:55.0 
+0200
+++ new/shakespeare-2.0.11.2/ChangeLog.md   2016-11-17 21:00:16.0 
+0100
@@ -1,3 +1,7 @@
+### 2.0.11.2
+
+* Support for template-haskell 2.12.0 
[#196](https://github.com/yesodweb/shakespeare/pull/196)
+
 ### 2.0.11.1
 
 * Handle parsing of trailing semicolon after mixins 
[#194](https://github.com/yesodweb/shakespeare/issues/194)
diff -urN '--exclude=CVS' '--exclude=.cvsignore' '--exclude=.svn' 
'--exclude=.svnignore' old/shakespeare-2.0.11.1/Text/MkSizeType.hs 
new/shakespeare-2.0.11.2/Text/MkSizeType.hs
--- old/shakespeare-2.0.11.1/Text/MkSizeType.hs 2016-09-02 08:01:55.0 
+0200
+++ new/shakespeare-2.0.11.2/Text/MkSizeType.hs 2016-11-17 21:00:16.0 
+0100
@@ -22,10 +22,13 @@
 
 dataDec :: Name -> Q Dec
 dataDec name =
-#if MIN_VERSION_template_haskell(2,11,0)
- DataD [] name [] Nothing [constructor] <$> mapM conT derives
+#if MIN_VERSION_template_haskell(2,12,0)
+  return $
+DataD [] name [] Nothing [constructor] [DerivClause Nothing (map ConT 
derives)]
+#elif MIN_VERSION_template_haskell(2,11,0)
+  DataD [] name [] Nothing [constructor] <$> mapM conT derives
 #else
-return $ DataD [] name [] [constructor] derives
+  return $ DataD [] name [] [constructor] derives
 #endif
   where constructor = NormalC name [(notStrict, ConT $ mkName "Rational")]
 derives = map mkName ["Eq", "Ord"]
diff -urN '--exclude=CVS' '--exclude=.cvsignore' '--exclude=.svn' 
'--exclude=.svnignore' old/shakespeare-2.0.11.1/shakespeare.cabal 
new/shakespeare-2.0.11.2/shakespeare.cabal
--- old/shakespeare-2.0.11.1/shakespeare.cabal  2016-09-02 08:01:55.0 
+0200
+++ new/shakespeare-2.0.11.2/shakespeare.cabal  2016-11-17 21:00:16.0 
+0100
@@ -1,5 +1,5 @@
 name:shakespeare
-version: 2.0.11.1
+version: 2.0.11.2
 license: MIT
 license-file:LICENSE
 author:  Michael Snoyman 




commit ghc-shakespeare for openSUSE:Factory

2016-11-02 Thread h_root
Hello community,

here is the log from the commit of package ghc-shakespeare for openSUSE:Factory 
checked in at 2016-11-02 12:45:18

Comparing /work/SRC/openSUSE:Factory/ghc-shakespeare (Old)
 and  /work/SRC/openSUSE:Factory/.ghc-shakespeare.new (New)


Package is "ghc-shakespeare"

Changes:

--- /work/SRC/openSUSE:Factory/ghc-shakespeare/ghc-shakespeare.changes  
2016-09-05 21:20:56.0 +0200
+++ /work/SRC/openSUSE:Factory/.ghc-shakespeare.new/ghc-shakespeare.changes 
2016-11-02 12:45:20.0 +0100
@@ -1,0 +2,5 @@
+Thu Sep 15 06:46:12 UTC 2016 - psim...@suse.com
+
+- Update to version 2.0.11.1 revision 0 with cabal2obs.
+
+---

Old:

  shakespeare-2.0.11.tar.gz

New:

  shakespeare-2.0.11.1.tar.gz



Other differences:
--
++ ghc-shakespeare.spec ++
--- /var/tmp/diff_new_pack.e7f8Jr/_old  2016-11-02 12:45:21.0 +0100
+++ /var/tmp/diff_new_pack.e7f8Jr/_new  2016-11-02 12:45:21.0 +0100
@@ -19,7 +19,7 @@
 %global pkg_name shakespeare
 %bcond_with tests
 Name:   ghc-%{pkg_name}
-Version:2.0.11
+Version:2.0.11.1
 Release:0
 Summary:A toolkit for making compile-time interpolated templates
 License:MIT

++ shakespeare-2.0.11.tar.gz -> shakespeare-2.0.11.1.tar.gz ++
diff -urN '--exclude=CVS' '--exclude=.cvsignore' '--exclude=.svn' 
'--exclude=.svnignore' old/shakespeare-2.0.11/ChangeLog.md 
new/shakespeare-2.0.11.1/ChangeLog.md
--- old/shakespeare-2.0.11/ChangeLog.md 2016-08-02 11:54:03.0 +0200
+++ new/shakespeare-2.0.11.1/ChangeLog.md   2016-09-02 08:01:55.0 
+0200
@@ -1,3 +1,7 @@
+### 2.0.11.1
+
+* Handle parsing of trailing semicolon after mixins 
[#194](https://github.com/yesodweb/shakespeare/issues/194)
+
 ### 2.0.11
 
 * Export hamletFromString 
[#191](https://github.com/yesodweb/shakespeare/pull/191)
diff -urN '--exclude=CVS' '--exclude=.cvsignore' '--exclude=.svn' 
'--exclude=.svnignore' old/shakespeare-2.0.11/Text/Lucius.hs 
new/shakespeare-2.0.11.1/Text/Lucius.hs
--- old/shakespeare-2.0.11/Text/Lucius.hs   2016-08-02 11:54:03.0 
+0200
+++ new/shakespeare-2.0.11.1/Text/Lucius.hs 2016-09-02 08:01:55.0 
+0200
@@ -158,6 +158,8 @@
 whiteSpace
 Right x <- parseCaret
 whiteSpace
+(char ';' >> return ()) <|> return ()
+whiteSpace
 return $ PBMixin x
 checkIfBlock = do
 skipMany $ noneOf "#@{};"
diff -urN '--exclude=CVS' '--exclude=.cvsignore' '--exclude=.svn' 
'--exclude=.svnignore' old/shakespeare-2.0.11/shakespeare.cabal 
new/shakespeare-2.0.11.1/shakespeare.cabal
--- old/shakespeare-2.0.11/shakespeare.cabal2016-08-02 11:54:03.0 
+0200
+++ new/shakespeare-2.0.11.1/shakespeare.cabal  2016-09-02 08:01:55.0 
+0200
@@ -1,5 +1,5 @@
 name:shakespeare
-version: 2.0.11
+version: 2.0.11.1
 license: MIT
 license-file:LICENSE
 author:  Michael Snoyman 
diff -urN '--exclude=CVS' '--exclude=.cvsignore' '--exclude=.svn' 
'--exclude=.svnignore' old/shakespeare-2.0.11/test/Text/CssSpec.hs 
new/shakespeare-2.0.11.1/test/Text/CssSpec.hs
--- old/shakespeare-2.0.11/test/Text/CssSpec.hs 2016-08-02 11:54:03.0 
+0200
+++ new/shakespeare-2.0.11.1/test/Text/CssSpec.hs   2016-09-02 
08:01:55.0 +0200
@@ -496,6 +496,21 @@
 src: url(sansation_light.woff)
 |]
 
+describe "trailing semicolon in mixin" $ do
+let someMixin = [luciusMixin|foo:bar|]
+it "direct in lucius" $
+celper "baz{foo:bar}" [lucius|
+baz {
+^{someMixin};
+}
+|]
+
+it "implicit in cassius #194" $
+celper "baz{foo:bar}" [cassius|
+baz
+^{someMixin}
+|]
+
 data Url = Home | Sub SubUrl
 data SubUrl = SubUrl
 render :: Url -> [(Text, Text)] -> Text




commit ghc-shakespeare for openSUSE:Factory

2016-09-05 Thread h_root
Hello community,

here is the log from the commit of package ghc-shakespeare for openSUSE:Factory 
checked in at 2016-09-05 21:20:50

Comparing /work/SRC/openSUSE:Factory/ghc-shakespeare (Old)
 and  /work/SRC/openSUSE:Factory/.ghc-shakespeare.new (New)


Package is "ghc-shakespeare"

Changes:

--- /work/SRC/openSUSE:Factory/ghc-shakespeare/ghc-shakespeare.changes  
2016-07-27 16:09:32.0 +0200
+++ /work/SRC/openSUSE:Factory/.ghc-shakespeare.new/ghc-shakespeare.changes 
2016-09-05 21:20:56.0 +0200
@@ -1,0 +2,10 @@
+Wed Aug 17 18:38:15 UTC 2016 - psim...@suse.com
+
+- Update to version 2.0.11 revision 0 with cabal2obs.
+
+---
+Mon Aug  1 10:30:58 UTC 2016 - psim...@suse.com
+
+- Update to version 2.0.10 revision 0 with cabal2obs.
+
+---

Old:

  shakespeare-2.0.9.tar.gz

New:

  shakespeare-2.0.11.tar.gz



Other differences:
--
++ ghc-shakespeare.spec ++
--- /var/tmp/diff_new_pack.Bunlnf/_old  2016-09-05 21:20:57.0 +0200
+++ /var/tmp/diff_new_pack.Bunlnf/_new  2016-09-05 21:20:57.0 +0200
@@ -19,15 +19,14 @@
 %global pkg_name shakespeare
 %bcond_with tests
 Name:   ghc-%{pkg_name}
-Version:2.0.9
+Version:2.0.11
 Release:0
 Summary:A toolkit for making compile-time interpolated templates
 License:MIT
-Group:  System/Libraries
+Group:  Development/Languages/Other
 Url:https://hackage.haskell.org/package/%{pkg_name}
 Source0:
https://hackage.haskell.org/package/%{pkg_name}-%{version}/%{pkg_name}-%{version}.tar.gz
 BuildRequires:  ghc-Cabal-devel
-# Begin cabal-rpm deps:
 BuildRequires:  ghc-aeson-devel
 BuildRequires:  ghc-blaze-html-devel
 BuildRequires:  ghc-blaze-markup-devel
@@ -50,7 +49,6 @@
 BuildRequires:  ghc-HUnit-devel
 BuildRequires:  ghc-hspec-devel
 %endif
-# End cabal-rpm deps
 
 %description
 Shakespeare is a family of type-safe, efficient template languages.
@@ -83,20 +81,14 @@
 %prep
 %setup -q -n %{pkg_name}-%{version}
 
-
 %build
 %ghc_lib_build
 
-
 %install
 %ghc_lib_install
 
-
 %check
-%if %{with tests}
-%{cabal} test
-%endif
-
+%cabal_test
 
 %post devel
 %ghc_pkg_recache

++ shakespeare-2.0.9.tar.gz -> shakespeare-2.0.11.tar.gz ++
 3951 lines of diff (skipped)




commit ghc-shakespeare for openSUSE:Factory

2016-07-27 Thread h_root
Hello community,

here is the log from the commit of package ghc-shakespeare for openSUSE:Factory 
checked in at 2016-07-27 16:09:30

Comparing /work/SRC/openSUSE:Factory/ghc-shakespeare (Old)
 and  /work/SRC/openSUSE:Factory/.ghc-shakespeare.new (New)


Package is "ghc-shakespeare"

Changes:

--- /work/SRC/openSUSE:Factory/ghc-shakespeare/ghc-shakespeare.changes  
2016-07-01 09:58:47.0 +0200
+++ /work/SRC/openSUSE:Factory/.ghc-shakespeare.new/ghc-shakespeare.changes 
2016-07-27 16:09:32.0 +0200
@@ -1,0 +2,5 @@
+Sun Jul 10 17:29:56 UTC 2016 - psim...@suse.com
+
+- Update to version 2.0.9 revision 0 with cabal2obs.
+
+---



Other differences:
--
++ ghc-shakespeare.spec ++
--- /var/tmp/diff_new_pack.8ldfjA/_old  2016-07-27 16:09:32.0 +0200
+++ /var/tmp/diff_new_pack.8ldfjA/_new  2016-07-27 16:09:32.0 +0200
@@ -1,7 +1,7 @@
 #
 # spec file for package ghc-shakespeare
 #
-# Copyright (c) 2015 SUSE LINUX GmbH, Nuernberg, Germany.
+# Copyright (c) 2016 SUSE LINUX GmbH, Nuernberg, Germany.
 #
 # All modifications and additions to the file contributed by third parties
 # remain the property of their copyright owners, unless otherwise agreed
@@ -15,23 +15,18 @@
 # Please submit bugfixes or comments via http://bugs.opensuse.org/
 #
 
-%global pkg_name shakespeare
 
+%global pkg_name shakespeare
 %bcond_with tests
-
-Name:   ghc-shakespeare
+Name:   ghc-%{pkg_name}
 Version:2.0.9
 Release:0
 Summary:A toolkit for making compile-time interpolated templates
-Group:  System/Libraries
-
 License:MIT
+Group:  System/Libraries
 Url:https://hackage.haskell.org/package/%{pkg_name}
 Source0:
https://hackage.haskell.org/package/%{pkg_name}-%{version}/%{pkg_name}-%{version}.tar.gz
-BuildRoot:  %{_tmppath}/%{name}-%{version}-build
-
 BuildRequires:  ghc-Cabal-devel
-BuildRequires:  ghc-rpm-macros
 # Begin cabal-rpm deps:
 BuildRequires:  ghc-aeson-devel
 BuildRequires:  ghc-blaze-html-devel
@@ -42,10 +37,15 @@
 BuildRequires:  ghc-exceptions-devel
 BuildRequires:  ghc-parsec-devel
 BuildRequires:  ghc-process-devel
+BuildRequires:  ghc-rpm-macros
+BuildRequires:  ghc-scientific-devel
 BuildRequires:  ghc-template-haskell-devel
 BuildRequires:  ghc-text-devel
 BuildRequires:  ghc-time-devel
 BuildRequires:  ghc-transformers-devel
+BuildRequires:  ghc-unordered-containers-devel
+BuildRequires:  ghc-vector-devel
+BuildRoot:  %{_tmppath}/%{name}-%{version}-build
 %if %{with tests}
 BuildRequires:  ghc-HUnit-devel
 BuildRequires:  ghc-hspec-devel
@@ -64,25 +64,22 @@
 Note there is no dependency on haskell-src-extras. Instead Shakespeare believes
 logic should stay out of templates and has its own minimal Haskell parser.
 
-Packages that use this: shakespeare-js, shakespeare-css, shakespeare-text,
-hamlet, and xml-hamlet
+Packages that use this: xml-hamlet
 
 Please see the documentation at
  for more details.
 
-
 %package devel
 Summary:Haskell %{pkg_name} library development files
 Group:  Development/Libraries/Other
+Requires:   %{name} = %{version}-%{release}
 Requires:   ghc-compiler = %{ghc_version}
 Requires(post): ghc-compiler = %{ghc_version}
 Requires(postun): ghc-compiler = %{ghc_version}
-Requires:   %{name} = %{version}-%{release}
 
 %description devel
 This package provides the Haskell %{pkg_name} library development files.
 
-
 %prep
 %setup -q -n %{pkg_name}-%{version}
 
@@ -97,25 +94,22 @@
 
 %check
 %if %{with tests}
-%cabal test
+%{cabal} test
 %endif
 
 
 %post devel
 %ghc_pkg_recache
 
-
 %postun devel
 %ghc_pkg_recache
 
-
 %files -f %{name}.files
 %defattr(-,root,root,-)
 %doc LICENSE
 
-
 %files devel -f %{name}-devel.files
 %defattr(-,root,root,-)
-
+%doc ChangeLog.md
 
 %changelog




commit ghc-shakespeare for openSUSE:Factory

2016-07-01 Thread h_root
Hello community,

here is the log from the commit of package ghc-shakespeare for openSUSE:Factory 
checked in at 2016-07-01 09:58:45

Comparing /work/SRC/openSUSE:Factory/ghc-shakespeare (Old)
 and  /work/SRC/openSUSE:Factory/.ghc-shakespeare.new (New)


Package is "ghc-shakespeare"

Changes:

--- /work/SRC/openSUSE:Factory/ghc-shakespeare/ghc-shakespeare.changes  
2016-04-30 23:30:32.0 +0200
+++ /work/SRC/openSUSE:Factory/.ghc-shakespeare.new/ghc-shakespeare.changes 
2016-07-01 09:58:47.0 +0200
@@ -1,0 +2,6 @@
+Tue Jun 21 04:54:08 UTC 2016 - mimi...@gmail.com
+
+- update to 2.0.9
+* Better empty HTML tag list
+
+---

Old:

  shakespeare-2.0.8.2.tar.gz

New:

  shakespeare-2.0.9.tar.gz



Other differences:
--
++ ghc-shakespeare.spec ++
--- /var/tmp/diff_new_pack.JYWe55/_old  2016-07-01 09:58:48.0 +0200
+++ /var/tmp/diff_new_pack.JYWe55/_new  2016-07-01 09:58:48.0 +0200
@@ -20,7 +20,7 @@
 %bcond_with tests
 
 Name:   ghc-shakespeare
-Version:2.0.8.2
+Version:2.0.9
 Release:0
 Summary:A toolkit for making compile-time interpolated templates
 Group:  System/Libraries

++ shakespeare-2.0.8.2.tar.gz -> shakespeare-2.0.9.tar.gz ++
diff -urN '--exclude=CVS' '--exclude=.cvsignore' '--exclude=.svn' 
'--exclude=.svnignore' old/shakespeare-2.0.8.2/ChangeLog.md 
new/shakespeare-2.0.9/ChangeLog.md
--- old/shakespeare-2.0.8.2/ChangeLog.md2016-04-15 11:13:07.0 
+0200
+++ new/shakespeare-2.0.9/ChangeLog.md  2016-06-20 19:02:14.0 +0200
@@ -1,3 +1,7 @@
+### 2.0.9
+
+* Better empty HTML tag list
+
 ### 2.0.8.1
 
 * Make it work with ghc-8.0 
[#181](https://github.com/yesodweb/shakespeare/pull/181)
diff -urN '--exclude=CVS' '--exclude=.cvsignore' '--exclude=.svn' 
'--exclude=.svnignore' old/shakespeare-2.0.8.2/Text/Hamlet/Parse.hs 
new/shakespeare-2.0.9/Text/Hamlet/Parse.hs
--- old/shakespeare-2.0.8.2/Text/Hamlet/Parse.hs2016-03-27 
12:59:30.0 +0200
+++ new/shakespeare-2.0.9/Text/Hamlet/Parse.hs  2016-06-20 19:02:14.0 
+0200
@@ -630,21 +630,28 @@
 lift (HamletSettings a b c d) = [|HamletSettings $(lift a) $(lift b) 
$(lift c) $(lift d)|]
 
 
+-- See the html specification for a list of all void elements:
+-- https://www.w3.org/TR/html/syntax.html#void-elements
 htmlEmptyTags :: Set String
 htmlEmptyTags = Set.fromAscList
 [ "area"
 , "base"
-, "basefont"
+, "basefont" -- not html 5
 , "br"
 , "col"
-, "frame"
+, "embed"
+, "frame"-- not html 5
 , "hr"
 , "img"
 , "input"
-, "isindex"
+, "isindex"  -- not html 5
+, "keygen"
 , "link"
 , "meta"
 , "param"
+, "source"
+, "track"
+, "wbr"
 ]
 
 -- | Defaults settings: HTML5 doctype and HTML-style empty tags.
diff -urN '--exclude=CVS' '--exclude=.cvsignore' '--exclude=.svn' 
'--exclude=.svnignore' old/shakespeare-2.0.8.2/shakespeare.cabal 
new/shakespeare-2.0.9/shakespeare.cabal
--- old/shakespeare-2.0.8.2/shakespeare.cabal   2016-04-24 15:29:42.0 
+0200
+++ new/shakespeare-2.0.9/shakespeare.cabal 2016-06-20 19:02:14.0 
+0200
@@ -1,5 +1,5 @@
 name:shakespeare
-version: 2.0.8.2
+version: 2.0.9
 license: MIT
 license-file:LICENSE
 author:  Michael Snoyman 
@@ -147,4 +147,4 @@
 
 source-repository head
   type: git
-  location: git://github.com/yesodweb/shakespeare.git
+  location: https://github.com/yesodweb/shakespeare.git




commit ghc-shakespeare for openSUSE:Factory

2016-04-30 Thread h_root
Hello community,

here is the log from the commit of package ghc-shakespeare for openSUSE:Factory 
checked in at 2016-04-30 23:30:31

Comparing /work/SRC/openSUSE:Factory/ghc-shakespeare (Old)
 and  /work/SRC/openSUSE:Factory/.ghc-shakespeare.new (New)


Package is "ghc-shakespeare"

Changes:

--- /work/SRC/openSUSE:Factory/ghc-shakespeare/ghc-shakespeare.changes  
2016-04-22 16:25:29.0 +0200
+++ /work/SRC/openSUSE:Factory/.ghc-shakespeare.new/ghc-shakespeare.changes 
2016-04-30 23:30:32.0 +0200
@@ -1,0 +2,5 @@
+Tue Apr 26 08:46:49 UTC 2016 - mimi...@gmail.com
+
+- update to 2.0.8.2 
+
+---

Old:

  shakespeare-2.0.8.1.tar.gz

New:

  shakespeare-2.0.8.2.tar.gz



Other differences:
--
++ ghc-shakespeare.spec ++
--- /var/tmp/diff_new_pack.gU27AD/_old  2016-04-30 23:30:33.0 +0200
+++ /var/tmp/diff_new_pack.gU27AD/_new  2016-04-30 23:30:33.0 +0200
@@ -20,7 +20,7 @@
 %bcond_with tests
 
 Name:   ghc-shakespeare
-Version:2.0.8.1
+Version:2.0.8.2
 Release:0
 Summary:A toolkit for making compile-time interpolated templates
 Group:  System/Libraries

++ shakespeare-2.0.8.1.tar.gz -> shakespeare-2.0.8.2.tar.gz ++
diff -urN '--exclude=CVS' '--exclude=.cvsignore' '--exclude=.svn' 
'--exclude=.svnignore' old/shakespeare-2.0.8.1/Text/MkSizeType.hs 
new/shakespeare-2.0.8.2/Text/MkSizeType.hs
--- old/shakespeare-2.0.8.1/Text/MkSizeType.hs  2016-04-15 11:13:43.0 
+0200
+++ new/shakespeare-2.0.8.2/Text/MkSizeType.hs  2016-04-24 15:29:13.0 
+0200
@@ -31,7 +31,7 @@
 derives = map mkName ["Eq", "Ord"]
 
 showInstanceDec :: Name -> String -> Dec
-showInstanceDec name unit' = InstanceD [] (instanceType "Show" name) [showDec]
+showInstanceDec name unit' = instanceD [] (instanceType "Show" name) [showDec]
   where showSize = VarE $ mkName "showSize"
 x = mkName "x"
 unit = LitE $ StringL unit'
@@ -40,17 +40,17 @@
 showBody = NormalB $ AppE (AppE showSize $ VarE x) unit
 
 numInstanceDec :: Name -> Dec
-numInstanceDec name = InstanceD [] (instanceType "Num" name) decs
+numInstanceDec name = instanceD [] (instanceType "Num" name) decs
   where decs = map (binaryFunDec name) ["+", "*", "-"] ++
map (unariFunDec1 name) ["abs", "signum"] ++
[unariFunDec2 name "fromInteger"]
 
 fractionalInstanceDec :: Name -> Dec
-fractionalInstanceDec name = InstanceD [] (instanceType "Fractional" name) decs
+fractionalInstanceDec name = instanceD [] (instanceType "Fractional" name) decs
   where decs = [binaryFunDec name "/", unariFunDec2 name "fromRational"]
 
 toCssInstanceDec :: Name -> Dec
-toCssInstanceDec name = InstanceD [] (instanceType "ToCss" name) [toCssDec]
+toCssInstanceDec name = instanceD [] (instanceType "ToCss" name) [toCssDec]
   where toCssDec = FunD (mkName "toCss") [Clause [] showBody []]
 showBody = NormalB $ (AppE dot from) `AppE` ((AppE dot pack) `AppE` 
show')
 from = VarE 'fromLazyText
@@ -92,3 +92,10 @@
 notStrict :: Strict
 notStrict = NotStrict
 #endif
+
+instanceD :: Cxt -> Type -> [Dec] -> Dec
+#if MIN_VERSION_template_haskell(2,11,0)
+instanceD = InstanceD Nothing
+#else
+instanceD = InstanceD
+#endif
diff -urN '--exclude=CVS' '--exclude=.cvsignore' '--exclude=.svn' 
'--exclude=.svnignore' old/shakespeare-2.0.8.1/Text/Shakespeare/I18N.hs 
new/shakespeare-2.0.8.2/Text/Shakespeare/I18N.hs
--- old/shakespeare-2.0.8.1/Text/Shakespeare/I18N.hs2016-04-15 
11:13:43.0 +0200
+++ new/shakespeare-2.0.8.2/Text/Shakespeare/I18N.hs2016-04-24 
15:29:13.0 +0200
@@ -177,7 +177,7 @@
 #endif
 (map (toCon dt) sdef) []) :)
else id)
-[ InstanceD
+[ instanceD
 []
 (ConT ''RenderMessage `AppT` (ConT $ mkName master) `AppT` ConT 
mname)
 [ FunD (mkName "renderMessage") $ c1 ++ c2 ++ [c3]
@@ -414,3 +414,10 @@
 notStrict :: Strict
 notStrict = NotStrict
 #endif
+
+instanceD :: Cxt -> Type -> [Dec] -> Dec
+#if MIN_VERSION_template_haskell(2,11,0)
+instanceD = InstanceD Nothing
+#else
+instanceD = InstanceD
+#endif
diff -urN '--exclude=CVS' '--exclude=.cvsignore' '--exclude=.svn' 
'--exclude=.svnignore' old/shakespeare-2.0.8.1/shakespeare.cabal 
new/shakespeare-2.0.8.2/shakespeare.cabal
--- old/shakespeare-2.0.8.1/shakespeare.cabal   2016-04-15 11:13:43.0 
+0200
+++ new/shakespeare-2.0.8.2/shakespeare.cabal   2016-04-24 15:29:42.0 
+0200
@@ -1,5 +1,5 @@
 name:shakespeare
-version: 2.0.8.1
+version: 2.0.8.2
 license: MIT
 license-file:LICENSE
 author:  Michael Snoyman 

commit ghc-shakespeare for openSUSE:Factory

2016-04-22 Thread h_root
Hello community,

here is the log from the commit of package ghc-shakespeare for openSUSE:Factory 
checked in at 2016-04-22 16:25:13

Comparing /work/SRC/openSUSE:Factory/ghc-shakespeare (Old)
 and  /work/SRC/openSUSE:Factory/.ghc-shakespeare.new (New)


Package is "ghc-shakespeare"

Changes:

--- /work/SRC/openSUSE:Factory/ghc-shakespeare/ghc-shakespeare.changes  
2016-03-31 13:02:43.0 +0200
+++ /work/SRC/openSUSE:Factory/.ghc-shakespeare.new/ghc-shakespeare.changes 
2016-04-22 16:25:29.0 +0200
@@ -1,0 +2,6 @@
+Sat Apr 16 07:38:54 UTC 2016 - mimi...@gmail.com
+
+- update to 2.0.8.1 
+* Make it work with GHC-8.0
+
+---

Old:

  shakespeare-2.0.8.tar.gz

New:

  shakespeare-2.0.8.1.tar.gz



Other differences:
--
++ ghc-shakespeare.spec ++
--- /var/tmp/diff_new_pack.YR4GEK/_old  2016-04-22 16:25:29.0 +0200
+++ /var/tmp/diff_new_pack.YR4GEK/_new  2016-04-22 16:25:29.0 +0200
@@ -20,7 +20,7 @@
 %bcond_with tests
 
 Name:   ghc-shakespeare
-Version:2.0.8
+Version:2.0.8.1
 Release:0
 Summary:A toolkit for making compile-time interpolated templates
 Group:  System/Libraries

++ shakespeare-2.0.8.tar.gz -> shakespeare-2.0.8.1.tar.gz ++
diff -urN '--exclude=CVS' '--exclude=.cvsignore' '--exclude=.svn' 
'--exclude=.svnignore' old/shakespeare-2.0.8/ChangeLog.md 
new/shakespeare-2.0.8.1/ChangeLog.md
--- old/shakespeare-2.0.8/ChangeLog.md  2016-03-27 13:00:15.0 +0200
+++ new/shakespeare-2.0.8.1/ChangeLog.md2016-04-15 11:13:43.0 
+0200
@@ -1,3 +1,7 @@
+### 2.0.8.1
+
+* Make it work with ghc-8.0 
[#181](https://github.com/yesodweb/shakespeare/pull/181)
+
 ### 2.0.8
 
 * Improve docs in Text.Hamlet 
[#180](https://github.com/yesodweb/shakespeare/pull/180)
diff -urN '--exclude=CVS' '--exclude=.cvsignore' '--exclude=.svn' 
'--exclude=.svnignore' old/shakespeare-2.0.8/Text/Hamlet.hs 
new/shakespeare-2.0.8.1/Text/Hamlet.hs
--- old/shakespeare-2.0.8/Text/Hamlet.hs2016-03-27 13:00:15.0 
+0200
+++ new/shakespeare-2.0.8.1/Text/Hamlet.hs  2016-04-15 11:13:43.0 
+0200
@@ -181,8 +181,13 @@
   -- use 'lookupValueName' instead of just using 'mkName' so we reify the
   -- data constructor and not the type constructor if their names match.
   Just conName<- lookupValueName $ conToStr conStr
+#if MIN_VERSION_template_haskell(2,11,0)
+  DataConI _ _ typeName <- reify conName
+  TyConI (DataD _ _ _ _ cons _) <- reify typeName
+#else
   DataConI _ _ typeName _ <- reify conName
   TyConI (DataD _ _ _ cons _) <- reify typeName
+#endif
   [fields] <- return [fields | RecC name fields <- cons, name == conName]
   return [fieldName | (fieldName, _, _) <- fields]
 
diff -urN '--exclude=CVS' '--exclude=.cvsignore' '--exclude=.svn' 
'--exclude=.svnignore' old/shakespeare-2.0.8/Text/MkSizeType.hs 
new/shakespeare-2.0.8.1/Text/MkSizeType.hs
--- old/shakespeare-2.0.8/Text/MkSizeType.hs2016-03-27 13:00:15.0 
+0200
+++ new/shakespeare-2.0.8.1/Text/MkSizeType.hs  2016-04-15 11:13:43.0 
+0200
@@ -1,21 +1,33 @@
+{-# LANGUAGE CPP #-}
+
 -- | Internal functions to generate CSS size wrapper types.
 module Text.MkSizeType (mkSizeType) where
 
+#if MIN_VERSION_template_haskell(2,11,0)
+import Language.Haskell.TH (conT)
+#endif
 import Language.Haskell.TH.Syntax
 import Data.Text.Lazy.Builder (fromLazyText)
 import qualified Data.Text.Lazy as TL
 
 mkSizeType :: String -> String -> Q [Dec]
-mkSizeType name' unit = return [ dataDec name
-   , showInstanceDec name unit
-   , numInstanceDec name
-   , fractionalInstanceDec name
-   , toCssInstanceDec name ]
+mkSizeType name' unit = do
+ddn <- dataDec name
+return  [ ddn
+, showInstanceDec name unit
+, numInstanceDec name
+, fractionalInstanceDec name
+, toCssInstanceDec name ]
   where name = mkName $ name'
 
-dataDec :: Name -> Dec
-dataDec name = DataD [] name [] [constructor] derives
-  where constructor = NormalC name [(NotStrict, ConT $ mkName "Rational")]
+dataDec :: Name -> Q Dec
+dataDec name =
+#if MIN_VERSION_template_haskell(2,11,0)
+ DataD [] name [] Nothing [constructor] <$> mapM conT derives
+#else
+return $ DataD [] name [] [constructor] derives
+#endif
+  where constructor = NormalC name [(notStrict, ConT $ mkName "Rational")]
 derives = map mkName ["Eq", "Ord"]
 
 showInstanceDec :: Name -> String -> Dec
@@ -72,3 +84,11 @@
 body = NormalB $ AppE (ConE name) (AppE (VarE fun) (VarE x))
 fun = 

commit ghc-shakespeare for openSUSE:Factory

2016-03-31 Thread h_root
Hello community,

here is the log from the commit of package ghc-shakespeare for openSUSE:Factory 
checked in at 2016-03-31 13:02:41

Comparing /work/SRC/openSUSE:Factory/ghc-shakespeare (Old)
 and  /work/SRC/openSUSE:Factory/.ghc-shakespeare.new (New)


Package is "ghc-shakespeare"

Changes:

--- /work/SRC/openSUSE:Factory/ghc-shakespeare/ghc-shakespeare.changes  
2015-11-26 17:00:52.0 +0100
+++ /work/SRC/openSUSE:Factory/.ghc-shakespeare.new/ghc-shakespeare.changes 
2016-03-31 13:02:43.0 +0200
@@ -1,0 +2,6 @@
+Tue Mar 29 07:37:55 UTC 2016 - mimi...@gmail.com
+
+- update to 2.0.8
+* Improve docs in Text.Hamlet 
+
+---

Old:

  shakespeare-2.0.7.tar.gz

New:

  shakespeare-2.0.8.tar.gz



Other differences:
--
++ ghc-shakespeare.spec ++
--- /var/tmp/diff_new_pack.7FRZWj/_old  2016-03-31 13:02:45.0 +0200
+++ /var/tmp/diff_new_pack.7FRZWj/_new  2016-03-31 13:02:45.0 +0200
@@ -20,7 +20,7 @@
 %bcond_with tests
 
 Name:   ghc-shakespeare
-Version:2.0.7
+Version:2.0.8
 Release:0
 Summary:A toolkit for making compile-time interpolated templates
 Group:  System/Libraries

++ shakespeare-2.0.7.tar.gz -> shakespeare-2.0.8.tar.gz ++
diff -urN '--exclude=CVS' '--exclude=.cvsignore' '--exclude=.svn' 
'--exclude=.svnignore' old/shakespeare-2.0.7/ChangeLog.md 
new/shakespeare-2.0.8/ChangeLog.md
--- old/shakespeare-2.0.7/ChangeLog.md  2015-10-18 07:20:07.0 +0200
+++ new/shakespeare-2.0.8/ChangeLog.md  2016-03-27 13:00:15.0 +0200
@@ -1,3 +1,7 @@
+### 2.0.8
+
+* Improve docs in Text.Hamlet 
[#180](https://github.com/yesodweb/shakespeare/pull/180)
+
 ### 2.0.7
 
 * Include aeson's JSON encoding and escape `<`, `>` and `&` to avoid XSS 
attacks
diff -urN '--exclude=CVS' '--exclude=.cvsignore' '--exclude=.svn' 
'--exclude=.svnignore' old/shakespeare-2.0.7/Text/Hamlet.hs 
new/shakespeare-2.0.8/Text/Hamlet.hs
--- old/shakespeare-2.0.7/Text/Hamlet.hs2015-10-18 07:20:07.0 
+0200
+++ new/shakespeare-2.0.8/Text/Hamlet.hs2016-03-27 13:00:15.0 
+0200
@@ -12,16 +12,18 @@
 , xshamletFile
   -- * Hamlet
 , HtmlUrl
+, Render
 , hamlet
 , hamletFile
 , hamletFileReload
-, ihamletFileReload
 , xhamlet
 , xhamletFile
   -- * I18N Hamlet
 , HtmlUrlI18n
+, Translate
 , ihamlet
 , ihamletFile
+, ihamletFileReload
   -- * Type classes
 , ToAttributes (..)
   -- * Internal, for making more
@@ -275,9 +277,18 @@
 html <- [|attrsToHtml . toAttributes|]
 return $ hrFromHtml hr `AppE` (html `AppE` derefToExp scope d)
 
+-- | "Simple Hamlet" quasi-quoter. May only be used to generate expressions.
+--
+-- Generated expressions have type 'Html'.
+--
+-- @
+-- >>> 'putStrLn' ('Text.Blaze.Html.Renderer.renderHtml' 
['shamlet'|\Hello, world!|])
+-- \Hello, world!\
+-- @
 shamlet :: QuasiQuoter
 shamlet = hamletWithSettings htmlRules defaultHamletSettings
 
+-- | Like 'shamlet', but produces XHTML.
 xshamlet :: QuasiQuoter
 xshamlet = hamletWithSettings htmlRules xhtmlHamletSettings
 
@@ -286,9 +297,23 @@
 i <- [|id|]
 return $ HamletRules i ($ (Env Nothing Nothing)) (\_ b -> return b)
 
+-- | Hamlet quasi-quoter. May only be used to generate expressions.
+--
+-- Generated expression have type @'HtmlUrl' url@, for some @url@.
+--
+-- @
+-- data MyRoute = Home
+--
+-- render :: 'Render' MyRoute
+-- render Home _ = \"/home\"
+--
+-- >>> 'putStrLn' ('Text.Blaze.Html.Renderer.String.renderHtml' (['hamlet'|\Home|] render))
+-- \Home\<\/a\>
+-- @
 hamlet :: QuasiQuoter
 hamlet = hamletWithSettings hamletRules defaultHamletSettings
 
+-- | Like 'hamlet', but produces XHTML.
 xhamlet :: QuasiQuoter
 xhamlet = hamletWithSettings hamletRules xhtmlHamletSettings
 
@@ -313,6 +338,27 @@
 urender $ \ur' -> return ((asHtmlUrl' `AppE` e) `AppE` ur')
 em _ _ = error "bad Env"
 
+-- | Hamlet quasi-quoter with internationalization. May only be used to 
generate
+-- expressions.
+--
+-- Generated expressions have type @'HtmlUrlI18n' msg url@, for some @msg@ and
+-- @url@.
+--
+-- @
+-- data MyMsg = Hi | Bye
+--
+-- data MyRoute = Home
+--
+-- renderEnglish :: 'Translate' MyMsg
+-- renderEnglish Hi  = \"hi\"
+-- renderEnglish Bye = \"bye\"
+--
+-- renderUrl :: 'Render' MyRoute
+-- renderUrl Home _ = \"/home\"
+--
+-- >>> 'putStrLn' ('Text.Blaze.Html.Renderer.renderHtml' (['ihamlet'|@{Home} 
_{Hi} _{Bye}|] renderEnglish renderUrl))
+-- \/home hi bye \
+-- @
 ihamlet :: QuasiQuoter
 ihamlet = hamletWithSettings ihamletRules defaultHamletSettings
 
@@ -370,26 +416,47 @@
 contents <- fmap