Difference between revisions of "Haskell Quiz/Grid Folding/Solution Dolio"

From HaskellWiki
Jump to navigation Jump to search
(creation)
 
m (unify folder)
Line 17: Line 17:
   
 
grid n = break . map return $ [1..(n*n)]
 
grid n = break . map return $ [1..(n*n)]
where
+
where break [] = []
 
break l = let (h,t) = splitAt n l in h : break t
break [] = []
 
break l = let (h,t) = splitAt n l in h : break t
 
   
fold T = vfolder vzipper
+
fold T = folder vzipper
fold B = vfolder (flip vzipper)
+
fold B = folder (flip vzipper)
fold L = hfolder hzipper
+
fold L = map (folder hzipper)
fold R = hfolder (flip hzipper)
+
fold R = map (folder $ flip hzipper)
   
 
vzipper = zipWith (zipWith ((++) . reverse)) . reverse
 
vzipper = zipWith (zipWith ((++) . reverse)) . reverse
 
hzipper = zipWith (++) . (map reverse . reverse)
 
hzipper = zipWith (++) . (map reverse . reverse)
   
vfolder z = uncurry z . ap (flip splitAt) (flip div 2 . length)
+
folder z = uncurry z . ap (flip splitAt) (flip div 2 . length)
hfolder z = map (uncurry z . ap (flip splitAt) (flip div 2 . length))
 
   
 
pp = unlines . map unwords . map (map show)
 
pp = unlines . map unwords . map (map show)

Revision as of 17:37, 27 October 2006


The basis for my solution is simple. Consider each square to be a single-element list initially. Then, a row of such squares is a list of such lists. An entire grid is then a list of those lists.

When folding horizontally, one splits each row, reverses the half to go on top (as well as its elements, since they'll be flipped), and zips the two halves together by appending corresponding elements. This results in a top-first list of the stacked squares.

When folding vertically, one splits the grid in half, reverses the half to go on top, and zips the two grid halves together. The function that combines corresponding rows is yet another zip that appends corresponding elements (again, reversing the ones on top).

This doesn't do any fancy error checking. The method above results in null lists for invalid sequences of folds, and will result in blank output. Sequences that are too short to stack all the squares will result in a representation of whatever the grid would look be at the end of that sequence.

module Main where
import Control.Monad.Reader
import System

data Direction = R | L | T | B deriving (Show, Read)

grid n = break . map return $ [1..(n*n)]
 where break [] = []
       break l  = let (h,t) = splitAt n l in h : break t

fold T = folder vzipper
fold B = folder (flip vzipper)
fold L = map (folder hzipper)
fold R = map (folder $ flip hzipper)

vzipper = zipWith (zipWith ((++) . reverse)) . reverse
hzipper = zipWith (++) . (map reverse . reverse)

folder z = uncurry z . ap (flip splitAt) (flip div 2 . length)

pp = unlines . map unwords . map (map show)

main = do [n, s] <- getArgs
          putStr . pp . foldl (flip fold) (grid $ read n) . map (read . return) $ s