(original) (raw)

{-# LANGUAGE Safe #-} -- This module deliberately declares orphan instances: {-# OPTIONS_GHC -Wno-orphans #-}


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

-- Optional instance of 'Text.Show.Show' for functions:

-- > instance Show (a -> b) where -- > showsPrec _ _ = showString ""


module Text.Show.Functions () where

-- | @since 2.01 instance Show (a -> b) where showsPrec :: Int -> (a -> b) -> ShowS showsPrec Int _ a -> b _ = String -> ShowS showString String ""