(original) (raw)

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


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

-- Converting values to readable strings: -- the 'Show' class and associated functions.


module Text.Show ( ShowS, Show(showsPrec, show, showList), shows, showChar, showString, showParen, showListWith, ) where

import GHC.Show

-- | Show a list (using square brackets and commas), given a function -- for showing elements. showListWith :: (a -> ShowS) -> [a] -> ShowS showListWith = showList__