2014-04-11 03:20:12 +00:00
|
|
|
{-# LANGUAGE BangPatterns #-}
|
2014-04-01 05:12:05 +00:00
|
|
|
|
2014-04-01 19:26:34 +00:00
|
|
|
-- | Docker support for propellor
|
|
|
|
--
|
|
|
|
-- The existance of a docker container is just another Property of a system,
|
|
|
|
-- which propellor can set up. See config.hs for an example.
|
|
|
|
|
2014-06-01 01:36:09 +00:00
|
|
|
module Propellor.Property.Docker (
|
2014-06-01 01:44:50 +00:00
|
|
|
-- * Host properties
|
2014-06-01 01:36:09 +00:00
|
|
|
installed,
|
2014-06-01 01:44:50 +00:00
|
|
|
configured,
|
2014-06-01 01:36:09 +00:00
|
|
|
container,
|
|
|
|
docked,
|
2014-06-01 17:35:21 +00:00
|
|
|
memoryLimited,
|
2014-06-01 01:36:09 +00:00
|
|
|
garbageCollected,
|
2014-09-19 03:50:13 +00:00
|
|
|
tweaked,
|
2014-06-01 01:44:50 +00:00
|
|
|
Image,
|
|
|
|
ContainerName,
|
2014-11-20 03:11:34 +00:00
|
|
|
Container,
|
2014-06-01 01:36:09 +00:00
|
|
|
-- * Container configuration
|
|
|
|
dns,
|
|
|
|
hostname,
|
|
|
|
publish,
|
|
|
|
expose,
|
|
|
|
user,
|
|
|
|
volume,
|
|
|
|
volumes_from,
|
|
|
|
workdir,
|
|
|
|
memory,
|
2014-06-01 17:35:21 +00:00
|
|
|
cpuShares,
|
2014-06-01 01:36:09 +00:00
|
|
|
link,
|
2014-06-01 01:44:50 +00:00
|
|
|
ContainerAlias,
|
2014-10-23 16:28:33 +00:00
|
|
|
restartAlways,
|
|
|
|
restartOnFailure,
|
|
|
|
restartNever,
|
2014-06-01 01:36:09 +00:00
|
|
|
-- * Internal use
|
2014-11-19 05:28:38 +00:00
|
|
|
init,
|
2014-06-01 01:36:09 +00:00
|
|
|
chain,
|
|
|
|
) where
|
2014-03-31 01:01:18 +00:00
|
|
|
|
2014-11-19 05:28:38 +00:00
|
|
|
import Propellor hiding (init)
|
2014-11-21 22:55:33 +00:00
|
|
|
import Propellor.Types.Docker
|
2014-03-31 03:37:54 +00:00
|
|
|
import qualified Propellor.Property.File as File
|
|
|
|
import qualified Propellor.Property.Apt as Apt
|
2014-11-20 19:15:28 +00:00
|
|
|
import qualified Propellor.Shim as Shim
|
2014-04-01 05:12:05 +00:00
|
|
|
import Utility.SafeCommand
|
2014-04-01 17:51:58 +00:00
|
|
|
import Utility.Path
|
2014-11-19 05:02:13 +00:00
|
|
|
import Utility.ThreadScheduler
|
2014-04-01 17:51:58 +00:00
|
|
|
|
2014-06-01 01:36:09 +00:00
|
|
|
import Control.Concurrent.Async hiding (link)
|
2014-04-02 00:23:11 +00:00
|
|
|
import System.Posix.Directory
|
2014-04-04 22:21:54 +00:00
|
|
|
import System.Posix.Process
|
2014-11-19 05:28:38 +00:00
|
|
|
import Prelude hiding (init)
|
|
|
|
import Data.List hiding (init)
|
2014-04-08 04:49:49 +00:00
|
|
|
import Data.List.Utils
|
2014-11-20 04:21:40 +00:00
|
|
|
import qualified Data.Map as M
|
2014-04-01 05:12:05 +00:00
|
|
|
|
2014-06-01 01:44:50 +00:00
|
|
|
installed :: Property
|
|
|
|
installed = Apt.installed ["docker.io"]
|
|
|
|
|
2014-03-31 03:59:07 +00:00
|
|
|
-- | Configures docker with an authentication file, so that images can be
|
2014-06-01 01:44:50 +00:00
|
|
|
-- pushed to index.docker.io. Optional.
|
2014-03-31 01:01:18 +00:00
|
|
|
configured :: Property
|
2014-07-06 19:56:56 +00:00
|
|
|
configured = prop `requires` installed
|
2014-03-31 01:03:42 +00:00
|
|
|
where
|
2014-12-14 20:14:05 +00:00
|
|
|
prop = withPrivData src anyContext $ \getcfg ->
|
2014-07-06 19:56:56 +00:00
|
|
|
property "docker configured" $ getcfg $ \cfg -> ensureProperty $
|
|
|
|
"/root/.dockercfg" `File.hasContent` (lines cfg)
|
2014-12-14 20:14:05 +00:00
|
|
|
src = PrivDataSourceFileFromCommand DockerAuthentication
|
|
|
|
"/root/.dockercfg" "docker login"
|
2014-04-01 05:12:05 +00:00
|
|
|
|
2014-04-11 03:20:12 +00:00
|
|
|
-- | A short descriptive name for a container.
|
|
|
|
-- Should not contain whitespace or other unusual characters,
|
|
|
|
-- only [a-zA-Z0-9_-] are allowed
|
|
|
|
type ContainerName = String
|
|
|
|
|
2014-11-20 03:11:34 +00:00
|
|
|
-- | A docker container.
|
|
|
|
data Container = Container Image Host
|
|
|
|
|
|
|
|
instance Hostlike Container where
|
|
|
|
(Container i h) & p = Container i (h & p)
|
|
|
|
(Container i h) &^ p = Container i (h &^ p)
|
2014-11-20 18:06:55 +00:00
|
|
|
getHost (Container _ h) = h
|
2014-11-20 03:11:34 +00:00
|
|
|
|
2014-11-20 18:06:55 +00:00
|
|
|
-- | Defines a Container with a given name, image, and properties.
|
|
|
|
-- Properties can be added to configure the Container.
|
2014-04-11 03:20:12 +00:00
|
|
|
--
|
|
|
|
-- > container "web-server" "debian"
|
|
|
|
-- > & publish "80:80"
|
|
|
|
-- > & Apt.installed {"apache2"]
|
|
|
|
-- > & ...
|
2014-11-20 03:11:34 +00:00
|
|
|
container :: ContainerName -> Image -> Container
|
2014-11-20 04:21:40 +00:00
|
|
|
container cn image = Container image (Host cn [] info)
|
2014-04-11 03:20:12 +00:00
|
|
|
where
|
2014-11-20 03:11:34 +00:00
|
|
|
info = dockerInfo mempty
|
2014-04-11 03:20:12 +00:00
|
|
|
|
2014-11-20 03:11:34 +00:00
|
|
|
-- | Ensures that a docker container is set up and running.
|
2014-06-01 01:44:50 +00:00
|
|
|
--
|
|
|
|
-- The container has its own Properties which are handled by running
|
|
|
|
-- propellor inside the container.
|
2014-05-31 20:48:14 +00:00
|
|
|
--
|
2014-07-06 21:54:06 +00:00
|
|
|
-- When the container's Properties include DNS info, such as a CNAME,
|
2014-11-20 03:11:34 +00:00
|
|
|
-- that is propigated to the Info of the Host it's docked in.
|
2014-04-02 16:13:39 +00:00
|
|
|
--
|
|
|
|
-- Reverting this property ensures that the container is stopped and
|
|
|
|
-- removed.
|
2014-11-20 18:06:55 +00:00
|
|
|
docked :: Container -> RevertableProperty
|
2014-11-20 03:11:34 +00:00
|
|
|
docked ctr@(Container _ h) = RevertableProperty
|
2014-11-20 18:06:55 +00:00
|
|
|
(propigateContainerInfo ctr (go "docked" setup))
|
2014-05-31 20:48:14 +00:00
|
|
|
(go "undocked" teardown)
|
2014-04-10 21:46:03 +00:00
|
|
|
where
|
2014-11-20 03:11:34 +00:00
|
|
|
cn = hostName h
|
|
|
|
|
2014-04-18 07:59:06 +00:00
|
|
|
go desc a = property (desc ++ " " ++ cn) $ do
|
2014-06-01 00:48:23 +00:00
|
|
|
hn <- asks hostName
|
2014-10-08 17:14:21 +00:00
|
|
|
let cid = ContainerId hn cn
|
2014-11-20 03:11:34 +00:00
|
|
|
ensureProperties [a cid (mkContainerInfo cid ctr)]
|
2014-04-10 21:46:03 +00:00
|
|
|
|
2014-11-20 03:11:34 +00:00
|
|
|
setup cid (ContainerInfo image runparams) =
|
2014-04-10 21:46:03 +00:00
|
|
|
provisionContainer cid
|
|
|
|
`requires`
|
2014-04-11 03:20:12 +00:00
|
|
|
runningContainer cid image runparams
|
2014-04-10 21:46:03 +00:00
|
|
|
`requires`
|
|
|
|
installed
|
|
|
|
|
2014-11-20 03:11:34 +00:00
|
|
|
teardown cid (ContainerInfo image _runparams) =
|
2014-04-10 21:46:03 +00:00
|
|
|
combineProperties ("undocked " ++ fromContainerId cid)
|
|
|
|
[ stoppedContainer cid
|
2014-04-18 07:59:06 +00:00
|
|
|
, property ("cleaned up " ++ fromContainerId cid) $
|
2014-04-10 21:22:32 +00:00
|
|
|
liftIO $ report <$> mapM id
|
2014-04-03 00:56:02 +00:00
|
|
|
[ removeContainer cid
|
|
|
|
, removeImage image
|
|
|
|
]
|
|
|
|
]
|
2014-04-02 04:52:39 +00:00
|
|
|
|
2014-11-20 18:06:55 +00:00
|
|
|
propigateContainerInfo :: Container -> Property -> Property
|
|
|
|
propigateContainerInfo ctr@(Container _ h) p =
|
|
|
|
propigateInfo ctr p (<> dockerinfo)
|
2014-07-06 21:54:06 +00:00
|
|
|
where
|
2014-11-20 18:06:55 +00:00
|
|
|
dockerinfo = dockerInfo $
|
|
|
|
mempty { _dockerContainers = M.singleton (hostName h) h }
|
2014-05-31 20:48:14 +00:00
|
|
|
|
2014-11-20 03:11:34 +00:00
|
|
|
mkContainerInfo :: ContainerId -> Container -> ContainerInfo
|
|
|
|
mkContainerInfo cid@(ContainerId hn _cn) (Container img h) =
|
|
|
|
ContainerInfo img runparams
|
2014-04-11 03:20:12 +00:00
|
|
|
where
|
2014-11-20 04:21:40 +00:00
|
|
|
runparams = map (\(DockerRunParam mkparam) -> mkparam hn)
|
|
|
|
(_dockerRunParams info)
|
2014-06-09 05:45:58 +00:00
|
|
|
info = _dockerinfo $ hostInfo h'
|
2014-10-08 17:14:21 +00:00
|
|
|
h' = h
|
2014-10-23 15:33:00 +00:00
|
|
|
-- Restart by default so container comes up on
|
|
|
|
-- boot or when docker is upgraded.
|
2014-10-23 16:28:33 +00:00
|
|
|
&^ restartAlways
|
2014-10-23 15:33:00 +00:00
|
|
|
-- Expose propellor directory inside the container.
|
2014-04-11 03:20:12 +00:00
|
|
|
& volume (localdir++":"++localdir)
|
2014-10-23 15:33:00 +00:00
|
|
|
-- Name the container in a predictable way so we
|
|
|
|
-- and the user can easily find it later. This property
|
|
|
|
-- comes last, so it cannot be overridden.
|
2014-04-11 03:20:12 +00:00
|
|
|
& name (fromContainerId cid)
|
|
|
|
|
2014-04-02 03:24:31 +00:00
|
|
|
-- | Causes *any* docker images that are not in use by running containers to
|
|
|
|
-- be deleted. And deletes any containers that propellor has set up
|
|
|
|
-- before that are not currently running. Does not delete any containers
|
|
|
|
-- that were not set up using propellor.
|
|
|
|
--
|
|
|
|
-- Generally, should come after the properties for the desired containers.
|
|
|
|
garbageCollected :: Property
|
|
|
|
garbageCollected = propertyList "docker garbage collected"
|
|
|
|
[ gccontainers
|
|
|
|
, gcimages
|
|
|
|
]
|
|
|
|
where
|
2014-04-18 07:59:06 +00:00
|
|
|
gccontainers = property "docker containers garbage collected" $
|
2014-04-10 21:22:32 +00:00
|
|
|
liftIO $ report <$> (mapM removeContainer =<< listContainers AllContainers)
|
2014-04-18 07:59:06 +00:00
|
|
|
gcimages = property "docker images garbage collected" $ do
|
2014-04-10 21:22:32 +00:00
|
|
|
liftIO $ report <$> (mapM removeImage =<< listImages)
|
2014-04-02 03:24:31 +00:00
|
|
|
|
2014-09-19 03:50:13 +00:00
|
|
|
-- | Tweaks a container to work well with docker.
|
|
|
|
--
|
|
|
|
-- Currently, this consists of making pam_loginuid lines optional in
|
2014-12-09 18:22:37 +00:00
|
|
|
-- the pam config, to work around <https://github.com/docker/docker/issues/5663>
|
2014-09-19 03:50:13 +00:00
|
|
|
-- which affects docker 1.2.0.
|
|
|
|
tweaked :: Property
|
|
|
|
tweaked = trivial $
|
|
|
|
cmdProperty "sh" ["-c", "sed -ri 's/^session\\s+required\\s+pam_loginuid.so$/session optional pam_loginuid.so/' /etc/pam.d/*"]
|
|
|
|
`describe` "tweaked for docker"
|
|
|
|
|
2014-06-01 17:35:21 +00:00
|
|
|
-- | Configures the kernel to respect docker memory limits.
|
|
|
|
--
|
|
|
|
-- This assumes the system boots using grub 2. And that you don't need any
|
|
|
|
-- other GRUB_CMDLINE_LINUX_DEFAULT settings.
|
|
|
|
--
|
|
|
|
-- Only takes effect after reboot. (Not automated.)
|
|
|
|
memoryLimited :: Property
|
|
|
|
memoryLimited = "/etc/default/grub" `File.containsLine` cfg
|
|
|
|
`describe` "docker memory limited"
|
|
|
|
`onChange` cmdProperty "update-grub" []
|
|
|
|
where
|
|
|
|
cmdline = "cgroup_enable=memory swapaccount=1"
|
|
|
|
cfg = "GRUB_CMDLINE_LINUX_DEFAULT=\""++cmdline++"\""
|
|
|
|
|
2014-11-20 03:11:34 +00:00
|
|
|
data ContainerInfo = ContainerInfo Image [RunParam]
|
2014-04-02 01:53:11 +00:00
|
|
|
|
|
|
|
-- | Parameters to pass to `docker run` when creating a container.
|
|
|
|
type RunParam = String
|
2014-04-01 05:12:05 +00:00
|
|
|
|
|
|
|
-- | A docker image, that can be used to run a container.
|
|
|
|
type Image = String
|
|
|
|
|
2014-04-02 01:53:11 +00:00
|
|
|
-- | Set custom dns server for container.
|
2014-04-18 07:59:06 +00:00
|
|
|
dns :: String -> Property
|
2014-04-02 01:53:11 +00:00
|
|
|
dns = runProp "dns"
|
|
|
|
|
|
|
|
-- | Set container host name.
|
2014-04-18 07:59:06 +00:00
|
|
|
hostname :: String -> Property
|
2014-04-02 01:53:11 +00:00
|
|
|
hostname = runProp "hostname"
|
|
|
|
|
2014-10-23 15:33:00 +00:00
|
|
|
-- | Set name of container.
|
2014-04-18 07:59:06 +00:00
|
|
|
name :: String -> Property
|
2014-04-02 01:53:11 +00:00
|
|
|
name = runProp "name"
|
|
|
|
|
|
|
|
-- | Publish a container's port to the host
|
|
|
|
-- (format: ip:hostPort:containerPort | ip::containerPort | hostPort:containerPort)
|
2014-04-18 07:59:06 +00:00
|
|
|
publish :: String -> Property
|
2014-04-02 01:53:11 +00:00
|
|
|
publish = runProp "publish"
|
|
|
|
|
2014-05-19 21:27:21 +00:00
|
|
|
-- | Expose a container's port without publishing it.
|
|
|
|
expose :: String -> Property
|
|
|
|
expose = runProp "expose"
|
|
|
|
|
2014-04-02 01:53:11 +00:00
|
|
|
-- | Username or UID for container.
|
2014-04-18 07:59:06 +00:00
|
|
|
user :: String -> Property
|
2014-04-02 01:53:11 +00:00
|
|
|
user = runProp "user"
|
|
|
|
|
2014-04-08 05:21:23 +00:00
|
|
|
-- | Mount a volume
|
|
|
|
-- Create a bind mount with: [host-dir]:[container-dir]:[rw|ro]
|
|
|
|
-- With just a directory, creates a volume in the container.
|
2014-04-18 07:59:06 +00:00
|
|
|
volume :: String -> Property
|
2014-04-02 01:53:11 +00:00
|
|
|
volume = runProp "volume"
|
|
|
|
|
2014-04-08 05:21:23 +00:00
|
|
|
-- | Mount a volume from the specified container into the current
|
|
|
|
-- container.
|
2014-04-18 07:59:06 +00:00
|
|
|
volumes_from :: ContainerName -> Property
|
2014-04-08 05:45:19 +00:00
|
|
|
volumes_from cn = genProp "volumes-from" $ \hn ->
|
2014-04-08 05:21:23 +00:00
|
|
|
fromContainerId (ContainerId hn cn)
|
|
|
|
|
2014-04-02 01:53:11 +00:00
|
|
|
-- | Work dir inside the container.
|
2014-04-18 07:59:06 +00:00
|
|
|
workdir :: String -> Property
|
2014-04-02 01:53:11 +00:00
|
|
|
workdir = runProp "workdir"
|
|
|
|
|
|
|
|
-- | Memory limit for container.
|
2014-06-01 17:35:21 +00:00
|
|
|
-- Format: <number><optional unit>, where unit = b, k, m or g
|
|
|
|
--
|
|
|
|
-- Note: Only takes effect when the host has the memoryLimited property
|
|
|
|
-- enabled.
|
2014-04-18 07:59:06 +00:00
|
|
|
memory :: String -> Property
|
2014-04-02 01:53:11 +00:00
|
|
|
memory = runProp "memory"
|
|
|
|
|
2014-06-01 17:35:21 +00:00
|
|
|
-- | CPU shares (relative weight).
|
2014-06-01 17:40:06 +00:00
|
|
|
--
|
|
|
|
-- By default, all containers run at the same priority, but you can tell
|
|
|
|
-- the kernel to give more CPU time to a container using this property.
|
2014-06-01 17:35:21 +00:00
|
|
|
cpuShares :: Int -> Property
|
|
|
|
cpuShares = runProp "cpu-shares" . show
|
|
|
|
|
2014-04-08 05:10:54 +00:00
|
|
|
-- | Link with another container on the same host.
|
2014-04-18 07:59:06 +00:00
|
|
|
link :: ContainerName -> ContainerAlias -> Property
|
2014-04-19 05:28:46 +00:00
|
|
|
link linkwith calias = genProp "link" $ \hn ->
|
|
|
|
fromContainerId (ContainerId hn linkwith) ++ ":" ++ calias
|
2014-04-08 05:10:54 +00:00
|
|
|
|
|
|
|
-- | A short alias for a linked container.
|
|
|
|
-- Each container has its own alias namespace.
|
|
|
|
type ContainerAlias = String
|
|
|
|
|
2014-10-23 16:28:33 +00:00
|
|
|
-- | This property is enabled by default for docker containers configured by
|
2014-10-23 15:31:00 +00:00
|
|
|
-- propellor; as well as keeping badly behaved containers running,
|
|
|
|
-- it ensures that containers get started back up after reboot or
|
|
|
|
-- after docker is upgraded.
|
2014-10-23 16:28:33 +00:00
|
|
|
restartAlways :: Property
|
|
|
|
restartAlways = runProp "restart" "always"
|
|
|
|
|
|
|
|
-- | Docker will restart the container if it exits nonzero.
|
|
|
|
-- If a number is provided, it will be restarted only up to that many
|
|
|
|
-- times.
|
|
|
|
restartOnFailure :: Maybe Int -> Property
|
|
|
|
restartOnFailure Nothing = runProp "restart" "on-failure"
|
|
|
|
restartOnFailure (Just n) = runProp "restart" ("on-failure:" ++ show n)
|
|
|
|
|
|
|
|
-- | Makes docker not restart a container when it exits
|
2014-10-23 15:33:00 +00:00
|
|
|
-- Note that this includes not restarting it on boot!
|
2014-10-23 16:28:33 +00:00
|
|
|
restartNever :: Property
|
|
|
|
restartNever = runProp "restart" "no"
|
2014-10-23 15:31:00 +00:00
|
|
|
|
2014-04-01 05:12:05 +00:00
|
|
|
-- | A container is identified by its name, and the host
|
|
|
|
-- on which it's deployed.
|
2014-11-20 04:21:40 +00:00
|
|
|
data ContainerId = ContainerId
|
|
|
|
{ containerHostName :: HostName
|
|
|
|
, containerName :: ContainerName
|
|
|
|
}
|
2014-04-02 00:47:25 +00:00
|
|
|
deriving (Eq, Read, Show)
|
2014-04-01 05:12:05 +00:00
|
|
|
|
2014-04-02 01:53:11 +00:00
|
|
|
-- | Two containers with the same ContainerIdent were started from
|
|
|
|
-- the same base image (possibly a different version though), and
|
|
|
|
-- with the same RunParams.
|
|
|
|
data ContainerIdent = ContainerIdent Image HostName ContainerName [RunParam]
|
|
|
|
deriving (Read, Show, Eq)
|
|
|
|
|
2014-04-01 05:12:05 +00:00
|
|
|
toContainerId :: String -> Maybe ContainerId
|
2014-04-02 03:33:06 +00:00
|
|
|
toContainerId s
|
|
|
|
| myContainerSuffix `isSuffixOf` s = case separate (== '.') (desuffix s) of
|
|
|
|
(cn, hn)
|
|
|
|
| null hn || null cn -> Nothing
|
|
|
|
| otherwise -> Just $ ContainerId hn cn
|
|
|
|
| otherwise = Nothing
|
|
|
|
where
|
|
|
|
desuffix = reverse . drop len . reverse
|
|
|
|
len = length myContainerSuffix
|
2014-04-01 05:12:05 +00:00
|
|
|
|
|
|
|
fromContainerId :: ContainerId -> String
|
2014-04-02 03:33:06 +00:00
|
|
|
fromContainerId (ContainerId hn cn) = cn++"."++hn++myContainerSuffix
|
|
|
|
|
|
|
|
myContainerSuffix :: String
|
|
|
|
myContainerSuffix = ".propellor"
|
2014-04-01 05:12:05 +00:00
|
|
|
|
2014-04-01 18:20:59 +00:00
|
|
|
containerDesc :: ContainerId -> Property -> Property
|
|
|
|
containerDesc cid p = p `describe` desc
|
|
|
|
where
|
2014-11-19 05:40:56 +00:00
|
|
|
desc = "container " ++ fromContainerId cid ++ " " ++ propertyDesc p
|
2014-04-01 17:51:58 +00:00
|
|
|
|
2014-04-11 03:20:12 +00:00
|
|
|
runningContainer :: ContainerId -> Image -> [RunParam] -> Property
|
2014-04-18 07:59:06 +00:00
|
|
|
runningContainer cid@(ContainerId hn cn) image runps = containerDesc cid $ property "running" $ do
|
2014-04-10 21:22:32 +00:00
|
|
|
l <- liftIO $ listContainers RunningContainers
|
2014-04-01 07:48:45 +00:00
|
|
|
if cid `elem` l
|
2014-11-19 05:02:13 +00:00
|
|
|
then checkident =<< liftIO getrunningident
|
2014-04-10 21:22:32 +00:00
|
|
|
else ifM (liftIO $ elem cid <$> listContainers AllContainers)
|
2014-10-10 17:45:43 +00:00
|
|
|
( do
|
|
|
|
-- The container exists, but is not
|
|
|
|
-- running. Its parameters may have
|
|
|
|
-- changed, but we cannot tell without
|
|
|
|
-- starting it up first.
|
|
|
|
void $ liftIO $ startContainer cid
|
2014-10-10 17:51:52 +00:00
|
|
|
-- It can take a while for the container to
|
2014-11-19 05:02:13 +00:00
|
|
|
-- start up enough for its ident file to be
|
|
|
|
-- written, so retry for up to 60 seconds.
|
|
|
|
checkident =<< liftIO (retry 60 $ getrunningident)
|
2014-04-04 19:47:06 +00:00
|
|
|
, go image
|
|
|
|
)
|
2014-04-01 07:48:45 +00:00
|
|
|
where
|
2014-04-01 17:04:24 +00:00
|
|
|
ident = ContainerIdent image hn cn runps
|
2014-04-01 07:48:45 +00:00
|
|
|
|
2014-10-10 17:45:43 +00:00
|
|
|
-- Check if the ident has changed; if so the
|
|
|
|
-- parameters of the container differ and it must
|
|
|
|
-- be restarted.
|
2014-10-10 17:51:52 +00:00
|
|
|
checkident runningident
|
|
|
|
| runningident == Just ident = noChange
|
|
|
|
| otherwise = do
|
|
|
|
void $ liftIO $ stopContainer cid
|
|
|
|
restartcontainer
|
2014-10-10 17:45:43 +00:00
|
|
|
|
2014-04-04 19:47:06 +00:00
|
|
|
restartcontainer = do
|
2014-04-10 21:22:32 +00:00
|
|
|
oldimage <- liftIO $ fromMaybe image <$> commitContainer cid
|
|
|
|
void $ liftIO $ removeContainer cid
|
2014-04-04 19:47:06 +00:00
|
|
|
go oldimage
|
|
|
|
|
2014-11-19 05:02:13 +00:00
|
|
|
getrunningident = readish
|
|
|
|
<$> readProcess' (inContainerProcess cid [] ["cat", propellorIdent])
|
2014-04-04 19:03:03 +00:00
|
|
|
|
2014-11-19 05:02:13 +00:00
|
|
|
retry :: Int -> IO (Maybe a) -> IO (Maybe a)
|
|
|
|
retry 0 _ = return Nothing
|
|
|
|
retry n a = do
|
|
|
|
v <- a
|
|
|
|
case v of
|
|
|
|
Just _ -> return v
|
|
|
|
Nothing -> do
|
|
|
|
threadDelaySeconds (Seconds 1)
|
|
|
|
retry (n-1) a
|
2014-04-01 07:48:45 +00:00
|
|
|
|
2014-04-02 00:47:25 +00:00
|
|
|
go img = do
|
2014-04-10 21:22:32 +00:00
|
|
|
liftIO $ do
|
|
|
|
clearProvisionedFlag cid
|
|
|
|
createDirectoryIfMissing True (takeDirectory $ identFile cid)
|
2014-11-23 02:10:53 +00:00
|
|
|
shim <- liftIO $ Shim.setup (localdir </> "propellor") Nothing (localdir </> shimdir cid)
|
2014-04-10 21:22:32 +00:00
|
|
|
liftIO $ writeFile (identFile cid) (show ident)
|
2014-12-08 05:06:19 +00:00
|
|
|
ensureProperty $ property "run" $ liftIO $
|
|
|
|
toResult <$> runContainer img
|
|
|
|
(runps ++ ["-i", "-d", "-t"])
|
|
|
|
[shim, "--continue", show (DockerInit (fromContainerId cid))]
|
2014-04-01 07:48:45 +00:00
|
|
|
|
2014-04-01 17:51:58 +00:00
|
|
|
-- | Called when propellor is running inside a docker container.
|
2014-04-02 00:47:25 +00:00
|
|
|
-- The string should be the container's ContainerId.
|
2014-04-01 17:51:58 +00:00
|
|
|
--
|
2014-04-04 22:21:54 +00:00
|
|
|
-- This process is effectively init inside the container.
|
|
|
|
-- It even needs to wait on zombie processes!
|
|
|
|
--
|
2014-04-01 17:51:58 +00:00
|
|
|
-- In the foreground, run an interactive bash (or sh) shell,
|
|
|
|
-- so that the user can interact with it when attached to the container.
|
2014-04-02 01:53:11 +00:00
|
|
|
--
|
|
|
|
-- When the system reboots, docker restarts the container, and this is run
|
|
|
|
-- again. So, to make the necessary services get started on boot, this needs
|
|
|
|
-- to provision the container then. However, if the container is already
|
|
|
|
-- being provisioned by the calling propellor, it would be redundant and
|
2014-11-19 05:28:38 +00:00
|
|
|
-- problimatic to also provisoon it here, when not booting up.
|
2014-04-02 01:53:11 +00:00
|
|
|
--
|
|
|
|
-- The solution is a flag file. If the flag file exists, then the container
|
|
|
|
-- was already provisioned. So, it must be a reboot, and time to provision
|
|
|
|
-- again. If the flag file doesn't exist, don't provision here.
|
2014-11-19 05:28:38 +00:00
|
|
|
init :: String -> IO ()
|
|
|
|
init s = case toContainerId s of
|
2014-04-01 17:51:58 +00:00
|
|
|
Nothing -> error $ "Invalid ContainerId: " ++ s
|
2014-04-02 00:47:25 +00:00
|
|
|
Just cid -> do
|
2014-04-02 00:23:11 +00:00
|
|
|
changeWorkingDirectory localdir
|
2014-04-02 00:47:25 +00:00
|
|
|
writeFile propellorIdent . show =<< readIdentFile cid
|
2014-04-04 01:22:37 +00:00
|
|
|
whenM (checkProvisionedFlag cid) $ do
|
2014-04-04 03:30:23 +00:00
|
|
|
let shim = Shim.file (localdir </> "propellor") (localdir </> shimdir cid)
|
2014-11-20 04:21:40 +00:00
|
|
|
unlessM (boolSystem shim [Param "--continue", Param $ show $ toChain cid]) $
|
2014-04-02 01:53:11 +00:00
|
|
|
warningMessage "Boot provision failed!"
|
2014-04-04 22:46:54 +00:00
|
|
|
void $ async $ job reapzombies
|
|
|
|
job $ do
|
2014-04-04 22:50:54 +00:00
|
|
|
void $ tryIO $ ifM (inPath "bash")
|
2014-04-01 19:38:32 +00:00
|
|
|
( boolSystem "bash" [Param "-l"]
|
|
|
|
, boolSystem "/bin/sh" []
|
|
|
|
)
|
|
|
|
putStrLn "Container is still running. Press ^P^Q to detach."
|
2014-04-04 22:21:54 +00:00
|
|
|
where
|
2014-04-04 22:46:54 +00:00
|
|
|
job = forever . void . tryIO
|
2014-04-04 22:21:54 +00:00
|
|
|
reapzombies = void $ getAnyProcessStatus True False
|
2014-04-01 17:51:58 +00:00
|
|
|
|
|
|
|
-- | Once a container is running, propellor can be run inside
|
|
|
|
-- it to provision it.
|
|
|
|
provisionContainer :: ContainerId -> Property
|
2014-07-06 21:58:27 +00:00
|
|
|
provisionContainer cid = containerDesc cid $ property "provisioned" $ liftIO $ do
|
2014-04-04 03:30:23 +00:00
|
|
|
let shim = Shim.file (localdir </> "propellor") (localdir </> shimdir cid)
|
2014-11-20 04:21:40 +00:00
|
|
|
let params = ["--continue", show $ toChain cid]
|
2014-11-18 21:53:42 +00:00
|
|
|
msgh <- mkMessageHandle
|
2014-11-19 05:02:13 +00:00
|
|
|
let p = inContainerProcess cid
|
2014-11-27 23:10:39 +00:00
|
|
|
(if isConsole msgh then ["-it"] else [])
|
2014-11-19 04:30:06 +00:00
|
|
|
(shim : params)
|
2014-11-19 05:02:13 +00:00
|
|
|
r <- withHandle StdoutHandle createProcessSuccess p $
|
2014-11-20 19:15:28 +00:00
|
|
|
processChainOutput
|
2014-04-02 01:53:11 +00:00
|
|
|
when (r /= FailedChange) $
|
|
|
|
setProvisionedFlag cid
|
|
|
|
return r
|
2014-04-01 05:12:05 +00:00
|
|
|
|
2014-11-20 04:21:40 +00:00
|
|
|
toChain :: ContainerId -> CmdLine
|
|
|
|
toChain cid = DockerChain (containerHostName cid) (fromContainerId cid)
|
|
|
|
|
|
|
|
chain :: [Host] -> HostName -> String -> IO ()
|
|
|
|
chain hostlist hn s = case toContainerId s of
|
|
|
|
Nothing -> errorMessage "bad container id"
|
|
|
|
Just cid -> case findHostNoAlias hostlist hn of
|
|
|
|
Nothing -> errorMessage ("cannot find host " ++ hn)
|
|
|
|
Just parenthost -> case M.lookup (containerName cid) (_dockerContainers $ _dockerinfo $ hostInfo parenthost) of
|
|
|
|
Nothing -> errorMessage ("cannot find container " ++ containerName cid ++ " docked on host " ++ hn)
|
|
|
|
Just h -> go cid h
|
|
|
|
where
|
|
|
|
go cid h = do
|
2014-11-19 05:32:09 +00:00
|
|
|
changeWorkingDirectory localdir
|
|
|
|
onlyProcess (provisioningLock cid) $ do
|
2014-12-22 01:33:03 +00:00
|
|
|
r <- runPropellor h $ ensureProperties $
|
2014-12-22 01:14:11 +00:00
|
|
|
hostProperties h
|
2014-11-19 05:32:09 +00:00
|
|
|
putStrLn $ "\n" ++ show r
|
2014-11-19 05:28:38 +00:00
|
|
|
|
2014-04-01 05:12:05 +00:00
|
|
|
stopContainer :: ContainerId -> IO Bool
|
|
|
|
stopContainer cid = boolSystem dockercmd [Param "stop", Param $ fromContainerId cid ]
|
|
|
|
|
2014-10-10 17:45:43 +00:00
|
|
|
startContainer :: ContainerId -> IO Bool
|
|
|
|
startContainer cid = boolSystem dockercmd [Param "start", Param $ fromContainerId cid ]
|
|
|
|
|
2014-04-03 00:56:02 +00:00
|
|
|
stoppedContainer :: ContainerId -> Property
|
2014-04-18 07:59:06 +00:00
|
|
|
stoppedContainer cid = containerDesc cid $ property desc $
|
2014-04-10 21:22:32 +00:00
|
|
|
ifM (liftIO $ elem cid <$> listContainers RunningContainers)
|
|
|
|
( liftIO cleanup `after` ensureProperty
|
2014-12-08 05:06:19 +00:00
|
|
|
(property desc $ liftIO $ toResult <$> stopContainer cid)
|
2014-04-03 00:56:02 +00:00
|
|
|
, return NoChange
|
|
|
|
)
|
|
|
|
where
|
|
|
|
desc = "stopped"
|
2014-04-04 01:22:37 +00:00
|
|
|
cleanup = do
|
|
|
|
nukeFile $ identFile cid
|
|
|
|
removeDirectoryRecursive $ shimdir cid
|
|
|
|
clearProvisionedFlag cid
|
2014-04-02 17:56:16 +00:00
|
|
|
|
2014-04-02 03:24:31 +00:00
|
|
|
removeContainer :: ContainerId -> IO Bool
|
|
|
|
removeContainer cid = catchBoolIO $
|
|
|
|
snd <$> processTranscript dockercmd ["rm", fromContainerId cid ] Nothing
|
|
|
|
|
|
|
|
removeImage :: Image -> IO Bool
|
|
|
|
removeImage image = catchBoolIO $
|
|
|
|
snd <$> processTranscript dockercmd ["rmi", image ] Nothing
|
2014-04-01 05:12:05 +00:00
|
|
|
|
2014-04-01 16:54:51 +00:00
|
|
|
runContainer :: Image -> [RunParam] -> [String] -> IO Bool
|
2014-04-01 07:48:45 +00:00
|
|
|
runContainer image ps cmd = boolSystem dockercmd $ map Param $
|
2014-04-01 16:54:51 +00:00
|
|
|
"run" : (ps ++ image : cmd)
|
2014-04-01 05:12:05 +00:00
|
|
|
|
2014-11-19 05:02:13 +00:00
|
|
|
inContainerProcess :: ContainerId -> [String] -> [String] -> CreateProcess
|
|
|
|
inContainerProcess cid ps cmd = proc dockercmd ("exec" : ps ++ [fromContainerId cid] ++ cmd)
|
2014-11-19 04:30:06 +00:00
|
|
|
|
2014-04-01 05:12:05 +00:00
|
|
|
commitContainer :: ContainerId -> IO (Maybe Image)
|
|
|
|
commitContainer cid = catchMaybeIO $
|
2014-04-01 07:48:45 +00:00
|
|
|
takeWhile (/= '\n')
|
|
|
|
<$> readProcess dockercmd ["commit", fromContainerId cid]
|
2014-04-01 05:12:05 +00:00
|
|
|
|
2014-04-01 17:04:24 +00:00
|
|
|
data ContainerFilter = RunningContainers | AllContainers
|
2014-04-01 16:37:57 +00:00
|
|
|
deriving (Eq)
|
|
|
|
|
2014-04-01 05:12:05 +00:00
|
|
|
-- | Only lists propellor managed containers.
|
2014-04-01 17:04:24 +00:00
|
|
|
listContainers :: ContainerFilter -> IO [ContainerId]
|
2014-04-01 16:37:57 +00:00
|
|
|
listContainers status =
|
2014-04-08 04:49:49 +00:00
|
|
|
catMaybes . map toContainerId . concat . map (split ",")
|
|
|
|
. catMaybes . map (lastMaybe . words) . lines
|
2014-04-01 16:37:57 +00:00
|
|
|
<$> readProcess dockercmd ps
|
|
|
|
where
|
|
|
|
ps
|
2014-04-01 17:04:24 +00:00
|
|
|
| status == AllContainers = baseps ++ ["--all"]
|
2014-04-01 16:37:57 +00:00
|
|
|
| otherwise = baseps
|
|
|
|
baseps = ["ps", "--no-trunc"]
|
2014-04-01 05:12:05 +00:00
|
|
|
|
2014-04-02 03:24:31 +00:00
|
|
|
listImages :: IO [Image]
|
2014-04-02 03:27:52 +00:00
|
|
|
listImages = lines <$> readProcess dockercmd ["images", "--all", "--quiet"]
|
2014-04-02 03:24:31 +00:00
|
|
|
|
2014-04-18 07:59:06 +00:00
|
|
|
runProp :: String -> RunParam -> Property
|
2014-06-09 05:45:58 +00:00
|
|
|
runProp field val = pureInfoProperty (param) $ dockerInfo $
|
2014-11-20 04:21:40 +00:00
|
|
|
mempty { _dockerRunParams = [DockerRunParam (\_ -> "--"++param)] }
|
2014-04-01 05:12:05 +00:00
|
|
|
where
|
|
|
|
param = field++"="++val
|
|
|
|
|
2014-04-18 07:59:06 +00:00
|
|
|
genProp :: String -> (HostName -> RunParam) -> Property
|
2014-06-09 05:45:58 +00:00
|
|
|
genProp field mkval = pureInfoProperty field $ dockerInfo $
|
2014-11-20 04:21:40 +00:00
|
|
|
mempty { _dockerRunParams = [DockerRunParam (\hn -> "--"++field++"=" ++ mkval hn)] }
|
2014-04-08 05:10:54 +00:00
|
|
|
|
2014-11-21 22:55:33 +00:00
|
|
|
dockerInfo :: DockerInfo Host -> Info
|
2014-06-09 05:45:58 +00:00
|
|
|
dockerInfo i = mempty { _dockerinfo = i }
|
2014-06-01 02:00:11 +00:00
|
|
|
|
2014-04-02 01:53:11 +00:00
|
|
|
-- | The ContainerIdent of a container is written to
|
2014-12-09 18:22:37 +00:00
|
|
|
-- </.propellor-ident> inside it. This can be checked to see if
|
2014-04-02 01:53:11 +00:00
|
|
|
-- the container has the same ident later.
|
|
|
|
propellorIdent :: FilePath
|
|
|
|
propellorIdent = "/.propellor-ident"
|
2014-04-01 05:12:05 +00:00
|
|
|
|
2014-04-02 01:53:11 +00:00
|
|
|
provisionedFlag :: ContainerId -> FilePath
|
2014-04-04 01:22:37 +00:00
|
|
|
provisionedFlag cid = "docker" </> fromContainerId cid ++ ".provisioned"
|
2014-04-01 05:12:05 +00:00
|
|
|
|
2014-04-02 01:53:11 +00:00
|
|
|
clearProvisionedFlag :: ContainerId -> IO ()
|
|
|
|
clearProvisionedFlag = nukeFile . provisionedFlag
|
2014-04-01 05:12:05 +00:00
|
|
|
|
2014-04-02 01:53:11 +00:00
|
|
|
setProvisionedFlag :: ContainerId -> IO ()
|
|
|
|
setProvisionedFlag cid = do
|
|
|
|
createDirectoryIfMissing True (takeDirectory (provisionedFlag cid))
|
|
|
|
writeFile (provisionedFlag cid) "1"
|
2014-04-01 05:12:05 +00:00
|
|
|
|
2014-04-02 01:53:11 +00:00
|
|
|
checkProvisionedFlag :: ContainerId -> IO Bool
|
|
|
|
checkProvisionedFlag = doesFileExist . provisionedFlag
|
2014-04-01 05:12:05 +00:00
|
|
|
|
2014-11-19 05:28:38 +00:00
|
|
|
provisioningLock :: ContainerId -> FilePath
|
|
|
|
provisioningLock cid = "docker" </> fromContainerId cid ++ ".lock"
|
|
|
|
|
2014-04-04 01:22:37 +00:00
|
|
|
shimdir :: ContainerId -> FilePath
|
|
|
|
shimdir cid = "docker" </> fromContainerId cid ++ ".shim"
|
|
|
|
|
2014-04-02 01:53:11 +00:00
|
|
|
identFile :: ContainerId -> FilePath
|
2014-04-04 01:22:37 +00:00
|
|
|
identFile cid = "docker" </> fromContainerId cid ++ ".ident"
|
2014-04-01 05:12:05 +00:00
|
|
|
|
2014-04-02 01:53:11 +00:00
|
|
|
readIdentFile :: ContainerId -> IO ContainerIdent
|
|
|
|
readIdentFile cid = fromMaybe (error "bad ident in identFile")
|
|
|
|
. readish <$> readFile (identFile cid)
|
2014-04-01 05:12:05 +00:00
|
|
|
|
2014-04-02 01:53:11 +00:00
|
|
|
dockercmd :: String
|
2014-11-08 19:55:58 +00:00
|
|
|
dockercmd = "docker"
|
2014-04-02 04:52:39 +00:00
|
|
|
|
|
|
|
report :: [Bool] -> Result
|
|
|
|
report rmed
|
|
|
|
| or rmed = MadeChange
|
|
|
|
| otherwise = NoChange
|
|
|
|
|