Skip to content
Snippets Groups Projects
Commit 65c4c363 authored by Ben Gamari's avatar Ben Gamari :turtle:
Browse files

Hide unzip in extra

parent 3a2683b6
No related branches found
No related tags found
1 merge request!290ci: Freeze index-state
diff --git a/src/Data/List/Extra.hs b/src/Data/List/Extra.hs
index 4b4fbe5..2a476cc 100644
index 4b4fbe5..4d98d2f 100644
--- a/src/Data/List/Extra.hs
+++ b/src/Data/List/Extra.hs
@@ -1,4 +1,5 @@
......@@ -9,6 +9,15 @@ index 4b4fbe5..2a476cc 100644
-- | This module extends "Data.List" with extra functions of a similar nature.
-- The package also exports the existing "Data.List" functions.
@@ -45,7 +46,7 @@ import Data.Char
import Data.Tuple.Extra
import Data.Monoid
import Numeric
-import Data.Functor
+import Data.Functor hiding (unzip)
import Data.Foldable
import Prelude
import Data.List.NonEmpty (NonEmpty ((:|)))
@@ -156,6 +157,7 @@ lastDef :: a -> [a] -> a
lastDef d xs = foldl (\_ x -> x) d xs -- I know this looks weird, but apparently this is the fastest way to do this: https://hackage.haskell.org/package/base-4.12.0.0/docs/src/GHC.List.html#last
{-# INLINE lastDef #-}
......
0% Loading or .
You are about to add 0 people to the discussion. Proceed with caution.
Finish editing this message first!
Please register or to comment