Class: RDoc::Context

Inherits:
CodeObject show all
Includes:
Comparable
Defined in:
lib/rdoc/context.rb

Overview

A Context is something that can hold modules, classes, methods, attributes, aliases, requires, and includes. Classes, modules, and files are all Contexts.

Direct Known Subclasses

ClassModule, TopLevel

Defined Under Namespace

Classes: Section

Constant Summary collapse

TYPES =

Types of methods

%w[class instance]
TOMDOC_TITLES =

If a context has these titles it will be sorted in this order.

[nil, 'Public', 'Internal', 'Deprecated']
TOMDOC_TITLES_SORT =

:nodoc:

TOMDOC_TITLES.sort_by { |title| title.to_s }

Constants included from Text

Text::MARKUP_FORMAT, Text::TO_HTML_CHARACTERS

Instance Attribute Summary collapse

Attributes inherited from CodeObject

#comment, #document_children, #document_self, #done_documenting, #file, #force_documentation, #line, #metadata, #offset, #parent, #received_nodoc, #section, #store, #viewer

Instance Method Summary collapse

Methods inherited from CodeObject

#display?, #documented?, #each_parent, #file_name, #full_name=, #ignore, #ignored?, #initialize_visibility, #options, #parent_file_name, #parent_name, #start_doc, #stop_doc, #suppress, #suppressed?

Methods included from Generator::Markup

#aref_to, #as_href, #cvs_url, #description, #formatter

Methods included from Text

encode_fallback, #expand_tabs, #flush_left, #markup, #normalize_comment, #parse, #snippet, #strip_hashes, #strip_newlines, #strip_stars, #to_html, #wrap

Constructor Details

#initializeContext

Creates an unnamed empty context with public current visibility



119
120
121
122
123
124
125
126
127
128
129
130
131
132
133
134
135
136
# File 'lib/rdoc/context.rb', line 119

def initialize
  super

  @in_files = []

  @name    ||= "unknown"
  @parent  = nil
  @visibility = :public

  @current_section = Section.new self, nil, nil
  @sections = { nil => @current_section }
  @temporary_section = nil

  @classes = {}
  @modules = {}

  initialize_methods_etc
end

Instance Attribute Details

#aliasesObject (readonly)

Class/module aliases



26
27
28
# File 'lib/rdoc/context.rb', line 26

def aliases
  @aliases
end

#attributesObject (readonly)

All attr* methods



31
32
33
# File 'lib/rdoc/context.rb', line 31

def attributes
  @attributes
end

#block_paramsObject

Block params to be used in the next MethodAttr parsed under this context



36
37
38
# File 'lib/rdoc/context.rb', line 36

def block_params
  @block_params
end

#constantsObject (readonly)

Constants defined



41
42
43
# File 'lib/rdoc/context.rb', line 41

def constants
  @constants
end

#constants_hashObject (readonly)

Hash of registered constants.



114
115
116
# File 'lib/rdoc/context.rb', line 114

def constants_hash
  @constants_hash
end

#current_sectionObject

The current documentation section that new items will be added to. If temporary_section is available it will be used.



652
653
654
655
656
657
658
659
660
# File 'lib/rdoc/context.rb', line 652

def current_section
  if section = @temporary_section then
    @temporary_section = nil
  else
    section = @current_section
  end

  section
end

#extendsObject (readonly)

Modules this context is extended with



61
62
63
# File 'lib/rdoc/context.rb', line 61

def extends
  @extends
end

#external_aliasesObject (readonly)

Aliases that could not be resolved.



93
94
95
# File 'lib/rdoc/context.rb', line 93

def external_aliases
  @external_aliases
end

#in_filesObject (readonly)

Files this context is found in



51
52
53
# File 'lib/rdoc/context.rb', line 51

def in_files
  @in_files
end

#includesObject (readonly)

Modules this context includes



56
57
58
# File 'lib/rdoc/context.rb', line 56

def includes
  @includes
end

#method_listObject (readonly)

Methods defined in this context



66
67
68
# File 'lib/rdoc/context.rb', line 66

def method_list
  @method_list
end

#methods_hashObject (readonly)

Hash of registered methods. Attributes are also registered here, twice if they are RW.



104
105
106
# File 'lib/rdoc/context.rb', line 104

def methods_hash
  @methods_hash
end

#nameObject (readonly)

Name of this class excluding namespace. See also full_name



71
72
73
# File 'lib/rdoc/context.rb', line 71

def name
  @name
end

#paramsObject

Params to be used in the next MethodAttr parsed under this context



109
110
111
# File 'lib/rdoc/context.rb', line 109

def params
  @params
end

#requiresObject (readonly)

Files this context requires



76
77
78
# File 'lib/rdoc/context.rb', line 76

def requires
  @requires
end

#temporary_sectionObject

Use this section for the next method, attribute or constant added.



81
82
83
# File 'lib/rdoc/context.rb', line 81

