Skip to content

Commit

Permalink
Moved files to proper parent modules.
Browse files Browse the repository at this point in the history
  • Loading branch information
MedeaMelana committed May 4, 2011
1 parent fd3012a commit 32e3cf2
Show file tree
Hide file tree
Showing 5 changed files with 11 additions and 11 deletions.
2 changes: 1 addition & 1 deletion Iso.hs → Data/Iso/Core.hs
@@ -1,6 +1,6 @@
{-# LANGUAGE TypeOperators #-}

module Iso (
module Data.Iso.Core (

-- * Partial isomorphisms
Iso(..), convert, inverse, (<>),
Expand Down
4 changes: 2 additions & 2 deletions TH.hs → Data/Iso/TH.hs
@@ -1,9 +1,9 @@
{-# LANGUAGE TypeOperators #-}
{-# LANGUAGE TemplateHaskell #-}

module TH (deriveIsos) where
module Data.Iso.TH (deriveIsos) where

import Iso
import Data.Iso.Core
import Language.Haskell.TH
import Control.Applicative
import Control.Monad
Expand Down
6 changes: 3 additions & 3 deletions Example.hs
Expand Up @@ -4,9 +4,9 @@

module Example where

import Iso
import JsonGrammar
import TH
import Data.Iso.Core
import Data.Iso.TH
import Language.JsonGrammar

import Prelude hiding (id, (.), head)
import Control.Category
Expand Down
6 changes: 3 additions & 3 deletions JsonGrammar.cabal
Expand Up @@ -20,9 +20,9 @@ Build-type: Simple


Library
Exposed-Modules: Iso,
JsonGrammar,
TH
Exposed-Modules: Data.Iso.Core,
Data.Iso.TH,
Language.JsonGrammar
Build-Depends: base >= 3.0 && < 3.1,
containers >= 0.3 && < 0.4,
aeson >= 0.3 && < 0.4,
Expand Down
4 changes: 2 additions & 2 deletions JsonGrammar.hs → Language/JsonGrammar.hs
Expand Up @@ -2,7 +2,7 @@
{-# LANGUAGE FlexibleInstances #-}
{-# LANGUAGE OverlappingInstances #-}

module JsonGrammar (
module Language.JsonGrammar (
-- * The Json type class
Json(..), fromJson, toJson,

Expand All @@ -11,7 +11,7 @@ module JsonGrammar (

) where

import Iso
import Data.Iso.Core

import Prelude hiding (id, (.), head, maybe)

Expand Down

0 comments on commit 32e3cf2

Please sign in to comment.