rename module

This commit is contained in:
Joey Hess 2013-05-12 19:19:28 -04:00
parent 92910f5107
commit 25a8d4b11c
14 changed files with 28 additions and 28 deletions

View file

@ -29,7 +29,7 @@ import Common.Annex
import qualified Annex
import Annex.Perms
import qualified Git
import Utility.TempFile
import Utility.Tmp
import Logs.Location
import Utility.InodeCache

View file

@ -9,7 +9,7 @@ module Assistant.DaemonStatus where
import Assistant.Common
import Assistant.Alert.Utility
import Utility.TempFile
import Utility.Tmp
import Assistant.Types.NetMessager
import Utility.NotificationBroadcaster
import Logs.Transfer

View file

@ -16,7 +16,7 @@ import Assistant.Ssh
import Config.Files
import Utility.FileMode
import Utility.Shell
import Utility.TempFile
import Utility.Tmp
import Utility.Env
#ifdef darwin_HOST_OS

View file

@ -8,7 +8,7 @@
module Assistant.Ssh where
import Common.Annex
import Utility.TempFile
import Utility.Tmp
import Utility.UserInfo
import Utility.Shell
import Git.Remote
@ -146,7 +146,7 @@ authorizedKeysLine rsynconly dir pubkey
{- Generates a ssh key pair. -}
genSshKeyPair :: IO SshKeyPair
genSshKeyPair = withTempDir "git-annex-keygen" $ \dir -> do
genSshKeyPair = withTmpDir "git-annex-keygen" $ \dir -> do
ok <- boolSystem "ssh-keygen"
[ Param "-P", Param "" -- no password
, Param "-f", File $ dir </> "key"

View file

@ -33,7 +33,7 @@ import Assistant.WebApp.Control
import Assistant.WebApp.OtherRepos
import Assistant.Types.ThreadedMonad
import Utility.WebApp
import Utility.TempFile
import Utility.Tmp
import Utility.FileMode
import Git
@ -74,7 +74,7 @@ webAppThread assistantdata urlrenderer noannex listenhost postfirstrun onstartup
, return app
)
runWebApp listenhost app' $ \addr -> if noannex
then withTempFile "webapp.html" $ \tmpfile _ ->
then withTmpFile "webapp.html" $ \tmpfile _ ->
go addr webapp tmpfile Nothing
else do
let st = threadState assistantdata

View file

@ -8,7 +8,7 @@
module Config.Files where
import Common
import Utility.TempFile
import Utility.Tmp
import Utility.FreeDesktop
{- ~/.config/git-annex/file -}

View file

@ -16,7 +16,7 @@ module Init (
) where
import Common.Annex
import Utility.TempFile
import Utility.Tmp
import Utility.Network
import qualified Git
import qualified Git.LsFiles

View file

@ -19,7 +19,7 @@ import qualified Data.Map as M
import Common.Annex
import Command
import Types.Key
import Utility.TempFile
import Utility.Tmp
writeUnusedLog :: FilePath -> [(Int, Key)] -> Annex ()
writeUnusedLog prefix l = do

View file

@ -35,7 +35,7 @@ import qualified Annex.Content
import qualified Annex.BranchState
import qualified Annex.Branch
import qualified Utility.Url as Url
import Utility.TempFile
import Utility.Tmp
import Config
import Config.Cost
import Init
@ -179,7 +179,7 @@ tryGitConfigRead r
geturlconfig headers = do
s <- Url.get (Git.repoLocation r ++ "/config") headers
withTempFile "git-annex.tmp" $ \tmpfile h -> do
withTmpFile "git-annex.tmp" $ \tmpfile h -> do
hPutStr h s
hClose h
safely $ pipedconfig "git" [Param "config", Param "--null", Param "--list", Param "--file", File tmpfile]

View file

@ -20,7 +20,7 @@ import qualified Git.LsFiles as LsFiles
import Backend
import Annex.Version
import Utility.FileMode
import Utility.TempFile
import Utility.Tmp
import qualified Upgrade.V2
-- v2 adds hashing of filenames of content and location log files.

View file

@ -14,7 +14,7 @@ import qualified Git.Ref
import qualified Annex.Branch
import Logs.Location
import Annex.Content
import Utility.TempFile
import Utility.Tmp
olddir :: Git.Repo -> FilePath
olddir g

View file

@ -18,7 +18,7 @@ import Control.Applicative
import System.IO.Unsafe (unsafeInterleaveIO)
import Utility.SafeCommand
import Utility.TempFile
import Utility.Tmp
import Utility.Exception
import Utility.Monad

View file

@ -1,11 +1,11 @@
{- temp file functions
{- Temporary files and directories.
-
- Copyright 2010-2013 Joey Hess <joey@kitenet.net>
-
- Licensed under the GNU GPL version 3 or higher.
-}
module Utility.TempFile where
module Utility.Tmp where
import Control.Exception (bracket)
import System.IO
@ -31,15 +31,15 @@ viaTmp a file content = do
{- Runs an action with a tmp file located in the system's tmp directory
- (or in "." if there is none) then removes the file. -}
withTempFile :: Template -> (FilePath -> Handle -> IO a) -> IO a
withTempFile template a = do
withTmpFile :: Template -> (FilePath -> Handle -> IO a) -> IO a
withTmpFile template a = do
tmpdir <- catchDefaultIO "." getTemporaryDirectory
withTempFileIn tmpdir template a
withTmpFileIn tmpdir template a
{- Runs an action with a tmp file located in the specified directory,
- then removes the file. -}
withTempFileIn :: FilePath -> Template -> (FilePath -> Handle -> IO a) -> IO a
withTempFileIn tmpdir template a = bracket create remove use
withTmpFileIn :: FilePath -> Template -> (FilePath -> Handle -> IO a) -> IO a
withTmpFileIn tmpdir template a = bracket create remove use
where
create = openTempFile tmpdir template
remove (name, handle) = do
@ -50,15 +50,15 @@ withTempFileIn tmpdir template a = bracket create remove use
{- Runs an action with a tmp directory located within the system's tmp
- directory (or within "." if there is none), then removes the tmp
- directory and all its contents. -}
withTempDir :: Template -> (FilePath -> IO a) -> IO a
withTempDir template a = do
withTmpDir :: Template -> (FilePath -> IO a) -> IO a
withTmpDir template a = do
tmpdir <- catchDefaultIO "." getTemporaryDirectory
withTempDirIn tmpdir template a
withTmpDirIn tmpdir template a
{- Runs an action with a tmp directory located within a specified directory,
- then removes the tmp directory and all its contents. -}
withTempDirIn :: FilePath -> Template -> (FilePath -> IO a) -> IO a
withTempDirIn tmpdir template = bracket create remove
withTmpDirIn :: FilePath -> Template -> (FilePath -> IO a) -> IO a
withTmpDirIn tmpdir template = bracket create remove
where
remove d = whenM (doesDirectoryExist d) $
removeDirectoryRecursive d

View file

@ -10,7 +10,7 @@
module Utility.WebApp where
import Common
import Utility.TempFile
import Utility.Tmp
import Utility.FileMode
import qualified Yesod