[commit: packages/vector] ghc-head: Resolve conflict (368ab31)
git at git.haskell.org
git at git.haskell.org
Thu Sep 26 11:54:14 CEST 2013
Repository : ssh://git@git.haskell.org/vector
On branch : ghc-head
Link : http://git.haskell.org/packages/vector.git/commitdiff/368ab31e0167488f7fd743a5e6cab2bccb8f71c4
>---------------------------------------------------------------
commit 368ab31e0167488f7fd743a5e6cab2bccb8f71c4
Author: Roman Leshchinskiy <rl at cse.unsw.edu.au>
Date: Fri Sep 28 22:32:07 2012 +0000
Resolve conflict
>---------------------------------------------------------------
368ab31e0167488f7fd743a5e6cab2bccb8f71c4
Data/Vector/Fusion/Stream/Monadic/Safe.hs | 78 ---------------------------
Data/Vector/Fusion/Stream/Safe.hs | 82 -----------------------------
2 files changed, 160 deletions(-)
diff --git a/Data/Vector/Fusion/Stream/Monadic/Safe.hs b/Data/Vector/Fusion/Stream/Monadic/Safe.hs
deleted file mode 100644
index 1805dc5..0000000
--- a/Data/Vector/Fusion/Stream/Monadic/Safe.hs
+++ /dev/null
@@ -1,78 +0,0 @@
-#if __GLASGOW_HASKELL__ >= 701
-{-# LANGUAGE Trustworthy #-}
-#endif
-
--- |
--- Module : Data.Vector.Fusion.Stream.Monadic.Safe
--- Copyright : (c) Roman Leshchinskiy 2008-2010
--- License : BSD-style
---
--- Maintainer : Roman Leshchinskiy <rl at cse.unsw.edu.au>
--- Stability : experimental
--- Portability : non-portable
---
--- Safe interface to "Data.Vector.Fusion.Stream.Monadic"
---
-
-module Data.Vector.Fusion.Stream.Monadic.Safe (
- Stream(..), Step(..),
-
- -- * Size hints
- size, sized,
-
- -- * Length
- length, null,
-
- -- * Construction
- empty, singleton, cons, snoc, replicate, replicateM, generate, generateM, (++),
-
- -- * Accessing elements
- head, last, (!!),
-
- -- * Substreams
- slice, init, tail, take, drop,
-
- -- * Mapping
- map, mapM, mapM_, trans, unbox, concatMap, flatten,
-
- -- * Zipping
- indexed, indexedR, zipWithM_,
- zipWithM, zipWith3M, zipWith4M, zipWith5M, zipWith6M,
- zipWith, zipWith3, zipWith4, zipWith5, zipWith6,
- zip, zip3, zip4, zip5, zip6,
-
- -- * Filtering
- filter, filterM, takeWhile, takeWhileM, dropWhile, dropWhileM,
-
- -- * Searching
- elem, notElem, find, findM, findIndex, findIndexM,
-
- -- * Folding
- foldl, foldlM, foldl1, foldl1M, foldM, fold1M,
- foldl', foldlM', foldl1', foldl1M', foldM', fold1M',
- foldr, foldrM, foldr1, foldr1M,
-
- -- * Specialised folds
- and, or, concatMapM,
-
- -- * Unfolding
- unfoldr, unfoldrM,
- unfoldrN, unfoldrNM,
- iterateN, iterateNM,
-
- -- * Scans
- prescanl, prescanlM, prescanl', prescanlM',
- postscanl, postscanlM, postscanl', postscanlM',
- scanl, scanlM, scanl', scanlM',
- scanl1, scanl1M, scanl1', scanl1M',
-
- -- * Enumerations
- enumFromStepN, enumFromTo, enumFromThenTo,
-
- -- * Conversions
- toList, fromList, fromListN
-) where
-
-import Data.Vector.Fusion.Stream.Monadic
-import Prelude ()
-
diff --git a/Data/Vector/Fusion/Stream/Safe.hs b/Data/Vector/Fusion/Stream/Safe.hs
deleted file mode 100644
index 00ac9c2..0000000
--- a/Data/Vector/Fusion/Stream/Safe.hs
+++ /dev/null
@@ -1,82 +0,0 @@
-#if __GLASGOW_HASKELL__ >= 701
-{-# LANGUAGE Trustworthy #-}
-#endif
-
--- |
--- Module : Data.Vector.Fusion.Stream.Safe
--- Copyright : (c) Roman Leshchinskiy 2008-2010
--- License : BSD-style
---
--- Maintainer : Roman Leshchinskiy <rl at cse.unsw.edu.au>
--- Stability : experimental
--- Portability : non-portable
---
--- Safe interface to "Data.Vector.Fusion.Stream"
---
-
-module Data.Vector.Fusion.Stream.Safe (
- -- * Types
- Step(..), Stream, MStream,
-
- -- * In-place markers
- inplace,
-
- -- * Size hints
- size, sized,
-
- -- * Length information
- length, null,
-
- -- * Construction
- empty, singleton, cons, snoc, replicate, generate, (++),
-
- -- * Accessing individual elements
- head, last, (!!),
-
- -- * Substreams
- slice, init, tail, take, drop,
-
- -- * Mapping
- map, concatMap, flatten, unbox,
-
- -- * Zipping
- indexed, indexedR,
- zipWith, zipWith3, zipWith4, zipWith5, zipWith6,
- zip, zip3, zip4, zip5, zip6,
-
- -- * Filtering
- filter, takeWhile, dropWhile,
-
- -- * Searching
- elem, notElem, find, findIndex,
-
- -- * Folding
- foldl, foldl1, foldl', foldl1', foldr, foldr1,
-
- -- * Specialised folds
- and, or,
-
- -- * Unfolding
- unfoldr, unfoldrN, iterateN,
-
- -- * Scans
- prescanl, prescanl',
- postscanl, postscanl',
- scanl, scanl',
- scanl1, scanl1',
-
- -- * Enumerations
- enumFromStepN, enumFromTo, enumFromThenTo,
-
- -- * Conversions
- toList, fromList, fromListN, liftStream,
-
- -- * Monadic combinators
- mapM, mapM_, zipWithM, zipWithM_, filterM, foldM, fold1M, foldM', fold1M',
-
- eq, cmp
-) where
-
-import Data.Vector.Fusion.Stream
-import Prelude ()
-
More information about the ghc-commits
mailing list