Haskell: Obtaining the Nth element in a Snoc list - haskell
I wrote the following function to find the Nth element on a given Snoc list (reverse cons) but I think it's not the most optimal solution to the problem. I was wondering if you would please share some insights, code or advice to see a different solution; one that you might consider does the job more efficiently:
Here's my function:
data ListS a = NilS
|Snoc (ListS a) a deriving Show
len :: ListS a -> Int
len NilS = 0
len (Snoc a b) = 1 + len(a)
nthElementS :: Int -> ListS a -> a
nthElementS _ NilS = error "Empty List"
nthElementS n s = if n < 0 || n >= len(s) then error "Invalid Index"
else nthAux ((len(s)-1)-n) s where
nthAux 0 (Snoc a b) = b
nthAux m (Snoc a b) = nthAux (m-1) a
Some examples:
Main> nthElementS 0 (Snoc (Snoc (Snoc (Snoc (Snoc NilS 1) 2) 3) 4) 5)
1
Main> nthElementS 2 (Snoc (Snoc (Snoc (Snoc (Snoc NilS 1) 2) 3) 4) 5)
3
As an additional inquiry: What would be the best way to implement a function that concatenates 2 Snoc lists? I am already thinking of a solution but it would require an auxiliary function to keep track of the Nth position, and again, I feel that's not going to make full use of Haskell's advantages over other languages.
Thanks in advance.
We can use a "try-and-error" approach where we first try to find that element in the "prefix list", and if that is not sufficient (since the index is larger), we then try the current element. If that still is not enough, it is up to the "parent call" to handle the situation. We can do this by first defining a function with a slightly different output type:
nthShelp :: Int -> ListS a -> Either a Int
So it returns Left x in case it has found the element (x being the element), or Rightn, withn` the "remaining" elements it needs to walk through.
So we can define this with:
nthShelp :: Int -> ListS a -> Either a Int
nthShelp n NilS = Right n
nthShelp n (Snoc hs t) = progress nhs
where nhs = nthElementS n hs
progress lx#(Left _) = lx
progress (Right 0) = Left t
progress (Right n) = Right (n-1)
So we first call recursively on the head of the list, and then the recursive calls are resolved by decrementing the index until it hits zero, in which case we return the corresponding Left t, and that Left t is than passed back out of the recursive calls.
We can make use of the fact that Either a is a Monad istance, and write this more effective like:
nthShelp :: Int -> ListS a -> Either a Int
nthShelp n NilS = Right n
nthShelp n (Snoc hs t) = nthElementS n hs >>= progress
where progress 0 = Left t
progress n = Right (n-1)
Then we can write nthElementS in terms of nthShelp with:
nthElementS :: Int -> ListS a -> a
nthElementS n l | n < 0 = error "Index too small"
| Left a <- nthShelp n l = a
| otherwise = error "Index too large"
In terms of time complexity, it is still O(n) (with n the length of the list, not the index we want to obtain). There is no way to do it better with this data structure, since we need to know the number of elements in the prefix, before we know what element to return.
As an additional inquiry: What would be the best way to implement a function that concatenates 2 Cons lists? I am already thinking of a solution but it would require an auxiliary function to keep track of the Nth position, and again, I feel that's not going to make full use of Haskell's advantages over other languages.
Well you can see a concatenation here as replacing the (usally deeply) nested NlS of the second list, by the first list. So if we concatenate concatS l1 NilS, then it is l1, if we concatenate concatS l1 (Snoc NilS x), then it is Snic l1 x). So we can define this recursively as:
concatS :: ListS a -> ListS a -> ListS a
concatS l1 NilS = l1
concatS l1 (Snoc l2 x) = Snoc (concatS l1 l2) x
A disadvantage of the above approach is that it still will work in O(n) if the first list is NilS (so empty). We can add a guard for this, to handle that case:
concatS :: ListS a -> ListS a -> ListS a
concatS NilS = id
concatS l1 = go
where go NilS = l1
go (Snoc l2 x) = Snoc (go l2) x
Related
Split a tuple into n parts
I am trying to create a function that receives a range of doubles (Double, Double) and an n (Int), where I divide this interval into n equal parts. I know that if it was a list, I did a Split in the list, but being in tuples and getting Doubles, I'm not sure what to do. Thank you for any help
This is similar to #mschmidt's answer, but I think a list comprehension is probably clearest: intervals :: Int -> (Double,Double) -> [(Double,Double)] intervals n (a,b) = let n' = fromIntegral n d = (b - a) / n' in [(a + i*d, a + (i+1)*d) | i <- [0..n'-1]] giving: > intervals 4 (1,10) [(1.0,3.25),(3.25,5.5),(5.5,7.75),(7.75,10.0)] > If the duplicate calculation of the endpoint offends you, you could write: intervals' :: Int -> (Double,Double) -> [(Double,Double)] intervals' n (a,b) = let n' = fromIntegral n d = (b - a) / n' x = [a + i*d | i <- [0..n']] in zip x (tail x) Note that zip x (tail x) is a pretty standard way to get tuples of consecutive pairs of a list: > let x = [1,2,3,4] in zip x (tail x) [(1,2),(2,3),(3,4)] >
A rough sketch, probably not the most elegant solution: Take the two input doubles (I call them l and u) and compute the width of the input range/interval. You want to compute n output ranges of equal width w. Compute this w by dividing the input width by n. Build a list of length n containing the values l+0*w, l+1*w, l+2*w, ... Build the list of output tuples by combining the first two items in the list into a tuple. Drop one element of the list. Continue until only one element remains. Try to catch all possible errors
Using fold* to grow a list in Haskell
I'm trying to solve the following problem in Haskell: given an integer return the list of its digits. The constraint is I have to only use one of the fold* functions (* = {r,l,1,l1}). Without such constraint, the code is simple: list_digits :: Int -> [Int] list_digits 0 = [] list_digits n = list_digits r ++ [n-10*r] where r = div n 10 But how do I use fold* to, essentially grow a list of digits from an empty list? Thanks in advance.
Is this a homework assignment? It's pretty strange for the assignment to require you to use foldr, because this is a natural use for unfoldr, not foldr. unfoldr :: (b -> Maybe (a, b)) -> b -> [a] builds a list, whereas foldr :: (a -> b -> b) -> b -> [a] -> b consumes a list. An implementation of this function using foldr would be horribly contorted. listDigits :: Int -> [Int] listDigits = unfoldr digRem where digRem x | x <= 0 = Nothing | otherwise = Just (x `mod` 10, x `div` 10) In the language of imperative programming, this is basically a while loop. Each iteration of the loop appends x `mod` 10 to the output list and passes x `div` 10 to the next iteration. In, say, Python, this'd be written as def list_digits(x): output = [] while x > 0: output.append(x % 10) x = x // 10 return output But unfoldr allows us to express the loop at a much higher level. unfoldr captures the pattern of "building a list one item at a time" and makes it explicit. You don't have to think through the sequential behaviour of the loop and realise that the list is being built one element at a time, as you do with the Python code; you just have to know what unfoldr does. Granted, programming with folds and unfolds takes a little getting used to, but it's worth it for the greater expressiveness. If your assignment is marked by machine and it really does require you to type the word foldr into your program text, (you should ask your teacher why they did that and) you can play a sneaky trick with the following "id[]-as-foldr" function: obfuscatedId = foldr (:) [] listDigits = obfuscatedId . unfoldr digRem
Though unfoldr is probably what the assignment meant, you can write this using foldr if you use foldr as a hylomorphism, that is, building up one list while it tears another down. digits :: Int -> [Int] digits n = snd $ foldr go (n, []) places where places = replicate num_digits () num_digits | n > 0 = 1 + floor (logBase 10 $ fromIntegral n) | otherwise = 0 go () (n, ds) = let (q,r) = n `quotRem` 10 in (q, r : ds) Effectively, what we're doing here is using foldr as "map-with-state". We know ahead of time how many digits we need to output (using log10) just not what those digits are, so we use unit (()) values as stand-ins for those digits. If your teacher's a stickler for just having a foldr at the top-level, you can get away with making go partial: digits' :: Int -> [Int] digits' n = foldr go [n] places where places = replicate num_digits () num_digits | n > 0 = floor (logBase 10 $ fromIntegral n) | otherwise = 0 go () (n:ds) = let (q,r) = n `quotRem` 10 in (q:r:ds) This has slightly different behaviour on non-positive numbers: >>> digits 1234567890 [1,2,3,4,5,6,7,8,9,0] >>> digits' 1234567890 [1,2,3,4,5,6,7,8,9,0] >>> digits 0 [] >>> digits' 0 [0] >>> digits (negate 1234567890) [] >>> digits' (negate 1234567890) [-1234567890]
How to efficiently generate all lists of length `n^2` containing `n` copies of every `x < n`?
Given an integer n, how can I build the list containing all lists of length n^2 containing exactly n copies of each integer x < n? For example, for n = 2, we have: [0,0,1,1], [0,1,0,1], [1,0,0,1], [0,1,1,0], [1,0,1,0], [1,1,0,0] This can be easily done combining permutations and nub: f :: Int -> [[Int]] f n = nub . permutations $ concatMap (replicate n) [0..n-1] But that is way too inefficient. Is there any simple way to encode the efficient/direct algorithm?
Sure, it's not too hard. We'll start with a list of n copies of each number less than n, and repeatedly choose one to start our result with. First, a function for choosing an element from a list: zippers :: [a] -> [([a], a, [a])] zippers = go [] where go l (h:r) = (l,h,r) : go (h:l) r go _ [] = [] Now we'll write a function that produces all possible interleavings of some input lists. Internally we'll maintain the invariant that each [a] is non-empty; hence we'll have to establish that invariant before we start recursing. In fact, this will be wasted work in the way we intend to call this function, but for good abstraction we might as well handle all inputs correctly, right? interleavings :: [[a]] -> [[a]] interleavings = go . filter (not . null) where go [] = [[]] go xss = do (xssl, x:xs, xssr) <- zippers xss (x:) <$> interleavings ([xs | not (null xs)] ++ xssl ++ xssr) And now we're basically done. All we have to do is feed in an appropriate starting list. f :: Int -> [[Int]] f n = interleavings (replicate n <$> [1..n]) Try it in ghci: > f 2 [[1,1,2,2],[1,2,2,1],[1,2,1,2],[2,2,1,1],[2,1,1,2],[2,1,2,1]]
Finding mean of list in Haskell
I think my code to find the mean of a list (of integers) works ok, but has a problem. This is my code listlen xs = if null xs then 0 else 1 + (listlen (tail xs)) sumx xs = if null xs then 0 else (head xs) + sumx (tail xs) mean xs = if null xs then 0 else (fromIntegral (sumx xs)) / (fromIntegral (listlen xs)) my mean function has to go through the list twice. Once to get the sum of the elements, and once to get the number of elements. Obviously this is not great. I would like to know a more efficient way to do this (using elementary Haskell - this is a a question from Real World Haskell chapter 3.)
I like the other answers here. But I don't like that they write their recursion by hand. There are lots of ways to do this, but one handy one is to reuse the Monoid machinery we have in place. Data.Monoid Data.Foldable> foldMap (\x -> (Sum x, Sum 1)) [15, 17, 19] (Sum {getSum = 51}, Sum {getSum = 3}) The first part of the pair is the sum, and the second part is the length (computed as the sum of as many 1s as there are elements in the list). This is a quite general pattern: many statistics can actually be cast as monoids; and pairs of monoids are monoids; so you can compute as many statistics about a thing as you like in one pass using foldMap. You can see another example of this pattern in this question, which is where I got the idea.
What #simonzack is alluding to is that you should write listlen and sumx as folds. Here is listlen written as a fold: listlen :: [a] -> Int listlen xs = go 0 xs -- 0 = initial value of accumulator where go s [] = s -- return accumulator go s (a:as) = go (s+1) as -- compute the next value of the accumulator -- and recurse Here s is an accumulator which is passed from one iteration of the helper function go to the next iteration. It is the value returned when the end of the list has been reached. Writing sumx as a fold will look like: sumx :: [a] -> Int sumx xs = go 0 xs where go s [] = s go s (a:as) = go ... as -- flll in the blank ... The point is that given two folds you can always combine them so they are computed together. lenAndSum :: [a] -> (Int,Int) lenAndSum xs = go (0,0) xs -- (0,0) = initial values of both accumulators where go (s1,s2) [] = (s1,s2) -- return both accumulators at the end go (s1,s2) (a:as) = go ... as -- left as an exercise Now you have computed both functions with one traversal of the list.
Define a helper function that only goes through once: lengthAndSum xs = if null xs then (0,0) else let (a,b) = lengthAndSum(tail xs) in (a + 1, b + head xs) mean xs = let (a, b) = lengthAndSum xs in (fromIntegral b / fromIntegral a)
Now, there's an idea: a function that takes a bunch of monoids and applies each to a list, all at the same time. But that can come later! I think what you'll need is a fold and a tuple for a good speed: avg :: (Fractional a) => [a] -> a avg [] = error "Cannot take average of empty list" avg nums = let (sum,count) = foldr (\e (s,c) -> (s+e,c+1)) (0,0) nums in sum / count I've tried this out, and it's decently speedy in GHCi, though It may not be the best. I thought up a recursive method, too, though it requires a helper function: avg :: (Fractional a) => [a] -> a avg [] = error "Cannot take average of empty list" avg nums = let (sum, count) = go nums in sum / count where go [] = (0,0) go (x:xs) = let (sum',count') = go xs in (sum' + x, count' + 1) Then again, that's really slow. Painfully slow. Looking at your solution, that's alright, but it's not really idiomatic Haskell. if statements within functions tend to work better as pattern matches, especially if the Eq class instance isn't defined for such-and-such a datatype. Furthermore, as my example illustrated, folds are beautiful! They allow Haskell to be lazy and therefore are faster. That's my feedback and my suggestion in response to your question.
Dovetail iteration over infinite lists in Haskell
I want to iterate 2 (or 3) infinite lists and find the "smallest" pair that satisfies a condition, like so: until pred [(a,b,c) | a<-as, b<-bs, c<-cs] where pred (a,b,c) = a*a + b*b == c*c as = [1..] bs = [1..] cs = [1..] The above wouldn't get very far, as a == b == 1 throughout the run of the program. Is there a nice way to dovetail the problem, e.g. build the infinite sequence [(1,1,1),(1,2,1),(2,1,1),(2,1,2),(2,2,1),(2,2,2),(2,2,3),(2,3,2),..] ? Bonus: is it possible to generalize to n-tuples?
There's a monad for that, Omega. Prelude> let as = each [1..] Prelude> let x = liftA3 (,,) as as as Prelude> let x' = mfilter (\(a,b,c) -> a*a + b*b == c*c) x Prelude> take 10 $ runOmega x' [(3,4,5),(4,3,5),(6,8,10),(8,6,10),(5,12,13),(12,5,13),(9,12,15),(12,9,15),(8,15,17),(15,8,17)] Using it's applicative features, you can generalize to arbitrary tuples: quadrupels = (,,,) <$> as <*> as <*> as <*> as -- or call it liftA4 But: this alone does not eliminate duplication, of course. It only gives you proper diagonalization. Maybe you could use monad comprehensions together with an approach like Thomas's, or just another mfilter pass (restricting to b /= c, in this case).
List comprehensions are great (and concise) ways to solve such problems. First, you know you want all combinations of (a,b,c) that might satisfy a^2 + b^2 = c^2 - a helpful observation is that (considering only positive numbers) it will always be the case that a <= c && b <= c. To generate our list of candidates we can thus say c ranges from 1 to infinity while a and b range from one to c. [(a,b,c) | c <- [1..], a <- [1..c], b <- [1..c]] To get to the solution we just need to add your desired equation as a guard: [(a,b,c) | c <- [1..], a <- [1..c], b <- [1..c], a*a+b*b == c*c] This is inefficient, but the output is correct: [(3,4,5),(4,3,5),(6,8,10),(8,6,10),(5,12,13),(12,5,13),(9,12,15)... There are more principled methods than blind testing that can solve this problem.
{- It depends on what is "smallest". But here is a solution for a concept of "smallest" if tuples were compared first by their max. number and then by their total sum. (You can just copy and paste my whole answer into a file as I write the text in comments.) We will need nub later. -} import Data.List (nub) {- Just for illustration: the easy case with 2-tuples. -} -- all the two-tuples where 'snd' is 'n' tuples n = [(i, n) | i <- [1..n]] -- all the two-tuples where 'snd' is in '1..n' tuplesUpTo n = concat [tuples i | i <- [1..n]] {- To get all results, you will need to insert the flip of each tuple into the stream. But let's do that later and generalize first. Building tuples of arbitrary length is somewhat difficult, so we will work on lists. I call them 'kList's, if they have a length 'k'. -} -- just copied from the tuples case, only we need a base case for k=1 and -- we can combine all results utilizing the list monad. kLists 1 n = [[n]] kLists k n = do rest <- kLists (k-1) n add <- [1..head rest] return (add:rest) -- same as above. all the klists with length k and max number of n kListsUpTo k n = concat [kLists k i | i <- [1..n]] -- we can do that unbounded as well, creating an infinite list. kListsInf k = concat [kLists k i | i <- [1..]] {- The next step is rotating these lists around, because until now the largest number is always in the last place. So we just look at all rotations to get all the results. Using nub here is admittedly awkward, you can improve that. But without it, lists where all elements are the same are repeated k times. -} rotate n l = let (init, end) = splitAt n l in end ++ init rotations k l = nub [rotate i l | i <- [0..k-1]] rotatedKListsInf k = concatMap (rotations k) $ kListsInf k {- What remains is to convert these lists into tuples. This is a bit awkward, because every n-tuple is a separate type. But it's straightforward, of course. -} kListToTuple2 [x,y] = (x,y) kListToTuple3 [x,y,z] = (x,y,z) kListToTuple4 [x,y,z,t] = (x,y,z,t) kListToTuple5 [x,y,z,t,u] = (x,y,z,t,u) kListToTuple6 [x,y,z,t,u,v] = (x,y,z,t,u,v) {- Some tests: *Main> take 30 . map kListToTuple2 $ rotatedKListsInf 2 [(1,1),(1,2),(2,1),(2,2),(1,3),(3,1),(2,3),(3,2),(3,3),(1,4),(4,1),(2,4),(4,2),(3,4), (4,3),(4,4),(1,5),(5,1),(2,5),(5,2),(3,5),(5,3),(4,5),(5,4),(5,5),(1,6),(6,1), (2,6), (6,2), (3,6)] *Main> take 30 . map kListToTuple3 $ rotatedKListsInf 3 [(1,1,1),(1,1,2),(1,2,1),(2,1,1),(1,2,2),(2,2,1),(2,1,2),(2,2,2),(1,1,3),(1,3,1), (3,1,1),(1,2,3),(2,3,1),(3,1,2),(2,2,3),(2,3,2),(3,2,2),(1,3,3),(3,3,1),(3,1,3), (2,3,3),(3,3,2),(3,2,3),(3,3,3),(1,1,4),(1,4,1),(4,1,1),(1,2,4),(2,4,1),(4,1,2)] Edit: I realized there is a bug: Just rotating the ordered lists isn't enough of course. The solution must be somewhere along the lines of having rest <- concat . map (rotations (k-1)) $ kLists (k-1) n in kLists, but then some issues with repeated outputs arise. You can figure that out, I guess. ;-) -}
It really depends on what you mean by "smallest", but I assume you want to find a tuple of numbers with respect to its maximal element - so (2,2) is less than (1,3) (while standard Haskell ordering is lexicographic). There is package data-ordlist, which is aimed precisely at working with ordered lists. It's function mergeAll (and mergeAllBy) allows you to combine a 2-dimensional matrix ordered in each direction into an ordered list. First let's create a desired comparing function on tuples: import Data.List (find) import Data.List.Ordered compare2 :: (Ord a) => (a, a) -> (a, a) -> Ordering compare2 x y = compare (max2 x, x) (max2 y, y) where max2 :: Ord a => (a, a) -> a max2 (x, y) = max x y Then using mergeAll we create a function that takes a comparator, a combining function (which must be monotonic in both arguments) and two sorted lists. It combines all possible elements from the two lists using the function and produces a result sorted list: mergeWith :: (b -> b -> Ordering) -> (a -> a -> b) -> [a] -> [a] -> [b] mergeWith cmp f xs ys = mergeAllBy cmp $ map (\x -> map (f x) xs) ys With this function, it's very simple to produce tuples ordered according to their maximum: incPairs :: [(Int,Int)] incPairs = mergeWith compare2 (,) [1..] [1..] Its first 10 elements are: > take 10 incPairs [(1,1),(1,2),(2,1),(2,2),(1,3),(2,3),(3,1),(3,2),(3,3),(1,4)] and when we (for example) look for the first pair whose sum of squares is equal to 65: find (\(x,y) -> x^2+y^2 == 65) incPairs we get the correct result (4,7) (as opposed to (1,8) if lexicographic ordering were used).
This answer is for a more general problem for a unknown predicate. If the predicate is known, more efficient solutions are possible, like others have listed solutions based on knowledge that you don't need to iterate for all Ints for a given c. When dealing with infinite lists, you need to perform breadth-first search for solution. The list comprehension only affords depth-first search, that is why you never arrive at a solution in your original code. counters 0 xs = [[]] counters n xs = concat $ foldr f [] gens where gens = [[x:t | t <- counters (n-1) xs] | x <- xs] f ys n = cat ys ([]:n) cat (y:ys) (x:xs) = (y:x): cat ys xs cat [] xs = xs cat xs [] = [xs] main = print $ take 10 $ filter p $ counters 3 [1..] where p [a,b,c] = a*a + b*b == c*c counters generates all possible counters for values from the specified range of digits, including a infinite range. First, we obtain a list of generators of valid combinations of counters - for each permitted digit, combine it with all permitted combinations for counters of smaller size. This may result in a generator that produces a infinite number of combinations. So, we need to borrow from each generator evenly. So gens is a list of generators. Think of this as a list of all counters starting with one digit: gens !! 0 is a list of all counters starting with 1, gens !! 1 is a list of all counters starting with 2, etc. In order to borrow from each generator evenly, we could transpose the list of generators - that way we would get a list of first elements of the generators, followed by a list of second elements of the generators, etc. Since the list of generators may be infinite, we cannot afford to transpose the list of generators, because we may never get to look at the second element of any generator (for a infinite number of digits we'd have a infinite number of generators). So, we enumerate the elements from the generators "diagonally" - take first element from the first generator; then take the second element from the first generator and the first from the second generator; then take the third element from the first generator, the second from the second, and the first element from the third generator, etc. This can be done by folding the list of generators with a function f, which zips together two lists - one list is the generator, the other is the already-zipped generators -, the beginning of one of them being offset by one step by adding []: to the head. This is almost zipWith (:) ys ([]:n) - the difference is that if n or ys is shorter than the other one, we don't drop the remainder of the other list. Note that folding with zipWith (:) ys n would be a transpose.
For this answer I will take "smallest" to refer to the sum of the numbers in the tuple. To list all possible pairs in order, you can first list all of the pairs with a sum of 2, then all pairs with a sum of 3 and so on. In code pairsWithSum n = [(i, n-i) | i <- [1..n-1]] xs = concatMap pairsWithSum [2..] Haskell doesn't have facilities for dealing with n-tuples without using Template Haskell, so to generalize this you will have to switch to lists. ntuplesWithSum 1 s = [[s]] ntuplesWithSum n s = concatMap (\i -> map (i:) (ntuplesWithSum (n-1) (s-i))) [1..s-n+1] nums n = concatMap (ntuplesWithSum n) [n..]
Here's another solution, with probably another slightly different idea of "smallest". My order is just "all tuples with max element N come before all tuples with max element N+1". I wrote the versions for pairs and triples: gen2_step :: Int -> [(Int, Int)] gen2_step s = [(x, y) | x <- [1..s], y <- [1..s], (x == s || y == s)] gen2 :: Int -> [(Int, Int)] gen2 n = concatMap gen2_step [1..n] gen2inf :: [(Int, Int)] gen2inf = concatMap gen2_step [1..] gen3_step :: Int -> [(Int, Int, Int)] gen3_step s = [(x, y, z) | x <- [1..s], y <- [1..s], z <- [1..s], (x == s || y == s || z == s)] gen3 :: Int -> [(Int, Int, Int)] gen3 n = concatMap gen3_step [1..n] gen3inf :: [(Int, Int, Int)] gen3inf = concatMap gen3_step [1..] You can't really generalize it to N-tuples, though as long as you stay homogeneous, you may be able to generalize it if you use arrays. But I don't want to tie my brain into that knot.
I think this is the simplest solution if "smallest" is defined as x+y+z because after you find your first solution in the space of Integral valued pythagorean triangles, your next solutions from the infinite list are bigger. take 1 [(x,y,z) | y <- [1..], x <- [1..y], z <- [1..x], z*z + x*x == y*y] -> [(4,5,3)] It has the nice property that it returns each symmetrically unique solution only once. x and z are also infinite, because y is infinite. This does not work, because the sequence for x never finishes, and thus you never get a value for y, not to mention z. The rightmost generator is the innermost loop. take 1 [(z,y,x)|z <- [1..],y <- [1..],x <- [1..],x*x + y*y == z*z]
Sry, it's quite a while since I did haskell, so I'm going to describe it with words. As I pointed out in my comment. It is not possible to find the smallest anything in an infinite list, since there could always be a smaller one. What you can do is, have a stream based approach that takes the lists and returns a list with only 'valid' elements, i. e. where the condition is met. Lets call this function triangle You can then compute the triangle list to some extent with take n (triangle ...) and from this n elements you can find the minium.