2014-03-31 03:37:54 +00:00
|
|
|
module Propellor.Property.Apt where
|
2014-03-30 03:10:52 +00:00
|
|
|
|
|
|
|
import Data.Maybe
|
|
|
|
import Control.Applicative
|
|
|
|
import Data.List
|
2014-03-30 05:44:36 +00:00
|
|
|
import System.IO
|
|
|
|
import Control.Monad
|
2014-03-30 03:10:52 +00:00
|
|
|
|
2014-03-31 03:55:59 +00:00
|
|
|
import Propellor
|
2014-03-31 03:37:54 +00:00
|
|
|
import qualified Propellor.Property.File as File
|
|
|
|
import Propellor.Property.File (Line)
|
2014-03-30 03:10:52 +00:00
|
|
|
|
|
|
|
sourcesList :: FilePath
|
|
|
|
sourcesList = "/etc/apt/sources.list"
|
|
|
|
|
|
|
|
type Url = String
|
|
|
|
type Section = String
|
|
|
|
|
2014-04-01 20:58:11 +00:00
|
|
|
showSuite :: DebianSuite -> String
|
2014-03-30 03:10:52 +00:00
|
|
|
showSuite Stable = "stable"
|
|
|
|
showSuite Testing = "testing"
|
|
|
|
showSuite Unstable = "unstable"
|
|
|
|
showSuite Experimental = "experimental"
|
2014-04-01 20:58:11 +00:00
|
|
|
showSuite (DebianRelease r) = r
|
2014-03-30 03:10:52 +00:00
|
|
|
|
2014-04-01 20:58:11 +00:00
|
|
|
debLine :: DebianSuite -> Url -> [Section] -> Line
|
2014-03-30 03:10:52 +00:00
|
|
|
debLine suite mirror sections = unwords $
|
|
|
|
["deb", mirror, showSuite suite] ++ sections
|
|
|
|
|
|
|
|
srcLine :: Line -> Line
|
|
|
|
srcLine l = case words l of
|
|
|
|
("deb":rest) -> unwords $ "deb-src" : rest
|
|
|
|
_ -> ""
|
|
|
|
|
2014-03-30 04:08:02 +00:00
|
|
|
stdSections :: [Section]
|
2014-03-30 03:10:52 +00:00
|
|
|
stdSections = ["main", "contrib", "non-free"]
|
|
|
|
|
2014-04-01 20:58:11 +00:00
|
|
|
debCdn :: DebianSuite -> [Line]
|
2014-03-30 03:10:52 +00:00
|
|
|
debCdn suite = [l, srcLine l]
|
|
|
|
where
|
|
|
|
l = debLine suite "http://cdn.debian.net/debian" stdSections
|
|
|
|
|
2014-03-31 03:37:54 +00:00
|
|
|
{- | Makes sources.list have a standard content using the mirror CDN,
|
2014-04-01 20:58:11 +00:00
|
|
|
- with a particular DebianSuite. -}
|
|
|
|
stdSourcesList :: DebianSuite -> Property
|
2014-03-30 20:04:50 +00:00
|
|
|
stdSourcesList suite = setSourcesList (debCdn suite)
|
|
|
|
`describe` ("standard sources.list for " ++ show suite)
|
2014-03-30 03:10:52 +00:00
|
|
|
|
|
|
|
setSourcesList :: [Line] -> Property
|
2014-03-30 17:12:33 +00:00
|
|
|
setSourcesList ls = sourcesList `File.hasContent` ls `onChange` update
|
2014-03-30 03:10:52 +00:00
|
|
|
|
2014-03-31 03:55:59 +00:00
|
|
|
runApt :: [String] -> Property
|
2014-03-30 05:13:53 +00:00
|
|
|
runApt ps = cmdProperty' "apt-get" ps env
|
|
|
|
where
|
|
|
|
env =
|
|
|
|
[ ("DEBIAN_FRONTEND", "noninteractive")
|
|
|
|
, ("APT_LISTCHANGES_FRONTEND", "none")
|
|
|
|
]
|
|
|
|
|
2014-03-30 03:10:52 +00:00
|
|
|
update :: Property
|
2014-03-31 03:55:59 +00:00
|
|
|
update = runApt ["update"]
|
2014-03-30 19:53:35 +00:00
|
|
|
`describe` "apt update"
|
2014-03-30 03:10:52 +00:00
|
|
|
|
|
|
|
upgrade :: Property
|
2014-03-31 03:55:59 +00:00
|
|
|
upgrade = runApt ["-y", "dist-upgrade"]
|
2014-03-30 19:53:35 +00:00
|
|
|
`describe` "apt dist-upgrade"
|
2014-03-30 03:10:52 +00:00
|
|
|
|
|
|
|
type Package = String
|
|
|
|
|
|
|
|
installed :: [Package] -> Property
|
|
|
|
installed ps = check (isInstallable ps) go
|
2014-03-30 19:53:35 +00:00
|
|
|
`describe` (unwords $ "apt installed":ps)
|
2014-03-30 03:10:52 +00:00
|
|
|
where
|
2014-03-31 03:55:59 +00:00
|
|
|
go = runApt $ ["-y", "install"] ++ ps
|
2014-03-30 03:10:52 +00:00
|
|
|
|
|
|
|
removed :: [Package] -> Property
|
2014-03-31 02:14:14 +00:00
|
|
|
removed ps = check (or <$> isInstalled' ps) go
|
2014-03-30 19:53:35 +00:00
|
|
|
`describe` (unwords $ "apt removed":ps)
|
2014-03-30 03:10:52 +00:00
|
|
|
where
|
2014-03-31 03:55:59 +00:00
|
|
|
go = runApt $ ["-y", "remove"] ++ ps
|
2014-03-30 03:10:52 +00:00
|
|
|
|
2014-04-01 20:58:11 +00:00
|
|
|
buildDep :: [Package] -> Property
|
|
|
|
buildDep ps = check (isInstallable ps) go
|
|
|
|
`describe` (unwords $ "apt build-dep":ps)
|
|
|
|
where
|
|
|
|
go = runApt $ ["-y", "build-dep"] ++ ps
|
|
|
|
|
2014-03-30 03:10:52 +00:00
|
|
|
isInstallable :: [Package] -> IO Bool
|
|
|
|
isInstallable ps = do
|
2014-03-31 02:14:14 +00:00
|
|
|
l <- isInstalled' ps
|
2014-03-30 03:10:52 +00:00
|
|
|
return $ any (== False) l && not (null l)
|
|
|
|
|
2014-03-31 02:14:14 +00:00
|
|
|
isInstalled :: Package -> IO Bool
|
|
|
|
isInstalled p = (== [True]) <$> isInstalled' [p]
|
|
|
|
|
2014-03-31 03:55:59 +00:00
|
|
|
-- | Note that the order of the returned list will not always
|
|
|
|
-- correspond to the order of the input list. The number of items may
|
|
|
|
-- even vary. If apt does not know about a package at all, it will not
|
|
|
|
-- be included in the result list.
|
2014-03-31 02:14:14 +00:00
|
|
|
isInstalled' :: [Package] -> IO [Bool]
|
|
|
|
isInstalled' ps = catMaybes . map parse . lines
|
2014-03-30 03:10:52 +00:00
|
|
|
<$> readProcess "apt-cache" ("policy":ps)
|
|
|
|
where
|
|
|
|
parse l
|
|
|
|
| "Installed: (none)" `isInfixOf` l = Just False
|
|
|
|
| "Installed: " `isInfixOf` l = Just True
|
|
|
|
| otherwise = Nothing
|
|
|
|
|
|
|
|
autoRemove :: Property
|
2014-03-31 03:55:59 +00:00
|
|
|
autoRemove = runApt ["-y", "autoremove"]
|
2014-03-30 19:53:35 +00:00
|
|
|
`describe` "apt autoremove"
|
2014-03-30 05:44:36 +00:00
|
|
|
|
|
|
|
unattendedUpgrades :: Bool -> Property
|
2014-03-30 19:53:35 +00:00
|
|
|
unattendedUpgrades enabled =
|
|
|
|
(if enabled then installed else removed) ["unattended-upgrades"]
|
2014-03-30 05:44:36 +00:00
|
|
|
`onChange` reConfigure "unattended-upgrades"
|
2014-03-30 19:53:35 +00:00
|
|
|
[("unattended-upgrades/enable_auto_updates" , "boolean", v)]
|
|
|
|
`describe` ("unattended upgrades " ++ v)
|
|
|
|
where
|
|
|
|
v
|
|
|
|
| enabled = "true"
|
|
|
|
| otherwise = "false"
|
2014-03-30 05:44:36 +00:00
|
|
|
|
2014-03-31 03:55:59 +00:00
|
|
|
-- | Preseeds debconf values and reconfigures the package so it takes
|
|
|
|
-- effect.
|
2014-03-30 05:44:36 +00:00
|
|
|
reConfigure :: Package -> [(String, String, String)] -> Property
|
|
|
|
reConfigure package vals = reconfigure `requires` setselections
|
2014-03-30 19:53:35 +00:00
|
|
|
`describe` ("reconfigure " ++ package)
|
2014-03-30 05:44:36 +00:00
|
|
|
where
|
2014-03-30 19:31:57 +00:00
|
|
|
setselections = Property "preseed" $ makeChange $
|
2014-03-30 05:44:36 +00:00
|
|
|
withHandle StdinHandle createProcessSuccess
|
|
|
|
(proc "debconf-set-selections" []) $ \h -> do
|
|
|
|
forM_ vals $ \(template, tmpltype, value) ->
|
|
|
|
hPutStrLn h $ unwords [package, template, tmpltype, value]
|
|
|
|
hClose h
|
2014-03-31 03:55:59 +00:00
|
|
|
reconfigure = cmdProperty "dpkg-reconfigure" ["-fnone", package]
|