Day 11 Part 2 done

This commit is contained in:
shu 2019-12-12 22:06:32 +01:00
parent bd832427bc
commit c94ec57f9f
2 changed files with 42 additions and 27 deletions

View File

@ -10,7 +10,6 @@ module Intcode
import Control.DeepSeq as DeepSeq
import Data.Char
import Data.List as L
import Debug.Trace
import Data.Maybe
import Data.Vector as V hiding
( (++)

View File

@ -1,18 +1,19 @@
module Main where
import Intcode
import Data.List
import Data.List.Split
import qualified Data.Map.Strict as M
import qualified Data.Vector as V
import Intcode
import Linear.V2
import Debug.Trace
data RoboState =
RoboState
{ hull :: M.Map (V2 Int) Integer
, position :: V2 Int
, direction :: V2 Int
} deriving Show
}
deriving (Show)
main :: IO ()
main = do
@ -20,35 +21,50 @@ main = do
let program = V.fromList $ concatMap (map read . splitOn ",") (lines content)
let run x =
runIntcode
(TM
( TM
{ tape = tapePreprocess program
, pointer = 0
, pointerOffset = 0
, output = []
, input = Just 0
, input = Just x
, state = Continue
}, RoboState {hull = M.empty, position = V2 0 0, direction = V2 0 1 })
print "hue"
}
, RoboState {hull = M.empty, position = V2 0 0, direction = V2 0 1})
print $ length $ hull $ snd $ run 0
-- concat
-- ["Part 1: " ++ show a ++ ", Part 2: " ++ show b | a <- out1, b <- out2]
putStrLn $ drawHull $ hull $ snd $ run 1
drawHull :: M.Map (V2 Int) Integer -> String
drawHull m =
intercalate "\n" $
transpose $
map reverse $
chunksOf
60
[ case M.findWithDefault 0 (V2 x y) m of
1 -> '•'
_ -> ' '
| x <- [(-10) .. 49]
, y <- [(-10) .. 49]
]
runIntcode :: (TuringMachine, RoboState) -> (TuringMachine, RoboState)
runIntcode (tm,rb) =
runIntcode (tm, rb) =
case state tmNew of
Continue -> runIntcode (tmNew,rb)
AwaitInput -> runIntcode $ updateState (tmNew,rb)
_ -> (tmNew,rb)
Continue -> runIntcode (tmNew, rb)
AwaitInput -> runIntcode $ updateState (tmNew, rb)
_ -> (tmNew, rb)
where
tmNew = execSteps tm
updateState :: (TuringMachine, RoboState) -> (TuringMachine, RoboState)
updateState (tm, rb) = (tmNew, rbNew)
where hullNew = M.insert (position rb) (output tm !! 1) (hull rb)
dirNew = if output tm !! 0 == 0
where
hullNew = M.insert (position rb) (output tm !! 1) (hull rb)
dirNew =
if head (output tm) == 0
then perp $ direction rb
else iterate perp (direction rb) !! 3
posNew = (position rb + dirNew)
posNew = position rb + dirNew
floorNext = M.findWithDefault 0 posNew (hull rb)
rbNew = rb{hull = hullNew, position = posNew, direction = dirNew}
tmNew = tm{input = Just floorNext, output = []}
rbNew = rb {hull = hullNew, position = posNew, direction = dirNew}
tmNew = tm {input = Just floorNext, output = []}