(original) (raw)

{-# LANGUAGE NoImplicitPrelude #-} {-# LANGUAGE Safe #-}


-- Maintainer : libraries@haskell.org -- Stability : experimental -- Portability : portable

-- This legacy module provides access to the list-specialised operations -- of "Data.List". This module may go away again in future GHC versions and -- is provided as transitional tool to access some of the list-specialised -- operations that had to be generalised due to the implementation of the -- <https://wiki.haskell.org/Foldable_Traversable_In_Prelude Foldable/Traversable-in-Prelude Proposal (FTP)>.

-- @since 4.8.0.0

module GHC.OldList (module Data.OldList) where

import Data.OldList