#6027: Allow changing fixity of new type operators
------------------------------+---------------------------------------------
Reporter: atnnn | Owner:
Type: feature request | Status: new
Priority: normal | Component: Compiler
Version: 7.5 | Keywords:
Os: Unknown/Multiple | Architecture: Unknown/Multiple
Failure: None/Unknown | Testcase:
Blockedby: | Blocking:
Related: |
------------------------------+---------------------------------------------
Here is the problem:
{{{
{-# LANGUAGE TypeOperators #-}
type (&) = ()
data (?)
class (#)
infixr 2 &
infixr 2 ?
infixr 2 #
}}}
{{{
testop.hs:5:10:
The fixity signature for `&' lacks an accompanying binding
testop.hs:6:10:
The fixity signature for `?' lacks an accompanying binding
testop.hs:7:10:
The fixity signature for `#' lacks an accompanying binding
}}}
My solution is inspired by the 'type' keyword in the export list.
{{{
infixr 2 type &
infixr 2 type ?, type #
}}}
--
Ticket URL: <http://hackage.haskell.org/trac/ghc/ticket/6027>
GHC <http://www.haskell.org/ghc/>
The Glasgow Haskell Compiler
_______________________________________________
Glasgow-haskell-bugs mailing list
[email protected]
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs