{-# LANGUAGE CPP, NoImplicitPrelude #-}
module Data.List.NonEmpty.Compat (
#if MIN_VERSION_base(4,9,0)
NonEmpty(..)
, map
, intersperse
, scanl
, scanr
, scanl1
, scanr1
, transpose
, sortBy
, sortWith
, length
, head
, tail
, last
, init
, singleton
, (<|), cons
, uncons
, unfoldr
, sort
, reverse
, inits
, tails
, iterate
, repeat
, cycle
, unfold
, insert
, some1
, take
, drop
, splitAt
, takeWhile
, dropWhile
, span
, break
, filter
, partition
, group
, groupBy
, groupWith
, groupAllWith
, group1
, groupBy1
, groupWith1
, groupAllWith1
, isPrefixOf
, nub
, nubBy
, (!!)
, zip
, zipWith
, unzip
, fromList
, toList
, nonEmpty
, xor
#endif
) where
#if MIN_VERSION_base(4,9,0)
import Data.List.NonEmpty
#endif
#if MIN_VERSION_base(4,9,0) && !(MIN_VERSION_base(4,15,0))
singleton :: a -> NonEmpty a
singleton :: a -> NonEmpty a
singleton a
a = a
a a -> [a] -> NonEmpty a
forall a. a -> [a] -> NonEmpty a
:| []
#endif