def temporary_section
  @temporary_section
end

#unmatched_alias_listsObject

Hash old_name => [aliases], for aliases that haven’t (yet) been resolved to a method/attribute. (Not to be confused with the aliases of the context.)



88
89
90
# File 'lib/rdoc/context.rb', line 88

def unmatched_alias_lists
  @unmatched_alias_lists
end

#visibilityObject

Current visibility of this context



98
99
100
# File 'lib/rdoc/context.rb', line 98

def visibility
  @visibility
end

Instance Method Details

#<=>(other) ⇒ Object

Contexts are sorted by full_name



166
167
168
# File 'lib/rdoc/context.rb', line 166

def <=>(other)
  full_name <=> other.full_name
end

#add(klass, name, comment) ⇒ Object

Adds an item of type klass with the given name and comment to the context.

Currently only RDoc::Extend and RDoc::Include are supported.



176
177
178
179
180
181
182
183
184
185
186
# File 'lib/rdoc/context.rb', line 176

def add klass, name, comment
  if RDoc::Extend == klass then
    ext = RDoc::Extend.new name, comment
    add_extend ext
  elsif RDoc::Include == klass then
    incl = RDoc::Include.new name, comment
    add_include incl
  else
    raise NotImplementedError, "adding a #{klass} is not implemented"
  end
end

#add_alias(an_alias) ⇒ Object

Adds an_alias that is automatically resolved



191
192
193
194
195
196
197
198
199
200
201
202
203
204
205
206
207
# File 'lib/rdoc/context.rb', line 191

def add_alias an_alias
  return an_alias unless @document_self

  method_attr = find_method(an_alias.old_name, an_alias.singleton) ||
                find_attribute(an_alias.old_name, an_alias.singleton)

  if method_attr then
    method_attr.add_alias an_alias, self
  else
    add_to @external_aliases, an_alias
    unmatched_alias_list =
      @unmatched_alias_lists[an_alias.pretty_old_name] ||= []
    unmatched_alias_list.push an_alias
  end

  an_alias
end

#add_attribute(attribute) ⇒ Object

Adds attribute if not already there. If it is (as method(s) or attribute), updates the comment if it was empty.

The attribute is registered only if it defines a new method. For instance, attr_reader :foo will not be registered if method foo exists, but attr_accessor :foo will be registered if method foo exists, but foo= does not.



218
219
220
221
222
223
224
225
226
227
228
229
230
231
232
233
234
235
236
237
238
239
240
241
242
243
244
245
246
247
248
249
250
251
252
253
254
255
256
257
258
259
260
261
262
263
264
# File 'lib/rdoc/context.rb', line 218

def add_attribute attribute
  return attribute unless @document_self

  # mainly to check for redefinition of an attribute as a method
  # TODO find a policy for 'attr_reader :foo' + 'def foo=()'
  register = false

  key = nil

  if attribute.rw.index 'R' then
    key = attribute.pretty_name
    known = @methods_hash[key]

    if known then
      known.comment = attribute.comment if known.comment.empty?
    elsif registered = @methods_hash[attribute.pretty_name << '='] and
          RDoc::Attr === registered then
      registered.rw = 'RW'
    else
      @methods_hash[key] = attribute
      register = true
    end
  end

  if attribute.rw.index 'W' then
    key = attribute.pretty_name << '='
    known = @methods_hash[key]

    if known then
      known.comment = attribute.comment if known.comment.empty?
    elsif registered = @methods_hash[attribute.pretty_name] and
          RDoc::Attr === registered then
      registered.rw = 'RW'
    else
      @methods_hash[key] = attribute
      register = true
    end
  end

  if register then
    attribute.visibility = @visibility
    add_to @attributes, attribute
    resolve_aliases attribute
  end

  attribute
end

#add_class(class_type, given_name, superclass = '::Object') ⇒ Object

Adds a class named given_name with superclass.

Both given_name and superclass may contain ‘::’, and are interpreted relative to the self context. This allows handling correctly examples like these:

class RDoc::Gauntlet < Gauntlet
module Mod
  class Object   # implies < ::Object
  class SubObject < Object  # this is _not_ ::Object

Given class Container::Item RDoc assumes Container is a module unless it later sees class Container. add_class automatically upgrades given_name to a class in this case.



281
282
283
284
285
286
287
288
289
290
291
292
293
294
295
296
297
298
299
300
301
302
303
304
305
306
307
308
309
310
311
312
313
314
315
316
317
318
319
320
321
322
323
324
325
326
327
328
329
330
331
332
333
334
335
336
337
338
339
340
341
342
343
344
345
346
347
348
349
350
351
352
353
354
355
356
357
358
359
360
361
362
363
364
365
366
367
368
369
370
371
372
373
374
375
376
377
378
379
380
381
382
383
384
385
386
387
# File 'lib/rdoc/context.rb', line 281

