Commit eea7fa9 1 parent 95fff5d commit eea7fa9 Copy full SHA for eea7fa9
File tree 5 files changed +37
-329
lines changed
5 files changed +37
-329
lines changed Original file line number Diff line number Diff line change @@ -16,4 +16,4 @@ source-repository-package
16
16
source-repository-package
17
17
type : git
18
18
location : https://github.com/jgm/djoths
19
- tag : 81a63ca744fc9e4696eea9c1541e31e08d50252f
19
+ tag : fa1bf8a18938bf24ffdf36ff6584524798c5d53f
Original file line number Diff line number Diff line change @@ -45,8 +45,7 @@ import Data.List (foldl')
45
45
readDjot :: (PandocMonad m , ToSources a ) => ReaderOptions -> a -> m Pandoc
46
46
readDjot _opts inp = do
47
47
let sources = toSources inp
48
- case parseDoc ParseOptions { optSourcePositions = False }
49
- (UTF8. fromText $ sourcesToText sources) of
48
+ case parseDoc ParseOptions (UTF8. fromText $ sourcesToText sources) of
50
49
Left e -> throwError $ PandocParseError $ T. pack $ show e
51
50
Right d ->
52
51
runReaderT (doc <$> convertBlocks (D. docBlocks d))
@@ -173,6 +172,8 @@ convertInline (D.Node attr il) = addAttrToInline attr <$>
173
172
D. Subscript ils -> subscript <$> convertInlines ils
174
173
D. Superscript ils -> superscript <$> convertInlines ils
175
174
D. Span ils -> spanWith nullAttr <$> convertInlines ils
175
+ D. Quoted D. DoubleQuotes ils -> doubleQuoted <$> convertInlines ils
176
+ D. Quoted D. SingleQuotes ils -> singleQuoted <$> convertInlines ils
176
177
D. Verbatim bs -> pure $ code (UTF8. toText bs)
177
178
D. Symbol bs -> pure $
178
179
let s = UTF8. toText bs
Original file line number Diff line number Diff line change @@ -299,7 +299,8 @@ normalizeDate' s = fmap (formatTime defaultTimeLocale "%F")
299
299
-- and 'Cm () Blocks' are instances of 'HasAttributes'.
300
300
addPandocAttributes
301
301
:: forall b . HasAttributes (Cm () b ) => [(T. Text , T. Text )] -> b -> b
302
- addPandocAttributes kvs bs = unCm . addAttributes kvs $ (Cm bs :: Cm () b )
302
+ addPandocAttributes kvs bs =
303
+ unCm . addAttributes ((" wrap" ," 1" ): kvs) $ (Cm bs :: Cm () b )
303
304
304
305
-- | Generate infinite lazy list of markers for an ordered list,
305
306
-- depending on list attributes.
You can’t perform that action at this time.
0 commit comments