2 Module : Gargantext.Core.Viz.Graph
4 Copyright : (c) CNRS, 2017-Present
5 License : AGPL + CECILL v3
6 Maintainer : team@gargantext.org
7 Stability : experimental
12 {-# LANGUAGE OverloadedLists #-} -- allows to write Map and HashMap as lists
13 {-# LANGUAGE TypeOperators #-}
15 module Gargantext.Core.Viz.Graph.API
18 import Control.Lens (set, (^.), _Just, (^?), at)
20 import Data.Maybe (fromMaybe)
22 import Data.Text hiding (head)
23 import Debug.Trace (trace)
24 import GHC.Generics (Generic)
25 import Gargantext.API.Admin.Orchestrator.Types
26 import Gargantext.API.Ngrams.Tools
27 import Gargantext.API.Prelude
28 import Gargantext.Core.Methods.Distances (Distance(..), GraphMetric(..), withMetric)
29 import Gargantext.Core.NodeStory
30 import Gargantext.Core.Types.Main
31 import Gargantext.Core.Viz.Graph
32 import Gargantext.Core.Viz.Graph.GEXF ()
33 import Gargantext.Core.Viz.Graph.Tools -- (cooc2graph)
34 import Gargantext.Database.Action.Metrics.NgramsByNode (getNodesByNgramsOnlyUser)
35 import Gargantext.Database.Action.Flow.Types (FlowCmdM)
36 import Gargantext.Database.Action.Node (mkNodeWithParent)
37 import Gargantext.Database.Admin.Config
38 import Gargantext.Database.Admin.Types.Node
39 import Gargantext.Database.Prelude (Cmd)
40 import Gargantext.Database.Query.Table.Node
41 import Gargantext.Database.Query.Table.Node.Error (HasNodeError)
42 import Gargantext.Database.Query.Table.Node.Select
43 import Gargantext.Database.Query.Table.Node.UpdateOpaleye (updateHyperdata)
44 import Gargantext.Database.Query.Table.Node.User (getNodeUser)
45 import Gargantext.Database.Schema.Node
46 import Gargantext.Database.Schema.Ngrams
47 import Gargantext.Prelude
49 import Servant.Job.Async
51 import qualified Data.HashMap.Strict as HashMap
53 ------------------------------------------------------------------------
54 -- | There is no Delete specific API for Graph since it can be deleted
56 type GraphAPI = Get '[JSON] HyperdataGraphAPI
57 :<|> "async" :> GraphAsyncAPI
59 :> ReqBody '[JSON] HyperdataGraphAPI
60 :> Post '[JSON] NodeId
61 :<|> "gexf" :> Get '[XML] (Headers '[Servant.Header "Content-Disposition" Text] Graph)
62 :<|> "versions" :> GraphVersionsAPI
65 GraphVersions { gv_graph :: Maybe Int
68 deriving (Show, Generic)
70 instance FromJSON GraphVersions
71 instance ToJSON GraphVersions
72 instance ToSchema GraphVersions
74 graphAPI :: UserId -> NodeId -> GargServer GraphAPI
75 graphAPI u n = getGraph u n
79 :<|> graphVersionsAPI u n
81 ------------------------------------------------------------------------
82 --getGraph :: UserId -> NodeId -> GargServer HyperdataGraphAPI
83 getGraph :: FlowCmdM env err m
86 -> m HyperdataGraphAPI
87 getGraph _uId nId = do
88 nodeGraph <- getNodeWith nId (Proxy :: Proxy HyperdataGraph)
91 graph = nodeGraph ^. node_hyperdata . hyperdataGraph
92 camera = nodeGraph ^. node_hyperdata . hyperdataCamera
94 mcId <- getClosestParentIdByType nId NodeCorpus
95 let cId = maybe (panic "[G.V.G.API] Node has no parent") identity mcId
97 printDebug "[getGraph] getting list for cId" cId
98 listId <- defaultList cId
99 repo <- getRepo' [listId]
101 -- TODO Distance in Graph params
104 let defaultMetric = Order1
105 graph' <- computeGraph cId (withMetric defaultMetric) NgramsTerms repo
106 mt <- defaultGraphMetadata cId "Title" repo defaultMetric
108 graph'' = set graph_metadata (Just mt) graph'
109 hg = HyperdataGraphAPI graph'' camera
110 -- _ <- updateHyperdata nId hg
111 _ <- updateHyperdata nId (HyperdataGraph (Just graph'') camera)
112 pure $ trace "[G.V.G.API] Graph empty, computing" hg
114 Just graph' -> pure $ trace "[G.V.G.API] Graph exists, returning" $
115 HyperdataGraphAPI graph' camera
118 --recomputeGraph :: UserId -> NodeId -> Maybe GraphMetric -> GargNoServer Graph
119 recomputeGraph :: FlowCmdM env err m
124 recomputeGraph _uId nId maybeDistance = do
125 nodeGraph <- getNodeWith nId (Proxy :: Proxy HyperdataGraph)
127 graph = nodeGraph ^. node_hyperdata . hyperdataGraph
128 camera = nodeGraph ^. node_hyperdata . hyperdataCamera
129 graphMetadata = graph ^? _Just . graph_metadata . _Just
130 listVersion = graph ^? _Just . graph_metadata . _Just . gm_list . lfg_version
131 graphMetric = case maybeDistance of
132 Nothing -> graph ^? _Just . graph_metadata . _Just . gm_metric
134 similarity = case graphMetric of
135 Nothing -> withMetric Order1
136 Just m -> withMetric m
138 mcId <- getClosestParentIdByType nId NodeCorpus
139 let cId = maybe (panic "[G.V.G.API] Node has no parent") identity mcId
141 listId <- defaultList cId
142 repo <- getRepo' [listId]
143 let v = repo ^. unNodeStory . at listId . _Just . a_version
147 graph' <- computeGraph cId similarity NgramsTerms repo
148 mt <- defaultGraphMetadata cId "Title" repo (fromMaybe Order1 maybeDistance)
149 let graph'' = set graph_metadata (Just mt) graph'
150 _ <- updateHyperdata nId (HyperdataGraph (Just graph'') camera)
151 pure $ trace "[G.V.G.API.recomputeGraph] Graph empty, computed" graph''
153 Just graph' -> if listVersion == Just v
156 graph'' <- computeGraph cId similarity NgramsTerms repo
157 let graph''' = set graph_metadata graphMetadata graph''
158 _ <- updateHyperdata nId (HyperdataGraph (Just graph''') camera)
159 pure $ trace "[G.V.G.API] Graph exists, recomputing" graph'''
162 computeGraph :: FlowCmdM env err m
168 computeGraph cId d nt repo = do
169 lId <- defaultList cId
170 lIds <- selectNodesWithUsername NodeList userMaster
172 let ngs = filterListWithRoot MapTerm
173 $ mapTermListRoot [lId] nt repo
175 myCooc <- HashMap.filter (>1) -- Removing the hapax (ngrams with 1 cooc)
176 -- <$> HashMap.filterWithKey (\(x,y) _ -> x /= y)
177 -- <$> getCoocByNgrams (if d == Conditional then Diagonal True else Diagonal False)
178 <$> getCoocByNgrams (Diagonal True)
179 <$> groupNodesByNgrams ngs
180 <$> getNodesByNgramsOnlyUser cId (lIds <> [lId]) nt (HashMap.keys ngs)
182 -- printDebug "myCooc" myCooc
183 -- saveAsFileDebug "debug/my-cooc" myCooc
185 listNgrams <- getListNgrams [lId] nt
187 -- graph <- liftBase $ cooc2graphWith Bac d 0 myCooc
188 graph <- liftBase $ cooc2graphWith Spinglass d 0 myCooc
189 -- saveAsFileDebug "debug/graph" graph
191 pure $ mergeGraphNgrams graph (Just listNgrams)
194 defaultGraphMetadata :: HasNodeError err
199 -> Cmd err GraphMetadata
200 defaultGraphMetadata cId t repo gm = do
201 lId <- defaultList cId
203 pure $ GraphMetadata {
206 , _gm_corpusId = [cId]
208 LegendField 1 "#FFF" "Cluster1"
209 , LegendField 2 "#FFF" "Cluster2"
210 , LegendField 3 "#FFF" "Cluster3"
211 , LegendField 4 "#FFF" "Cluster4"
213 , _gm_list = (ListForGraph lId (repo ^. unNodeStory . at lId . _Just . a_version))
214 , _gm_startForceAtlas = True
216 -- (map (\n -> LegendField n "#FFFFFF" (pack $ show n)) [1..10])
218 ------------------------------------------------------------
219 type GraphAsyncAPI = Summary "Recompute graph"
221 :> AsyncJobsAPI JobLog () JobLog
224 graphAsync :: UserId -> NodeId -> GargServer GraphAsyncAPI
227 JobFunction (\_ log' -> graphRecompute u n (liftBase . log'))
230 --graphRecompute :: UserId
232 -- -> (JobLog -> GargNoServer ())
233 -- -> GargNoServer JobLog
234 graphRecompute :: FlowCmdM env err m
239 graphRecompute u n logStatus = do
240 logStatus JobLog { _scst_succeeded = Just 0
241 , _scst_failed = Just 0
242 , _scst_remaining = Just 1
243 , _scst_events = Just []
245 _g <- trace (show u) $ recomputeGraph u n Nothing
246 pure JobLog { _scst_succeeded = Just 1
247 , _scst_failed = Just 0
248 , _scst_remaining = Just 0
249 , _scst_events = Just []
252 ------------------------------------------------------------
253 type GraphVersionsAPI = Summary "Graph versions"
254 :> Get '[JSON] GraphVersions
255 :<|> Summary "Recompute graph version"
256 :> Post '[JSON] Graph
258 graphVersionsAPI :: UserId -> NodeId -> GargServer GraphVersionsAPI
259 graphVersionsAPI u n =
261 :<|> recomputeVersions u n
263 graphVersions :: Int -> NodeId -> GargNoServer GraphVersions
264 graphVersions n nId = do
265 nodeGraph <- getNodeWith nId (Proxy :: Proxy HyperdataGraph)
278 mcId <- getClosestParentIdByType nId NodeCorpus
279 let cId = maybe (panic "[G.V.G.API] Node has no parent") identity mcId
281 maybeListId <- defaultListMaybe cId
284 then graphVersions (n+1) cId
285 else panic "[G.V.G.API] list not found after iterations"
288 repo <- getRepo' [listId]
289 let v = repo ^. unNodeStory . at listId . _Just . a_version
290 printDebug "graphVersions" v
292 pure $ GraphVersions { gv_graph = listVersion
295 --recomputeVersions :: UserId -> NodeId -> GargNoServer Graph
296 recomputeVersions :: FlowCmdM env err m
300 recomputeVersions uId nId = recomputeGraph uId nId Nothing
302 ------------------------------------------------------------
306 -> GargNoServer NodeId
307 graphClone uId pId (HyperdataGraphAPI { _hyperdataAPIGraph = graph
308 , _hyperdataAPICamera = camera }) = do
309 let nodeType = NodeGraph
310 nodeUser <- getNodeUser (NodeId uId)
311 nodeParent <- getNodeWith pId (Proxy :: Proxy HyperdataGraph)
312 let uId' = nodeUser ^. node_user_id
313 nIds <- mkNodeWithParent nodeType (Just pId) uId' $ nodeParent ^. node_name
318 let graphP' = set (graph_metadata . _Just . gm_startForceAtlas) False graphP
320 _ <- updateHyperdata nId (HyperdataGraph (Just graphP') camera)
324 ------------------------------------------------------------
325 --getGraphGexf :: UserId
327 -- -> GargNoServer (Headers '[Servant.Header "Content-Disposition" Text] Graph)
328 getGraphGexf :: FlowCmdM env err m
331 -> m (Headers '[Servant.Header "Content-Disposition" Text] Graph)
332 getGraphGexf uId nId = do
333 HyperdataGraphAPI { _hyperdataAPIGraph = graph } <- getGraph uId nId
334 pure $ addHeader "attachment; filename=graph.gexf" graph