2 Module : Gargantext.Text.Parsers
3 Description : All parsers of Gargantext in one file.
4 Copyright : (c) CNRS, 2017
5 License : AGPL + CECILL v3
6 Maintainer : team@gargantext.org
7 Stability : experimental
10 Gargantext enables analyzing semi-structured text that should be parsed
11 in order to be analyzed.
13 The parsers suppose we know the format of the Text (TextFormat data
14 type) according to which the right parser is chosen among the list of
17 This module mainly describe how to add a new parser to Gargantext,
18 please follow the types.
21 {-# LANGUAGE NoImplicitPrelude #-}
22 {-# LANGUAGE PackageImports #-}
23 {-# LANGUAGE OverloadedStrings #-}
25 module Gargantext.Text.Parsers (parse, FileFormat(..), clean, parseDocs)
28 import System.FilePath (FilePath(), takeExtension)
29 import "zip" Codec.Archive.Zip (withArchive, getEntry, getEntries)
31 import Control.Monad (join)
32 import qualified Data.Time as DT
33 import Data.Either.Extra (partitionEithers)
34 import Data.Time (UTCTime(..))
35 import Data.List (concat)
36 import qualified Data.Map as DM
37 import qualified Data.ByteString as DB
40 import Data.Either(Either(..))
41 import Data.Attoparsec.ByteString (parseOnly, Parser)
43 import Data.Text (Text)
44 import qualified Data.Text as DT
46 -- Activate Async for to parse in parallel
47 import Control.Concurrent.Async as CCA (mapConcurrently)
49 import Data.Text.Encoding (decodeUtf8)
50 import Data.String (String())
51 import Data.List (lookup)
53 ------------------------------------------------------------------------
54 import Gargantext.Core (Lang(..))
55 import Gargantext.Prelude
56 import Gargantext.Database.Types.Node (HyperdataDocument(..))
57 import Gargantext.Text.Parsers.WOS (wosParser)
58 import Gargantext.Text.Parsers.Date (parseDate)
59 import Gargantext.Text.Terms.Stop (detectLang)
60 ------------------------------------------------------------------------
62 type ParseError = String
64 --type Document = DM.Map Field Text
65 --type FilesParsed = DM.Map FilePath FileParsed
66 --data FileParsed = FileParsed { _fileParsed_errors :: Maybe ParseError
67 -- , _fileParsed_result :: [Document]
71 -- | According to the format of Input file,
72 -- different parser are available.
76 -- Implemented (ISI Format)
77 -- | DOC -- Not Implemented / import Pandoc
78 -- | ODT -- Not Implemented / import Pandoc
79 -- | PDF -- Not Implemented / pdftotext and import Pandoc ?
80 -- | XML -- Not Implemented / see :
81 -- -- > http://chrisdone.com/posts/fast-haskell-c-parsing-xml
83 -- TODO: to debug maybe add the filepath in error message
86 -- | Parse file into documents
87 -- TODO manage errors here
88 parseDocs :: FileFormat -> FilePath -> IO [HyperdataDocument]
89 parseDocs format path = do
90 docs <- snd <$> parse format path
91 mapM (toDoc format) docs
97 -- | Parse date to Ints
98 -- TODO add hours, minutes and seconds
99 parseDate' :: Lang -> Maybe Text -> IO (Maybe UTCTime, (Maybe Year, Maybe Month, Maybe Day))
100 parseDate' _ Nothing = pure (Nothing, (Nothing, Nothing, Nothing))
101 parseDate' l (Just txt) = do
102 utcTime <- parseDate l txt
103 let (UTCTime day _) = utcTime
104 let (y,m,d) = DT.toGregorian day
105 pure (Just utcTime, (Just (fromIntegral y),Just m,Just d))
108 toDoc :: FileFormat -> [(Text, Text)] -> IO HyperdataDocument
111 let abstract = lookup "abstract" d
112 let lang = maybe EN identity (join $ detectLang <$> (fmap (DT.take 50) abstract))
114 let dateToParse = DT.replace "-" " " <$> lookup "PY" d <> Just " " <> lookup "publication_date" d
116 (utcTime, (pub_year, pub_month, pub_day)) <- parseDate' lang dateToParse
118 pure $ HyperdataDocument (Just $ DT.pack $ show format)
127 (lookup "abstract" d)
128 (fmap (DT.pack . show) utcTime)
135 (Just $ (DT.pack . show) lang)
138 parse :: FileFormat -> FilePath -> IO ([ParseError], [[(Text, Text)]])
139 parse format path = do
140 files <- case takeExtension path of
141 ".zip" -> openZip path
142 _ -> pure <$> DB.readFile path
143 (as, bs) <- partitionEithers <$> mapConcurrently (runParser format) files
144 pure (as, map toText $ concat bs)
146 -- TODO : decode with bayesian inference on encodings
147 toText = map (\(a,b) -> (decodeUtf8 a, decodeUtf8 b))
151 -- According to the format of the text, choose the right parser.
152 -- TODO withParser :: FileFormat -> Parser [Document]
153 withParser :: FileFormat -> Parser [[(DB.ByteString, DB.ByteString)]]
154 withParser WOS = wosParser
155 --withParser DOC = docParser
156 --withParser ODT = odtParser
157 --withParser XML = xmlParser
158 --withParser _ = error "[ERROR] Parser not implemented yet"
160 runParser :: FileFormat -> DB.ByteString
161 -> IO (Either String [[(DB.ByteString, DB.ByteString)]])
162 runParser format text = pure $ parseOnly (withParser format) text
164 openZip :: FilePath -> IO [DB.ByteString]
166 entries <- withArchive fp (DM.keys <$> getEntries)
167 bs <- mapConcurrently (\s -> withArchive fp (getEntry s)) entries
170 clean :: Text -> Text
171 clean txt = DT.map clean' txt