summaryrefslogtreecommitdiff
diff options
context:
space:
mode:
authorBen Gamari <ben@smart-cactus.org>2019-10-31 18:38:40 -0400
committerMarge Bot <ben+marge-bot@smart-cactus.org>2019-11-01 15:50:29 -0400
commitcabafe34156acb80cd9a918363b2a342fb0c8e66 (patch)
tree36872f95a274b95ba68a389007f4326bb2e9c53b
parenta4ce26e0dbbd736b4106c3d30979ae0058922a06 (diff)
downloadhaskell-cabafe34156acb80cd9a918363b2a342fb0c8e66.tar.gz
testsuite: Add test for #17423
-rw-r--r--testsuite/tests/gadt/T17423.hs37
-rw-r--r--testsuite/tests/gadt/all.T1
2 files changed, 38 insertions, 0 deletions
diff --git a/testsuite/tests/gadt/T17423.hs b/testsuite/tests/gadt/T17423.hs
new file mode 100644
index 0000000000..35023f0612
--- /dev/null
+++ b/testsuite/tests/gadt/T17423.hs
@@ -0,0 +1,37 @@
+{-# LANGUAGE Arrows, GADTs #-}
+
+module Main where
+
+import Control.Arrow
+import Control.Category
+import Prelude hiding (id, (.))
+
+data DecoType a where
+ -- | Icons and colours for @False@ and @True@ respectively.
+ DecoBool :: Maybe (String, String) -> Maybe (Int, Int) -> DecoType Bool
+ -- | Icons and colours for ranges within type @a@.
+ DecoRange :: String -> DecoType a
+
+-- Sub-dialog for designing decorated booleans.
+decoBoolDialog :: Gadget (DecoType Bool) (DecoType Bool)
+decoBoolDialog =
+ -- arr (\(DecoBool i c) -> (i, c)) >>> (icons *** colours) >>> arr (uncurry DecoBool)
+ proc (DecoBool i c) -> do -- Compiler panic in GHC 8.6.5.
+ i1 <- id -< i
+ c1 <- id -< c
+ returnA -< DecoBool i1 c1
+
+
+
+data Gadget b c = Pure (b -> c)
+
+instance Category Gadget where
+ id = Pure id
+ Pure g1 . Pure g2 = Pure $ g1 . g2
+
+instance Arrow Gadget where
+ arr = Pure
+ first (Pure f) = Pure $ \(b, b1) -> (f b, b1)
+
+
+main = putStrLn "Hello world."
diff --git a/testsuite/tests/gadt/all.T b/testsuite/tests/gadt/all.T
index bffb34ac00..be7177445e 100644
--- a/testsuite/tests/gadt/all.T
+++ b/testsuite/tests/gadt/all.T
@@ -120,3 +120,4 @@ test('T14808', normal, compile, [''])
test('T15009', normal, compile, [''])
test('T15558', normal, compile, [''])
test('T16427', normal, compile_fail, [''])
+test('T17423', expect_broken(17423), compile_and_run, [''])