Hi,
Use ScopedTypeVariables and forall:
{-# LANGUAGE ScopedTypeVariables #-}
skips :: forall a. [a] -> [[a]]
skips xs = go 1 [] where
go :: Int -> [[a]] -> [[a]]
...
Hi all,
skips :: [a] -> [[a]]skips xs = go 1 [] wherego :: Int -> [[a]] -> [[a]] -- Compiles if i remove this linego n acc| n > (length xs) = acc| n == 1 = xs : (go (n+1) acc)| n < 1 = []| otherwise = (everyN n xs) : (go (n+1) acc)
everyN :: Int -> [a] -> [a]everyN n xs =case (drop (n-1) xs) ofy:ys -> y : (everyN n ys)[] -> []
How can i tell haskell compiler that a is the sub program if the same as a in the main program?
--
Best Regards,Boon Hui
_______________________________________________ Beginners mailing list Beginners@haskell.org http://mail.haskell.org/cgi-bin/mailman/listinfo/beginners