[GHC] #1702: type operator precedences don't work in contexts
GHC
cvs-ghc at haskell.org
Sat Jan 19 11:09:05 CET 2013
#1702: type operator precedences don't work in contexts
------------------------------------+---------------------------------------
Reporter: b.hilken@… | Owner:
Type: bug | Status: closed
Priority: lowest | Milestone: 7.6.2
Component: Compiler | Version: 6.8
Resolution: fixed | Keywords:
Os: Unknown/Multiple | Architecture: Unknown/Multiple
Failure: None/Unknown | Difficulty: Unknown
Testcase: | Blockedby:
Blocking: | Related:
------------------------------------+---------------------------------------
Changes (by monoidal):
* status: new => closed
* failure: => None/Unknown
* resolution: => fixed
Comment:
The code works fine in 7.6, with a minor change (type operators now do not
use colons). It might have been fixed when constraint kinds were added. I
opened #7609 to note a minor formatting error.
{{{
{-# LANGUAGE TypeOperators, MultiParamTypeClasses, FlexibleContexts #-}
data (=:) a b
data (+:) a b
class Disjoint a b
infixr 4 =:
infixl 3 +:
infix 2 `Disjoint`
labelZip :: (n =: a `Disjoint` m =: b)
=> n -> m -> [a] -> [b] -> [n =: a +: m =: b]
labelZip = undefined
}}}
--
Ticket URL: <http://hackage.haskell.org/trac/ghc/ticket/1702#comment:16>
GHC <http://www.haskell.org/ghc/>
The Glasgow Haskell Compiler
More information about the ghc-tickets
mailing list