1:- module(bc_api_tag, []).

Tag API handlers */

    5:- use_module(library(arouter)).    6
    7:- use_module(bc_api_io).    8:- use_module(bc_api_auth).    9:- use_module(bc_api_actor).   10:- use_module(bc_tag_stat).   11
   12:- route_get(api/tags/Type/(public),
   13    public_tags(Type)).   14
   15public_tags(Type):-
   16    bc_tag_stat(Type, Tags),
   17    bc_reply_success(Tags).
   18
   19:- route_get(api/tags/Type/all,
   20    bc_auth, all_tags(Type)).   21
   22all_tags(Type):-
   23    bc_tag_stat_all(Type, Tags),
   24    bc_reply_success(Tags)