# Copyright (c) Facebook, Inc. and its affiliates.
#
# This source code is licensed under the MIT license found in the
# LICENSE file in the root directory of this source tree.
#
-f PartialF.foo
===
 module PartialF where
 
 foo :: Int -> Int -> Int
 foo x y = x + y
 
 main :: IO ()
 main = do
   -- fold tests
-  print (6 + 7)
-  print $ map (\ y -> 5 + y) [1..4]
-  print $ zipWith (\ x y -> x + y) [1..3] [10..]
+  print (foo 6 7)
+  print $ map (foo 5) [1..4]
+  print $ zipWith foo [1..3] [10..]