Class: Psych::Visitors::YAMLTree

Inherits:
Visitor show all
Defined in:
lib/psych/visitors/yaml_tree.rb,
yaml_tree.c

Overview

YAMLTree builds a YAML ast given a ruby object. For example:

builder = Psych::Visitors::YAMLTree.new
builder << { :foo => 'bar' }
builder.tree # => #<Psych::Nodes::Stream .. }

Direct Known Subclasses

Stream, JSONTree

Instance Attribute Summary collapse

Instance Method Summary collapse

Constructor Details

#initialize(options = {}, emitter = TreeBuilder.new, ss = ScalarScanner.new) ⇒ YAMLTree

Returns a new instance of YAMLTree.



15
16
17
18
19
20
21
22
23
24
25
26
27
28
29
30
31
32
33
# File 'lib/psych/visitors/yaml_tree.rb', line 15

def initialize options = {}, emitter = TreeBuilder.new, ss = ScalarScanner.new
  super()
  @started  = false
  @finished = false
  @emitter  = emitter
  @st       = {}
  @ss       = ss
  @options  = options

  @dispatch_cache = Hash.new do |h,klass|
    method = "visit_#{(klass.name || '').split('::').join('_')}"

    method = respond_to?(method) ? method : h[klass.superclass]

    raise(TypeError, "Can't dump #{target.class}") unless method

    h[klass] = method
  end
end

Instance Attribute Details

#finishedObject (readonly) Also known as: finished?

Returns the value of attribute finished



11
12
13
# File 'lib/psych/visitors/yaml_tree.rb', line 11

def finished
  @finished
end

#startedObject (readonly) Also known as: started?

Returns the value of attribute started



11
12
13
# File 'lib/psych/visitors/yaml_tree.rb', line 11

def started
  @started
end

Instance Method Details

#accept(target) ⇒ Object



71
72
73
74
75
76
77
78
79
80
81
82
83
84
85
86
87
88
89
90
91
92
93
94
95
96
97
98
99
100
101
102
103
104
# File 'lib/psych/visitors/yaml_tree.rb', line 71

def accept target
  # return any aliases we find
  if @st.key? target.object_id
    oid         = target.object_id
    node        = @st[oid]
    anchor      = oid.to_s
    node.anchor = anchor
    return @emitter.alias anchor
  end

  if target.respond_to?(:to_yaml)
    begin
      loc = target.method(:to_yaml).source_location.first
      if loc !~ /(syck\/rubytypes.rb|psych\/core_ext.rb)/
        unless target.respond_to?(:encode_with)
          if $VERBOSE
            warn "implementing to_yaml is deprecated, please implement \"encode_with\""
          end

          target.to_yaml(:nodump => true)
        end
      end
    rescue
      # public_method or source_location might be overridden,
      # and it's OK to skip it since it's only to emit a warning
    end
  end

  if target.respond_to?(:encode_with)
    dump_coder target
  else
    send(@dispatch_cache[target.class], target)
  end
end

#finishObject



41
42
43
44
45
# File 'lib/psych/visitors/yaml_tree.rb', line 41

def finish
  @emitter.end_stream.tap do
    @finished = true
  end
end

#format_time(time) ⇒ Object



363
364
365
366
367
368
369
370
371
372
373
374
# File 'lib/psych/visitors/yaml_tree.rb', line 363

def format_time time
  formatted = time.strftime("%Y-%m-%d %H:%M:%S.%9N")

  if time.utc?
    formatted += " Z"
  else
    zone = time.strftime('%z')
    formatted += " #{zone[0,3]}:#{zone[3,5]}"
  end

  formatted
end

#push(object) ⇒ Object Also known as: <<



51
52
53
54
55
56
57
58
59
60
61
62
63
64
65
66
67
68
# File 'lib/psych/visitors/yaml_tree.rb', line 51

def push object
  start unless started?
  version = []
  version = [1,1] if @options[:header]

  case @options[:version]
  when Array
    version = @options[:version]
  when String
    version = @options[:version].split('.').map { |x| x.to_i }
  else
    version = [1,1]
  end if @options.key? :version

  @emitter.start_document version, [], false
  accept object
  @emitter.end_document
end

#start(encoding = Nodes::Stream::UTF8) ⇒ Object



35
36
37
38
39
# File 'lib/psych/visitors/yaml_tree.rb', line 35

def start encoding = Nodes::Stream::UTF8
  @emitter.start_stream(encoding).tap do
    @started = true
  end
end

#treeObject



47
48
49
# File 'lib/psych/visitors/yaml_tree.rb', line 47

def tree
  finish unless finished?
end

#visit_Array(o) ⇒ Object



309
310
311
312
313
314
315
316
317
# File 'lib/psych/visitors/yaml_tree.rb', line 309

