Class: OptionParser

Inherits:
Object
  • Object
show all
Defined in:
lib/optparse.rb

Overview

Developer Documentation (not for RDoc output)

Class tree

  • OptionParser

    front end

  • OptionParser::Switch

    each switches

  • OptionParser::List

    options list

  • OptionParser::ParseError

    errors on parsing

    • OptionParser::AmbiguousOption

    • OptionParser::NeedlessArgument

    • OptionParser::MissingArgument

    • OptionParser::InvalidOption

    • OptionParser::InvalidArgument

      • OptionParser::AmbiguousArgument

Object relationship diagram

+--------------+
| OptionParser |<>-----+
+--------------+       |                      +--------+
                       |                    ,-| Switch |
     on_head -------->+---------------+    /  +--------+
     accept/reject -->| List          |<|>-
                      |               |<|>-  +----------+
     on ------------->+---------------+    `-| argument |
                        :           :        |  class   |
                      +---------------+      |==========|
     on_tail -------->|               |      |pattern   |
                      +---------------+      |----------|
OptionParser.accept ->| DefaultList   |      |converter |
             reject   |(shared between|      +----------+
                      | all instances)|
                      +---------------+

OptionParser

Introduction

OptionParser is a class for command-line option analysis. It is much more advanced, yet also easier to use, than GetoptLong, and is a more Ruby-oriented solution.

Features

  1. The argument specification and the code to handle it are written in the same place.

  2. It can output an option summary; you don't need to maintain this string separately.

  3. Optional and mandatory arguments are specified very gracefully.

  4. Arguments can be automatically converted to a specified class.

  5. Arguments can be restricted to a certain set.

All of these features are demonstrated in the examples below.

Minimal example

require 'optparse'

options = {}
OptionParser.new do |opts|
  opts.banner = "Usage: example.rb [options]"

  opts.on("-v", "--[no-]verbose", "Run verbosely") do |v|
    options[:verbose] = v
  end
end.parse!

p options
p ARGV

Complete example

The following example is a complete Ruby program. You can run it and see the effect of specifying various options. This is probably the best way to learn the features of optparse.

require 'optparse'
require 'optparse/time'
require 'ostruct'
require 'pp'

class OptparseExample

  CODES = %w[iso-2022-jp shift_jis euc-jp utf8 binary]
  CODE_ALIASES = { "jis" => "iso-2022-jp", "sjis" => "shift_jis" }

  #
  # Return a structure describing the options.
  #
  def self.parse(args)
    # The options specified on the command line will be collected in *options*.
    # We set default values here.
    options = OpenStruct.new
    options.library = []
    options.inplace = false
    options.encoding = "utf8"
    options.transfer_type = :auto
    options.verbose = false

    opts = OptionParser.new do |opts|
      opts.banner = "Usage: example.rb [options]"

      opts.separator ""
      opts.separator "Specific options:"

      # Mandatory argument.
      opts.on("-r", "--require LIBRARY",
              "Require the LIBRARY before executing your script") do |lib|
        options.library << lib
      end

      # Optional argument; multi-line description.
      opts.on("-i", "--inplace [EXTENSION]",
              "Edit ARGV files in place",
              "  (make backup if EXTENSION supplied)") do |ext|
        options.inplace = true
        options.extension = ext || ''
        options.extension.sub!(/\A\.?(?=.)/, ".")  # Ensure extension begins with dot.
      end

      # Cast 'delay' argument to a Float.
      opts.on("--delay N", Float, "Delay N seconds before executing") do |n|
        options.delay = n
      end

      # Cast 'time' argument to a Time object.
      opts.on("-t", "--time [TIME]", Time, "Begin execution at given time") do |time|
        options.time = time
      end

      # Cast to octal integer.
      opts.on("-F", "--irs [OCTAL]", OptionParser::OctalInteger,
              "Specify record separator (default \\0)") do |rs|
        options.record_separator = rs
      end

      # List of arguments.
      opts.on("--list x,y,z", Array, "Example 'list' of arguments") do |list|
        options.list = list
      end

      # Keyword completion.  We are specifying a specific set of arguments (CODES
      # and CODE_ALIASES - notice the latter is a Hash), and the user may provide
      # the shortest unambiguous text.
      code_list = (CODE_ALIASES.keys + CODES).join(',')
      opts.on("--code CODE", CODES, CODE_ALIASES, "Select encoding",
              "  (#{code_list})") do |encoding|
        options.encoding = encoding
      end

      # Optional argument with keyword completion.
      opts.on("--type [TYPE]", [:text, :binary, :auto],
              "Select transfer type (text, binary, auto)") do |t|
        options.transfer_type = t
      end

      # Boolean switch.
      opts.on("-v", "--[no-]verbose", "Run verbosely") do |v|
        options.verbose = v
      end

      opts.separator ""
      opts.separator "Common options:"

      # No argument, shows at tail.  This will print an options summary.
      # Try it and see!
      opts.on_tail("-h", "--help", "Show this message") do
        puts opts
        exit
      end

      # Another typical switch to print the version.
      opts.on_tail("--version", "Show version") do
        puts OptionParser::Version.join('.')
        exit
      end
    end

    opts.parse!(args)
    options
  end  # parse()

end  # class OptparseExample

options = OptparseExample.parse(ARGV)
pp options

Further documentation

The above examples should be enough to learn how to use this class. If you have any questions, email me ([email protected]) and I will update this document.

Defined Under Namespace

Modules: Acceptables, Arguable, Completion Classes: AmbiguousArgument, AmbiguousOption, CompletingHash, InvalidArgument, InvalidOption, List, MissingArgument, NeedlessArgument, OptionMap, ParseError, Switch

Constant Summary collapse

RCSID =

:stopdoc:

%w$Id: optparse.rb 22467 2009-02-20 11:42:39Z shyouhei $[1..-1].each {|s| s.freeze}.freeze
Version =
(RCSID[1].split('.').collect {|s| s.to_i}.extend(Comparable).freeze if RCSID[1])
LastModified =
(Time.gm(*RCSID[2, 2].join('-').scan(/\d+/).collect {|s| s.to_i}) if RCSID[2])
Release =
RCSID[2]
NoArgument =
[NO_ARGUMENT = :NONE, nil].freeze
RequiredArgument =
[REQUIRED_ARGUMENT = :REQUIRED, true].freeze
OptionalArgument =
[OPTIONAL_ARGUMENT = :OPTIONAL, false].freeze
ArgumentStyle =

Enumeration of acceptable argument styles. Possible values are:

NO_ARGUMENT

The switch takes no arguments. (:NONE)

REQUIRED_ARGUMENT

The switch requires an argument. (:REQUIRED)

OPTIONAL_ARGUMENT

The switch requires an optional argument. (:OPTIONAL)

Use like --switch=argument (long style) or -Xargument (short style). For short style, only portion matched to argument pattern is dealed as argument.

{}
DefaultList =

Switches common used such as '--', and also provides default argument classes

List.new
Officious =

Default options for ARGV, which never appear in option summary.

{}
DecimalInteger =

Decimal integer format, to be converted to Integer.

/\A[-+]?#{decimal}/io
OctalInteger =

Ruby/C like octal/hexadecimal/binary integer format, to be converted to Integer.

/\A[-+]?(?:[0-7]+(?:_[0-7]+)*|0(?:#{binary}|#{hex}))/io
DecimalNumeric =

Decimal integer/float number format, to be converted to Integer for integer format, Float for float format.

floatpat

Instance Attribute Summary collapse

Class Method Summary collapse

Instance Method Summary collapse

Constructor Details

#initialize(banner = nil, width = 32, indent = ' ' * 4) {|_self| ... } ⇒ OptionParser

Initializes the instance and yields itself if called with a block.

banner

Banner message.

width

Summary width.

indent

Summary indent.

Yields:

  • (_self)

Yield Parameters:

  • _self (OptionParser)

    the object that the method was called on



781
782
783
784
785
786
787
788
789
790
# File 'lib/optparse.rb', line 781

def initialize(banner = nil, width = 32, indent = ' ' * 4)
  @stack = [DefaultList, List.new, List.new]
  @program_name = nil
  @banner = banner
  @summary_width = width
  @summary_indent = indent
  @default_argv = ARGV
  add_officious
  yield self if block_given?
end

Instance Attribute Details

Heading banner preceding summary.



864
865
866
867
868
869
870
# File 'lib/optparse.rb', line 864

def banner
  unless @banner
    @banner = "Usage: #{program_name} [options]"
    visit(:add_banner, @banner)
  end
  @banner
end

#default_argvObject

Strings to be parsed in default.



859
860
861
# File 'lib/optparse.rb', line 859

def default_argv
  @default_argv
end

#program_nameObject

Program name to be emitted in error message and default banner, defaults to $0.



876
877
878
# File 'lib/optparse.rb', line 876

def program_name
  @program_name || File.basename($0, '.*')
end

#releaseObject

Release code



901
902
903
# File 'lib/optparse.rb', line 901

def release
  @release || (defined?(::Release) && ::Release) || (defined?(::RELEASE) && ::RELEASE)
end

#summary_indentObject

Indentation for summary. Must be String (or have + String method).



856
857
858
# File 'lib/optparse.rb', line 856

def summary_indent
  @summary_indent
end

#summary_widthObject

Width for option list portion of summary. Must be Numeric.



853
854
855
# File 'lib/optparse.rb', line 853

def summary_width
  @summary_width
end

#versionObject

Version



894
895
896
# File 'lib/optparse.rb', line 894

def version
  @version || (defined?(::Version) && ::Version)
end

Class Method Details

.accept(*args, &blk) ⇒ Object

See #accept.



826
# File 'lib/optparse.rb', line 826

def self.accept(*args, &blk) top.accept(*args, &blk) end

.each_const(path, klass = ::Object) ⇒ Object



49
50
51
52
53
54
55
56
57
# File 'lib/optparse/version.rb', line 49

def each_const(path, klass = ::Object)
  path.split(/::|\//).inject(klass) do |klass, name|
    raise NameError, path unless Module === klass
    klass.constants.grep(/#{name}/i) do |c|
      klass.const_defined?(c) or next
      c = klass.const_get(c)
    end
  end
end

.getopts(*args) ⇒ Object

See #getopts.



1405
1406
1407
# File 'lib/optparse.rb', line 1405

def self.getopts(*args)
  new.getopts(*args)
end

.inc(arg, default = nil) ⇒ Object

Returns an incremented value of default according to arg.



762
763
764
765
766
767
768
769
# File 'lib/optparse.rb', line 762

def self.inc(arg, default = nil)
  case arg
  when Integer
    arg.nonzero?
  when nil
    default.to_i + 1
  end
end

.reject(*args, &blk) ⇒ Object

See #reject.



839
# File 'lib/optparse.rb', line 839

def self.reject(*args, &blk) top.reject(*args, &blk) end

.search_const(klass, name) ⇒ Object



59
60
61
62
63
64
65
66
67
68
69
# File 'lib/optparse/version.rb', line 59

def search_const(klass, name)
  klasses = [klass]
  while klass = klasses.shift
    klass.constants.each do |cname|
      klass.const_defined?(cname) or next
      const = klass.const_get(cname)
      yield klass, cname, const if name === cname
      klasses << const if Module === const and const != ::Object
    end
  end
end

.show_version(*pkg) ⇒ Object



4
5
6
7
8
9
10
11
12
13
14
15
16
17
18
19
20
21
22
23
24
25
26
27
28
29
30
31
32
33
34
35
36
37
38
39
40
41
42
43
44
45
46
47
# File 'lib/optparse/version.rb', line 4

def show_version(*pkg)
  progname = ARGV.options.program_name
  result = false
  show = proc do |klass, cname, version|
    str = "#{progname}"
    unless klass == ::Object and cname == :VERSION
      version = version.join(".") if Array === version
      str << ": #{klass}" unless klass == Object
      str << " version #{version}"
    end
    [:Release, :RELEASE].find do |rel|
      if klass.const_defined?(rel)
        str << " (#{klass.const_get(rel)})"
      end
    end
    puts str
    result = true
  end
  if pkg.size == 1 and pkg[0] == "all"
    self.search_const(::Object, /\AV(?:ERSION|ersion)\z/) do |klass, cname, version|
      unless cname[1] == ?e and klass.const_defined?(:Version)
        show.call(klass, cname.intern, version)
      end
    end
  else
    pkg.each do |pkg|
      begin
        pkg = pkg.split(/::|\//).inject(::Object) {|m, c| m.const_get(c)}
        v = case
            when pkg.const_defined?(:Version)
              pkg.const_get(n = :Version)
            when pkg.const_defined?(:VERSION)
              pkg.const_get(n = :VERSION)
            else
              n = nil
              "unknown"
            end
        show.call(pkg, n, v)
      rescue NameError
      end
    end
  end
  result
end

.terminate(arg = nil) ⇒ Object



806
807
808
# File 'lib/optparse.rb', line 806

def self.terminate(arg = nil)
  throw :terminate, arg
end

.topObject



811
# File 'lib/optparse.rb', line 811

def self.top() DefaultList end

.with(*args, &block) ⇒ Object

Initializes a new instance and evaluates the optional block in context of the instance. Arguments args are passed to #new, see there for description of parameters.

This method is deprecated, its behavior corresponds to the older #new method.



753
754
755
756
757
# File 'lib/optparse.rb', line 753

def self.with(*args, &block)
  opts = new(*args)
  opts.instance_eval(&block)
  opts
end

Instance Method Details

#abort(mesg = $!) ⇒ Object



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

def abort(mesg = $!)
  super("#{program_name}: #{mesg}")
end

#accept(*args, &blk) ⇒ Object

Directs to accept specified class t. The argument string is passed to the block in which it should be converted to the desired class.

t

Argument class specifier, any object including Class.

pat

Pattern for argument, defaults to t if it responds to match.

accept(t, pat, &block)


822
# File 'lib/optparse.rb', line 822

def accept(*args, &blk) top.accept(*args, &blk) end

#add_officiousObject

:nodoc:



792
793
794
795
796
797
# File 'lib/optparse.rb', line 792

def add_officious  # :nodoc:
  list = base()
  Officious.each do |opt, block|
    list.long[opt] ||= block.call(self)
  end
end

#baseObject

Subject of #on_tail.



934
935
936
# File 'lib/optparse.rb', line 934

def base
  @stack[1]
end

#define(*opts, &block) ⇒ Object Also known as: def_option



1181
1182
1183
1184
# File 'lib/optparse.rb', line 1181

def define(*opts, &block)
  top.append(*(sw = make_switch(opts, block)))
  sw[0]
end

#define_head(*opts, &block) ⇒ Object Also known as: def_head_option



1196
1197
1198
1199
# File 'lib/optparse.rb', line 1196

def define_head(*opts, &block)
  top.prepend(*(sw = make_switch(opts, block)))
  sw[0]
end

#define_tail(*opts, &block) ⇒ Object Also known as: def_tail_option



1210
1211
1212
1213
# File 'lib/optparse.rb', line 1210

def define_tail(*opts, &block)
  base.append(*(sw = make_switch(opts, block)))
  sw[0]
end

#environment(env = File.basename($0, '.*')) ⇒ Object

Parses environment variable env or its uppercase with splitting like a shell.

env defaults to the basename of the program.



1480
1481
1482
1483
1484
# File 'lib/optparse.rb', line 1480

def environment(env = File.basename($0, '.*'))
  env = ENV[env] || ENV[env.upcase] or return
  require 'shellwords'
  parse(*Shellwords.shellwords(env))
end

#getopts(*args) ⇒ Object

Wrapper method for getopts.rb.

params = ARGV.getopts("ab:", "foo", "bar:")
# params[:a] = true   # -a
# params[:b] = "1"    # -b1
# params[:foo] = "1"  # --foo
# params[:bar] = "x"  # --bar x


1371
1372
1373
1374
1375
1376
1377
1378
1379
1380
1381
1382
1383
1384
1385
1386
1387
1388
1389
1390
1391
1392
1393
1394
1395
1396
1397
1398
1399
1400
# File 'lib/optparse.rb', line 1371

def getopts(*args)
  argv = Array === args.first ? args.shift : default_argv
  single_options, *long_options = *args

  result = {}

  single_options.scan(/(.)(:)?/) do |opt, val|
    if val
      result[opt] = nil
      define("-#{opt} VAL")
    else
      result[opt] = false
      define("-#{opt}")
    end
  end if single_options

  long_options.each do |arg|
    opt, val = arg.split(':', 2)
    if val
      result[opt] = val.empty? ? nil : val
      define("--#{opt} VAL")
    else
      result[opt] = false
      define("--#{opt}")
    end
  end

  parse_in_order(argv, result.method(:[]=))
  result
end

#helpObject Also known as: to_s

Returns option summary string.



975
# File 'lib/optparse.rb', line 975

def help; summarize(banner.to_s.sub(/\n?\z/, "\n")) end

#inc(*args) ⇒ Object



770
771
772
# File 'lib/optparse.rb', line 770

def inc(*args)
  self.class.inc(*args)
end

#load(filename = nil) ⇒ Object

Loads options from file names as filename. Does nothing when the file is not present. Returns whether successfully loaded.

filename defaults to basename of the program without suffix in a directory ~/.options.



1460
1461
1462
1463
1464
1465
1466
1467
1468
1469
1470
1471
1472
# File 'lib/optparse.rb', line 1460

def load(filename = nil)
  begin
    filename ||= File.expand_path(File.basename($0, '.*'), '~/.options')
  rescue
    return false
  end
  begin
    parse(*IO.readlines(filename).each {|s| s.chomp!})
    true
  rescue Errno::ENOENT, Errno::ENOTDIR
    false
  end
end

#make_switch(opts, block = nil) ⇒ Object

Creates an OptionParser::Switch from the parameters. The parsed argument value is passed to the given block, where it can be processed.

See at the beginning of OptionParser for some full examples.

opts can include the following elements:

Argument style:

One of the following:

:NONE, :REQUIRED, :OPTIONAL
Argument pattern:

Acceptable option argument format, must be pre-defined with OptionParser.accept or OptionParser#accept, or Regexp. This can appear once or assigned as String if not present, otherwise causes an ArgumentError. Examples:

Float, Time, Array
Possible argument values:

Hash or Array.

[:text, :binary, :auto]
%w[iso-2022-jp shift_jis euc-jp utf8 binary]
{ "jis" => "iso-2022-jp", "sjis" => "shift_jis" }
Long style switch:

Specifies a long style switch which takes a mandatory, optional or no argument. It's a string of the following form:

"--switch=MANDATORY" or "--switch MANDATORY"
"--switch[=OPTIONAL]"
"--switch"
Short style switch:

Specifies short style switch which takes a mandatory, optional or no argument. It's a string of the following form:

"-xMANDATORY"
"-x[OPTIONAL]"
"-x"

There is also a special form which matches character range (not full set of regural expression):

"-[a-z]MANDATORY"
"-[a-z][OPTIONAL]" 
"-[a-z]"
Argument style and description:

Instead of specifying mandatory or optional orguments directly in the switch parameter, this separate parameter can be used.

"=MANDATORY"
"=[OPTIONAL]"
Description:

Description string for the option.

"Run verbosely"
Handler:

Handler for the parsed argument value. Either give a block or pass a Proc or Method as an argument.



1062
1063
1064
1065
1066
1067
1068
1069
1070
1071
1072
1073
1074
1075
1076
1077
1078
1079
1080
1081
1082
1083
1084
1085
1086
1087
1088
1089
1090
1091
1092
1093
1094
1095
1096
1097
1098
1099
1100
1101
1102
1103
1104
1105
1106
1107
1108
1109
1110
1111
1112
1113
1114
1115
1116
1117
1118
1119
1120
1121
1122
1123
1124
1125
1126
1127
1128
1129
1130
1131
1132
1133
1134
1135
1136
1137
1138
1139
1140
1141
1142
1143
1144
1145
1146
1147
1148
1149
1150
1151
1152
1153
1154
1155
1156
1157
1158
1159
1160
1161
1162
1163
1164
1165
1166
1167
1168
1169
1170
1171
1172
1173
1174
1175
1176
1177
1178
1179
# File 'lib/optparse.rb', line 1062

def make_switch(opts, block = nil)
  short, long, nolong, style, pattern, conv, not_pattern, not_conv, not_style = [], [], []
  ldesc, sdesc, desc, arg = [], [], []
  default_style = Switch::NoArgument
  default_pattern = nil
  klass = nil
  o = nil
  n, q, a = nil

  opts.each do |o|
    # argument class
    next if search(:atype, o) do |pat, c|
      klass = notwice(o, klass, 'type')
      if not_style and not_style != Switch::NoArgument
        not_pattern, not_conv = pat, c
      else
        default_pattern, conv = pat, c
      end
    end

    # directly specified pattern(any object possible to match)
    if !(String === o) and o.respond_to?(:match)
      pattern = notwice(o, pattern, 'pattern')
      conv = (pattern.method(:convert).to_proc if pattern.respond_to?(:convert))
      next
    end

    # anything others
    case o
    when Proc, Method
      block = notwice(o, block, 'block')
    when Array, Hash
      case pattern
      when CompletingHash
      when nil
        pattern = CompletingHash.new
        conv = (pattern.method(:convert).to_proc if pattern.respond_to?(:convert))
      else
        raise ArgumentError, "argument pattern given twice"
      end
      o.each {|(o, *v)| pattern[o] = v.fetch(0) {o}}
    when Module
      raise ArgumentError, "unsupported argument type: #{o}"
    when *ArgumentStyle.keys
      style = notwice(ArgumentStyle[o], style, 'style')
    when /^--no-([^\[\]=\s]*)(.+)?/
      q, a = $1, $2
      o = notwice(a ? Object : TrueClass, klass, 'type')
      not_pattern, not_conv = search(:atype, o) unless not_style
      not_style = (not_style || default_style).guess(arg = a) if a
      default_style = Switch::NoArgument
      default_pattern, conv = search(:atype, FalseClass) unless default_pattern
      ldesc << "--no-#{q}"
      long << 'no-' + (q = q.downcase)
      nolong << q
    when /^--\[no-\]([^\[\]=\s]*)(.+)?/
      q, a = $1, $2
      o = notwice(a ? Object : TrueClass, klass, 'type')
      if a
        default_style = default_style.guess(arg = a)
        default_pattern, conv = search(:atype, o) unless default_pattern
      end
      ldesc << "--[no-]#{q}"
      long << (o = q.downcase)
      not_pattern, not_conv = search(:atype, FalseClass) unless not_style
      not_style = Switch::NoArgument
      nolong << 'no-' + o
    when /^--([^\[\]=\s]*)(.+)?/
      q, a = $1, $2
      if a
        o = notwice(NilClass, klass, 'type')
        default_style = default_style.guess(arg = a)
        default_pattern, conv = search(:atype, o) unless default_pattern
      end
      ldesc << "--#{q}"
      long << (o = q.downcase)
    when /^-(\[\^?\]?(?:[^\\\]]|\\.)*\])(.+)?/
      q, a = $1, $2
      o = notwice(Object, klass, 'type')
      if a
        default_style = default_style.guess(arg = a)
        default_pattern, conv = search(:atype, o) unless default_pattern
      end
      sdesc << "-#{q}"
      short << Regexp.new(q)
    when /^-(.)(.+)?/
      q, a = $1, $2
      if a
        o = notwice(NilClass, klass, 'type')
        default_style = default_style.guess(arg = a)
        default_pattern, conv = search(:atype, o) unless default_pattern
      end
      sdesc << "-#{q}"
      short << q
    when /^=/
      style = notwice(default_style.guess(arg = o), style, 'style')
      default_pattern, conv = search(:atype, Object) unless default_pattern
    else
      desc.push(o)
    end
  end

  default_pattern, conv = search(:atype, default_style.pattern) unless default_pattern
  if !(short.empty? and long.empty?)
    s = (style || default_style).new(pattern || default_pattern,
                                     conv, sdesc, ldesc, arg, desc, block)
  elsif !block
    raise ArgumentError, "no switch given" if style or pattern
    s = desc
  else
    short << pattern
    s = (style || default_style).new(pattern,
                                     conv, nil, nil, arg, desc, block)
  end
  return s, short, long,
    (not_style.new(not_pattern, not_conv, sdesc, ldesc, nil, desc, block) if not_style),
    nolong
end

#newObject

Pushes a new List.



941
942
943
944
945
946
947
948
# File 'lib/optparse.rb', line 941

def new
  @stack.push(List.new)
  if block_given?
    yield self
  else
    self
  end
end

#on(*opts, &block) ⇒ Object

Add option switch and handler. See #make_switch for an explanation of parameters.



1190
1191
1192
1193
# File 'lib/optparse.rb', line 1190

def on(*opts, &block)
  define(*opts, &block)
  self
end

#on_head(*opts, &block) ⇒ Object

Add option switch like with #on, but at head of summary.



1204
1205
1206
1207
# File 'lib/optparse.rb', line 1204

def on_head(*opts, &block)
  define_head(*opts, &block)
  self
end

#on_tail(*opts, &block) ⇒ Object

Add option switch like with #on, but at tail of summary.



1218
1219
1220
1221
# File 'lib/optparse.rb', line 1218

def on_tail(*opts, &block)
  define_tail(*opts, &block)
  self
end

#order(*argv, &block) ⇒ Object

Parses command line arguments argv in order. When a block is given, each non-option argument is yielded.

Returns the rest of argv left unparsed.



1237
1238
1239
1240
# File 'lib/optparse.rb', line 1237

def order(*argv, &block)
  argv = argv[0].dup if argv.size == 1 and Array === argv[0]
  order!(argv, &block)
end

#order!(argv = default_argv, &nonopt) ⇒ Object

Same as #order, but removes switches destructively.



1245
1246
1247
# File 'lib/optparse.rb', line 1245

def order!(argv = default_argv, &nonopt)
  parse_in_order(argv, &nonopt)
end

#parse(*argv) ⇒ Object

Parses command line arguments argv in order when environment variable POSIXLY_CORRECT is set, and in permutation mode otherwise.



1346
1347
1348
1349
# File 'lib/optparse.rb', line 1346

def parse(*argv)
  argv = argv[0].dup if argv.size == 1 and Array === argv[0]
  parse!(argv)
end

#parse!(argv = default_argv) ⇒ Object

Same as #parse, but removes switches destructively.



1354
1355
1356
1357
1358
1359
1360
# File 'lib/optparse.rb', line 1354

def parse!(argv = default_argv)
  if ENV.include?('POSIXLY_CORRECT')
    order!(argv)
  else
    permute!(argv)
  end
end

#permute(*argv) ⇒ Object

Parses command line arguments argv in permutation mode and returns list of non-option arguments.



1326
1327
1328
1329
# File 'lib/optparse.rb', line 1326

def permute(*argv)
  argv = argv[0].dup if argv.size == 1 and Array === argv[0]
  permute!(argv)
end

#permute!(argv = default_argv) ⇒ Object

Same as #permute, but removes switches destructively.



1334
1335
1336
1337
1338
1339
1340
# File 'lib/optparse.rb', line 1334

def permute!(argv = default_argv)
  nonopts = []
  arg = nil
  order!(argv) {|arg| nonopts << arg}
  argv[0, 0] = nonopts
  argv
end

#reject(*args, &blk) ⇒ Object

Directs to reject specified class argument.

t

Argument class speficier, any object including Class.

reject(t)


835
# File 'lib/optparse.rb', line 835

def reject(*args, &blk) top.reject(*args, &blk) end

#removeObject

Removes the last List.



953
954
955
# File 'lib/optparse.rb', line 953

def remove
  @stack.pop
end

#separator(string) ⇒ Object

Add separator in summary.



1227
1228
1229
# File 'lib/optparse.rb', line 1227

def separator(string)
  top.append(string, nil, nil)
end

#summarize(to = [], width = @summary_width, max = width - 1, indent = @summary_indent, &blk) ⇒ Object

Puts option summary into to and returns to. Yields each line if a block is given.

to

Output destination, which must have method <<. Defaults to [].

width

Width of left side, defaults to @summary_width.

max

Maximum length allowed for left side, defaults to width - 1.

indent

Indentation, defaults to @summary_indent.



966
967
968
969
970
# File 'lib/optparse.rb', line 966

def summarize(to = [], width = @summary_width, max = width - 1, indent = @summary_indent, &blk)
  blk ||= proc {|l| to << (l.index($/, -1) ? l : l + $/)}
  visit(:summarize, {}, {}, width, max, indent, &blk)
  to
end

#terminate(arg = nil) ⇒ Object

Terminates option parsing. Optional parameter arg is a string pushed back to be the first non-option argument.



803
804
805
# File 'lib/optparse.rb', line 803

def terminate(arg = nil)
  self.class.terminate(arg)
end

#to_aObject

Returns option summary list.



981
# File 'lib/optparse.rb', line 981

def to_a; summarize(banner.to_a.dup) end

#topObject

Subject of #on / #on_head, #accept / #reject



927
928
929
# File 'lib/optparse.rb', line 927

def top
  @stack[-1]
end

#verObject

Returns version string from program_name, version and release.



908
909
910
911
912
913
914
# File 'lib/optparse.rb', line 908

def ver
  if v = version
    str = "#{program_name} #{[v].join('.')}"
    str << " (#{v})" if v = release
    str
  end
end

#warn(mesg = $!) ⇒ Object



916
917
918
# File 'lib/optparse.rb', line 916

def warn(mesg = $!)
  super("#{program_name}: #{mesg}")
end