[commit: ghc] master: Remove unused HscStats.lhs; fixes #7605 (858888e)

Ian Lynagh igloo at earth.li
Fri Jan 18 19:29:05 CET 2013


Repository : ssh://darcs.haskell.org//srv/darcs/ghc

On branch  : master

http://hackage.haskell.org/trac/ghc/changeset/858888ebffaf6140d1385acdd6c22fe955898ec2

>---------------------------------------------------------------

commit 858888ebffaf6140d1385acdd6c22fe955898ec2
Author: Ian Lynagh <ian at well-typed.com>
Date:   Fri Jan 18 17:16:05 2013 +0000

    Remove unused HscStats.lhs; fixes #7605

>---------------------------------------------------------------

 compiler/main/HscStats.lhs |  187 --------------------------------------------
 1 files changed, 0 insertions(+), 187 deletions(-)

diff --git a/compiler/main/HscStats.lhs b/compiler/main/HscStats.lhs
deleted file mode 100644
index 299f688..0000000
--- a/compiler/main/HscStats.lhs
+++ /dev/null
@@ -1,187 +0,0 @@
-%
-% (c) The GRASP/AQUA Project, Glasgow University, 1993-1998
-%
-\section[GHC_Stats]{Statistics for per-module compilations}
-
-\begin{code}
-{-# OPTIONS -fno-warn-tabs #-}
--- The above warning supression flag is a temporary kludge.
--- While working on this module you are encouraged to remove it and
--- detab the module (please do the detabbing in a separate patch). See
---     http://hackage.haskell.org/trac/ghc/wiki/Commentary/CodingStyle#TabsvsSpaces
--- for details
-
-module HscStats ( ppSourceStats ) where
-
-#include "HsVersions.h"
-
-import HsSyn
-import Outputable
-import SrcLoc
-import Bag
-import Util
-import RdrName
-
-import Data.Char
-\end{code}
-
-%************************************************************************
-%*									*
-\subsection{Statistics}
-%*									*
-%************************************************************************
-
-\begin{code}
-ppSourceStats :: Bool -> Located (HsModule RdrName) -> SDoc
-ppSourceStats short (L _ (HsModule _ exports imports ldecls _ _))
- = (if short then hcat else vcat)
-        (map pp_val
-	       [("ExportAll        ", export_all), -- 1 if no export list
-		("ExportDecls      ", export_ds),
-		("ExportModules    ", export_ms),
-		("Imports          ", imp_no),
-		("  ImpSafe        ", imp_safe),
-		("  ImpQual        ", imp_qual),
-		("  ImpAs          ", imp_as),
-		("  ImpAll         ", imp_all),
-		("  ImpPartial     ", imp_partial),
-		("  ImpHiding      ", imp_hiding),
-		("FixityDecls      ", fixity_sigs),
-		("DefaultDecls     ", default_ds),
-	      	("TypeDecls        ", type_ds),
-	      	("DataDecls        ", data_ds),
-	      	("NewTypeDecls     ", newt_ds),
-	      	("TypeFamilyDecls  ", type_fam_ds),
-	      	("DataConstrs      ", data_constrs),
-		("DataDerivings    ", data_derivs),
-	      	("ClassDecls       ", class_ds),
-	      	("ClassMethods     ", class_method_ds),
-	      	("DefaultMethods   ", default_method_ds),
-	      	("InstDecls        ", inst_ds),
-	      	("InstMethods      ", inst_method_ds),
-	      	("InstType         ", inst_type_ds),
-	      	("InstData         ", inst_data_ds),
-	      	("TypeSigs         ", bind_tys),
-	      	("GenericSigs      ", generic_sigs),
-	      	("ValBinds         ", val_bind_ds),
-	      	("FunBinds         ", fn_bind_ds),
-	      	("InlineMeths      ", method_inlines),
-		("InlineBinds      ", bind_inlines),
---	      	("SpecialisedData  ", data_specs),
---	      	("SpecialisedInsts ", inst_specs),
-	      	("SpecialisedMeths ", method_specs),
-	      	("SpecialisedBinds ", bind_specs)
-	       ])
-  where
-    decls = map unLoc ldecls
-
-    pp_val (_, 0) = empty
-    pp_val (str, n) 
-      | not short   = hcat [text str, int n]
-      | otherwise   = hcat [text (trim str), equals, int n, semi]
-    
-    trim ls     = takeWhile (not.isSpace) (dropWhile isSpace ls)
-
-    (fixity_sigs, bind_tys, bind_specs, bind_inlines, generic_sigs) 
-	= count_sigs [d | SigD d <- decls]
-		-- NB: this omits fixity decls on local bindings and
-		-- in class decls.  ToDo
-
-    tycl_decls  = [d | TyClD d <- decls]
-    (class_ds, type_ds, data_ds, newt_ds, type_fam_ds) = 
-      countTyClDecls tycl_decls
-
-    inst_decls  = [d | InstD d <- decls]
-    inst_ds     = length inst_decls
-    default_ds  = count (\ x -> case x of { DefD{} -> True; _ -> False}) decls
-    val_decls   = [d | ValD d <- decls]
-
-    real_exports = case exports of { Nothing -> []; Just es -> es }
-    n_exports  	 = length real_exports
-    export_ms  	 = count (\ e -> case unLoc e of { IEModuleContents{} -> True;_ -> False})
-                         real_exports
-    export_ds  	 = n_exports - export_ms
-    export_all 	 = case exports of { Nothing -> 1; _ -> 0 }
-
-    (val_bind_ds, fn_bind_ds)
-	= foldr add2 (0,0) (map count_bind val_decls)
-
-    (imp_no, imp_safe, imp_qual, imp_as, imp_all, imp_partial, imp_hiding)
-	= foldr add7 (0,0,0,0,0,0,0) (map import_info imports)
-    (data_constrs, data_derivs)
-	= foldr add2 (0,0) (map data_info tycl_decls)
-    (class_method_ds, default_method_ds)
-	= foldr add2 (0,0) (map class_info tycl_decls)
-    (inst_method_ds, method_specs, method_inlines, inst_type_ds, inst_data_ds)
-	= foldr add5 (0,0,0,0,0) (map inst_info inst_decls)
-
-    count_bind (PatBind { pat_lhs = L _ (VarPat _) }) = (1,0)
-    count_bind (PatBind {})                           = (0,1)
-    count_bind (FunBind {})                           = (0,1)
-    count_bind b = pprPanic "count_bind: Unhandled binder" (ppr b)
-
-    count_sigs sigs = foldr add5 (0,0,0,0,0) (map sig_info sigs)
-
-    sig_info (FixSig _)		= (1,0,0,0,0)
-    sig_info (TypeSig _ _)      = (0,1,0,0,0)
-    sig_info (SpecSig _ _ _)    = (0,0,1,0,0)
-    sig_info (InlineSig _ _)    = (0,0,0,1,0)
-    sig_info (GenericSig _ _)   = (0,0,0,0,1)
-    sig_info _                  = (0,0,0,0,0)
-
-    import_info (L _ (ImportDecl { ideclSafe = safe, ideclQualified = qual
-                                 , ideclAs = as, ideclHiding = spec }))
-	= add7 (1, safe_info safe, qual_info qual, as_info as, 0,0,0) (spec_info spec)
-    safe_info = qual_info
-    qual_info False  = 0
-    qual_info True   = 1
-    as_info Nothing  = 0
-    as_info (Just _) = 1
-    spec_info Nothing 	        = (0,0,0,0,1,0,0)
-    spec_info (Just (False, _)) = (0,0,0,0,0,1,0)
-    spec_info (Just (True, _))  = (0,0,0,0,0,0,1)
-
-    data_info (SynDecl { tcdTyDefn = TyData {td_cons = cs, td_derivs = derivs}})
-	= (length cs, case derivs of Nothing -> 0
-				     Just ds -> length ds)
-    data_info _ = (0,0)
-
-    class_info decl@(ClassDecl {})
-	= case count_sigs (map unLoc (tcdSigs decl)) of
-	    (_,classops,_,_,_) ->
-	       (classops, addpr (foldr add2 (0,0) (map (count_bind.unLoc) (bagToList (tcdMeths decl)))))
-    class_info _ = (0,0)
-
-    inst_info (FamInstD d) = case countATDecl d of
-                                  (tyd, dtd) -> (0,0,0,tyd,dtd)
-    inst_info (ClsInstD _ inst_meths inst_sigs ats)
-	= case count_sigs (map unLoc inst_sigs) of
-	    (_,_,ss,is,_) ->
-	      case foldr add2 (0, 0) (map (countATDecl . unLoc) ats) of
-	        (SynDecl, dtDecl) ->
-	          (addpr (foldr add2 (0,0) 
-			   (map (count_bind.unLoc) (bagToList inst_meths))), 
-                   ss, is, SynDecl, dtDecl)
-        where
-    countATDecl (FamInstDecl { fid_defn = TyData    {} }) = (0, 1)
-    countATDecl (FamInstDecl { fid_defn = TySynonym {} }) = (1, 0)
-
-    addpr :: (Int,Int) -> Int
-    add2  :: (Int,Int) -> (Int,Int) -> (Int, Int)
-    add5  :: (Int,Int,Int,Int,Int) -> (Int,Int,Int,Int,Int) -> (Int, Int, Int, Int, Int)
-    add7  :: (Int,Int,Int,Int,Int,Int,Int) -> (Int,Int,Int,Int,Int,Int,Int) -> (Int, Int, Int, Int, Int, Int, Int)
-
-    addpr (x,y) = x+y
-    add2 (x1,x2) (y1,y2) = (x1+y1,x2+y2)
-    add5 (x1,x2,x3,x4,x5) (y1,y2,y3,y4,y5) = (x1+y1,x2+y2,x3+y3,x4+y4,x5+y5)
-    add7 (x1,x2,x3,x4,x5,x6,x7) (y1,y2,y3,y4,y5,y6,y7) = (x1+y1,x2+y2,x3+y3,x4+y4,x5+y5,x6+y6,x7+y7)
-\end{code}
-
-
-
-
-
-
-
-
-





More information about the ghc-commits mailing list