slightly modified hasktags version / Who can commit it?

Marc Weber marco-oweber at gmx.de
Tue Feb 12 12:38:05 EST 2008


I've hacked on hasktags again
	http://mawercer.de/hasktags.hs
I'd like to merge changes into the ghc distribution or ask someone to do
so.

changes:
  a)  full qualified module names are added as well now
  b)  hack: removed empty tokens so that getcons finds
            [..]   rqBody    :: RqBody, [..]
  c)  ctag files are sorted now 

testcase :
=============  =======================================================
-- module name should be found 
module A.B.testcase where

-- Request, Request2
-- rqMethod, rqBody, rqPeer should be found as well 
data Request = Request2 { rqMethod::Method,
                         rqBody    :: RqBody,
                         rqPeer    :: Host
                       } deriving(Show,Read,Typeable)
=============  =======================================================

hasktags distributed with ghc (6.8.2):
  Request testcase.hs     6
  Request2        testcase.hs     6
  rqMethod        testcase.hs     6
          testcase.hs     7            <<< name is missing
          testcase.hs     8            <<< name is missing

my modified version:
  A.B.testcase    testcase.hs     2    <<< module name added
  Request2        testcase.hs     6
  Request testcase.hs     6
  rqMethod        testcase.hs     6
  rqBody  testcase.hs     7
  rqPeer  testcase.hs     8


More information about the Glasgow-haskell-users mailing list