aboutsummaryrefslogtreecommitdiffstats
path: root/XMonad/Core.hs
diff options
context:
space:
mode:
Diffstat (limited to '')
-rw-r--r--XMonad/Core.hs (renamed from XMonad/EventLoop.hs)4
1 files changed, 2 insertions, 2 deletions
diff --git a/XMonad/EventLoop.hs b/XMonad/Core.hs
index eba8e9d..ff64457 100644
--- a/XMonad/EventLoop.hs
+++ b/XMonad/Core.hs
@@ -1,7 +1,7 @@
{-# LANGUAGE MultiParamTypeClasses #-}
----------------------------------------------------------------------------
-- |
--- Module : EventLoop.hs
+-- Module : Core.hs
-- Copyright : (c) Spencer Janssen 2007
-- License : BSD3-style (see LICENSE)
--
@@ -13,7 +13,7 @@
--
-----------------------------------------------------------------------------
-module XMonad.EventLoop (makeMain) where
+module XMonad.Core (makeMain) where
import Data.Bits
import qualified Data.Map as M