def add_class class_type, given_name, superclass = '::Object'
  # superclass +nil+ is passed by the C parser in the following cases:
  # - registering Object in 1.8 (correct)
  # - registering BasicObject in 1.9 (correct)
  # - registering RubyVM in 1.9 in iseq.c (incorrect: < Object in vm.c)
  #
  # If we later find a superclass for a registered class with a nil
  # superclass, we must honor it.

  # find the name & enclosing context
  if given_name =~ /^:+(\w+)$/ then
    full_name = $1
    enclosing = top_level
    name = full_name.split(/:+/).last
  else
    full_name = child_name given_name

    if full_name =~ /^(.+)::(\w+)$/ then
      name = $2
      ename = $1
      enclosing = @store.classes_hash[ename] || @store.modules_hash[ename]
      # HACK: crashes in actionpack/lib/action_view/helpers/form_helper.rb (metaprogramming)
      unless enclosing then
        # try the given name at top level (will work for the above example)
        enclosing = @store.classes_hash[given_name] ||
                    @store.modules_hash[given_name]
        return enclosing if enclosing
        # not found: create the parent(s)
        names = ename.split('::')
        enclosing = self
        names.each do |n|
          enclosing = enclosing.classes_hash[n] ||
                      enclosing.modules_hash[n] ||
                      enclosing.add_module(RDoc::NormalModule, n)
        end
      end
    else
      name = full_name
      enclosing = self
    end
  end

  # fix up superclass
  superclass = nil if full_name == 'BasicObject'
  superclass = nil if full_name == 'Object' and defined?(::BasicObject)
  superclass = '::BasicObject' if
    defined?(::BasicObject) and full_name == 'Object'

  # find the superclass full name
  if superclass then
    if superclass =~ /^:+/ then
      superclass = $' #'
    else
      if superclass =~ /^(\w+):+(.+)$/ then
        suffix = $2
        mod = find_module_named($1)
        superclass = mod.full_name + '::' + suffix if mod
      else
        mod = find_module_named(superclass)
        superclass = mod.full_name if mod
      end
    end

    # did we believe it was a module?
    mod = @store.modules_hash.delete superclass

    upgrade_to_class mod, RDoc::NormalClass, mod.parent if mod

    # e.g., Object < Object
    superclass = nil if superclass == full_name
  end

  klass = @store.classes_hash[full_name]

  if klass then
    # if TopLevel, it may not be registered in the classes:
    enclosing.classes_hash[name] = klass

    # update the superclass if needed
    if superclass then
      existing = klass.superclass
      existing = existing.full_name unless existing.is_a?(String) if existing
      if existing.nil? ||
         (existing == 'Object' && superclass != 'Object') then
        klass.superclass = superclass
      end
    end
  else
    # this is a new class
    mod = @store.modules_hash.delete full_name

    if mod then
      klass = upgrade_to_class mod, RDoc::NormalClass, enclosing

      klass.superclass = superclass unless superclass.nil?
    else
      klass = class_type.new name, superclass

      enclosing.add_class_or_module(klass, enclosing.classes_hash,
                                    @store.classes_hash)
    end
  end

  klass.parent = self

  klass
end

#add_class_or_module(mod, self_hash, all_hash) ⇒ Object

Adds the class or module mod to the modules or classes Hash self_hash, and to all_hash (either TopLevel::modules_hash or TopLevel::classes_hash), unless #done_documenting is true. Sets the #parent of mod to self, and its #section to #current_section. Returns mod.



396
397
398
399
400
401
402
403
404
405
406
407
408
409
410
# File 'lib/rdoc/context.rb', line 396

def add_class_or_module mod, self_hash, all_hash
  mod.section = current_section # TODO declaring context? something is
                                # wrong here...
  mod.parent = self
  mod.store = @store

  unless @done_documenting then
    self_hash[mod.name] = mod
    # this must be done AFTER adding mod to its parent, so that the full
    # name is correct:
    all_hash[mod.full_name] = mod
  end

  mod
end

#add_constant(constant) ⇒ Object

Adds constant if not already there. If it is, updates the comment, value and/or is_alias_for of the known constant if they were empty/nil.



416
417
418
419
420
421
422
423
424
425
426
427
428
429
430
431
432
433
434
435
436
# File 'lib/rdoc/context.rb', line 416

def add_constant constant
  return constant unless @document_self

  # HACK: avoid duplicate 'PI' & 'E' in math.c (1.8.7 source code)
  # (this is a #ifdef: should be handled by the C parser)
  known = @constants_hash[constant.name]

  if known then
    known.comment = constant.comment if known.comment.empty?

    known.value = constant.value if
      known.value.nil? or known.value.strip.empty?

    known.is_alias_for ||= constant.is_alias_for
  else
    @constants_hash[constant.name] = constant
    add_to @constants, constant
  end

  constant
end

#add_extend(ext) ⇒ Object

