Skip to content

Commit

Permalink
Change imports to work with functored AST
Browse files Browse the repository at this point in the history
Unfortunately due to https://gitlab.haskell.org/ghc/ghc/-/issues/19507
this cannot be perfectly seamless.
  • Loading branch information
Ericson2314 committed Jun 16, 2022
1 parent a0364f7 commit 0c4eff6
Showing 1 changed file with 4 additions and 1 deletion.
5 changes: 4 additions & 1 deletion src/Text/Pandoc/Lua/Marshal/Citation.hs
Original file line number Diff line number Diff line change
@@ -1,4 +1,6 @@
{-# LANGUAGE ExplicitNamespaces #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE PatternSynonyms #-}
{- |
Copyright : © 2021-2022 Albert Krewinkel
SPDX-License-Identifier : MIT
Expand All @@ -17,7 +19,8 @@ module Text.Pandoc.Lua.Marshal.Citation
import Control.Applicative (optional)
import Data.Maybe (fromMaybe)
import HsLua as Lua
import Text.Pandoc.Definition (Citation (..))
import Text.Pandoc.Definition (Citation, pattern Citation)
import Text.Pandoc.Definition.Functors hiding (type Citation)
import Text.Pandoc.Lua.Marshal.CitationMode (peekCitationMode, pushCitationMode)
import {-# SOURCE #-} Text.Pandoc.Lua.Marshal.Inline
( peekInlinesFuzzy, pushInlines )
Expand Down

0 comments on commit 0c4eff6

Please sign in to comment.