Sat Sep  1 04:21:30 PDT 2007  Ian Lynagh <[EMAIL PROTECTED]>
  * Add {-# OPTIONS_GHC -w #-} and some blurb to all compiler modules

    M ./compiler/Makefile +1
    M ./compiler/basicTypes/BasicTypes.lhs +7
    M ./compiler/basicTypes/DataCon.lhs +7
    M ./compiler/basicTypes/Demand.lhs +7
    M ./compiler/basicTypes/Id.lhs +7
    M ./compiler/basicTypes/IdInfo.lhs +7
    M ./compiler/basicTypes/Literal.lhs +7
    M ./compiler/basicTypes/MkId.lhs +7
    M ./compiler/basicTypes/Module.lhs +7
    M ./compiler/basicTypes/Name.lhs +7
    M ./compiler/basicTypes/NameEnv.lhs +7
    M ./compiler/basicTypes/NameSet.lhs +7
    M ./compiler/basicTypes/NewDemand.lhs +7
    M ./compiler/basicTypes/OccName.lhs +7
    M ./compiler/basicTypes/RdrName.lhs +7
    M ./compiler/basicTypes/SrcLoc.lhs +7
    M ./compiler/basicTypes/UniqSupply.lhs +7
    M ./compiler/basicTypes/Unique.lhs +7
    M ./compiler/basicTypes/Var.lhs +7
    M ./compiler/basicTypes/VarEnv.lhs +7
    M ./compiler/basicTypes/VarSet.lhs +7
    M ./compiler/cmm/CLabel.hs +7
    M ./compiler/cmm/Cmm.hs +7
    M ./compiler/cmm/CmmBrokenBlock.hs +7
    M ./compiler/cmm/CmmCPS.hs +7
    M ./compiler/cmm/CmmCPSGen.hs +7
    M ./compiler/cmm/CmmCallConv.hs +7
    M ./compiler/cmm/CmmInfo.hs +7
    M ./compiler/cmm/CmmLex.x +7
    M ./compiler/cmm/CmmLint.hs +7
    M ./compiler/cmm/CmmLive.hs +7
    M ./compiler/cmm/CmmOpt.hs +7
    M ./compiler/cmm/CmmParse.y +7
    M ./compiler/cmm/CmmProcPoint.hs +7
    M ./compiler/cmm/CmmUtils.hs +7
    M ./compiler/cmm/Dataflow.hs +7
    M ./compiler/cmm/MachOp.hs +7
    M ./compiler/cmm/PprC.hs +7
    M ./compiler/cmm/PprCmm.hs +7
    M ./compiler/codeGen/Bitmap.hs +7
    M ./compiler/codeGen/CgBindery.lhs +7
    M ./compiler/codeGen/CgCallConv.hs +6
    M ./compiler/codeGen/CgCase.lhs +7
    M ./compiler/codeGen/CgClosure.lhs +7
    M ./compiler/codeGen/CgCon.lhs +7
    M ./compiler/codeGen/CgExpr.lhs +7
    M ./compiler/codeGen/CgForeignCall.hs +7
    M ./compiler/codeGen/CgHeapery.lhs +7
    M ./compiler/codeGen/CgHpc.hs +7
    M ./compiler/codeGen/CgInfoTbls.hs +7
    M ./compiler/codeGen/CgLetNoEscape.lhs +7
    M ./compiler/codeGen/CgMonad.lhs +7
    M ./compiler/codeGen/CgParallel.hs +7
    M ./compiler/codeGen/CgPrimOp.hs +7
    M ./compiler/codeGen/CgProf.hs +7
    M ./compiler/codeGen/CgStackery.lhs +7
    M ./compiler/codeGen/CgTailCall.lhs +7
    M ./compiler/codeGen/CgTicky.hs +7
    M ./compiler/codeGen/CgUtils.hs +7
    M ./compiler/codeGen/ClosureInfo.lhs +7
    M ./compiler/codeGen/CodeGen.lhs +7
    M ./compiler/codeGen/SMRep.lhs +7
    M ./compiler/coreSyn/CoreFVs.lhs +7
    M ./compiler/coreSyn/CoreLint.lhs +7
    M ./compiler/coreSyn/CorePrep.lhs +7
    M ./compiler/coreSyn/CoreSubst.lhs +7
    M ./compiler/coreSyn/CoreSyn.lhs +7
    M ./compiler/coreSyn/CoreTidy.lhs +7
    M ./compiler/coreSyn/CoreUnfold.lhs +7
    M ./compiler/coreSyn/CoreUtils.lhs +7
    M ./compiler/coreSyn/ExternalCore.lhs +6
    M ./compiler/coreSyn/MkExternalCore.lhs +6
    M ./compiler/coreSyn/PprCore.lhs +7
    M ./compiler/coreSyn/PprExternalCore.lhs +7
    M ./compiler/cprAnalysis/CprAnalyse.lhs +7
    M ./compiler/deSugar/Check.lhs +7
    M ./compiler/deSugar/Coverage.lhs +7
    M ./compiler/deSugar/Desugar.lhs +7
    M ./compiler/deSugar/DsArrows.lhs +7
    M ./compiler/deSugar/DsBinds.lhs +7
    M ./compiler/deSugar/DsCCall.lhs +7
    M ./compiler/deSugar/DsExpr.lhs +7
    M ./compiler/deSugar/DsForeign.lhs +7
    M ./compiler/deSugar/DsGRHSs.lhs +7
    M ./compiler/deSugar/DsListComp.lhs +7
    M ./compiler/deSugar/DsMeta.hs +6
    M ./compiler/deSugar/DsMonad.lhs +7
    M ./compiler/deSugar/DsUtils.lhs +7
    M ./compiler/deSugar/Match.lhs +7
    M ./compiler/deSugar/MatchCon.lhs +7
    M ./compiler/deSugar/MatchLit.lhs +7
    M ./compiler/ghci/ByteCodeAsm.lhs +7
    M ./compiler/ghci/ByteCodeFFI.lhs +7
    M ./compiler/ghci/ByteCodeGen.lhs +7
    M ./compiler/ghci/ByteCodeInstr.lhs +8
    M ./compiler/ghci/ByteCodeItbls.lhs +7
    M ./compiler/ghci/ByteCodeLink.lhs +7
    M ./compiler/ghci/Debugger.hs +7
    M ./compiler/ghci/GhciMonad.hs +7
    M ./compiler/ghci/GhciTags.hs +7
    M ./compiler/ghci/InteractiveUI.hs +7
    M ./compiler/ghci/Linker.lhs +7
    M ./compiler/ghci/ObjLink.lhs +7
    M ./compiler/ghci/RtClosureInspect.hs +7
    M ./compiler/hsSyn/Convert.lhs +7
    M ./compiler/hsSyn/HsBinds.lhs +7
    M ./compiler/hsSyn/HsDecls.lhs +7
    M ./compiler/hsSyn/HsDoc.hs +7
    M ./compiler/hsSyn/HsExpr.lhs +7
    M ./compiler/hsSyn/HsImpExp.lhs +7
    M ./compiler/hsSyn/HsLit.lhs +7
    M ./compiler/hsSyn/HsPat.lhs +7
    M ./compiler/hsSyn/HsSyn.lhs +7
    M ./compiler/hsSyn/HsTypes.lhs +7
    M ./compiler/hsSyn/HsUtils.lhs +7
    M ./compiler/iface/BinIface.hs +7
    M ./compiler/iface/BuildTyCl.lhs +7
    M ./compiler/iface/IfaceEnv.lhs +7
    M ./compiler/iface/IfaceSyn.lhs +7
    M ./compiler/iface/IfaceType.lhs +7
    M ./compiler/iface/LoadIface.lhs +7
    M ./compiler/iface/MkIface.lhs +7
    M ./compiler/iface/TcIface.lhs +7
    M ./compiler/ilxGen/IlxGen.lhs +7
    M ./compiler/javaGen/Java.lhs +7
    M ./compiler/javaGen/JavaGen.lhs +7
    M ./compiler/javaGen/PrintJava.lhs +7
    M ./compiler/main/BreakArray.hs +7
    M ./compiler/main/CmdLineParser.hs +7
    M ./compiler/main/CodeOutput.lhs +7
    M ./compiler/main/Constants.lhs +7
    M ./compiler/main/DriverMkDepend.hs +7
    M ./compiler/main/DriverPhases.hs +7
    M ./compiler/main/DriverPipeline.hs +7
    M ./compiler/main/DynFlags.hs +7
    M ./compiler/main/ErrUtils.lhs +7
    M ./compiler/main/Finder.lhs +7
    M ./compiler/main/GHC.hs +7
    M ./compiler/main/HeaderInfo.hs +7
    M ./compiler/main/HscMain.lhs +7
    M ./compiler/main/HscStats.lhs +7
    M ./compiler/main/HscTypes.lhs +7
    M ./compiler/main/InteractiveEval.hs +7
    M ./compiler/main/Main.hs +7
    M ./compiler/main/PackageConfig.hs +7
    M ./compiler/main/Packages.lhs +7
    M ./compiler/main/ParsePkgConf.y +7
    M ./compiler/main/PprTyThing.hs +7
    M ./compiler/main/StaticFlags.hs +7
    M ./compiler/main/SysTools.lhs +7
    M ./compiler/main/TidyPgm.lhs +7
    M ./compiler/nativeGen/AsmCodeGen.lhs +7
    M ./compiler/nativeGen/GraphBase.hs +7
    M ./compiler/nativeGen/GraphColor.hs +8
    M ./compiler/nativeGen/GraphOps.hs +8
    M ./compiler/nativeGen/GraphPpr.hs +7
    M ./compiler/nativeGen/MachCodeGen.hs +7
    M ./compiler/nativeGen/MachInstrs.hs +7
    M ./compiler/nativeGen/MachRegs.lhs +7
    M ./compiler/nativeGen/NCGMonad.hs +7
    M ./compiler/nativeGen/PositionIndependentCode.hs +7
    M ./compiler/nativeGen/PprMach.hs +7
    M ./compiler/nativeGen/RegAllocColor.hs +7
    M ./compiler/nativeGen/RegAllocInfo.hs +7
    M ./compiler/nativeGen/RegAllocLinear.hs +7
    M ./compiler/nativeGen/RegAllocStats.hs +7
    M ./compiler/nativeGen/RegArchBase.hs -1 +8
    M ./compiler/nativeGen/RegArchX86.hs +8
    M ./compiler/nativeGen/RegCoalesce.hs +7
    M ./compiler/nativeGen/RegLiveness.hs +6
    M ./compiler/nativeGen/RegSpill.hs +7
    M ./compiler/nativeGen/RegSpillClean.hs -1 +8
    M ./compiler/ndpFlatten/FlattenInfo.hs +7
    M ./compiler/ndpFlatten/FlattenMonad.hs +7
    M ./compiler/ndpFlatten/Flattening.hs +7
    M ./compiler/ndpFlatten/NDPCoreUtils.hs +7
    M ./compiler/ndpFlatten/PArrAnal.hs +7
    M ./compiler/parser/Ctype.lhs +7
    M ./compiler/parser/HaddockLex.x +7
    M ./compiler/parser/HaddockParse.y +7
    M ./compiler/parser/HaddockUtils.hs +7
    M ./compiler/parser/LexCore.hs +7
    M ./compiler/parser/Lexer.x +7
    M ./compiler/parser/Parser.y.pp +7
    M ./compiler/parser/ParserCore.y +7
    M ./compiler/parser/ParserCoreUtils.hs +7
    M ./compiler/parser/RdrHsSyn.lhs +7
    M ./compiler/prelude/ForeignCall.lhs +7
    M ./compiler/prelude/PrelInfo.lhs +7
    M ./compiler/prelude/PrelNames.lhs +7
    M ./compiler/prelude/PrelRules.lhs +7
    M ./compiler/prelude/PrimOp.lhs +7
    M ./compiler/prelude/TysPrim.lhs +7
    M ./compiler/prelude/TysWiredIn.lhs +7
    M ./compiler/profiling/CostCentre.lhs +7
    M ./compiler/profiling/SCCfinal.lhs +7
    M ./compiler/rename/RnBinds.lhs +7
    M ./compiler/rename/RnEnv.lhs +7
    M ./compiler/rename/RnExpr.lhs +7
    M ./compiler/rename/RnHsDoc.hs +7
    M ./compiler/rename/RnHsSyn.lhs +7
    M ./compiler/rename/RnNames.lhs +7
    M ./compiler/rename/RnSource.lhs +7
    M ./compiler/rename/RnTypes.lhs +7
    M ./compiler/simplCore/CSE.lhs +7
    M ./compiler/simplCore/FloatIn.lhs +7
    M ./compiler/simplCore/FloatOut.lhs +7
    M ./compiler/simplCore/LiberateCase.lhs +7
    M ./compiler/simplCore/OccurAnal.lhs +7
    M ./compiler/simplCore/SAT.lhs +7
    M ./compiler/simplCore/SATMonad.lhs +7
    M ./compiler/simplCore/SetLevels.lhs +7
    M ./compiler/simplCore/SimplCore.lhs +7
    M ./compiler/simplCore/SimplEnv.lhs +7
    M ./compiler/simplCore/SimplMonad.lhs +7
    M ./compiler/simplCore/SimplUtils.lhs +7
    M ./compiler/simplCore/Simplify.lhs +7
    M ./compiler/simplStg/SRT.lhs +7
    M ./compiler/simplStg/SimplStg.lhs +7
    M ./compiler/simplStg/StgStats.lhs +7
    M ./compiler/specialise/Rules.lhs +7
    M ./compiler/specialise/SpecConstr.lhs +7
    M ./compiler/specialise/Specialise.lhs +7
    M ./compiler/stgSyn/CoreToStg.lhs +7
    M ./compiler/stgSyn/StgLint.lhs +7
    M ./compiler/stgSyn/StgSyn.lhs +7
    M ./compiler/stranal/DmdAnal.lhs +7
    M ./compiler/stranal/SaAbsInt.lhs +7
    M ./compiler/stranal/SaLib.lhs +7
    M ./compiler/stranal/StrictAnal.lhs +7
    M ./compiler/stranal/WorkWrap.lhs +7
    M ./compiler/stranal/WwLib.lhs +7
    M ./compiler/typecheck/FamInst.lhs +7
    M ./compiler/typecheck/Inst.lhs +7
    M ./compiler/typecheck/TcArrows.lhs +7
    M ./compiler/typecheck/TcBinds.lhs +7
    M ./compiler/typecheck/TcClassDcl.lhs +7
    M ./compiler/typecheck/TcDefaults.lhs +7
    M ./compiler/typecheck/TcDeriv.lhs +7
    M ./compiler/typecheck/TcEnv.lhs +7
    M ./compiler/typecheck/TcExpr.lhs +7
    M ./compiler/typecheck/TcForeign.lhs +7
    M ./compiler/typecheck/TcGadt.lhs +7
    M ./compiler/typecheck/TcGenDeriv.lhs +7
    M ./compiler/typecheck/TcHsSyn.lhs +7
    M ./compiler/typecheck/TcHsType.lhs +7
    M ./compiler/typecheck/TcInstDcls.lhs +7
    M ./compiler/typecheck/TcMType.lhs +7
    M ./compiler/typecheck/TcMatches.lhs +7
    M ./compiler/typecheck/TcPat.lhs +7
    M ./compiler/typecheck/TcRnDriver.lhs +7
    M ./compiler/typecheck/TcRnMonad.lhs +7
    M ./compiler/typecheck/TcRnTypes.lhs +7
    M ./compiler/typecheck/TcRules.lhs +7
    M ./compiler/typecheck/TcSimplify.lhs +7
    M ./compiler/typecheck/TcSplice.lhs +7
    M ./compiler/typecheck/TcTyClsDecls.lhs +7
    M ./compiler/typecheck/TcTyDecls.lhs +7
    M ./compiler/typecheck/TcTyFuns.lhs +6
    M ./compiler/typecheck/TcType.lhs +7
    M ./compiler/typecheck/TcUnify.lhs +7
    M ./compiler/types/Class.lhs +7
    M ./compiler/types/Coercion.lhs +7
    M ./compiler/types/FamInstEnv.lhs +7
    M ./compiler/types/FunDeps.lhs +7
    M ./compiler/types/Generics.lhs +7
    M ./compiler/types/InstEnv.lhs +7
    M ./compiler/types/TyCon.lhs +7
    M ./compiler/types/Type.lhs +7
    M ./compiler/types/TypeRep.lhs +7
    M ./compiler/types/Unify.lhs +7
    M ./compiler/utils/Bag.lhs +7
    M ./compiler/utils/Binary.hs +7
    M ./compiler/utils/BufWrite.hs +7
    M ./compiler/utils/Digraph.lhs +7
    M ./compiler/utils/Encoding.hs +7
    M ./compiler/utils/FastMutInt.lhs +7
    M ./compiler/utils/FastString.lhs +7
    M ./compiler/utils/FastTypes.lhs +7
    M ./compiler/utils/FiniteMap.lhs +6
    M ./compiler/utils/IOEnv.hs +7
    M ./compiler/utils/ListSetOps.lhs +7
    M ./compiler/utils/Maybes.lhs +7
    M ./compiler/utils/OrdList.lhs +7
    M ./compiler/utils/Outputable.lhs +6
    M ./compiler/utils/Panic.lhs +7
    M ./compiler/utils/Pretty.lhs +7
    M ./compiler/utils/State.hs +6
    M ./compiler/utils/StringBuffer.lhs +7
    M ./compiler/utils/UniqFM.lhs +7
    M ./compiler/utils/UniqSet.lhs +7
    M ./compiler/utils/Util.lhs +7
    M ./compiler/vectorise/VectBuiltIn.hs +7
    M ./compiler/vectorise/VectCore.hs +7
    M ./compiler/vectorise/VectMonad.hs +7
    M ./compiler/vectorise/VectType.hs +7
    M ./compiler/vectorise/VectUtils.hs +7
    M ./compiler/vectorise/Vectorise.hs +7

_______________________________________________
Cvs-ghc mailing list
[email protected]
http://www.haskell.org/mailman/listinfo/cvs-ghc

Reply via email to