Skip to content
Snippets Groups Projects
Commit 9f23dd9d authored by Ben Gamari's avatar Ben Gamari Committed by Ben Gamari
Browse files

testsuite: Add ClassOperator testcase

This is derived from Haddock's `Operators` `html-test`, which appears to
fail with GHC master yet compiles with 7.10.2

Reviewers: simonpj, austin

Subscribers: thomie

Differential Revision: https://phabricator.haskell.org/D1667

GHC Trac Issues: #11264
parent 6457903e
No related merge requests found
{-# LANGUAGE PatternSynonyms, TypeOperators, TypeFamilies, MultiParamTypeClasses, GADTs #-}
module ClassOperator where
-- | Class with fixity, including associated types
class a ><> b where
type a <>< b :: *
data a ><< b
(>><), (<<>) :: a -> b -> ()
-- | Multiple fixities
(**>), (**<), (>**), (<**) :: a -> a -> ()
infixr 1 ><>
infixl 2 <><
infixl 3 ><<
infixr 4 >><
infixl 5 <<>
infixr 8 **>, >**
infixl 8 **<, <**
......@@ -481,3 +481,4 @@ test('T10935', normal, compile, [''])
test('T10971a', normal, compile, [''])
test('T11237', normal, compile, [''])
test('T10592', normal, compile, [''])
test('ClassOperator', expect_broken(11264), compile, [''])
0% Loading or .
You are about to add 0 people to the discussion. Proceed with caution.
Finish editing this message first!
Please register or to comment