module Codec.Tiled.Tileset.IO
  ( TilesetError(..)
  , readFile
  , writeFile
  ) where

import Prelude hiding (readFile, writeFile)

import Control.Exception (Exception, throwIO)
import Control.Monad.IO.Class (MonadIO(..))
import Data.Aeson qualified as Aeson
import Data.ByteString (ByteString)
import Data.ByteString qualified as ByteString
import Data.Text (Text)
import Data.Text qualified as Text

import Codec.Tiled.Tileset (Tileset)

newtype TilesetError = TilesetError Text
  deriving (TilesetError -> TilesetError -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: TilesetError -> TilesetError -> Bool
$c/= :: TilesetError -> TilesetError -> Bool
== :: TilesetError -> TilesetError -> Bool
$c== :: TilesetError -> TilesetError -> Bool
Eq, Int -> TilesetError -> ShowS
[TilesetError] -> ShowS
TilesetError -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [TilesetError] -> ShowS
$cshowList :: [TilesetError] -> ShowS
show :: TilesetError -> String
$cshow :: TilesetError -> String
showsPrec :: Int -> TilesetError -> ShowS
$cshowsPrec :: Int -> TilesetError -> ShowS
Show)

instance Exception TilesetError

readFile :: MonadIO m => FilePath -> m Tileset
readFile :: forall (m :: * -> *). MonadIO m => String -> m Tileset
readFile String
source = forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO do
  ByteString
bytes <- String -> IO ByteString
ByteString.readFile String
source
  case ByteString -> Either String Tileset
decodeMap ByteString
bytes of
    Left String
msg ->
      forall e a. Exception e => e -> IO a
throwIO forall a b. (a -> b) -> a -> b
$ Text -> TilesetError
TilesetError (String -> Text
Text.pack String
msg)
    Right Tileset
res ->
      forall (f :: * -> *) a. Applicative f => a -> f a
pure Tileset
res

decodeMap :: ByteString -> Either String Tileset
decodeMap :: ByteString -> Either String Tileset
decodeMap = forall a. FromJSON a => ByteString -> Either String a
Aeson.eitherDecodeStrict'

writeFile :: MonadIO m => FilePath -> Tileset -> m ()
writeFile :: forall (m :: * -> *). MonadIO m => String -> Tileset -> m ()
writeFile String
destination = forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall a. ToJSON a => String -> a -> IO ()
Aeson.encodeFile String
destination