Skip to content

Commit

Permalink
Test #10321 in ghci/scripts/T10321
Browse files Browse the repository at this point in the history
  • Loading branch information
Richard Eisenberg committed Apr 24, 2015
1 parent 414e20b commit d4cf559
Show file tree
Hide file tree
Showing 3 changed files with 18 additions and 0 deletions.
14 changes: 14 additions & 0 deletions testsuite/tests/ghci/scripts/T10321.hs
Original file line number Diff line number Diff line change
@@ -0,0 +1,14 @@
{-# LANGUAGE DataKinds #-}
{-# LANGUAGE GADTs #-}
{-# LANGUAGE KindSignatures #-}
{-# LANGUAGE TypeOperators #-}

module T10321 where

import GHC.TypeLits

data Vec :: Nat -> * -> * where
Nil :: Vec 0 a
(:>) :: a -> Vec n a -> Vec (n + 1) a

infixr 5 :>
2 changes: 2 additions & 0 deletions testsuite/tests/ghci/scripts/T10321.script
Original file line number Diff line number Diff line change
@@ -0,0 +1,2 @@
:load T10321
:t 3 :> 4 :> 5 :> Nil
2 changes: 2 additions & 0 deletions testsuite/tests/ghci/scripts/all.T
Original file line number Diff line number Diff line change
Expand Up @@ -209,3 +209,5 @@ test('T9878b',
test('T10122', normal, ghci_script, ['T10122.script'])
test('T10322', when(opsys('darwin'), expect_broken(10322)),
ghci_script, ['T10322.script'])

test('T10321', expect_broken(10321), ghci_script, ['T10321.script'])

0 comments on commit d4cf559

Please sign in to comment.