Difference between revisions of "Implicit parameters"

From HaskellWiki
Jump to navigation Jump to search
Line 1: Line 1:
{{GHCUsersGuide|https://downloads.haskell.org/~ghc/latest/docs/html/users_guide/glasgow_exts.html#implicit-parameters Implicit Parameters section}}
+
{{GHCUsersGuide|glasgow_exts|implicit-parameters|Implicit Parameters section}}
   
 
Working example:
 
Working example:

Revision as of 23:03, 13 November 2016

The GHC Users Guide has Implicit Parameters section.

Working example:

{-# LANGUAGE ImplicitParams #-}

import Data.List (sortBy)

sortBy' :: (?cmp :: a -> a -> Ordering) => [a] -> [a]
sortBy' = sortBy ?cmp
sort :: Ord a => [a] -> [a]
sort = let ?cmp = compare in sortBy'

main = putStrLn (show (sort [3,1,2]))