1:- module( stoics_lib, [ 
    2              stoics_lib/0,            % doc predicate 
    3              stoics_lib_version/2,    % -Vers, -Date
    4            % atom/
    5              at_con/2, at_con/3,      % ?List[, +Sep], ?Atom
    6              atom_replace/4,          % +Atom, +What, +With, -New
    7              atom_sub/2,              %  ?Sub, ?Ful.
    8              prefix_atom/2,prefix_atom/3,  % +Prefix, +Atom[, -Postfix]
    9              sub_atom/2,sub_atom/4,   % +Full[, ?Pre, ?Post], Sub
   10            % codes
   11              has_cased/3,             % +Obj, +Case, -Cased
   12              n_digits_integer_codes/3,% +N, +Numb, -Codes
   13              lexi/2,                  % ?Lexi, ?CodeOr
   14              lexi_n/4,                % -InCodes, +N, +PadC, -Codes
   15            % colour
   16              latex_colour/4,          % ?FullName, -HexValue, ?CodingName, -RGBterm
   17              colour_hex/2,            % +Clr, -HexString
   18            % date_time/
   19              datime_readable/1,       % +Ratom
   20              datime_readable/2,       % +Datime, -Ratom
   21              date_two_digit_dotted/1, % -Dotted
   22              date_two_digit_dotted/2, % +Date, -Dotted
   23              get_date/1,              % -Date
   24              get_date_time/1,         % -CurrDateTime
   25              get_datetime/1,          % -CurrDateTime
   26              three_letter_month/2,    % ?IntIdx, -Month
   27              three_letter_months/1,   % -Months
   28            % error/
   29              message_report/3,        % +Format, +Args, +Kind
   30            % file/
   31              expand_spec/2,           % +FileSpec, -Expanded
   32              locate/3,                % +File, +Exts, -Locations
   33            % io/
   34              io_line/2,               % +Stream, ?Line
   35              io_get_line/2,           % +Stream, -Line
   36              io_put_line/2,           % +Stream, +Line
   37              io_lines/2,              % +FileOrStream, -Lines
   38              io_close/2,              % +FileR, -Stream
   39              io_open/3,               % +FileR, +Mode, -Stream
   40              io_sections/3,           % +File, -Sections, +Opts
   41              io_streams/3,            % ?Input, ?Output, ?Error
   42            % kv/
   43              kv_compose/3,            % +Ks, +Vs, -KVs
   44              kv_compose/4,            % +List1, +List2, -KVsCont, -Tkvs
   45              kv_decompose/3,          % +Pairs, -Ks, -Vs
   46              kv_ks/2,                 % +KVs, -Ks
   47              kv_transpose/2,          % +KVs, -VKs
   48              kv_vs/2,                 % +KVs, -Vs
   49              kvo_k_memberchk/3,       % +K, +KVs, -V
   50              kvs_k_memberchk/3,       % +K, +KVs, -V
   51            % list/
   52              break_on_list/4,         % +List, +Partial, -Left, -Right
   53              break_nth/4,             % +Nth, +List, -Left, -Right
   54              n_breaks/4,              % +Vector, +N, -Breaks, -Opts
   55              nth1/5,                  % ?N, +List, ?With, ?Nth, +NewList
   56              has_at_least/3,          % +N, +X, +List
   57              has_at_most/3,           % +N, +X, +List
   58              list_frequency/2,        % +List, -Freqs
   59              list_frequency/3,        % +List, -Freqs, +Opts
   60              list_is_invariant/1,     % +List
   61              list_proportions/2,      % +List, -Props
   62              list_proportions/3,      % +List, -Props, +Opts
   63              list_transpose/2,        % +List, -Transpose
   64              min_max/3,               % +List, -Max, -Min
   65              select_all/4,            % +List, +Elem, -Select, -Rem
   66              select_first/3,          % +List, +Elem, -Rem
   67              skim/3,                  % +Nested, -Scum, -Remains
   68            % meta/
   69              call_morph/4,            % +Term, +Input, -Morphed, +Opts
   70              current_call/1,          % +Goal
   71              current_call/2,          % +Goal, +Else
   72              goal/4,                  % +Partial, +ArgS, +Mod, -Goal
   73              goal_spec/2,             % +ModG, -ModSpec
   74              holds/2,                 %  +Goal, -Holds
   75              imported_from/2,         %  +Clauser, ?Mod
   76              known/1,known/2,         %  +Goal[, Opts]
   77              maparg/2,maparg/3,       % +Pname, ?Term1[, ?Term2]
   78              maparg/4,                % +PName, +Npos ?Term1, ?Term2
   79              map_list_options/3,      % +Goal, +InList, +Opts
   80              map_list_options/4,      % +Goal, +/-InList, -/+OutList, +Opts
   81              map_succ_list/3,         %  
   82              map_succ_list/4,         % +Goal, ?InList, ?OutList[, -Rejects]
   83              mod_goal/2,              % +Goal, -Moal
   84              mod_goal/3, mod_goal/4,  % +Mod, +Goal[, +Override], -Moal
   85              on_fail/2, on_fail/3,    % +Goal, +Call, +Opts
   86              on_call/4,               % +OnB+ +Goal, +In, -Out
   87              which/3,                 % Goal, +Term, -Indices
   88            % number/
   89              int_trailer/2,           % +Int, -Trailer
   90              compare_arithmetic/3,    % -Op, +X, +Y
   91              n_digits_min/3,          % +N, +Number, -Padded 
   92            % strings/
   93              letter_strings/3,        % +Start, -N, -Letts 
   94            % term/
   95              arg_add/4,               % +N, +Term, +Arg, -New
   96              arg/4, arg/5,            % ?N, +TermIn, [+NewNth,] ?Nth, -TermOut
   97              arity/2,arity/3,         % ?Term[, ?Name], ?Arity
   98              functor_term/2,          % ?Pid, ?Term
   99              compare/4,               % +Type, ?Op, +Term1, +Term
  100              compound/3,              % +Term, -Name, -Args 
  101              curtail/3,               % +Term, -Max, -Curtailed
  102              en_append/3,             % +ListOr1, +ListOr2, List
  103              en_list/2,en_list/3,     % +Term, -Listed[, +Opts]
  104              has_length/2,            % +List, +Lengthy
  105              has_length/3,            % +List, +Lengthy, +Op
  106              has_length/4,            % +List, +Lengthy, +Op, +Err
  107              op_compare/3,            % ?Op, +Term1, +Term2
  108              portray_clauses/2,       % +Terms, +Opts
  109              positions/2,positions/3, % +Data, [-Dtype,] -NofPositions ).
  110              position/3,position/4,   % [+Type,] ?N, +Data, ?Nths
  111              position/6,              % +Type, ?N, +Data, ?Nths, -NxN, -Cont
  112              position_nth/3, position_nth/4, % +N, +Data[, -Nth]
  113              position_nth/5, position_nth/6, % [+Dtype,] +N, +Data, -Nth, -Rem, -Nxt
  114              position_type/2,         % +Term, -PosType
  115              term_length/2,           % +Term, -Length
  116              term_type/2,             % +Term, -Type
  117              termplate/2,termplate/3, % +Term[, -Arity], -Termplate
  118              url_file/2,url_file/3    % +Url, +File[, +Opts]
  119    ] ).  120
  121% :- ensure_loaded( '../src/auxil/stoics_lib_module.pl' ).
  122
  123:- use_module(library(lib)).  124:- lib( source(stoics_lib), [index(true),homonyms(false)] ).  125
  126:- lib(stoics_lib/0).  127:- lib(stoics_lib_version/2).  128:- lib(at_con/2).  129:- lib(atom_sub/2).  130:- lib(prefix_atom/2).  131:- lib(sub_atom/2).  132:- lib(n_digits_integer_codes/3).  133:- lib(datime_readable/1).  134:- lib(datime_readable/2).  135:- lib(date_two_digit_dotted/1).  136:- lib(date_two_digit_dotted/2).  137:- lib(get_date/1).  138:- lib(get_date_time/1).  139:- lib(get_datetime/1).  140:- lib(three_letter_month/2).  141:- lib(three_letter_months/1).  142:- lib(message_report/3).  143:- lib(expand_spec/2).  144:- lib(io_line/2).  145:- lib(io_get_line/2).  146:- lib(io_put_line/2).  147:- lib(io_lines/2).  148:- lib(io_close/2).  149:- lib(io_open/3).  150:- lib(kv_compose/3).  151:- lib(kv_compose/4).  152:- lib(kv_decompose/3).  153:- lib(kv_ks/2).  154:- lib(kv_transpose/2).  155:- lib(kv_vs/2).  156:- lib(kvo_k_memberchk/3).  157:- lib(kvs_k_memberchk/3).  158:- lib(break_on_list/4).  159:- lib(break_nth/4).  160:- lib(has_at_least/3).  161:- lib(has_at_most/3).  162:- lib(has_length/2).  163:- lib(has_length/3).  164:- lib(has_length/4).  165:- lib(list_frequency/2).  166:- lib(list_frequency/3).  167:- lib(list_proportions/2).  168:- lib(list_proportions/3).  169:- lib(list_transpose/2).  170:- lib(select_all/4).  171:- lib(select_first/3).  172:- lib(skim/3).  173:- lib(current_call/1).  174:- lib(current_call/2).  175:- lib(goal/4).  176:- lib(goal_spec/2).  177:- lib(holds/2).  178:- lib(imported_from/2).  179:- lib(known/1).  180:- lib(known/2).  181:- lib(known/3).  182:- lib(map_list_options/4).  183:- lib(map_succ_list/4).  184:- lib(mod_goal/2).  185:- lib(mod_goal/3).  186:- lib(mod_goal/4).  187:- lib(which/3).  188:- lib(int_trailer/2).  189:- lib(letter_strings/3).  190:- lib(arity/2).  191:- lib(arity/3).  192:- lib(functor_term/2).  193:- lib(compound/3).  194:- lib(en_list/2).  195:- lib(op_compare/3).  196:- lib(portray_clauses/2).  197:- lib(positions/2).  198:- lib(positions/3).  199:- lib(position/3).  200:- lib(position/4).  201:- lib(position/6).  202:- lib(position_nth/3).  203:- lib(position_nth/4).  204:- lib(position_nth/5).  205:- lib(position_nth/6).  206:- lib(position_type/2).  207:- lib(termplate/2).  208:- lib(termplate/3).  209:- lib(locate/3).  210:- lib(compare/4).  211:- lib(compare_arithmetic/3).  212:- lib(n_digits_min/3).  213:- lib(n_breaks/4).  214:- lib(min_max/3).  215:- lib(nth1/5).  216:- lib(arg_add/4).  217:- lib(arg/4).  218:- lib(arg/5).  219:- lib(maparg/2).  220:- lib(maparg/3).  221:- lib(maparg/4).  222:- lib(atom_replace/4).  223:- lib(io_sections/3).  224:- lib(on_fail/2).  225:- lib(on_fail/3).  226:- lib(on_call/4).  227:- lib(term_length/2).  228:- lib(curtail/3).  229:- lib(term_type/2).  230:- lib(en_append/3).  231:- lib(url_file/2).  232:- lib(call_morph/4).  233:- lib(io_streams/3).  234:- lib(lexi/2).  235:- lib(has_cased/3).  236:- lib(latex_colour/4).  237:- lib(colour_hex/2).  238:- lib(lexi_n/4).  239:- lib(list_is_invariant/1).  240
  241:- lib( end(stoics_lib) ).