Skip to content

Commit

Permalink
Switch to GHC2021
Browse files Browse the repository at this point in the history
  • Loading branch information
mrkkrp committed Jun 24, 2023
1 parent 8fcdadf commit ecb7505
Show file tree
Hide file tree
Showing 6 changed files with 9 additions and 11 deletions.
1 change: 0 additions & 1 deletion Text/URI/QQ.hs
Original file line number Diff line number Diff line change
@@ -1,5 +1,4 @@
{-# LANGUAGE RankNTypes #-}
{-# LANGUAGE TemplateHaskell #-}

-- |
-- Module : Text.URI.QQ
Expand Down
2 changes: 1 addition & 1 deletion bench/memory/Main.hs
Original file line number Diff line number Diff line change
Expand Up @@ -9,7 +9,7 @@ import Data.Text (Text)
import Data.Void
import Text.Megaparsec
import Text.URI (URI)
import qualified Text.URI as URI
import Text.URI qualified as URI
import Weigh

main :: IO ()
Expand Down
2 changes: 1 addition & 1 deletion bench/speed/Main.hs
Original file line number Diff line number Diff line change
Expand Up @@ -10,7 +10,7 @@ import Data.Text (Text)
import Data.Void
import Text.Megaparsec
import Text.URI (URI)
import qualified Text.URI as URI
import Text.URI qualified as URI

main :: IO ()
main =
Expand Down
6 changes: 3 additions & 3 deletions modern-uri.cabal
Original file line number Diff line number Diff line change
Expand Up @@ -76,7 +76,7 @@ test-suite tests
Text.QQSpec
Text.URISpec

default-language: Haskell2010
default-language: GHC2021
build-depends:
QuickCheck >=2.4 && <3.0,
base >=4.15 && <5.0,
Expand All @@ -97,7 +97,7 @@ benchmark bench-speed
type: exitcode-stdio-1.0
main-is: Main.hs
hs-source-dirs: bench/speed
default-language: Haskell2010
default-language: GHC2021
build-depends:
base >=4.15 && <5.0,
bytestring >=0.2 && <0.12,
Expand All @@ -116,7 +116,7 @@ benchmark bench-memory
type: exitcode-stdio-1.0
main-is: Main.hs
hs-source-dirs: bench/memory
default-language: Haskell2010
default-language: GHC2021
build-depends:
base >=4.15 && <5.0,
bytestring >=0.2 && <0.12,
Expand Down
3 changes: 1 addition & 2 deletions tests/Text/QQSpec.hs
Original file line number Diff line number Diff line change
@@ -1,14 +1,13 @@
{-# LANGUAGE LambdaCase #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE QuasiQuotes #-}
{-# LANGUAGE TemplateHaskell #-}
{-# LANGUAGE ViewPatterns #-}

module Text.QQSpec (spec) where

import Test.Hspec
import Text.URI
import qualified Text.URI.QQ as QQ
import Text.URI.QQ qualified as QQ

spec :: Spec
spec = do
Expand Down
6 changes: 3 additions & 3 deletions tests/Text/URISpec.hs
Original file line number Diff line number Diff line change
Expand Up @@ -6,18 +6,18 @@ module Text.URISpec (spec) where
import Control.Monad
import Data.ByteString (ByteString)
import Data.List.NonEmpty (NonEmpty (..))
import qualified Data.List.NonEmpty as NE
import Data.List.NonEmpty qualified as NE
import Data.Maybe (isJust, isNothing)
import Data.String (IsString (..))
import Data.Text (Text)
import qualified Data.Text as T
import Data.Text qualified as T
import Data.Void
import Test.Hspec
import Test.Hspec.Megaparsec
import Test.QuickCheck
import Text.Megaparsec
import Text.URI (RTextException (..), RTextLabel (..), URI (..))
import qualified Text.URI as URI
import Text.URI qualified as URI

instance Arbitrary Text where
arbitrary = T.pack <$> arbitrary
Expand Down

0 comments on commit ecb7505

Please sign in to comment.