{-# LANGUAGE Trustworthy #-}
module Relude.List.Reexport
(
module Data.List
, cycle
, sortWith
) where
import Data.List (break, drop, dropWhile, filter, genericDrop, genericLength, genericReplicate,
genericSplitAt, genericTake, group, inits, intercalate, intersperse, isPrefixOf,
iterate, map, permutations, repeat, replicate, reverse, scanl, scanl', scanl1,
scanr, scanr1, sort, sortBy, sortOn, span, splitAt, subsequences, tails, take,
takeWhile, transpose, uncons, unfoldr, unzip, unzip3, zip, zip3, zipWith, (++))
import GHC.Exts (sortWith)
cycle :: [a] -> [a]
cycle :: [a] -> [a]
cycle [] = []
cycle [a]
xs = [a]
cycledList
where
cycledList :: [a]
cycledList = [a]
xs [a] -> [a] -> [a]
forall a. [a] -> [a] -> [a]
++ [a]
cycledList