2 import Gargantext.Database.Prelude (Cmd, runPGSQuery)
3 Module : Gargantext.Database.Query.Table.Node
4 Description : Main Tools of Node to the database
5 Copyright : (c) CNRS, 2017-Present
6 License : AGPL + CECILL v3
7 Maintainer : team@gargantext.org
8 Stability : experimental
12 {-# OPTIONS_GHC -fno-warn-name-shadowing #-}
13 {-# OPTIONS_GHC -fno-warn-orphans #-}
15 {-# LANGUAGE Arrows #-}
16 {-# LANGUAGE ConstraintKinds #-}
17 {-# LANGUAGE FunctionalDependencies #-}
18 {-# LANGUAGE TemplateHaskell #-}
19 {-# LANGUAGE TypeFamilies #-}
21 module Gargantext.Database.Query.Table.Node
24 import Control.Arrow (returnA)
25 import Control.Lens (set, view)
27 import Data.Maybe (Maybe(..), fromMaybe, maybe)
28 import Data.Text (Text)
29 import GHC.Int (Int64)
30 import Gargantext.Core.Types
31 import Gargantext.Database.Admin.Config (nodeTypeId)
32 import Gargantext.Database.Admin.Types.Hyperdata
33 import Gargantext.Database.Admin.Types.Hyperdata.Default
34 import Gargantext.Database.Admin.Types.Node (NodeType(..), defaultName)
35 import Gargantext.Database.Prelude
36 import Gargantext.Database.Query.Filter (limit', offset')
37 import Gargantext.Database.Query.Table.Node.Error
38 import Gargantext.Database.Schema.Node
39 import Gargantext.Prelude hiding (sum, head)
40 import Opaleye hiding (FromField)
41 import Opaleye.Internal.QueryArr (Query)
42 import Prelude hiding (null, id, map, sum)
45 queryNodeSearchTable :: Query NodeSearchRead
46 queryNodeSearchTable = queryTable nodeTableSearch
48 selectNode :: Column PGInt4 -> Query NodeRead
49 selectNode id = proc () -> do
50 row <- queryNodeTable -< ()
51 restrict -< _node_id row .== id
54 runGetNodes :: Query NodeRead -> Cmd err [Node HyperdataAny]
55 runGetNodes = runOpaQuery
57 ------------------------------------------------------------------------
58 ------------------------------------------------------------------------
59 -- | order by publication date
60 -- Favorites (Bool), node_ngrams
61 selectNodesWith :: ParentId -> Maybe NodeType
62 -> Maybe Offset -> Maybe Limit -> Query NodeRead
63 selectNodesWith parentId maybeNodeType maybeOffset maybeLimit =
64 --offset' maybeOffset $ limit' maybeLimit $ orderBy (asc (hyperdataDocument_Publication_date . node_hyperdata)) $ selectNodesWith' parentId typeId
65 limit' maybeLimit $ offset' maybeOffset
66 $ orderBy (asc _node_id)
67 $ selectNodesWith' parentId maybeNodeType
69 selectNodesWith' :: ParentId -> Maybe NodeType -> Query NodeRead
70 selectNodesWith' parentId maybeNodeType = proc () -> do
71 node <- (proc () -> do
72 row@(Node _ typeId _ parentId' _ _ _) <- queryNodeTable -< ()
73 restrict -< parentId' .== (pgNodeId parentId)
75 let typeId' = maybe 0 nodeTypeId maybeNodeType
77 restrict -< if typeId' > 0
78 then typeId .== (pgInt4 (typeId' :: Int))
80 returnA -< row ) -< ()
83 deleteNode :: NodeId -> Cmd err Int
84 deleteNode n = mkCmd $ \conn ->
85 fromIntegral <$> runDelete conn nodeTable
86 (\(Node n_id _ _ _ _ _ _) -> n_id .== pgNodeId n)
88 deleteNodes :: [NodeId] -> Cmd err Int
89 deleteNodes ns = mkCmd $ \conn ->
90 fromIntegral <$> runDelete conn nodeTable
91 (\(Node n_id _ _ _ _ _ _) -> in_ ((map pgNodeId ns)) n_id)
93 -- TODO: NodeType should match with `a'
94 getNodesWith :: JSONB a => NodeId -> proxy a -> Maybe NodeType
95 -> Maybe Offset -> Maybe Limit -> Cmd err [Node a]
96 getNodesWith parentId _ nodeType maybeOffset maybeLimit =
97 runOpaQuery $ selectNodesWith parentId nodeType maybeOffset maybeLimit
99 -- TODO: Why is the second parameter ignored?
100 -- TODO: Why not use getNodesWith?
101 getNodesWithParentId :: (Hyperdata a, QueryRunnerColumnDefault PGJsonb a)
104 getNodesWithParentId n = runOpaQuery $ selectNodesWithParentID n'
110 ------------------------------------------------------------------------
111 getDocumentsV3WithParentId :: NodeId -> Cmd err [Node HyperdataDocumentV3]
112 getDocumentsV3WithParentId n = runOpaQuery $ selectNodesWith' n (Just NodeDocument)
114 -- TODO: merge with getDocumentsWithParentId by having a class IsHyperdataDocument
115 getDocumentsWithParentId :: NodeId -> Cmd err [Node HyperdataDocument]
116 getDocumentsWithParentId n = runOpaQuery $ selectNodesWith' n (Just NodeDocument)
118 getListsModelWithParentId :: NodeId -> Cmd err [Node HyperdataModel]
119 getListsModelWithParentId n = runOpaQuery $ selectNodesWith' n (Just NodeModel)
121 getCorporaWithParentId :: NodeId -> Cmd err [Node HyperdataCorpus]
122 getCorporaWithParentId n = runOpaQuery $ selectNodesWith' n (Just NodeCorpus)
124 ------------------------------------------------------------------------
125 selectNodesWithParentID :: NodeId -> Query NodeRead
126 selectNodesWithParentID n = proc () -> do
127 row@(Node _ _ _ parent_id _ _ _) <- queryNodeTable -< ()
128 restrict -< parent_id .== (pgNodeId n)
131 selectNodesWithType :: Column PGInt4 -> Query NodeRead
132 selectNodesWithType type_id = proc () -> do
133 row@(Node _ tn _ _ _ _ _) <- queryNodeTable -< ()
134 restrict -< tn .== type_id
137 type JSONB = QueryRunnerColumnDefault PGJsonb
140 getNode :: HasNodeError err => NodeId -> Cmd err (Node Value)
142 maybeNode <- headMay <$> runOpaQuery (selectNode (pgNodeId nId))
144 Nothing -> nodeError (DoesNotExist nId)
147 getNodeWith :: (HasNodeError err, JSONB a)
148 => NodeId -> proxy a -> Cmd err (Node a)
149 getNodeWith nId _ = do
150 maybeNode <- headMay <$> runOpaQuery (selectNode (pgNodeId nId))
152 Nothing -> nodeError (DoesNotExist nId)
156 ------------------------------------------------------------------------
157 nodeContactW :: Maybe Name -> Maybe HyperdataContact
158 -> AnnuaireId -> UserId -> NodeWrite
159 nodeContactW maybeName maybeContact aId =
160 node NodeContact name contact (Just aId)
162 name = maybe "Contact" identity maybeName
163 contact = maybe arbitraryHyperdataContact identity maybeContact
164 ------------------------------------------------------------------------
165 nodeCorpusW :: Maybe Name -> Maybe HyperdataCorpus -> ParentId -> UserId -> NodeWrite
166 nodeCorpusW maybeName maybeCorpus pId = node NodeCorpus name corpus (Just pId)
168 name = maybe "Corpus" identity maybeName
169 corpus = maybe defaultHyperdataCorpus identity maybeCorpus
170 --------------------------
172 nodeDocumentW :: Maybe Name -> Maybe HyperdataDocument -> CorpusId -> UserId -> NodeWrite
173 nodeDocumentW maybeName maybeDocument cId = node NodeDocument name doc (Just cId)
175 name = maybe "Document" identity maybeName
176 doc = maybe defaultHyperdataDocument identity maybeDocument
177 ------------------------------------------------------------------------
178 -- | Sugar to insert Node with NodeType in Database
179 insertDefaultNode :: NodeType -> ParentId -> UserId -> Cmd err [NodeId]
180 insertDefaultNode nt p u = insertNode nt Nothing Nothing p u
182 insertNode :: NodeType -> Maybe Name -> Maybe DefaultHyperdata -> ParentId -> UserId -> Cmd err [NodeId]
183 insertNode nt n h p u = insertNodesR [nodeW nt n h p u]
185 nodeW :: NodeType -> Maybe Name -> Maybe DefaultHyperdata -> ParentId -> UserId -> NodeWrite
186 nodeW nt n h p u = node nt n' h' (Just p) u
188 n' = fromMaybe (defaultName nt) n
189 h' = maybe (defaultHyperdata nt) identity h
191 ------------------------------------------------------------------------
192 node :: (ToJSON a, Hyperdata a)
199 node nodeType name hyperData parentId userId =
203 (pgNodeId <$> parentId)
206 (pgJSONB $ cs $ encode hyperData)
208 typeId = nodeTypeId nodeType
210 -------------------------------
211 insertNodes :: [NodeWrite] -> Cmd err Int64
212 insertNodes ns = mkCmd $ \conn -> runInsert_ conn $ Insert nodeTable ns rCount Nothing
214 insertNodesR :: [NodeWrite] -> Cmd err [NodeId]
215 insertNodesR ns = mkCmd $ \conn ->
216 runInsert_ conn (Insert nodeTable ns (rReturning (\(Node i _ _ _ _ _ _) -> i)) Nothing)
218 insertNodesWithParent :: Maybe ParentId -> [NodeWrite] -> Cmd err Int64
219 insertNodesWithParent pid ns = insertNodes (set node_parentId (pgNodeId <$> pid) <$> ns)
221 insertNodesWithParentR :: Maybe ParentId -> [NodeWrite] -> Cmd err [NodeId]
222 insertNodesWithParentR pid ns = insertNodesR (set node_parentId (pgNodeId <$> pid) <$> ns)
223 ------------------------------------------------------------------------
225 -- currently this function removes the child relation
226 -- needs a Temporary type between Node' and NodeWriteT
228 node2table :: UserId -> Maybe ParentId -> Node' -> NodeWrite
229 node2table uid pid (Node' nt txt v []) = Node Nothing (pgInt4 $ nodeTypeId nt) (pgInt4 uid) (fmap pgNodeId pid) (pgStrictText txt) Nothing (pgStrictJSONB $ cs $ encode v)
230 node2table _ _ (Node' _ _ _ _) = panic "node2table: should not happen, Tree insert not implemented yet"
233 data Node' = Node' { _n_type :: NodeType
236 , _n_children :: [Node']
239 mkNodes :: [NodeWrite] -> Cmd err Int64
240 mkNodes ns = mkCmd $ \conn -> runInsert_ conn
241 $ Insert nodeTable ns rCount Nothing
243 mkNodeR :: [NodeWrite] -> Cmd err [NodeId]
244 mkNodeR ns = mkCmd $ \conn -> runInsert_ conn $ Insert nodeTable ns (rReturning _node_id) Nothing
246 ------------------------------------------------------------------------
247 childWith :: UserId -> ParentId -> Node' -> NodeWrite
248 childWith uId pId (Node' NodeDocument txt v []) = node2table uId (Just pId) (Node' NodeDocument txt v [])
249 childWith uId pId (Node' NodeContact txt v []) = node2table uId (Just pId) (Node' NodeContact txt v [])
250 childWith _ _ (Node' _ _ _ _) = panic "This NodeType can not be a child"
253 -- =================================================================== --
255 -- CorpusDocument is a corpus made from a set of documents
256 -- CorpusContact is a corpus made from a set of contacts (syn of Annuaire)
257 data CorpusType = CorpusDocument | CorpusContact
261 mk :: Maybe Name -> Maybe a -> ParentId -> UserId -> Cmd err [NodeId]
263 instance MkCorpus HyperdataCorpus
265 mk n Nothing p u = insertNode NodeCorpus n Nothing p u
266 mk n (Just h) p u = insertNode NodeCorpus n (Just $ DefaultCorpus h) p u
269 instance MkCorpus HyperdataAnnuaire
271 mk n Nothing p u = insertNode NodeCorpus n Nothing p u
272 mk n (Just h) p u = insertNode NodeAnnuaire n (Just $ DefaultAnnuaire h) p u
275 getOrMkList :: HasNodeError err
279 getOrMkList pId uId =
280 maybe (mkList' pId uId) (pure . view node_id) . headMay =<< getListsWithParentId pId
282 mkList' pId uId = maybe (nodeError MkNode) pure . headMay =<< insertDefaultNode NodeList pId uId
284 -- | TODO remove defaultList
285 defaultList :: HasNodeError err => CorpusId -> Cmd err ListId
287 maybe (nodeError NoListFound) (pure . view node_id) . headMay =<< getListsWithParentId cId
290 getListsWithParentId :: NodeId -> Cmd err [Node HyperdataList]
291 getListsWithParentId n = runOpaQuery $ selectNodesWith' n (Just NodeList)