0

我将如何结合以下两个功能:

replaceNth n newVal (x:xs)
 | n == 0 = newVal:xs
 | otherwise = x:replaceNth (n-1) newVal xs

replaceMthNth m n v arg = replaceNth m (replaceNth n v (arg !! m)) arg

成一个单一的功能?

是否可以?

4

5 回答 5

3

这是非常可怕的,但它可以完成工作:

replacemn 0 0 z ((x : xs) : xss) = (z : xs) : xss
replacemn 0 n z ((x : xs) : xss) =
  let (ys : yss) = replacemn 0 (n-1) z (xs : xss)
  in ((x : ys) : yss)
replacemn m n z (xs:xss) = xs : replacemn (m-1) n z xss
于 2011-05-04T00:17:28.193 回答
2

功能组成

Haskell 中的函数可以免费组合。例如,给定两个函数fg,您可以将它们组合成一个新函数:f . g,它适用g于参数,然后适用f于结果。您应该可以在这里以相同的方式使用合成。

于 2011-05-03T23:20:18.140 回答
2

好的,这里在全局命名空间中没有其他命名函数,或者使用任何whereorlet子句或任何其他全局函数。

{-# LANGUAGE ScopedTypeVariables,RankNTypes #-}
module Temp where
newtype Mu a = Mu (Mu a -> a)

replaceMthNth :: Int -> Int -> a -> [[a]] -> [[a]]
replaceMthNth = (\h (f :: Int -> forall b . b -> [b] -> [b]) -> h f f)
                  ( \replaceNth replaceNth' ->
                    -- definition of replaceMthNth in terms of some replaceNth and replaceNth'
                    \m n v arg -> replaceNth m (replaceNth' n v (arg !! m)) arg
                  )
                  $
                    -- y combinator
                    ((\f -> (\h -> h $ Mu h) $ \x -> f $ (\(Mu g) -> g) x $ x) :: (a -> a) -> a) $
                    (\replaceNth ->
                      -- definition of replaceNth given a recursive definition 
                      (\(n::Int) newVal xs -> case xs of
                          [] -> []
                          (x:xs) -> if n == 0 then newVal:xs else x:replaceNth (n-1) newVal xs
                      )
                    )
于 2011-05-04T01:02:50.187 回答
1

我根本不明白问题是什么:),但这是我将如何实现它:

modifyNth :: Int -> (a -> a) -> [a] -> [a]
modifyNth n f (x:xs)
  | n == 0 = f x : xs
  | otherwise = x : modifyNth (n-1) f xs

replaceNthMth :: Int -> Int -> a -> [[a]] -> [[a]]
replaceNthMth m n v = modifyNth m (modifyNth n (const v))

这样您就不需要遍历列表两次(第一次使用!!,第二次使用replaceNth

于 2011-05-04T03:03:44.273 回答
0

这是一个怪诞的实现,它使用嵌套列表推导在具有无限列表的 zip 上重建 2d 列表结构:

replaceMthNth :: Int -> Int -> a -> [[a]] -> [[a]]
replaceMthNth m n v ass = [[if (x,y) == (m,n) then v else a
                            | (y, a) <- zip [0..] as]
                           | (x, as) <- zip [0..] ass]
于 2011-05-04T07:46:36.567 回答