Skip to content

Instantly share code, notes, and snippets.

@hololeap
Created December 3, 2021 12:00
Show Gist options
  • Star 0 You must be signed in to star a gist
  • Fork 0 You must be signed in to fork a gist
  • Save hololeap/7bafa6592902de52fb7b4e2e9bedc1b8 to your computer and use it in GitHub Desktop.
Save hololeap/7bafa6592902de52fb7b4e2e9bedc1b8 to your computer and use it in GitHub Desktop.
AoC 2021/02
module Main (main) where
import Data.ByteString.Char8 qualified as B
import Y2021.D02.Movement
main :: IO ()
main = do
ds <- B.getContents >>= parseAllIO . B.lines
let Pos (Depth d, Horizontal h) = travel ds
print $ d * h
travel :: Foldable t => t Direction -> Pos
travel = foldMap $ \case
Up d -> pos (negate d) 0
Down d -> pos d 0
Forward h -> pos 0 h
module Main (main) where
import Data.ByteString.Char8 qualified as B
import Control.Monad.Trans.Accum
import Data.Monoid (Ap(..))
import Y2021.D02.Movement
main :: IO ()
main = do
ds <- B.getContents >>= parseAllIO . B.lines
let Pos (Depth d, Horizontal h) = evalAccum (getAp (travel ds)) mempty
print $ d * h
type Aim = Depth
travel :: Foldable t => t Direction -> Ap (Accum Aim) Pos
travel = foldMap $ Ap . \case
Down d -> mempty <$ add d
Up d -> mempty <$ add (negate d)
Forward h -> looks $ \a -> pos (a * fromIntegral h) h
{-# Language OverloadedStrings #-}
module Y2021.D02.Movement where
import Data.Attoparsec.ByteString.Char8
import Data.ByteString (ByteString)
import Data.Bifunctor.Biap
import Data.Monoid (Sum(..))
import UnliftIO.Exception
newtype Depth = Depth Int
deriving stock (Show, Eq, Ord, Bounded)
deriving newtype (Enum, Num, Real, Integral)
deriving (Semigroup, Monoid) via Sum Int
newtype Horizontal = Horizontal Int
deriving stock (Show, Eq, Ord, Bounded)
deriving newtype (Enum, Num, Real, Integral)
deriving (Semigroup, Monoid) via Sum Int
newtype Pos = Pos (Depth, Horizontal)
deriving stock (Show, Eq, Ord, Bounded)
deriving newtype (Semigroup, Monoid)
deriving Num via Biap (,) Depth Horizontal
class Parsable t where
parser :: Parser t
parseAllIO :: Parsable t => [ByteString] -> IO [t]
parseAllIO = either throwString pure . traverse (parseOnly parser)
data Direction = Up Depth | Down Depth | Forward Horizontal
deriving stock (Show, Eq, Ord)
instance Parsable Direction where
parser = choice
[ "up " *> (Up <$> decimal)
, "down " *> (Down <$> decimal)
, "forward " *> (Forward <$> decimal) ]
pos :: Depth -> Horizontal -> Pos
pos d h = Pos (d,h)
Sign up for free to join this conversation on GitHub. Already have an account? Sign in to comment