Hi, There,

I am using GHC 2.06 for Win32 and why does GHC complain about "possibly 
incomplete patterns"? Source file and error message are as follows. 
Thanks.

-Gary

Source File "a.hs":

=====================
module Main where

main = putStrLn $ (merge "Hello!" "World")

merge :: String -> String -> String
merge (a:as) (b:bs) = b : merge as bs
merge [] bs = bs
merge as [] = as
=====================

GHC's complaint:

=====================
bash$ ghc -o a a.hs
a.hs:8:
    Warning: Possibly incomplete patterns
        in the definition of function `merge'
Module version unchanged at 3
=====================

Reply via email to