Skip to content
Snippets Groups Projects
Commit 5d0a0edc authored by Hécate Moonlight's avatar Hécate Moonlight
Browse files

remove Bug873

parent b07b5ab2
No related branches found
No related tags found
No related merge requests found
-- Hoogle documentation, generated by Haddock
-- See Hoogle, http://www.haskell.org/hoogle/
@package test
@version 0.0.0
module Bug873
-- | Application operator. This operator is redundant, since ordinary
-- application <tt>(f x)</tt> means the same as <tt>(f <a>$</a> x)</tt>.
-- However, <a>$</a> has low, right-associative binding precedence, so it
-- sometimes allows parentheses to be omitted; for example:
--
-- <pre>
-- f $ g $ h x = f (g (h x))
-- </pre>
--
-- It is also useful in higher-order situations, such as <tt><a>map</a>
-- (<a>$</a> 0) xs</tt>, or <tt><a>zipWith</a> (<a>$</a>) fs xs</tt>.
--
-- Note that <tt>(<a>$</a>)</tt> is levity-polymorphic in its result
-- type, so that <tt>foo <a>$</a> True</tt> where <tt>foo :: Bool -&gt;
-- Int#</tt> is well-typed.
($) :: forall (r :: RuntimeRep) a (b :: TYPE r). (a -> b) -> a -> b
infixr 0 $
($$) :: (a -> b) -> a -> b
infixr 0 $$
{-# LANGUAGE Haskell2010 #-}
module Bug873 (($), ($$)) where
infixr 0 $$
($$) :: (a -> b) -> a -> b
f $$ x = f x
0% Loading or .
You are about to add 0 people to the discussion. Proceed with caution.
Finish editing this message first!
Please register or to comment