1 {-# LANGUAGE TemplateHaskell #-}
3 module Gargantext.API.Node.Corpus.Searx where
7 import Control.Lens (view)
8 import qualified Data.Aeson as Aeson
9 import Data.Aeson.TH (deriveJSON)
10 import Data.Either (Either(..))
11 import qualified Data.HashMap.Strict as HashMap
12 import qualified Data.Text as T
13 import Data.Time.Calendar (Day, toGregorian)
14 import Data.Time.Format (defaultTimeLocale, formatTime, parseTimeM)
15 import Data.Tuple.Select (sel1, sel2, sel3)
16 import GHC.Generics (Generic)
17 import Network.HTTP.Client
18 import Network.HTTP.Client.TLS
20 import qualified Prelude
21 import Protolude (catMaybes, encodeUtf8, rightToMaybe, Text)
22 import Gargantext.Prelude
23 import Gargantext.Prelude.Config
25 import Gargantext.Core (Lang(..))
26 import Gargantext.Core.NLP (nlpServerGet)
27 import qualified Gargantext.Core.Text.Corpus.API as API
28 import Gargantext.Core.Text.List (buildNgramsLists)
29 import Gargantext.Core.Text.List.Group.WithStem ({-StopSize(..),-} GroupParams(..))
30 import Gargantext.Core.Text.Terms (TermType(..))
31 import Gargantext.Core.Types.Individu (User(..))
32 import Gargantext.Core.Utils.Prefix (unPrefix)
33 import Gargantext.Database.Action.Flow (insertMasterDocs) --, DataText(..))
34 import Gargantext.Database.Action.Flow.List (flowList_DbRepo)
35 import Gargantext.Database.Action.Flow.Types (FlowCmdM)
36 import Gargantext.Database.Action.User (getUserId)
37 import Gargantext.Database.Admin.Config (userMaster)
38 import Gargantext.Database.Admin.Types.Hyperdata.Corpus (HyperdataCorpus)
39 import Gargantext.Database.Admin.Types.Hyperdata.Document (HyperdataDocument(..))
40 import Gargantext.Database.Admin.Types.Node (CorpusId, ListId)
41 import Gargantext.Database.Prelude (hasConfig)
42 import Gargantext.Database.Query.Table.Node (defaultListMaybe, getOrMkList)
43 import Gargantext.Database.Query.Tree.Root (getOrMk_RootWithCorpus)
44 import Gargantext.Utils.Jobs (JobHandle, MonadJobStatus(..))
45 import qualified Gargantext.Database.Query.Table.Node.Document.Add as Doc (add)
47 langToSearx :: Lang -> Text
48 langToSearx EN = "en-US"
49 langToSearx FR = "fr-FR"
50 langToSearx All = "en-US"
52 data SearxResult = SearxResult
55 , _sr_content :: Maybe Text
58 , _sr_category :: Text
59 , _sr_pretty_url :: Text
60 , _sr_publishedDate :: Text -- "Nov 19, 2021"
61 , _sr_pubdate :: Text -- "2021-11-19 02:12:00+0000"
63 deriving (Show, Eq, Generic)
68 $(deriveJSON (unPrefix "_sr_") ''SearxResult)
70 data SearxResponse = SearxResponse
72 , _srs_number_of_results :: Int
73 , _srs_results :: [SearxResult] }
74 deriving (Show, Eq, Generic)
78 -- , _srs_suggestions :: [Text]
79 -- , _srs_unresponsive_engines :: [Text] }
81 $(deriveJSON (unPrefix "_srs_") ''SearxResponse)
83 data FetchSearxParams = FetchSearxParams
84 { _fsp_language :: Lang
85 , _fsp_manager :: Manager
91 fetchSearxPage :: FetchSearxParams -> IO (Either Prelude.String SearxResponse)
92 fetchSearxPage (FetchSearxParams { _fsp_language
98 -- https://searx.github.io/searx/dev/search_api.html?highlight=json
99 req <- parseRequest $ T.unpack _fsp_url
100 let request = urlEncodedBody
101 [ --("category_general", "1")
102 ("q", encodeUtf8 _fsp_query)
103 , ("categories", "news") -- https://gitlab.iscpif.fr/gargantext/haskell-gargantext/issues/70#note_3976
104 , ("pageno", encodeUtf8 $ T.pack $ show _fsp_pageno)
105 --, ("time_range", "None")
106 , ("language", encodeUtf8 $ langToSearx _fsp_language)
109 res <- httpLbs request _fsp_manager
110 let dec = Aeson.eitherDecode $ responseBody res :: (Either Prelude.String SearxResponse)
113 insertSearxResponse :: (MonadBase IO m, FlowCmdM env err m)
118 -> Either Prelude.String SearxResponse
120 insertSearxResponse _ _ _ _ (Left _) = pure ()
121 insertSearxResponse user cId listId l (Right (SearxResponse { _srs_results })) = do
122 server <- view (nlpServerGet l)
123 -- docs :: [Either Text HyperdataDocument]
124 let docs = hyperdataDocumentFromSearxResult l <$> _srs_results
125 --printDebug "[triggerSearxSearch] docs" docs
126 let docs' = catMaybes $ rightToMaybe <$> docs
128 Prelude.mapM_ (\(HyperdataDocument { _hd_title, _hd_publication_year, _hd_publication_date }) -> do
129 printDebug "[triggerSearxSearch] doc time" $
130 "[title] " <> (show _hd_title) <>
131 " :: [publication_year] " <> (show _hd_publication_year) <>
132 " :: [publication_date] " <> (show _hd_publication_date)
135 --_ <- flowDataText user (DataNew [docs']) (Multi l) cId Nothing logStatus
136 let mCorpus = Nothing :: Maybe HyperdataCorpus
137 ids <- insertMasterDocs mCorpus (Multi l) docs'
139 (_masterUserId, _masterRootId, masterCorpusId)
140 <- getOrMk_RootWithCorpus (UserName userMaster) (Left "") mCorpus
141 let gp = GroupWithPosTag l server HashMap.empty
143 -- FR -> GroupWithPosTag l Spacy HashMap.empty
144 -- _ -> GroupWithPosTag l CoreNLP HashMap.empty
145 ngs <- buildNgramsLists user cId masterCorpusId Nothing gp
146 _userListId <- flowList_DbRepo listId ngs
150 -- TODO Make an async task out of this?
151 triggerSearxSearch :: (MonadBase IO m, FlowCmdM env err m, MonadJobStatus m)
158 triggerSearxSearch user cId q l jobHandle = do
160 markStarted numPages jobHandle
162 -- printDebug "[triggerSearxSearch] cId" cId
163 -- printDebug "[triggerSearxSearch] q" q
164 -- printDebug "[triggerSearxSearch] l" l
165 cfg <- view hasConfig
166 uId <- getUserId user
167 let surl = _gc_frame_searx_url cfg
168 -- printDebug "[triggerSearxSearch] surl" surl
169 mListId <- defaultListMaybe cId
170 listId <- case mListId of
172 listId <- getOrMkList cId uId
174 Just listId -> pure listId
176 -- printDebug "[triggerSearxSearch] listId" listId
178 manager <- liftBase $ newManager tlsManagerSettings
179 _ <- mapM (\page -> do
180 res <- liftBase $ fetchSearxPage $ FetchSearxParams { _fsp_language = l
181 , _fsp_manager = manager
186 insertSearxResponse user cId listId l res
187 markProgress page jobHandle
190 --printDebug "[triggerSearxSearch] res" res
191 markComplete jobHandle
193 hyperdataDocumentFromSearxResult :: Lang -> SearxResult -> Either T.Text HyperdataDocument
194 hyperdataDocumentFromSearxResult l (SearxResult { _sr_content, _sr_engine, _sr_pubdate, _sr_title }) = do
195 let mDate = parseTimeM False defaultTimeLocale "%Y-%m-%d %H:%M:%S+0000" (T.unpack _sr_pubdate) :: Maybe Day
196 let mGregorian = toGregorian <$> mDate
197 Right HyperdataDocument { _hd_bdd = Just "Searx"
200 , _hd_uniqId = Nothing
201 , _hd_uniqIdBdd = Nothing
203 , _hd_title = Just _sr_title
204 , _hd_authors = Nothing
205 , _hd_institutes = Nothing
206 , _hd_source = Just _sr_engine
207 , _hd_abstract = _sr_content
208 , _hd_publication_date = T.pack <$> formatTime defaultTimeLocale "%Y-%m-%dT%H:%M:%S" <$> mDate
209 , _hd_publication_year = fromIntegral <$> sel1 <$> mGregorian
210 , _hd_publication_month = sel2 <$> mGregorian
211 , _hd_publication_day = sel3 <$> mGregorian
212 , _hd_publication_hour = Nothing
213 , _hd_publication_minute = Nothing
214 , _hd_publication_second = Nothing
215 , _hd_language_iso2 = Just $ T.pack $ show l }