[auth] nodes auth stub

parent 78bc52e0
...@@ -53,6 +53,7 @@ library ...@@ -53,6 +53,7 @@ library
Gargantext.API.Node.Corpus.Types Gargantext.API.Node.Corpus.Types
Gargantext.API.Node.File Gargantext.API.Node.File
Gargantext.API.Node.Share Gargantext.API.Node.Share
Gargantext.API.NodeAuth
Gargantext.API.Prelude Gargantext.API.Prelude
Gargantext.Core Gargantext.Core
Gargantext.Core.NLP Gargantext.Core.NLP
......
{-# LANGUAGE CPP #-}
{-# LANGUAGE DataKinds #-}
{-# LANGUAGE GeneralizedNewtypeDeriving #-}
{-# LANGUAGE TypeFamilies #-}
{-# LANGUAGE TypeOperators #-}
{-|
Module : Gargantext.API.NodeAuth
Description :
Copyright : (c) CNRS, 2017-Present
License : AGPL + CECILL v3
Maintainer : team@gargantext.org
Stability : experimental
Portability : POSIX
-}
module Gargantext.API.NodeAuth where
import Servant.API ((:>))
import Servant.Links (HasLink (..))
import Protolude
data NodeAuth (nodeAuths :: [*]) val
-- | A @HasLink@ instance for @NodeAuth@
instance HasLink sub => HasLink (NodeAuth (tag :: [*]) value :> sub) where
type MkLink (NodeAuth (tag :: [*]) value :> sub) a = MkLink sub a
toLink toA _ = toLink toA (Proxy :: Proxy sub)
...@@ -90,7 +90,8 @@ type GargAdminAPI ...@@ -90,7 +90,8 @@ type GargAdminAPI
= "user" :> Summary "First user endpoint" = "user" :> Summary "First user endpoint"
:> Roots :> Roots
:<|> "nodes" :> Summary "Nodes endpoint" :<|> "nodes" :> Summary "Nodes endpoint"
:> ReqBody '[JSON] [NodeId] :> NodesAPI :> ReqBody '[JSON] [NodeId]
:> NodesAPI
type GargPrivateAPI' = type GargPrivateAPI' =
GargAdminAPI GargAdminAPI
......
Markdown is supported
0% or
You are about to add 0 people to the discussion. Proceed with caution.
Finish editing this message first!
Please register or to comment