2 Module : Gargantext.Viz.Phylo.API
3 Description : Phylo API
4 Copyright : (c) CNRS, 2017-Present
5 License : AGPL + CECILL v3
6 Maintainer : team@gargantext.org
7 Stability : experimental
12 {-# OPTIONS_GHC -fno-warn-orphans #-}
14 {-# LANGUAGE OverloadedLists #-} -- allows to write Map and HashMap as lists
15 {-# LANGUAGE TypeOperators #-}
17 module Gargantext.Viz.Phylo.API
20 import Control.Lens ((^.))
21 import Data.String.Conversions
22 --import Control.Monad.Reader (ask)
23 import qualified Data.ByteString as DB
24 import qualified Data.ByteString.Lazy as DBL
25 import Data.Proxy (Proxy(..))
27 import Network.HTTP.Media ((//), (/:))
29 import Test.QuickCheck (elements)
30 import Test.QuickCheck.Arbitrary (Arbitrary, arbitrary)
31 import Web.HttpApiData (parseUrlPiece, readTextData)
33 import Gargantext.API.Prelude
34 import Gargantext.Database.Admin.Types.Hyperdata
35 import Gargantext.Database.Admin.Types.Node -- (PhyloId, ListId, CorpusId, UserId, NodeId(..))
36 import Gargantext.Database.Query.Table.Node (insertNodes, node, getNodeWith)
37 import Gargantext.Database.Schema.Node (node_hyperdata)
38 import Gargantext.Prelude
39 import Gargantext.Viz.Phylo
40 import Gargantext.Viz.Phylo.Main
41 import Gargantext.Viz.Phylo.Example
42 import Gargantext.Core.Types (TODO(..))
44 ------------------------------------------------------------------------
45 type PhyloAPI = Summary "Phylo API"
51 phyloAPI :: PhyloId -> UserId -> GargServer PhyloAPI
52 phyloAPI n u = getPhylo n
57 newtype SVG = SVG DB.ByteString
61 declareNamedSchema _ = declareNamedSchema (Proxy :: Proxy TODO)
63 instance Show SVG where
66 instance Accept SVG where
67 contentType _ = "SVG" // "image/svg+xml" /: ("charset", "utf-8")
69 instance Show a => MimeRender PlainText a where
70 mimeRender _ val = cs ("" <> show val)
72 instance MimeRender SVG SVG where
73 mimeRender _ (SVG s) = DBL.fromStrict s
75 ------------------------------------------------------------------------
76 type GetPhylo = QueryParam "listId" ListId
77 :> QueryParam "level" Level
78 :> QueryParam "minSizeBranch" MinSizeBranch
79 {- :> QueryParam "filiation" Filiation
80 :> QueryParam "childs" Bool
81 :> QueryParam "depth" Level
82 :> QueryParam "metrics" [Metric]
83 :> QueryParam "periodsInf" Int
84 :> QueryParam "periodsSup" Int
85 :> QueryParam "minNodes" Int
86 :> QueryParam "taggers" [Tagger]
87 :> QueryParam "sort" Sort
88 :> QueryParam "order" Order
89 :> QueryParam "export" ExportMode
90 :> QueryParam "display" DisplayMode
91 :> QueryParam "verbose" Bool
96 -- Add real text processing
97 -- Fix Filter parameters
98 getPhylo :: PhyloId -> GargServer GetPhylo
99 getPhylo phId _lId l msb = do
100 phNode <- getNodeWith phId (Proxy :: Proxy HyperdataPhylo)
102 level = maybe 2 identity l
103 branc = maybe 2 identity msb
104 maybePhylo = phNode ^. (node_hyperdata . hp_data)
106 p <- liftBase $ viewPhylo2Svg
107 $ viewPhylo level branc
108 $ maybe phyloFromQuery identity maybePhylo
110 ------------------------------------------------------------------------
111 type PostPhylo = QueryParam "listId" ListId
112 -- :> ReqBody '[JSON] PhyloQueryBuild
113 :> (Post '[JSON] NodeId)
115 postPhylo :: CorpusId -> UserId -> GargServer PostPhylo
116 postPhylo n userId _lId = do
117 -- TODO get Reader settings
120 -- _vrs = Just ("1" :: Text)
121 -- _sft = Just (Software "Gargantext" "4")
122 -- _prm = initPhyloParam vrs sft (Just q)
124 pId <- insertNodes [node NodePhylo "Phylo" (HyperdataPhylo Nothing (Just phy)) (Just n) userId]
125 pure $ NodeId (fromIntegral pId)
127 ------------------------------------------------------------------------
128 -- | DELETE Phylo == delete a node
129 ------------------------------------------------------------------------
130 ------------------------------------------------------------------------
132 type PutPhylo = (Put '[JSON] Phylo )
133 --putPhylo :: PhyloId -> Maybe ListId -> PhyloQueryBuild -> Phylo
134 putPhylo :: PhyloId -> GargServer PutPhylo
140 instance Arbitrary PhyloView
142 arbitrary = elements [phyloView]
144 -- | TODO add phyloGroup ex
145 instance Arbitrary PhyloGroup
147 arbitrary = elements []
149 instance Arbitrary Phylo
151 arbitrary = elements [phylo]
153 instance ToSchema Order
155 instance ToParamSchema Order
156 instance FromHttpApiData Order
158 parseUrlPiece = readTextData
161 instance ToParamSchema Metric
162 instance FromHttpApiData [Metric]
164 parseUrlPiece = readTextData
165 instance FromHttpApiData Metric
167 parseUrlPiece = readTextData
170 instance ToParamSchema DisplayMode
171 instance FromHttpApiData DisplayMode
173 parseUrlPiece = readTextData
176 instance ToParamSchema ExportMode
177 instance FromHttpApiData ExportMode
179 parseUrlPiece = readTextData
182 instance FromHttpApiData Sort
184 parseUrlPiece = readTextData
185 instance ToParamSchema Sort
187 instance FromHttpApiData [Tagger]
189 parseUrlPiece = readTextData
190 instance FromHttpApiData Tagger
192 parseUrlPiece = readTextData
193 instance ToParamSchema Tagger
195 instance FromHttpApiData Filiation
197 parseUrlPiece = readTextData
198 instance ToParamSchema Filiation