def visit_Array o
  if o.class == ::Array
    register o, @emitter.start_sequence(nil, nil, true, Nodes::Sequence::BLOCK)
    o.each { |c| accept c }
    @emitter.end_sequence
  else
    visit_array_subclass o
  end
end

#visit_BigDecimal(o) ⇒ Object



217
218
219
# File 'lib/psych/visitors/yaml_tree.rb', line 217

def visit_BigDecimal o
  @emitter.scalar o._dump, nil, '!ruby/object:BigDecimal', false, false, Nodes::Scalar::ANY
end

#visit_Class(o) ⇒ Object

Raises:

  • (TypeError)


271
272
273
274
# File 'lib/psych/visitors/yaml_tree.rb', line 271

def visit_Class o
  raise TypeError, "can't dump anonymous class: #{o}" unless o.name
  register o, @emitter.scalar(o.name, nil, '!ruby/class', false, false, Nodes::Scalar::SINGLE_QUOTED)
end

#visit_Complex(o) ⇒ Object



189
190
191
192
193
194
195
196
197
# File 'lib/psych/visitors/yaml_tree.rb', line 189

def visit_Complex o
  register o, @emitter.start_mapping(nil, '!ruby/object:Complex', false, Nodes::Mapping::BLOCK)

  ['real', o.real.to_s, 'image', o.imag.to_s].each do |m|
    @emitter.scalar m, nil, nil, true, false, Nodes::Scalar::ANY
  end

  @emitter.end_mapping
end

#visit_DateTime(o) ⇒ Object



165
166
167
168
169
# File 'lib/psych/visitors/yaml_tree.rb', line 165

def visit_DateTime o
  formatted = format_time o.to_time
  tag = '!ruby/object:DateTime'
  register o, @emitter.scalar(formatted, nil, tag, false, false, Nodes::Scalar::ANY)
end

#visit_Exception(o) ⇒ Object



142
143
144
145
146
147
148
149
150
151
152
153
154
155
156
157
158
159
# File 'lib/psych/visitors/yaml_tree.rb', line 142

def visit_Exception o
  tag = ['!ruby/exception', o.class.name].join ':'

  @emitter.start_mapping nil, tag, false, Nodes::Mapping::BLOCK

  {
    'message'   => private_iv_get(o, 'mesg'),
    'backtrace' => private_iv_get(o, 'backtrace'),
  }.each do |k,v|
    next unless v
    @emitter.scalar k, nil, nil, true, false, Nodes::Scalar::ANY
    accept v
  end

  dump_ivars o

  @emitter.end_mapping
end

#visit_Float(o) ⇒ Object



206
207
208
209
210
211
212
213
214
215
# File 'lib/psych/visitors/yaml_tree.rb', line 206

def visit_Float o
  if o.nan?
    @emitter.scalar '.nan', nil, nil, true, false, Nodes::Scalar::ANY
  elsif o.infinite?
    @emitter.scalar((o.infinite? > 0 ? '.inf' : '-.inf'),
      nil, nil, true, false, Nodes::Scalar::ANY)
  else
    @emitter.scalar o.to_s, nil, nil, true, false, Nodes::Scalar::ANY
  end
end

#visit_Hash(o) ⇒ Object



284
285
286
287
288
289
290
291
292
293
294
295
296
# File 'lib/psych/visitors/yaml_tree.rb', line 284

def visit_Hash o
  tag      = o.class == ::Hash ? nil : "!ruby/hash:#{o.class}"
  implicit = !tag

  register(o, @emitter.start_mapping(nil, tag, implicit, Psych::Nodes::Mapping::BLOCK))

  o.each do |k,v|
    accept k
    accept v
  end

  @emitter.end_mapping
end

#visit_Integer(o) ⇒ Object Also known as: visit_TrueClass, visit_FalseClass, visit_Date



199
200
201
# File 'lib/psych/visitors/yaml_tree.rb', line 199

def visit_Integer o
  @emitter.scalar o.to_s, nil, nil, true, false, Nodes::Scalar::ANY
end

#visit_Module(o) ⇒ Object

Raises:

  • (TypeError)


266
267
268
269
# File 'lib/psych/visitors/yaml_tree.rb', line 266

def visit_Module o
  raise TypeError, "can't dump anonymous module: #{o}" unless o.name
  register o, @emitter.scalar(o.name, nil, '!ruby/module', false, false, Nodes::Scalar::SINGLE_QUOTED)
end

#visit_NilClass(o) ⇒ Object



319
320
321
# File 'lib/psych/visitors/yaml_tree.rb', line 319

def visit_NilClass o
  @emitter.scalar('', nil, 'tag:yaml.org,2002:null', true, false, Nodes::Scalar::ANY)
end

#visit_Object(o) ⇒ Object



114
115
116
117
118
119
120
121
122
123
124
125
126
# File 'lib/psych/visitors/yaml_tree.rb', line 114

