| Copyright | (c) Ivan A. Malison | 
|---|---|
| License | BSD3-style (see LICENSE) | 
| Maintainer | Ivan A. Malison | 
| Stability | unstable | 
| Portability | unportable | 
| Safe Haskell | Safe-Inferred | 
| Language | Haskell2010 | 
System.Taffybar
Contents
Description
Synopsis
- dyreTaffybar :: TaffybarConfig -> IO ()
- dyreTaffybarMain :: TaffybarConfig -> IO ()
- getTaffyFile :: String -> IO FilePath
- startTaffybar :: TaffybarConfig -> IO ()
- taffybarDyreParams :: Params TaffybarConfig ()
Documentation
Taffybar is a system status bar meant for use with window managers like XMonad and i3wm. Taffybar is somewhat similar to xmobar, but it opts to use more heavy weight GUI in the form of gtk+ rather than the mostly textual approach favored by the latter. This allows it to provide features like an SNI system tray, and a workspace widget with window icons.
Config File
The interface that taffybar provides to the end user is roughly as follows: you give Taffybar a list of ([Taffy]IO actions that build) gtk+ widgets and it renders them in a horizontal bar for you (taking care of ugly details like reserving strut space so that window managers don't put windows over it).
The config file in which you specify the gtk+ widgets to render is just a Haskell source file which is used to produce a custom executable with the desired set of widgets. This approach requires that taffybar be installed as a haskell library (not merely as an executable), and that the ghc compiler be available for recompiling the configuration. The upshot of this approach is that taffybar's behavior and widget set are not limited to the set of widgets provided by the library, because custom code and widgets can be provided to taffybar for instantiation and execution.
The following code snippet is a simple example of what a taffybar configuration might look like (also see System.Taffybar.Example):
{-# LANGUAGE OverloadedStrings #-}
import Data.Default (def)
import System.Taffybar
import System.Taffybar.Information.CPU
import System.Taffybar.SimpleConfig
import System.Taffybar.Widget
import System.Taffybar.Widget.Generic.Graph
import System.Taffybar.Widget.Generic.PollingGraph
cpuCallback = do
  (_, systemLoad, totalLoad) <- cpuLoad
  return [ totalLoad, systemLoad ]
main = do
  let cpuCfg = def
                 { graphDataColors = [ (0, 1, 0, 1), (1, 0, 1, 0.5)]
                 , graphLabel = Just "cpu"
                 }
      clock = textClockNewWith def
      cpu = pollingGraphNew cpuCfg 0.5 cpuCallback
      workspaces = workspacesNew def
      simpleConfig = def
                       { startWidgets = [ workspaces ]
                       , endWidgets = [ sniTrayNew, clock, cpu ]
                       }
  simpleTaffybar simpleConfigThis configuration creates a bar with four widgets. On the left is a widget that shows information about the workspace configuration. The rightmost widget is the system tray, with a clock and then a CPU graph.
The CPU widget plots two graphs on the same widget: total CPU use in green and then system CPU use in a kind of semi-transparent purple on top of the green.
It is important to note that the widget lists are *not* [Widget]. They are actually [TaffyIO Widget] since the bar needs to construct them after performing some GTK initialization.
- Taffybar and DBus
| Taffybar has a strict dependency on dbus, so you must ensure that it is started before starting taffybar.
- If you start your window manager using a graphical login manager like gdm or kdm, DBus should be started automatically for you.
- If you start xmonad with a different graphical login manager that does not start DBus for you automatically, put the line @eval `dbus-launch
- -auto-syntax`@ into your ~/.xsession *before* xmonad and taffybar are started. This command sets some environment variables that the two must agree on.
- If you start xmonad via startxor a similar command, add the above command to ~/.xinitrc
- System tray compatability
| System.Taffybar.Widget.SNITray only supports the newer StatusNotifierItem (SNI) protocol; older xembed applets will not work. AppIndicator is also a valid implementation of SNI.
Additionally, this module does not handle recognising new tray applets. Instead it is necessary to run status-notifier-watcher from the status-notifier-item package early on system startup. In case this is not possible, the alternative widget sniTrayThatStartsWatcherEvenThoughThisIsABadWayToDoIt is available, but this may not necessarily be able to pick up everything.
Colors
While taffybar is based on GTK+, it ignores your GTK+ theme. The default
 theme that it uses lives at
 https://github.com/taffybar/taffybar/blob/master/taffybar.css You can alter
 this theme by editing ~/.config/taffybar/taffybar.css to your liking.
 For an idea of the customizations you can make, see
 https://live.gnome.org/GnomeArt/Tutorials/GtkThemes.
dyreTaffybar :: TaffybarConfig -> IO () Source #
Use Dyre to configure and start taffybar. This will automatically recompile taffybar whenever there are changes to your taffybar.hs configuration file.
dyreTaffybarMain :: TaffybarConfig -> IO () Source #
The main function that should be run by dyre given a TaffybarConfig.
startTaffybar :: TaffybarConfig -> IO () Source #
Start taffybar with the provided TaffybarConfig. This function will not
 handle recompiling taffybar automatically when taffybar.hs is updated. If you
 would like this feature, use dyreTaffybar instead. If automatic
 recompilation is handled by another mechanism such as stack or a custom user
 script or not desired for some reason, it is perfectly fine (and probably
 better) to use this function.
taffybarDyreParams :: Params TaffybarConfig () Source #
The parameters that are passed to Dyre when taffybar is invoked with
 dyreTaffybar.