Adds extension module ext which should be an RDoc::Extend



450
451
452
453
454
# File 'lib/rdoc/context.rb', line 450

def add_extend ext
  add_to @extends, ext

  ext
end

#add_include(include) ⇒ Object

Adds included module include which should be an RDoc::Include



441
442
443
444
445
# File 'lib/rdoc/context.rb', line 441

def add_include include
  add_to @includes, include

  include
end

#add_method(method) ⇒ Object

Adds method if not already there. If it is (as method or attribute), updates the comment if it was empty.



460
461
462
463
464
465
466
467
468
469
470
471
472
473
474
475
476
477
478
479
480
481
482
483
# File 'lib/rdoc/context.rb', line 460

def add_method method
  return method unless @document_self

  # HACK: avoid duplicate 'new' in io.c & struct.c (1.8.7 source code)
  key = method.pretty_name
  known = @methods_hash[key]

  if known then
    if @store then # otherwise we are loading
      known.comment = method.comment if known.comment.empty?
      previously = ", previously in #{known.file}" unless
        method.file == known.file
      @store.rdoc.options.warn \
        "Duplicate method #{known.full_name} in #{method.file}#{previously}"
    end
  else
    @methods_hash[key] = method
    method.visibility = @visibility
    add_to @method_list, method
    resolve_aliases method
  end

  method
end

#add_module(class_type, name) ⇒ Object

Adds a module named name. If RDoc already knows name is a class then that class is returned instead. See also #add_class.



489
490
491
492
493
494
495
496
497
# File 'lib/rdoc/context.rb', line 489

def add_module(class_type, name)
  mod = @classes[name] || @modules[name]
  return mod if mod

  full_name = child_name name
  mod = @store.modules_hash[full_name] || class_type.new(name)

  add_class_or_module mod, @modules, @store.modules_hash
end

#add_module_alias(from, name, file) ⇒ Object

Adds an alias from from (a class or module) to name which was defined in file.



503
504
505
506
507
508
509
510
511
512
513
514
515
516
517
518
519
520
521
522
523
524
525
526
527
528
529
530
531
532
533
534
# File 'lib/rdoc/context.rb', line 503

def add_module_alias from, name, file
  return from if @done_documenting

  to_name = child_name name

  # if we already know this name, don't register an alias:
  # see the metaprogramming in lib/active_support/basic_object.rb,
  # where we already know BasicObject is a class when we find
  # BasicObject = BlankSlate
  return from if @store.find_class_or_module to_name

  to = from.dup
  to.name = name
  to.full_name = nil

  if to.module? then
    @store.modules_hash[to_name] = to
    @modules[name] = to
  else
    @store.classes_hash[to_name] = to
    @classes[name] = to
  end

  # Registers a constant for this alias.  The constant value and comment
  # will be updated later, when the Ruby parser adds the constant
  const = RDoc::Constant.new name, nil, to.comment
  const.record_location file
  const.is_alias_for = from
  add_constant const

  to
end

#add_require(require) ⇒ Object

Adds require to this context’s top level



539
540
541
542
543
544
545
546
547
# File 'lib/rdoc/context.rb', line 539

def add_require(require)
  return require unless @document_self

  if RDoc::TopLevel === self then
    add_to @requires, require
  else
    parent.add_require require
  end
end

#add_section(title, comment = nil) ⇒ Object

Returns a section with title, creating it if it doesn’t already exist. comment will be appended to the section’s comment.

A section with a title of nil will return the default section.

See also RDoc::Context::Section



557
558
559
560
561
562
563
564
565
566
# File 'lib/rdoc/context.rb', line 557

def add_section title, comment = nil
  if section = @sections[title] then
    section.add_comment comment if comment
  else
    section = Section.new self, title, comment
    @sections[title] = section
  end

  section
end

#add_to(array, thing) ⇒ Object

Adds thing to the collection array



571
572
573
574
575
576
577
# File 'lib/rdoc/context.rb', line 571

def add_to array, thing
  array << thing if @document_self

  thing.parent  = self
  thing.store   = @store if @store
  thing.section = current_section
end

#any_content(includes = true) ⇒ Object

Is there any content?

This means any of: comment, aliases, methods, attributes, external aliases, require, constant.

Includes and extends are also checked unless includes == false.



587
588
589
590
591
592
593
594
595
596
597
598
# File 'lib/rdoc/context.rb', line 587

def any_content(includes = true)
  @any_content ||= !(
    @comment.empty? &&
    @method_list.empty? &&
    @attributes.empty? &&
    @aliases.empty? &&
    @external_aliases.empty? &&
    @requires.empty? &&
    @constants.empty?
  )
  @any_content || (includes && !(@includes + @extends).empty? )
end

#child_name(name) ⇒ Object

Creates the full name for a child with name



603
604
605
606
607
608
609
610
611
# File 'lib/rdoc/context.rb', line 603

