{-# LANGUAGE BangPatterns #-} {-# LANGUAGE TypeApplications #-} import Control.Monad import Data.Bool import Data.IORef import qualified Data.Vector.Fusion.Stream.Monadic as VFSM import qualified Data.Vector.Unboxed as VU import qualified Data.Vector.Unboxed.Mutable as VUM main :: IO () main = do [n, _] <- map (read @Int) . words <$> getLine g <- VUM.replicate ((n + 1) * (n + 1)) False VUM.unsafeWrite g 0 True x <- newIORef (0 :: Int) y <- newIORef (0 :: Int) ss <- VU.fromList <$> getLine VU.forM_ ss $ \s -> do when (s == 'R') $ modifyIORef' x succ when (s == 'U') $ modifyIORef' y succ when (s == 'L') $ modifyIORef' x pred when (s == 'D') $ modifyIORef' y pred x1 <- readIORef x y1 <- readIORef y VUM.unsafeWrite g (x1 + y1 * (n + 1)) True xs <- VU.unsafeFreeze g let ys = VU.map (\b -> bool (1 :: Int) (0 :: Int) b) xs rev (n + 1) $ \i -> rep (n + 1) $ \j -> do let sep = if j == n then "\n" else " " putStr $ (++ sep) $ show $ ys VU.! (i * (n + 1) + j) stream :: Monad m => Int -> Int -> VFSM.Stream m Int stream !l !r = VFSM.Stream step l where step x | x < r = return $ VFSM.Yield x (x + 1) | otherwise = return $ VFSM.Done {-# INLINE [0] step #-} {-# INLINE [1] stream #-} rep :: Monad m => Int -> (Int -> m ()) -> m () rep n = flip VFSM.mapM_ (stream 0 n) {-# INLINE rep #-} streamR :: Monad m => Int -> Int -> VFSM.Stream m Int streamR !l !r = VFSM.Stream step (r - 1) where step x | x >= l = return $ VFSM.Yield x (x - 1) | otherwise = return $ VFSM.Done {-# INLINE [0] step #-} {-# INLINE [1] streamR #-} rev :: Monad m => Int -> (Int -> m ()) -> m () rev n = flip VFSM.mapM_ (streamR 0 n) {-# INLINE rev #-}