[commit: testsuite] master: Remove CatPairs test. (286314f)
Austin Seipp
mad.one at gmail.com
Thu May 30 16:18:58 CEST 2013
Repository : ssh://darcs.haskell.org//srv/darcs/testsuite
On branch : master
https://github.com/ghc/testsuite/commit/286314f4326e31c3763883d39fa1851759e1ca8b
>---------------------------------------------------------------
commit 286314f4326e31c3763883d39fa1851759e1ca8b
Author: Austin Seipp <aseipp at pobox.com>
Date: Thu May 30 09:18:31 2013 -0500
Remove CatPairs test.
It's causing a failure. It should probably go in the tests for base
anyway.
Signed-off-by: Austin Seipp <aseipp at pobox.com>
>---------------------------------------------------------------
tests/polykinds/CatPairs.hs | 30 ------------------------------
tests/polykinds/all.T | 1 -
2 files changed, 0 insertions(+), 31 deletions(-)
diff --git a/tests/polykinds/CatPairs.hs b/tests/polykinds/CatPairs.hs
deleted file mode 100644
index 8ab709e..0000000
--- a/tests/polykinds/CatPairs.hs
+++ /dev/null
@@ -1,30 +0,0 @@
-{-# LANGUAGE PolyKinds, TypeFamilies, DataKinds #-}
-module CatPairs where
-import Control.Monad
-import Control.Category
-
--- Take from Twan van Laarhoven
--- http://twanvl.nl/blog/haskell/categories-over-pairs-of-types
-
-data Pipe i o u m r = Pipe { runPipe :: Either i u -> m (Either o r) }
-
-(>+>) :: Monad m
- => Pipe io1 io2 ur1 m ur2
- -> Pipe io2 io3 ur2 m ur3
- -> Pipe io1 io3 ur1 m ur3
-(>+>) (Pipe f) (Pipe g) = Pipe (f >=> g)
-
-idP :: Monad m => Pipe i i r m r
-idP = Pipe return
-
-type family Fst (xy :: (*,*)) :: *
-type family Snd (xy :: (*,*)) :: *
-type instance Fst '(x,y) = x
-type instance Snd '(x,y) = y
-
-newtype WrapPipe m iu or = WrapPipe
- { unWrapPipe :: Pipe (Fst iu) (Fst or) (Snd iu) m (Snd or) }
-
-instance Monad m => Category (WrapPipe m) where
- id = WrapPipe idP
- x . y = WrapPipe (unWrapPipe y >+> unWrapPipe x)
diff --git a/tests/polykinds/all.T b/tests/polykinds/all.T
index 718819f..00007b1 100644
--- a/tests/polykinds/all.T
+++ b/tests/polykinds/all.T
@@ -17,7 +17,6 @@ test('PolyKinds07', normal, compile_fail, [''])
test('PolyKinds12', normal, compile, [''])
-test('CatPairs', normal, compile, [''])
test('Freeman', normal, compile_and_run, [''])
test('MonoidsTF', normal, compile_and_run, [''])
test('MonoidsFD', normal, compile_and_run, [''])
More information about the ghc-commits
mailing list