def child_name name
  if name =~ /^:+/
    $'  #'
  elsif RDoc::TopLevel === self then
    name
  else
    "#{self.full_name}::#{name}"
  end
end

#class_attributesObject

Class attributes



616
617
618
# File 'lib/rdoc/context.rb', line 616

def class_attributes
  @class_attributes ||= attributes.select { |a| a.singleton }
end

#class_method_listObject

Class methods



623
624
625
# File 'lib/rdoc/context.rb', line 623

def class_method_list
  @class_method_list ||= method_list.select { |a| a.singleton }
end

#classesObject

Array of classes in this context



630
631
632
# File 'lib/rdoc/context.rb', line 630

def classes
  @classes.values
end

#classes_and_modulesObject

All classes and modules in this namespace



637
638
639
# File 'lib/rdoc/context.rb', line 637

def classes_and_modules
  classes + modules
end

#classes_hashObject

Hash of classes keyed by class name



644
645
646
# File 'lib/rdoc/context.rb', line 644

def classes_hash
  @classes
end

#defined_in?(file) ⇒ Boolean

Is part of this thing was defined in file?

Returns:

  • (Boolean)


665
666
667
# File 'lib/rdoc/context.rb', line 665

def defined_in?(file)
  @in_files.include?(file)
end

#display(method_attr) ⇒ Object

:nodoc:



669
670
671
672
673
674
675
# File 'lib/rdoc/context.rb', line 669

def display(method_attr) # :nodoc:
  if method_attr.is_a? RDoc::Attr
    "#{method_attr.definition} #{method_attr.pretty_name}"
  else
    "method #{method_attr.pretty_name}"
  end
end

#each_ancestorObject

Iterator for ancestors for duck-typing. Does nothing. See RDoc::ClassModule#each_ancestor.

This method exists to make it easy to work with Context subclasses that aren’t part of RDoc.



684
685
# File 'lib/rdoc/context.rb', line 684

def each_ancestor # :nodoc:
end

#each_attributeObject

Iterator for attributes



690
691
692
# File 'lib/rdoc/context.rb', line 690

def each_attribute # :yields: attribute
  @attributes.each { |a| yield a }
end

#each_classmodule(&block) ⇒ Object

Iterator for classes and modules



697
698
699
# File 'lib/rdoc/context.rb', line 697

def each_classmodule(&block) # :yields: module
  classes_and_modules.sort.each(&block)
end

#each_constantObject

Iterator for constants



704
705
706
# File 'lib/rdoc/context.rb', line 704

def each_constant # :yields: constant
  @constants.each {|c| yield c}
end

#each_extendObject

Iterator for extension modules



718
719
720
# File 'lib/rdoc/context.rb', line 718

def each_extend # :yields: extend
  @extends.each do |e| yield e end
end

#each_includeObject

Iterator for included modules



711
712
713
# File 'lib/rdoc/context.rb', line 711

def each_include # :yields: include
  @includes.each do |i| yield i end
end

#each_methodObject

Iterator for methods



725
726
727
728
729
# File 'lib/rdoc/context.rb', line 725

def each_method # :yields: method
  return enum_for __method__ unless block_given?

  @method_list.sort.each { |m| yield m }
end

#each_sectionObject

Iterator for each section’s contents sorted by title. The section, the section’s constants and the sections attributes are yielded. The constants and attributes collections are sorted.

To retrieve methods in a section use #methods_by_type with the optional section parameter.

NOTE: Do not edit collections yielded by this method



741
742
743
744
745
746
747
748
749
750
751
752
753
# File 'lib/rdoc/context.rb', line 741

def each_section # :yields: section, constants, attributes
  return enum_for __method__ unless block_given?

  constants  = @constants.group_by  do |constant|  constant.section end
  attributes = @attributes.group_by do |attribute| attribute.section end

  constants.default  = []
  attributes.default = []

  sort_sections.each do |section|
    yield section, constants[section].sort, attributes[section].sort
  end
end

#find_attribute(name, singleton) ⇒ Object

Finds an attribute name with singleton value singleton.



758
759
760
761
# File 'lib/rdoc/context.rb', line 758

def find_attribute(name, singleton)
  name = $1 if name =~ /^(.*)=$/
  @attributes.find { |a| a.name == name && a.singleton == singleton }
end

#find_attribute_named(name) ⇒ Object

Finds an attribute with name in this context



766
767
768
769
770
771
772
773
774
775
# File 'lib/rdoc/context.rb', line 766

def find_attribute_named(name)
  case name
  when /\A#/ then
    find_attribute name[1..-1], false
  when /\A::/ then
    find_attribute name[2..-1], true
  else
    @attributes.find { |a| a.name == name }
  end
end

#find_class_method_named(name) ⇒ Object

Finds a class method with name in this context



780
781
782
# File 'lib/rdoc/context.rb', line 780

