We read every piece of feedback, and take your input very seriously.
To see all available qualifiers, see our documentation.
There was an error while loading. Please reload this page.
1 parent f2d9ba8 commit fe3fd67Copy full SHA for fe3fd67
benchmark/Streamly/Benchmark/Data/Stream/Common.hs
@@ -103,7 +103,7 @@ import qualified Streamly.Internal.Data.Stream.StreamD as StreamK
103
#endif
104
105
import Gauge
106
-import Prelude hiding (mapM, replicate)
+import Prelude hiding (Foldable(..), mapM, replicate)
107
108
#ifdef USE_STREAMK
109
toStream :: Applicative m => StreamK m a -> Stream m a
benchmark/Streamly/Benchmark/Data/Stream/StreamK.hs
@@ -26,7 +26,7 @@ import Control.Monad (when)
26
import Data.Maybe (isJust)
27
import System.Random (randomRIO)
28
import Prelude hiding
29
- ( tail, mapM_, foldl, last, map, mapM, concatMap, zipWith, init, iterate
+ ( Foldable(..), tail, mapM_, last, map, mapM, concatMap, zipWith, init, iterate
30
, repeat, replicate
31
)
32
@@ -167,15 +167,15 @@ fromFoldable streamLen n = S.fromFoldable [n..n+streamLen]
167
{-# INLINE fromFoldableM #-}
168
fromFoldableM :: Monad m => Int -> Int -> Stream m Int
169
fromFoldableM streamLen n =
170
- Prelude.foldr S.consM S.nil (Prelude.fmap return [n..n+streamLen])
+ List.foldr S.consM S.nil (Prelude.fmap return [n..n+streamLen])
171
172
{-# INLINABLE concatMapFoldableWith #-}
173
-concatMapFoldableWith :: Foldable f
+concatMapFoldableWith :: P.Foldable f
174
=> (Stream m b -> Stream m b -> Stream m b)
175
-> (a -> Stream m b)
176
-> f a
177
-> Stream m b
178
-concatMapFoldableWith f g = Prelude.foldr (f . g) S.nil
+concatMapFoldableWith f g = P.foldr (f . g) S.nil
179
180
{-# INLINE concatMapFoldableSerial #-}
181
concatMapFoldableSerial :: Int -> Int -> Stream m Int
src/Streamly/Internal/Data/Stream/IsStream/Eliminate.hs
@@ -182,9 +182,9 @@ import qualified Streamly.Internal.Data.Stream.StreamK.Type as K
182
import qualified System.IO as IO
183
184
185
- ( drop, take, takeWhile, foldr , foldl, mapM_, sequence, all, any, sum
186
- , product, elem, notElem, maximum, minimum, head, last, tail, length
187
- , null , reverse, init, and, or, lookup, foldr1, (!!) , splitAt, break
+ ( Foldable(..), drop, take, takeWhile, mapM_, sequence, all, any
+ , notElem, head, last, tail
+ , reverse, init, and, or, lookup, (!!), splitAt, break
188
, mconcat)
189
190
-- $setup
src/Streamly/Internal/Data/Stream/IsStream/Top.hs
@@ -85,7 +85,7 @@ import qualified Streamly.Internal.Data.Stream.IsStream.Transform as Stream
85
import qualified Streamly.Internal.Data.Stream.IsStream.Type as IsStream
86
import qualified Streamly.Internal.Data.Stream.StreamD as StreamD
87
88
-import Prelude hiding (filter, zipWith, concatMap, concat)
+import Prelude hiding (Foldable(..), filter, zipWith, concatMap, concat)
89
90
91
-- >>> :m
src/Streamly/Internal/Data/Stream/IsStream/Type.hs
@@ -133,7 +133,8 @@ import qualified Streamly.Internal.Data.Stream.Serial as Stream
133
import qualified Streamly.Internal.Data.Stream.Zip as Zip
134
import qualified Streamly.Internal.Data.Stream.ZipAsync as ZipAsync
135
136
-import Prelude hiding (foldr, repeat)
+import Prelude hiding (Foldable(..), repeat)
137
+import Data.Foldable (Foldable)
138
139
#include "inline.hs"
140
src/Streamly/Prelude.hs
@@ -943,10 +943,10 @@ where
943
944
import Streamly.Internal.Control.Concurrent (MonadAsync)
945
import Prelude
946
- hiding (filter, drop, dropWhile, take, takeWhile, zipWith, foldr,
947
- foldl, map, mapM, mapM_, sequence, all, any, sum, product, elem,
948
- notElem, maximum, minimum, head, last, tail, length, null,
949
- reverse, iterate, init, and, or, lookup, foldr1, (!!),
+ hiding (Foldable(..), filter, drop, dropWhile, take, takeWhile, zipWith,
+ map, mapM, mapM_, sequence, all, any,
+ notElem, head, last, tail,
+ reverse, iterate, init, and, or, lookup, (!!),
950
scanl, scanl1, repeat, replicate, concatMap, span)
951
952
import Streamly.Internal.Data.Stream.IsStream
0 commit comments