-
Notifications
You must be signed in to change notification settings - Fork 0
/
Copy pathDay05.hs
103 lines (76 loc) · 2.34 KB
/
Day05.hs
1
2
3
4
5
6
7
8
9
10
11
12
13
14
15
16
17
18
19
20
21
22
23
24
25
26
27
28
29
30
31
32
33
34
35
36
37
38
39
40
41
42
43
44
45
46
47
48
49
50
51
52
53
54
55
56
57
58
59
60
61
62
63
64
65
66
67
68
69
70
71
72
73
74
75
76
77
78
79
80
81
82
83
84
85
86
87
88
89
90
91
92
93
94
95
96
97
98
99
100
101
102
103
{-# LANGUAGE RecordWildCards #-}
module Day05 where
import Control.Monad
import Data.Array (Array)
import Data.Char
import Data.Foldable
import Data.Maybe
import Text.ParserCombinators.ReadP
import Harness
import ParseHelper
import qualified Data.Array as A
import qualified Data.List as L
main :: IO ()
main = getInputAndSolve (parseInputRaw parseFullInput) (topOfStacks reverse) (topOfStacks id)
-- SOLVE
topOfStacks :: ([Crate] -> [Crate]) -> (Array Int CrateStack, [Instruction]) -> String
topOfStacks moveModifier (initial, instrs) =
mapMaybe (fmap fromCrate . listToMaybe . fromStack)
. toList
$ L.foldl' move initial instrs
where
move :: Array Int CrateStack -> Instruction -> Array Int CrateStack
move stacks Instruction {..} =
let (toMove, remaining) = L.splitAt iCount . fromStack $ stacks A.! iSource
newStack = CrateStack $ moveModifier toMove <> fromStack (stacks A.! iDest)
in A.set [(iSource, CrateStack remaining), (iDest, newStack)] stacks
-- HELPERS
-- PARSE
parseFullInput :: ReadP (Array Int CrateStack, [Instruction])
parseFullInput = do
crateRows <- sepBy parseCrateRow newline
void $ many (choice [char ' ', satisfy isDigit]) <* newline
void newline
instructions <- sepBy parseInstruction newline
void newline
return
( A.fromList $ map (CrateStack . catMaybes) $ L.transpose crateRows
, instructions
)
newtype CrateStack = CrateStack
{ fromStack :: [Crate]
}
deriving (Show, Read, Eq, Ord)
newtype Crate = Crate
{ fromCrate :: Char
}
deriving (Show, Read, Eq, Ord)
parseCrate :: ReadP Crate
parseCrate = do
void $ char '['
c <- satisfy isAsciiUpper
void $ char ']'
return $ Crate c
parseMaybeCrate :: ReadP (Maybe Crate)
parseMaybeCrate =
choice
[ Just <$> parseCrate
, Nothing <$ count 3 (char ' ')
]
parseCrateRow :: ReadP [Maybe Crate]
parseCrateRow = sepBy parseMaybeCrate (char ' ')
data Instruction = Instruction
{ iCount :: Int
, iSource :: Int
, iDest :: Int
}
deriving (Show, Read, Eq, Ord)
parseInstruction :: ReadP Instruction
parseInstruction = do
void $ string "move "
iCount <- parseInt
void $ string " from "
iSource <- pred <$> parseInt
void $ string " to "
iDest <- pred <$> parseInt
return Instruction {..}