def find_class_method_named(name)
  @method_list.find { |meth| meth.singleton && meth.name == name }
end

#find_constant_named(name) ⇒ Object

Finds a constant with name in this context



787
788
789
# File 'lib/rdoc/context.rb', line 787

def find_constant_named(name)
  @constants.find {|m| m.name == name}
end

#find_enclosing_module_named(name) ⇒ Object

Find a module at a higher scope



794
795
796
# File 'lib/rdoc/context.rb', line 794

def find_enclosing_module_named(name)
  parent && parent.find_module_named(name)
end

#find_external_alias(name, singleton) ⇒ Object

Finds an external alias name with singleton value singleton.



801
802
803
# File 'lib/rdoc/context.rb', line 801

def find_external_alias(name, singleton)
  @external_aliases.find { |m| m.name == name && m.singleton == singleton }
end

#find_external_alias_named(name) ⇒ Object

Finds an external alias with name in this context



808
809
810
811
812
813
814
815
816
817
# File 'lib/rdoc/context.rb', line 808

def find_external_alias_named(name)
  case name
  when /\A#/ then
    find_external_alias name[1..-1], false
  when /\A::/ then
    find_external_alias name[2..-1], true
  else
    @external_aliases.find { |a| a.name == name }
  end
end

#find_file_named(name) ⇒ Object

Finds a file with name in this context



822
823
824
# File 'lib/rdoc/context.rb', line 822

def find_file_named name
  @store.find_file_named name
end

#find_instance_method_named(name) ⇒ Object

Finds an instance method with name in this context



829
830
831
# File 'lib/rdoc/context.rb', line 829

def find_instance_method_named(name)
  @method_list.find { |meth| !meth.singleton && meth.name == name }
end

#find_local_symbol(symbol) ⇒ Object

Finds a method, constant, attribute, external alias, module or file named symbol in this context.



837
838
839
840
841
842
843
844
# File 'lib/rdoc/context.rb', line 837

def find_local_symbol(symbol)
  find_method_named(symbol) or
  find_constant_named(symbol) or
  find_attribute_named(symbol) or
  find_external_alias_named(symbol) or
  find_module_named(symbol) or
  find_file_named(symbol)
end

#find_method(name, singleton) ⇒ Object

Finds a method named name with singleton value singleton.



849
850
851
# File 'lib/rdoc/context.rb', line 849

def find_method(name, singleton)
  @method_list.find { |m| m.name == name && m.singleton == singleton }
end

#find_method_named(name) ⇒ Object

Finds a instance or module method with name in this context



856
857
858
859
860
861
862
863
864
865
# File 'lib/rdoc/context.rb', line 856

def find_method_named(name)
  case name
  when /\A#/ then
    find_method name[1..-1], false
  when /\A::/ then
    find_method name[2..-1], true
  else
    @method_list.find { |meth| meth.name == name }
  end
end

#find_module_named(name) ⇒ Object

Find a module with name using ruby’s scoping rules



870
871
872
873
874
875
# File 'lib/rdoc/context.rb', line 870

def find_module_named(name)
  res = @modules[name] || @classes[name]
  return res if res
  return self if self.name == name
  find_enclosing_module_named name
end

#find_symbol(symbol) ⇒ Object

Look up symbol, first as a module, then as a local symbol.



880
881
882
# File 'lib/rdoc/context.rb', line 880

def find_symbol(symbol)
  find_symbol_module(symbol) || find_local_symbol(symbol)
end

#find_symbol_module(symbol) ⇒ Object

Look up a module named symbol.



887
888
889
890
891
892
893
894
895
896
897
898
899
900
901
902
903
904
905
906
907
908
909
910
911
912
913
914
915
# File 'lib/rdoc/context.rb', line 887

def find_symbol_module(symbol)
  result = nil

  # look for a class or module 'symbol'
  case symbol
  when /^::/ then
    result = @store.find_class_or_module symbol
  when /^(\w+):+(.+)$/
    suffix = $2
    top = $1
    searched = self
    while searched do
      mod = searched.find_module_named(top)
      break unless mod
      result = @store.find_class_or_module "#{mod.full_name}::#{suffix}"
      break if result || searched.is_a?(RDoc::TopLevel)
      searched = searched.parent
    end
  else
    searched = self
    while searched do
      result = searched.find_module_named(symbol)
      break if result || searched.is_a?(RDoc::TopLevel)
      searched = searched.parent
    end
  end

  result
end

#full_nameObject

The full name for this context. This method is overridden by subclasses.



920
921
922
# File 'lib/rdoc/context.rb', line 920

def full_name
  '(unknown)'
end

#fully_documented?Boolean

Does this context and its methods and constants all have documentation?

(Yes, fully documented doesn’t mean everything.)

Returns:

  • (Boolean)


929
930
931
932
933
934
# File 'lib/rdoc/context.rb', line 929

