{-# LANGUAGE RankNTypes #-}
{-# LANGUAGE ScopedTypeVariables #-}
{-# LANGUAGE ViewPatterns #-}
{-# OPTIONS_HADDOCK hide #-}
{-# OPTIONS_GHC -Wno-unrecognised-pragmas #-}
{-# HLINT ignore "Avoid restricted function" #-}
module Codec.Archive.Tar.Pack (
pack,
packAndCheck,
packFileEntry,
packDirectoryEntry,
packSymlinkEntry,
longLinkEntry,
) where
import Codec.Archive.Tar.LongNames
import Codec.Archive.Tar.PackAscii (filePathToOsPath, osPathToFilePath)
import Codec.Archive.Tar.Types
import Data.Bifunctor (bimap)
import qualified Data.ByteString as B
import qualified Data.ByteString.Lazy as BL
import Data.Foldable
import System.File.OsPath
import System.OsPath
( OsPath, (</>) )
import qualified System.OsPath as FilePath.Native
( addTrailingPathSeparator, hasTrailingPathSeparator )
import System.Directory.OsPath
( doesDirectoryExist, getModificationTime
, pathIsSymbolicLink, getSymbolicLinkTarget
, Permissions(..), getPermissions, getFileSize )
import qualified System.Directory.OsPath.Types as FT
import System.Directory.OsPath.Streaming (getDirectoryContentsRecursive)
import Data.Time.Clock.POSIX
( utcTimeToPOSIXSeconds )
import System.IO
( IOMode(ReadMode), hFileSize )
import System.IO.Unsafe (unsafeInterleaveIO)
import Control.Exception (throwIO, SomeException)
pack
:: FilePath
-> [FilePath]
-> IO [Entry]
pack :: FilePath -> [FilePath] -> IO [Entry]
pack = (GenEntry FilePath FilePath -> Maybe SomeException)
-> FilePath -> [FilePath] -> IO [Entry]
packAndCheck (Maybe SomeException
-> GenEntry FilePath FilePath -> Maybe SomeException
forall a b. a -> b -> a
const Maybe SomeException
forall a. Maybe a
Nothing)
packAndCheck
:: (GenEntry FilePath FilePath -> Maybe SomeException)
-> FilePath
-> [FilePath]
-> IO [Entry]
packAndCheck :: (GenEntry FilePath FilePath -> Maybe SomeException)
-> FilePath -> [FilePath] -> IO [Entry]
packAndCheck GenEntry FilePath FilePath -> Maybe SomeException
secCB (FilePath -> OsPath
filePathToOsPath -> OsPath
baseDir) ((FilePath -> OsPath) -> [FilePath] -> [OsPath]
forall a b. (a -> b) -> [a] -> [b]
map FilePath -> OsPath
filePathToOsPath -> [OsPath]
relpaths) = do
paths <- OsPath -> [OsPath] -> IO [OsPath]
preparePaths OsPath
baseDir [OsPath]
relpaths
entries' <- packPaths baseDir paths
let entries = (GenEntry OsPath OsPath -> GenEntry FilePath FilePath)
-> [GenEntry OsPath OsPath] -> [GenEntry FilePath FilePath]
forall a b. (a -> b) -> [a] -> [b]
map ((OsPath -> FilePath)
-> (OsPath -> FilePath)
-> GenEntry OsPath OsPath
-> GenEntry FilePath FilePath
forall a b c d.
(a -> b) -> (c -> d) -> GenEntry a c -> GenEntry b d
forall (p :: * -> * -> *) a b c d.
Bifunctor p =>
(a -> b) -> (c -> d) -> p a c -> p b d
bimap OsPath -> FilePath
osPathToFilePath OsPath -> FilePath
osPathToFilePath) [GenEntry OsPath OsPath]
entries'
traverse_ (maybe (pure ()) throwIO . secCB) entries
pure $ concatMap encodeLongNames entries
preparePaths :: OsPath -> [OsPath] -> IO [OsPath]
preparePaths :: OsPath -> [OsPath] -> IO [OsPath]
preparePaths OsPath
baseDir = ([[OsPath]] -> [OsPath]) -> IO [[OsPath]] -> IO [OsPath]
forall a b. (a -> b) -> IO a -> IO b
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
fmap [[OsPath]] -> [OsPath]
forall (t :: * -> *) a. Foldable t => t [a] -> [a]
concat (IO [[OsPath]] -> IO [OsPath])
-> ([OsPath] -> IO [[OsPath]]) -> [OsPath] -> IO [OsPath]
forall b c a. (b -> c) -> (a -> b) -> a -> c
. [IO [OsPath]] -> IO [[OsPath]]
forall a. [IO a] -> IO [a]
interleave ([IO [OsPath]] -> IO [[OsPath]])
-> ([OsPath] -> [IO [OsPath]]) -> [OsPath] -> IO [[OsPath]]
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (OsPath -> IO [OsPath]) -> [OsPath] -> [IO [OsPath]]
forall a b. (a -> b) -> [a] -> [b]
map OsPath -> IO [OsPath]
go
where
go :: OsPath -> IO [OsPath]
go :: OsPath -> IO [OsPath]
go OsPath
relpath = do
let abspath :: OsPath
abspath = OsPath
baseDir OsPath -> OsPath -> OsPath
</> OsPath
relpath
isDir <- OsPath -> IO Bool
doesDirectoryExist OsPath
abspath
isSymlink <- pathIsSymbolicLink abspath
if isDir && not isSymlink then do
entries <- getDirectoryContentsRecursive abspath
let entries' = ((OsPath, FileType) -> OsPath) -> [(OsPath, FileType)] -> [OsPath]
forall a b. (a -> b) -> [a] -> [b]
map ((OsPath
relpath OsPath -> OsPath -> OsPath
</>) (OsPath -> OsPath)
-> ((OsPath, FileType) -> OsPath) -> (OsPath, FileType) -> OsPath
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (OsPath, FileType) -> OsPath
addSeparatorIfDir) [(OsPath, FileType)]
entries
return $ if relpath == mempty
then entries'
else FilePath.Native.addTrailingPathSeparator relpath : entries'
else return [relpath]
addSeparatorIfDir :: (OsPath, FileType) -> OsPath
addSeparatorIfDir (OsPath
fn, FileType
ty) = case FileType
ty of
FT.Directory{} -> OsPath -> OsPath
FilePath.Native.addTrailingPathSeparator OsPath
fn
FileType
_ -> OsPath
fn
packPaths
:: OsPath
-> [OsPath]
-> IO [GenEntry OsPath OsPath]
packPaths :: OsPath -> [OsPath] -> IO [GenEntry OsPath OsPath]
packPaths OsPath
baseDir [OsPath]
paths = [IO (GenEntry OsPath OsPath)] -> IO [GenEntry OsPath OsPath]
forall a. [IO a] -> IO [a]
interleave ([IO (GenEntry OsPath OsPath)] -> IO [GenEntry OsPath OsPath])
-> [IO (GenEntry OsPath OsPath)] -> IO [GenEntry OsPath OsPath]
forall a b. (a -> b) -> a -> b
$ ((OsPath -> IO (GenEntry OsPath OsPath))
-> [OsPath] -> [IO (GenEntry OsPath OsPath)])
-> [OsPath]
-> (OsPath -> IO (GenEntry OsPath OsPath))
-> [IO (GenEntry OsPath OsPath)]
forall a b c. (a -> b -> c) -> b -> a -> c
flip (OsPath -> IO (GenEntry OsPath OsPath))
-> [OsPath] -> [IO (GenEntry OsPath OsPath)]
forall a b. (a -> b) -> [a] -> [b]
map [OsPath]
paths ((OsPath -> IO (GenEntry OsPath OsPath))
-> [IO (GenEntry OsPath OsPath)])
-> (OsPath -> IO (GenEntry OsPath OsPath))
-> [IO (GenEntry OsPath OsPath)]
forall a b. (a -> b) -> a -> b
$ \OsPath
relpath -> do
let isDir :: Bool
isDir = OsPath -> Bool
FilePath.Native.hasTrailingPathSeparator OsPath
abspath
abspath :: OsPath
abspath = OsPath
baseDir OsPath -> OsPath -> OsPath
</> OsPath
relpath
isSymlink <- OsPath -> IO Bool
pathIsSymbolicLink OsPath
abspath
let mkEntry
| Bool
isSymlink = OsPath -> tarPath -> IO (GenEntry tarPath OsPath)
forall tarPath. OsPath -> tarPath -> IO (GenEntry tarPath OsPath)
packSymlinkEntry'
| Bool
isDir = OsPath -> tarPath -> IO (GenEntry tarPath OsPath)
forall tarPath linkTarget.
OsPath -> tarPath -> IO (GenEntry tarPath linkTarget)
packDirectoryEntry'
| Bool
otherwise = OsPath -> tarPath -> IO (GenEntry tarPath OsPath)
forall tarPath linkTarget.
OsPath -> tarPath -> IO (GenEntry tarPath linkTarget)
packFileEntry'
mkEntry abspath relpath
interleave :: [IO a] -> IO [a]
interleave :: forall a. [IO a] -> IO [a]
interleave = IO [a] -> IO [a]
forall a. IO a -> IO a
unsafeInterleaveIO (IO [a] -> IO [a]) -> ([IO a] -> IO [a]) -> [IO a] -> IO [a]
forall b c a. (b -> c) -> (a -> b) -> a -> c
. [IO a] -> IO [a]
forall a. [IO a] -> IO [a]
go
where
go :: [IO a] -> IO [a]
go [] = [a] -> IO [a]
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return []
go (IO a
x:[IO a]
xs) = do
x' <- IO a
x
xs' <- interleave xs
return (x':xs')
packFileEntry
:: FilePath
-> tarPath
-> IO (GenEntry tarPath linkTarget)
packFileEntry :: forall tarPath linkTarget.
FilePath -> tarPath -> IO (GenEntry tarPath linkTarget)
packFileEntry = OsPath -> tarPath -> IO (GenEntry tarPath linkTarget)
forall tarPath linkTarget.
OsPath -> tarPath -> IO (GenEntry tarPath linkTarget)
packFileEntry' (OsPath -> tarPath -> IO (GenEntry tarPath linkTarget))
-> (FilePath -> OsPath)
-> FilePath
-> tarPath
-> IO (GenEntry tarPath linkTarget)
forall b c a. (b -> c) -> (a -> b) -> a -> c
. FilePath -> OsPath
filePathToOsPath
packFileEntry'
:: OsPath
-> tarPath
-> IO (GenEntry tarPath linkTarget)
packFileEntry' :: forall tarPath linkTarget.
OsPath -> tarPath -> IO (GenEntry tarPath linkTarget)
packFileEntry' OsPath
filepath tarPath
tarpath = do
mtime <- OsPath -> IO EpochTime
getModTime OsPath
filepath
perms <- getPermissions filepath
approxSize <- getFileSize filepath
(content, size) <- if approxSize < 131072
then do
cnt <- readFile' filepath
pure (BL.fromStrict cnt, fromIntegral $ B.length cnt)
else do
hndl <- openBinaryFile filepath ReadMode
sz <- hFileSize hndl
cnt <- BL.hGetContents hndl
pure (cnt, fromInteger sz)
pure (simpleEntry tarpath (NormalFile content size))
{ entryPermissions =
if executable perms then executableFilePermissions else ordinaryFilePermissions
, entryTime = mtime
}
packDirectoryEntry
:: FilePath
-> tarPath
-> IO (GenEntry tarPath linkTarget)
packDirectoryEntry :: forall tarPath linkTarget.
FilePath -> tarPath -> IO (GenEntry tarPath linkTarget)
packDirectoryEntry = OsPath -> tarPath -> IO (GenEntry tarPath linkTarget)
forall tarPath linkTarget.
OsPath -> tarPath -> IO (GenEntry tarPath linkTarget)
packDirectoryEntry' (OsPath -> tarPath -> IO (GenEntry tarPath linkTarget))
-> (FilePath -> OsPath)
-> FilePath
-> tarPath
-> IO (GenEntry tarPath linkTarget)
forall b c a. (b -> c) -> (a -> b) -> a -> c
. FilePath -> OsPath
filePathToOsPath
packDirectoryEntry'
:: OsPath
-> tarPath
-> IO (GenEntry tarPath linkTarget)
packDirectoryEntry' :: forall tarPath linkTarget.
OsPath -> tarPath -> IO (GenEntry tarPath linkTarget)
packDirectoryEntry' OsPath
filepath tarPath
tarpath = do
mtime <- OsPath -> IO EpochTime
getModTime OsPath
filepath
return (directoryEntry tarpath) {
entryTime = mtime
}
packSymlinkEntry
:: FilePath
-> tarPath
-> IO (GenEntry tarPath FilePath)
packSymlinkEntry :: forall tarPath.
FilePath -> tarPath -> IO (GenEntry tarPath FilePath)
packSymlinkEntry = (((GenEntry tarPath OsPath -> GenEntry tarPath FilePath)
-> IO (GenEntry tarPath OsPath) -> IO (GenEntry tarPath FilePath)
forall a b. (a -> b) -> IO a -> IO b
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
fmap ((OsPath -> FilePath)
-> GenEntry tarPath OsPath -> GenEntry tarPath FilePath
forall a b. (a -> b) -> GenEntry tarPath a -> GenEntry tarPath b
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
fmap OsPath -> FilePath
osPathToFilePath) (IO (GenEntry tarPath OsPath) -> IO (GenEntry tarPath FilePath))
-> (tarPath -> IO (GenEntry tarPath OsPath))
-> tarPath
-> IO (GenEntry tarPath FilePath)
forall b c a. (b -> c) -> (a -> b) -> a -> c
.) ((tarPath -> IO (GenEntry tarPath OsPath))
-> tarPath -> IO (GenEntry tarPath FilePath))
-> (OsPath -> tarPath -> IO (GenEntry tarPath OsPath))
-> OsPath
-> tarPath
-> IO (GenEntry tarPath FilePath)
forall b c a. (b -> c) -> (a -> b) -> a -> c
. OsPath -> tarPath -> IO (GenEntry tarPath OsPath)
forall tarPath. OsPath -> tarPath -> IO (GenEntry tarPath OsPath)
packSymlinkEntry') (OsPath -> tarPath -> IO (GenEntry tarPath FilePath))
-> (FilePath -> OsPath)
-> FilePath
-> tarPath
-> IO (GenEntry tarPath FilePath)
forall b c a. (b -> c) -> (a -> b) -> a -> c
. FilePath -> OsPath
filePathToOsPath
packSymlinkEntry'
:: OsPath
-> tarPath
-> IO (GenEntry tarPath OsPath)
packSymlinkEntry' :: forall tarPath. OsPath -> tarPath -> IO (GenEntry tarPath OsPath)
packSymlinkEntry' OsPath
filepath tarPath
tarpath = do
linkTarget <- OsPath -> IO OsPath
getSymbolicLinkTarget OsPath
filepath
pure $ symlinkEntry tarpath linkTarget
getModTime :: OsPath -> IO EpochTime
getModTime :: OsPath -> IO EpochTime
getModTime OsPath
path = do
t <- OsPath -> IO UTCTime
getModificationTime OsPath
path
return . floor . utcTimeToPOSIXSeconds $ t