def visit_Object o
  tag = Psych.dump_tags[o.class]
  unless tag
    klass = o.class == Object ? nil : o.class.name
    tag   = ['!ruby/object', klass].compact.join(':')
  end

  map = @emitter.start_mapping(nil, tag, false, Nodes::Mapping::BLOCK)
  register(o, map)

  dump_ivars o
  @emitter.end_mapping
end

#visit_Psych_Omap(o) ⇒ Object



106
107
108
109
110
111
112
# File 'lib/psych/visitors/yaml_tree.rb', line 106

def visit_Psych_Omap o
  seq = @emitter.start_sequence(nil, '!omap', false, Nodes::Sequence::BLOCK)
  register(o, seq)

  o.each { |k,v| visit_Hash k => v }
  @emitter.end_sequence
end

#visit_Psych_Set(o) ⇒ Object



298
299
300
301
302
303
304
305
306
307
# File 'lib/psych/visitors/yaml_tree.rb', line 298

def visit_Psych_Set o
  register(o, @emitter.start_mapping(nil, '!set', false, Psych::Nodes::Mapping::BLOCK))

  o.each do |k,v|
    accept k
    accept v
  end

  @emitter.end_mapping
end

#visit_Range(o) ⇒ Object



276
277
278
279
280
281
282
# File 'lib/psych/visitors/yaml_tree.rb', line 276

def visit_Range o
  register o, @emitter.start_mapping(nil, '!ruby/range', false, Nodes::Mapping::BLOCK)
  ['begin', o.begin, 'end', o.end, 'excl', o.exclude_end?].each do |m|
    accept m
  end
  @emitter.end_mapping
end

#visit_Rational(o) ⇒ Object



176
177
178
179
180
181
182
183
184
185
186
187
# File 'lib/psych/visitors/yaml_tree.rb', line 176

def visit_Rational o
  register o, @emitter.start_mapping(nil, '!ruby/object:Rational', false, Nodes::Mapping::BLOCK)

  [
    'denominator', o.denominator.to_s,
    'numerator', o.numerator.to_s
  ].each do |m|
    @emitter.scalar m, nil, nil, true, false, Nodes::Scalar::ANY
  end

  @emitter.end_mapping
end

#visit_Regexp(o) ⇒ Object



161
162
163
# File 'lib/psych/visitors/yaml_tree.rb', line 161

def visit_Regexp o
  register o, @emitter.scalar(o.inspect, nil, '!ruby/regexp', false, false, Nodes::Scalar::ANY)
end

#visit_String(o) ⇒ Object



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/psych/visitors/yaml_tree.rb', line 228

def visit_String o
  plain = false
  quote = false
  style = Nodes::Scalar::ANY

  if binary?(o)
    str   = [o].pack('m').chomp
    tag   = '!binary' # FIXME: change to below when syck is removed
    #tag   = 'tag:yaml.org,2002:binary'
    style = Nodes::Scalar::LITERAL
  else
    str   = o
    tag   = nil
    quote = !(String === @ss.tokenize(o))
    plain = !quote
  end

  ivars = find_ivars o

  if ivars.empty?
    unless o.class == ::String
      tag = "!ruby/string:#{o.class}"
    end
    @emitter.scalar str, nil, tag, plain, quote, style
  else
    maptag = '!ruby/string'
    maptag << ":#{o.class}" unless o.class == ::String

    @emitter.start_mapping nil, maptag, false, Nodes::Mapping::BLOCK
    @emitter.scalar 'str', nil, nil, true, false, Nodes::Scalar::ANY
    @emitter.scalar str, nil, tag, plain, quote, style

    dump_ivars o

    @emitter.end_mapping
  end
end

#visit_Struct(o) ⇒ Object



128
129
130
131
132
133
134
135
136
137
138
139
140
# File 'lib/psych/visitors/yaml_tree.rb', line 128

def visit_Struct o
  tag = ['!ruby/struct', o.class.name].compact.join(':')

  register o, @emitter.start_mapping(nil, tag, false, Nodes::Mapping::BLOCK)
  o.members.each do |member|
    @emitter.scalar member.to_s, nil, nil, true, false, Nodes::Scalar::ANY
    accept o[member]
  end

  dump_ivars o

  @emitter.end_mapping
end

#visit_Symbol(o) ⇒ Object



323
324
325
# File 'lib/psych/visitors/yaml_tree.rb', line 323

def visit_Symbol o
  @emitter.scalar ":#{o}", nil, nil, true, false, Nodes::Scalar::ANY
end

#visit_Time(o) ⇒ Object



171
172
173
174
# File 'lib/psych/visitors/yaml_tree.rb', line 171

def visit_Time o
  formatted = format_time o
  @emitter.scalar formatted, nil, nil, true, false, Nodes::Scalar::ANY
end