def fully_documented?
  documented? and
    attributes.all? { |a| a.documented? } and
    method_list.all? { |m| m.documented? } and
    constants.all? { |c| c.documented? }
end

#http_url(prefix) ⇒ Object

URL for this with a prefix



939
940
941
942
943
944
945
# File 'lib/rdoc/context.rb', line 939

def http_url(prefix)
  path = name_for_path
  path = path.gsub(/<<\s*(\w*)/, 'from-\1') if path =~ /<</
  path = [prefix] + path.split('::')

  File.join(*path.compact) + '.html'
end

#initialize_methods_etcObject

Sets the defaults for methods and so-forth



141
142
143
144
145
146
147
148
149
150
151
152
153
154
155
156
157
158
159
160
161
# File 'lib/rdoc/context.rb', line 141

def initialize_methods_etc
  @method_list = []
  @attributes  = []
  @aliases     = []
  @requires    = []
  @includes    = []
  @extends     = []
  @constants   = []
  @external_aliases = []

  # This Hash maps a method name to a list of unmatched aliases (aliases of
  # a method not yet encountered).
  @unmatched_alias_lists = {}

  @methods_hash   = {}
  @constants_hash = {}

  @params = nil

  @store ||= nil
end

#instance_attributesObject

Instance attributes



950
951
952
# File 'lib/rdoc/context.rb', line 950

def instance_attributes
  @instance_attributes ||= attributes.reject { |a| a.singleton }
end

#instance_method_listObject

Instance methods – TODO rename to instance_methods



959
960
961
# File 'lib/rdoc/context.rb', line 959

def instance_method_list
  @instance_method_list ||= method_list.reject { |a| a.singleton }
end

#methods_by_type(section = nil) ⇒ Object

Breaks method_list into a nested hash by type ('class' or 'instance') and visibility (:public, :protected, :private).

If section is provided only methods in that RDoc::Context::Section will be returned.



970
971
972
973
974
975
976
977
978
979
980
981
982
983
984
985
986
987
988
# File 'lib/rdoc/context.rb', line 970

def methods_by_type section = nil
  methods = {}

  TYPES.each do |type|
    visibilities = {}
    RDoc::VISIBILITIES.each do |vis|
      visibilities[vis] = []
    end

    methods[type] = visibilities
  end

  each_method do |method|
    next if section and not method.section == section
    methods[method.type][method.visibility] << method
  end

  methods
end

#methods_matching(methods, singleton = false, &block) ⇒ Object

Yields AnyMethod and Attr entries matching the list of names in methods.



993
994
995
996
997
998
999
1000
1001
# File 'lib/rdoc/context.rb', line 993

def methods_matching(methods, singleton = false, &block)
  (@method_list + @attributes).each do |m|
    yield m if methods.include?(m.name) and m.singleton == singleton
  end

  each_ancestor do |parent|
    parent.methods_matching(methods, singleton, &block)
  end
end

#modulesObject

Array of modules in this context



1006
1007
1008
# File 'lib/rdoc/context.rb', line 1006

def modules
  @modules.values
end

#modules_hashObject

Hash of modules keyed by module name



1013
1014
1015
# File 'lib/rdoc/context.rb', line 1013

def modules_hash
  @modules
end

#name_for_pathObject

Name to use to generate the url. #full_name by default.



1021
1022
1023
# File 'lib/rdoc/context.rb', line 1021

def name_for_path
  full_name
end

#ongoing_visibility=(visibility) ⇒ Object

Changes the visibility for new methods to visibility



1028
1029
1030
# File 'lib/rdoc/context.rb', line 1028

def ongoing_visibility=(visibility)
  @visibility = visibility
end

#record_location(top_level) ⇒ Object

Record top_level as a file self is in.



1035
1036
1037
# File 'lib/rdoc/context.rb', line 1035

def record_location(top_level)
  @in_files << top_level unless @in_files.include?(top_level)
end

#remove_from_documentation?Boolean

Should we remove this context from the documentation?

The answer is yes if:

  • #received_nodoc is true

  • #any_content is false (not counting includes)

  • All #includes are modules (not a string), and their module has #remove_from_documentation? == true

  • All classes and modules have #remove_from_documentation? == true

Returns:

  • (Boolean)


1049
1050
1051
1052
1053
1054
1055
# File 'lib/rdoc/context.rb', line 1049

def remove_from_documentation?
  @remove_from_documentation ||=
    @received_nodoc &&
    !any_content(false) &&
    @includes.all? { |i| !i.module.is_a?(String) && i.module.remove_from_documentation? } &&
    classes_and_modules.all? { |cm| cm.remove_from_documentation? }
end

#remove_invisible(min_visibility) ⇒ Object

Removes methods and attributes with a visibility less than min_visibility. – TODO mark the visibility of attributes in the template (if not public?)



1062
1063
1064
1065
1066
# File 'lib/rdoc/context.rb', line 1062

