[Haddock] [haddock] #213: Haddock fails when advanced typesystem features are used

haddock haddock at projects.haskell.org
Sat Sep 22 18:51:34 BST 2012


#213: Haddock fails when advanced typesystem features are used
------------------------+---------------------------------------------------
Reporter:  SimonHengel  |       Owner:     
    Type:  defect       |      Status:  new
Priority:  blocker      |   Milestone:     
 Version:               |    Keywords:     
------------------------+---------------------------------------------------
 Here is an example:
 {{{
 {-# LANGUAGE DataKinds #-}
 {-# LANGUAGE GADTs #-}
 {-# LANGUAGE KindSignatures #-}
 {-# LANGUAGE TypeOperators #-}
 module Foo where

 data Pattern :: [*] -> * where
   Nil :: Pattern '[]
   Cons :: Maybe h -> Pattern t -> Pattern (h ': t)
 }}}

 This fails with:

 {{{
 haddock: internal error: renameType
 }}}

 Tested with Haddock 2.11.0 / GHC 7.4.2.

-- 
Ticket URL: <http://trac.haskell.org/haddock/ticket/213>
haddock <http://www.haskell.org/haddock>
Haddock, The Haskell Documentation Tool


More information about the Haddock mailing list