summaryrefslogtreecommitdiff
diff options
context:
space:
mode:
-rw-r--r--compiler/ghci/Debugger.hs2
-rw-r--r--libraries/base/Data/Foldable.hs10
-rw-r--r--libraries/base/Data/List.hs2
m---------libraries/containers0
-rw-r--r--testsuite/tests/ghci/scripts/ghci025.stdout4
-rw-r--r--testsuite/tests/module/mod106.hs2
-rw-r--r--testsuite/tests/parser/should_fail/readFail003.hs2
-rw-r--r--testsuite/tests/simplCore/should_compile/T7360.hs6
-rw-r--r--testsuite/tests/typecheck/should_compile/faxen.hs5
-rw-r--r--testsuite/tests/typecheck/should_fail/mc21.hs4
-rw-r--r--testsuite/tests/typecheck/should_fail/mc24.hs4
11 files changed, 29 insertions, 12 deletions
diff --git a/compiler/ghci/Debugger.hs b/compiler/ghci/Debugger.hs
index 4966714181..bd1532904e 100644
--- a/compiler/ghci/Debugger.hs
+++ b/compiler/ghci/Debugger.hs
@@ -172,7 +172,7 @@ showTerm term = do
txt_ <- withExtendedLinkEnv [(bname, val)]
(GHC.compileExpr expr)
let myprec = 10 -- application precedence. TODO Infix constructors
- let txt = unsafeCoerce# txt_
+ let txt = unsafeCoerce# txt_ :: [a]
if not (null txt) then
return $ Just $ cparen (prec >= myprec && needsParens txt)
(text txt)
diff --git a/libraries/base/Data/Foldable.hs b/libraries/base/Data/Foldable.hs
index 688fd06ec0..d8310ca49e 100644
--- a/libraries/base/Data/Foldable.hs
+++ b/libraries/base/Data/Foldable.hs
@@ -149,6 +149,14 @@ class Foldable t where
{-# INLINE toList #-}
toList t = build (\ c n -> foldr c n t)
+ -- | Test whether the structure is empty.
+ null :: Foldable t => t a -> Bool
+ null = foldr (\_ _ -> False) True
+
+ -- | Returns the size/length of a finite structure as an 'Int'.
+ length :: Foldable t => t a -> Int
+ length = foldl' (\c _ -> c+1) 0
+
-- | Does the element occur in the structure?
elem :: (Foldable t, Eq a) => a -> t a -> Bool
elem = any . (==)
@@ -186,8 +194,10 @@ instance Foldable [] where
foldl1 = List.foldl1
foldr = List.foldr
foldr1 = List.foldr1
+ length = List.length
maximum = List.maximum
minimum = List.minimum
+ null = List.null
product = List.product
sum = List.sum
toList = id
diff --git a/libraries/base/Data/List.hs b/libraries/base/Data/List.hs
index 795baec6af..193ebbc0c4 100644
--- a/libraries/base/Data/List.hs
+++ b/libraries/base/Data/List.hs
@@ -213,4 +213,4 @@ import Data.Traversable
import Data.OldList hiding ( all, and, any, concat, concatMap, elem, find,
foldl, foldl1, foldl', foldr, foldr1, mapAccumL,
mapAccumR, maximum, maximumBy, minimum, minimumBy,
- notElem, or, product, sum )
+ length, notElem, null, or, product, sum )
diff --git a/libraries/containers b/libraries/containers
-Subproject e84c5d2145415cb0beacce0909a551ae5e28d39
+Subproject 085e1b8b2cfbd1159bbc9f8cbf6a4127cc32227
diff --git a/testsuite/tests/ghci/scripts/ghci025.stdout b/testsuite/tests/ghci/scripts/ghci025.stdout
index e6b012a4c6..4d21c5fc44 100644
--- a/testsuite/tests/ghci/scripts/ghci025.stdout
+++ b/testsuite/tests/ghci/scripts/ghci025.stdout
@@ -52,7 +52,9 @@ class Eq a where
(GHC.Classes.==) :: a -> a -> GHC.Types.Bool
(GHC.Classes./=) :: a -> a -> GHC.Types.Bool
-- imported via Prelude, T
-Prelude.length :: [a] -> GHC.Types.Int
+Prelude.length ::
+ Data.Foldable.Foldable t =>
+ forall a. Data.Foldable.Foldable t => t a -> GHC.Types.Int
-- imported via T
data T.Integer
= integer-gmp-0.5.1.0:GHC.Integer.Type.S# GHC.Prim.Int#
diff --git a/testsuite/tests/module/mod106.hs b/testsuite/tests/module/mod106.hs
index a871377d38..b5059714ec 100644
--- a/testsuite/tests/module/mod106.hs
+++ b/testsuite/tests/module/mod106.hs
@@ -1,7 +1,7 @@
-- !!! local aliases
module M where
-import qualified Data.List as M
+import qualified Data.OldList as M
import qualified Data.Maybe as M
x = M.length
diff --git a/testsuite/tests/parser/should_fail/readFail003.hs b/testsuite/tests/parser/should_fail/readFail003.hs
index 8595312137..343e1f06e2 100644
--- a/testsuite/tests/parser/should_fail/readFail003.hs
+++ b/testsuite/tests/parser/should_fail/readFail003.hs
@@ -1,6 +1,6 @@
-- !!! Irrefutable patterns + guards
module Read003 where
-
+import Data.OldList; import Prelude hiding (null)
~(a,b,c) | nullity b = a
| nullity c = a
| otherwise = a
diff --git a/testsuite/tests/simplCore/should_compile/T7360.hs b/testsuite/tests/simplCore/should_compile/T7360.hs
index 9225bd168a..67c5e7212b 100644
--- a/testsuite/tests/simplCore/should_compile/T7360.hs
+++ b/testsuite/tests/simplCore/should_compile/T7360.hs
@@ -3,6 +3,8 @@
module T7360 where
+import Data.OldList as L
+
data Foo = Foo1 | Foo2 | Foo3 !Int
fun1 :: Foo -> ()
@@ -15,5 +17,5 @@ fun1 x = case x of
fun2 x = (fun1 Foo1, -- Keep -ddump-simpl output
-- in a predicatable order
case x of
- [] -> length x
- (_:_) -> length x)
+ [] -> L.length x
+ (_:_) -> L.length x)
diff --git a/testsuite/tests/typecheck/should_compile/faxen.hs b/testsuite/tests/typecheck/should_compile/faxen.hs
index ddc8f7b90d..f65ee7159a 100644
--- a/testsuite/tests/typecheck/should_compile/faxen.hs
+++ b/testsuite/tests/typecheck/should_compile/faxen.hs
@@ -1,4 +1,4 @@
-{-# LANGUAGE RankNTypes #-}
+{-# LANGUAGE RankNTypes #-}
-- A classic test for type inference
-- Taken from "Haskell and principal types", Section 3
@@ -6,6 +6,9 @@
module ShouldCompile where
+import Data.OldList (null)
+import Prelude hiding (null)
+
class HasEmpty a where
isEmpty :: a -> Bool
diff --git a/testsuite/tests/typecheck/should_fail/mc21.hs b/testsuite/tests/typecheck/should_fail/mc21.hs
index 601403a6bd..adb4b91204 100644
--- a/testsuite/tests/typecheck/should_fail/mc21.hs
+++ b/testsuite/tests/typecheck/should_fail/mc21.hs
@@ -1,13 +1,13 @@
-- Checks that the correct type is used checking the using clause of the group
{-# OPTIONS_GHC -XMonadComprehensions -XTransformListComp #-}
-
module ShouldFail where
import GHC.Exts( the )
+import Data.OldList
data Unorderable = Gnorf | Pinky | Brain
-foo = [ length x
+foo = [ Data.OldList.length x
| x <- [Gnorf, Brain]
, then group using take 5
]
diff --git a/testsuite/tests/typecheck/should_fail/mc24.hs b/testsuite/tests/typecheck/should_fail/mc24.hs
index 9186721229..281f4ad99a 100644
--- a/testsuite/tests/typecheck/should_fail/mc24.hs
+++ b/testsuite/tests/typecheck/should_fail/mc24.hs
@@ -2,10 +2,10 @@
-- the group when a by clause is present
{-# OPTIONS_GHC -XMonadComprehensions -XTransformListComp #-}
-
module ShouldFail where
+import Data.OldList
-foo = [ length x
+foo = [ Data.OldList.length x
| x <- [1..10]
, then group by x using take 2
]