def remove_invisible min_visibility
  return if [:private, :nodoc].include? min_visibility
  remove_invisible_in @method_list, min_visibility
  remove_invisible_in @attributes, min_visibility
end

#remove_invisible_in(array, min_visibility) ⇒ Object

Only called when min_visibility == :public or :private



1071
1072
1073
1074
1075
1076
1077
1078
1079
1080
1081
# File 'lib/rdoc/context.rb', line 1071

def remove_invisible_in array, min_visibility # :nodoc:
  if min_visibility == :public then
    array.reject! { |e|
      e.visibility != :public and not e.force_documentation
    }
  else
    array.reject! { |e|
      e.visibility == :private and not e.force_documentation
    }
  end
end

#resolve_aliases(added) ⇒ Object

Tries to resolve unmatched aliases when a method or attribute has just been added.



1087
1088
1089
1090
1091
1092
1093
1094
1095
1096
1097
# File 'lib/rdoc/context.rb', line 1087

def resolve_aliases added
  # resolve any pending unmatched aliases
  key = added.pretty_name
  unmatched_alias_list = @unmatched_alias_lists[key]
  return unless unmatched_alias_list
  unmatched_alias_list.each do |unmatched_alias|
    added.add_alias unmatched_alias, self
    @external_aliases.delete unmatched_alias
  end
  @unmatched_alias_lists.delete key
end

#section_contentsObject

Returns RDoc::Context::Section objects referenced in this context for use in a table of contents.



1103
1104
1105
1106
1107
1108
1109
1110
1111
1112
1113
1114
1115
1116
1117
1118
1119
1120
1121
1122
# File 'lib/rdoc/context.rb', line 1103

def section_contents
  used_sections = {}

  each_method do |method|
    next unless method.display?

    used_sections[method.section] = true
  end

  # order found sections
  sections = sort_sections.select do |section|
    used_sections[section]
  end

  # only the default section is used
  return [] if
    sections.length == 1 and not sections.first.title

  sections
end

#sectionsObject

Sections in this context



1127
1128
1129
# File 'lib/rdoc/context.rb', line 1127

def sections
  @sections.values
end

#sections_hashObject

:nodoc:



1131
1132
1133
# File 'lib/rdoc/context.rb', line 1131

def sections_hash # :nodoc:
  @sections
end

#set_current_section(title, comment) ⇒ Object

Sets the current section to a section with title. See also #add_section



1138
1139
1140
# File 'lib/rdoc/context.rb', line 1138

def set_current_section title, comment
  @current_section = add_section title, comment
end

#set_visibility_for(methods, visibility, singleton = false) ⇒ Object

Given an array methods of method names, set the visibility of each to visibility



1146
1147
1148
1149
1150
# File 'lib/rdoc/context.rb', line 1146

def set_visibility_for(methods, visibility, singleton = false)
  methods_matching methods, singleton do |m|
    m.visibility = visibility
  end
end

#sort_sectionsObject

Sorts sections alphabetically (default) or in TomDoc fashion (none, Public, Internal, Deprecated)



1156
1157
1158
1159
1160
1161
1162
1163
1164
1165
1166
1167
1168
1169
1170
# File 'lib/rdoc/context.rb', line 1156

def sort_sections
  titles = @sections.map { |title, _| title }

  if titles.length > 1 and
     TOMDOC_TITLES_SORT ==
       (titles | TOMDOC_TITLES).sort_by { |title| title.to_s } then
    @sections.values_at(*TOMDOC_TITLES).compact
  else
    @sections.sort_by { |title, _|
      title.to_s
    }.map { |_, section|
      section
    }
  end
end

#to_sObject

:nodoc:



1172
1173
1174
# File 'lib/rdoc/context.rb', line 1172

def to_s # :nodoc:
  "#{self.class.name} #{self.full_name}"
end

#top_levelObject

Return the TopLevel that owns us – FIXME we can be ‘owned’ by several TopLevel (see #record_location & #in_files)



1182
1183
1184
1185
1186
1187
# File 'lib/rdoc/context.rb', line 1182

def top_level
  return @top_level if defined? @top_level
  @top_level = self
  @top_level = @top_level.parent until RDoc::TopLevel === @top_level
  @top_level
end

#upgrade_to_class(mod, class_type, enclosing) ⇒ Object

Upgrades NormalModule mod in enclosing to a class_type



1192
1193
1194
1195
1196
1197
1198
1199
1200
1201
1202
1203
# File 'lib/rdoc/context.rb', line 1192

def upgrade_to_class mod, class_type, enclosing
  enclosing.modules_hash.delete mod.name

  klass = RDoc::ClassModule.from_module class_type, mod
  klass.store = @store

  # if it was there, then we keep it even if done_documenting
  @store.classes_hash[mod.full_name] = klass
  enclosing.classes_hash[mod.name]   = klass

  klass
end