fix all remaining -Wall warnings on Windows
This commit is contained in:
parent
360ecb9f35
commit
3f6e4b8c7c
13 changed files with 57 additions and 44 deletions
19
Assistant.hs
19
Assistant.hs
|
@ -49,11 +49,13 @@ import Assistant.Threads.XMPPPusher
|
||||||
import Assistant.Types.UrlRenderer
|
import Assistant.Types.UrlRenderer
|
||||||
#endif
|
#endif
|
||||||
import qualified Utility.Daemon
|
import qualified Utility.Daemon
|
||||||
import Utility.LogFile
|
|
||||||
import Utility.ThreadScheduler
|
import Utility.ThreadScheduler
|
||||||
import Utility.HumanTime
|
import Utility.HumanTime
|
||||||
import Annex.Perms
|
|
||||||
import qualified Build.SysConfig as SysConfig
|
import qualified Build.SysConfig as SysConfig
|
||||||
|
#ifndef mingw32_HOST_OS
|
||||||
|
import Utility.LogFile
|
||||||
|
import Annex.Perms
|
||||||
|
#endif
|
||||||
|
|
||||||
import System.Log.Logger
|
import System.Log.Logger
|
||||||
import Network.Socket (HostName)
|
import Network.Socket (HostName)
|
||||||
|
@ -70,8 +72,8 @@ startDaemon :: Bool -> Bool -> Maybe Duration -> Maybe String -> Maybe HostName
|
||||||
startDaemon assistant foreground startdelay cannotrun listenhost startbrowser = do
|
startDaemon assistant foreground startdelay cannotrun listenhost startbrowser = do
|
||||||
Annex.changeState $ \s -> s { Annex.daemon = True }
|
Annex.changeState $ \s -> s { Annex.daemon = True }
|
||||||
pidfile <- fromRepo gitAnnexPidFile
|
pidfile <- fromRepo gitAnnexPidFile
|
||||||
logfile <- fromRepo gitAnnexLogFile
|
|
||||||
#ifndef mingw32_HOST_OS
|
#ifndef mingw32_HOST_OS
|
||||||
|
logfile <- fromRepo gitAnnexLogFile
|
||||||
createAnnexDirectory (parentDir logfile)
|
createAnnexDirectory (parentDir logfile)
|
||||||
logfd <- liftIO $ openLog logfile
|
logfd <- liftIO $ openLog logfile
|
||||||
if foreground
|
if foreground
|
||||||
|
@ -93,11 +95,12 @@ startDaemon assistant foreground startdelay cannotrun listenhost startbrowser =
|
||||||
start (Utility.Daemon.daemonize logfd (Just pidfile) False) Nothing
|
start (Utility.Daemon.daemonize logfd (Just pidfile) False) Nothing
|
||||||
#else
|
#else
|
||||||
-- Windows is always foreground, and has no log file.
|
-- Windows is always foreground, and has no log file.
|
||||||
liftIO $ Utility.Daemon.lockPidFile pidfile
|
when (foreground || not foreground) $ do
|
||||||
start id $ do
|
liftIO $ Utility.Daemon.lockPidFile pidfile
|
||||||
case startbrowser of
|
start id $ do
|
||||||
Nothing -> Nothing
|
case startbrowser of
|
||||||
Just a -> Just $ a Nothing Nothing
|
Nothing -> Nothing
|
||||||
|
Just a -> Just $ a Nothing Nothing
|
||||||
#endif
|
#endif
|
||||||
where
|
where
|
||||||
desc
|
desc
|
||||||
|
|
|
@ -27,7 +27,6 @@ import qualified Git.Command
|
||||||
import qualified Git.Config
|
import qualified Git.Config
|
||||||
import Utility.ThreadScheduler
|
import Utility.ThreadScheduler
|
||||||
import qualified Assistant.Threads.Watcher as Watcher
|
import qualified Assistant.Threads.Watcher as Watcher
|
||||||
import Utility.LogFile
|
|
||||||
import Utility.Batch
|
import Utility.Batch
|
||||||
import Utility.NotificationBroadcaster
|
import Utility.NotificationBroadcaster
|
||||||
import Config
|
import Config
|
||||||
|
@ -43,6 +42,9 @@ import qualified Annex
|
||||||
#ifdef WITH_WEBAPP
|
#ifdef WITH_WEBAPP
|
||||||
import Assistant.WebApp.Types
|
import Assistant.WebApp.Types
|
||||||
#endif
|
#endif
|
||||||
|
#ifndef mingw32_HOST_OS
|
||||||
|
import Utility.LogFile
|
||||||
|
#endif
|
||||||
|
|
||||||
import Data.Time.Clock.POSIX
|
import Data.Time.Clock.POSIX
|
||||||
import qualified Data.Text as T
|
import qualified Data.Text as T
|
||||||
|
@ -214,10 +216,10 @@ checkLogSize n = do
|
||||||
checkLogSize $ n + 1
|
checkLogSize $ n + 1
|
||||||
where
|
where
|
||||||
filesize f = fromIntegral . fileSize <$> liftIO (getFileStatus f)
|
filesize f = fromIntegral . fileSize <$> liftIO (getFileStatus f)
|
||||||
#endif
|
|
||||||
|
|
||||||
oneMegabyte :: Int
|
oneMegabyte :: Int
|
||||||
oneMegabyte = 1000000
|
oneMegabyte = 1000000
|
||||||
|
#endif
|
||||||
|
|
||||||
oneHour :: Int
|
oneHour :: Int
|
||||||
oneHour = 60 * 60
|
oneHour = 60 * 60
|
||||||
|
|
|
@ -23,7 +23,6 @@ import Assistant.Types.Changes
|
||||||
import Assistant.Alert
|
import Assistant.Alert
|
||||||
import Utility.DirWatcher
|
import Utility.DirWatcher
|
||||||
import Utility.DirWatcher.Types
|
import Utility.DirWatcher.Types
|
||||||
import qualified Utility.Lsof as Lsof
|
|
||||||
import qualified Annex
|
import qualified Annex
|
||||||
import qualified Annex.Queue
|
import qualified Annex.Queue
|
||||||
import qualified Git
|
import qualified Git
|
||||||
|
@ -40,6 +39,9 @@ import Annex.ReplaceFile
|
||||||
import Git.Types
|
import Git.Types
|
||||||
import Config
|
import Config
|
||||||
import Utility.ThreadScheduler
|
import Utility.ThreadScheduler
|
||||||
|
#ifndef mingw32_HOST_OS
|
||||||
|
import qualified Utility.Lsof as Lsof
|
||||||
|
#endif
|
||||||
|
|
||||||
import Data.Bits.Utils
|
import Data.Bits.Utils
|
||||||
import Data.Typeable
|
import Data.Typeable
|
||||||
|
|
|
@ -114,9 +114,9 @@ checkRepositoryPath p = do
|
||||||
- browsed to a directory with git-annex and run it from there. -}
|
- browsed to a directory with git-annex and run it from there. -}
|
||||||
defaultRepositoryPath :: Bool -> IO FilePath
|
defaultRepositoryPath :: Bool -> IO FilePath
|
||||||
defaultRepositoryPath firstrun = do
|
defaultRepositoryPath firstrun = do
|
||||||
cwd <- liftIO getCurrentDirectory
|
|
||||||
home <- myHomeDir
|
|
||||||
#ifndef mingw32_HOST_OS
|
#ifndef mingw32_HOST_OS
|
||||||
|
home <- myHomeDir
|
||||||
|
cwd <- liftIO getCurrentDirectory
|
||||||
if home == cwd && firstrun
|
if home == cwd && firstrun
|
||||||
then inhome
|
then inhome
|
||||||
else ifM (legit cwd <&&> canWrite cwd)
|
else ifM (legit cwd <&&> canWrite cwd)
|
||||||
|
@ -127,7 +127,7 @@ defaultRepositoryPath firstrun = do
|
||||||
-- On Windows, always default to ~/Desktop/annex or ~/annex,
|
-- On Windows, always default to ~/Desktop/annex or ~/annex,
|
||||||
-- no cwd handling because the user might be able to write
|
-- no cwd handling because the user might be able to write
|
||||||
-- to the entire drive.
|
-- to the entire drive.
|
||||||
inhome
|
if firstrun then inhome else inhome
|
||||||
#endif
|
#endif
|
||||||
where
|
where
|
||||||
inhome = do
|
inhome = do
|
||||||
|
@ -136,9 +136,11 @@ defaultRepositoryPath firstrun = do
|
||||||
( relHome $ desktop </> gitAnnexAssistantDefaultDir
|
( relHome $ desktop </> gitAnnexAssistantDefaultDir
|
||||||
, return $ "~" </> gitAnnexAssistantDefaultDir
|
, return $ "~" </> gitAnnexAssistantDefaultDir
|
||||||
)
|
)
|
||||||
|
#ifndef mingw32_HOST_OS
|
||||||
-- Avoid using eg, standalone build's git-annex.linux/ directory
|
-- Avoid using eg, standalone build's git-annex.linux/ directory
|
||||||
-- when run from there.
|
-- when run from there.
|
||||||
legit d = not <$> doesFileExist (d </> "git-annex")
|
legit d = not <$> doesFileExist (d </> "git-annex")
|
||||||
|
#endif
|
||||||
|
|
||||||
newRepositoryForm :: FilePath -> Hamlet.Html -> MkMForm RepositoryPath
|
newRepositoryForm :: FilePath -> Hamlet.Html -> MkMForm RepositoryPath
|
||||||
newRepositoryForm defpath msg = do
|
newRepositoryForm defpath msg = do
|
||||||
|
|
|
@ -12,7 +12,6 @@ module Assistant.WebApp.Configurators.Pairing where
|
||||||
|
|
||||||
import Assistant.Pairing
|
import Assistant.Pairing
|
||||||
import Assistant.WebApp.Common
|
import Assistant.WebApp.Common
|
||||||
import Assistant.WebApp.Configurators
|
|
||||||
import Assistant.Types.Buddies
|
import Assistant.Types.Buddies
|
||||||
import Annex.UUID
|
import Annex.UUID
|
||||||
#ifdef WITH_PAIRING
|
#ifdef WITH_PAIRING
|
||||||
|
@ -34,6 +33,9 @@ import Assistant.NetMessager
|
||||||
import Assistant.WebApp.RepoList
|
import Assistant.WebApp.RepoList
|
||||||
import Assistant.WebApp.Configurators.XMPP
|
import Assistant.WebApp.Configurators.XMPP
|
||||||
#endif
|
#endif
|
||||||
|
#if defined(WITH_PAIRING) || defined(WITH_XMP)
|
||||||
|
import Assistant.WebApp.Configurators
|
||||||
|
#endif
|
||||||
import Utility.UserInfo
|
import Utility.UserInfo
|
||||||
import Git
|
import Git
|
||||||
|
|
||||||
|
|
|
@ -218,15 +218,15 @@ link file key mcache = flip catchAnnex (undo file key) $ do
|
||||||
l <- inRepo $ gitAnnexLink file key
|
l <- inRepo $ gitAnnexLink file key
|
||||||
replaceFile file $ makeAnnexLink l
|
replaceFile file $ makeAnnexLink l
|
||||||
|
|
||||||
#ifdef WITH_CLIBS
|
|
||||||
#ifndef __ANDROID__
|
|
||||||
-- touch symlink to have same time as the original file,
|
-- touch symlink to have same time as the original file,
|
||||||
-- as provided in the InodeCache
|
-- as provided in the InodeCache
|
||||||
case mcache of
|
case mcache of
|
||||||
|
#if defined(WITH_CLIBS) && ! defined(__ANDROID__)
|
||||||
Just c -> liftIO $ touch file (TimeSpec $ inodeCacheToMtime c) False
|
Just c -> liftIO $ touch file (TimeSpec $ inodeCacheToMtime c) False
|
||||||
|
#else
|
||||||
|
Just _ -> noop
|
||||||
|
#endif
|
||||||
Nothing -> noop
|
Nothing -> noop
|
||||||
#endif
|
|
||||||
#endif
|
|
||||||
|
|
||||||
return l
|
return l
|
||||||
|
|
||||||
|
|
|
@ -466,7 +466,8 @@ getFsckTime key = do
|
||||||
- To guard against time stamp damange (for example, if an annex directory
|
- To guard against time stamp damange (for example, if an annex directory
|
||||||
- is copied without -a), the fsckstate file contains a time that should
|
- is copied without -a), the fsckstate file contains a time that should
|
||||||
- be identical to its modification time.
|
- be identical to its modification time.
|
||||||
- (This is not possible to do on Windows.)
|
- (This is not possible to do on Windows, and so the timestamp in
|
||||||
|
- the file will only be equal or greater than the modification time.)
|
||||||
-}
|
-}
|
||||||
recordStartTime :: Annex ()
|
recordStartTime :: Annex ()
|
||||||
recordStartTime = do
|
recordStartTime = do
|
||||||
|
@ -477,10 +478,10 @@ recordStartTime = do
|
||||||
withFile f WriteMode $ \h -> do
|
withFile f WriteMode $ \h -> do
|
||||||
#ifndef mingw32_HOST_OS
|
#ifndef mingw32_HOST_OS
|
||||||
t <- modificationTime <$> getFileStatus f
|
t <- modificationTime <$> getFileStatus f
|
||||||
hPutStr h $ showTime $ realToFrac t
|
|
||||||
#else
|
#else
|
||||||
noop
|
t <- getPOSIXTime
|
||||||
#endif
|
#endif
|
||||||
|
hPutStr h $ showTime $ realToFrac t
|
||||||
where
|
where
|
||||||
showTime :: POSIXTime -> String
|
showTime :: POSIXTime -> String
|
||||||
showTime = show
|
showTime = show
|
||||||
|
@ -494,15 +495,18 @@ getStartTime = do
|
||||||
f <- fromRepo gitAnnexFsckState
|
f <- fromRepo gitAnnexFsckState
|
||||||
liftIO $ catchDefaultIO Nothing $ do
|
liftIO $ catchDefaultIO Nothing $ do
|
||||||
timestamp <- modificationTime <$> getFileStatus f
|
timestamp <- modificationTime <$> getFileStatus f
|
||||||
#ifndef mingw32_HOST_OS
|
let fromstatus = Just (realToFrac timestamp)
|
||||||
t <- readishTime <$> readFile f
|
fromfile <- readishTime <$> readFile f
|
||||||
return $ if Just (realToFrac timestamp) == t
|
return $ if matchingtimestamp fromfile fromstatus
|
||||||
then Just timestamp
|
then Just timestamp
|
||||||
else Nothing
|
else Nothing
|
||||||
#else
|
|
||||||
return $ Just timestamp
|
|
||||||
#endif
|
|
||||||
where
|
where
|
||||||
readishTime :: String -> Maybe POSIXTime
|
readishTime :: String -> Maybe POSIXTime
|
||||||
readishTime s = utcTimeToPOSIXSeconds <$>
|
readishTime s = utcTimeToPOSIXSeconds <$>
|
||||||
parseTime defaultTimeLocale "%s%Qs" s
|
parseTime defaultTimeLocale "%s%Qs" s
|
||||||
|
matchingtimestamp fromfile fromstatus =
|
||||||
|
#ifndef mingw32_HOST_OS
|
||||||
|
fromfile == fromstatus
|
||||||
|
#else
|
||||||
|
fromfile >= fromstatus
|
||||||
|
#endif
|
||||||
|
|
|
@ -15,9 +15,6 @@ import Common
|
||||||
import Git
|
import Git
|
||||||
import Git.Types
|
import Git.Types
|
||||||
import qualified Utility.CoProcess as CoProcess
|
import qualified Utility.CoProcess as CoProcess
|
||||||
#ifdef mingw32_HOST_OS
|
|
||||||
import Git.FilePath
|
|
||||||
#endif
|
|
||||||
import Utility.Batch
|
import Utility.Batch
|
||||||
|
|
||||||
{- Constructs a git command line operating on the specified repo. -}
|
{- Constructs a git command line operating on the specified repo. -}
|
||||||
|
|
11
Git/Queue.hs
11
Git/Queue.hs
|
@ -17,16 +17,17 @@ module Git.Queue (
|
||||||
flush,
|
flush,
|
||||||
) where
|
) where
|
||||||
|
|
||||||
import qualified Data.Map as M
|
|
||||||
import System.IO
|
|
||||||
import System.Process
|
|
||||||
|
|
||||||
import Utility.SafeCommand
|
import Utility.SafeCommand
|
||||||
import Common
|
import Common
|
||||||
import Git
|
import Git
|
||||||
import Git.Command
|
import Git.Command
|
||||||
import qualified Git.UpdateIndex
|
import qualified Git.UpdateIndex
|
||||||
|
|
||||||
|
import qualified Data.Map as M
|
||||||
|
#ifndef mingw32_HOST_OS
|
||||||
|
import System.Process
|
||||||
|
#endif
|
||||||
|
|
||||||
{- Queable actions that can be performed in a git repository.
|
{- Queable actions that can be performed in a git repository.
|
||||||
-}
|
-}
|
||||||
data Action
|
data Action
|
||||||
|
@ -149,6 +150,7 @@ runAction repo (UpdateIndexAction streamers) =
|
||||||
Git.UpdateIndex.streamUpdateIndex repo $ reverse streamers
|
Git.UpdateIndex.streamUpdateIndex repo $ reverse streamers
|
||||||
runAction repo action@(CommandAction {}) =
|
runAction repo action@(CommandAction {}) =
|
||||||
#ifndef mingw32_HOST_OS
|
#ifndef mingw32_HOST_OS
|
||||||
|
let p = (proc "xargs" $ "-0":"git":toCommand gitparams) { env = gitEnv repo }
|
||||||
withHandle StdinHandle createProcessSuccess p $ \h -> do
|
withHandle StdinHandle createProcessSuccess p $ \h -> do
|
||||||
fileEncoding h
|
fileEncoding h
|
||||||
hPutStr h $ intercalate "\0" $ toCommand $ getFiles action
|
hPutStr h $ intercalate "\0" $ toCommand $ getFiles action
|
||||||
|
@ -162,6 +164,5 @@ runAction repo action@(CommandAction {}) =
|
||||||
void $ boolSystem "git" (gitparams ++ [f])
|
void $ boolSystem "git" (gitparams ++ [f])
|
||||||
#endif
|
#endif
|
||||||
where
|
where
|
||||||
p = (proc "xargs" $ "-0":"git":toCommand gitparams) { env = gitEnv repo }
|
|
||||||
gitparams = gitCommandLine
|
gitparams = gitCommandLine
|
||||||
(Param (getSubcommand action):getParams action) repo
|
(Param (getSubcommand action):getParams action) repo
|
||||||
|
|
|
@ -11,7 +11,9 @@ module Utility.LogFile where
|
||||||
|
|
||||||
import Common
|
import Common
|
||||||
|
|
||||||
|
#ifndef mingw32_HOST_OS
|
||||||
import System.Posix.Types
|
import System.Posix.Types
|
||||||
|
#endif
|
||||||
|
|
||||||
#ifndef mingw32_HOST_OS
|
#ifndef mingw32_HOST_OS
|
||||||
openLog :: FilePath -> IO Fd
|
openLog :: FilePath -> IO Fd
|
||||||
|
|
|
@ -18,7 +18,6 @@ import Data.Char
|
||||||
import Control.Applicative
|
import Control.Applicative
|
||||||
|
|
||||||
#ifdef mingw32_HOST_OS
|
#ifdef mingw32_HOST_OS
|
||||||
import Data.Char
|
|
||||||
import qualified System.FilePath.Posix as Posix
|
import qualified System.FilePath.Posix as Posix
|
||||||
#else
|
#else
|
||||||
import System.Posix.Files
|
import System.Posix.Files
|
||||||
|
|
|
@ -23,7 +23,6 @@ import Network.HTTP.Types
|
||||||
import System.Log.Logger
|
import System.Log.Logger
|
||||||
import qualified Data.CaseInsensitive as CI
|
import qualified Data.CaseInsensitive as CI
|
||||||
import Network.Socket
|
import Network.Socket
|
||||||
import Control.Exception
|
|
||||||
import "crypto-api" Crypto.Random
|
import "crypto-api" Crypto.Random
|
||||||
import qualified Web.ClientSession as CS
|
import qualified Web.ClientSession as CS
|
||||||
import qualified Data.ByteString.Lazy as L
|
import qualified Data.ByteString.Lazy as L
|
||||||
|
@ -39,6 +38,10 @@ import Control.Concurrent
|
||||||
#ifdef __ANDROID__
|
#ifdef __ANDROID__
|
||||||
import Data.Endian
|
import Data.Endian
|
||||||
#endif
|
#endif
|
||||||
|
#if defined(__ANDROID__) || defined (mingw32_HOST_OS)
|
||||||
|
#else
|
||||||
|
import Control.Exception (bracketOnError)
|
||||||
|
#endif
|
||||||
|
|
||||||
localhost :: HostName
|
localhost :: HostName
|
||||||
localhost = "localhost"
|
localhost = "localhost"
|
||||||
|
|
|
@ -11,9 +11,5 @@ module Utility.WinProcess where
|
||||||
|
|
||||||
import Utility.PID
|
import Utility.PID
|
||||||
|
|
||||||
import System.Win32.Process
|
|
||||||
import Foreign.C
|
|
||||||
import Control.Exception
|
|
||||||
|
|
||||||
foreign import ccall unsafe "terminatepid"
|
foreign import ccall unsafe "terminatepid"
|
||||||
terminatePID :: PID -> IO ()
|
terminatePID :: PID -> IO ()
|
||||||
|
|
Loading…
Add table
Reference in a new issue