diff options
author | Joey Hess <joey@kitenet.net> | 2014-02-18 20:57:14 -0400 |
---|---|---|
committer | Joey Hess <joey@kitenet.net> | 2014-02-18 20:57:14 -0400 |
commit | 935f5ed55b1ed9a218955fdd34cb40db3b1c9425 (patch) | |
tree | 0409ba3b6decae4764b39b0b4b827d093f081039 /Command | |
parent | 59d66243ab57890cbbe7fdc0a7c7c78c24702b95 (diff) |
fix view changing when in subdir
Failed reading some files with relative paths. This is a quick and dirty
fix.
Diffstat (limited to 'Command')
-rw-r--r-- | Command/VAdd.hs | 9 | ||||
-rw-r--r-- | Command/VCycle.hs | 7 | ||||
-rw-r--r-- | Command/VPop.hs | 2 | ||||
-rw-r--r-- | Command/View.hs | 20 |
4 files changed, 16 insertions, 22 deletions
diff --git a/Command/VAdd.hs b/Command/VAdd.hs index a79e91215..e766f3939 100644 --- a/Command/VAdd.hs +++ b/Command/VAdd.hs @@ -9,7 +9,6 @@ module Command.VAdd where import Common.Annex import Command -import Types.View import Annex.View import Logs.View import Command.View (paramView, parseViewParam, checkoutViewBranch) @@ -33,15 +32,11 @@ start params = do Unchanged -> do showNote "unchanged" next $ next $ return True + Narrowing -> next $ next $ + checkoutViewBranch view' narrowView Widening -> error "Widening view to match more files is not currently supported." - Narrowing -> next $ perform view' calc v c [] = (v, c) calc v c (p:ps) = let (v', c') = uncurry (refineView v) (parseViewParam p) in calc v' (max c c') ps - -perform :: View -> CommandPerform -perform view = do - branch <- narrowView view - next $ checkoutViewBranch view branch diff --git a/Command/VCycle.hs b/Command/VCycle.hs index c32ce2eb1..c1bee30b6 100644 --- a/Command/VCycle.hs +++ b/Command/VCycle.hs @@ -32,14 +32,9 @@ start = go =<< currentView then do showNote "unchanged" next $ next $ return True - else next $ perform v' + else next $ next $ checkoutViewBranch v' narrowView vcycle rest (c:cs) | multiValue (viewFilter c) = rest ++ cs ++ [c] | otherwise = vcycle (c:rest) cs vcycle rest c = rest ++ c - -perform :: View -> CommandPerform -perform view = do - branch <- narrowView view - next $ checkoutViewBranch view branch diff --git a/Command/VPop.hs b/Command/VPop.hs index 03905b751..52c2b7f0c 100644 --- a/Command/VPop.hs +++ b/Command/VPop.hs @@ -32,7 +32,7 @@ start = go =<< currentView <$> recentViews case vs of (_v:oldv:_) -> next $ next $ - checkoutViewBranch oldv (branchView oldv) + checkoutViewBranch oldv (return . branchView) _ -> next $ next $ inRepo $ Git.Command.runBool [ Param "checkout" diff --git a/Command/View.hs b/Command/View.hs index 4e642e50f..9e1b981a7 100644 --- a/Command/View.hs +++ b/Command/View.hs @@ -40,8 +40,7 @@ start params = do perform :: View -> CommandPerform perform view = do showSideAction "searching" - branch <- applyView view - next $ checkoutViewBranch view branch + next $ checkoutViewBranch view applyView paramView :: String paramView = paramPair (paramRepeating "FIELD=VALUE") (paramRepeating "TAG") @@ -63,20 +62,25 @@ mkView params = do viewbranch = fromMaybe (error "not on any branch!") <$> inRepo Git.Branch.current -checkoutViewBranch :: View -> Git.Branch -> CommandCleanup -checkoutViewBranch view branch = do +checkoutViewBranch :: View -> (View -> Annex Git.Branch) -> CommandCleanup +checkoutViewBranch view mkbranch = do + oldcwd <- liftIO getCurrentDirectory + + {- Change to top of repository before creating view branch. -} + liftIO . setCurrentDirectory =<< fromRepo Git.repoPath + branch <- mkbranch view + ok <- inRepo $ Git.Command.runBool [ Param "checkout" , Param (show $ Git.Ref.base branch) ] when ok $ do setView view - top <- fromRepo Git.repoPath - cwd <- liftIO getCurrentDirectory {- A git repo can easily have empty directories in it, - and this pollutes the view, so remove them. -} - liftIO $ removeemptydirs top - unlessM (liftIO $ doesDirectoryExist cwd) $ + liftIO $ removeemptydirs "." + unlessM (liftIO $ doesDirectoryExist oldcwd) $ do + top <- fromRepo Git.repoPath showLongNote (cwdmissing top) return ok where |