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

On branch  : master

http://hackage.haskell.org/trac/ghc/changeset/e2e0785eb7f4efd9f7791d913cdfdfd03148cd86

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

commit e2e0785eb7f4efd9f7791d913cdfdfd03148cd86
Author: Manuel M T Chakravarty <[email protected]>
Date:   Mon Jun 13 23:11:03 2011 +1000

    Fix warnings

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

 compiler/deSugar/Desugar.lhs                     |    2 +-
 compiler/vectorise/Vectorise/Builtins/Prelude.hs |   70 +++++++++++-----------
 2 files changed, 36 insertions(+), 36 deletions(-)

diff --git a/compiler/deSugar/Desugar.lhs b/compiler/deSugar/Desugar.lhs
index 98fd1e6..af2db36 100644
--- a/compiler/deSugar/Desugar.lhs
+++ b/compiler/deSugar/Desugar.lhs
@@ -399,6 +399,6 @@ dsVect (L loc (HsVect (L _ v) rhs))
     do { rhs' <- fmapMaybeM dsLExpr rhs
        ; return $ Vect v rhs'
           }
-dsVect (L loc (HsNoVect (L _ v)))
+dsVect (L _loc (HsNoVect (L _ v)))
   = return $ NoVect v
 \end{code}
diff --git a/compiler/vectorise/Vectorise/Builtins/Prelude.hs 
b/compiler/vectorise/Vectorise/Builtins/Prelude.hs
index dfde5ca..a59f936 100644
--- a/compiler/vectorise/Vectorise/Builtins/Prelude.hs
+++ b/compiler/vectorise/Vectorise/Builtins/Prelude.hs
@@ -27,7 +27,7 @@ preludeVars :: Modules
 preludeVars (Modules { dph_Combinators    = _dph_Combinators
                      , dph_Prelude_Int    = dph_Prelude_Int
                      , dph_Prelude_Word8  = dph_Prelude_Word8
-                     , dph_Prelude_Double = dph_Prelude_Double
+                     -- , dph_Prelude_Double = dph_Prelude_Double
                      , dph_Prelude_Bool   = dph_Prelude_Bool 
                      })
 
@@ -92,40 +92,40 @@ preludeVars (Modules { dph_Combinators    = _dph_Combinators
        , mk' mod "productP" "productPA"
        ]
 
-    vars_Fractional mod 
-     = [ mk' mod "/"     "divideV"
-       , mk' mod "recip" "recipV"
-       ]
-
-    vars_Floating mod 
-     = [ mk' mod "pi"      "pi"
-       , mk' mod "exp"     "expV"
-       , mk' mod "sqrt"    "sqrtV"
-       , mk' mod "log"     "logV"
-       , mk' mod "sin"     "sinV"
-       , mk' mod "tan"     "tanV"
-       , mk' mod "cos"     "cosV"
-       , mk' mod "asin"    "asinV"
-       , mk' mod "atan"    "atanV"
-       , mk' mod "acos"    "acosV"
-       , mk' mod "sinh"    "sinhV"
-       , mk' mod "tanh"    "tanhV"
-       , mk' mod "cosh"    "coshV"
-       , mk' mod "asinh"   "asinhV"
-       , mk' mod "atanh"   "atanhV"
-       , mk' mod "acosh"   "acoshV"
-       , mk' mod "**"      "powV"
-       , mk' mod "logBase" "logBaseV"
-       ]
-
-    vars_RealFrac mod
-     = [ mk' mod "fromInt"  "fromIntV"
-       , mk' mod "truncate" "truncateV"
-       , mk' mod "round"    "roundV"
-       , mk' mod "ceiling"  "ceilingV"
-       , mk' mod "floor"    "floorV"
-       ]
-
+    -- vars_Fractional mod 
+    --  = [ mk' mod "/"     "divideV"
+    --    , mk' mod "recip" "recipV"
+    --    ]
+    -- 
+    -- vars_Floating mod 
+    --  = [ mk' mod "pi"      "pi"
+    --    , mk' mod "exp"     "expV"
+    --    , mk' mod "sqrt"    "sqrtV"
+    --    , mk' mod "log"     "logV"
+    --    , mk' mod "sin"     "sinV"
+    --    , mk' mod "tan"     "tanV"
+    --    , mk' mod "cos"     "cosV"
+    --    , mk' mod "asin"    "asinV"
+    --    , mk' mod "atan"    "atanV"
+    --    , mk' mod "acos"    "acosV"
+    --    , mk' mod "sinh"    "sinhV"
+    --    , mk' mod "tanh"    "tanhV"
+    --    , mk' mod "cosh"    "coshV"
+    --    , mk' mod "asinh"   "asinhV"
+    --    , mk' mod "atanh"   "atanhV"
+    --    , mk' mod "acosh"   "acoshV"
+    --    , mk' mod "**"      "powV"
+    --    , mk' mod "logBase" "logBaseV"
+    --    ]
+    -- 
+    -- vars_RealFrac mod
+    --  = [ mk' mod "fromInt"  "fromIntV"
+    --    , mk' mod "truncate" "truncateV"
+    --    , mk' mod "round"    "roundV"
+    --    , mk' mod "ceiling"  "ceilingV"
+    --    , mk' mod "floor"    "floorV"
+    --    ]
+    -- 
 preludeScalars :: Modules -> [(Module, FastString)]
 preludeScalars (Modules { dph_Prelude_Int    = dph_Prelude_Int
                         , dph_Prelude_Word8  = dph_Prelude_Word8



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

Reply via email to